title: “Data_Products”
author: “aid004”
date: “2022-11-19”
output: html_document
toc: true
toc_float:true

Data Visualization

GGPlot

Boxplots

Let’s look at some boxplots

data("ToothGrowth")

Let’s change the dose to a factor and look at the top of the dataframe

ToothGrowth$dose <- as.factor(ToothGrowth$dose)

head(ToothGrowth, 4)
##    len supp dose
## 1  4.2   VC  0.5
## 2 11.5   VC  0.5
## 3  7.3   VC  0.5
## 4  5.8   VC  0.5

Let’s load ggplot

library(ggplot2)

Let’s set the theme for our plots to classic

theme_set(
  theme_bw() +
    theme(legend.position = "top")
)

Let’s start with a very basic boxplot with dose vs. length

tg <- ggplot(ToothGrowth, aes(x = dose, y = len))
tg + geom_boxplot()

Now let’s look at a boxplot with points for the mean

tg + geom_boxplot(notch = TRUE, fill = "lightgrey") +
  stat_summary(fun = mean, geom = "point", shape = 9, size = 2.5, color = "indianred")

We can also change the scale number of variables included, and their order

tg + geom_boxplot() +
  scale_x_discrete(limits = c("0.5", "2"))
## Warning: Removed 20 rows containing missing values (stat_boxplot).

Let’s put our x axis in descending order

tg +geom_boxplot() +
  scale_x_discrete(limits = c("2", "1", "0.5"))

We can also change boxplot colors by groups

tg + geom_boxplot(aes(color = dose)) +
  scale_color_manual(values = c("indianred", "blue1", "green2"))

What if we want to display our data subset by oj vs vitamin c?

tg2 <- tg + geom_boxplot(aes(fill = supp), position = position_dodge(0.9)) +
  scale_fill_manual(values = c("#999999", "#E69F00"))
    
tg2

We can also arrange this as two plots with facet_wrap

tg2 + facet_wrap(~supp)

Bar Plots

Now let’s take a look at some barplots.

We’ll start with making a dataframe based on the tooth data.

df <- data.frame(dose = c("D0.5", "D1", "D2"),
                  len = c(4.2, 10, 29.5))
                  
df
##   dose  len
## 1 D0.5  4.2
## 2   D1 10.0
## 3   D2 29.5

And now let’s make a second dataframe

df2 <- data.frame(supp=rep(c("VC", "OJ"), each = 3),
                  dose = rep(c("D0.5", "D1", "D2"), 2),
                  len = c(6.8, 15, 33, 4.2, 10, 29.5))

df2
##   supp dose  len
## 1   VC D0.5  6.8
## 2   VC   D1 15.0
## 3   VC   D2 33.0
## 4   OJ D0.5  4.2
## 5   OJ   D1 10.0
## 6   OJ   D2 29.5

Let’s load up ggplot2

library(ggplot2)

Let’s set our parameters for ggplot

theme_set(
  theme_classic() +
    theme(legend.position = "top")
)

Let’s start with some basic barplots using the tooth data

f <-ggplot(df, aes(x = dose, y = len))

f + geom_col()

Now let’s change the fill, and add labels to the top

f + geom_col(fill = "darkblue") +
  geom_text(aes(label = len), vjust = -0.3)

Now let’s add the labels inside the bars

f + geom_col(fill = "darkblue") +
  geom_text(aes(label = len), vjust = 1.6, color = "white")

Now let’s change the barplot colors by group

f + geom_col(aes(color = dose), fill = "white") +
  scale_color_manual(values = c("blue", "gold", "red"))

This is kinda hard to see, so let’s change the fill.

f + geom_col(aes(fill = dose)) +
  scale_fill_manual(values = c("blue", "gold", "red"))

Ok how do we do this with multiple groups

ggplot(df2, aes(x = dose, y =len)) +
  geom_col(aes(color = supp, fill = supp), position = position_stack()) +
  scale_color_manual(values =c("blue", "gold")) +
  scale_fill_manual(values = c("blue", "gold"))

p <- ggplot(df2, aes(x = dose, y = len)) +
  geom_col(aes(color = supp, fill = supp), position = position_dodge(0.8), width = 0.7) +
             scale_color_manual(values = c("blue", "gold")) +
             scale_fill_manual(values = c("blue", "gold"))
p

Now let’s add those labels to the dodged barplot

p + geom_text(
  aes(label = len, group = supp),
  position = position_dodge(0.8),
  vjust = -0.3, size = 3.5
)

Now what if we want to add labels to our stacked barplots? For this we need dplyr

library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
df2 <- df2 %>%
  group_by(dose) %>%
  arrange(dose, desc(supp)) %>%
          dplyr::mutate(lab_ypos = cumsum(len) - 0.5 * len)
df2
## # A tibble: 6 × 4
## # Groups:   dose [3]
##   supp  dose    len lab_ypos
##   <chr> <chr> <dbl>    <dbl>
## 1 VC    D0.5    6.8      3.4
## 2 OJ    D0.5    4.2      8.9
## 3 VC    D1     15        7.5
## 4 OJ    D1     10       20  
## 5 VC    D2     33       16.5
## 6 OJ    D2     29.5     47.8

Now let’s recreate our stacked graphs

ggplot(df2, aes(x=dose, y = len)) +
  geom_col(aes(fill = supp), width = 0.7) +
  geom_text(aes(y = lab_ypos, label = len, group = supp), color = "white") +
  scale_color_manual(values = c("blue", "gold")) +
  scale_fill_manual(values = c("blue", "gold"))

Histograms

Let’s take a look at histograms. First, let’s load our data.

set.seed(1234)

wdata = data.frame(
  sex = factor(rep(c("F", "M"), each = 200)),
  weight = c(rnorm(200, 50), rnorm(200, 58))
)

head(wdata, 4)
##   sex   weight
## 1   F 48.79293
## 2   F 50.27743
## 3   F 51.08444
## 4   F 47.65430

Now let’s load dplyr

library(dplyr)

mu <- wdata %>%
  group_by(sex) %>%
  summarise(grp.mean = mean(weight))

Now let’s load the plotting package

library(ggplot2)

theme_set(
  theme_classic() +
    theme(legend.position = "bottom")
)

Now let’s create a ggplot object

a <- ggplot(wdata, aes(x = weight))

a + geom_histogram(bins = 30, color = "black", fill = "grey") +
  geom_vline(aes(xintercept = mean(weight)),
             linetype = "dashed", size = 0.6)

Now let’s change the color by group

a + geom_histogram(aes(color = sex), fill = "white", position = "identity") +
  scale_color_manual(values = c("#00AFBB", "#E7B800"))
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

a + geom_histogram(aes(color = sex, fill = sex), position = "identity") +
  scale_color_manual(values = c("#00AFBB", "#E7B800")) +
  scale_fill_manual(values = c("indianred", "lightblue1"))
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

What if we want to combine density plots and histograms?

a + geom_histogram(aes(y = stat(density)),
                   color = "black", fill = "white") +
  geom_density(alpha = 0.2, fill = "#FF6666")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

a + geom_histogram(aes(y = stat(density), color = sex),
                   fill = "white", position = "identity") +
  geom_density(aes(color = sex), size = 1) +
  scale_color_manual(values = c("indianred", "lightblue1"))
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

Dot Plots

First let’s load the required packages

library(ggplot2)

Let’s set our theme

theme_set(
  theme_dark() +
    theme(legend.position = "top")
)

First let’s initiate a ggplot object called TG

data("ToothGrowth")
ToothGrowth$dose <- as.factor(ToothGrowth$dose)

tg <- ggplot(ToothGrowth, aes(x=dose, y = len))

Let’s create a dotplot with a summary statistic

tg + geom_dotplot(binaxis = "y", stackdir = "center", fill = "white") +
  stat_summary(fun = mean, fun.args = list(mult=1))
## Bin width defaults to 1/30 of the range of the data. Pick better value with `binwidth`.
## Warning: Removed 3 rows containing missing values (geom_segment).

Let’s add a boxplt and dotplot together

tg + geom_boxplot(width = 0.5) +
  geom_dotplot(binaxis = "y", stackdir = "center", fill = "white")
## Bin width defaults to 1/30 of the range of the data. Pick better value with `binwidth`.

tg + geom_violin(trim = FALSE) +
  geom_dotplot(binaxis = "y", stackdir = "center", fill = "#999999") +
  stat_summary(fun = mean, fun.args = list(mult=1))
## Bin width defaults to 1/30 of the range of the data. Pick better value with `binwidth`.
## Warning: Removed 3 rows containing missing values (geom_segment).

Let’s create a dotplot with multiple groups

tg + geom_boxplot(width = 0.5) +
  geom_dotplot(aes(fill = supp), binaxis = "y", stackdir = "center") +
                 scale_fill_manual(values = c("indianred", "lightblue1"))
## Bin width defaults to 1/30 of the range of the data. Pick better value with `binwidth`.

tg + geom_boxplot(aes(color = supp), width = 0.5, position = position_dodge(0.8)) +
  geom_dotplot(aes(fill = supp, color = supp), binaxis = 'y', stackdir = 'center',
               dotsize = 0.8, position = position_dodge(0.8)) +
  scale_fill_manual(values = c("#00AFBB", "#E7B800")) +
  scale_color_manual(values = c("#00AFBB", "#E7B800"))
## Bin width defaults to 1/30 of the range of the data. Pick better value with `binwidth`.

Line Plots

Now let’s change it up and look at some line plots

We’ll start by making a custom dataframe kinda like the tooth dataset. This way we can see the lines and stuff that we’re modifying

df <- data.frame(dose = c("D0.5", "D1", "D2"),
                 len = c(4.2, 10, 29.55))

Now let’s create a second dataframe for plotting by groups

df2 <- data.frame(supp = rep(c("VC", "OJ"), each = 3),
                 dose = rep(c("D0.5", "D1", "D2"), 2),
                 len = c(6.8, 15, 33, 4.2, 10, 29.5))

df2
##   supp dose  len
## 1   VC D0.5  6.8
## 2   VC   D1 15.0
## 3   VC   D2 33.0
## 4   OJ D0.5  4.2
## 5   OJ   D1 10.0
## 6   OJ   D2 29.5

Now let’s again load ggplot2 and set a theme

library(ggplot2)

theme_set(
  theme_gray() +
    theme(legend.position = "right")
  
)

Now let’s do some basic line plots. First, we will build a function to display all the different line types

generateRLineTypes <- function(){
  oldPar <- par ()
  par(font = 2, mar = c(0, 0, 0, 0))
  plot(1, pch = "", ylim = c(0, 6), xlim = c(0, 0.7), axes = FALSE, xlab = "", ylab = "")
  for(i in 0:6) lines(c(0.3, 0.7), c(i, i), lty = i, lwd = 3)
    text(rep(0.1, 6), 0:6, labels = c("0. 'Blank'", "1. 'solid'", "2. 'dashed'", "3. 'dotted'", 
                                      "4. 'dotdash'", "5. 'longdash'", "6. 'twodash'"))
  par(mar = oldPar$mar, font = oldPar$font)
}

generateRLineTypes()

Now let’s build a basic line plot

p <- ggplot(data = df, aes(x = dose, y = len, group = 1))

p + geom_line() + geom_point()

Now let’s modify the line type and color

p + geom_line(linetype = "dashed", color = "steelblue") +
  geom_point(color = "steelblue")

Now let’s try a step graph, which indicates a threshold type progression

p +geom_step() + geom_point()

Now let’s move on to making multiple groups. First we’ll create our ggplot object

p <- ggplot(df2, aes(x=dose, y=len, group = supp))

Now let’s change line types and point shapes by group

p + geom_line(aes(linetype = supp, color = supp)) +
  geom_point(aes(shape = supp, color = supp)) +
  scale_color_manual(values = c("red", "blue"))

Now let’s look at line plots with a numeric x axis

df3 <- data.frame(supp = rep(c("VC", "OJ"), each = 3),
                  dose = rep(c("0.5", "1", "2"), 2),
                  len=c(6.8, 15, 33, 4.2, 10, 29.5))

df3
##   supp dose  len
## 1   VC  0.5  6.8
## 2   VC    1 15.0
## 3   VC    2 33.0
## 4   OJ  0.5  4.2
## 5   OJ    1 10.0
## 6   OJ    2 29.5

Now let’s plot where both axes are treated as continuous labels

df3$dose <- as.numeric(as.vector(df3$dose))
ggplot(data = df3, aes(x=dose, y=len, group = supp, color = supp)) +
  geom_line() + geom_point()

Now let’s look at a line graph with having the x axis as dates. We’ll use the built in aconomics time for this example.

head(economics)
## # A tibble: 6 × 6
##   date         pce    pop psavert uempmed unemploy
##   <date>     <dbl>  <dbl>   <dbl>   <dbl>    <dbl>
## 1 1967-07-01  507. 198712    12.6     4.5     2944
## 2 1967-08-01  510. 198911    12.6     4.7     2945
## 3 1967-09-01  516. 199113    11.9     4.6     2958
## 4 1967-10-01  512. 199311    12.9     4.9     3143
## 5 1967-11-01  517. 199498    12.8     4.7     3066
## 6 1967-12-01  525. 199657    11.8     4.8     3018
ggplot(data = economics, aes(x = date, y = pop)) +
  geom_line()

Now let’s subset the data

ss <- subset(economics, date > as.Date("2006-1-1"))
ggplot(data = ss, aes(x = date, y = pop)) + geom_line()

We can also change the line size, for instance by another variable like unemployment

ggplot(data = economics, aes(x=date, y = pop)) +
  geom_line(aes(size = unemploy/pop))

We can also plot multiple time-series data

ggplot(economics, aes(x = date)) +
  geom_line(aes(y=psavert), color = "darkred") +
  geom_line(aes(y = uempmed), color = "steelblue", linetype = "twodash")

Lastly, let’s make this into an area plot

ggplot(economics, aes(x=date)) +
  geom_area(aes(y = psavert), fill = "#999999",
            color = "#999999", alpha = 0.5) +
  geom_area(aes(y = uempmed), fill = "#E69F00",
            color = "#E69F00", alpha = 0.5)

Ridge Plots

First, let’s load the required packages

library(ggplot2)
library(ggridges)

#BiocManager::install("ggridges")

Now, let’s load some sample data

?airquality
air <- ggplot(airquality) + aes(Temp, Month, group = Month) + geom_density_ridges()

air
## Picking joint bandwidth of 2.65

Now, let’s add some pazzazz to our graph

library(viridis)
## Loading required package: viridisLite
library(viridisLite)

ggplot(airquality) + aes(Temp, Month, group = Month, fill = ..x..) +
  geom_density_ridges_gradient() + 
  scale_fill_viridis(option = "C", name = "Temp")
## Picking joint bandwidth of 2.65

Lat thing we will do is create a facet plot for all our data.

library(tidyr)

airquality %>%
gather(key = "Measurement", value = "Value", Ozone, Solar.R, Wind, Temp) %>%
  ggplot() + aes(Value, Month, group = Month) +
  geom_density_ridges() +
  facet_wrap(~ Measurement, scales = "free")
## Picking joint bandwidth of 11
## Picking joint bandwidth of 40.1
## Picking joint bandwidth of 2.65
## Picking joint bandwidth of 1.44
## Warning: Removed 44 rows containing non-finite values (stat_density_ridges).

Density Plots

A density plot is a nice alternative to a histogram

set.seed(1234)

wdata = data.frame(
  sex = factor(rep(c("F", "M"), each = 200)), 
  weight = c(rnorm(200, 55), rnorm(200, 58))
)

Adding the library and group data

library(dplyr)
mu <- wdata %>%
  group_by(sex) %>%
dplyr::summarize(grp.mean = mean(weight))

Next, we load the graphing packages

library(ggplot2)
theme_set(
  theme_classic() +
    theme(legend.position = "right")
)

Now, let’s do the basic plot function. First, we will create a ggplot object.

d <- ggplot(wdata, aes(x = weight))

Now, let’s do a basic density plot

d + geom_density() +
  geom_vline(aes(xintercept = mean(weight)), linetype = "dashed")

Now, let’s change the y axis to count instead of density

d + geom_density(aes(y = stat(count)), fill = "lightgray") +
  geom_vline(aes(xintercept = mean(weight)), linetype = "dashed")

Let’s make it easier to read by adding color.

d + geom_density(aes(color = sex)) +
  scale_color_manual(values = c("darkgray", "gold"))

Lastly, let’s fill the density plots

d + geom_density(aes(fill = sex), alpha = 0.4) +
  geom_vline(aes(xintercept = grp.mean, color = sex), data = mu, linetype = "dashed") +
  scale_color_manual(values = c("grey", "gold")) +
  scale_fill_manual(values = c("grey", "gold"))

Plotly

Plotly Line Plots

First, let’s load our required package

library(plotly)
## 
## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2':
## 
##     last_plot
## The following object is masked from 'package:stats':
## 
##     filter
## The following object is masked from 'package:graphics':
## 
##     layout

Let’s start with a scatter plot of the Orange dataset

Orange <- as.data.frame(Orange)

plot_ly(data = Orange, x = ~age, y = ~circumference)
## No trace type specified:
##   Based on info supplied, a 'scatter' trace seems appropriate.
##   Read more about this trace type -> https://plotly.com/r/reference/#scatter
## No scatter mode specifed:
##   Setting the mode to markers
##   Read more about this attribute -> https://plotly.com/r/reference/#scatter-mode

Now, let’s add some more info

plot_ly(data = Orange, x = ~age, y = ~circumference, 
        color = ~Tree, size = ~age, 
        text = ~paste("Tree ID:", Tree, "<br>Age:", age, "Circ:", circumference)
)
## No trace type specified:
##   Based on info supplied, a 'scatter' trace seems appropriate.
##   Read more about this trace type -> https://plotly.com/r/reference/#scatter
## No scatter mode specifed:
##   Setting the mode to markers
##   Read more about this attribute -> https://plotly.com/r/reference/#scatter-mode
## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

Now, let’s create a random distribution and add it to our dataframe

trace_1 <- rnorm(35, mean= 120, sd = 10)
new_data <- data.frame(Orange, trace_1)

We’ll use the random numbers as lines on the graph

plot_ly(data = new_data, x = ~age, y = ~circumference, color = ~Tree, size = ~age, 
        text = ~paste("Tree ID:", Tree, "<br>Age:", age, "<br>Circ:", circumference)) %>%
  add_trace(y = ~trace_1, mode = 'lines') %>%
  add_trace(y = ~circumference, mode = 'markers')
## No trace type specified:
##   Based on info supplied, a 'scatter' trace seems appropriate.
##   Read more about this trace type -> https://plotly.com/r/reference/#scatter
## No trace type specified:
##   Based on info supplied, a 'scatter' trace seems appropriate.
##   Read more about this trace type -> https://plotly.com/r/reference/#scatter
## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

Now, let’s create a graph with the option of showing as a scatter or line, and add labels.

plot_ly(data = Orange, x = ~age, y = ~circumference, 
        color = ~Tree, size = ~circumference,
        text = ~paste("Tree ID:", Tree, "<br>Age:", age, "Circ:", circumference)) %>%
  add_trace(y = ~circumference, mode = 'markers') %>%
  layout(
    title = "Plot of Orange data with switchable trace", 
    updatemenus= list(
      list(
        type = 'downdrop',
        y = 0.8, 
        buttons = list(
          list(method = 'restyle',
               args = list('mode', 'markers'),
               label = "Marker"
               ),
          list(method = "restyle",
               args = list("mode", 'lines'),
               label = "Lines"
          )
        )
      )
    )
  )
## No trace type specified:
##   Based on info supplied, a 'scatter' trace seems appropriate.
##   Read more about this trace type -> https://plotly.com/r/reference/#scatter
## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

## Warning: `line.width` does not currently support multiple values.

Plotly 3D

First, let’s load our required packages

library(plotly)

Now, let’s create a random 3D matrix

d <- data.frame(
  x <- seq(1,10, by = 0.5),
  y <- seq(1,10, by = 0.5)
)

z <- matrix(rnorm(length(d$x) * length(d$y)), nrow = length(d$x), ncol = length(d$y))

Now, let’s plot our 3D data

plot_ly(d, x = ~x, y = ~y, z = ~z) %>%
  add_surface()

Let’s add some more aspects to it, such as topography

plot_ly(d, x = ~x, y = ~y, z = ~z) %>%
  add_surface(
    contours = list(
      z = list(
        show = TRUE, 
        usecolormap = TRUE,
        highlightcolor = "FF00000", 
        project = list(z = TRUE)
      )
    )
  )

Now, let’s look at a 3D scatter plot

plot_ly(longley, x = ~GNP, y = ~Population, z = ~Employed, marker = list(color = ~GNP)) %>%
  add_markers()

Other Graphing Techniques

Error Bars

First, let’s load our required libraries

library(ggplot2)
library(dplyr)
BiocManager::install("plotrix")
## 'getOption("repos")' replaces Bioconductor standard repositories, see
## '?repositories' for details
## 
## replacement repositories:
##     CRAN: https://cloud.r-project.org
## Bioconductor version 3.15 (BiocManager 1.30.18), R 4.2.1 (2022-06-23)
## Warning: package(s) not installed when version(s) same as current; use `force = TRUE` to
##   re-install: 'plotrix'
## Installation paths not writeable, unable to update packages
##   path: /usr/lib/R/library
##   packages:
##     foreign, MASS, Matrix, mgcv, nlme, nnet, rpart, spatial
## Old packages: 'BiocManager', 'bit', 'brew', 'bslib', 'callr', 'car', 'cli',
##   'commonmark', 'cpp11', 'crayon', 'curl', 'data.table', 'devtools', 'digest',
##   'DT', 'evaluate', 'fontawesome', 'gert', 'ggforce', 'ggplot2', 'ggpubr',
##   'ggraph', 'ggrepel', 'ggridges', 'ggsignif', 'ggstance', 'graphlayouts',
##   'igraph', 'isoband', 'jsonlite', 'knitr', 'labelled', 'lifecycle', 'limma',
##   'lme4', 'lubridate', 'maps', 'maptools', 'markdown', 'MatrixModels',
##   'matrixStats', 'minqa', 'modelr', 'mosaic', 'mosaicCore', 'openssl',
##   'pkgload', 'plotly', 'plyr', 'polyclip', 'processx', 'ps', 'purrr', 'ragg',
##   'raster', 'RcppArmadillo', 'RcppEigen', 'RCurl', 'readr', 'rlang',
##   'rmarkdown', 'RMySQL', 'roxygen2', 'rsconnect', 'RSQLite', 'rstatix', 'sass',
##   'shiny', 'sp', 'sys', 'terra', 'testthat', 'tidyselect', 'tinytex', 'tm',
##   'tokenizers', 'vctrs', 'vroom', 'widyr', 'xfun', 'XML', 'xts', 'yaml', 'zip',
##   'zoo'
library(plotrix)

theme_set(
  theme_classic()+
    theme(legend.position = "top")
)

Let’s again use the tooth data for this exercise

df <- ToothGrowth
df$dose <- as.factor(df$dose)

Now, let’s use dplyr for manipulation purposes

df.summary <- df %>%
  group_by(dose) %>%
  dplyr::summarize(
    sd = sd(len, na.rm = TRUE),
    stderr = std.error(len, na.rm = TRUE),
        len = mean(len),
  )

df.summary
## # A tibble: 3 × 4
##   dose     sd stderr   len
##   <fct> <dbl>  <dbl> <dbl>
## 1 0.5    4.50  1.01   10.6
## 2 1      4.42  0.987  19.7
## 3 2      3.77  0.844  26.1

Let’s now look at some key functions

  • geom_crossbar() for hollow bars with middle indicated by a horizontal line
  • geom_errorbar() for error bars
  • geom_errorbarh() for horizontal error bars
  • geom_linerange() is for drawing an interval represented by a vertical line
  • geom_pointrange() for creating an interval represented by a vertical line; with a point in the middle

Let’s start by creating a ggplot object

tg <- ggplot(
  df.summary, 
  aes(x = dose, y = len, ymin = len - sd, ymax = len + sd)
)

Now, let’s look at the most basic error bars

tg + geom_pointrange()

tg + geom_errorbar(width = 0.2) +
  geom_point(size = 1.5)

Now, let’s create horizontal error bars by manipulating our graph

ggplot(df.summary, aes( x = len, y = dose, xmin = len - sd, xmax = len + sd)) +
  geom_point() +
  geom_errorbarh(height = 0.2)

This just gives you an idea of error bars on the horizontal axis

Now, let’s look at adding jitter points (actual measurements) to our data.

ggplot(df, aes(dose, len)) +
  geom_jitter(psoition = position_jitter(0.2), color = "darkgray") +
  geom_pointrange(aes(ymin = len - sd, ymax = len + sd), data = df.summary)
## Warning: Ignoring unknown parameters: psoition

Now, let’s try error bars on a violin plot

ggplot(df, aes(dose, len)) +
  geom_violin(color = "darkgrey", trim = FALSE) +
  geom_pointrange(aes(ymin = len - sd, ymax = len+sd), data = df.summary)

Now, how about with a line graph?

ggplot(df.summary, aes(dose, len)) +
  geom_line(aes(group = 1)) + #always specify this when you have 1 line)
  geom_errorbar(aes(ymin = len - stderr, ymax = len + stderr), width = 0.2) +
  geom_point(size = 2)

Now, let’s make a bar graph with the halve error bars

ggplot(df.summary, aes(dose, len)) +
  geom_col(fill = "lightgray", color = "black") +
  geom_errorbar(aes(ymin = len, ymax = len+stderr), width = 0.2)

You can see that by not specifying wmin = len-stderr, we have in essence cut our error bar in half.

How about we add jitter points to the line plots? We need to use the original dataframe for the jitter plot, and the summary df for the geom layers.

ggplot(df, aes(dose, len)) +
  geom_jitter(position = position_jitter(0.2), color = "darkgrey") +
  geom_line(aes(group = 1), data = df.summary) +
  geom_errorbar(
    aes(ymin = len - stderr, ymax = len + stderr), 
                data = df.summary, width = 0.2) +
  geom_point(data = df.summary, size = 0.2)

What about adding jitterpoints to a barplot?

ggplot(df, aes(dose, len)) +
  geom_col(data = df.summary, fill = NA, color = "black") +
  geom_jitter(position = position_jitter(0.3), color = "blue") +
  geom_errorbar(aes(ymin = len - stderr, ymax = len + stderr), 
                data = df.summary, width = 0.2)

What if we wanted to have our error bars per group? (OJ vs VC)

df.summary2 <- df %>%
  group_by(dose, supp) %>%
  dplyr::summarize(
    sd = sd(len),
    stderr = std.error(len),
    len = mean(len)
  )
## `summarise()` has grouped output by 'dose'. You can override using the
## `.groups` argument.
df.summary2
## # A tibble: 6 × 5
## # Groups:   dose [3]
##   dose  supp     sd stderr   len
##   <fct> <fct> <dbl>  <dbl> <dbl>
## 1 0.5   OJ     4.46  1.41  13.2 
## 2 0.5   VC     2.75  0.869  7.98
## 3 1     OJ     3.91  1.24  22.7 
## 4 1     VC     2.52  0.795 16.8 
## 5 2     OJ     2.66  0.840 26.1 
## 6 2     VC     4.80  1.52  26.1

Now, you can see we have mean and error for each dose and supp

ggplot(df.summary2, aes(dose, len)) +
  geom_pointrange(
    aes(ymin = len - stderr, ymax = len + stderr, color = supp),
    position = position_dodge(0.3)) +
  scale_color_manual(values = c("indianred", "lightblue"))

How about line plots with multiple error bars?

ggplot(df.summary2, aes(dose, len)) +
  geom_line(aes(linetype = supp, group = supp)) +
  geom_point() +
  geom_errorbar(aes(ymin = len - stderr, ymax = len + stderr, group = supp), width = 0.2)

And the same with a bar plot

ggplot(df.summary2, aes(dose, len)) +
  geom_col(aes(fill = supp), position = position_dodge(0.8), width = 0.7) +
  geom_errorbar(
    aes(ymin = len - sd, ymax = len + sd, group = supp), 
    width = 0.2, position = position_dodge(0.8)) +
  scale_fill_manual(values = c("indianred", "lightblue"))

Now, let’s add some jitterpoints

ggplot(df, aes(dose, len, color = supp)) +
  geom_jitter(position = position_dodge(0.2)) +
  geom_line(aes(group = supp), data = df.summary2) +
  geom_point() +
  geom_errorbar(aes(ymin = len - stderr, ymax = len + stderr, group = supp), data = df.summary2, width = 0.2)

ggplot(df, aes(dose, len, color = supp)) +
  geom_col(data = df.summary2, position = position_dodge(0.8), width = 0.7, fill = "white") +
  geom_jitter(
    position = position_jitterdodge(jitter.width = 0.2, dodge.width = 0.8)) +
  geom_errorbar(
    aes(ymin = len - stderr, ymax = len + stderr), data = df.summary2, 
    width = 0.2, position = position_dodge(0.8)) +
  scale_color_manual(values = c("indianred", "lightblue"))+
  theme(legend.position = "top")

ECDF Plots

Now let’s do an empirical cumulative distribution function. This reports any given number percentile of individuals that are above or below that threshold.

set.seed(1234)

wdata = data.frame(
  sex = factor(rep(c("F", "M"), each = 200)),
  weight = c(rnorm(200, 55)), rnorm(200, 58))

Now let’s look at our daataframe

head(wdata, 5)
##   sex   weight rnorm.200..58.
## 1   F 53.79293       58.48523
## 2   F 55.27743       58.69677
## 3   F 56.08444       58.18551
## 4   F 52.65430       58.70073
## 5   F 55.42912       58.31168

Now let’s load our plotting package

library(ggplot2)

theme_set(
  theme_classic() +
    theme(legend.position = "bottom")
)

Now let’s create our ECDF Plot

ggplot(wdata, aes(x = weight)) +
  stat_ecdf(aes(color = sex, linetype = sex), 
            geom = "step", size = 1.5) +
  scale_color_manual(values = c("#00AFBB", "#E7B900")) +
  labs(y = "weight")

QQ Plots

Now, let’s take a look at qq plots. These are used to determine if the given data follows a normal distribution

install.packages("ggpubr")
## Installing package into '/home/student/R/x86_64-pc-linux-gnu-library/4.2'
## (as 'lib' is unspecified)
## also installing the dependencies 'lifecycle', 'rlang', 'vctrs', 'ggplot2', 'rstatix'
BiocManager::install("ggpubr")
## 'getOption("repos")' replaces Bioconductor standard repositories, see
## '?repositories' for details
## 
## replacement repositories:
##     CRAN: https://cloud.r-project.org
## Bioconductor version 3.15 (BiocManager 1.30.18), R 4.2.1 (2022-06-23)
## Warning: package(s) not installed when version(s) same as current; use `force = TRUE` to
##   re-install: 'ggpubr'
## Installation paths not writeable, unable to update packages
##   path: /usr/lib/R/library
##   packages:
##     foreign, MASS, Matrix, mgcv, nlme, nnet, rpart, spatial
## Old packages: 'BiocManager', 'bit', 'brew', 'bslib', 'callr', 'car', 'cli',
##   'commonmark', 'cpp11', 'crayon', 'curl', 'data.table', 'devtools', 'digest',
##   'DT', 'evaluate', 'fontawesome', 'gert', 'ggforce', 'ggraph', 'ggrepel',
##   'ggridges', 'ggsignif', 'ggstance', 'graphlayouts', 'igraph', 'isoband',
##   'jsonlite', 'knitr', 'labelled', 'limma', 'lme4', 'lubridate', 'maps',
##   'maptools', 'markdown', 'MatrixModels', 'matrixStats', 'minqa', 'modelr',
##   'mosaic', 'mosaicCore', 'openssl', 'pkgload', 'plotly', 'plyr', 'polyclip',
##   'processx', 'ps', 'purrr', 'ragg', 'raster', 'RcppArmadillo', 'RcppEigen',
##   'RCurl', 'readr', 'rmarkdown', 'RMySQL', 'roxygen2', 'rsconnect', 'RSQLite',
##   'sass', 'shiny', 'sp', 'sys', 'terra', 'testthat', 'tidyselect', 'tinytex',
##   'tm', 'tokenizers', 'vroom', 'widyr', 'xfun', 'XML', 'xts', 'yaml', 'zip',
##   'zoo'
library(ggpubr)
set.seed(1234)

Now, let’s randomly generate some data

wdata = data.frame(
  sex = factor(rep(c("F", "M"), each = 200)),
  weight = c(rnorm(200, 55), rnorm(200, 58))
)

Let’s set our theme for the graphing with ggplot

library(ggplot2)

theme_set(
  theme_classic() +
    theme(legend.position = "top")
)

Create a qq plot of the weight

ggplot(wdata, aes(sample = weight)) +
  stat_qq(aes(color = sex)) +
  scale_color_manual(values = c("#0073C2FF", "#FC4E07")) +
  labs(y = "weight")

library(ggpubr)

ggqqplot(wdata, x = "weight",
         color = "sex", 
         palettes = c("#0073C2FF", "#FC4E07"),
         ggtheme = theme_pubclean())

Now, what would a non-normal distribution look like?

#install.packages(mnonr)

library(mnonr)

data2 <- mnonr::mnonr(n = 1000, p = 2, ms = 3, mk = 61, Sigma = matrix(c(1, 0.5, 0.5, 1), 2, 2), initial = NULL)

data2 <- as.data.frame(data2)

Now, let’s plot the non-normal data

ggplot(data2, aes(sample = V1)) +
  stat_qq()

ggqqplot(data2, x = "V1", 
         palette = "#0073C2FF",
         ggtheme = theme_pubclean())

Facet Plots

Let’s look at how to put multiple plots together into a single figure

library(ggpubr)
library(ggplot2)

theme_set(
  theme_bw() +
    theme(legend.position = "top")

)

First, let’s create a nice boxplot

Let’s load the data

df <- ToothGrowth
df$dose <- as.factor(df$dose)

and create the plot object

p <- ggplot(df, aes(x = dose, y = len)) +
  geom_boxplot(aes(fill = supp), position = position_dodge(0.9)) +
  scale_fill_manual(values = c("#00AFBB", "#E7B800"))

p

Now let’s look at the gvgplot facet function

p + facet_grid(rows = vars(supp))

Now, let’s do a facet with multiple variables

p + facet_grid(rows = vars(dose), cols = vars(supp))

p

Now, let’s look at the facet_wrap function. This allows facets to be placed side-by-side

p + facet_wrap(vars(dose), ncol = 2)

Now, how do we combine multiple plots using ggarrange()

Let’s start by making some basic plots. First, we will define a color palette and data

my3cols <- c("#e7B800", "#2E9FDF", "#FC4E07")
ToothGrowth$dose <- as.factor(ToothGrowth$dose)

Now, let’s make some basic plots

p <- ggplot(ToothGrowth, aes(x = dose, y = len))
bxp <- p + geom_boxplot(aes(color = dose)) +
  scale_color_manual(values = my3cols)

Okay, now let’s do a dotplot

dp <- p + geom_dotplot(aes(color = dose, fill = dose), 
                       binaxis = 'y', stackdir = 'center') +
  scale_color_manual(values = my3cols) +
  scale_fill_manual(values = my3cols)

Now, lastly let’s create a lineplot

lp <- ggplot(economics, aes(x = date, y = psavert)) +
  geom_line(color = "indianred")

Now, we can make the figure

figure <- ggarrange(bxp, dp, lp, labels = c("A", "B", "C"), ncol = 2, nrow = 2)
## Bin width defaults to 1/30 of the range of the data. Pick better value with `binwidth`.
figure

This looks great, but we can make it look even better

figure2 <- ggarrange(
  lp,
  ggarrange(bxp, dp, ncol = 2, labels = c("B", "C")),
  nrow = 2,
  labels = "A")
## Bin width defaults to 1/30 of the range of the data. Pick better value with `binwidth`.
figure2

Okay… This looks really good, but you’ll notice that there are two legends that are the same.

ggarrange(
  bxp, dp, labels = c("A", "B"),
  common.legend = TRUE, legend = "bottom")
## Bin width defaults to 1/30 of the range of the data. Pick better value with `binwidth`.

Lastly, we should export the plot

ggexport(figure2, filename = "facetfigure.pdf")
## file saved to facetfigure.pdf

We can also export multiple plots to a pdf

ggexport(bxp, dp, lp, filename = "multi.pdf")
## Bin width defaults to 1/30 of the range of the data. Pick better value with `binwidth`.
## file saved to multi.pdf

Lastly, we can export to a pdf with multople pages and multiple columns

ggexport(bxp, dp, lp, bxp, filename = "test2.pdf", nrow =2, ncol = 1)
## Bin width defaults to 1/30 of the range of the data. Pick better value with `binwidth`.
## file saved to test2.pdf

Heatmaps

Let’s get started with heatmaps

#install.packages(heatmap3)
library(heatmap3)

Now, let’s get our data.

data <- ldeaths

data2 <- do.call(cbind, split(data, cycle(data)))
dimnames(data2) <- dimnames(.preformat.ts(data))

Now, let’s generate a heat map

heatmap(data2)

heatmap(data2, Rowv = NA, Colv = NA)

Now, let’s play with the colors

rc <- rainbow(nrow(data2), start = 0, end = 0.3)
cc <- rainbow(ncol(data2), start = 0, end = 0.3)

Now, let’s apply our color selections

heatmap(data2, ColSideColors = cc)

library(RColorBrewer)
heatmap(data2, ColSideColors = cc,
        col = colorRampPalette(brewer.pal(8, "PiYG"))(25))

There’s more that we can customize

library(gplots)
## 
## Attaching package: 'gplots'
## The following object is masked from 'package:plotrix':
## 
##     plotCI
## The following object is masked from 'package:stats':
## 
##     lowess
heatmap(data2, ColSideColors = cc, 
        col = colorRampPalette(brewer.pal(8, "PiYG"))(25))

Exploratory Data Analysis

Outlier Detection

Missing Values

If you encounter an unusual value in your dataset and simply want to move on to the rest of your analysis, you have two options:

Drop the entire row with the strange values:

library(dplyr)
library(ggplot2)

diamonds <- diamonds

diamonds2 <- diamonds %>%
  filter(between(y, 3, 20))

In this instance, y is the width of the diamond, so anything undr 3 mm or above 20 is excluded

I don’t recommend this option, just because there is one bad measurement doesn’t mean they are all bad

Instead, I recommend replacing the unusual values with missing values

diamonds3 <- diamonds %>%
  dplyr::mutate(y = ifelse(y < 3 | y > 20, NA, y))

Like R, ggplot2 subscribe to the idea that missing values shouldn’t pass silently into the night.

ggplot(data = diamonds3, mapping = aes( x = x, y = y)) +
  geom_point()
## Warning: Removed 9 rows containing missing values (geom_point).

If you want to suppress that warning you can use na.rm = TRUE

ggplot(data = diamonds3, mapping = aes(x = x, y = y)) +
  geom_point(na.rm = TRUE)

Other times you want to understand what makes observations with missing values different to the observation with recorded values. For example, in the NYCflights13 dataset, missing values in the dep_time variable indicate that the flight was canceled. So you might want to compare the scheduled departure times for cancelled and non-cancelled times.

Might have to install this package.

BiocManager::install("nycflights13")
## 'getOption("repos")' replaces Bioconductor standard repositories, see
## '?repositories' for details
## 
## replacement repositories:
##     CRAN: https://cloud.r-project.org
## Bioconductor version 3.15 (BiocManager 1.30.18), R 4.2.1 (2022-06-23)
## Warning: package(s) not installed when version(s) same as current; use `force = TRUE` to
##   re-install: 'nycflights13'
## Installation paths not writeable, unable to update packages
##   path: /usr/lib/R/library
##   packages:
##     foreign, MASS, Matrix, mgcv, nlme, nnet, rpart, spatial
## Old packages: 'BiocManager', 'bit', 'brew', 'bslib', 'callr', 'car', 'cli',
##   'commonmark', 'cpp11', 'crayon', 'curl', 'data.table', 'devtools', 'digest',
##   'DT', 'evaluate', 'fontawesome', 'gert', 'ggforce', 'ggraph', 'ggrepel',
##   'ggridges', 'ggsignif', 'ggstance', 'graphlayouts', 'igraph', 'isoband',
##   'jsonlite', 'knitr', 'labelled', 'limma', 'lme4', 'lubridate', 'maps',
##   'maptools', 'markdown', 'MatrixModels', 'matrixStats', 'minqa', 'modelr',
##   'mosaic', 'mosaicCore', 'openssl', 'pkgload', 'plotly', 'plyr', 'polyclip',
##   'processx', 'ps', 'purrr', 'ragg', 'raster', 'RcppArmadillo', 'RcppEigen',
##   'RCurl', 'readr', 'rmarkdown', 'RMySQL', 'roxygen2', 'rsconnect', 'RSQLite',
##   'sass', 'shiny', 'sp', 'sys', 'terra', 'testthat', 'tidyselect', 'tinytex',
##   'tm', 'tokenizers', 'vroom', 'widyr', 'xfun', 'XML', 'xts', 'yaml', 'zip',
##   'zoo'
library(nycflights13)

nycflights13::flights %>%
  dplyr::mutate(
    cancelled = is.na(dep_time),
    sched_hour = sched_dep_time %/% 100,
    sched_min = sched_dep_time %% 100, 
    sched_dep_time = sched_hour + sched_min / 60
  ) %>%
  ggplot(mapping = aes(sched_dep_time)) +
  geom_freqpoly(mapping = aes(color = cancelled), binwidth = 1/4)

Outliers

What if we want to know what our outliers are?

First, we need to load the required libraries

library(outliers)
library(ggplot2)

And let’s load our packages

library(readr)
library(readxl)
library(outliers)
library(RCurl)
## 
## Attaching package: 'RCurl'
## The following object is masked from 'package:tidyr':
## 
##     complete
library(dplyr)

And reload the dataset because we removed outliers

Air_data <- read_excel("AirQualityUCI.xlsx")

Let’s create a function using the grubb test to identify all outliers. The grubbs test identifies outliers in a univariate dataset that is presumed. To come from a normal distribution.

grubbs.flag <- function(x) {
  # lets create a variable called outliers and save nothing in it, we'll add to the variable 
  #as we identify them
  outliers <- NULL
  # We'll create a variable called test to idenitfy which univariate we are testing
  test <- x
  # now using the outliers package, use grubbs.test to find outliers in our variable
  grubbs.result <- grubbs.test(test)
  # lets get the p-values of all tested variables
  pv <- grubbs.result$p.value
  # now lets search through our p-values for ones that are outside of 0.5
  while(pv < 0.05) {
    # anything with a p-value greater than p = 0.05, we add to our empty outliers vector
    outliers <- c(outliers, as.numeric(strsplit(grubbs.result$alternative, " ")[[1]][[3]]))
    # now we want to remove those outliers from our test variable
    test <- x[!x %in% outliers]
    # and run the grubbs test again without the outliers
    grubbs.result <- grubbs.test(test)
    # and save the new p-values
    pv <- grubbs.result$p.value
  }
  return(data.frame(x = x, Outliers = (x %in% outliers)))
}

Let’s create the function

identified_outliers <- grubbs.flag(Air_data$AH)

Now we can create a histogram showing where the outliers were

ggplot(grubbs.flag(Air_data$AH), aes(x = Air_data$AH, color = Outliers, fill = Outliers)) +
  geom_histogram(binwidth = diff(range(Air_data$AH))) +
  theme_bw()

Covariance

First, let’s load our required packages.

ggplot(data = diamonds, mapping = aes(x= price)) +
  geom_freqpoly(mapping = aes(color = cut), binwidth = 500)

It’s hard to see the difference in distribution because the counts differ so much.

ggplot(diamonds) +
  geom_bar(mapping = aes(x = cut))

To make the comparison easier, we need to swap the display on the y-axis. Instead of displaying count, we’ll display density, which is the count standardized so that the area under the curve is one.

ggplot(data = diamonds, mapping = aes(x = price, y = ..density..)) +
  geom_freqpoly(mapping = aes(color = cut), binwidth = 500)

It appears the fair diamonds (the lowest cut quality) have the highest average price. But maybe that’s because frequency Polygons are a little hard to interpret.

Another alternative is the boxplot. A boxplot is a type of visual shorthand for a distribution of values.

ggplot(data = diamonds, mapping = aes(x = cut, y = price)) +
  geom_boxplot()

We see much less information about the distribution, but the boxplots are much more compact, so we can more easily Compare them. It supports the counterintuitive finding that better quality diamonds are cheaper on average! Let’s look at some car data

ggplot(data = mpg, mapping = aes(x = class, y = hwy)) +
  geom_boxplot()

Let’s plot the data.

ggplot(data = mpg) +
  geom_boxplot(mapping = aes(x = reorder(class, hwy, FUN = median), y = hwy))

If you have long variable names, you can switch the axis and flip it 90 degrees.

ggplot(data = mpg) +
  geom_boxplot(mapping = aes(x = reorder(class, hwy, FUN = median), y = hwy)) +
  coord_flip()

To visualize the correlation between two continuous variables, we can use a scatter plot.

ggplot(data = diamonds) +
  geom_point(mapping = aes(x = carat, y = price))

Scatterplots become less useful as the size of your dataset grows, because we get overplot. We can fix this using the alpha aesthetic

ggplot(data = diamonds) +
  geom_point(mapping = aes(x = carat, y = price), alpha = 1/100)

Exploratory Statistics

Exploratory Data Analysis

First let’s load a required library

library(RCurl)
library(dplyr)

Now, let’s get our data

site <- "https://raw.githubusercontent.com/nytimes/covid-19-data/master/colleges/colleges.csv"

College_Data <- read.csv(site)

First, let’s use the str function, this shows the structure of the graph

str(College_Data)
## 'data.frame':    1948 obs. of  9 variables:
##  $ date      : chr  "2021-05-26" "2021-05-26" "2021-05-26" "2021-05-26" ...
##  $ state     : chr  "Alabama" "Alabama" "Alabama" "Alabama" ...
##  $ county    : chr  "Madison" "Montgomery" "Limestone" "Lee" ...
##  $ city      : chr  "Huntsville" "Montgomery" "Athens" "Auburn" ...
##  $ ipeds_id  : chr  "100654" "100724" "100812" "100858" ...
##  $ college   : chr  "Alabama A&M University" "Alabama State University" "Athens State University" "Auburn University" ...
##  $ cases     : int  41 2 45 2742 220 4 263 137 49 76 ...
##  $ cases_2021: int  NA NA 10 567 80 NA 49 53 10 35 ...
##  $ notes     : chr  "" "" "" "" ...

What if we want to arrange our dataset alphabetically by college?

alphabetical <- College_Data %>%
  arrange(College_Data$college)

The glimpse package is another way to preview data.

glimpse(College_Data)
## Rows: 1,948
## Columns: 9
## $ date       <chr> "2021-05-26", "2021-05-26", "2021-05-26", "2021-05-26", "20…
## $ state      <chr> "Alabama", "Alabama", "Alabama", "Alabama", "Alabama", "Ala…
## $ county     <chr> "Madison", "Montgomery", "Limestone", "Lee", "Montgomery", …
## $ city       <chr> "Huntsville", "Montgomery", "Athens", "Auburn", "Montgomery…
## $ ipeds_id   <chr> "100654", "100724", "100812", "100858", "100830", "102429",…
## $ college    <chr> "Alabama A&M University", "Alabama State University", "Athe…
## $ cases      <int> 41, 2, 45, 2742, 220, 4, 263, 137, 49, 76, 67, 0, 229, 19, …
## $ cases_2021 <int> NA, NA, 10, 567, 80, NA, 49, 53, 10, 35, 5, NA, 10, NA, 19,…
## $ notes      <chr> "", "", "", "", "", "", "", "", "", "", "", "", "", "", "",…

We can also subset with select()

College_Cases <- select(College_Data, college, cases)

We can also filter or subset with the filter function

Louisiana_Cases <- filter(College_Data, state == "Louisiana")

Let’s filter out a smaller amount of states

South_Cases <- filter(College_Data, state == "Louisiana" | state == "Texas" | state == "Arkansas" | state == "Mississippi")

Let’s look at some time series data.

First, we’ll load the required libraries

library(lubridate)
## 
## Attaching package: 'lubridate'
## The following objects are masked from 'package:base':
## 
##     date, intersect, setdiff, union
library(dplyr)
library(ggplot2)
library(gridExtra)
## 
## Attaching package: 'gridExtra'
## The following object is masked from 'package:dplyr':
## 
##     combine
library(scales)
## 
## Attaching package: 'scales'
## The following object is masked from 'package:readr':
## 
##     col_factor
## The following object is masked from 'package:plotrix':
## 
##     rescale
## The following object is masked from 'package:viridis':
## 
##     viridis_pal
state_site <- 'https://raw.githubusercontent.com/nytimes/covid-19-data/master/us-states.csv'

State_Data <- read.csv(state_site)

Now, let’s load some data

Let’s create group_by object using the state column

state_cases <- group_by(State_Data, state)

class(state_cases)
## [1] "grouped_df" "tbl_df"     "tbl"        "data.frame"

How many measurements were made by state? This gives us a idea of when states started reporting.

Days_since_first_reported <- tally(state_cases)

Let’s visualize some data

First, let’s start off with some definition

Data – obvious – the stuff we want to visualize Layer – made of geometric elements and requisite statistical information. Include geometic objects, which represents the plot

Scales – used to map values in the data space that is used for creation of values (color, size, shape, etc)

Coordinate system – describes how the data coordinates are mapped together in relation to the plane on the graphic

Faceting – how to break up data into subsets to display multiple types or groups of data

Theme – controls the finer points of the display, such as font, size, and background color

options(repr.plot.width = 6, repr.plot.height = 6)
class(College_Data)
## [1] "data.frame"
head(College_Data)
##         date   state     county       city ipeds_id
## 1 2021-05-26 Alabama    Madison Huntsville   100654
## 2 2021-05-26 Alabama Montgomery Montgomery   100724
## 3 2021-05-26 Alabama  Limestone     Athens   100812
## 4 2021-05-26 Alabama        Lee     Auburn   100858
## 5 2021-05-26 Alabama Montgomery Montgomery   100830
## 6 2021-05-26 Alabama     Walker     Jasper   102429
##                           college cases cases_2021 notes
## 1          Alabama A&M University    41         NA      
## 2        Alabama State University     2         NA      
## 3         Athens State University    45         10      
## 4               Auburn University  2742        567      
## 5 Auburn University at Montgomery   220         80      
## 6  Bevill State Community College     4         NA
summary(College_Data)
##      date              state              county              city          
##  Length:1948        Length:1948        Length:1948        Length:1948       
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##                                                                             
##                                                                             
##                                                                             
##                                                                             
##    ipeds_id           college              cases          cases_2021    
##  Length:1948        Length:1948        Min.   :   0.0   Min.   :   0.0  
##  Class :character   Class :character   1st Qu.:  32.0   1st Qu.:  23.0  
##  Mode  :character   Mode  :character   Median : 114.5   Median :  65.0  
##                                        Mean   : 363.5   Mean   : 168.1  
##                                        3rd Qu.: 303.0   3rd Qu.: 159.0  
##                                        Max.   :9914.0   Max.   :3158.0  
##                                                         NA's   :337     
##     notes          
##  Length:1948       
##  Class :character  
##  Mode  :character  
##                    
##                    
##                    
## 

Now, let’s look at a different dataset

iris <- as.data.frame(iris)

class(iris)
## [1] "data.frame"
head(iris)
##   Sepal.Length Sepal.Width Petal.Length Petal.Width Species
## 1          5.1         3.5          1.4         0.2  setosa
## 2          4.9         3.0          1.4         0.2  setosa
## 3          4.7         3.2          1.3         0.2  setosa
## 4          4.6         3.1          1.5         0.2  setosa
## 5          5.0         3.6          1.4         0.2  setosa
## 6          5.4         3.9          1.7         0.4  setosa
summary(iris)
##   Sepal.Length    Sepal.Width     Petal.Length    Petal.Width   
##  Min.   :4.300   Min.   :2.000   Min.   :1.000   Min.   :0.100  
##  1st Qu.:5.100   1st Qu.:2.800   1st Qu.:1.600   1st Qu.:0.300  
##  Median :5.800   Median :3.000   Median :4.350   Median :1.300  
##  Mean   :5.843   Mean   :3.057   Mean   :3.758   Mean   :1.199  
##  3rd Qu.:6.400   3rd Qu.:3.300   3rd Qu.:5.100   3rd Qu.:1.800  
##  Max.   :7.900   Max.   :4.400   Max.   :6.900   Max.   :2.500  
##        Species  
##  setosa    :50  
##  versicolor:50  
##  virginica :50  
##                 
##                 
## 

Let’s start by creating a scatterplot of College Data

ggplot(data = College_Data, aes(x = cases, y = cases_2021)) +
  geom_point() +
  theme_minimal()
## Warning: Removed 337 rows containing missing values (geom_point).

Now, let’s do the iris data

ggplot(data = iris, aes(x = Sepal.Width, y = Sepal.Length)) +
  geom_point() +
  theme_minimal()

Let’s color coordinate our college data

ggplot(data = College_Data, aes(x = cases, y = cases_2021, color = state)) +
  geom_point() +
  theme_minimal()
## Warning: Removed 337 rows containing missing values (geom_point).

Let’s color coordinate the iris data

ggplot(data = iris, aes(x = Sepal.Width, y = Sepal.Length, color = Species)) +
  geom_point() +
  theme_minimal()

Let’s run a single histogram of our Louisiana Case Data

hist(Louisiana_Cases$cases, freq = NULL, density = NULL, breaks = 10, xlab = "Total Cases", ylab = "Frequency", 
     main = "Total College Covid-19 Infections (Louisiana)")

Let’s run a simple histogram for the Iris Data

hist(iris$Sepal.Width, freq = NULL, density = NULL, breaks = 10, xlab = "Sepal Width",
     ylab = "Frequency", main = "Iris Sepal Width")

Let’s plot our data.

histogram_college <- ggplot(data = Louisiana_Cases, aes(x = cases))

histogram_college + geom_histogram(bindwidth = 100, color = "black", aes(fill = county))+
  xlab("cases") + ylab("Frequency") + ggtitle("Histogram of Covid-19 Cases in Louisiana")
## Warning: Ignoring unknown parameters: bindwidth
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

Let’s create a ggplot for the IRIS data

histogram_iris <- ggplot(data = iris, aes(x = Sepal.Width))

histogram_iris + geom_histogram(bindwidth = 0.2, color = "black", aes(fill = Species)) +
  xlab("sepal Width") + ylab("Frequency") +ggtitle("Histogram Iris Sepal Width by Species")
## Warning: Ignoring unknown parameters: bindwidth
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

Maybe a density plot makes more sense for our college data.

ggplot(South_Cases) +
  geom_density(aes(x = cases, fill = state), alpha = 0.50)

Let’s do it with the iris data.

ggplot(iris) + 
  geom_density(aes(x = Sepal.Width, fill = Species), alpha = 0.25)

Let’s look at violin plots for iris data.

ggplot(data = iris, aes(x = Species, y = Sepal.Length, color = Species)) +
  geom_violin() +
  theme_classic() +
  theme(legend.position = "none")

Now let’s try the South Data

ggplot(data = South_Cases, aes(x = state, y = cases, color = state)) +
  geom_violin() +
  theme_gray() +
  theme(legend.position = "none")

Now, let’s take a look at residual plots. This is a graph that displays the residuals on the vertical axis, and the independent variable on the horizontal. In the event that the points in a residual plot are dispersed in a random manner around the horizontal axis, it is appropriate to use a linear regression. If they are not randomly dispersed, a non-linear model is more appropriate.

Let’s start with the iris data.

ggplot(lm(Sepal.Length ~ Sepal.Width, data = iris)) +
  geom_point(aes(x = .fitted, y = .resid))

Now, let’s look at the Southern States cases.

ggplot(lm(cases ~ cases_2021, data = South_Cases)) +
  geom_point(aes(x = .fitted, y = .resid))

A linear model is not a good call for the state cases. Now, let’s use some correlations.

obesity <- read.csv("Obesity_insurance.csv")

Let’s load the required packages.

library(tidyr)
library(dplyr)

Let’s look at the structure of the dataset.

str(obesity)
## 'data.frame':    1338 obs. of  7 variables:
##  $ age     : int  19 18 28 33 32 31 46 37 37 60 ...
##  $ sex     : chr  "female" "male" "male" "male" ...
##  $ bmi     : num  27.9 33.8 33 22.7 28.9 ...
##  $ children: int  0 1 3 0 0 0 1 3 2 0 ...
##  $ smoker  : chr  "yes" "no" "no" "no" ...
##  $ region  : chr  "southwest" "southeast" "southeast" "northwest" ...
##  $ charges : num  16885 1726 4449 21984 3867 ...

Let’s look at the column classes

class(obesity)
## [1] "data.frame"

And get a summary of distribution of the variables.

summary(obesity)
##       age            sex                 bmi           children    
##  Min.   :18.00   Length:1338        Min.   :15.96   Min.   :0.000  
##  1st Qu.:27.00   Class :character   1st Qu.:26.30   1st Qu.:0.000  
##  Median :39.00   Mode  :character   Median :30.40   Median :1.000  
##  Mean   :39.21                      Mean   :30.66   Mean   :1.095  
##  3rd Qu.:51.00                      3rd Qu.:34.69   3rd Qu.:2.000  
##  Max.   :64.00                      Max.   :53.13   Max.   :5.000  
##     smoker             region             charges     
##  Length:1338        Length:1338        Min.   : 1122  
##  Class :character   Class :character   1st Qu.: 4740  
##  Mode  :character   Mode  :character   Median : 9382  
##                                        Mean   :13270  
##                                        3rd Qu.:16640  
##                                        Max.   :63770

Now, let’s look at the distribution for insurance charges.

hist(obesity$charges)

We can also get an idea of the distribution using a boxplot.

boxplot(obesity$charges)

boxplot(obesity$bmi)

Now, let’s look at correlation. The cor() command is used to determine correlation between two vectors, all of the columns of a data frame, or two data frames. The cov() command, on the otherhand, examines the covariance. The cor.test() command carries out a test as to the significance of the correlation.

cor(obesity$charges, obesity$bmi)
## [1] 0.198341

This test uses a spearman Rho correlation, or you can use Kendall’s tau by specifying it

cor(obesity$charges, obesity$bmi, method = 'kendall')
## [1] 0.08252397

This correlation measures strength of a correlation between -1 and 1.

Now, let’s look at the Tietjen=Moore test. This is used for the univariate datasets. The algorithm depicts the detection of the outliers in a univariate dataset.

TietjenMoore <- function(dataSeries, k)
{
  n = length(dataSeries)
  # Compute the absolute residuals
  r = abs(dataSeries - mean(dataSeries))
  # Sort data according to size of residual
  df = data.frame(dataSeries, r)
  dfs = df[order(df$r),]
  # Create a subset of the data without the largest values.
  klarge = c((n-k+1):n)
  subdataSeries = dfs$dataSeries[-klarge]
  # Compute the sums of squares
  ksub = (subdataSeries - mean(subdataSeries)) **2
  all = (df$dataSeries - mean(df$dataSeries)) **2
  # Compute the test statistic.
  sum(ksub)/sum(all)
  
}

This function helps to compute the absolute residuals and sorts data, according to the size of the residuals. Later, we will focus on the computation of sum of squares.

FindOutliersTietjenMooreTest <- function(dataSeries, k, alpha = 0.5){
  ek <- TietjenMoore(dataSeries, k)
  # Compute critical values based on simulation.
  test = c(1:10000)
  for (i in 1:10000){
    dataSeriesdataSeries = rnorm(length(dataSeries))
    test[i] = TietjenMoore(dataSeriesdataSeries, k)}
  Talpha = quantile(test, alpha)
  list(T = ek, Talpha = Talpha)
  
}

This function helps us to compute the critical values based on simulation data. Now lets demonstrate these functions with sample data and the obesity dataset for evaluating this algorithm. The critical region for the Tietjen-Moore test is determined by simulation. The simulation is performed by generating the standard normal random sample of size n and computing the Tietjen Moore test statistic. Typically, 10,000 random samples are used. The values of the Tietjen-Moore statistic obtained from the data is compared to this reference distribution. The values of the test statistic is between zero and one. If there are no outliers in the data, the test statistic is close to 1. If there are outliers, the test statistic will be closer to zero. Thus, the test is always a lower, one-tailed test regardless of which test statistic is used, Lk or Ek. First we will look at charges.

boxplot(obesity$charges)

FindOutliersTietjenMooreTest(obesity$charges, 100)
## $T
## [1] 0.4556033
## 
## $Talpha
##       50% 
## 0.6350056

Let’s check out bmi

boxplot(obesity$bmi)

FindOutliersTietjenMooreTest(obesity$bmi, 7)
## $T
## [1] 0.9475628
## 
## $Talpha
##      50% 
## 0.950515

Probability Plots

library(ggplot2)
library(tigerstats)
## Loading required package: abd
## Loading required package: nlme
## 
## Attaching package: 'nlme'
## The following object is masked from 'package:dplyr':
## 
##     collapse
## Loading required package: lattice
## Loading required package: grid
## Loading required package: mosaic
## Registered S3 method overwritten by 'mosaic':
##   method                           from   
##   fortify.SpatialPolygonsDataFrame ggplot2
## 
## The 'mosaic' package masks several functions from core packages in order to add 
## additional features.  The original behavior of these functions should not be affected by this.
## 
## Attaching package: 'mosaic'
## The following object is masked from 'package:Matrix':
## 
##     mean
## The following object is masked from 'package:scales':
## 
##     rescale
## The following object is masked from 'package:plotrix':
## 
##     rescale
## The following object is masked from 'package:plotly':
## 
##     do
## The following objects are masked from 'package:dplyr':
## 
##     count, do, tally
## The following object is masked from 'package:ggplot2':
## 
##     stat
## The following objects are masked from 'package:stats':
## 
##     binom.test, cor, cor.test, cov, fivenum, IQR, median, prop.test,
##     quantile, sd, t.test, var
## The following objects are masked from 'package:base':
## 
##     max, mean, min, prod, range, sample, sum
## Welcome to tigerstats!
## To learn more about this package, consult its website:
##  http://homerhanumat.github.io/tigerstats

We will use the probability plot function and their output dnorm: density function of the normal distribution. Using the density, it is possible to determine the probability of events. Or, for example, you may wonder “What is the likelihood that a person has an IQ of exactly 140? In this case, you would need to retrieve the density of the IQ distribution at values 140. The IQ distribution can be modeled with a mean of 100 and a standard deviation of 15. The corresponding density is:

bmi.mean <- mean(obesity$bmi)
bmi.sd <- sd(obesity$bmi)

Let’s create a plot of our normal distribution

bmi.dist <- dnorm(obesity$bmi, mean = bmi.mean, sd = bmi.sd)
bmi.df <- data.frame("bmi" = obesity$bmi, "Density" = bmi.dist)

ggplot(bmi.df, aes(x = bmi, y = Density)) +
  geom_point()

This gives us the probability of every single point occurring. Now, let’s use the pnorm function for more info.

bmi.dist <- pnorm(obesity$bmi, mean = bmi.mean, sd = bmi.sd)
bmi.df <- data.frame("bmi" = obesity$bmi, "Density" = bmi.dist)

ggplot(bmi.df, aes(x = bmi, y = Density)) +
  geom_point()

What if we want to find the probability of the bmi being greater than 40 in our distribution?

pp_greater <- function(x) {
  paste(round(100 * pnorm(x,, mean = 30.66339, sd = 6.09818, lower.tail = FALSE), 2), "%")
}

pp_greater(40)
## [1] "6.29 %"
pnormGC(40, region = "above", mean = 30.66339, sd = 6.09818, graph = TRUE)

## [1] 0.06287869

What about the probability that bmi is less than 40 in our population?

pp_less <- function(x) {
  paste(round(100 * (1-pnorm(x, mean = 30.66339, sd = 6.09818, lower.tail = FALSE)), 2), "%")
}

pp_less(40)
## [1] "93.71 %"
pnormGC(40, region = "below", mean = 30.66339, sd = 6.09818, graph = TRUE)

## [1] 0.9371213

What if we want to find the area in between?

pnormGC(c(20, 40), region = "between", mean = 30.66339, sd = 6.09818, graph = TRUE)

## [1] 0.8969428

What if we want to know the qnorm? Let’s use the pnorm function. We need to assume a normal distribution for this. What bmi represents the lowest 1% of the population?

qnorm(0.01, mean = 30.6639, sd= 6.09818, lower.tail = TRUE)
## [1] 16.47741

What if you want a random sampling of values within your distribution?

subset <- rnorm(50, mean = 30.6639, sd = 6.09818)

hist(subset)

subset2 <- rnorm(50000, mean = 30.6639, sd = 6.09818)

hist(subset2)

Shapiro-Wilk Test So, now we know how to generate a normal distribution, how do we tell if our samples Came from a normal distribution?

shapiro.test(obesity$charges[1:5])
## 
##  Shapiro-Wilk normality test
## 
## data:  obesity$charges[1:5]
## W = 0.84164, p-value = 0.1695

You can see here, with a small sample size, we would reject the null hypothesis that the samples came from a normal distribution. We can increase the power of the test by increasing the sample size.

shapiro.test(obesity$charges[1:1000])
## 
##  Shapiro-Wilk normality test
## 
## data:  obesity$charges[1:1000]
## W = 0.8119, p-value < 2.2e-16

Now, let’s check out age.

shapiro.test(obesity$age[1:1000])
## 
##  Shapiro-Wilk normality test
## 
## data:  obesity$age[1:1000]
## W = 0.94406, p-value < 2.2e-16

And lastly bmi.

shapiro.test(obesity$bmi[1:1000])
## 
##  Shapiro-Wilk normality test
## 
## data:  obesity$bmi[1:1000]
## W = 0.99471, p-value = 0.001426

Here is the time series data. First, let’s load our packages.

library(readr)
library(readxl)

Air_data <- read_xlsx("AirQualityUCI.xlsx")

Date- date of measurement Time – time of measurement CO(GT) – average hourly CO2 PT08,s1(CO) – tin oxide hourly average sensor response NMHC – average hourly non-metallic hydrocarbon concentration C6HC – average benzene concentration PT08.S3)NMHC) – titania average hourly sensor response NOX – average hourly NOX concentration NO2 – average hourly NO2 concentration T – temperature RH – relative humidity AH – absolute humidity Now, let’s load the data

str(Air_data)
## tibble [9,357 × 15] (S3: tbl_df/tbl/data.frame)
##  $ Date         : POSIXct[1:9357], format: "2004-03-10" "2004-03-10" ...
##  $ Time         : POSIXct[1:9357], format: "1899-12-31 18:00:00" "1899-12-31 19:00:00" ...
##  $ CO(GT)       : num [1:9357] 2.6 2 2.2 2.2 1.6 1.2 1.2 1 0.9 0.6 ...
##  $ PT08.S1(CO)  : num [1:9357] 1360 1292 1402 1376 1272 ...
##  $ NMHC(GT)     : num [1:9357] 150 112 88 80 51 38 31 31 24 19 ...
##  $ C6H6(GT)     : num [1:9357] 11.88 9.4 9 9.23 6.52 ...
##  $ PT08.S2(NMHC): num [1:9357] 1046 955 939 948 836 ...
##  $ NOx(GT)      : num [1:9357] 166 103 131 172 131 89 62 62 45 -200 ...
##  $ PT08.S3(NOx) : num [1:9357] 1056 1174 1140 1092 1205 ...
##  $ NO2(GT)      : num [1:9357] 113 92 114 122 116 96 77 76 60 -200 ...
##  $ PT08.S4(NO2) : num [1:9357] 1692 1559 1554 1584 1490 ...
##  $ PT08.S5(O3)  : num [1:9357] 1268 972 1074 1203 1110 ...
##  $ T            : num [1:9357] 13.6 13.3 11.9 11 11.2 ...
##  $ RH           : num [1:9357] 48.9 47.7 54 60 59.6 ...
##  $ AH           : num [1:9357] 0.758 0.725 0.75 0.787 0.789 ...
library(tidyr)
library(dplyr)
library(lubridate)
library(hms)
## 
## Attaching package: 'hms'
## The following object is masked from 'package:lubridate':
## 
##     hms
library(ggplot2)

Let’s get rid of the date in the time column

Air_data$Time <- as_hms(Air_data$Time)

glimpse(Air_data)
## Rows: 9,357
## Columns: 15
## $ Date            <dttm> 2004-03-10, 2004-03-10, 2004-03-10, 2004-03-10, 2004-…
## $ Time            <time> 18:00:00, 19:00:00, 20:00:00, 21:00:00, 22:00:00, 23:…
## $ `CO(GT)`        <dbl> 2.6, 2.0, 2.2, 2.2, 1.6, 1.2, 1.2, 1.0, 0.9, 0.6, -200…
## $ `PT08.S1(CO)`   <dbl> 1360.00, 1292.25, 1402.00, 1375.50, 1272.25, 1197.00, …
## $ `NMHC(GT)`      <dbl> 150, 112, 88, 80, 51, 38, 31, 31, 24, 19, 14, 8, 16, 2…
## $ `C6H6(GT)`      <dbl> 11.881723, 9.397165, 8.997817, 9.228796, 6.518224, 4.7…
## $ `PT08.S2(NMHC)` <dbl> 1045.50, 954.75, 939.25, 948.25, 835.50, 750.25, 689.5…
## $ `NOx(GT)`       <dbl> 166, 103, 131, 172, 131, 89, 62, 62, 45, -200, 21, 16,…
## $ `PT08.S3(NOx)`  <dbl> 1056.25, 1173.75, 1140.00, 1092.00, 1205.00, 1336.50, …
## $ `NO2(GT)`       <dbl> 113, 92, 114, 122, 116, 96, 77, 76, 60, -200, 34, 28, …
## $ `PT08.S4(NO2)`  <dbl> 1692.00, 1558.75, 1554.50, 1583.75, 1490.00, 1393.00, …
## $ `PT08.S5(O3)`   <dbl> 1267.50, 972.25, 1074.00, 1203.25, 1110.00, 949.25, 73…
## $ T               <dbl> 13.600, 13.300, 11.900, 11.000, 11.150, 11.175, 11.325…
## $ RH              <dbl> 48.875, 47.700, 53.975, 60.000, 59.575, 59.175, 56.775…
## $ AH              <dbl> 0.7577538, 0.7254874, 0.7502391, 0.7867125, 0.7887942,…

Let’s plot the data

plot(Air_data$AH, Air_data$RH, main = "Humidity Analysis", xlab = "Absolute Humidity", ylab = "Relative Humidity")

Notice that we have an outlier in our data.

t.test(Air_data$RH, Air_data$AH)
## 
##  Welch Two Sample t-test
## 
## data:  Air_data$RH and Air_data$AH
## t = 69.62, df = 17471, p-value < 2.2e-16
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
##  45.01707 47.62536
## sample estimates:
## mean of x mean of y 
## 39.483611 -6.837604

Sentiment Analysis

Text Mining

Text Mining Analysis

First, we will look at the unnest_token function. Let’s start by looking at an Emily Dickinson passage.

text <- c("Because I could not stop from Death - ",
          "He kindly stopped for me - ", 
          "The Carriage held but just ourselves - ", 
          "and Immortality")

text
## [1] "Because I could not stop from Death - " 
## [2] "He kindly stopped for me - "            
## [3] "The Carriage held but just ourselves - "
## [4] "and Immortality"

This is a typical character vector that we might want to analyze. In order to turn it into a tidytext dataset, we first need to put it into a dataframe.

library(dplyr)

text_df <- tibble(line = 1:4, text = text)
text_df
## # A tibble: 4 × 2
##    line text                                     
##   <int> <chr>                                    
## 1     1 "Because I could not stop from Death - " 
## 2     2 "He kindly stopped for me - "            
## 3     3 "The Carriage held but just ourselves - "
## 4     4 "and Immortality"

Reminder: A tibble is modern class of dataframe within R. It is available within the dplyr and tibble packages, that has a convenient print method, will not convert strings to factors, and does not use row names. Tibbles are great for use with tidy tools. Next, we will use the “unnest_tokens” function. First, we have the output column name that will be created as the text as unnested into it.

library(tidytext)

text_df %>%
  unnest_tokens(word, text)
## # A tibble: 20 × 2
##     line word       
##    <int> <chr>      
##  1     1 because    
##  2     1 i          
##  3     1 could      
##  4     1 not        
##  5     1 stop       
##  6     1 from       
##  7     1 death      
##  8     2 he         
##  9     2 kindly     
## 10     2 stopped    
## 11     2 for        
## 12     2 me         
## 13     3 the        
## 14     3 carriage   
## 15     3 held       
## 16     3 but        
## 17     3 just       
## 18     3 ourselves  
## 19     4 and        
## 20     4 immortality

Let’s use the janeaustenr package to analyze Jane Austen texts. There are 6 books in this package.

library(janeaustenr)
library(dplyr)
library(stringr)

original_books <- austen_books() %>%
  group_by(book) %>%
 dplyr:: mutate(linenumber = row_number(),
         chapter = cumsum(str_detect(text, regex("^chapter [\\divxlc]",
                                                 ignore_case = TRUE))))%>%
  ungroup()

original_books
## # A tibble: 73,422 × 4
##    text                    book                linenumber chapter
##    <chr>                   <fct>                    <int>   <int>
##  1 "SENSE AND SENSIBILITY" Sense & Sensibility          1       0
##  2 ""                      Sense & Sensibility          2       0
##  3 "by Jane Austen"        Sense & Sensibility          3       0
##  4 ""                      Sense & Sensibility          4       0
##  5 "(1811)"                Sense & Sensibility          5       0
##  6 ""                      Sense & Sensibility          6       0
##  7 ""                      Sense & Sensibility          7       0
##  8 ""                      Sense & Sensibility          8       0
##  9 ""                      Sense & Sensibility          9       0
## 10 "CHAPTER 1"             Sense & Sensibility         10       1
## # … with 73,412 more rows

To work with this as a tidy dataset, we need to restructure in the one-token-per-row format, which, as we saw earlier, is done with the unnest_tokens() function.

library(tidytext)

tidy_books <- original_books %>%
  unnest_tokens(word, text)

tidy_books
## # A tibble: 725,055 × 4
##    book                linenumber chapter word       
##    <fct>                    <int>   <int> <chr>      
##  1 Sense & Sensibility          1       0 sense      
##  2 Sense & Sensibility          1       0 and        
##  3 Sense & Sensibility          1       0 sensibility
##  4 Sense & Sensibility          3       0 by         
##  5 Sense & Sensibility          3       0 jane       
##  6 Sense & Sensibility          3       0 austen     
##  7 Sense & Sensibility          5       0 1811       
##  8 Sense & Sensibility         10       1 chapter    
##  9 Sense & Sensibility         10       1 1          
## 10 Sense & Sensibility         13       1 the        
## # … with 725,045 more rows

This function uses the tokenizers package to separate each line of text in the original dataframe into tokens. The default tokenizing is for words, but other options, including characters, n-grams, sentences, lines, or paragraphs can be used. Now that the data is a one-word-per-row format, we can manipulate it with tools like dplyr. Often, in a text analysis we will want to remove stop words. Stop words are words that are NOT USEFUL for an analysis. These include words like the, of, to, and, and so forth. We can remove stop words (kept in the tidytext data set “stop_words”) with an anti_join().

data(stop_words)

tidy_books <- tidy_books %>%
  anti_join(stop_words)
## Joining, by = "word"

The stop words data set in the tidy text contains stop words from three lexisons. We can use them all together, as we have here, or filter() to only use one set of stop words if that is more appropriate for your analysis.

tidy_books %>%
  count(word, sort = TRUE)
## # A tibble: 13,914 × 2
##    word       n
##    <chr>  <int>
##  1 miss    1855
##  2 time    1337
##  3 fanny    862
##  4 dear     822
##  5 lady     817
##  6 sir      806
##  7 day      797
##  8 emma     787
##  9 sister   727
## 10 house    699
## # … with 13,904 more rows

Because we have been using tidy tools, our word counts are stored in a tidy dataframe. This allows us to pipe this directly into ggplot2. For example, we can create a visualization of the most common words.

library(ggplot2)

tidy_books %>%
  count(word, sort = TRUE) %>%
  filter(n > 600) %>%
  dplyr::mutate(word = reorder(word, n)) %>%
  ggplot(aes(n, word)) +
  geom_col() +
  labs(y = NULL, x = "word count")

The gutenbergr package: The gutenbergr package: This package provides access to the public domain works from the gutenberg project (www.gutenburg.org). This package includes tools for both downloading books and a complete dataset of project gutenberg metadata that can be used to find works of interest. We will mostly use the function gutenberg_download(). Word Frequencies Lets look at some biology texts, starting with Darwin. The Voyage of the Beagle - 944 On the origin of species by the means of natural selection - 1228 The expression of emotions in man and animals - 1227 The descent of man, and selection in relation to sex - 2300 We can access these words using gutenberg_download() and the Project Gutenberg IDnumbers.

library(gutenbergr)

darwin <- gutenberg_download(c(944, 1227, 1228, 2300), mirror = "https://mirror2.sandyriver.net/pub/gutenberg")

Let’s break these into tokens

tidy_darwin <- darwin %>%
  unnest_tokens(word, text) %>%
  anti_join(stop_words)
## Joining, by = "word"

Let’s check out what the most common Darwin words are

tidy_darwin %>%
  count(word, sort = TRUE)
## # A tibble: 23,630 × 2
##    word          n
##    <chr>     <int>
##  1 species    2998
##  2 male       1672
##  3 males      1337
##  4 animals    1310
##  5 birds      1292
##  6 female     1197
##  7 sexes      1095
##  8 females    1038
##  9 selection  1038
## 10 sexual      801
## # … with 23,620 more rows

Now lets get some work from Thomas Morgan, who is credited with discovering chromosomes. Regeneration - 57198 The genetic and operative evidence relating to secondary sexual characteristics - 57460 Evolution and Adaptation - 63540

morgan <- gutenberg_download(c(57198, 57460, 63540), mirror = "https://mirror2.sandyriver.net/pub/gutenberg")

Let’s tokenize THM

tidy_morgan <- morgan %>%
  unnest_tokens(word, text) %>%
  anti_join(stop_words)
## Joining, by = "word"

What are THM’s most common words?

tidy_morgan %>%
  count(word, sort = TRUE)
## # A tibble: 13,855 × 2
##    word             n
##    <chr>        <int>
##  1 species        869
##  2 regeneration   814
##  3 piece          702
##  4 cut            669
##  5 male           668
##  6 forms          631
##  7 selection      604
##  8 cells          576
##  9 found          552
## 10 development    546
## # … with 13,845 more rows

Lastly, let’s look at Thomas Henry Huxley. Evidence as to mans place in nature - 2931 On the reception of the Origin of Species - 2089 Evolution and Ethics, and other essays - 2940 Science and Culture, and other essays – 52344

huxley <- gutenberg_download(c(2931, 2089, 2940, 52344), mirror = "https://mirror2.sandyriver.net/pub/gutenberg")

Let’s create the function

tidy_huxley <- huxley %>%
  unnest_tokens(word, text) %>%
  anti_join(stop_words)
## Joining, by = "word"

Let’s sort the function

tidy_huxley %>%
  count(word, sort = TRUE)
## # A tibble: 16,090 × 2
##    word          n
##    <chr>     <int>
##  1 species     339
##  2 nature      331
##  3 time        287
##  4 life        286
##  5 existence   255
##  6 knowledge   238
##  7 animals     227
##  8 natural     223
##  9 animal      216
## 10 science     207
## # … with 16,080 more rows

Now, let’s calculate the frequency for each word for the works of Darwin, Morgan, and Huxley by binding the dataframes together.

library(tidyr)

frequency <- bind_rows(dplyr::mutate(tidy_morgan, author = "Thomas Hunt Morgan"), 
                       dplyr::mutate(tidy_darwin, author = "Charles Darwin"), 
                       dplyr::mutate(tidy_huxley, author = "Thomas Henry Huxley")) %>%
  dplyr::mutate(word = str_extract(word, "[a-z']+")) %>%
  count(author, word) %>%
  group_by(author) %>%
  dplyr::mutate(proportion = n/ sum(n)) %>%
  select(-n) %>%
  pivot_wider(names_from = author, values_from = proportion) %>%
  pivot_longer('Thomas Hunt Morgan': 'Charles Darwin', names_to = "author", values_to = "proportion")

frequency
## # A tibble: 95,895 × 3
##    word    author               proportion
##    <chr>   <chr>                     <dbl>
##  1 a       Thomas Hunt Morgan   0.00206   
##  2 a       Thomas Henry Huxley  0.0000856 
##  3 a       Charles Darwin       0.000141  
##  4 ab      Thomas Hunt Morgan   0.000165  
##  5 ab      Thomas Henry Huxley  0.0000978 
##  6 ab      Charles Darwin       0.00000642
##  7 abaiss  Thomas Hunt Morgan  NA         
##  8 abaiss  Thomas Henry Huxley NA         
##  9 abaiss  Charles Darwin       0.00000642
## 10 abandon Thomas Hunt Morgan   0.00000752
## # … with 95,885 more rows

Now, we need to change the table so that each author has its own row.

frequency2 <- pivot_wider(frequency, names_from = author, values_from = proportion)

frequency2
## # A tibble: 31,965 × 4
##    word        `Thomas Hunt Morgan` `Thomas Henry Huxley` `Charles Darwin`
##    <chr>                      <dbl>                 <dbl>            <dbl>
##  1 a                     0.00206                0.0000856       0.000141  
##  2 ab                    0.000165               0.0000978       0.00000642
##  3 abaiss               NA                     NA               0.00000642
##  4 abandon               0.00000752             0.0000122       0.00000321
##  5 abandoned             0.0000150              0.0000245       0.00000321
##  6 abashed              NA                     NA               0.00000321
##  7 abatement            NA                      0.0000245       0.00000321
##  8 abbot                NA                      0.0000245       0.00000321
##  9 abbott               NA                     NA               0.00000642
## 10 abbreviated          NA                     NA               0.0000128 
## # … with 31,955 more rows

Now, let’s plot

library(scales)

ggplot(frequency2, aes(x = `Charles Darwin`, y = `Thomas Hunt Morgan`), color = abs(- 'Charles Darwin' - 'Thomas Hunt Morgan')) +
  geom_abline(color = "gray40", lty = 2) +
  geom_jitter(alpha = 0.1, size = 2.5, width = 0.3, height = 0.3) +
  geom_text(aes(label = word), check_overlap = TRUE, vjust = 1.5) +
  scale_x_log10(labels = percent_format()) +
  scale_y_log10(labels = percent_format()) +
  scale_color_gradient(limits = "darkslategray4", high = "gray75") +
  theme(legend.position = "none") +
  labs(y = "Thomas Hunt Morgan", x = "Charles Darwin")
## Warning: Removed 24513 rows containing missing values (geom_point).
## Warning: Removed 24514 rows containing missing values (geom_text).

Sentiment Analysis

The Sentiments datasets There are a variety of methods and dictionaries that exist for evaluating the opinion or emotion of the text. AFFIN Bing Nrc Bing categorizes words in a binary fashion into positive or negative. Nrc categorizes into positive, negative, anger, anticipation, disgust, fear, joy, sadness, surprise, and trust. AFFIN assigns a score between -5 and 5, with negative indicating negative sentiment, and 5 positive.

The function get_sentiment() allows us to get the specific sentiments lexicon with the measures for each one. Let’s install the package.

BiocManager::install("textdata")
## 'getOption("repos")' replaces Bioconductor standard repositories, see
## '?repositories' for details
## 
## replacement repositories:
##     CRAN: https://cloud.r-project.org
## Bioconductor version 3.15 (BiocManager 1.30.18), R 4.2.1 (2022-06-23)
## Warning: package(s) not installed when version(s) same as current; use `force = TRUE` to
##   re-install: 'textdata'
## Installation paths not writeable, unable to update packages
##   path: /usr/lib/R/library
##   packages:
##     foreign, MASS, Matrix, mgcv, nlme, nnet, rpart, spatial
## Old packages: 'BiocManager', 'bit', 'brew', 'bslib', 'callr', 'car', 'cli',
##   'commonmark', 'cpp11', 'crayon', 'curl', 'data.table', 'devtools', 'digest',
##   'DT', 'evaluate', 'fontawesome', 'gert', 'ggforce', 'ggraph', 'ggrepel',
##   'ggridges', 'ggsignif', 'ggstance', 'graphlayouts', 'igraph', 'isoband',
##   'jsonlite', 'knitr', 'labelled', 'limma', 'lme4', 'lubridate', 'maps',
##   'maptools', 'markdown', 'MatrixModels', 'matrixStats', 'minqa', 'modelr',
##   'mosaic', 'mosaicCore', 'openssl', 'pkgload', 'plotly', 'plyr', 'polyclip',
##   'processx', 'ps', 'purrr', 'ragg', 'raster', 'RcppArmadillo', 'RcppEigen',
##   'RCurl', 'readr', 'rmarkdown', 'RMySQL', 'roxygen2', 'rsconnect', 'RSQLite',
##   'sass', 'shiny', 'sp', 'sys', 'terra', 'testthat', 'tidyselect', 'tinytex',
##   'tm', 'tokenizers', 'vroom', 'widyr', 'xfun', 'XML', 'xts', 'yaml', 'zip',
##   'zoo'

Let’s load the required packages

library(tidytext)
library(textdata)

afinn <- read.csv("affin.csv")

afinn
##         X               word value
## 1       1            abandon    -2
## 2       2          abandoned    -2
## 3       3           abandons    -2
## 4       4           abducted    -2
## 5       5          abduction    -2
## 6       6         abductions    -2
## 7       7              abhor    -3
## 8       8           abhorred    -3
## 9       9          abhorrent    -3
## 10     10             abhors    -3
## 11     11          abilities     2
## 12     12            ability     2
## 13     13             aboard     1
## 14     14           absentee    -1
## 15     15          absentees    -1
## 16     16            absolve     2
## 17     17           absolved     2
## 18     18           absolves     2
## 19     19          absolving     2
## 20     20           absorbed     1
## 21     21              abuse    -3
## 22     22             abused    -3
## 23     23             abuses    -3
## 24     24            abusive    -3
## 25     25             accept     1
## 26     26           accepted     1
## 27     27          accepting     1
## 28     28            accepts     1
## 29     29           accident    -2
## 30     30         accidental    -2
## 31     31       accidentally    -2
## 32     32          accidents    -2
## 33     33         accomplish     2
## 34     34       accomplished     2
## 35     35       accomplishes     2
## 36     36         accusation    -2
## 37     37        accusations    -2
## 38     38             accuse    -2
## 39     39            accused    -2
## 40     40            accuses    -2
## 41     41           accusing    -2
## 42     42               ache    -2
## 43     43         achievable     1
## 44     44             aching    -2
## 45     45             acquit     2
## 46     46            acquits     2
## 47     47          acquitted     2
## 48     48         acquitting     2
## 49     49        acrimonious    -3
## 50     50             active     1
## 51     51           adequate     1
## 52     52             admire     3
## 53     53            admired     3
## 54     54            admires     3
## 55     55           admiring     3
## 56     56              admit    -1
## 57     57             admits    -1
## 58     58           admitted    -1
## 59     59           admonish    -2
## 60     60         admonished    -2
## 61     61              adopt     1
## 62     62             adopts     1
## 63     63           adorable     3
## 64     64              adore     3
## 65     65             adored     3
## 66     66             adores     3
## 67     67           advanced     1
## 68     68          advantage     2
## 69     69         advantages     2
## 70     70          adventure     2
## 71     71         adventures     2
## 72     72        adventurous     2
## 73     73           affected    -1
## 74     74          affection     3
## 75     75       affectionate     3
## 76     76          afflicted    -1
## 77     77          affronted    -1
## 78     78             afraid    -2
## 79     79          aggravate    -2
## 80     80         aggravated    -2
## 81     81         aggravates    -2
## 82     82        aggravating    -2
## 83     83         aggression    -2
## 84     84        aggressions    -2
## 85     85         aggressive    -2
## 86     86             aghast    -2
## 87     87               agog     2
## 88     88            agonise    -3
## 89     89           agonised    -3
## 90     90           agonises    -3
## 91     91          agonising    -3
## 92     92            agonize    -3
## 93     93           agonized    -3
## 94     94           agonizes    -3
## 95     95          agonizing    -3
## 96     96              agree     1
## 97     97          agreeable     2
## 98     98             agreed     1
## 99     99          agreement     1
## 100   100             agrees     1
## 101   101              alarm    -2
## 102   102            alarmed    -2
## 103   103           alarmist    -2
## 104   104          alarmists    -2
## 105   105               alas    -1
## 106   106              alert    -1
## 107   107         alienation    -2
## 108   108              alive     1
## 109   109           allergic    -2
## 110   110              allow     1
## 111   111              alone    -2
## 112   112              amaze     2
## 113   113             amazed     2
## 114   114             amazes     2
## 115   115            amazing     4
## 116   116          ambitious     2
## 117   117         ambivalent    -1
## 118   118              amuse     3
## 119   119             amused     3
## 120   120          amusement     3
## 121   121         amusements     3
## 122   122              anger    -3
## 123   123             angers    -3
## 124   124              angry    -3
## 125   125            anguish    -3
## 126   126          anguished    -3
## 127   127          animosity    -2
## 128   128              annoy    -2
## 129   129          annoyance    -2
## 130   130            annoyed    -2
## 131   131           annoying    -2
## 132   132             annoys    -2
## 133   133       antagonistic    -2
## 134   134               anti    -1
## 135   135       anticipation     1
## 136   136            anxiety    -2
## 137   137            anxious    -2
## 138   138          apathetic    -3
## 139   139             apathy    -3
## 140   140            apeshit    -3
## 141   141        apocalyptic    -2
## 142   142          apologise    -1
## 143   143         apologised    -1
## 144   144         apologises    -1
## 145   145        apologising    -1
## 146   146          apologize    -1
## 147   147         apologized    -1
## 148   148         apologizes    -1
## 149   149        apologizing    -1
## 150   150            apology    -1
## 151   151           appalled    -2
## 152   152          appalling    -2
## 153   153            appease     2
## 154   154           appeased     2
## 155   155           appeases     2
## 156   156          appeasing     2
## 157   157            applaud     2
## 158   158          applauded     2
## 159   159         applauding     2
## 160   160           applauds     2
## 161   161           applause     2
## 162   162         appreciate     2
## 163   163        appreciated     2
## 164   164        appreciates     2
## 165   165       appreciating     2
## 166   166       appreciation     2
## 167   167       apprehensive    -2
## 168   168           approval     2
## 169   169           approved     2
## 170   170           approves     2
## 171   171             ardent     1
## 172   172             arrest    -2
## 173   173           arrested    -3
## 174   174            arrests    -2
## 175   175           arrogant    -2
## 176   176             ashame    -2
## 177   177            ashamed    -2
## 178   178                ass    -4
## 179   179      assassination    -3
## 180   180     assassinations    -3
## 181   181              asset     2
## 182   182             assets     2
## 183   183         assfucking    -4
## 184   184            asshole    -4
## 185   185         astonished     2
## 186   186            astound     3
## 187   187          astounded     3
## 188   188         astounding     3
## 189   189       astoundingly     3
## 190   190           astounds     3
## 191   191             attack    -1
## 192   192           attacked    -1
## 193   193          attacking    -1
## 194   194            attacks    -1
## 195   195            attract     1
## 196   196          attracted     1
## 197   197         attracting     2
## 198   198         attraction     2
## 199   199        attractions     2
## 200   200           attracts     1
## 201   201          audacious     3
## 202   202          authority     1
## 203   203              avert    -1
## 204   204            averted    -1
## 205   205             averts    -1
## 206   206               avid     2
## 207   207              avoid    -1
## 208   208            avoided    -1
## 209   209             avoids    -1
## 210   210              await    -1
## 211   211            awaited    -1
## 212   212             awaits    -1
## 213   213              award     3
## 214   214            awarded     3
## 215   215             awards     3
## 216   216            awesome     4
## 217   217              awful    -3
## 218   218            awkward    -2
## 219   219                axe    -1
## 220   220               axed    -1
## 221   221             backed     1
## 222   222            backing     2
## 223   223              backs     1
## 224   224                bad    -3
## 225   225             badass    -3
## 226   226              badly    -3
## 227   227            bailout    -2
## 228   228          bamboozle    -2
## 229   229         bamboozled    -2
## 230   230         bamboozles    -2
## 231   231                ban    -2
## 232   232             banish    -1
## 233   233           bankrupt    -3
## 234   234           bankster    -3
## 235   235             banned    -2
## 236   236            bargain     2
## 237   237            barrier    -2
## 238   238            bastard    -5
## 239   239           bastards    -5
## 240   240             battle    -1
## 241   241            battles    -1
## 242   242             beaten    -2
## 243   243           beatific     3
## 244   244            beating    -1
## 245   245           beauties     3
## 246   246          beautiful     3
## 247   247        beautifully     3
## 248   248           beautify     3
## 249   249           belittle    -2
## 250   250          belittled    -2
## 251   251            beloved     3
## 252   252            benefit     2
## 253   253           benefits     2
## 254   254         benefitted     2
## 255   255        benefitting     2
## 256   256            bereave    -2
## 257   257           bereaved    -2
## 258   258           bereaves    -2
## 259   259          bereaving    -2
## 260   260               best     3
## 261   261             betray    -3
## 262   262           betrayal    -3
## 263   263           betrayed    -3
## 264   264          betraying    -3
## 265   265            betrays    -3
## 266   266             better     2
## 267   267               bias    -1
## 268   268             biased    -2
## 269   269                big     1
## 270   270              bitch    -5
## 271   271            bitches    -5
## 272   272             bitter    -2
## 273   273           bitterly    -2
## 274   274            bizarre    -2
## 275   275               blah    -2
## 276   276              blame    -2
## 277   277             blamed    -2
## 278   278             blames    -2
## 279   279            blaming    -2
## 280   280              bless     2
## 281   281            blesses     2
## 282   282           blessing     3
## 283   283              blind    -1
## 284   284              bliss     3
## 285   285           blissful     3
## 286   286             blithe     2
## 287   287              block    -1
## 288   288        blockbuster     3
## 289   289            blocked    -1
## 290   290           blocking    -1
## 291   291             blocks    -1
## 292   292             bloody    -3
## 293   293             blurry    -2
## 294   294           boastful    -2
## 295   295               bold     2
## 296   296             boldly     2
## 297   297               bomb    -1
## 298   298              boost     1
## 299   299            boosted     1
## 300   300           boosting     1
## 301   301             boosts     1
## 302   302               bore    -2
## 303   303              bored    -2
## 304   304             boring    -3
## 305   305             bother    -2
## 306   306           bothered    -2
## 307   307            bothers    -2
## 308   308         bothersome    -2
## 309   309            boycott    -2
## 310   310          boycotted    -2
## 311   311         boycotting    -2
## 312   312           boycotts    -2
## 313   313       brainwashing    -3
## 314   314              brave     2
## 315   315       breakthrough     3
## 316   316       breathtaking     5
## 317   317              bribe    -3
## 318   318             bright     1
## 319   319          brightest     2
## 320   320         brightness     1
## 321   321          brilliant     4
## 322   322              brisk     2
## 323   323              broke    -1
## 324   324             broken    -1
## 325   325           brooding    -2
## 326   326            bullied    -2
## 327   327           bullshit    -4
## 328   328              bully    -2
## 329   329           bullying    -2
## 330   330             bummer    -2
## 331   331            buoyant     2
## 332   332             burden    -2
## 333   333           burdened    -2
## 334   334          burdening    -2
## 335   335            burdens    -2
## 336   336               calm     2
## 337   337             calmed     2
## 338   338            calming     2
## 339   339              calms     2
## 340   340        can't stand    -3
## 341   341             cancel    -1
## 342   342          cancelled    -1
## 343   343         cancelling    -1
## 344   344            cancels    -1
## 345   345             cancer    -1
## 346   346            capable     1
## 347   347         captivated     3
## 348   348               care     2
## 349   349           carefree     1
## 350   350            careful     2
## 351   351          carefully     2
## 352   352           careless    -2
## 353   353              cares     2
## 354   354         cashing in    -2
## 355   355           casualty    -2
## 356   356        catastrophe    -3
## 357   357       catastrophic    -4
## 358   358           cautious    -1
## 359   359          celebrate     3
## 360   360         celebrated     3
## 361   361         celebrates     3
## 362   362        celebrating     3
## 363   363             censor    -2
## 364   364           censored    -2
## 365   365            censors    -2
## 366   366            certain     1
## 367   367            chagrin    -2
## 368   368          chagrined    -2
## 369   369          challenge    -1
## 370   370             chance     2
## 371   371            chances     2
## 372   372              chaos    -2
## 373   373            chaotic    -2
## 374   374            charged    -3
## 375   375            charges    -2
## 376   376              charm     3
## 377   377           charming     3
## 378   378          charmless    -3
## 379   379           chastise    -3
## 380   380          chastised    -3
## 381   381          chastises    -3
## 382   382         chastising    -3
## 383   383              cheat    -3
## 384   384            cheated    -3
## 385   385            cheater    -3
## 386   386           cheaters    -3
## 387   387             cheats    -3
## 388   388              cheer     2
## 389   389            cheered     2
## 390   390           cheerful     2
## 391   391           cheering     2
## 392   392          cheerless    -2
## 393   393             cheers     2
## 394   394             cheery     3
## 395   395            cherish     2
## 396   396          cherished     2
## 397   397          cherishes     2
## 398   398         cherishing     2
## 399   399               chic     2
## 400   400           childish    -2
## 401   401           chilling    -1
## 402   402              choke    -2
## 403   403             choked    -2
## 404   404             chokes    -2
## 405   405            choking    -2
## 406   406          clarifies     2
## 407   407            clarity     2
## 408   408              clash    -2
## 409   409             classy     3
## 410   410              clean     2
## 411   411            cleaner     2
## 412   412              clear     1
## 413   413            cleared     1
## 414   414            clearly     1
## 415   415             clears     1
## 416   416             clever     2
## 417   417            clouded    -1
## 418   418           clueless    -2
## 419   419               cock    -5
## 420   420         cocksucker    -5
## 421   421        cocksuckers    -5
## 422   422              cocky    -2
## 423   423            coerced    -2
## 424   424           collapse    -2
## 425   425          collapsed    -2
## 426   426          collapses    -2
## 427   427         collapsing    -2
## 428   428            collide    -1
## 429   429           collides    -1
## 430   430          colliding    -1
## 431   431          collision    -2
## 432   432         collisions    -2
## 433   433          colluding    -3
## 434   434             combat    -1
## 435   435            combats    -1
## 436   436             comedy     1
## 437   437            comfort     2
## 438   438        comfortable     2
## 439   439         comforting     2
## 440   440           comforts     2
## 441   441            commend     2
## 442   442          commended     2
## 443   443             commit     1
## 444   444         commitment     2
## 445   445            commits     1
## 446   446          committed     1
## 447   447         committing     1
## 448   448      compassionate     2
## 449   449          compelled     1
## 450   450          competent     2
## 451   451        competitive     2
## 452   452         complacent    -2
## 453   453           complain    -2
## 454   454         complained    -2
## 455   455          complains    -2
## 456   456      comprehensive     2
## 457   457         conciliate     2
## 458   458        conciliated     2
## 459   459        conciliates     2
## 460   460       conciliating     2
## 461   461            condemn    -2
## 462   462       condemnation    -2
## 463   463          condemned    -2
## 464   464           condemns    -2
## 465   465         confidence     2
## 466   466          confident     2
## 467   467           conflict    -2
## 468   468        conflicting    -2
## 469   469        conflictive    -2
## 470   470          conflicts    -2
## 471   471            confuse    -2
## 472   472           confused    -2
## 473   473          confusing    -2
## 474   474           congrats     2
## 475   475       congratulate     2
## 476   476     congratulation     2
## 477   477    congratulations     2
## 478   478            consent     2
## 479   479           consents     2
## 480   480         consolable     2
## 481   481         conspiracy    -3
## 482   482        constrained    -2
## 483   483          contagion    -2
## 484   484         contagions    -2
## 485   485         contagious    -1
## 486   486           contempt    -2
## 487   487       contemptuous    -2
## 488   488     contemptuously    -2
## 489   489            contend    -1
## 490   490          contender    -1
## 491   491         contending    -1
## 492   492        contentious    -2
## 493   493        contestable    -2
## 494   494      controversial    -2
## 495   495    controversially    -2
## 496   496           convince     1
## 497   497          convinced     1
## 498   498          convinces     1
## 499   499          convivial     2
## 500   500               cool     1
## 501   501         cool stuff     3
## 502   502           cornered    -2
## 503   503             corpse    -1
## 504   504             costly    -2
## 505   505            courage     2
## 506   506         courageous     2
## 507   507          courteous     2
## 508   508           courtesy     2
## 509   509           cover-up    -3
## 510   510             coward    -2
## 511   511           cowardly    -2
## 512   512           coziness     2
## 513   513              cramp    -1
## 514   514               crap    -3
## 515   515              crash    -2
## 516   516            crazier    -2
## 517   517           craziest    -2
## 518   518              crazy    -2
## 519   519           creative     2
## 520   520        crestfallen    -2
## 521   521              cried    -2
## 522   522              cries    -2
## 523   523              crime    -3
## 524   524           criminal    -3
## 525   525          criminals    -3
## 526   526             crisis    -3
## 527   527             critic    -2
## 528   528          criticism    -2
## 529   529          criticize    -2
## 530   530         criticized    -2
## 531   531         criticizes    -2
## 532   532        criticizing    -2
## 533   533            critics    -2
## 534   534              cruel    -3
## 535   535            cruelty    -3
## 536   536              crush    -1
## 537   537            crushed    -2
## 538   538            crushes    -1
## 539   539           crushing    -1
## 540   540                cry    -1
## 541   541             crying    -2
## 542   542               cunt    -5
## 543   543            curious     1
## 544   544              curse    -1
## 545   545                cut    -1
## 546   546               cute     2
## 547   547               cuts    -1
## 548   548            cutting    -1
## 549   549              cynic    -2
## 550   550            cynical    -2
## 551   551           cynicism    -2
## 552   552             damage    -3
## 553   553            damages    -3
## 554   554               damn    -4
## 555   555             damned    -4
## 556   556             damnit    -4
## 557   557             danger    -2
## 558   558          daredevil     2
## 559   559             daring     2
## 560   560            darkest    -2
## 561   561           darkness    -1
## 562   562          dauntless     2
## 563   563               dead    -3
## 564   564           deadlock    -2
## 565   565          deafening    -1
## 566   566               dear     2
## 567   567             dearly     3
## 568   568              death    -2
## 569   569           debonair     2
## 570   570               debt    -2
## 571   571             deceit    -3
## 572   572          deceitful    -3
## 573   573            deceive    -3
## 574   574           deceived    -3
## 575   575           deceives    -3
## 576   576          deceiving    -3
## 577   577          deception    -3
## 578   578           decisive     1
## 579   579          dedicated     2
## 580   580           defeated    -2
## 581   581             defect    -3
## 582   582            defects    -3
## 583   583           defender     2
## 584   584          defenders     2
## 585   585        defenseless    -2
## 586   586              defer    -1
## 587   587          deferring    -1
## 588   588            defiant    -1
## 589   589            deficit    -2
## 590   590            degrade    -2
## 591   591           degraded    -2
## 592   592           degrades    -2
## 593   593         dehumanize    -2
## 594   594        dehumanized    -2
## 595   595        dehumanizes    -2
## 596   596       dehumanizing    -2
## 597   597             deject    -2
## 598   598           dejected    -2
## 599   599          dejecting    -2
## 600   600            dejects    -2
## 601   601              delay    -1
## 602   602            delayed    -1
## 603   603            delight     3
## 604   604          delighted     3
## 605   605         delighting     3
## 606   606           delights     3
## 607   607             demand    -1
## 608   608           demanded    -1
## 609   609          demanding    -1
## 610   610            demands    -1
## 611   611      demonstration    -1
## 612   612        demoralized    -2
## 613   613             denied    -2
## 614   614             denier    -2
## 615   615            deniers    -2
## 616   616             denies    -2
## 617   617           denounce    -2
## 618   618          denounces    -2
## 619   619               deny    -2
## 620   620            denying    -2
## 621   621          depressed    -2
## 622   622         depressing    -2
## 623   623             derail    -2
## 624   624           derailed    -2
## 625   625            derails    -2
## 626   626             deride    -2
## 627   627            derided    -2
## 628   628            derides    -2
## 629   629           deriding    -2
## 630   630           derision    -2
## 631   631          desirable     2
## 632   632             desire     1
## 633   633            desired     2
## 634   634           desirous     2
## 635   635            despair    -3
## 636   636         despairing    -3
## 637   637           despairs    -3
## 638   638          desperate    -3
## 639   639        desperately    -3
## 640   640         despondent    -3
## 641   641            destroy    -3
## 642   642          destroyed    -3
## 643   643         destroying    -3
## 644   644           destroys    -3
## 645   645        destruction    -3
## 646   646        destructive    -3
## 647   647           detached    -1
## 648   648             detain    -2
## 649   649           detained    -2
## 650   650          detention    -2
## 651   651         determined     2
## 652   652          devastate    -2
## 653   653         devastated    -2
## 654   654        devastating    -2
## 655   655            devoted     3
## 656   656            diamond     1
## 657   657               dick    -4
## 658   658           dickhead    -4
## 659   659                die    -3
## 660   660               died    -3
## 661   661          difficult    -1
## 662   662          diffident    -2
## 663   663            dilemma    -1
## 664   664            dipshit    -3
## 665   665               dire    -3
## 666   666            direful    -3
## 667   667               dirt    -2
## 668   668            dirtier    -2
## 669   669           dirtiest    -2
## 670   670              dirty    -2
## 671   671          disabling    -1
## 672   672       disadvantage    -2
## 673   673      disadvantaged    -2
## 674   674          disappear    -1
## 675   675        disappeared    -1
## 676   676         disappears    -1
## 677   677         disappoint    -2
## 678   678       disappointed    -2
## 679   679      disappointing    -2
## 680   680     disappointment    -2
## 681   681    disappointments    -2
## 682   682        disappoints    -2
## 683   683           disaster    -2
## 684   684          disasters    -2
## 685   685         disastrous    -3
## 686   686         disbelieve    -2
## 687   687            discard    -1
## 688   688          discarded    -1
## 689   689         discarding    -1
## 690   690           discards    -1
## 691   691       disconsolate    -2
## 692   692     disconsolation    -2
## 693   693       discontented    -2
## 694   694            discord    -2
## 695   695         discounted    -1
## 696   696        discouraged    -2
## 697   697        discredited    -2
## 698   698            disdain    -2
## 699   699           disgrace    -2
## 700   700          disgraced    -2
## 701   701           disguise    -1
## 702   702          disguised    -1
## 703   703          disguises    -1
## 704   704         disguising    -1
## 705   705            disgust    -3
## 706   706          disgusted    -3
## 707   707         disgusting    -3
## 708   708       disheartened    -2
## 709   709          dishonest    -2
## 710   710      disillusioned    -2
## 711   711        disinclined    -2
## 712   712         disjointed    -2
## 713   713            dislike    -2
## 714   714             dismal    -2
## 715   715           dismayed    -2
## 716   716           disorder    -2
## 717   717       disorganized    -2
## 718   718        disoriented    -2
## 719   719          disparage    -2
## 720   720         disparaged    -2
## 721   721         disparages    -2
## 722   722        disparaging    -2
## 723   723         displeased    -2
## 724   724            dispute    -2
## 725   725           disputed    -2
## 726   726           disputes    -2
## 727   727          disputing    -2
## 728   728       disqualified    -2
## 729   729           disquiet    -2
## 730   730          disregard    -2
## 731   731        disregarded    -2
## 732   732       disregarding    -2
## 733   733         disregards    -2
## 734   734         disrespect    -2
## 735   735       disrespected    -2
## 736   736         disruption    -2
## 737   737        disruptions    -2
## 738   738         disruptive    -2
## 739   739       dissatisfied    -2
## 740   740            distort    -2
## 741   741          distorted    -2
## 742   742         distorting    -2
## 743   743           distorts    -2
## 744   744           distract    -2
## 745   745         distracted    -2
## 746   746        distraction    -2
## 747   747          distracts    -2
## 748   748           distress    -2
## 749   749         distressed    -2
## 750   750         distresses    -2
## 751   751        distressing    -2
## 752   752           distrust    -3
## 753   753        distrustful    -3
## 754   754            disturb    -2
## 755   755          disturbed    -2
## 756   756         disturbing    -2
## 757   757           disturbs    -2
## 758   758          dithering    -2
## 759   759              dizzy    -1
## 760   760            dodging    -2
## 761   761              dodgy    -2
## 762   762      does not work    -3
## 763   763           dolorous    -2
## 764   764          dont like    -2
## 765   765               doom    -2
## 766   766             doomed    -2
## 767   767              doubt    -1
## 768   768            doubted    -1
## 769   769           doubtful    -1
## 770   770           doubting    -1
## 771   771             doubts    -1
## 772   772             douche    -3
## 773   773          douchebag    -3
## 774   774           downcast    -2
## 775   775        downhearted    -2
## 776   776           downside    -2
## 777   777               drag    -1
## 778   778            dragged    -1
## 779   779              drags    -1
## 780   780            drained    -2
## 781   781              dread    -2
## 782   782            dreaded    -2
## 783   783           dreadful    -3
## 784   784           dreading    -2
## 785   785              dream     1
## 786   786             dreams     1
## 787   787             dreary    -2
## 788   788             droopy    -2
## 789   789               drop    -1
## 790   790              drown    -2
## 791   791            drowned    -2
## 792   792             drowns    -2
## 793   793              drunk    -2
## 794   794            dubious    -2
## 795   795                dud    -2
## 796   796               dull    -2
## 797   797               dumb    -3
## 798   798            dumbass    -3
## 799   799               dump    -1
## 800   800             dumped    -2
## 801   801              dumps    -1
## 802   802               dupe    -2
## 803   803              duped    -2
## 804   804        dysfunction    -2
## 805   805              eager     2
## 806   806            earnest     2
## 807   807               ease     2
## 808   808               easy     1
## 809   809           ecstatic     4
## 810   810              eerie    -2
## 811   811               eery    -2
## 812   812          effective     2
## 813   813        effectively     2
## 814   814             elated     3
## 815   815            elation     3
## 816   816            elegant     2
## 817   817          elegantly     2
## 818   818          embarrass    -2
## 819   819        embarrassed    -2
## 820   820        embarrasses    -2
## 821   821       embarrassing    -2
## 822   822      embarrassment    -2
## 823   823         embittered    -2
## 824   824            embrace     1
## 825   825          emergency    -2
## 826   826         empathetic     2
## 827   827          emptiness    -1
## 828   828              empty    -1
## 829   829          enchanted     2
## 830   830          encourage     2
## 831   831         encouraged     2
## 832   832      encouragement     2
## 833   833         encourages     2
## 834   834            endorse     2
## 835   835           endorsed     2
## 836   836        endorsement     2
## 837   837           endorses     2
## 838   838            enemies    -2
## 839   839              enemy    -2
## 840   840          energetic     2
## 841   841             engage     1
## 842   842            engages     1
## 843   843          engrossed     1
## 844   844              enjoy     2
## 845   845           enjoying     2
## 846   846             enjoys     2
## 847   847          enlighten     2
## 848   848        enlightened     2
## 849   849       enlightening     2
## 850   850         enlightens     2
## 851   851              ennui    -2
## 852   852             enrage    -2
## 853   853            enraged    -2
## 854   854            enrages    -2
## 855   855           enraging    -2
## 856   856          enrapture     3
## 857   857            enslave    -2
## 858   858           enslaved    -2
## 859   859           enslaves    -2
## 860   860             ensure     1
## 861   861           ensuring     1
## 862   862       enterprising     1
## 863   863       entertaining     2
## 864   864            enthral     3
## 865   865       enthusiastic     3
## 866   866           entitled     1
## 867   867          entrusted     2
## 868   868             envies    -1
## 869   869            envious    -2
## 870   870               envy    -1
## 871   871            envying    -1
## 872   872          erroneous    -2
## 873   873              error    -2
## 874   874             errors    -2
## 875   875             escape    -1
## 876   876            escapes    -1
## 877   877           escaping    -1
## 878   878           esteemed     2
## 879   879            ethical     2
## 880   880           euphoria     3
## 881   881           euphoric     4
## 882   882           eviction    -1
## 883   883               evil    -3
## 884   884         exaggerate    -2
## 885   885        exaggerated    -2
## 886   886        exaggerates    -2
## 887   887       exaggerating    -2
## 888   888        exasperated     2
## 889   889         excellence     3
## 890   890          excellent     3
## 891   891             excite     3
## 892   892            excited     3
## 893   893         excitement     3
## 894   894           exciting     3
## 895   895            exclude    -1
## 896   896           excluded    -2
## 897   897          exclusion    -1
## 898   898          exclusive     2
## 899   899             excuse    -1
## 900   900             exempt    -1
## 901   901          exhausted    -2
## 902   902        exhilarated     3
## 903   903        exhilarates     3
## 904   904       exhilarating     3
## 905   905          exonerate     2
## 906   906         exonerated     2
## 907   907         exonerates     2
## 908   908        exonerating     2
## 909   909             expand     1
## 910   910            expands     1
## 911   911              expel    -2
## 912   912           expelled    -2
## 913   913          expelling    -2
## 914   914             expels    -2
## 915   915            exploit    -2
## 916   916          exploited    -2
## 917   917         exploiting    -2
## 918   918           exploits    -2
## 919   919        exploration     1
## 920   920       explorations     1
## 921   921             expose    -1
## 922   922            exposed    -1
## 923   923            exposes    -1
## 924   924           exposing    -1
## 925   925             extend     1
## 926   926            extends     1
## 927   927          exuberant     4
## 928   928           exultant     3
## 929   929         exultantly     3
## 930   930           fabulous     4
## 931   931                fad    -2
## 932   932                fag    -3
## 933   933             faggot    -3
## 934   934            faggots    -3
## 935   935               fail    -2
## 936   936             failed    -2
## 937   937            failing    -2
## 938   938              fails    -2
## 939   939            failure    -2
## 940   940           failures    -2
## 941   941       fainthearted    -2
## 942   942               fair     2
## 943   943              faith     1
## 944   944           faithful     3
## 945   945               fake    -3
## 946   946              fakes    -3
## 947   947             faking    -3
## 948   948             fallen    -2
## 949   949            falling    -1
## 950   950          falsified    -3
## 951   951            falsify    -3
## 952   952               fame     1
## 953   953                fan     3
## 954   954          fantastic     4
## 955   955              farce    -1
## 956   956          fascinate     3
## 957   957         fascinated     3
## 958   958         fascinates     3
## 959   959        fascinating     3
## 960   960            fascist    -2
## 961   961           fascists    -2
## 962   962         fatalities    -3
## 963   963           fatality    -3
## 964   964            fatigue    -2
## 965   965           fatigued    -2
## 966   966           fatigues    -2
## 967   967          fatiguing    -2
## 968   968              favor     2
## 969   969            favored     2
## 970   970           favorite     2
## 971   971          favorited     2
## 972   972          favorites     2
## 973   973             favors     2
## 974   974               fear    -2
## 975   975            fearful    -2
## 976   976            fearing    -2
## 977   977           fearless     2
## 978   978           fearsome    -2
## 979   979             fed up    -3
## 980   980             feeble    -2
## 981   981            feeling     1
## 982   982           felonies    -3
## 983   983             felony    -3
## 984   984            fervent     2
## 985   985             fervid     2
## 986   986            festive     2
## 987   987             fiasco    -3
## 988   988            fidgety    -2
## 989   989              fight    -1
## 990   990               fine     2
## 991   991               fire    -2
## 992   992              fired    -2
## 993   993             firing    -2
## 994   994                fit     1
## 995   995            fitness     1
## 996   996           flagship     2
## 997   997              flees    -1
## 998   998               flop    -2
## 999   999              flops    -2
## 1000 1000                flu    -2
## 1001 1001          flustered    -2
## 1002 1002            focused     2
## 1003 1003               fond     2
## 1004 1004           fondness     2
## 1005 1005               fool    -2
## 1006 1006            foolish    -2
## 1007 1007              fools    -2
## 1008 1008             forced    -1
## 1009 1009        foreclosure    -2
## 1010 1010       foreclosures    -2
## 1011 1011             forget    -1
## 1012 1012          forgetful    -2
## 1013 1013            forgive     1
## 1014 1014          forgiving     1
## 1015 1015          forgotten    -1
## 1016 1016          fortunate     2
## 1017 1017            frantic    -1
## 1018 1018              fraud    -4
## 1019 1019             frauds    -4
## 1020 1020          fraudster    -4
## 1021 1021         fraudsters    -4
## 1022 1022        fraudulence    -4
## 1023 1023         fraudulent    -4
## 1024 1024               free     1
## 1025 1025            freedom     2
## 1026 1026             frenzy    -3
## 1027 1027              fresh     1
## 1028 1028           friendly     2
## 1029 1029             fright    -2
## 1030 1030         frightened    -2
## 1031 1031        frightening    -3
## 1032 1032             frikin    -2
## 1033 1033             frisky     2
## 1034 1034           frowning    -1
## 1035 1035          frustrate    -2
## 1036 1036         frustrated    -2
## 1037 1037         frustrates    -2
## 1038 1038        frustrating    -2
## 1039 1039        frustration    -2
## 1040 1040                ftw     3
## 1041 1041               fuck    -4
## 1042 1042             fucked    -4
## 1043 1043             fucker    -4
## 1044 1044            fuckers    -4
## 1045 1045           fuckface    -4
## 1046 1046           fuckhead    -4
## 1047 1047            fucking    -4
## 1048 1048           fucktard    -4
## 1049 1049                fud    -3
## 1050 1050              fuked    -4
## 1051 1051             fuking    -4
## 1052 1052            fulfill     2
## 1053 1053          fulfilled     2
## 1054 1054           fulfills     2
## 1055 1055             fuming    -2
## 1056 1056                fun     4
## 1057 1057            funeral    -1
## 1058 1058           funerals    -1
## 1059 1059              funky     2
## 1060 1060            funnier     4
## 1061 1061              funny     4
## 1062 1062            furious    -3
## 1063 1063             futile     2
## 1064 1064                gag    -2
## 1065 1065             gagged    -2
## 1066 1066               gain     2
## 1067 1067             gained     2
## 1068 1068            gaining     2
## 1069 1069              gains     2
## 1070 1070            gallant     3
## 1071 1071          gallantly     3
## 1072 1072          gallantry     3
## 1073 1073           generous     2
## 1074 1074             genial     3
## 1075 1075              ghost    -1
## 1076 1076              giddy    -2
## 1077 1077               gift     2
## 1078 1078               glad     3
## 1079 1079          glamorous     3
## 1080 1080         glamourous     3
## 1081 1081               glee     3
## 1082 1082            gleeful     3
## 1083 1083              gloom    -1
## 1084 1084             gloomy    -2
## 1085 1085           glorious     2
## 1086 1086              glory     2
## 1087 1087               glum    -2
## 1088 1088                god     1
## 1089 1089            goddamn    -3
## 1090 1090            godsend     4
## 1091 1091               good     3
## 1092 1092           goodness     3
## 1093 1093              grace     1
## 1094 1094           gracious     3
## 1095 1095              grand     3
## 1096 1096              grant     1
## 1097 1097            granted     1
## 1098 1098           granting     1
## 1099 1099             grants     1
## 1100 1100           grateful     3
## 1101 1101      gratification     2
## 1102 1102              grave    -2
## 1103 1103               gray    -1
## 1104 1104              great     3
## 1105 1105            greater     3
## 1106 1106           greatest     3
## 1107 1107              greed    -3
## 1108 1108             greedy    -2
## 1109 1109         green wash    -3
## 1110 1110      green washing    -3
## 1111 1111          greenwash    -3
## 1112 1112        greenwasher    -3
## 1113 1113       greenwashers    -3
## 1114 1114       greenwashing    -3
## 1115 1115              greet     1
## 1116 1116            greeted     1
## 1117 1117           greeting     1
## 1118 1118          greetings     2
## 1119 1119             greets     1
## 1120 1120               grey    -1
## 1121 1121              grief    -2
## 1122 1122            grieved    -2
## 1123 1123              gross    -2
## 1124 1124            growing     1
## 1125 1125             growth     2
## 1126 1126          guarantee     1
## 1127 1127              guilt    -3
## 1128 1128             guilty    -3
## 1129 1129        gullibility    -2
## 1130 1130           gullible    -2
## 1131 1131                gun    -1
## 1132 1132                 ha     2
## 1133 1133             hacked    -1
## 1134 1134               haha     3
## 1135 1135             hahaha     3
## 1136 1136            hahahah     3
## 1137 1137               hail     2
## 1138 1138             hailed     2
## 1139 1139            hapless    -2
## 1140 1140        haplessness    -2
## 1141 1141          happiness     3
## 1142 1142              happy     3
## 1143 1143               hard    -1
## 1144 1144            hardier     2
## 1145 1145           hardship    -2
## 1146 1146              hardy     2
## 1147 1147               harm    -2
## 1148 1148             harmed    -2
## 1149 1149            harmful    -2
## 1150 1150            harming    -2
## 1151 1151              harms    -2
## 1152 1152            harried    -2
## 1153 1153              harsh    -2
## 1154 1154            harsher    -2
## 1155 1155           harshest    -2
## 1156 1156               hate    -3
## 1157 1157              hated    -3
## 1158 1158             haters    -3
## 1159 1159              hates    -3
## 1160 1160             hating    -3
## 1161 1161              haunt    -1
## 1162 1162            haunted    -2
## 1163 1163           haunting     1
## 1164 1164             haunts    -1
## 1165 1165              havoc    -2
## 1166 1166            healthy     2
## 1167 1167      heartbreaking    -3
## 1168 1168        heartbroken    -3
## 1169 1169          heartfelt     3
## 1170 1170             heaven     2
## 1171 1171           heavenly     4
## 1172 1172       heavyhearted    -2
## 1173 1173               hell    -4
## 1174 1174               help     2
## 1175 1175            helpful     2
## 1176 1176            helping     2
## 1177 1177           helpless    -2
## 1178 1178              helps     2
## 1179 1179               hero     2
## 1180 1180             heroes     2
## 1181 1181             heroic     3
## 1182 1182           hesitant    -2
## 1183 1183           hesitate    -2
## 1184 1184                hid    -1
## 1185 1185               hide    -1
## 1186 1186              hides    -1
## 1187 1187             hiding    -1
## 1188 1188          highlight     2
## 1189 1189          hilarious     2
## 1190 1190          hindrance    -2
## 1191 1191               hoax    -2
## 1192 1192           homesick    -2
## 1193 1193             honest     2
## 1194 1194              honor     2
## 1195 1195            honored     2
## 1196 1196           honoring     2
## 1197 1197             honour     2
## 1198 1198           honoured     2
## 1199 1199          honouring     2
## 1200 1200           hooligan    -2
## 1201 1201        hooliganism    -2
## 1202 1202          hooligans    -2
## 1203 1203               hope     2
## 1204 1204            hopeful     2
## 1205 1205          hopefully     2
## 1206 1206           hopeless    -2
## 1207 1207       hopelessness    -2
## 1208 1208              hopes     2
## 1209 1209             hoping     2
## 1210 1210         horrendous    -3
## 1211 1211           horrible    -3
## 1212 1212           horrific    -3
## 1213 1213          horrified    -3
## 1214 1214            hostile    -2
## 1215 1215           huckster    -2
## 1216 1216                hug     2
## 1217 1217               huge     1
## 1218 1218               hugs     2
## 1219 1219           humerous     3
## 1220 1220         humiliated    -3
## 1221 1221        humiliation    -3
## 1222 1222              humor     2
## 1223 1223           humorous     2
## 1224 1224             humour     2
## 1225 1225          humourous     2
## 1226 1226             hunger    -2
## 1227 1227             hurrah     5
## 1228 1228               hurt    -2
## 1229 1229            hurting    -2
## 1230 1230              hurts    -2
## 1231 1231       hypocritical    -2
## 1232 1232           hysteria    -3
## 1233 1233         hysterical    -3
## 1234 1234          hysterics    -3
## 1235 1235              idiot    -3
## 1236 1236            idiotic    -3
## 1237 1237          ignorance    -2
## 1238 1238           ignorant    -2
## 1239 1239             ignore    -1
## 1240 1240            ignored    -2
## 1241 1241            ignores    -1
## 1242 1242                ill    -2
## 1243 1243            illegal    -3
## 1244 1244         illiteracy    -2
## 1245 1245            illness    -2
## 1246 1246          illnesses    -2
## 1247 1247           imbecile    -3
## 1248 1248        immobilized    -1
## 1249 1249           immortal     2
## 1250 1250             immune     1
## 1251 1251          impatient    -2
## 1252 1252          imperfect    -2
## 1253 1253         importance     2
## 1254 1254          important     2
## 1255 1255             impose    -1
## 1256 1256            imposed    -1
## 1257 1257            imposes    -1
## 1258 1258           imposing    -1
## 1259 1259           impotent    -2
## 1260 1260            impress     3
## 1261 1261          impressed     3
## 1262 1262          impresses     3
## 1263 1263         impressive     3
## 1264 1264         imprisoned    -2
## 1265 1265            improve     2
## 1266 1266           improved     2
## 1267 1267        improvement     2
## 1268 1268           improves     2
## 1269 1269          improving     2
## 1270 1270          inability    -2
## 1271 1271           inaction    -2
## 1272 1272         inadequate    -2
## 1273 1273          incapable    -2
## 1274 1274      incapacitated    -2
## 1275 1275           incensed    -2
## 1276 1276       incompetence    -2
## 1277 1277        incompetent    -2
## 1278 1278      inconsiderate    -2
## 1279 1279      inconvenience    -2
## 1280 1280       inconvenient    -2
## 1281 1281           increase     1
## 1282 1282          increased     1
## 1283 1283         indecisive    -2
## 1284 1284     indestructible     2
## 1285 1285       indifference    -2
## 1286 1286        indifferent    -2
## 1287 1287          indignant    -2
## 1288 1288        indignation    -2
## 1289 1289       indoctrinate    -2
## 1290 1290      indoctrinated    -2
## 1291 1291      indoctrinates    -2
## 1292 1292     indoctrinating    -2
## 1293 1293        ineffective    -2
## 1294 1294      ineffectively    -2
## 1295 1295         infatuated     2
## 1296 1296        infatuation     2
## 1297 1297           infected    -2
## 1298 1298           inferior    -2
## 1299 1299           inflamed    -2
## 1300 1300        influential     2
## 1301 1301       infringement    -2
## 1302 1302          infuriate    -2
## 1303 1303         infuriated    -2
## 1304 1304         infuriates    -2
## 1305 1305        infuriating    -2
## 1306 1306            inhibit    -1
## 1307 1307            injured    -2
## 1308 1308             injury    -2
## 1309 1309          injustice    -2
## 1310 1310           innovate     1
## 1311 1311          innovates     1
## 1312 1312         innovation     1
## 1313 1313         innovative     2
## 1314 1314        inquisition    -2
## 1315 1315        inquisitive     2
## 1316 1316             insane    -2
## 1317 1317           insanity    -2
## 1318 1318           insecure    -2
## 1319 1319        insensitive    -2
## 1320 1320      insensitivity    -2
## 1321 1321      insignificant    -2
## 1322 1322            insipid    -2
## 1323 1323        inspiration     2
## 1324 1324      inspirational     2
## 1325 1325            inspire     2
## 1326 1326           inspired     2
## 1327 1327           inspires     2
## 1328 1328          inspiring     3
## 1329 1329             insult    -2
## 1330 1330           insulted    -2
## 1331 1331          insulting    -2
## 1332 1332            insults    -2
## 1333 1333             intact     2
## 1334 1334          integrity     2
## 1335 1335        intelligent     2
## 1336 1336            intense     1
## 1337 1337           interest     1
## 1338 1338         interested     2
## 1339 1339        interesting     2
## 1340 1340          interests     1
## 1341 1341       interrogated    -2
## 1342 1342          interrupt    -2
## 1343 1343        interrupted    -2
## 1344 1344       interrupting    -2
## 1345 1345       interruption    -2
## 1346 1346         interrupts    -2
## 1347 1347         intimidate    -2
## 1348 1348        intimidated    -2
## 1349 1349        intimidates    -2
## 1350 1350       intimidating    -2
## 1351 1351       intimidation    -2
## 1352 1352          intricate     2
## 1353 1353          intrigues     1
## 1354 1354         invincible     2
## 1355 1355             invite     1
## 1356 1356           inviting     1
## 1357 1357       invulnerable     2
## 1358 1358              irate    -3
## 1359 1359             ironic    -1
## 1360 1360              irony    -1
## 1361 1361         irrational    -1
## 1362 1362       irresistible     2
## 1363 1363         irresolute    -2
## 1364 1364      irresponsible     2
## 1365 1365       irreversible    -1
## 1366 1366           irritate    -3
## 1367 1367          irritated    -3
## 1368 1368         irritating    -3
## 1369 1369           isolated    -1
## 1370 1370              itchy    -2
## 1371 1371            jackass    -4
## 1372 1372          jackasses    -4
## 1373 1373             jailed    -2
## 1374 1374             jaunty     2
## 1375 1375            jealous    -2
## 1376 1376           jeopardy    -2
## 1377 1377               jerk    -3
## 1378 1378              jesus     1
## 1379 1379              jewel     1
## 1380 1380             jewels     1
## 1381 1381            jocular     2
## 1382 1382               join     1
## 1383 1383               joke     2
## 1384 1384              jokes     2
## 1385 1385              jolly     2
## 1386 1386             jovial     2
## 1387 1387                joy     3
## 1388 1388             joyful     3
## 1389 1389           joyfully     3
## 1390 1390            joyless    -2
## 1391 1391             joyous     3
## 1392 1392           jubilant     3
## 1393 1393              jumpy    -1
## 1394 1394            justice     2
## 1395 1395        justifiably     2
## 1396 1396          justified     2
## 1397 1397               keen     1
## 1398 1398               kill    -3
## 1399 1399             killed    -3
## 1400 1400            killing    -3
## 1401 1401              kills    -3
## 1402 1402               kind     2
## 1403 1403             kinder     2
## 1404 1404               kiss     2
## 1405 1405              kudos     3
## 1406 1406               lack    -2
## 1407 1407      lackadaisical    -2
## 1408 1408                lag    -1
## 1409 1409             lagged    -2
## 1410 1410            lagging    -2
## 1411 1411               lags    -2
## 1412 1412               lame    -2
## 1413 1413           landmark     2
## 1414 1414              laugh     1
## 1415 1415            laughed     1
## 1416 1416           laughing     1
## 1417 1417             laughs     1
## 1418 1418          laughting     1
## 1419 1419           launched     1
## 1420 1420               lawl     3
## 1421 1421            lawsuit    -2
## 1422 1422           lawsuits    -2
## 1423 1423               lazy    -1
## 1424 1424               leak    -1
## 1425 1425             leaked    -1
## 1426 1426              leave    -1
## 1427 1427              legal     1
## 1428 1428            legally     1
## 1429 1429            lenient     1
## 1430 1430          lethargic    -2
## 1431 1431           lethargy    -2
## 1432 1432               liar    -3
## 1433 1433              liars    -3
## 1434 1434           libelous    -2
## 1435 1435               lied    -2
## 1436 1436          lifesaver     4
## 1437 1437       lighthearted     1
## 1438 1438               like     2
## 1439 1439              liked     2
## 1440 1440              likes     2
## 1441 1441         limitation    -1
## 1442 1442            limited    -1
## 1443 1443             limits    -1
## 1444 1444         litigation    -1
## 1445 1445          litigious    -2
## 1446 1446             lively     2
## 1447 1447              livid    -2
## 1448 1448               lmao     4
## 1449 1449              lmfao     4
## 1450 1450             loathe    -3
## 1451 1451            loathed    -3
## 1452 1452            loathes    -3
## 1453 1453           loathing    -3
## 1454 1454              lobby    -2
## 1455 1455           lobbying    -2
## 1456 1456                lol     3
## 1457 1457             lonely    -2
## 1458 1458           lonesome    -2
## 1459 1459            longing    -1
## 1460 1460               loom    -1
## 1461 1461             loomed    -1
## 1462 1462            looming    -1
## 1463 1463              looms    -1
## 1464 1464              loose    -3
## 1465 1465             looses    -3
## 1466 1466              loser    -3
## 1467 1467             losing    -3
## 1468 1468               loss    -3
## 1469 1469               lost    -3
## 1470 1470            lovable     3
## 1471 1471               love     3
## 1472 1472              loved     3
## 1473 1473           lovelies     3
## 1474 1474             lovely     3
## 1475 1475             loving     2
## 1476 1476             lowest    -1
## 1477 1477              loyal     3
## 1478 1478            loyalty     3
## 1479 1479               luck     3
## 1480 1480            luckily     3
## 1481 1481              lucky     3
## 1482 1482         lugubrious    -2
## 1483 1483            lunatic    -3
## 1484 1484           lunatics    -3
## 1485 1485               lurk    -1
## 1486 1486            lurking    -1
## 1487 1487              lurks    -1
## 1488 1488                mad    -3
## 1489 1489          maddening    -3
## 1490 1490            made-up    -1
## 1491 1491              madly    -3
## 1492 1492            madness    -3
## 1493 1493          mandatory    -1
## 1494 1494        manipulated    -1
## 1495 1495       manipulating    -1
## 1496 1496       manipulation    -1
## 1497 1497             marvel     3
## 1498 1498          marvelous     3
## 1499 1499            marvels     3
## 1500 1500        masterpiece     4
## 1501 1501       masterpieces     4
## 1502 1502             matter     1
## 1503 1503            matters     1
## 1504 1504             mature     2
## 1505 1505         meaningful     2
## 1506 1506        meaningless    -2
## 1507 1507              medal     3
## 1508 1508         mediocrity    -3
## 1509 1509         meditative     1
## 1510 1510         melancholy    -2
## 1511 1511             menace    -2
## 1512 1512            menaced    -2
## 1513 1513              mercy     2
## 1514 1514              merry     3
## 1515 1515               mess    -2
## 1516 1516             messed    -2
## 1517 1517         messing up    -2
## 1518 1518         methodical     2
## 1519 1519           mindless    -2
## 1520 1520            miracle     4
## 1521 1521              mirth     3
## 1522 1522           mirthful     3
## 1523 1523         mirthfully     3
## 1524 1524          misbehave    -2
## 1525 1525         misbehaved    -2
## 1526 1526         misbehaves    -2
## 1527 1527        misbehaving    -2
## 1528 1528           mischief    -1
## 1529 1529          mischiefs    -1
## 1530 1530          miserable    -3
## 1531 1531             misery    -2
## 1532 1532          misgiving    -2
## 1533 1533     misinformation    -2
## 1534 1534        misinformed    -2
## 1535 1535     misinterpreted    -2
## 1536 1536         misleading    -3
## 1537 1537            misread    -1
## 1538 1538       misreporting    -2
## 1539 1539  misrepresentation    -2
## 1540 1540               miss    -2
## 1541 1541             missed    -2
## 1542 1542            missing    -2
## 1543 1543            mistake    -2
## 1544 1544           mistaken    -2
## 1545 1545           mistakes    -2
## 1546 1546          mistaking    -2
## 1547 1547      misunderstand    -2
## 1548 1548   misunderstanding    -2
## 1549 1549     misunderstands    -2
## 1550 1550      misunderstood    -2
## 1551 1551               moan    -2
## 1552 1552             moaned    -2
## 1553 1553            moaning    -2
## 1554 1554              moans    -2
## 1555 1555               mock    -2
## 1556 1556             mocked    -2
## 1557 1557            mocking    -2
## 1558 1558              mocks    -2
## 1559 1559          mongering    -2
## 1560 1560         monopolize    -2
## 1561 1561        monopolized    -2
## 1562 1562        monopolizes    -2
## 1563 1563       monopolizing    -2
## 1564 1564              moody    -1
## 1565 1565               mope    -1
## 1566 1566             moping    -1
## 1567 1567              moron    -3
## 1568 1568       motherfucker    -5
## 1569 1569      motherfucking    -5
## 1570 1570           motivate     1
## 1571 1571          motivated     2
## 1572 1572         motivating     2
## 1573 1573         motivation     1
## 1574 1574              mourn    -2
## 1575 1575            mourned    -2
## 1576 1576           mournful    -2
## 1577 1577           mourning    -2
## 1578 1578             mourns    -2
## 1579 1579            mumpish    -2
## 1580 1580             murder    -2
## 1581 1581           murderer    -2
## 1582 1582          murdering    -3
## 1583 1583          murderous    -3
## 1584 1584            murders    -2
## 1585 1585               myth    -1
## 1586 1586               n00b    -2
## 1587 1587              naive    -2
## 1588 1588              nasty    -3
## 1589 1589            natural     1
## 1590 1590           na\xefve    -2
## 1591 1591              needy    -2
## 1592 1592           negative    -2
## 1593 1593         negativity    -2
## 1594 1594            neglect    -2
## 1595 1595          neglected    -2
## 1596 1596         neglecting    -2
## 1597 1597           neglects    -2
## 1598 1598             nerves    -1
## 1599 1599            nervous    -2
## 1600 1600          nervously    -2
## 1601 1601               nice     3
## 1602 1602              nifty     2
## 1603 1603             niggas    -5
## 1604 1604             nigger    -5
## 1605 1605                 no    -1
## 1606 1606             no fun    -3
## 1607 1607              noble     2
## 1608 1608              noisy    -1
## 1609 1609           nonsense    -2
## 1610 1610               noob    -2
## 1611 1611              nosey    -2
## 1612 1612           not good    -2
## 1613 1613        not working    -3
## 1614 1614          notorious    -2
## 1615 1615              novel     2
## 1616 1616               numb    -1
## 1617 1617               nuts    -3
## 1618 1618         obliterate    -2
## 1619 1619        obliterated    -2
## 1620 1620          obnoxious    -3
## 1621 1621            obscene    -2
## 1622 1622           obsessed     2
## 1623 1623           obsolete    -2
## 1624 1624           obstacle    -2
## 1625 1625          obstacles    -2
## 1626 1626          obstinate    -2
## 1627 1627                odd    -2
## 1628 1628             offend    -2
## 1629 1629           offended    -2
## 1630 1630           offender    -2
## 1631 1631          offending    -2
## 1632 1632            offends    -2
## 1633 1633            offline    -1
## 1634 1634                oks     2
## 1635 1635            ominous     3
## 1636 1636 once-in-a-lifetime     3
## 1637 1637      opportunities     2
## 1638 1638        opportunity     2
## 1639 1639          oppressed    -2
## 1640 1640         oppressive    -2
## 1641 1641           optimism     2
## 1642 1642         optimistic     2
## 1643 1643         optionless    -2
## 1644 1644             outcry    -2
## 1645 1645      outmaneuvered    -2
## 1646 1646            outrage    -3
## 1647 1647           outraged    -3
## 1648 1648           outreach     2
## 1649 1649        outstanding     5
## 1650 1650          overjoyed     4
## 1651 1651           overload    -1
## 1652 1652         overlooked    -1
## 1653 1653          overreact    -2
## 1654 1654        overreacted    -2
## 1655 1655       overreaction    -2
## 1656 1656         overreacts    -2
## 1657 1657           oversell    -2
## 1658 1658        overselling    -2
## 1659 1659          oversells    -2
## 1660 1660 oversimplification    -2
## 1661 1661     oversimplified    -2
## 1662 1662     oversimplifies    -2
## 1663 1663       oversimplify    -2
## 1664 1664      overstatement    -2
## 1665 1665     overstatements    -2
## 1666 1666         overweight    -1
## 1667 1667           oxymoron    -1
## 1668 1668               pain    -2
## 1669 1669             pained    -2
## 1670 1670              panic    -3
## 1671 1671           panicked    -3
## 1672 1672             panics    -3
## 1673 1673           paradise     3
## 1674 1674            paradox    -1
## 1675 1675             pardon     2
## 1676 1676           pardoned     2
## 1677 1677          pardoning     2
## 1678 1678            pardons     2
## 1679 1679             parley    -1
## 1680 1680         passionate     2
## 1681 1681            passive    -1
## 1682 1682          passively    -1
## 1683 1683           pathetic    -2
## 1684 1684                pay    -1
## 1685 1685              peace     2
## 1686 1686           peaceful     2
## 1687 1687         peacefully     2
## 1688 1688            penalty    -2
## 1689 1689            pensive    -1
## 1690 1690            perfect     3
## 1691 1691          perfected     2
## 1692 1692          perfectly     3
## 1693 1693           perfects     2
## 1694 1694              peril    -2
## 1695 1695            perjury    -3
## 1696 1696        perpetrator    -2
## 1697 1697       perpetrators    -2
## 1698 1698          perplexed    -2
## 1699 1699          persecute    -2
## 1700 1700         persecuted    -2
## 1701 1701         persecutes    -2
## 1702 1702        persecuting    -2
## 1703 1703          perturbed    -2
## 1704 1704              pesky    -2
## 1705 1705          pessimism    -2
## 1706 1706        pessimistic    -2
## 1707 1707          petrified    -2
## 1708 1708             phobic    -2
## 1709 1709        picturesque     2
## 1710 1710             pileup    -1
## 1711 1711              pique    -2
## 1712 1712             piqued    -2
## 1713 1713               piss    -4
## 1714 1714             pissed    -4
## 1715 1715            pissing    -3
## 1716 1716            piteous    -2
## 1717 1717             pitied    -1
## 1718 1718               pity    -2
## 1719 1719            playful     2
## 1720 1720           pleasant     3
## 1721 1721             please     1
## 1722 1722            pleased     3
## 1723 1723           pleasure     3
## 1724 1724             poised    -2
## 1725 1725             poison    -2
## 1726 1726           poisoned    -2
## 1727 1727            poisons    -2
## 1728 1728            pollute    -2
## 1729 1729           polluted    -2
## 1730 1730           polluter    -2
## 1731 1731          polluters    -2
## 1732 1732           pollutes    -2
## 1733 1733               poor    -2
## 1734 1734             poorer    -2
## 1735 1735            poorest    -2
## 1736 1736            popular     3
## 1737 1737           positive     2
## 1738 1738         positively     2
## 1739 1739         possessive    -2
## 1740 1740           postpone    -1
## 1741 1741          postponed    -1
## 1742 1742          postpones    -1
## 1743 1743         postponing    -1
## 1744 1744            poverty    -1
## 1745 1745           powerful     2
## 1746 1746          powerless    -2
## 1747 1747             praise     3
## 1748 1748            praised     3
## 1749 1749            praises     3
## 1750 1750           praising     3
## 1751 1751               pray     1
## 1752 1752            praying     1
## 1753 1753              prays     1
## 1754 1754              prblm    -2
## 1755 1755             prblms    -2
## 1756 1756           prepared     1
## 1757 1757           pressure    -1
## 1758 1758          pressured    -2
## 1759 1759            pretend    -1
## 1760 1760         pretending    -1
## 1761 1761           pretends    -1
## 1762 1762             pretty     1
## 1763 1763            prevent    -1
## 1764 1764          prevented    -1
## 1765 1765         preventing    -1
## 1766 1766           prevents    -1
## 1767 1767              prick    -5
## 1768 1768             prison    -2
## 1769 1769           prisoner    -2
## 1770 1770          prisoners    -2
## 1771 1771         privileged     2
## 1772 1772          proactive     2
## 1773 1773            problem    -2
## 1774 1774           problems    -2
## 1775 1775          profiteer    -2
## 1776 1776           progress     2
## 1777 1777          prominent     2
## 1778 1778            promise     1
## 1779 1779           promised     1
## 1780 1780           promises     1
## 1781 1781            promote     1
## 1782 1782           promoted     1
## 1783 1783           promotes     1
## 1784 1784          promoting     1
## 1785 1785         propaganda    -2
## 1786 1786          prosecute    -1
## 1787 1787         prosecuted    -2
## 1788 1788         prosecutes    -1
## 1789 1789        prosecution    -1
## 1790 1790           prospect     1
## 1791 1791          prospects     1
## 1792 1792         prosperous     3
## 1793 1793            protect     1
## 1794 1794          protected     1
## 1795 1795           protects     1
## 1796 1796            protest    -2
## 1797 1797         protesters    -2
## 1798 1798         protesting    -2
## 1799 1799           protests    -2
## 1800 1800              proud     2
## 1801 1801            proudly     2
## 1802 1802            provoke    -1
## 1803 1803           provoked    -1
## 1804 1804           provokes    -1
## 1805 1805          provoking    -1
## 1806 1806      pseudoscience    -3
## 1807 1807             punish    -2
## 1808 1808           punished    -2
## 1809 1809           punishes    -2
## 1810 1810           punitive    -2
## 1811 1811              pushy    -1
## 1812 1812            puzzled    -2
## 1813 1813            quaking    -2
## 1814 1814       questionable    -2
## 1815 1815         questioned    -1
## 1816 1816        questioning    -1
## 1817 1817             racism    -3
## 1818 1818             racist    -3
## 1819 1819            racists    -3
## 1820 1820               rage    -2
## 1821 1821            rageful    -2
## 1822 1822              rainy    -1
## 1823 1823               rant    -3
## 1824 1824             ranter    -3
## 1825 1825            ranters    -3
## 1826 1826              rants    -3
## 1827 1827               rape    -4
## 1828 1828             rapist    -4
## 1829 1829            rapture     2
## 1830 1830           raptured     2
## 1831 1831           raptures     2
## 1832 1832          rapturous     4
## 1833 1833               rash    -2
## 1834 1834           ratified     2
## 1835 1835              reach     1
## 1836 1836            reached     1
## 1837 1837            reaches     1
## 1838 1838           reaching     1
## 1839 1839           reassure     1
## 1840 1840          reassured     1
## 1841 1841          reassures     1
## 1842 1842         reassuring     2
## 1843 1843          rebellion    -2
## 1844 1844          recession    -2
## 1845 1845           reckless    -2
## 1846 1846          recommend     2
## 1847 1847        recommended     2
## 1848 1848         recommends     2
## 1849 1849           redeemed     2
## 1850 1850             refuse    -2
## 1851 1851            refused    -2
## 1852 1852           refusing    -2
## 1853 1853             regret    -2
## 1854 1854          regretful    -2
## 1855 1855            regrets    -2
## 1856 1856          regretted    -2
## 1857 1857         regretting    -2
## 1858 1858             reject    -1
## 1859 1859           rejected    -1
## 1860 1860          rejecting    -1
## 1861 1861            rejects    -1
## 1862 1862            rejoice     4
## 1863 1863           rejoiced     4
## 1864 1864           rejoices     4
## 1865 1865          rejoicing     4
## 1866 1866            relaxed     2
## 1867 1867         relentless    -1
## 1868 1868            reliant     2
## 1869 1869            relieve     1
## 1870 1870           relieved     2
## 1871 1871           relieves     1
## 1872 1872          relieving     2
## 1873 1873          relishing     2
## 1874 1874         remarkable     2
## 1875 1875            remorse    -2
## 1876 1876            repulse    -1
## 1877 1877           repulsed    -2
## 1878 1878             rescue     2
## 1879 1879            rescued     2
## 1880 1880            rescues     2
## 1881 1881          resentful    -2
## 1882 1882             resign    -1
## 1883 1883           resigned    -1
## 1884 1884          resigning    -1
## 1885 1885            resigns    -1
## 1886 1886           resolute     2
## 1887 1887            resolve     2
## 1888 1888           resolved     2
## 1889 1889           resolves     2
## 1890 1890          resolving     2
## 1891 1891          respected     2
## 1892 1892        responsible     2
## 1893 1893         responsive     2
## 1894 1894            restful     2
## 1895 1895           restless    -2
## 1896 1896            restore     1
## 1897 1897           restored     1
## 1898 1898           restores     1
## 1899 1899          restoring     1
## 1900 1900           restrict    -2
## 1901 1901         restricted    -2
## 1902 1902        restricting    -2
## 1903 1903        restriction    -2
## 1904 1904          restricts    -2
## 1905 1905           retained    -1
## 1906 1906             retard    -2
## 1907 1907           retarded    -2
## 1908 1908            retreat    -1
## 1909 1909            revenge    -2
## 1910 1910         revengeful    -2
## 1911 1911            revered     2
## 1912 1912             revive     2
## 1913 1913            revives     2
## 1914 1914             reward     2
## 1915 1915           rewarded     2
## 1916 1916          rewarding     2
## 1917 1917            rewards     2
## 1918 1918               rich     2
## 1919 1919         ridiculous    -3
## 1920 1920                rig    -1
## 1921 1921             rigged    -1
## 1922 1922    right direction     3
## 1923 1923           rigorous     3
## 1924 1924         rigorously     3
## 1925 1925               riot    -2
## 1926 1926              riots    -2
## 1927 1927               risk    -2
## 1928 1928              risks    -2
## 1929 1929                rob    -2
## 1930 1930             robber    -2
## 1931 1931              robed    -2
## 1932 1932             robing    -2
## 1933 1933               robs    -2
## 1934 1934             robust     2
## 1935 1935               rofl     4
## 1936 1936         roflcopter     4
## 1937 1937            roflmao     4
## 1938 1938            romance     2
## 1939 1939              rotfl     4
## 1940 1940          rotflmfao     4
## 1941 1941            rotflol     4
## 1942 1942               ruin    -2
## 1943 1943             ruined    -2
## 1944 1944            ruining    -2
## 1945 1945              ruins    -2
## 1946 1946           sabotage    -2
## 1947 1947                sad    -2
## 1948 1948             sadden    -2
## 1949 1949           saddened    -2
## 1950 1950              sadly    -2
## 1951 1951               safe     1
## 1952 1952             safely     1
## 1953 1953             safety     1
## 1954 1954            salient     1
## 1955 1955              sappy    -1
## 1956 1956          sarcastic    -2
## 1957 1957          satisfied     2
## 1958 1958               save     2
## 1959 1959              saved     2
## 1960 1960               scam    -2
## 1961 1961              scams    -2
## 1962 1962            scandal    -3
## 1963 1963         scandalous    -3
## 1964 1964           scandals    -3
## 1965 1965          scapegoat    -2
## 1966 1966         scapegoats    -2
## 1967 1967              scare    -2
## 1968 1968             scared    -2
## 1969 1969              scary    -2
## 1970 1970          sceptical    -2
## 1971 1971              scold    -2
## 1972 1972              scoop     3
## 1973 1973              scorn    -2
## 1974 1974           scornful    -2
## 1975 1975             scream    -2
## 1976 1976           screamed    -2
## 1977 1977          screaming    -2
## 1978 1978            screams    -2
## 1979 1979            screwed    -2
## 1980 1980         screwed up    -3
## 1981 1981            scumbag    -4
## 1982 1982             secure     2
## 1983 1983            secured     2
## 1984 1984            secures     2
## 1985 1985           sedition    -2
## 1986 1986          seditious    -2
## 1987 1987            seduced    -1
## 1988 1988     self-confident     2
## 1989 1989       self-deluded    -2
## 1990 1990            selfish    -3
## 1991 1991        selfishness    -3
## 1992 1992           sentence    -2
## 1993 1993          sentenced    -2
## 1994 1994          sentences    -2
## 1995 1995         sentencing    -2
## 1996 1996             serene     2
## 1997 1997             severe    -2
## 1998 1998               sexy     3
## 1999 1999              shaky    -2
## 2000 2000              shame    -2
## 2001 2001             shamed    -2
## 2002 2002           shameful    -2
## 2003 2003              share     1
## 2004 2004             shared     1
## 2005 2005             shares     1
## 2006 2006          shattered    -2
## 2007 2007               shit    -4
## 2008 2008           shithead    -4
## 2009 2009             shitty    -3
## 2010 2010              shock    -2
## 2011 2011            shocked    -2
## 2012 2012           shocking    -2
## 2013 2013             shocks    -2
## 2014 2014              shoot    -1
## 2015 2015      short-sighted    -2
## 2016 2016  short-sightedness    -2
## 2017 2017           shortage    -2
## 2018 2018          shortages    -2
## 2019 2019              shrew    -4
## 2020 2020                shy    -1
## 2021 2021               sick    -2
## 2022 2022               sigh    -2
## 2023 2023       significance     1
## 2024 2024        significant     1
## 2025 2025          silencing    -1
## 2026 2026              silly    -1
## 2027 2027            sincere     2
## 2028 2028          sincerely     2
## 2029 2029          sincerest     2
## 2030 2030          sincerity     2
## 2031 2031             sinful    -3
## 2032 2032       singleminded    -2
## 2033 2033            skeptic    -2
## 2034 2034          skeptical    -2
## 2035 2035         skepticism    -2
## 2036 2036           skeptics    -2
## 2037 2037               slam    -2
## 2038 2038              slash    -2
## 2039 2039            slashed    -2
## 2040 2040            slashes    -2
## 2041 2041           slashing    -2
## 2042 2042            slavery    -3
## 2043 2043      sleeplessness    -2
## 2044 2044              slick     2
## 2045 2045            slicker     2
## 2046 2046           slickest     2
## 2047 2047           sluggish    -2
## 2048 2048               slut    -5
## 2049 2049              smart     1
## 2050 2050            smarter     2
## 2051 2051           smartest     2
## 2052 2052              smear    -2
## 2053 2053              smile     2
## 2054 2054             smiled     2
## 2055 2055             smiles     2
## 2056 2056            smiling     2
## 2057 2057               smog    -2
## 2058 2058             sneaky    -1
## 2059 2059               snub    -2
## 2060 2060            snubbed    -2
## 2061 2061           snubbing    -2
## 2062 2062              snubs    -2
## 2063 2063           sobering     1
## 2064 2064             solemn    -1
## 2065 2065              solid     2
## 2066 2066         solidarity     2
## 2067 2067           solution     1
## 2068 2068          solutions     1
## 2069 2069              solve     1
## 2070 2070             solved     1
## 2071 2071             solves     1
## 2072 2072            solving     1
## 2073 2073             somber    -2
## 2074 2074          some kind     0
## 2075 2075     son-of-a-bitch    -5
## 2076 2076             soothe     3
## 2077 2077            soothed     3
## 2078 2078           soothing     3
## 2079 2079      sophisticated     2
## 2080 2080               sore    -1
## 2081 2081             sorrow    -2
## 2082 2082          sorrowful    -2
## 2083 2083              sorry    -1
## 2084 2084               spam    -2
## 2085 2085            spammer    -3
## 2086 2086           spammers    -3
## 2087 2087           spamming    -2
## 2088 2088              spark     1
## 2089 2089            sparkle     3
## 2090 2090           sparkles     3
## 2091 2091          sparkling     3
## 2092 2092        speculative    -2
## 2093 2093             spirit     1
## 2094 2094           spirited     2
## 2095 2095         spiritless    -2
## 2096 2096           spiteful    -2
## 2097 2097           splendid     3
## 2098 2098          sprightly     2
## 2099 2099          squelched    -1
## 2100 2100               stab    -2
## 2101 2101            stabbed    -2
## 2102 2102             stable     2
## 2103 2103              stabs    -2
## 2104 2104              stall    -2
## 2105 2105            stalled    -2
## 2106 2106           stalling    -2
## 2107 2107            stamina     2
## 2108 2108           stampede    -2
## 2109 2109           startled    -2
## 2110 2110             starve    -2
## 2111 2111            starved    -2
## 2112 2112            starves    -2
## 2113 2113           starving    -2
## 2114 2114          steadfast     2
## 2115 2115              steal    -2
## 2116 2116             steals    -2
## 2117 2117         stereotype    -2
## 2118 2118        stereotyped    -2
## 2119 2119            stifled    -1
## 2120 2120          stimulate     1
## 2121 2121         stimulated     1
## 2122 2122         stimulates     1
## 2123 2123        stimulating     2
## 2124 2124             stingy    -2
## 2125 2125             stolen    -2
## 2126 2126               stop    -1
## 2127 2127            stopped    -1
## 2128 2128           stopping    -1
## 2129 2129              stops    -1
## 2130 2130              stout     2
## 2131 2131           straight     1
## 2132 2132            strange    -1
## 2133 2133          strangely    -1
## 2134 2134          strangled    -2
## 2135 2135           strength     2
## 2136 2136         strengthen     2
## 2137 2137       strengthened     2
## 2138 2138      strengthening     2
## 2139 2139        strengthens     2
## 2140 2140           stressed    -2
## 2141 2141           stressor    -2
## 2142 2142          stressors    -2
## 2143 2143           stricken    -2
## 2144 2144             strike    -1
## 2145 2145           strikers    -2
## 2146 2146            strikes    -1
## 2147 2147             strong     2
## 2148 2148           stronger     2
## 2149 2149          strongest     2
## 2150 2150             struck    -1
## 2151 2151           struggle    -2
## 2152 2152          struggled    -2
## 2153 2153          struggles    -2
## 2154 2154         struggling    -2
## 2155 2155           stubborn    -2
## 2156 2156              stuck    -2
## 2157 2157            stunned    -2
## 2158 2158           stunning     4
## 2159 2159             stupid    -2
## 2160 2160           stupidly    -2
## 2161 2161              suave     2
## 2162 2162        substantial     1
## 2163 2163      substantially     1
## 2164 2164         subversive    -2
## 2165 2165            success     2
## 2166 2166         successful     3
## 2167 2167               suck    -3
## 2168 2168              sucks    -3
## 2169 2169             suffer    -2
## 2170 2170          suffering    -2
## 2171 2171            suffers    -2
## 2172 2172           suicidal    -2
## 2173 2173            suicide    -2
## 2174 2174              suing    -2
## 2175 2175            sulking    -2
## 2176 2176              sulky    -2
## 2177 2177             sullen    -2
## 2178 2178           sunshine     2
## 2179 2179              super     3
## 2180 2180             superb     5
## 2181 2181           superior     2
## 2182 2182            support     2
## 2183 2183          supported     2
## 2184 2184          supporter     1
## 2185 2185         supporters     1
## 2186 2186         supporting     1
## 2187 2187         supportive     2
## 2188 2188           supports     2
## 2189 2189           survived     2
## 2190 2190          surviving     2
## 2191 2191           survivor     2
## 2192 2192            suspect    -1
## 2193 2193          suspected    -1
## 2194 2194         suspecting    -1
## 2195 2195           suspects    -1
## 2196 2196            suspend    -1
## 2197 2197          suspended    -1
## 2198 2198         suspicious    -2
## 2199 2199              swear    -2
## 2200 2200           swearing    -2
## 2201 2201             swears    -2
## 2202 2202              sweet     2
## 2203 2203              swift     2
## 2204 2204            swiftly     2
## 2205 2205            swindle    -3
## 2206 2206           swindles    -3
## 2207 2207          swindling    -3
## 2208 2208        sympathetic     2
## 2209 2209           sympathy     2
## 2210 2210               tard    -2
## 2211 2211              tears    -2
## 2212 2212             tender     2
## 2213 2213              tense    -2
## 2214 2214            tension    -1
## 2215 2215           terrible    -3
## 2216 2216           terribly    -3
## 2217 2217           terrific     4
## 2218 2218          terrified    -3
## 2219 2219             terror    -3
## 2220 2220          terrorize    -3
## 2221 2221         terrorized    -3
## 2222 2222         terrorizes    -3
## 2223 2223              thank     2
## 2224 2224           thankful     2
## 2225 2225             thanks     2
## 2226 2226             thorny    -2
## 2227 2227         thoughtful     2
## 2228 2228        thoughtless    -2
## 2229 2229             threat    -2
## 2230 2230           threaten    -2
## 2231 2231         threatened    -2
## 2232 2232        threatening    -2
## 2233 2233          threatens    -2
## 2234 2234            threats    -2
## 2235 2235           thrilled     5
## 2236 2236             thwart    -2
## 2237 2237           thwarted    -2
## 2238 2238          thwarting    -2
## 2239 2239            thwarts    -2
## 2240 2240              timid    -2
## 2241 2241           timorous    -2
## 2242 2242              tired    -2
## 2243 2243               tits    -2
## 2244 2244           tolerant     2
## 2245 2245          toothless    -2
## 2246 2246                top     2
## 2247 2247               tops     2
## 2248 2248               torn    -2
## 2249 2249            torture    -4
## 2250 2250           tortured    -4
## 2251 2251           tortures    -4
## 2252 2252          torturing    -4
## 2253 2253       totalitarian    -2
## 2254 2254    totalitarianism    -2
## 2255 2255               tout    -2
## 2256 2256             touted    -2
## 2257 2257            touting    -2
## 2258 2258              touts    -2
## 2259 2259            tragedy    -2
## 2260 2260             tragic    -2
## 2261 2261           tranquil     2
## 2262 2262               trap    -1
## 2263 2263            trapped    -2
## 2264 2264             trauma    -3
## 2265 2265          traumatic    -3
## 2266 2266           travesty    -2
## 2267 2267            treason    -3
## 2268 2268         treasonous    -3
## 2269 2269           treasure     2
## 2270 2270          treasures     2
## 2271 2271          trembling    -2
## 2272 2272          tremulous    -2
## 2273 2273            tricked    -2
## 2274 2274           trickery    -2
## 2275 2275            triumph     4
## 2276 2276         triumphant     4
## 2277 2277            trouble    -2
## 2278 2278           troubled    -2
## 2279 2279           troubles    -2
## 2280 2280               true     2
## 2281 2281              trust     1
## 2282 2282            trusted     2
## 2283 2283              tumor    -2
## 2284 2284               twat    -5
## 2285 2285               ugly    -3
## 2286 2286       unacceptable    -2
## 2287 2287      unappreciated    -2
## 2288 2288         unapproved    -2
## 2289 2289            unaware    -2
## 2290 2290       unbelievable    -1
## 2291 2291        unbelieving    -1
## 2292 2292           unbiased     2
## 2293 2293          uncertain    -1
## 2294 2294            unclear    -1
## 2295 2295      uncomfortable    -2
## 2296 2296        unconcerned    -2
## 2297 2297        unconfirmed    -1
## 2298 2298        unconvinced    -1
## 2299 2299         uncredited    -1
## 2300 2300          undecided    -1
## 2301 2301      underestimate    -1
## 2302 2302     underestimated    -1
## 2303 2303     underestimates    -1
## 2304 2304    underestimating    -1
## 2305 2305          undermine    -2
## 2306 2306         undermined    -2
## 2307 2307         undermines    -2
## 2308 2308        undermining    -2
## 2309 2309        undeserving    -2
## 2310 2310        undesirable    -2
## 2311 2311             uneasy    -2
## 2312 2312       unemployment    -2
## 2313 2313            unequal    -1
## 2314 2314          unequaled     2
## 2315 2315          unethical    -2
## 2316 2316             unfair    -2
## 2317 2317          unfocused    -2
## 2318 2318        unfulfilled    -2
## 2319 2319            unhappy    -2
## 2320 2320          unhealthy    -2
## 2321 2321            unified     1
## 2322 2322        unimpressed    -2
## 2323 2323      unintelligent    -2
## 2324 2324             united     1
## 2325 2325             unjust    -2
## 2326 2326          unlovable    -2
## 2327 2327            unloved    -2
## 2328 2328          unmatched     1
## 2329 2329        unmotivated    -2
## 2330 2330     unprofessional    -2
## 2331 2331       unresearched    -2
## 2332 2332        unsatisfied    -2
## 2333 2333          unsecured    -2
## 2334 2334          unsettled    -1
## 2335 2335    unsophisticated    -2
## 2336 2336           unstable    -2
## 2337 2337        unstoppable     2
## 2338 2338        unsupported    -2
## 2339 2339             unsure    -1
## 2340 2340        untarnished     2
## 2341 2341           unwanted    -2
## 2342 2342           unworthy    -2
## 2343 2343              upset    -2
## 2344 2344             upsets    -2
## 2345 2345          upsetting    -2
## 2346 2346            uptight    -2
## 2347 2347             urgent    -1
## 2348 2348             useful     2
## 2349 2349         usefulness     2
## 2350 2350            useless    -2
## 2351 2351        uselessness    -2
## 2352 2352              vague    -2
## 2353 2353           validate     1
## 2354 2354          validated     1
## 2355 2355          validates     1
## 2356 2356         validating     1
## 2357 2357            verdict    -1
## 2358 2358           verdicts    -1
## 2359 2359             vested     1
## 2360 2360           vexation    -2
## 2361 2361             vexing    -2
## 2362 2362            vibrant     3
## 2363 2363            vicious    -2
## 2364 2364             victim    -3
## 2365 2365          victimize    -3
## 2366 2366         victimized    -3
## 2367 2367         victimizes    -3
## 2368 2368        victimizing    -3
## 2369 2369            victims    -3
## 2370 2370           vigilant     3
## 2371 2371               vile    -3
## 2372 2372          vindicate     2
## 2373 2373         vindicated     2
## 2374 2374         vindicates     2
## 2375 2375        vindicating     2
## 2376 2376            violate    -2
## 2377 2377           violated    -2
## 2378 2378           violates    -2
## 2379 2379          violating    -2
## 2380 2380           violence    -3
## 2381 2381            violent    -3
## 2382 2382           virtuous     2
## 2383 2383           virulent    -2
## 2384 2384             vision     1
## 2385 2385          visionary     3
## 2386 2386          visioning     1
## 2387 2387            visions     1
## 2388 2388           vitality     3
## 2389 2389            vitamin     1
## 2390 2390          vitriolic    -3
## 2391 2391          vivacious     3
## 2392 2392         vociferous    -1
## 2393 2393      vulnerability    -2
## 2394 2394         vulnerable    -2
## 2395 2395            walkout    -2
## 2396 2396           walkouts    -2
## 2397 2397             wanker    -3
## 2398 2398               want     1
## 2399 2399                war    -2
## 2400 2400            warfare    -2
## 2401 2401               warm     1
## 2402 2402             warmth     2
## 2403 2403               warn    -2
## 2404 2404             warned    -2
## 2405 2405            warning    -3
## 2406 2406           warnings    -3
## 2407 2407              warns    -2
## 2408 2408              waste    -1
## 2409 2409             wasted    -2
## 2410 2410            wasting    -2
## 2411 2411           wavering    -1
## 2412 2412               weak    -2
## 2413 2413           weakness    -2
## 2414 2414             wealth     3
## 2415 2415            wealthy     2
## 2416 2416              weary    -2
## 2417 2417               weep    -2
## 2418 2418            weeping    -2
## 2419 2419              weird    -2
## 2420 2420            welcome     2
## 2421 2421           welcomed     2
## 2422 2422           welcomes     2
## 2423 2423          whimsical     1
## 2424 2424          whitewash    -3
## 2425 2425              whore    -4
## 2426 2426             wicked    -2
## 2427 2427            widowed    -1
## 2428 2428        willingness     2
## 2429 2429                win     4
## 2430 2430             winner     4
## 2431 2431            winning     4
## 2432 2432               wins     4
## 2433 2433             winwin     3
## 2434 2434               wish     1
## 2435 2435             wishes     1
## 2436 2436            wishing     1
## 2437 2437         withdrawal    -3
## 2438 2438          woebegone    -2
## 2439 2439             woeful    -3
## 2440 2440                won     3
## 2441 2441          wonderful     4
## 2442 2442                woo     3
## 2443 2443             woohoo     3
## 2444 2444               wooo     4
## 2445 2445               woow     4
## 2446 2446               worn    -1
## 2447 2447            worried    -3
## 2448 2448              worry    -3
## 2449 2449           worrying    -3
## 2450 2450              worse    -3
## 2451 2451             worsen    -3
## 2452 2452           worsened    -3
## 2453 2453          worsening    -3
## 2454 2454            worsens    -3
## 2455 2455          worshiped     3
## 2456 2456              worst    -3
## 2457 2457              worth     2
## 2458 2458          worthless    -2
## 2459 2459             worthy     2
## 2460 2460                wow     4
## 2461 2461              wowow     4
## 2462 2462              wowww     4
## 2463 2463           wrathful    -3
## 2464 2464              wreck    -2
## 2465 2465              wrong    -2
## 2466 2466            wronged    -2
## 2467 2467                wtf    -4
## 2468 2468               yeah     1
## 2469 2469           yearning     1
## 2470 2470              yeees     2
## 2471 2471                yes     1
## 2472 2472           youthful     2
## 2473 2473              yucky    -2
## 2474 2474              yummy     3
## 2475 2475             zealot    -2
## 2476 2476            zealots    -2
## 2477 2477            zealous     2

Let’s look at bing

bing <- get_sentiments("bing")

bing
## # A tibble: 6,786 × 2
##    word        sentiment
##    <chr>       <chr>    
##  1 2-faces     negative 
##  2 abnormal    negative 
##  3 abolish     negative 
##  4 abominable  negative 
##  5 abominably  negative 
##  6 abominate   negative 
##  7 abomination negative 
##  8 abort       negative 
##  9 aborted     negative 
## 10 aborts      negative 
## # … with 6,776 more rows

An lastly nrc

nrc <- read.csv("nrc.csv")

nrc
##           X              word    sentiment
## 1         1            abacus        trust
## 2         2           abandon         fear
## 3         3           abandon     negative
## 4         4           abandon      sadness
## 5         5         abandoned        anger
## 6         6         abandoned         fear
## 7         7         abandoned     negative
## 8         8         abandoned      sadness
## 9         9       abandonment        anger
## 10       10       abandonment         fear
## 11       11       abandonment     negative
## 12       12       abandonment      sadness
## 13       13       abandonment     surprise
## 14       14              abba     positive
## 15       15             abbot        trust
## 16       16         abduction         fear
## 17       17         abduction     negative
## 18       18         abduction      sadness
## 19       19         abduction     surprise
## 20       20          aberrant     negative
## 21       21        aberration      disgust
## 22       22        aberration     negative
## 23       23             abhor        anger
## 24       24             abhor      disgust
## 25       25             abhor         fear
## 26       26             abhor     negative
## 27       27         abhorrent        anger
## 28       28         abhorrent      disgust
## 29       29         abhorrent         fear
## 30       30         abhorrent     negative
## 31       31           ability     positive
## 32       32            abject      disgust
## 33       33            abject     negative
## 34       34          abnormal      disgust
## 35       35          abnormal     negative
## 36       36           abolish        anger
## 37       37           abolish     negative
## 38       38         abolition     negative
## 39       39        abominable      disgust
## 40       40        abominable         fear
## 41       41        abominable     negative
## 42       42       abomination        anger
## 43       43       abomination      disgust
## 44       44       abomination         fear
## 45       45       abomination     negative
## 46       46             abort     negative
## 47       47          abortion      disgust
## 48       48          abortion         fear
## 49       49          abortion     negative
## 50       50          abortion      sadness
## 51       51          abortive     negative
## 52       52          abortive      sadness
## 53       53    abovementioned     positive
## 54       54          abrasion     negative
## 55       55          abrogate     negative
## 56       56            abrupt     surprise
## 57       57           abscess     negative
## 58       58           abscess      sadness
## 59       59           absence         fear
## 60       60           absence     negative
## 61       61           absence      sadness
## 62       62            absent     negative
## 63       63            absent      sadness
## 64       64          absentee     negative
## 65       65          absentee      sadness
## 66       66       absenteeism     negative
## 67       67          absolute     positive
## 68       68        absolution          joy
## 69       69        absolution     positive
## 70       70        absolution        trust
## 71       71          absorbed     positive
## 72       72            absurd     negative
## 73       73         absurdity     negative
## 74       74         abundance anticipation
## 75       75         abundance      disgust
## 76       76         abundance          joy
## 77       77         abundance     negative
## 78       78         abundance     positive
## 79       79         abundance        trust
## 80       80          abundant          joy
## 81       81          abundant     positive
## 82       82             abuse        anger
## 83       83             abuse      disgust
## 84       84             abuse         fear
## 85       85             abuse     negative
## 86       86             abuse      sadness
## 87       87           abysmal     negative
## 88       88           abysmal      sadness
## 89       89             abyss         fear
## 90       90             abyss     negative
## 91       91             abyss      sadness
## 92       92          academic     positive
## 93       93          academic        trust
## 94       94           academy     positive
## 95       95        accelerate anticipation
## 96       96        acceptable     positive
## 97       97        acceptance     positive
## 98       98        accessible     positive
## 99       99          accident         fear
## 100     100          accident     negative
## 101     101          accident      sadness
## 102     102          accident     surprise
## 103     103        accidental         fear
## 104     104        accidental     negative
## 105     105        accidental     surprise
## 106     106      accidentally     surprise
## 107     107          accolade anticipation
## 108     108          accolade          joy
## 109     109          accolade     positive
## 110     110          accolade     surprise
## 111     111          accolade        trust
## 112     112     accommodation     positive
## 113     113     accompaniment anticipation
## 114     114     accompaniment          joy
## 115     115     accompaniment     positive
## 116     116     accompaniment        trust
## 117     117        accomplish          joy
## 118     118        accomplish     positive
## 119     119      accomplished          joy
## 120     120      accomplished     positive
## 121     121    accomplishment     positive
## 122     122            accord     positive
## 123     123            accord        trust
## 124     124           account        trust
## 125     125    accountability     positive
## 126     126    accountability        trust
## 127     127       accountable     positive
## 128     128       accountable        trust
## 129     129        accountant        trust
## 130     130          accounts        trust
## 131     131        accredited     positive
## 132     132        accredited        trust
## 133     133           accueil     positive
## 134     134          accurate     positive
## 135     135          accurate        trust
## 136     136          accursed        anger
## 137     137          accursed         fear
## 138     138          accursed     negative
## 139     139          accursed      sadness
## 140     140        accusation        anger
## 141     141        accusation      disgust
## 142     142        accusation     negative
## 143     143        accusative     negative
## 144     144           accused        anger
## 145     145           accused         fear
## 146     146           accused     negative
## 147     147           accuser        anger
## 148     148           accuser         fear
## 149     149           accuser     negative
## 150     150          accusing        anger
## 151     151          accusing         fear
## 152     152          accusing     negative
## 153     153               ace     positive
## 154     154              ache     negative
## 155     155              ache      sadness
## 156     156           achieve          joy
## 157     157           achieve     positive
## 158     158           achieve        trust
## 159     159       achievement anticipation
## 160     160       achievement          joy
## 161     161       achievement     positive
## 162     162       achievement        trust
## 163     163            aching     negative
## 164     164            aching      sadness
## 165     165              acid     negative
## 166     166    acknowledgment     positive
## 167     167           acquire     positive
## 168     168         acquiring anticipation
## 169     169         acquiring     positive
## 170     170           acrobat         fear
## 171     171           acrobat          joy
## 172     172           acrobat     positive
## 173     173           acrobat        trust
## 174     174            action     positive
## 175     175        actionable        anger
## 176     176        actionable      disgust
## 177     177        actionable     negative
## 178     178            actual     positive
## 179     179            acuity     positive
## 180     180            acumen     positive
## 181     181             adapt     positive
## 182     182         adaptable     positive
## 183     183             adder        anger
## 184     184             adder      disgust
## 185     185             adder         fear
## 186     186             adder     negative
## 187     187             adder      sadness
## 188     188         addiction     negative
## 189     189         addresses anticipation
## 190     190         addresses     positive
## 191     191             adept     positive
## 192     192          adequacy     positive
## 193     193          adhering        trust
## 194     194           adipose     negative
## 195     195        adjudicate         fear
## 196     196        adjudicate     negative
## 197     197           adjunct     positive
## 198     198    administrative        trust
## 199     199         admirable          joy
## 200     200         admirable     positive
## 201     201         admirable        trust
## 202     202           admiral     positive
## 203     203           admiral        trust
## 204     204        admiration          joy
## 205     205        admiration     positive
## 206     206        admiration        trust
## 207     207            admire     positive
## 208     208            admire        trust
## 209     209           admirer     positive
## 210     210        admissible     positive
## 211     211        admissible        trust
## 212     212        admonition         fear
## 213     213        admonition     negative
## 214     214          adorable          joy
## 215     215          adorable     positive
## 216     216         adoration          joy
## 217     217         adoration     positive
## 218     218         adoration        trust
## 219     219             adore anticipation
## 220     220             adore          joy
## 221     221             adore     positive
## 222     222             adore        trust
## 223     223            adrift anticipation
## 224     224            adrift         fear
## 225     225            adrift     negative
## 226     226            adrift      sadness
## 227     227       adulterated     negative
## 228     228          adultery      disgust
## 229     229          adultery     negative
## 230     230          adultery      sadness
## 231     231           advance anticipation
## 232     232           advance         fear
## 233     233           advance          joy
## 234     234           advance     positive
## 235     235           advance     surprise
## 236     236          advanced     positive
## 237     237       advancement     positive
## 238     238         advantage     positive
## 239     239      advantageous     positive
## 240     240            advent anticipation
## 241     241            advent          joy
## 242     242            advent     positive
## 243     243            advent        trust
## 244     244         adventure anticipation
## 245     245         adventure     positive
## 246     246       adventurous     positive
## 247     247         adversary        anger
## 248     248         adversary     negative
## 249     249           adverse        anger
## 250     250           adverse      disgust
## 251     251           adverse         fear
## 252     252           adverse     negative
## 253     253           adverse      sadness
## 254     254         adversity        anger
## 255     255         adversity         fear
## 256     256         adversity     negative
## 257     257         adversity      sadness
## 258     258            advice        trust
## 259     259         advisable     positive
## 260     260         advisable        trust
## 261     261            advise     positive
## 262     262            advise        trust
## 263     263           advised        trust
## 264     264           adviser     positive
## 265     265           adviser        trust
## 266     266          advocacy        anger
## 267     267          advocacy anticipation
## 268     268          advocacy          joy
## 269     269          advocacy     positive
## 270     270          advocacy        trust
## 271     271          advocate        trust
## 272     272         aesthetic     positive
## 273     273        aesthetics          joy
## 274     274        aesthetics     positive
## 275     275           affable     positive
## 276     276         affection          joy
## 277     277         affection     positive
## 278     278         affection        trust
## 279     279        affiliated     positive
## 280     280            affirm     positive
## 281     281            affirm        trust
## 282     282       affirmation     positive
## 283     283       affirmative     positive
## 284     284     affirmatively     positive
## 285     285     affirmatively        trust
## 286     286           afflict         fear
## 287     287           afflict     negative
## 288     288           afflict      sadness
## 289     289         afflicted     negative
## 290     290        affliction      disgust
## 291     291        affliction         fear
## 292     292        affliction     negative
## 293     293        affliction      sadness
## 294     294         affluence          joy
## 295     295         affluence     positive
## 296     296          affluent     positive
## 297     297            afford     positive
## 298     298           affront        anger
## 299     299           affront      disgust
## 300     300           affront         fear
## 301     301           affront     negative
## 302     302           affront      sadness
## 303     303           affront     surprise
## 304     304            afraid         fear
## 305     305            afraid     negative
## 306     306         aftermath        anger
## 307     307         aftermath      disgust
## 308     308         aftermath         fear
## 309     309         aftermath     negative
## 310     310         aftermath      sadness
## 311     311        aftertaste     negative
## 312     312               aga         fear
## 313     313               aga     positive
## 314     314               aga        trust
## 315     315        aggravated        anger
## 316     316        aggravated     negative
## 317     317       aggravating        anger
## 318     318       aggravating     negative
## 319     319       aggravating      sadness
## 320     320       aggravation        anger
## 321     321       aggravation      disgust
## 322     322       aggravation     negative
## 323     323        aggression        anger
## 324     324        aggression         fear
## 325     325        aggression     negative
## 326     326        aggressive        anger
## 327     327        aggressive         fear
## 328     328        aggressive     negative
## 329     329         aggressor        anger
## 330     330         aggressor         fear
## 331     331         aggressor     negative
## 332     332            aghast      disgust
## 333     333            aghast         fear
## 334     334            aghast     negative
## 335     335            aghast     surprise
## 336     336             agile     positive
## 337     337           agility     positive
## 338     338          agitated        anger
## 339     339          agitated     negative
## 340     340         agitation        anger
## 341     341         agitation     negative
## 342     342         agonizing         fear
## 343     343         agonizing     negative
## 344     344             agony        anger
## 345     345             agony         fear
## 346     346             agony     negative
## 347     347             agony      sadness
## 348     348             agree     positive
## 349     349         agreeable     positive
## 350     350         agreeable        trust
## 351     351            agreed     positive
## 352     352            agreed        trust
## 353     353          agreeing     positive
## 354     354          agreeing        trust
## 355     355         agreement     positive
## 356     356         agreement        trust
## 357     357       agriculture     positive
## 358     358           aground     negative
## 359     359             ahead     positive
## 360     360               aid     positive
## 361     361            aiding     positive
## 362     362               ail     negative
## 363     363               ail      sadness
## 364     364            ailing         fear
## 365     365            ailing     negative
## 366     366            ailing      sadness
## 367     367           aimless     negative
## 368     368           airport anticipation
## 369     369              airs      disgust
## 370     370              airs     negative
## 371     371              akin        trust
## 372     372         alabaster     positive
## 373     373             alarm         fear
## 374     374             alarm     negative
## 375     375             alarm     surprise
## 376     376          alarming         fear
## 377     377          alarming     negative
## 378     378          alarming     surprise
## 379     379               alb        trust
## 380     380        alcoholism        anger
## 381     381        alcoholism      disgust
## 382     382        alcoholism         fear
## 383     383        alcoholism     negative
## 384     384        alcoholism      sadness
## 385     385         alertness anticipation
## 386     386         alertness         fear
## 387     387         alertness     positive
## 388     388         alertness     surprise
## 389     389            alerts anticipation
## 390     390            alerts         fear
## 391     391            alerts     surprise
## 392     392             alien      disgust
## 393     393             alien         fear
## 394     394             alien     negative
## 395     395          alienate        anger
## 396     396          alienate      disgust
## 397     397          alienate     negative
## 398     398         alienated     negative
## 399     399         alienated      sadness
## 400     400        alienation        anger
## 401     401        alienation      disgust
## 402     402        alienation         fear
## 403     403        alienation     negative
## 404     404        alienation      sadness
## 405     405      alimentation     positive
## 406     406           alimony     negative
## 407     407             alive anticipation
## 408     408             alive          joy
## 409     409             alive     positive
## 410     410             alive        trust
## 411     411             allay     positive
## 412     412        allegation        anger
## 413     413        allegation     negative
## 414     414            allege     negative
## 415     415        allegiance     positive
## 416     416        allegiance        trust
## 417     417           allegro     positive
## 418     418         alleviate     positive
## 419     419       alleviation     positive
## 420     420          alliance        trust
## 421     421            allied     positive
## 422     422            allied        trust
## 423     423         allowable     positive
## 424     424            allure anticipation
## 425     425            allure          joy
## 426     426            allure     positive
## 427     427            allure     surprise
## 428     428          alluring     positive
## 429     429              ally     positive
## 430     430              ally        trust
## 431     431          almighty     positive
## 432     432             aloha anticipation
## 433     433             aloha          joy
## 434     434             aloha     positive
## 435     435             aloof     negative
## 436     436       altercation        anger
## 437     437       altercation     negative
## 438     438             amaze     surprise
## 439     439         amazingly          joy
## 440     440         amazingly     positive
## 441     441         amazingly     surprise
## 442     442        ambassador     positive
## 443     443        ambassador        trust
## 444     444         ambiguous     negative
## 445     445          ambition anticipation
## 446     446          ambition          joy
## 447     447          ambition     positive
## 448     448          ambition        trust
## 449     449         ambulance         fear
## 450     450         ambulance        trust
## 451     451            ambush        anger
## 452     452            ambush         fear
## 453     453            ambush     negative
## 454     454            ambush     surprise
## 455     455        ameliorate     positive
## 456     456              amen          joy
## 457     457              amen     positive
## 458     458              amen        trust
## 459     459          amenable     positive
## 460     460             amend     positive
## 461     461            amends     positive
## 462     462           amenity     positive
## 463     463           amiable     positive
## 464     464          amicable          joy
## 465     465          amicable     positive
## 466     466           ammonia      disgust
## 467     467           amnesia     negative
## 468     468           amnesty          joy
## 469     469           amnesty     positive
## 470     470      amortization        trust
## 471     471             amour anticipation
## 472     472             amour          joy
## 473     473             amour     positive
## 474     474             amour        trust
## 475     475      amphetamines      disgust
## 476     476      amphetamines     negative
## 477     477             amuse          joy
## 478     478             amuse     positive
## 479     479            amused          joy
## 480     480            amused     positive
## 481     481         amusement          joy
## 482     482         amusement     positive
## 483     483           amusing          joy
## 484     484           amusing     positive
## 485     485          anaconda      disgust
## 486     486          anaconda         fear
## 487     487          anaconda     negative
## 488     488              anal     negative
## 489     489           analyst anticipation
## 490     490           analyst     positive
## 491     491           analyst        trust
## 492     492         anarchism        anger
## 493     493         anarchism         fear
## 494     494         anarchism     negative
## 495     495         anarchist        anger
## 496     496         anarchist         fear
## 497     497         anarchist     negative
## 498     498           anarchy        anger
## 499     499           anarchy         fear
## 500     500           anarchy     negative
## 501     501          anathema        anger
## 502     502          anathema      disgust
## 503     503          anathema         fear
## 504     504          anathema     negative
## 505     505          anathema      sadness
## 506     506         ancestral        trust
## 507     507            anchor     positive
## 508     508         anchorage     positive
## 509     509         anchorage      sadness
## 510     510           ancient     negative
## 511     511             angel anticipation
## 512     512             angel          joy
## 513     513             angel     positive
## 514     514             angel     surprise
## 515     515             angel        trust
## 516     516           angelic          joy
## 517     517           angelic     positive
## 518     518           angelic        trust
## 519     519             anger        anger
## 520     520             anger     negative
## 521     521            angina         fear
## 522     522            angina     negative
## 523     523           angling anticipation
## 524     524           angling     negative
## 525     525             angry        anger
## 526     526             angry      disgust
## 527     527             angry     negative
## 528     528           anguish        anger
## 529     529           anguish         fear
## 530     530           anguish     negative
## 531     531           anguish      sadness
## 532     532           animate     positive
## 533     533          animated          joy
## 534     534          animated     positive
## 535     535         animosity        anger
## 536     536         animosity      disgust
## 537     537         animosity         fear
## 538     538         animosity     negative
## 539     539         animosity      sadness
## 540     540            animus        anger
## 541     541            animus     negative
## 542     542        annihilate        anger
## 543     543        annihilate         fear
## 544     544        annihilate     negative
## 545     545       annihilated        anger
## 546     546       annihilated         fear
## 547     547       annihilated     negative
## 548     548       annihilated      sadness
## 549     549      annihilation        anger
## 550     550      annihilation         fear
## 551     551      annihilation     negative
## 552     552      annihilation      sadness
## 553     553      announcement anticipation
## 554     554             annoy        anger
## 555     555             annoy      disgust
## 556     556             annoy     negative
## 557     557         annoyance        anger
## 558     558         annoyance      disgust
## 559     559         annoyance     negative
## 560     560          annoying        anger
## 561     561          annoying     negative
## 562     562             annul     negative
## 563     563         annulment     negative
## 564     564         annulment      sadness
## 565     565           anomaly         fear
## 566     566           anomaly     negative
## 567     567           anomaly     surprise
## 568     568         anonymous     negative
## 569     569        answerable        trust
## 570     570        antagonism        anger
## 571     571        antagonism     negative
## 572     572        antagonist        anger
## 573     573        antagonist     negative
## 574     574      antagonistic        anger
## 575     575      antagonistic      disgust
## 576     576      antagonistic     negative
## 577     577           anthrax      disgust
## 578     578           anthrax         fear
## 579     579           anthrax     negative
## 580     580           anthrax      sadness
## 581     581       antibiotics     positive
## 582     582        antichrist        anger
## 583     583        antichrist      disgust
## 584     584        antichrist         fear
## 585     585        antichrist     negative
## 586     586      anticipation anticipation
## 587     587      anticipatory anticipation
## 588     588          antidote anticipation
## 589     589          antidote     positive
## 590     590          antidote        trust
## 591     591        antifungal     positive
## 592     592        antifungal        trust
## 593     593         antipathy        anger
## 594     594         antipathy      disgust
## 595     595         antipathy     negative
## 596     596        antiquated     negative
## 597     597           antique     positive
## 598     598        antiseptic     positive
## 599     599        antiseptic        trust
## 600     600        antisocial        anger
## 601     601        antisocial      disgust
## 602     602        antisocial         fear
## 603     603        antisocial     negative
## 604     604        antisocial      sadness
## 605     605        antithesis        anger
## 606     606        antithesis     negative
## 607     607           anxiety        anger
## 608     608           anxiety anticipation
## 609     609           anxiety         fear
## 610     610           anxiety     negative
## 611     611           anxiety      sadness
## 612     612           anxious anticipation
## 613     613           anxious         fear
## 614     614           anxious     negative
## 615     615            apache         fear
## 616     616            apache     negative
## 617     617         apathetic     negative
## 618     618         apathetic      sadness
## 619     619            apathy     negative
## 620     620            apathy      sadness
## 621     621             aphid      disgust
## 622     622             aphid     negative
## 623     623            aplomb     positive
## 624     624        apologetic     positive
## 625     625        apologetic        trust
## 626     626         apologize     positive
## 627     627         apologize      sadness
## 628     628         apologize        trust
## 629     629           apology     positive
## 630     630           apostle     positive
## 631     631           apostle        trust
## 632     632         apostolic        trust
## 633     633         appalling      disgust
## 634     634         appalling         fear
## 635     635         appalling     negative
## 636     636        apparition         fear
## 637     637        apparition     surprise
## 638     638            appeal anticipation
## 639     639      appendicitis         fear
## 640     640      appendicitis     negative
## 641     641      appendicitis      sadness
## 642     642          applause          joy
## 643     643          applause     positive
## 644     644          applause     surprise
## 645     645          applause        trust
## 646     646         applicant anticipation
## 647     647      appreciation          joy
## 648     648      appreciation     positive
## 649     649      appreciation        trust
## 650     650         apprehend         fear
## 651     651      apprehension         fear
## 652     652      apprehension     negative
## 653     653      apprehensive anticipation
## 654     654      apprehensive         fear
## 655     655      apprehensive     negative
## 656     656        apprentice        trust
## 657     657       approaching anticipation
## 658     658       approbation     positive
## 659     659       approbation        trust
## 660     660     appropriation     negative
## 661     661          approval     positive
## 662     662           approve          joy
## 663     663           approve     positive
## 664     664           approve        trust
## 665     665         approving     positive
## 666     666               apt     positive
## 667     667          aptitude     positive
## 668     668           arbiter        trust
## 669     669       arbitration anticipation
## 670     670        arbitrator        trust
## 671     671       archaeology anticipation
## 672     672       archaeology     positive
## 673     673           archaic     negative
## 674     674      architecture        trust
## 675     675            ardent anticipation
## 676     676            ardent          joy
## 677     677            ardent     positive
## 678     678             ardor     positive
## 679     679           arduous     negative
## 680     680             argue        anger
## 681     681             argue     negative
## 682     682          argument        anger
## 683     683          argument     negative
## 684     684     argumentation        anger
## 685     685     argumentative     negative
## 686     686         arguments        anger
## 687     687              arid     negative
## 688     688              arid      sadness
## 689     689       aristocracy     positive
## 690     690      aristocratic     positive
## 691     691          armament        anger
## 692     692          armament         fear
## 693     693         armaments         fear
## 694     694         armaments     negative
## 695     695             armed        anger
## 696     696             armed         fear
## 697     697             armed     negative
## 698     698             armed     positive
## 699     699             armor         fear
## 700     700             armor     positive
## 701     701             armor        trust
## 702     702           armored         fear
## 703     703            armory        trust
## 704     704             aroma     positive
## 705     705            arouse anticipation
## 706     706            arouse     positive
## 707     707       arraignment        anger
## 708     708       arraignment         fear
## 709     709       arraignment     negative
## 710     710       arraignment      sadness
## 711     711             array     positive
## 712     712           arrears     negative
## 713     713            arrest     negative
## 714     714           arrival anticipation
## 715     715            arrive anticipation
## 716     716         arrogance     negative
## 717     717          arrogant        anger
## 718     718          arrogant      disgust
## 719     719          arrogant     negative
## 720     720           arsenic      disgust
## 721     721           arsenic         fear
## 722     722           arsenic     negative
## 723     723           arsenic      sadness
## 724     724             arson        anger
## 725     725             arson         fear
## 726     726             arson     negative
## 727     727               art anticipation
## 728     728               art          joy
## 729     729               art     positive
## 730     730               art      sadness
## 731     731               art     surprise
## 732     732        articulate     positive
## 733     733      articulation     positive
## 734     734         artillery         fear
## 735     735         artillery     negative
## 736     736           artisan     positive
## 737     737           artiste     positive
## 738     738          artistic     positive
## 739     739        ascendancy     positive
## 740     740            ascent     positive
## 741     741               ash     negative
## 742     742           ashamed      disgust
## 743     743           ashamed     negative
## 744     744           ashamed      sadness
## 745     745             ashes     negative
## 746     746             ashes      sadness
## 747     747               asp         fear
## 748     748        aspiration anticipation
## 749     749        aspiration          joy
## 750     750        aspiration     positive
## 751     751        aspiration     surprise
## 752     752        aspiration        trust
## 753     753            aspire anticipation
## 754     754            aspire          joy
## 755     755            aspire     positive
## 756     756          aspiring anticipation
## 757     757          aspiring          joy
## 758     758          aspiring     positive
## 759     759          aspiring        trust
## 760     760               ass     negative
## 761     761            assail        anger
## 762     762            assail         fear
## 763     763            assail     negative
## 764     764            assail     surprise
## 765     765         assailant        anger
## 766     766         assailant         fear
## 767     767         assailant     negative
## 768     768         assailant      sadness
## 769     769          assassin        anger
## 770     770          assassin         fear
## 771     771          assassin     negative
## 772     772          assassin      sadness
## 773     773       assassinate        anger
## 774     774       assassinate         fear
## 775     775       assassinate     negative
## 776     776     assassination        anger
## 777     777     assassination         fear
## 778     778     assassination     negative
## 779     779     assassination      sadness
## 780     780           assault        anger
## 781     781           assault         fear
## 782     782           assault     negative
## 783     783          assembly     positive
## 784     784          assembly        trust
## 785     785            assent     positive
## 786     786         asserting     positive
## 787     787         asserting        trust
## 788     788        assessment     surprise
## 789     789        assessment        trust
## 790     790          assessor        trust
## 791     791            assets     positive
## 792     792           asshole        anger
## 793     793           asshole      disgust
## 794     794           asshole     negative
## 795     795          assignee        trust
## 796     796            assist     positive
## 797     797            assist        trust
## 798     798        assistance     positive
## 799     799         associate     positive
## 800     800         associate        trust
## 801     801       association        trust
## 802     802           assuage     positive
## 803     803         assurance     positive
## 804     804         assurance        trust
## 805     805            assure        trust
## 806     806           assured     positive
## 807     807           assured        trust
## 808     808         assuredly        trust
## 809     809     astonishingly     positive
## 810     810     astonishingly     surprise
## 811     811      astonishment          joy
## 812     812      astonishment     positive
## 813     813      astonishment     surprise
## 814     814            astray         fear
## 815     815            astray     negative
## 816     816        astringent     negative
## 817     817        astrologer anticipation
## 818     818        astrologer     positive
## 819     819         astronaut     positive
## 820     820        astronomer anticipation
## 821     821        astronomer     positive
## 822     822            astute     positive
## 823     823            asylum         fear
## 824     824            asylum     negative
## 825     825         asymmetry      disgust
## 826     826           atheism     negative
## 827     827   atherosclerosis         fear
## 828     828   atherosclerosis     negative
## 829     829   atherosclerosis      sadness
## 830     830           athlete     positive
## 831     831          athletic     positive
## 832     832              atom     positive
## 833     833             atone anticipation
## 834     834             atone          joy
## 835     835             atone     positive
## 836     836             atone        trust
## 837     837         atonement     positive
## 838     838         atrocious        anger
## 839     839         atrocious      disgust
## 840     840         atrocious     negative
## 841     841          atrocity        anger
## 842     842          atrocity      disgust
## 843     843          atrocity         fear
## 844     844          atrocity     negative
## 845     845          atrocity      sadness
## 846     846           atrophy      disgust
## 847     847           atrophy         fear
## 848     848           atrophy     negative
## 849     849           atrophy      sadness
## 850     850        attachment     positive
## 851     851            attack        anger
## 852     852            attack         fear
## 853     853            attack     negative
## 854     854         attacking        anger
## 855     855         attacking      disgust
## 856     856         attacking         fear
## 857     857         attacking     negative
## 858     858         attacking      sadness
## 859     859         attacking     surprise
## 860     860        attainable anticipation
## 861     861        attainable     positive
## 862     862        attainment     positive
## 863     863           attempt anticipation
## 864     864        attendance anticipation
## 865     865         attendant     positive
## 866     866         attendant        trust
## 867     867         attention     positive
## 868     868         attentive     positive
## 869     869         attentive        trust
## 870     870        attenuated     negative
## 871     871       attenuation     negative
## 872     872       attenuation      sadness
## 873     873            attest     positive
## 874     874            attest        trust
## 875     875       attestation        trust
## 876     876          attorney        anger
## 877     877          attorney         fear
## 878     878          attorney     positive
## 879     879          attorney        trust
## 880     880        attraction     positive
## 881     881    attractiveness     positive
## 882     882           auction anticipation
## 883     883          audacity     negative
## 884     884          audience anticipation
## 885     885           auditor         fear
## 886     886           auditor        trust
## 887     887           augment     positive
## 888     888            august     positive
## 889     889              aunt     positive
## 890     890              aunt        trust
## 891     891              aura     positive
## 892     892        auspicious anticipation
## 893     893        auspicious          joy
## 894     894        auspicious     positive
## 895     895           austere         fear
## 896     896           austere     negative
## 897     897           austere      sadness
## 898     898         austerity     negative
## 899     899         authentic          joy
## 900     900         authentic     positive
## 901     901         authentic        trust
## 902     902      authenticate        trust
## 903     903    authentication        trust
## 904     904      authenticity     positive
## 905     905      authenticity        trust
## 906     906            author     positive
## 907     907            author        trust
## 908     908     authoritative     positive
## 909     909     authoritative        trust
## 910     910         authority     positive
## 911     911         authority        trust
## 912     912     authorization     positive
## 913     913     authorization        trust
## 914     914         authorize        trust
## 915     915        authorized     positive
## 916     916        autocratic     negative
## 917     917         automatic        trust
## 918     918           autopsy      disgust
## 919     919           autopsy         fear
## 920     920           autopsy     negative
## 921     921           autopsy      sadness
## 922     922         avalanche         fear
## 923     923         avalanche     negative
## 924     924         avalanche      sadness
## 925     925         avalanche     surprise
## 926     926           avarice        anger
## 927     927           avarice      disgust
## 928     928           avarice     negative
## 929     929            avatar     positive
## 930     930           avenger        anger
## 931     931           avenger     negative
## 932     932            averse        anger
## 933     933            averse      disgust
## 934     934            averse         fear
## 935     935            averse     negative
## 936     936          aversion        anger
## 937     937          aversion      disgust
## 938     938          aversion         fear
## 939     939          aversion     negative
## 940     940             avoid         fear
## 941     941             avoid     negative
## 942     942         avoidance         fear
## 943     943         avoidance     negative
## 944     944          avoiding         fear
## 945     945             await anticipation
## 946     946             award anticipation
## 947     947             award          joy
## 948     948             award     positive
## 949     949             award     surprise
## 950     950             award        trust
## 951     951             awful        anger
## 952     952             awful      disgust
## 953     953             awful         fear
## 954     954             awful     negative
## 955     955             awful      sadness
## 956     956       awkwardness      disgust
## 957     957       awkwardness     negative
## 958     958              awry     negative
## 959     959             axiom        trust
## 960     960         axiomatic        trust
## 961     961                ay     positive
## 962     962               aye     positive
## 963     963            babble     negative
## 964     964          babbling     negative
## 965     965            baboon      disgust
## 966     966            baboon     negative
## 967     967              baby          joy
## 968     968              baby     positive
## 969     969        babysitter        trust
## 970     970     baccalaureate     positive
## 971     971          backbone        anger
## 972     972          backbone     positive
## 973     973          backbone        trust
## 974     974            backer        trust
## 975     975          backward     negative
## 976     976         backwards      disgust
## 977     977         backwards     negative
## 978     978         backwater     negative
## 979     979         backwater      sadness
## 980     980          bacteria      disgust
## 981     981          bacteria         fear
## 982     982          bacteria     negative
## 983     983          bacteria      sadness
## 984     984         bacterium      disgust
## 985     985         bacterium         fear
## 986     986         bacterium     negative
## 987     987               bad        anger
## 988     988               bad      disgust
## 989     989               bad         fear
## 990     990               bad     negative
## 991     991               bad      sadness
## 992     992             badge        trust
## 993     993            badger        anger
## 994     994            badger     negative
## 995     995             badly     negative
## 996     996             badly      sadness
## 997     997           badness        anger
## 998     998           badness      disgust
## 999     999           badness         fear
## 1000   1000           badness     negative
## 1001   1001           bailiff         fear
## 1002   1002           bailiff     negative
## 1003   1003           bailiff        trust
## 1004   1004              bait         fear
## 1005   1005              bait     negative
## 1006   1006              bait        trust
## 1007   1007           balance     positive
## 1008   1008          balanced     positive
## 1009   1009              bale         fear
## 1010   1010              bale     negative
## 1011   1011              balk     negative
## 1012   1012            ballad     positive
## 1013   1013            ballet     positive
## 1014   1014            ballot anticipation
## 1015   1015            ballot     positive
## 1016   1016            ballot        trust
## 1017   1017              balm anticipation
## 1018   1018              balm          joy
## 1019   1019              balm     negative
## 1020   1020              balm     positive
## 1021   1021            balsam     positive
## 1022   1022               ban     negative
## 1023   1023            bandit     negative
## 1024   1024              bane        anger
## 1025   1025              bane      disgust
## 1026   1026              bane         fear
## 1027   1027              bane     negative
## 1028   1028              bang        anger
## 1029   1029              bang      disgust
## 1030   1030              bang         fear
## 1031   1031              bang     negative
## 1032   1032              bang      sadness
## 1033   1033              bang     surprise
## 1034   1034            banger        anger
## 1035   1035            banger anticipation
## 1036   1036            banger         fear
## 1037   1037            banger     negative
## 1038   1038            banger     surprise
## 1039   1039            banish        anger
## 1040   1040            banish      disgust
## 1041   1041            banish         fear
## 1042   1042            banish     negative
## 1043   1043            banish      sadness
## 1044   1044          banished        anger
## 1045   1045          banished         fear
## 1046   1046          banished     negative
## 1047   1047          banished      sadness
## 1048   1048        banishment        anger
## 1049   1049        banishment      disgust
## 1050   1050        banishment     negative
## 1051   1051        banishment      sadness
## 1052   1052              bank        trust
## 1053   1053            banker        trust
## 1054   1054          bankrupt         fear
## 1055   1055          bankrupt     negative
## 1056   1056          bankrupt      sadness
## 1057   1057        bankruptcy        anger
## 1058   1058        bankruptcy      disgust
## 1059   1059        bankruptcy         fear
## 1060   1060        bankruptcy     negative
## 1061   1061        bankruptcy      sadness
## 1062   1062           banquet anticipation
## 1063   1063           banquet          joy
## 1064   1064           banquet     positive
## 1065   1065           banshee        anger
## 1066   1066           banshee      disgust
## 1067   1067           banshee         fear
## 1068   1068           banshee     negative
## 1069   1069           banshee      sadness
## 1070   1070           baptism     positive
## 1071   1071         baptismal          joy
## 1072   1072         baptismal     positive
## 1073   1073              barb        anger
## 1074   1074              barb     negative
## 1075   1075         barbarian         fear
## 1076   1076         barbarian     negative
## 1077   1077          barbaric        anger
## 1078   1078          barbaric      disgust
## 1079   1079          barbaric         fear
## 1080   1080          barbaric     negative
## 1081   1081         barbarism     negative
## 1082   1082              bard     positive
## 1083   1083              barf      disgust
## 1084   1084           bargain     positive
## 1085   1085           bargain        trust
## 1086   1086              bark        anger
## 1087   1087              bark     negative
## 1088   1088            barred     negative
## 1089   1089            barren     negative
## 1090   1090            barren      sadness
## 1091   1091         barricade         fear
## 1092   1092         barricade     negative
## 1093   1093           barrier        anger
## 1094   1094           barrier     negative
## 1095   1095            barrow      disgust
## 1096   1096         bartender        trust
## 1097   1097            barter        trust
## 1098   1098              base        trust
## 1099   1099          baseless     negative
## 1100   1100        basketball anticipation
## 1101   1101        basketball          joy
## 1102   1102        basketball     positive
## 1103   1103           bastard      disgust
## 1104   1104           bastard     negative
## 1105   1105           bastard      sadness
## 1106   1106           bastion        anger
## 1107   1107           bastion     positive
## 1108   1108              bath     positive
## 1109   1109         battalion        anger
## 1110   1110            batter        anger
## 1111   1111            batter         fear
## 1112   1112            batter     negative
## 1113   1113          battered         fear
## 1114   1114          battered     negative
## 1115   1115          battered      sadness
## 1116   1116           battery        anger
## 1117   1117           battery     negative
## 1118   1118            battle        anger
## 1119   1119            battle     negative
## 1120   1120           battled        anger
## 1121   1121           battled         fear
## 1122   1122           battled     negative
## 1123   1123           battled      sadness
## 1124   1124       battlefield         fear
## 1125   1125       battlefield     negative
## 1126   1126             bawdy     negative
## 1127   1127           bayonet        anger
## 1128   1128           bayonet         fear
## 1129   1129           bayonet     negative
## 1130   1130             beach          joy
## 1131   1131              beam          joy
## 1132   1132              beam     positive
## 1133   1133           beaming anticipation
## 1134   1134           beaming          joy
## 1135   1135           beaming     positive
## 1136   1136              bear        anger
## 1137   1137              bear         fear
## 1138   1138            bearer     negative
## 1139   1139           bearish        anger
## 1140   1140           bearish         fear
## 1141   1141             beast        anger
## 1142   1142             beast         fear
## 1143   1143             beast     negative
## 1144   1144           beastly      disgust
## 1145   1145           beastly         fear
## 1146   1146           beastly     negative
## 1147   1147           beating        anger
## 1148   1148           beating         fear
## 1149   1149           beating     negative
## 1150   1150           beating      sadness
## 1151   1151    beautification          joy
## 1152   1152    beautification     positive
## 1153   1153    beautification        trust
## 1154   1154         beautiful          joy
## 1155   1155         beautiful     positive
## 1156   1156          beautify          joy
## 1157   1157          beautify     positive
## 1158   1158            beauty          joy
## 1159   1159            beauty     positive
## 1160   1160           bedrock     positive
## 1161   1161           bedrock        trust
## 1162   1162               bee        anger
## 1163   1163               bee         fear
## 1164   1164              beer          joy
## 1165   1165              beer     positive
## 1166   1166            befall     negative
## 1167   1167         befitting     positive
## 1168   1168          befriend          joy
## 1169   1169          befriend     positive
## 1170   1170          befriend        trust
## 1171   1171               beg     negative
## 1172   1172               beg      sadness
## 1173   1173            beggar     negative
## 1174   1174            beggar      sadness
## 1175   1175           begging     negative
## 1176   1176             begun anticipation
## 1177   1177          behemoth         fear
## 1178   1178          behemoth     negative
## 1179   1179          beholden     negative
## 1180   1180           belated     negative
## 1181   1181          believed        trust
## 1182   1182          believer        trust
## 1183   1183         believing     positive
## 1184   1184         believing        trust
## 1185   1185          belittle        anger
## 1186   1186          belittle      disgust
## 1187   1187          belittle         fear
## 1188   1188          belittle     negative
## 1189   1189          belittle      sadness
## 1190   1190       belligerent        anger
## 1191   1191       belligerent         fear
## 1192   1192       belligerent     negative
## 1193   1193           bellows        anger
## 1194   1194              belt        anger
## 1195   1195              belt         fear
## 1196   1196              belt     negative
## 1197   1197            bender     negative
## 1198   1198        benefactor     positive
## 1199   1199        benefactor        trust
## 1200   1200        beneficial     positive
## 1201   1201           benefit     positive
## 1202   1202       benevolence          joy
## 1203   1203       benevolence     positive
## 1204   1204       benevolence        trust
## 1205   1205            benign          joy
## 1206   1206            benign     positive
## 1207   1207           bequest        trust
## 1208   1208          bereaved     negative
## 1209   1209          bereaved      sadness
## 1210   1210       bereavement     negative
## 1211   1211       bereavement      sadness
## 1212   1212            bereft     negative
## 1213   1213           berserk        anger
## 1214   1214           berserk     negative
## 1215   1215             berth     positive
## 1216   1216           bestial      disgust
## 1217   1217           bestial         fear
## 1218   1218           bestial     negative
## 1219   1219            betray        anger
## 1220   1220            betray      disgust
## 1221   1221            betray     negative
## 1222   1222            betray      sadness
## 1223   1223            betray     surprise
## 1224   1224          betrayal        anger
## 1225   1225          betrayal      disgust
## 1226   1226          betrayal     negative
## 1227   1227          betrayal      sadness
## 1228   1228         betrothed anticipation
## 1229   1229         betrothed          joy
## 1230   1230         betrothed     positive
## 1231   1231         betrothed        trust
## 1232   1232        betterment     positive
## 1233   1233          beverage     positive
## 1234   1234            beware anticipation
## 1235   1235            beware         fear
## 1236   1236            beware     negative
## 1237   1237        bewildered         fear
## 1238   1238        bewildered     negative
## 1239   1239        bewildered     surprise
## 1240   1240      bewilderment         fear
## 1241   1241      bewilderment     surprise
## 1242   1242              bias        anger
## 1243   1243              bias     negative
## 1244   1244            biased     negative
## 1245   1245          biblical     positive
## 1246   1246         bickering        anger
## 1247   1247         bickering      disgust
## 1248   1248         bickering     negative
## 1249   1249          biennial anticipation
## 1250   1250              bier         fear
## 1251   1251              bier     negative
## 1252   1252              bier      sadness
## 1253   1253             bigot        anger
## 1254   1254             bigot      disgust
## 1255   1255             bigot         fear
## 1256   1256             bigot     negative
## 1257   1257           bigoted        anger
## 1258   1258           bigoted      disgust
## 1259   1259           bigoted         fear
## 1260   1260           bigoted     negative
## 1261   1261           bigoted      sadness
## 1262   1262              bile        anger
## 1263   1263              bile      disgust
## 1264   1264              bile     negative
## 1265   1265         bilingual     positive
## 1266   1266            biopsy         fear
## 1267   1267            biopsy     negative
## 1268   1268             birch        anger
## 1269   1269             birch      disgust
## 1270   1270             birch         fear
## 1271   1271             birch     negative
## 1272   1272             birth anticipation
## 1273   1273             birth         fear
## 1274   1274             birth          joy
## 1275   1275             birth     positive
## 1276   1276             birth        trust
## 1277   1277          birthday anticipation
## 1278   1278          birthday          joy
## 1279   1279          birthday     positive
## 1280   1280          birthday     surprise
## 1281   1281        birthplace        anger
## 1282   1282        birthplace     negative
## 1283   1283             bitch        anger
## 1284   1284             bitch      disgust
## 1285   1285             bitch         fear
## 1286   1286             bitch     negative
## 1287   1287             bitch      sadness
## 1288   1288              bite     negative
## 1289   1289          bitterly        anger
## 1290   1290          bitterly      disgust
## 1291   1291          bitterly     negative
## 1292   1292          bitterly      sadness
## 1293   1293        bitterness        anger
## 1294   1294        bitterness      disgust
## 1295   1295        bitterness     negative
## 1296   1296        bitterness      sadness
## 1297   1297           bizarre     negative
## 1298   1298           bizarre     surprise
## 1299   1299         blackjack     negative
## 1300   1300         blackmail        anger
## 1301   1301         blackmail         fear
## 1302   1302         blackmail     negative
## 1303   1303         blackness         fear
## 1304   1304         blackness     negative
## 1305   1305         blackness      sadness
## 1306   1306             blame        anger
## 1307   1307             blame      disgust
## 1308   1308             blame     negative
## 1309   1309         blameless     positive
## 1310   1310             bland     negative
## 1311   1311           blanket        trust
## 1312   1312       blasphemous        anger
## 1313   1313       blasphemous      disgust
## 1314   1314       blasphemous     negative
## 1315   1315         blasphemy        anger
## 1316   1316         blasphemy     negative
## 1317   1317             blast        anger
## 1318   1318             blast         fear
## 1319   1319             blast     negative
## 1320   1320             blast     surprise
## 1321   1321           blatant        anger
## 1322   1322           blatant      disgust
## 1323   1323           blatant     negative
## 1324   1324           blather     negative
## 1325   1325             blaze        anger
## 1326   1326             blaze     negative
## 1327   1327             bleak     negative
## 1328   1328             bleak      sadness
## 1329   1329          bleeding      disgust
## 1330   1330          bleeding         fear
## 1331   1331          bleeding     negative
## 1332   1332          bleeding      sadness
## 1333   1333           blemish        anger
## 1334   1334           blemish      disgust
## 1335   1335           blemish         fear
## 1336   1336           blemish     negative
## 1337   1337           blemish      sadness
## 1338   1338             bless anticipation
## 1339   1339             bless          joy
## 1340   1340             bless     positive
## 1341   1341             bless        trust
## 1342   1342           blessed          joy
## 1343   1343           blessed     positive
## 1344   1344          blessing anticipation
## 1345   1345          blessing          joy
## 1346   1346          blessing     positive
## 1347   1347          blessing        trust
## 1348   1348         blessings anticipation
## 1349   1349         blessings          joy
## 1350   1350         blessings     positive
## 1351   1351         blessings     surprise
## 1352   1352         blessings        trust
## 1353   1353            blight      disgust
## 1354   1354            blight         fear
## 1355   1355            blight     negative
## 1356   1356            blight      sadness
## 1357   1357          blighted      disgust
## 1358   1358          blighted     negative
## 1359   1359          blighted      sadness
## 1360   1360           blinded     negative
## 1361   1361         blindfold anticipation
## 1362   1362         blindfold         fear
## 1363   1363         blindfold     surprise
## 1364   1364           blindly     negative
## 1365   1365           blindly      sadness
## 1366   1366         blindness     negative
## 1367   1367         blindness      sadness
## 1368   1368             bliss          joy
## 1369   1369             bliss     positive
## 1370   1370          blissful          joy
## 1371   1371          blissful     positive
## 1372   1372           blister      disgust
## 1373   1373           blister     negative
## 1374   1374             blitz     surprise
## 1375   1375           bloated      disgust
## 1376   1376           bloated     negative
## 1377   1377              blob      disgust
## 1378   1378              blob         fear
## 1379   1379              blob     negative
## 1380   1380          blockade        anger
## 1381   1381          blockade         fear
## 1382   1382          blockade     negative
## 1383   1383          blockade      sadness
## 1384   1384         bloodless     positive
## 1385   1385         bloodshed        anger
## 1386   1386         bloodshed      disgust
## 1387   1387         bloodshed         fear
## 1388   1388         bloodshed     negative
## 1389   1389         bloodshed      sadness
## 1390   1390         bloodshed     surprise
## 1391   1391      bloodthirsty        anger
## 1392   1392      bloodthirsty      disgust
## 1393   1393      bloodthirsty         fear
## 1394   1394      bloodthirsty     negative
## 1395   1395            bloody        anger
## 1396   1396            bloody      disgust
## 1397   1397            bloody         fear
## 1398   1398            bloody     negative
## 1399   1399            bloody      sadness
## 1400   1400             bloom anticipation
## 1401   1401             bloom          joy
## 1402   1402             bloom     positive
## 1403   1403             bloom        trust
## 1404   1404           blossom          joy
## 1405   1405           blossom     positive
## 1406   1406              blot     negative
## 1407   1407            blower     negative
## 1408   1408           blowout     negative
## 1409   1409              blue      sadness
## 1410   1410             blues         fear
## 1411   1411             blues     negative
## 1412   1412             blues      sadness
## 1413   1413             bluff     negative
## 1414   1414           blunder      disgust
## 1415   1415           blunder     negative
## 1416   1416           blunder      sadness
## 1417   1417              blur     negative
## 1418   1418           blurred     negative
## 1419   1419             blush     negative
## 1420   1420             board anticipation
## 1421   1421             boast     negative
## 1422   1422             boast     positive
## 1423   1423          boasting     negative
## 1424   1424         bodyguard     positive
## 1425   1425         bodyguard        trust
## 1426   1426               bog     negative
## 1427   1427             bogus        anger
## 1428   1428             bogus      disgust
## 1429   1429             bogus     negative
## 1430   1430              boil      disgust
## 1431   1431              boil     negative
## 1432   1432       boilerplate     negative
## 1433   1433        boisterous        anger
## 1434   1434        boisterous anticipation
## 1435   1435        boisterous          joy
## 1436   1436        boisterous     negative
## 1437   1437        boisterous     positive
## 1438   1438              bold     positive
## 1439   1439          boldness     positive
## 1440   1440           bolster     positive
## 1441   1441              bomb        anger
## 1442   1442              bomb         fear
## 1443   1443              bomb     negative
## 1444   1444              bomb      sadness
## 1445   1445              bomb     surprise
## 1446   1446           bombard        anger
## 1447   1447           bombard         fear
## 1448   1448           bombard     negative
## 1449   1449       bombardment        anger
## 1450   1450       bombardment         fear
## 1451   1451       bombardment     negative
## 1452   1452            bombed      disgust
## 1453   1453            bombed     negative
## 1454   1454            bomber         fear
## 1455   1455            bomber      sadness
## 1456   1456           bonanza          joy
## 1457   1457           bonanza     positive
## 1458   1458           bondage         fear
## 1459   1459           bondage     negative
## 1460   1460           bondage      sadness
## 1461   1461             bonds     negative
## 1462   1462             bonne     positive
## 1463   1463             bonus anticipation
## 1464   1464             bonus          joy
## 1465   1465             bonus     positive
## 1466   1466             bonus     surprise
## 1467   1467               boo     negative
## 1468   1468             booby     negative
## 1469   1469           bookish     positive
## 1470   1470          bookshop     positive
## 1471   1471          bookworm     negative
## 1472   1472          bookworm     positive
## 1473   1473         boomerang anticipation
## 1474   1474         boomerang        trust
## 1475   1475              boon     positive
## 1476   1476             booze     negative
## 1477   1477              bore     negative
## 1478   1478           boredom     negative
## 1479   1479           boredom      sadness
## 1480   1480            boring     negative
## 1481   1481          borrower     negative
## 1482   1482            bother     negative
## 1483   1483         bothering        anger
## 1484   1484         bothering     negative
## 1485   1485         bothering      sadness
## 1486   1486            bottom     negative
## 1487   1487            bottom      sadness
## 1488   1488        bottomless         fear
## 1489   1489             bound     negative
## 1490   1490         bountiful anticipation
## 1491   1491         bountiful          joy
## 1492   1492         bountiful     positive
## 1493   1493            bounty anticipation
## 1494   1494            bounty          joy
## 1495   1495            bounty     positive
## 1496   1496            bounty        trust
## 1497   1497           bouquet          joy
## 1498   1498           bouquet     positive
## 1499   1499           bouquet        trust
## 1500   1500              bout        anger
## 1501   1501              bout     negative
## 1502   1502            bovine      disgust
## 1503   1503            bovine     negative
## 1504   1504            bowels      disgust
## 1505   1505            boxing        anger
## 1506   1506           boycott     negative
## 1507   1507              brag     negative
## 1508   1508            brains     positive
## 1509   1509              bran      disgust
## 1510   1510            brandy     negative
## 1511   1511           bravado     negative
## 1512   1512           bravery     positive
## 1513   1513             brawl        anger
## 1514   1514             brawl      disgust
## 1515   1515             brawl         fear
## 1516   1516             brawl     negative
## 1517   1517            brazen        anger
## 1518   1518            brazen     negative
## 1519   1519            breach     negative
## 1520   1520             break     surprise
## 1521   1521         breakdown     negative
## 1522   1522         breakfast     positive
## 1523   1523         breakneck     negative
## 1524   1524           breakup     negative
## 1525   1525           breakup      sadness
## 1526   1526             bribe     negative
## 1527   1527           bribery      disgust
## 1528   1528           bribery     negative
## 1529   1529            bridal anticipation
## 1530   1530            bridal          joy
## 1531   1531            bridal     positive
## 1532   1532            bridal        trust
## 1533   1533             bride anticipation
## 1534   1534             bride          joy
## 1535   1535             bride     positive
## 1536   1536             bride        trust
## 1537   1537        bridegroom anticipation
## 1538   1538        bridegroom          joy
## 1539   1539        bridegroom     positive
## 1540   1540        bridegroom        trust
## 1541   1541        bridesmaid          joy
## 1542   1542        bridesmaid     positive
## 1543   1543        bridesmaid        trust
## 1544   1544           brigade         fear
## 1545   1545           brigade     negative
## 1546   1546          brighten          joy
## 1547   1547          brighten     positive
## 1548   1548          brighten     surprise
## 1549   1549          brighten        trust
## 1550   1550        brightness     positive
## 1551   1551         brilliant anticipation
## 1552   1552         brilliant          joy
## 1553   1553         brilliant     positive
## 1554   1554         brilliant        trust
## 1555   1555         brimstone        anger
## 1556   1556         brimstone         fear
## 1557   1557         brimstone     negative
## 1558   1558           bristle     negative
## 1559   1559         broadside anticipation
## 1560   1560         broadside     negative
## 1561   1561           brocade     positive
## 1562   1562             broil        anger
## 1563   1563             broil     negative
## 1564   1564             broke         fear
## 1565   1565             broke     negative
## 1566   1566             broke      sadness
## 1567   1567            broken        anger
## 1568   1568            broken         fear
## 1569   1569            broken     negative
## 1570   1570            broken      sadness
## 1571   1571           brothel      disgust
## 1572   1572           brothel     negative
## 1573   1573           brother     positive
## 1574   1574           brother        trust
## 1575   1575       brotherhood     positive
## 1576   1576       brotherhood        trust
## 1577   1577         brotherly anticipation
## 1578   1578         brotherly          joy
## 1579   1579         brotherly     positive
## 1580   1580         brotherly        trust
## 1581   1581            bruise anticipation
## 1582   1582            bruise     negative
## 1583   1583             brunt        anger
## 1584   1584             brunt     negative
## 1585   1585            brutal        anger
## 1586   1586            brutal         fear
## 1587   1587            brutal     negative
## 1588   1588         brutality        anger
## 1589   1589         brutality         fear
## 1590   1590         brutality     negative
## 1591   1591             brute        anger
## 1592   1592             brute         fear
## 1593   1593             brute     negative
## 1594   1594             brute      sadness
## 1595   1595              buck         fear
## 1596   1596              buck     negative
## 1597   1597              buck     positive
## 1598   1598              buck     surprise
## 1599   1599             buddy anticipation
## 1600   1600             buddy          joy
## 1601   1601             buddy     positive
## 1602   1602             buddy        trust
## 1603   1603            budget        trust
## 1604   1604            buffet        anger
## 1605   1605            buffet     negative
## 1606   1606               bug      disgust
## 1607   1607               bug         fear
## 1608   1608               bug     negative
## 1609   1609           bugaboo        anger
## 1610   1610           bugaboo         fear
## 1611   1611           bugaboo     negative
## 1612   1612           bugaboo      sadness
## 1613   1613             bugle anticipation
## 1614   1614             build     positive
## 1615   1615          building     positive
## 1616   1616           bulbous     negative
## 1617   1617           bulldog     positive
## 1618   1618       bulletproof     positive
## 1619   1619             bully        anger
## 1620   1620             bully         fear
## 1621   1621             bully     negative
## 1622   1622               bum      disgust
## 1623   1623               bum     negative
## 1624   1624               bum      sadness
## 1625   1625            bummer        anger
## 1626   1626            bummer      disgust
## 1627   1627            bummer     negative
## 1628   1628            bunker         fear
## 1629   1629              buoy     positive
## 1630   1630        burdensome         fear
## 1631   1631        burdensome     negative
## 1632   1632        burdensome      sadness
## 1633   1633       bureaucracy     negative
## 1634   1634       bureaucracy        trust
## 1635   1635        bureaucrat      disgust
## 1636   1636        bureaucrat     negative
## 1637   1637           burglar      disgust
## 1638   1638           burglar         fear
## 1639   1639           burglar     negative
## 1640   1640          burglary     negative
## 1641   1641            burial        anger
## 1642   1642            burial         fear
## 1643   1643            burial     negative
## 1644   1644            burial      sadness
## 1645   1645            buried         fear
## 1646   1646            buried     negative
## 1647   1647            buried      sadness
## 1648   1648             burke        anger
## 1649   1649             burke      disgust
## 1650   1650             burke         fear
## 1651   1651             burke     negative
## 1652   1652             burke      sadness
## 1653   1653         burlesque     surprise
## 1654   1654             burnt      disgust
## 1655   1655             burnt     negative
## 1656   1656           bursary        trust
## 1657   1657              bury      sadness
## 1658   1658              buss          joy
## 1659   1659              buss     positive
## 1660   1660            busted        anger
## 1661   1661            busted         fear
## 1662   1662            busted     negative
## 1663   1663           butcher        anger
## 1664   1664           butcher      disgust
## 1665   1665           butcher         fear
## 1666   1666           butcher     negative
## 1667   1667            butler     positive
## 1668   1668            butler        trust
## 1669   1669              butt     negative
## 1670   1670           buttery     positive
## 1671   1671             buxom     positive
## 1672   1672              buzz anticipation
## 1673   1673              buzz         fear
## 1674   1674              buzz     positive
## 1675   1675            buzzed     negative
## 1676   1676               bye anticipation
## 1677   1677             bylaw        trust
## 1678   1678               cab     positive
## 1679   1679             cabal         fear
## 1680   1680             cabal     negative
## 1681   1681           cabinet     positive
## 1682   1682           cabinet        trust
## 1683   1683             cable     surprise
## 1684   1684         cacophony        anger
## 1685   1685         cacophony      disgust
## 1686   1686         cacophony     negative
## 1687   1687               cad        anger
## 1688   1688               cad      disgust
## 1689   1689               cad     negative
## 1690   1690           cadaver      disgust
## 1691   1691           cadaver         fear
## 1692   1692           cadaver     negative
## 1693   1693           cadaver      sadness
## 1694   1694           cadaver     surprise
## 1695   1695              cafe     positive
## 1696   1696              cage     negative
## 1697   1697              cage      sadness
## 1698   1698          calamity      sadness
## 1699   1699       calculating     negative
## 1700   1700       calculation anticipation
## 1701   1701        calculator     positive
## 1702   1702        calculator        trust
## 1703   1703              calf          joy
## 1704   1704              calf     positive
## 1705   1705              calf        trust
## 1706   1706           callous        anger
## 1707   1707           callous      disgust
## 1708   1708           callous     negative
## 1709   1709             calls anticipation
## 1710   1710             calls     negative
## 1711   1711             calls        trust
## 1712   1712              calm     positive
## 1713   1713        camouflage     surprise
## 1714   1714       camouflaged     surprise
## 1715   1715       campaigning        anger
## 1716   1716       campaigning         fear
## 1717   1717       campaigning     negative
## 1718   1718            canary     positive
## 1719   1719            cancel     negative
## 1720   1720            cancel      sadness
## 1721   1721            cancer        anger
## 1722   1722            cancer      disgust
## 1723   1723            cancer         fear
## 1724   1724            cancer     negative
## 1725   1725            cancer      sadness
## 1726   1726            candid anticipation
## 1727   1727            candid          joy
## 1728   1728            candid     positive
## 1729   1729            candid     surprise
## 1730   1730            candid        trust
## 1731   1731         candidate     positive
## 1732   1732           candied     positive
## 1733   1733              cane        anger
## 1734   1734              cane         fear
## 1735   1735            canker        anger
## 1736   1736            canker      disgust
## 1737   1737            canker     negative
## 1738   1738          cannibal      disgust
## 1739   1739          cannibal         fear
## 1740   1740          cannibal     negative
## 1741   1741       cannibalism      disgust
## 1742   1742       cannibalism     negative
## 1743   1743            cannon        anger
## 1744   1744            cannon         fear
## 1745   1745            cannon     negative
## 1746   1746            canons        trust
## 1747   1747               cap anticipation
## 1748   1748               cap        trust
## 1749   1749        capitalist     positive
## 1750   1750           captain     positive
## 1751   1751         captivate anticipation
## 1752   1752         captivate          joy
## 1753   1753         captivate     positive
## 1754   1754         captivate     surprise
## 1755   1755         captivate        trust
## 1756   1756       captivating     positive
## 1757   1757           captive         fear
## 1758   1758           captive     negative
## 1759   1759           captive      sadness
## 1760   1760         captivity     negative
## 1761   1761         captivity      sadness
## 1762   1762            captor         fear
## 1763   1763            captor     negative
## 1764   1764           capture     negative
## 1765   1765           carcass      disgust
## 1766   1766           carcass         fear
## 1767   1767           carcass     negative
## 1768   1768           carcass      sadness
## 1769   1769         carcinoma         fear
## 1770   1770         carcinoma     negative
## 1771   1771         carcinoma      sadness
## 1772   1772    cardiomyopathy         fear
## 1773   1773    cardiomyopathy     negative
## 1774   1774    cardiomyopathy      sadness
## 1775   1775            career anticipation
## 1776   1776            career     positive
## 1777   1777           careful     positive
## 1778   1778         carefully     positive
## 1779   1779      carelessness        anger
## 1780   1780      carelessness      disgust
## 1781   1781      carelessness     negative
## 1782   1782            caress     positive
## 1783   1783         caretaker     positive
## 1784   1784         caretaker        trust
## 1785   1785        caricature     negative
## 1786   1786            caries      disgust
## 1787   1787            caries     negative
## 1788   1788           carnage        anger
## 1789   1789           carnage      disgust
## 1790   1790           carnage         fear
## 1791   1791           carnage     negative
## 1792   1792           carnage      sadness
## 1793   1793           carnage     surprise
## 1794   1794            carnal     negative
## 1795   1795       carnivorous         fear
## 1796   1796       carnivorous     negative
## 1797   1797             carol          joy
## 1798   1798             carol     positive
## 1799   1799             carol        trust
## 1800   1800            cartel     negative
## 1801   1801         cartridge         fear
## 1802   1802           cascade     positive
## 1803   1803              case         fear
## 1804   1804              case     negative
## 1805   1805              case      sadness
## 1806   1806              cash        anger
## 1807   1807              cash anticipation
## 1808   1808              cash         fear
## 1809   1809              cash          joy
## 1810   1810              cash     positive
## 1811   1811              cash        trust
## 1812   1812           cashier        trust
## 1813   1813            casket         fear
## 1814   1814            casket     negative
## 1815   1815            casket      sadness
## 1816   1816             caste     negative
## 1817   1817          casualty        anger
## 1818   1818          casualty         fear
## 1819   1819          casualty     negative
## 1820   1820          casualty      sadness
## 1821   1821          cataract anticipation
## 1822   1822          cataract         fear
## 1823   1823          cataract     negative
## 1824   1824          cataract      sadness
## 1825   1825       catastrophe        anger
## 1826   1826       catastrophe      disgust
## 1827   1827       catastrophe         fear
## 1828   1828       catastrophe     negative
## 1829   1829       catastrophe      sadness
## 1830   1830       catastrophe     surprise
## 1831   1831             catch     surprise
## 1832   1832         catechism      disgust
## 1833   1833       categorical     positive
## 1834   1834             cater     positive
## 1835   1835         cathartic     positive
## 1836   1836         cathedral          joy
## 1837   1837         cathedral     positive
## 1838   1838         cathedral        trust
## 1839   1839          catheter     negative
## 1840   1840           caution        anger
## 1841   1841           caution anticipation
## 1842   1842           caution         fear
## 1843   1843           caution     negative
## 1844   1844        cautionary         fear
## 1845   1845          cautious anticipation
## 1846   1846          cautious         fear
## 1847   1847          cautious     positive
## 1848   1848          cautious        trust
## 1849   1849        cautiously         fear
## 1850   1850        cautiously     positive
## 1851   1851              cede     negative
## 1852   1852        celebrated anticipation
## 1853   1853        celebrated          joy
## 1854   1854        celebrated     positive
## 1855   1855       celebrating anticipation
## 1856   1856       celebrating          joy
## 1857   1857       celebrating     positive
## 1858   1858       celebration anticipation
## 1859   1859       celebration          joy
## 1860   1860       celebration     positive
## 1861   1861       celebration     surprise
## 1862   1862       celebration        trust
## 1863   1863         celebrity        anger
## 1864   1864         celebrity anticipation
## 1865   1865         celebrity      disgust
## 1866   1866         celebrity          joy
## 1867   1867         celebrity     negative
## 1868   1868         celebrity     positive
## 1869   1869         celebrity     surprise
## 1870   1870         celebrity        trust
## 1871   1871         celestial anticipation
## 1872   1872         celestial          joy
## 1873   1873         celestial     positive
## 1874   1874            cement anticipation
## 1875   1875            cement        trust
## 1876   1876          cemetery         fear
## 1877   1877          cemetery     negative
## 1878   1878          cemetery      sadness
## 1879   1879            censor        anger
## 1880   1880            censor      disgust
## 1881   1881            censor         fear
## 1882   1882            censor     negative
## 1883   1883            censor        trust
## 1884   1884           censure     negative
## 1885   1885            center     positive
## 1886   1886            center        trust
## 1887   1887         centurion     positive
## 1888   1888          cerebral     positive
## 1889   1889          ceremony          joy
## 1890   1890          ceremony     positive
## 1891   1891          ceremony     surprise
## 1892   1892         certainty     positive
## 1893   1893           certify        trust
## 1894   1894              cess      disgust
## 1895   1895              cess     negative
## 1896   1896         cessation     negative
## 1897   1897             chaff        anger
## 1898   1898             chaff         fear
## 1899   1899             chaff     negative
## 1900   1900           chafing     negative
## 1901   1901           chagrin      disgust
## 1902   1902           chagrin     negative
## 1903   1903           chagrin      sadness
## 1904   1904          chairman     positive
## 1905   1905          chairman        trust
## 1906   1906        chairwoman     positive
## 1907   1907        chairwoman        trust
## 1908   1908         challenge        anger
## 1909   1909         challenge         fear
## 1910   1910         challenge     negative
## 1911   1911          champion anticipation
## 1912   1912          champion          joy
## 1913   1913          champion     positive
## 1914   1914          champion        trust
## 1915   1915            chance     surprise
## 1916   1916        chancellor        trust
## 1917   1917            change         fear
## 1918   1918        changeable anticipation
## 1919   1919        changeable     surprise
## 1920   1920             chant        anger
## 1921   1921             chant anticipation
## 1922   1922             chant          joy
## 1923   1923             chant     positive
## 1924   1924             chant     surprise
## 1925   1925             chaos        anger
## 1926   1926             chaos         fear
## 1927   1927             chaos     negative
## 1928   1928             chaos      sadness
## 1929   1929           chaotic        anger
## 1930   1930           chaotic     negative
## 1931   1931          chaplain        trust
## 1932   1932           charade     negative
## 1933   1933        chargeable         fear
## 1934   1934        chargeable     negative
## 1935   1935        chargeable      sadness
## 1936   1936           charger     positive
## 1937   1937        charitable anticipation
## 1938   1938        charitable          joy
## 1939   1939        charitable     positive
## 1940   1940        charitable        trust
## 1941   1941           charity          joy
## 1942   1942           charity     positive
## 1943   1943             charm     positive
## 1944   1944           charmed          joy
## 1945   1945           charmed     negative
## 1946   1946           charmed     positive
## 1947   1947          charming     positive
## 1948   1948             chart        trust
## 1949   1949             chase     negative
## 1950   1950             chasm         fear
## 1951   1951      chastisement     negative
## 1952   1952          chastity anticipation
## 1953   1953          chastity     positive
## 1954   1954          chastity        trust
## 1955   1955        chattering     positive
## 1956   1956            chatty     negative
## 1957   1957             cheap     negative
## 1958   1958             cheat        anger
## 1959   1959             cheat      disgust
## 1960   1960             cheat     negative
## 1961   1961         checklist     positive
## 1962   1962         checklist        trust
## 1963   1963             cheer anticipation
## 1964   1964             cheer          joy
## 1965   1965             cheer     positive
## 1966   1966             cheer     surprise
## 1967   1967             cheer        trust
## 1968   1968          cheerful          joy
## 1969   1969          cheerful     positive
## 1970   1970          cheerful     surprise
## 1971   1971      cheerfulness anticipation
## 1972   1972      cheerfulness          joy
## 1973   1973      cheerfulness     positive
## 1974   1974      cheerfulness        trust
## 1975   1975          cheering          joy
## 1976   1976          cheering     positive
## 1977   1977            cheery anticipation
## 1978   1978            cheery          joy
## 1979   1979            cheery     positive
## 1980   1980        cheesecake     negative
## 1981   1981           chemist     positive
## 1982   1982           chemist        trust
## 1983   1983           cherish anticipation
## 1984   1984           cherish          joy
## 1985   1985           cherish     positive
## 1986   1986           cherish     surprise
## 1987   1987           cherish        trust
## 1988   1988            cherry     positive
## 1989   1989           chicane anticipation
## 1990   1990           chicane     negative
## 1991   1991           chicane     surprise
## 1992   1992           chicane        trust
## 1993   1993           chicken         fear
## 1994   1994         chieftain     positive
## 1995   1995             child anticipation
## 1996   1996             child          joy
## 1997   1997             child     positive
## 1998   1998         childhood          joy
## 1999   1999         childhood     positive
## 2000   2000          childish     negative
## 2001   2001            chilly     negative
## 2002   2002           chimera         fear
## 2003   2003           chimera     surprise
## 2004   2004             chirp          joy
## 2005   2005             chirp     positive
## 2006   2006            chisel     positive
## 2007   2007          chivalry     positive
## 2008   2008        chloroform     negative
## 2009   2009         chocolate anticipation
## 2010   2010         chocolate          joy
## 2011   2011         chocolate     positive
## 2012   2012         chocolate        trust
## 2013   2013            choice     positive
## 2014   2014             choir          joy
## 2015   2015             choir     positive
## 2016   2016             choir        trust
## 2017   2017             choke        anger
## 2018   2018             choke     negative
## 2019   2019             choke      sadness
## 2020   2020           cholera      disgust
## 2021   2021           cholera         fear
## 2022   2022           cholera     negative
## 2023   2023           cholera      sadness
## 2024   2024              chop     negative
## 2025   2025            choral          joy
## 2026   2026            choral     positive
## 2027   2027             chore     negative
## 2028   2028            chorus     positive
## 2029   2029            chosen     positive
## 2030   2030           chowder     positive
## 2031   2031           chronic     negative
## 2032   2032           chronic      sadness
## 2033   2033         chronicle     positive
## 2034   2034         chronicle        trust
## 2035   2035           chuckle anticipation
## 2036   2036           chuckle          joy
## 2037   2037           chuckle     positive
## 2038   2038           chuckle     surprise
## 2039   2039           chuckle        trust
## 2040   2040            church anticipation
## 2041   2041            church          joy
## 2042   2042            church     positive
## 2043   2043            church        trust
## 2044   2044             cider     positive
## 2045   2045         cigarette     negative
## 2046   2046      circumcision     positive
## 2047   2047     circumvention     negative
## 2048   2048     circumvention     positive
## 2049   2049           citizen     positive
## 2050   2050             civil     positive
## 2051   2051          civility     positive
## 2052   2052      civilization     positive
## 2053   2053      civilization        trust
## 2054   2054         civilized          joy
## 2055   2055         civilized     positive
## 2056   2056         civilized        trust
## 2057   2057          claimant        anger
## 2058   2058          claimant      disgust
## 2059   2059       clairvoyant     positive
## 2060   2060            clamor        anger
## 2061   2061            clamor anticipation
## 2062   2062            clamor      disgust
## 2063   2063            clamor     negative
## 2064   2064            clamor     surprise
## 2065   2065              clan        trust
## 2066   2066              clap anticipation
## 2067   2067              clap          joy
## 2068   2068              clap     positive
## 2069   2069              clap        trust
## 2070   2070           clarify     positive
## 2071   2071             clash        anger
## 2072   2072             clash     negative
## 2073   2073          clashing        anger
## 2074   2074          clashing         fear
## 2075   2075          clashing     negative
## 2076   2076           classic     positive
## 2077   2077         classical     positive
## 2078   2078          classics          joy
## 2079   2079          classics     positive
## 2080   2080          classify     positive
## 2081   2081              claw        anger
## 2082   2082              claw         fear
## 2083   2083              claw     negative
## 2084   2084             clean          joy
## 2085   2085             clean     positive
## 2086   2086             clean        trust
## 2087   2087          cleaning     positive
## 2088   2088       cleanliness     positive
## 2089   2089           cleanly     positive
## 2090   2090           cleanse     positive
## 2091   2091         cleansing     positive
## 2092   2092         clearance     positive
## 2093   2093         clearance        trust
## 2094   2094         clearness     positive
## 2095   2095            cleave         fear
## 2096   2096          clerical     positive
## 2097   2097          clerical        trust
## 2098   2098            clever     positive
## 2099   2099        cleverness     positive
## 2100   2100             cliff         fear
## 2101   2101            climax anticipation
## 2102   2102            climax          joy
## 2103   2103            climax     positive
## 2104   2104            climax     surprise
## 2105   2105            climax        trust
## 2106   2106             clock anticipation
## 2107   2107          cloister     negative
## 2108   2108         closeness          joy
## 2109   2109         closeness     positive
## 2110   2110         closeness        trust
## 2111   2111           closure anticipation
## 2112   2112           closure          joy
## 2113   2113           closure     positive
## 2114   2114           closure      sadness
## 2115   2115            clothe     positive
## 2116   2116           clouded     negative
## 2117   2117           clouded      sadness
## 2118   2118        cloudiness         fear
## 2119   2119        cloudiness     negative
## 2120   2120            cloudy      sadness
## 2121   2121             clown anticipation
## 2122   2122             clown          joy
## 2123   2123             clown     positive
## 2124   2124             clown     surprise
## 2125   2125              clue anticipation
## 2126   2126             clump     negative
## 2127   2127            clumsy      disgust
## 2128   2128            clumsy     negative
## 2129   2129             coach        trust
## 2130   2130          coalesce        trust
## 2131   2131         coalition     positive
## 2132   2132             coast     positive
## 2133   2133              coax        trust
## 2134   2134             cobra         fear
## 2135   2135           cocaine     negative
## 2136   2136           cocaine      sadness
## 2137   2137            coerce        anger
## 2138   2138            coerce      disgust
## 2139   2139            coerce         fear
## 2140   2140            coerce     negative
## 2141   2141          coercion        anger
## 2142   2142          coercion      disgust
## 2143   2143          coercion         fear
## 2144   2144          coercion     negative
## 2145   2145          coercion      sadness
## 2146   2146           coexist     positive
## 2147   2147           coexist        trust
## 2148   2148        coexisting        trust
## 2149   2149            coffin         fear
## 2150   2150            coffin     negative
## 2151   2151            coffin      sadness
## 2152   2152            cogent     positive
## 2153   2153            cogent        trust
## 2154   2154         cognitive     positive
## 2155   2155         coherence     positive
## 2156   2156          coherent     positive
## 2157   2157          cohesion        trust
## 2158   2158          cohesive     positive
## 2159   2159          cohesive        trust
## 2160   2160       coincidence     surprise
## 2161   2161              cold     negative
## 2162   2162            coldly     negative
## 2163   2163          coldness        anger
## 2164   2164          coldness      disgust
## 2165   2165          coldness         fear
## 2166   2166          coldness     negative
## 2167   2167          coldness      sadness
## 2168   2168             colic     negative
## 2169   2169      collaborator        trust
## 2170   2170          collapse      disgust
## 2171   2171          collapse         fear
## 2172   2172          collapse     negative
## 2173   2173          collapse      sadness
## 2174   2174        collateral        trust
## 2175   2175      collectively     positive
## 2176   2176      collectively        trust
## 2177   2177         collision        anger
## 2178   2178         collision     negative
## 2179   2179         collusion        anger
## 2180   2180         collusion      disgust
## 2181   2181         collusion         fear
## 2182   2182         collusion     negative
## 2183   2183         collusion      sadness
## 2184   2184           colonel     positive
## 2185   2185           colonel        trust
## 2186   2186          colossal     positive
## 2187   2187              coma         fear
## 2188   2188              coma     negative
## 2189   2189              coma      sadness
## 2190   2190          comatose         fear
## 2191   2191          comatose     negative
## 2192   2192          comatose      sadness
## 2193   2193            combat        anger
## 2194   2194            combat         fear
## 2195   2195            combat     negative
## 2196   2196         combatant        anger
## 2197   2197         combatant         fear
## 2198   2198         combatant     negative
## 2199   2199         combative        anger
## 2200   2200         combative         fear
## 2201   2201         combative     negative
## 2202   2202           comfort anticipation
## 2203   2203           comfort          joy
## 2204   2204           comfort     positive
## 2205   2205           comfort        trust
## 2206   2206            coming anticipation
## 2207   2207        commandant     positive
## 2208   2208        commandant        trust
## 2209   2209        commanding     positive
## 2210   2210        commanding        trust
## 2211   2211       commemorate anticipation
## 2212   2212       commemorate          joy
## 2213   2213       commemorate     positive
## 2214   2214       commemorate      sadness
## 2215   2215     commemoration anticipation
## 2216   2216     commemoration          joy
## 2217   2217     commemoration     positive
## 2218   2218     commemorative anticipation
## 2219   2219     commemorative     positive
## 2220   2220           commend     positive
## 2221   2221       commendable          joy
## 2222   2222       commendable     positive
## 2223   2223       commendable        trust
## 2224   2224       commentator     positive
## 2225   2225          commerce        trust
## 2226   2226        commission        trust
## 2227   2227         committal     negative
## 2228   2228         committal      sadness
## 2229   2229         committed     positive
## 2230   2230         committed        trust
## 2231   2231         committee        trust
## 2232   2232         commodore     positive
## 2233   2233         commodore        trust
## 2234   2234       commonplace anticipation
## 2235   2235       commonplace        trust
## 2236   2236      commonwealth     positive
## 2237   2237      commonwealth        trust
## 2238   2238         commotion        anger
## 2239   2239         commotion     negative
## 2240   2240       communicate     positive
## 2241   2241       communicate        trust
## 2242   2242     communication        trust
## 2243   2243     communicative     positive
## 2244   2244         communion          joy
## 2245   2245         communion     positive
## 2246   2246         communion        trust
## 2247   2247         communism        anger
## 2248   2248         communism         fear
## 2249   2249         communism     negative
## 2250   2250         communism      sadness
## 2251   2251         communist     negative
## 2252   2252         community     positive
## 2253   2253       commutation     positive
## 2254   2254           commute     positive
## 2255   2255           compact        trust
## 2256   2256         companion          joy
## 2257   2257         companion     positive
## 2258   2258         companion        trust
## 2259   2259           compass        trust
## 2260   2260        compassion         fear
## 2261   2261        compassion     positive
## 2262   2262     compassionate     positive
## 2263   2263     compatibility     positive
## 2264   2264        compatible     positive
## 2265   2265        compelling     positive
## 2266   2266        compensate anticipation
## 2267   2267        compensate          joy
## 2268   2268        compensate     positive
## 2269   2269        compensate     surprise
## 2270   2270        compensate        trust
## 2271   2271      compensatory     positive
## 2272   2272        competence     positive
## 2273   2273        competence        trust
## 2274   2274        competency     positive
## 2275   2275        competency        trust
## 2276   2276         competent     positive
## 2277   2277         competent        trust
## 2278   2278       competition anticipation
## 2279   2279       competition     negative
## 2280   2280       complacency     positive
## 2281   2281          complain        anger
## 2282   2282          complain     negative
## 2283   2283          complain      sadness
## 2284   2284         complaint        anger
## 2285   2285         complaint     negative
## 2286   2286        complement anticipation
## 2287   2287        complement          joy
## 2288   2288        complement     positive
## 2289   2289        complement     surprise
## 2290   2290        complement        trust
## 2291   2291     complementary     positive
## 2292   2292        completely     positive
## 2293   2293      completeness     positive
## 2294   2294        completing anticipation
## 2295   2295        completing          joy
## 2296   2296        completing     positive
## 2297   2297        completion anticipation
## 2298   2298        completion          joy
## 2299   2299        completion     positive
## 2300   2300         complexed     negative
## 2301   2301        complexity     negative
## 2302   2302        compliance     positive
## 2303   2303        compliance        trust
## 2304   2304         compliant     positive
## 2305   2305        complicate        anger
## 2306   2306        complicate     negative
## 2307   2307       complicated     negative
## 2308   2308      complication     negative
## 2309   2309        complicity     negative
## 2310   2310        complicity     positive
## 2311   2311        compliment anticipation
## 2312   2312        compliment          joy
## 2313   2313        compliment     positive
## 2314   2314        compliment     surprise
## 2315   2315        compliment        trust
## 2316   2316          composed     positive
## 2317   2317          composer     positive
## 2318   2318           compost      disgust
## 2319   2319           compost     negative
## 2320   2320         composure     positive
## 2321   2321        comprehend     positive
## 2322   2322     comprehensive     positive
## 2323   2323          compress        anger
## 2324   2324       comptroller        trust
## 2325   2325        compulsion        anger
## 2326   2326        compulsion     negative
## 2327   2327        compulsory     negative
## 2328   2328           comrade     positive
## 2329   2329           comrade        trust
## 2330   2330           conceal     negative
## 2331   2331           conceal      sadness
## 2332   2332         concealed anticipation
## 2333   2333         concealed         fear
## 2334   2334         concealed     negative
## 2335   2335         concealed     surprise
## 2336   2336       concealment        anger
## 2337   2337       concealment anticipation
## 2338   2338       concealment         fear
## 2339   2339       concealment     negative
## 2340   2340           conceit     negative
## 2341   2341         conceited     negative
## 2342   2342        concentric     positive
## 2343   2343         concerned         fear
## 2344   2344         concerned      sadness
## 2345   2345      conciliation          joy
## 2346   2346      conciliation     positive
## 2347   2347      conciliation        trust
## 2348   2348        concluding     positive
## 2349   2349           concord     positive
## 2350   2350           concord        trust
## 2351   2351       concordance     positive
## 2352   2352       concordance        trust
## 2353   2353        concussion        anger
## 2354   2354        concussion     negative
## 2355   2355        concussion      sadness
## 2356   2356           condemn        anger
## 2357   2357           condemn     negative
## 2358   2358      condemnation        anger
## 2359   2359      condemnation anticipation
## 2360   2360      condemnation      disgust
## 2361   2361      condemnation         fear
## 2362   2362      condemnation     negative
## 2363   2363      condemnation      sadness
## 2364   2364     condescending     negative
## 2365   2365     condescension        anger
## 2366   2366     condescension      disgust
## 2367   2367     condescension     negative
## 2368   2368     condescension      sadness
## 2369   2369        condolence     positive
## 2370   2370        condolence      sadness
## 2371   2371           condone     positive
## 2372   2372         conducive     positive
## 2373   2373      conductivity     positive
## 2374   2374       confederate     positive
## 2375   2375       confederate        trust
## 2376   2376           confess     negative
## 2377   2377           confess     positive
## 2378   2378           confess        trust
## 2379   2379        confession anticipation
## 2380   2380        confession         fear
## 2381   2381        confession     negative
## 2382   2382        confession      sadness
## 2383   2383        confession     surprise
## 2384   2384      confessional         fear
## 2385   2385      confessional        trust
## 2386   2386           confide        trust
## 2387   2387        confidence         fear
## 2388   2388        confidence          joy
## 2389   2389        confidence     positive
## 2390   2390        confidence        trust
## 2391   2391         confident          joy
## 2392   2392         confident     positive
## 2393   2393         confident        trust
## 2394   2394      confidential        trust
## 2395   2395    confidentially        trust
## 2396   2396           confine        anger
## 2397   2397           confine         fear
## 2398   2398           confine     negative
## 2399   2399           confine      sadness
## 2400   2400          confined        anger
## 2401   2401          confined      disgust
## 2402   2402          confined         fear
## 2403   2403          confined     negative
## 2404   2404          confined      sadness
## 2405   2405       confinement        anger
## 2406   2406       confinement         fear
## 2407   2407       confinement     negative
## 2408   2408       confinement      sadness
## 2409   2409      confirmation        trust
## 2410   2410         confirmed     positive
## 2411   2411         confirmed        trust
## 2412   2412        confiscate        anger
## 2413   2413        confiscate     negative
## 2414   2414        confiscate      sadness
## 2415   2415      confiscation     negative
## 2416   2416     conflagration        anger
## 2417   2417     conflagration         fear
## 2418   2418     conflagration     negative
## 2419   2419          conflict        anger
## 2420   2420          conflict         fear
## 2421   2421          conflict     negative
## 2422   2422          conflict      sadness
## 2423   2423       conflicting     negative
## 2424   2424       conformance     positive
## 2425   2425        conformity        trust
## 2426   2426          confound     negative
## 2427   2427        confounded     negative
## 2428   2428          confront        anger
## 2429   2429           confuse     negative
## 2430   2430         confusion        anger
## 2431   2431         confusion         fear
## 2432   2432         confusion     negative
## 2433   2433         congenial     positive
## 2434   2434        congestion     negative
## 2435   2435      conglomerate        trust
## 2436   2436    congratulatory          joy
## 2437   2437    congratulatory     positive
## 2438   2438      congregation     positive
## 2439   2439      congregation        trust
## 2440   2440          congress      disgust
## 2441   2441          congress        trust
## 2442   2442       congressman        trust
## 2443   2443        congruence     positive
## 2444   2444        congruence        trust
## 2445   2445        conjecture anticipation
## 2446   2446           conjure anticipation
## 2447   2447           conjure     surprise
## 2448   2448         conjuring     negative
## 2449   2449        connective        trust
## 2450   2450       connoisseur          joy
## 2451   2451       connoisseur     positive
## 2452   2452       connoisseur        trust
## 2453   2453          conquest        anger
## 2454   2454          conquest         fear
## 2455   2455          conquest     negative
## 2456   2456        conscience     positive
## 2457   2457        conscience        trust
## 2458   2458     conscientious     positive
## 2459   2459     conscientious        trust
## 2460   2460     consciousness     positive
## 2461   2461      consecration anticipation
## 2462   2462      consecration          joy
## 2463   2463      consecration     positive
## 2464   2464      consecration      sadness
## 2465   2465      consecration        trust
## 2466   2466        consequent anticipation
## 2467   2467      conservation anticipation
## 2468   2468      conservation     positive
## 2469   2469      conservation        trust
## 2470   2470          conserve     positive
## 2471   2471      considerable     positive
## 2472   2472       considerate     positive
## 2473   2473       considerate        trust
## 2474   2474       consistency     positive
## 2475   2475       consistency        trust
## 2476   2476           console     positive
## 2477   2477           console      sadness
## 2478   2478         consonant     positive
## 2479   2479           consort        trust
## 2480   2480        conspiracy         fear
## 2481   2481       conspirator        anger
## 2482   2482       conspirator anticipation
## 2483   2483       conspirator      disgust
## 2484   2484       conspirator         fear
## 2485   2485       conspirator     negative
## 2486   2486          conspire         fear
## 2487   2487          conspire     negative
## 2488   2488         constable        trust
## 2489   2489         constancy     positive
## 2490   2490         constancy        trust
## 2491   2491          constant     positive
## 2492   2492          constant        trust
## 2493   2493        constantly        trust
## 2494   2494     consternation        anger
## 2495   2495     consternation         fear
## 2496   2496     consternation     negative
## 2497   2497      constipation      disgust
## 2498   2498      constipation     negative
## 2499   2499        constitute        trust
## 2500   2500    constitutional     positive
## 2501   2501    constitutional        trust
## 2502   2502         constrain         fear
## 2503   2503         constrain     negative
## 2504   2504       constrained     negative
## 2505   2505        constraint        anger
## 2506   2506        constraint         fear
## 2507   2507        constraint     negative
## 2508   2508        constraint      sadness
## 2509   2509         construct     positive
## 2510   2510            consul        trust
## 2511   2511           consult        trust
## 2512   2512        consummate     positive
## 2513   2513           contact     positive
## 2514   2514         contagion anticipation
## 2515   2515         contagion      disgust
## 2516   2516         contagion         fear
## 2517   2517         contagion     negative
## 2518   2518        contagious      disgust
## 2519   2519        contagious         fear
## 2520   2520        contagious     negative
## 2521   2521       contaminate      disgust
## 2522   2522       contaminate     negative
## 2523   2523      contaminated      disgust
## 2524   2524      contaminated         fear
## 2525   2525      contaminated     negative
## 2526   2526      contaminated      sadness
## 2527   2527     contamination      disgust
## 2528   2528     contamination     negative
## 2529   2529     contemplation     positive
## 2530   2530          contempt        anger
## 2531   2531          contempt      disgust
## 2532   2532          contempt         fear
## 2533   2533          contempt     negative
## 2534   2534      contemptible        anger
## 2535   2535      contemptible      disgust
## 2536   2536      contemptible     negative
## 2537   2537      contemptuous        anger
## 2538   2538      contemptuous     negative
## 2539   2539           content          joy
## 2540   2540           content     positive
## 2541   2541           content        trust
## 2542   2542       contentious        anger
## 2543   2543       contentious      disgust
## 2544   2544       contentious         fear
## 2545   2545       contentious     negative
## 2546   2546        contingent anticipation
## 2547   2547      continuation anticipation
## 2548   2548          continue anticipation
## 2549   2549          continue     positive
## 2550   2550          continue        trust
## 2551   2551           contour     positive
## 2552   2552        contraband        anger
## 2553   2553        contraband      disgust
## 2554   2554        contraband         fear
## 2555   2555        contraband     negative
## 2556   2556        contracted     negative
## 2557   2557        contradict        anger
## 2558   2558        contradict     negative
## 2559   2559     contradiction     negative
## 2560   2560     contradictory     negative
## 2561   2561          contrary     negative
## 2562   2562        contrasted     negative
## 2563   2563        contravene     negative
## 2564   2564     contravention     negative
## 2565   2565        contribute     positive
## 2566   2566       contributor     positive
## 2567   2567       contributor        trust
## 2568   2568     controversial        anger
## 2569   2569     controversial     negative
## 2570   2570       controversy     negative
## 2571   2571       convenience     positive
## 2572   2572        convenient     positive
## 2573   2573           convent     positive
## 2574   2574           convent        trust
## 2575   2575        convention     positive
## 2576   2576       convergence anticipation
## 2577   2577        conversant     positive
## 2578   2578    conversational     positive
## 2579   2579           convert     positive
## 2580   2580      conveyancing        trust
## 2581   2581           convict        anger
## 2582   2582           convict      disgust
## 2583   2583           convict         fear
## 2584   2584           convict     negative
## 2585   2585           convict      sadness
## 2586   2586        conviction     negative
## 2587   2587          convince anticipation
## 2588   2588          convince     positive
## 2589   2589          convince        trust
## 2590   2590         convinced        trust
## 2591   2591        convincing        trust
## 2592   2592              cool     positive
## 2593   2593          coolness     positive
## 2594   2594              coop        anger
## 2595   2595              coop      disgust
## 2596   2596              coop     negative
## 2597   2597         cooperate     positive
## 2598   2598       cooperating     positive
## 2599   2599       cooperating        trust
## 2600   2600       cooperation     positive
## 2601   2601       cooperation        trust
## 2602   2602       cooperative     positive
## 2603   2603       cooperative        trust
## 2604   2604               cop         fear
## 2605   2605               cop        trust
## 2606   2606              copy     negative
## 2607   2607           copycat        anger
## 2608   2608           copycat      disgust
## 2609   2609           copycat     negative
## 2610   2610              core     positive
## 2611   2611        coronation          joy
## 2612   2612        coronation     positive
## 2613   2613        coronation        trust
## 2614   2614           coroner     negative
## 2615   2615          corporal     negative
## 2616   2616       corporation     positive
## 2617   2617       corporation        trust
## 2618   2618         corporeal     positive
## 2619   2619            corpse      disgust
## 2620   2620            corpse     negative
## 2621   2621            corpse      sadness
## 2622   2622        correction     negative
## 2623   2623        corrective     positive
## 2624   2624       correctness        trust
## 2625   2625    correspondence anticipation
## 2626   2626    correspondence     positive
## 2627   2627       corroborate     positive
## 2628   2628       corroborate        trust
## 2629   2629     corroboration        trust
## 2630   2630         corrosion     negative
## 2631   2631         corrosive         fear
## 2632   2632         corrosive     negative
## 2633   2633           corrupt     negative
## 2634   2634        corrupting        anger
## 2635   2635        corrupting      disgust
## 2636   2636        corrupting         fear
## 2637   2637        corrupting     negative
## 2638   2638        corrupting      sadness
## 2639   2639        corruption      disgust
## 2640   2640        corruption     negative
## 2641   2641             corse      sadness
## 2642   2642      cosmopolitan     positive
## 2643   2643      cosmopolitan        trust
## 2644   2644              cosy     positive
## 2645   2645             couch      sadness
## 2646   2646             cough      disgust
## 2647   2647             cough     negative
## 2648   2648           council anticipation
## 2649   2649           council     positive
## 2650   2650           council        trust
## 2651   2651           counsel     positive
## 2652   2652           counsel        trust
## 2653   2653        counsellor        anger
## 2654   2654        counsellor         fear
## 2655   2655        counsellor     negative
## 2656   2656        counsellor        trust
## 2657   2657         counselor     positive
## 2658   2658         counselor        trust
## 2659   2659             count     positive
## 2660   2660             count        trust
## 2661   2661         countdown anticipation
## 2662   2662          countess     positive
## 2663   2663        countryman        trust
## 2664   2664            county        trust
## 2665   2665              coup        anger
## 2666   2666              coup     surprise
## 2667   2667           courage     positive
## 2668   2668        courageous         fear
## 2669   2669        courageous     positive
## 2670   2670           courier        trust
## 2671   2671          coursing     negative
## 2672   2672             court        anger
## 2673   2673             court anticipation
## 2674   2674             court         fear
## 2675   2675         courteous     positive
## 2676   2676          courtesy     positive
## 2677   2677         courtship anticipation
## 2678   2678         courtship          joy
## 2679   2679         courtship     positive
## 2680   2680         courtship        trust
## 2681   2681              cove anticipation
## 2682   2682              cove      disgust
## 2683   2683              cove         fear
## 2684   2684              cove          joy
## 2685   2685              cove     positive
## 2686   2686          covenant     positive
## 2687   2687          covenant        trust
## 2688   2688             cover        trust
## 2689   2689             covet     negative
## 2690   2690            coward      disgust
## 2691   2691            coward         fear
## 2692   2692            coward     negative
## 2693   2693            coward      sadness
## 2694   2694         cowardice         fear
## 2695   2695         cowardice     negative
## 2696   2696          cowardly         fear
## 2697   2697          cowardly     negative
## 2698   2698               coy         fear
## 2699   2699            coyote         fear
## 2700   2700            crabby        anger
## 2701   2701            crabby     negative
## 2702   2702             crack     negative
## 2703   2703           cracked        anger
## 2704   2704           cracked         fear
## 2705   2705           cracked     negative
## 2706   2706          cracking     negative
## 2707   2707            cradle anticipation
## 2708   2708            cradle          joy
## 2709   2709            cradle     positive
## 2710   2710            cradle        trust
## 2711   2711             craft     positive
## 2712   2712         craftsman     positive
## 2713   2713             cramp anticipation
## 2714   2714             cramp     negative
## 2715   2715           cramped     negative
## 2716   2716             crank     negative
## 2717   2717            cranky        anger
## 2718   2718            cranky     negative
## 2719   2719              crap      disgust
## 2720   2720              crap     negative
## 2721   2721             craps anticipation
## 2722   2722             crash         fear
## 2723   2723             crash     negative
## 2724   2724             crash      sadness
## 2725   2725             crash     surprise
## 2726   2726             crave anticipation
## 2727   2727           craving anticipation
## 2728   2728             crawl      disgust
## 2729   2729             crawl     negative
## 2730   2730            crazed        anger
## 2731   2731            crazed         fear
## 2732   2732            crazed     negative
## 2733   2733             crazy        anger
## 2734   2734             crazy         fear
## 2735   2735             crazy     negative
## 2736   2736             crazy      sadness
## 2737   2737          creaking     negative
## 2738   2738             cream anticipation
## 2739   2739             cream          joy
## 2740   2740             cream     positive
## 2741   2741             cream     surprise
## 2742   2742            create          joy
## 2743   2743            create     positive
## 2744   2744          creative     positive
## 2745   2745          creature      disgust
## 2746   2746          creature         fear
## 2747   2747          creature     negative
## 2748   2748          credence     positive
## 2749   2749          credence        trust
## 2750   2750        credential     positive
## 2751   2751        credential        trust
## 2752   2752       credibility     positive
## 2753   2753       credibility        trust
## 2754   2754          credible     positive
## 2755   2755          credible        trust
## 2756   2756            credit     positive
## 2757   2757            credit        trust
## 2758   2758        creditable     positive
## 2759   2759        creditable        trust
## 2760   2760          credited     positive
## 2761   2761             creep     negative
## 2762   2762          creeping anticipation
## 2763   2763         cremation      sadness
## 2764   2764         crescendo anticipation
## 2765   2765         crescendo          joy
## 2766   2766         crescendo     positive
## 2767   2767         crescendo     surprise
## 2768   2768         crescendo        trust
## 2769   2769              crew        trust
## 2770   2770             crime        anger
## 2771   2771             crime     negative
## 2772   2772          criminal        anger
## 2773   2773          criminal      disgust
## 2774   2774          criminal         fear
## 2775   2775          criminal     negative
## 2776   2776       criminality        anger
## 2777   2777       criminality      disgust
## 2778   2778       criminality         fear
## 2779   2779       criminality     negative
## 2780   2780            cringe      disgust
## 2781   2781            cringe         fear
## 2782   2782            cringe     negative
## 2783   2783            cringe      sadness
## 2784   2784           cripple         fear
## 2785   2785           cripple     negative
## 2786   2786           cripple      sadness
## 2787   2787          crippled     negative
## 2788   2788          crippled      sadness
## 2789   2789            crisis     negative
## 2790   2790             crisp     negative
## 2791   2791             crisp        trust
## 2792   2792            critic     negative
## 2793   2793         criticism        anger
## 2794   2794         criticism     negative
## 2795   2795         criticism      sadness
## 2796   2796         criticize        anger
## 2797   2797         criticize      disgust
## 2798   2798         criticize         fear
## 2799   2799         criticize     negative
## 2800   2800         criticize      sadness
## 2801   2801          critique     positive
## 2802   2802           critter      disgust
## 2803   2803         crocodile         fear
## 2804   2804             crook     negative
## 2805   2805             cross        anger
## 2806   2806             cross         fear
## 2807   2807             cross     negative
## 2808   2808             cross      sadness
## 2809   2809            crouch         fear
## 2810   2810         crouching         fear
## 2811   2811         crouching     negative
## 2812   2812          crowning anticipation
## 2813   2813          crowning          joy
## 2814   2814          crowning     positive
## 2815   2815          crowning     surprise
## 2816   2816          crowning        trust
## 2817   2817           crucial     positive
## 2818   2818           crucial        trust
## 2819   2819          cruciate     negative
## 2820   2820       crucifixion        anger
## 2821   2821       crucifixion      disgust
## 2822   2822       crucifixion         fear
## 2823   2823       crucifixion     negative
## 2824   2824       crucifixion      sadness
## 2825   2825             crude      disgust
## 2826   2826             crude     negative
## 2827   2827             cruel        anger
## 2828   2828             cruel      disgust
## 2829   2829             cruel         fear
## 2830   2830             cruel     negative
## 2831   2831             cruel      sadness
## 2832   2832           cruelly        anger
## 2833   2833           cruelly         fear
## 2834   2834           cruelly     negative
## 2835   2835           cruelty        anger
## 2836   2836           cruelty      disgust
## 2837   2837           cruelty         fear
## 2838   2838           cruelty     negative
## 2839   2839           cruelty      sadness
## 2840   2840         crumbling     negative
## 2841   2841         crumbling      sadness
## 2842   2842            crunch        anger
## 2843   2843            crunch     negative
## 2844   2844           crusade        anger
## 2845   2845           crusade         fear
## 2846   2846           crusade     negative
## 2847   2847           crushed        anger
## 2848   2848           crushed      disgust
## 2849   2849           crushed         fear
## 2850   2850           crushed     negative
## 2851   2851           crushed      sadness
## 2852   2852          crushing        anger
## 2853   2853          crushing      disgust
## 2854   2854          crushing         fear
## 2855   2855          crushing     negative
## 2856   2856            crusty      disgust
## 2857   2857            crusty     negative
## 2858   2858               cry     negative
## 2859   2859               cry      sadness
## 2860   2860            crying     negative
## 2861   2861            crying      sadness
## 2862   2862             crypt         fear
## 2863   2863             crypt     negative
## 2864   2864             crypt      sadness
## 2865   2865           crystal     positive
## 2866   2866              cube        trust
## 2867   2867           cuckold      disgust
## 2868   2868           cuckold     negative
## 2869   2869            cuckoo     negative
## 2870   2870            cuddle          joy
## 2871   2871            cuddle     positive
## 2872   2872            cuddle        trust
## 2873   2873               cue anticipation
## 2874   2874          culinary     positive
## 2875   2875          culinary        trust
## 2876   2876              cull     negative
## 2877   2877       culmination     positive
## 2878   2878       culpability     negative
## 2879   2879          culpable     negative
## 2880   2880           culprit     negative
## 2881   2881              cult         fear
## 2882   2882              cult     negative
## 2883   2883         cultivate anticipation
## 2884   2884         cultivate     positive
## 2885   2885         cultivate        trust
## 2886   2886        cultivated     positive
## 2887   2887       cultivation     positive
## 2888   2888           culture     positive
## 2889   2889        cumbersome     negative
## 2890   2890        cumbersome      sadness
## 2891   2891           cunning     negative
## 2892   2892           cunning     positive
## 2893   2893           cupping      disgust
## 2894   2894           cupping         fear
## 2895   2895           cupping     negative
## 2896   2896           cupping      sadness
## 2897   2897               cur        anger
## 2898   2898               cur      disgust
## 2899   2899               cur         fear
## 2900   2900               cur     negative
## 2901   2901           curable     positive
## 2902   2902           curable        trust
## 2903   2903         curiosity anticipation
## 2904   2904         curiosity     positive
## 2905   2905         curiosity     surprise
## 2906   2906              curl     positive
## 2907   2907             curse        anger
## 2908   2908             curse      disgust
## 2909   2909             curse         fear
## 2910   2910             curse     negative
## 2911   2911             curse      sadness
## 2912   2912            cursed        anger
## 2913   2913            cursed         fear
## 2914   2914            cursed     negative
## 2915   2915            cursed      sadness
## 2916   2916           cursing        anger
## 2917   2917           cursing      disgust
## 2918   2918           cursing     negative
## 2919   2919           cursory     negative
## 2920   2920           cushion     positive
## 2921   2921            cussed        anger
## 2922   2922         custodian        trust
## 2923   2923           custody        trust
## 2924   2924          customer     positive
## 2925   2925              cute     positive
## 2926   2926            cutter         fear
## 2927   2927            cutter     negative
## 2928   2928           cutters     positive
## 2929   2929         cutthroat        anger
## 2930   2930         cutthroat         fear
## 2931   2931         cutthroat     negative
## 2932   2932           cutting        anger
## 2933   2933           cutting      disgust
## 2934   2934           cutting         fear
## 2935   2935           cutting     negative
## 2936   2936           cutting      sadness
## 2937   2937           cyanide         fear
## 2938   2938           cyanide     negative
## 2939   2939           cyclone         fear
## 2940   2940           cyclone     negative
## 2941   2941           cyclone     surprise
## 2942   2942              cyst         fear
## 2943   2943              cyst     negative
## 2944   2944              cyst      sadness
## 2945   2945            cystic      disgust
## 2946   2946   cytomegalovirus     negative
## 2947   2947   cytomegalovirus      sadness
## 2948   2948          dabbling        anger
## 2949   2949          dabbling      disgust
## 2950   2950          dabbling     negative
## 2951   2951            daemon        anger
## 2952   2952            daemon      disgust
## 2953   2953            daemon         fear
## 2954   2954            daemon     negative
## 2955   2955            daemon      sadness
## 2956   2956            daemon     surprise
## 2957   2957              daft      disgust
## 2958   2958              daft     negative
## 2959   2959            dagger         fear
## 2960   2960            dagger     negative
## 2961   2961             daily anticipation
## 2962   2962            damage        anger
## 2963   2963            damage      disgust
## 2964   2964            damage     negative
## 2965   2965            damage      sadness
## 2966   2966           damages     negative
## 2967   2967           damages      sadness
## 2968   2968              dame        anger
## 2969   2969              dame      disgust
## 2970   2970              dame     positive
## 2971   2971              dame        trust
## 2972   2972              damn        anger
## 2973   2973              damn      disgust
## 2974   2974              damn     negative
## 2975   2975         damnation        anger
## 2976   2976         damnation         fear
## 2977   2977         damnation     negative
## 2978   2978         damnation      sadness
## 2979   2979            damned     negative
## 2980   2980            damper     negative
## 2981   2981             dance          joy
## 2982   2982             dance     positive
## 2983   2983             dance        trust
## 2984   2984          dandruff     negative
## 2985   2985             dandy      disgust
## 2986   2986             dandy     negative
## 2987   2987            danger         fear
## 2988   2988            danger     negative
## 2989   2989            danger      sadness
## 2990   2990         dangerous         fear
## 2991   2991         dangerous     negative
## 2992   2992              dank      disgust
## 2993   2993              dare anticipation
## 2994   2994              dare        trust
## 2995   2995            daring     positive
## 2996   2996              dark      sadness
## 2997   2997            darken         fear
## 2998   2998            darken     negative
## 2999   2999            darken      sadness
## 3000   3000          darkened         fear
## 3001   3001          darkened     negative
## 3002   3002          darkened      sadness
## 3003   3003          darkness        anger
## 3004   3004          darkness         fear
## 3005   3005          darkness     negative
## 3006   3006          darkness      sadness
## 3007   3007           darling          joy
## 3008   3008           darling     positive
## 3009   3009           darling        trust
## 3010   3010              dart         fear
## 3011   3011            dashed        anger
## 3012   3012            dashed         fear
## 3013   3013            dashed     negative
## 3014   3014            dashed      sadness
## 3015   3015           dashing     positive
## 3016   3016         dastardly        anger
## 3017   3017         dastardly      disgust
## 3018   3018         dastardly         fear
## 3019   3019         dastardly     negative
## 3020   3020          daughter          joy
## 3021   3021          daughter     positive
## 3022   3022              dawn anticipation
## 3023   3023              dawn          joy
## 3024   3024              dawn     positive
## 3025   3025              dawn     surprise
## 3026   3026              dawn        trust
## 3027   3027             dazed     negative
## 3028   3028            deacon        trust
## 3029   3029        deactivate     negative
## 3030   3030          deadlock     negative
## 3031   3031            deadly        anger
## 3032   3032            deadly      disgust
## 3033   3033            deadly         fear
## 3034   3034            deadly     negative
## 3035   3035            deadly      sadness
## 3036   3036              deal anticipation
## 3037   3037              deal          joy
## 3038   3038              deal     positive
## 3039   3039              deal     surprise
## 3040   3040              deal        trust
## 3041   3041          dealings        trust
## 3042   3042              dear     positive
## 3043   3043             death        anger
## 3044   3044             death anticipation
## 3045   3045             death      disgust
## 3046   3046             death         fear
## 3047   3047             death     negative
## 3048   3048             death      sadness
## 3049   3049             death     surprise
## 3050   3050           debacle         fear
## 3051   3051           debacle     negative
## 3052   3052           debacle      sadness
## 3053   3053            debate     positive
## 3054   3054        debauchery      disgust
## 3055   3055        debauchery         fear
## 3056   3056        debauchery     negative
## 3057   3057         debenture anticipation
## 3058   3058            debris      disgust
## 3059   3059            debris     negative
## 3060   3060              debt     negative
## 3061   3061              debt      sadness
## 3062   3062            debtor     negative
## 3063   3063             decay         fear
## 3064   3064             decay     negative
## 3065   3065             decay      sadness
## 3066   3066           decayed      disgust
## 3067   3067           decayed     negative
## 3068   3068           decayed      sadness
## 3069   3069          deceased     negative
## 3070   3070          deceased      sadness
## 3071   3071            deceit        anger
## 3072   3072            deceit      disgust
## 3073   3073            deceit         fear
## 3074   3074            deceit     negative
## 3075   3075            deceit      sadness
## 3076   3076            deceit     surprise
## 3077   3077         deceitful      disgust
## 3078   3078         deceitful     negative
## 3079   3079         deceitful      sadness
## 3080   3080           deceive        anger
## 3081   3081           deceive      disgust
## 3082   3082           deceive     negative
## 3083   3083           deceive      sadness
## 3084   3084          deceived        anger
## 3085   3085          deceived     negative
## 3086   3086         deceiving     negative
## 3087   3087         deceiving        trust
## 3088   3088           decency     positive
## 3089   3089            decent     positive
## 3090   3090         deception     negative
## 3091   3091         deceptive     negative
## 3092   3092       declaratory     positive
## 3093   3093       declination     negative
## 3094   3094           decline     negative
## 3095   3095         declining     negative
## 3096   3096         decompose      disgust
## 3097   3097        decomposed      sadness
## 3098   3098     decomposition      disgust
## 3099   3099     decomposition         fear
## 3100   3100     decomposition     negative
## 3101   3101     decomposition      sadness
## 3102   3102             decoy     surprise
## 3103   3103          decrease     negative
## 3104   3104         decrement     negative
## 3105   3105          decrepit     negative
## 3106   3106             decry        anger
## 3107   3107             decry     negative
## 3108   3108        dedication     positive
## 3109   3109            deduct     negative
## 3110   3110              deed        trust
## 3111   3111        defamation      disgust
## 3112   3112        defamation         fear
## 3113   3113        defamation     negative
## 3114   3114        defamatory        anger
## 3115   3115        defamatory     negative
## 3116   3116           default      disgust
## 3117   3117           default         fear
## 3118   3118           default     negative
## 3119   3119           default      sadness
## 3120   3120            defeat     negative
## 3121   3121          defeated     negative
## 3122   3122          defeated      sadness
## 3123   3123            defect        anger
## 3124   3124            defect     negative
## 3125   3125         defection         fear
## 3126   3126         defection     negative
## 3127   3127         defective      disgust
## 3128   3128         defective     negative
## 3129   3129            defend         fear
## 3130   3130            defend     positive
## 3131   3131         defendant        anger
## 3132   3132         defendant         fear
## 3133   3133         defendant      sadness
## 3134   3134          defended     positive
## 3135   3135          defended        trust
## 3136   3136          defender     positive
## 3137   3137          defender        trust
## 3138   3138         defending     positive
## 3139   3139           defense        anger
## 3140   3140           defense anticipation
## 3141   3141           defense         fear
## 3142   3142           defense     positive
## 3143   3143       defenseless         fear
## 3144   3144       defenseless     negative
## 3145   3145       defenseless      sadness
## 3146   3146         deference     positive
## 3147   3147         deference        trust
## 3148   3148          deferral     negative
## 3149   3149          defiance        anger
## 3150   3150          defiance      disgust
## 3151   3151          defiance         fear
## 3152   3152          defiance     negative
## 3153   3153           defiant        anger
## 3154   3154           defiant     negative
## 3155   3155        deficiency     negative
## 3156   3156           deficit     negative
## 3157   3157        definitive     positive
## 3158   3158        definitive        trust
## 3159   3159           deflate        anger
## 3160   3160           deflate     negative
## 3161   3161           deflate      sadness
## 3162   3162         deflation         fear
## 3163   3163         deflation     negative
## 3164   3164            deform      disgust
## 3165   3165            deform     negative
## 3166   3166          deformed      disgust
## 3167   3167          deformed     negative
## 3168   3168          deformed      sadness
## 3169   3169         deformity      disgust
## 3170   3170         deformity         fear
## 3171   3171         deformity     negative
## 3172   3172         deformity      sadness
## 3173   3173           defraud        anger
## 3174   3174           defraud      disgust
## 3175   3175           defraud     negative
## 3176   3176           defunct     negative
## 3177   3177           defunct      sadness
## 3178   3178              defy        anger
## 3179   3179              defy         fear
## 3180   3180              defy     negative
## 3181   3181              defy      sadness
## 3182   3182              defy     surprise
## 3183   3183        degeneracy        anger
## 3184   3184        degeneracy      disgust
## 3185   3185        degeneracy     negative
## 3186   3186        degeneracy      sadness
## 3187   3187        degenerate     negative
## 3188   3188       degradation     negative
## 3189   3189           degrade      disgust
## 3190   3190           degrade     negative
## 3191   3191         degrading      disgust
## 3192   3192         degrading         fear
## 3193   3193         degrading     negative
## 3194   3194         degrading      sadness
## 3195   3195            degree     positive
## 3196   3196             delay        anger
## 3197   3197             delay      disgust
## 3198   3198             delay         fear
## 3199   3199             delay     negative
## 3200   3200             delay      sadness
## 3201   3201           delayed     negative
## 3202   3202        delectable     positive
## 3203   3203          delegate     positive
## 3204   3204          delegate        trust
## 3205   3205       deleterious        anger
## 3206   3206       deleterious      disgust
## 3207   3207       deleterious         fear
## 3208   3208       deleterious     negative
## 3209   3209          deletion     negative
## 3210   3210        deliberate     positive
## 3211   3211         delicious          joy
## 3212   3212         delicious     positive
## 3213   3213           delight anticipation
## 3214   3214           delight          joy
## 3215   3215           delight     positive
## 3216   3216         delighted anticipation
## 3217   3217         delighted          joy
## 3218   3218         delighted     positive
## 3219   3219         delighted     surprise
## 3220   3220        delightful anticipation
## 3221   3221        delightful          joy
## 3222   3222        delightful     positive
## 3223   3223        delightful        trust
## 3224   3224       delinquency     negative
## 3225   3225        delinquent        anger
## 3226   3226        delinquent      disgust
## 3227   3227        delinquent     negative
## 3228   3228         delirious     negative
## 3229   3229         delirious      sadness
## 3230   3230          delirium      disgust
## 3231   3231          delirium     negative
## 3232   3232          delirium      sadness
## 3233   3233       deliverance anticipation
## 3234   3234       deliverance          joy
## 3235   3235       deliverance     positive
## 3236   3236       deliverance        trust
## 3237   3237          delivery anticipation
## 3238   3238          delivery     positive
## 3239   3239            deluge         fear
## 3240   3240            deluge     negative
## 3241   3241            deluge      sadness
## 3242   3242            deluge     surprise
## 3243   3243          delusion        anger
## 3244   3244          delusion         fear
## 3245   3245          delusion     negative
## 3246   3246          delusion      sadness
## 3247   3247        delusional        anger
## 3248   3248        delusional         fear
## 3249   3249        delusional     negative
## 3250   3250            demand        anger
## 3251   3251            demand     negative
## 3252   3252         demanding     negative
## 3253   3253          demented         fear
## 3254   3254          demented     negative
## 3255   3255          dementia         fear
## 3256   3256          dementia     negative
## 3257   3257          dementia      sadness
## 3258   3258            demise         fear
## 3259   3259            demise     negative
## 3260   3260            demise      sadness
## 3261   3261         democracy     positive
## 3262   3262          demolish        anger
## 3263   3263          demolish     negative
## 3264   3264          demolish      sadness
## 3265   3265        demolition     negative
## 3266   3266             demon        anger
## 3267   3267             demon      disgust
## 3268   3268             demon         fear
## 3269   3269             demon     negative
## 3270   3270             demon      sadness
## 3271   3271           demonic        anger
## 3272   3272           demonic      disgust
## 3273   3273           demonic         fear
## 3274   3274           demonic     negative
## 3275   3275           demonic      sadness
## 3276   3276      demonstrable     positive
## 3277   3277     demonstrative          joy
## 3278   3278     demonstrative     positive
## 3279   3279     demonstrative      sadness
## 3280   3280       demoralized         fear
## 3281   3281       demoralized     negative
## 3282   3282       demoralized      sadness
## 3283   3283            denial     negative
## 3284   3284            denied     negative
## 3285   3285            denied      sadness
## 3286   3286          denounce        anger
## 3287   3287          denounce      disgust
## 3288   3288          denounce     negative
## 3289   3289         dentistry         fear
## 3290   3290      denunciation        anger
## 3291   3291      denunciation      disgust
## 3292   3292      denunciation         fear
## 3293   3293      denunciation     negative
## 3294   3294              deny        anger
## 3295   3295              deny     negative
## 3296   3296           denying anticipation
## 3297   3297           denying     negative
## 3298   3298            depart anticipation
## 3299   3299            depart      sadness
## 3300   3300          departed     negative
## 3301   3301          departed      sadness
## 3302   3302         departure     negative
## 3303   3303         departure      sadness
## 3304   3304            depend anticipation
## 3305   3305            depend        trust
## 3306   3306        dependence         fear
## 3307   3307        dependence     negative
## 3308   3308        dependence      sadness
## 3309   3309        dependency     negative
## 3310   3310         dependent     negative
## 3311   3311         dependent     positive
## 3312   3312         dependent        trust
## 3313   3313        deplorable        anger
## 3314   3314        deplorable      disgust
## 3315   3315        deplorable         fear
## 3316   3316        deplorable     negative
## 3317   3317        deplorable      sadness
## 3318   3318           deplore        anger
## 3319   3319           deplore      disgust
## 3320   3320           deplore     negative
## 3321   3321           deplore      sadness
## 3322   3322            deport         fear
## 3323   3323            deport     negative
## 3324   3324            deport      sadness
## 3325   3325       deportation        anger
## 3326   3326       deportation         fear
## 3327   3327       deportation     negative
## 3328   3328       deportation      sadness
## 3329   3329        depository        trust
## 3330   3330          depraved        anger
## 3331   3331          depraved anticipation
## 3332   3332          depraved      disgust
## 3333   3333          depraved         fear
## 3334   3334          depraved     negative
## 3335   3335          depraved      sadness
## 3336   3336         depravity        anger
## 3337   3337         depravity      disgust
## 3338   3338         depravity     negative
## 3339   3339        depreciate        anger
## 3340   3340        depreciate      disgust
## 3341   3341        depreciate     negative
## 3342   3342       depreciated        anger
## 3343   3343       depreciated      disgust
## 3344   3344       depreciated         fear
## 3345   3345       depreciated     negative
## 3346   3346       depreciated      sadness
## 3347   3347      depreciation         fear
## 3348   3348      depreciation     negative
## 3349   3349           depress         fear
## 3350   3350           depress     negative
## 3351   3351           depress      sadness
## 3352   3352         depressed        anger
## 3353   3353         depressed         fear
## 3354   3354         depressed     negative
## 3355   3355         depressed      sadness
## 3356   3356        depressing      disgust
## 3357   3357        depressing     negative
## 3358   3358        depressing      sadness
## 3359   3359        depression     negative
## 3360   3360        depression      sadness
## 3361   3361        depressive     negative
## 3362   3362        depressive      sadness
## 3363   3363       deprivation        anger
## 3364   3364       deprivation      disgust
## 3365   3365       deprivation         fear
## 3366   3366       deprivation     negative
## 3367   3367       deprivation      sadness
## 3368   3368             depth     positive
## 3369   3369             depth        trust
## 3370   3370            deputy        trust
## 3371   3371          deranged        anger
## 3372   3372          deranged      disgust
## 3373   3373          deranged         fear
## 3374   3374          deranged     negative
## 3375   3375          derelict     negative
## 3376   3376          derision        anger
## 3377   3377          derision      disgust
## 3378   3378          derision     negative
## 3379   3379     dermatologist        trust
## 3380   3380        derogation        anger
## 3381   3381        derogation      disgust
## 3382   3382        derogation         fear
## 3383   3383        derogation     negative
## 3384   3384        derogation      sadness
## 3385   3385        derogatory        anger
## 3386   3386        derogatory      disgust
## 3387   3387        derogatory         fear
## 3388   3388        derogatory     negative
## 3389   3389        derogatory      sadness
## 3390   3390           descent         fear
## 3391   3391           descent      sadness
## 3392   3392       descriptive     positive
## 3393   3393       desecration        anger
## 3394   3394       desecration      disgust
## 3395   3395       desecration         fear
## 3396   3396       desecration     negative
## 3397   3397       desecration      sadness
## 3398   3398            desert        anger
## 3399   3399            desert      disgust
## 3400   3400            desert         fear
## 3401   3401            desert     negative
## 3402   3402            desert      sadness
## 3403   3403          deserted        anger
## 3404   3404          deserted      disgust
## 3405   3405          deserted         fear
## 3406   3406          deserted     negative
## 3407   3407          deserted      sadness
## 3408   3408         desertion     negative
## 3409   3409           deserve        anger
## 3410   3410           deserve anticipation
## 3411   3411           deserve     positive
## 3412   3412           deserve        trust
## 3413   3413          deserved     positive
## 3414   3414       designation        trust
## 3415   3415          designer     positive
## 3416   3416         desirable     positive
## 3417   3417          desiring     positive
## 3418   3418          desirous     positive
## 3419   3419            desist        anger
## 3420   3420            desist      disgust
## 3421   3421            desist     negative
## 3422   3422        desolation         fear
## 3423   3423        desolation     negative
## 3424   3424        desolation      sadness
## 3425   3425           despair        anger
## 3426   3426           despair      disgust
## 3427   3427           despair         fear
## 3428   3428           despair     negative
## 3429   3429           despair      sadness
## 3430   3430        despairing         fear
## 3431   3431        despairing     negative
## 3432   3432        despairing      sadness
## 3433   3433         desperate     negative
## 3434   3434        despicable        anger
## 3435   3435        despicable      disgust
## 3436   3436        despicable     negative
## 3437   3437           despise        anger
## 3438   3438           despise      disgust
## 3439   3439           despise     negative
## 3440   3440          despotic         fear
## 3441   3441          despotic     negative
## 3442   3442         despotism        anger
## 3443   3443         despotism      disgust
## 3444   3444         despotism         fear
## 3445   3445         despotism     negative
## 3446   3446         despotism      sadness
## 3447   3447       destination anticipation
## 3448   3448       destination         fear
## 3449   3449       destination          joy
## 3450   3450       destination     positive
## 3451   3451       destination      sadness
## 3452   3452       destination     surprise
## 3453   3453          destined anticipation
## 3454   3454         destitute         fear
## 3455   3455         destitute     negative
## 3456   3456         destitute      sadness
## 3457   3457         destroyed        anger
## 3458   3458         destroyed         fear
## 3459   3459         destroyed     negative
## 3460   3460         destroyed      sadness
## 3461   3461         destroyer        anger
## 3462   3462         destroyer         fear
## 3463   3463         destroyer     negative
## 3464   3464        destroying        anger
## 3465   3465        destroying         fear
## 3466   3466        destroying     negative
## 3467   3467        destroying      sadness
## 3468   3468       destruction        anger
## 3469   3469       destruction     negative
## 3470   3470       destructive        anger
## 3471   3471       destructive      disgust
## 3472   3472       destructive         fear
## 3473   3473       destructive     negative
## 3474   3474        detachment     negative
## 3475   3475            detain     negative
## 3476   3476          detainee        anger
## 3477   3477          detainee anticipation
## 3478   3478          detainee         fear
## 3479   3479          detainee     negative
## 3480   3480          detainee      sadness
## 3481   3481            detect     positive
## 3482   3482         detection     positive
## 3483   3483         detention     negative
## 3484   3484         detention      sadness
## 3485   3485       deteriorate         fear
## 3486   3486       deteriorate     negative
## 3487   3487       deteriorate      sadness
## 3488   3488      deteriorated      disgust
## 3489   3489      deteriorated     negative
## 3490   3490      deteriorated      sadness
## 3491   3491     deterioration        anger
## 3492   3492     deterioration      disgust
## 3493   3493     deterioration         fear
## 3494   3494     deterioration     negative
## 3495   3495     deterioration      sadness
## 3496   3496       determinate anticipation
## 3497   3497       determinate        trust
## 3498   3498     determination     positive
## 3499   3499     determination        trust
## 3500   3500        determined     positive
## 3501   3501            detest        anger
## 3502   3502            detest      disgust
## 3503   3503            detest     negative
## 3504   3504          detonate         fear
## 3505   3505          detonate     negative
## 3506   3506          detonate     surprise
## 3507   3507        detonation        anger
## 3508   3508           detract        anger
## 3509   3509           detract     negative
## 3510   3510         detriment     negative
## 3511   3511       detrimental     negative
## 3512   3512          detritus     negative
## 3513   3513         devastate        anger
## 3514   3514         devastate         fear
## 3515   3515         devastate     negative
## 3516   3516         devastate      sadness
## 3517   3517       devastating        anger
## 3518   3518       devastating      disgust
## 3519   3519       devastating         fear
## 3520   3520       devastating     negative
## 3521   3521       devastating      sadness
## 3522   3522       devastating        trust
## 3523   3523       devastation        anger
## 3524   3524       devastation         fear
## 3525   3525       devastation     negative
## 3526   3526       devastation      sadness
## 3527   3527       devastation     surprise
## 3528   3528           develop anticipation
## 3529   3529           develop     positive
## 3530   3530         deviation      sadness
## 3531   3531             devil        anger
## 3532   3532             devil anticipation
## 3533   3533             devil      disgust
## 3534   3534             devil         fear
## 3535   3535             devil     negative
## 3536   3536             devil      sadness
## 3537   3537          devilish      disgust
## 3538   3538          devilish         fear
## 3539   3539          devilish     negative
## 3540   3540           devious     negative
## 3541   3541        devolution     negative
## 3542   3542        devotional     positive
## 3543   3543        devotional        trust
## 3544   3544            devour     negative
## 3545   3545            devout anticipation
## 3546   3546            devout          joy
## 3547   3547            devout     positive
## 3548   3548            devout        trust
## 3549   3549         dexterity     positive
## 3550   3550        diabolical        anger
## 3551   3551        diabolical      disgust
## 3552   3552        diabolical         fear
## 3553   3553        diabolical     negative
## 3554   3554         diagnosis anticipation
## 3555   3555         diagnosis         fear
## 3556   3556         diagnosis     negative
## 3557   3557         diagnosis        trust
## 3558   3558           diamond          joy
## 3559   3559           diamond     positive
## 3560   3560            diaper      disgust
## 3561   3561         diarrhoea      disgust
## 3562   3562             diary          joy
## 3563   3563             diary     positive
## 3564   3564             diary        trust
## 3565   3565          diatribe        anger
## 3566   3566          diatribe      disgust
## 3567   3567          diatribe     negative
## 3568   3568          dictator         fear
## 3569   3569          dictator     negative
## 3570   3570       dictatorial        anger
## 3571   3571       dictatorial     negative
## 3572   3572      dictatorship        anger
## 3573   3573      dictatorship anticipation
## 3574   3574      dictatorship      disgust
## 3575   3575      dictatorship         fear
## 3576   3576      dictatorship     negative
## 3577   3577      dictatorship      sadness
## 3578   3578        dictionary     positive
## 3579   3579        dictionary        trust
## 3580   3580            dictum        trust
## 3581   3581          didactic     positive
## 3582   3582               die         fear
## 3583   3583               die     negative
## 3584   3584               die      sadness
## 3585   3585           dietary anticipation
## 3586   3586           dietary     positive
## 3587   3587      differential        trust
## 3588   3588       differently     surprise
## 3589   3589         difficult         fear
## 3590   3590      difficulties     negative
## 3591   3591      difficulties      sadness
## 3592   3592        difficulty        anger
## 3593   3593        difficulty         fear
## 3594   3594        difficulty     negative
## 3595   3595        difficulty      sadness
## 3596   3596             digit        trust
## 3597   3597         dignified     positive
## 3598   3598           dignity     positive
## 3599   3599           dignity        trust
## 3600   3600           digress anticipation
## 3601   3601           digress     negative
## 3602   3602              dike         fear
## 3603   3603       dilapidated      disgust
## 3604   3604       dilapidated     negative
## 3605   3605       dilapidated      sadness
## 3606   3606         diligence     positive
## 3607   3607         diligence        trust
## 3608   3608            dilute     negative
## 3609   3609          diminish     negative
## 3610   3610          diminish      sadness
## 3611   3611        diminished     negative
## 3612   3612               din     negative
## 3613   3613            dinner     positive
## 3614   3614          dinosaur         fear
## 3615   3615         diplomacy anticipation
## 3616   3616         diplomacy     positive
## 3617   3617         diplomacy        trust
## 3618   3618        diplomatic     positive
## 3619   3619        diplomatic        trust
## 3620   3620              dire      disgust
## 3621   3621              dire         fear
## 3622   3622              dire     negative
## 3623   3623              dire      sadness
## 3624   3624              dire     surprise
## 3625   3625          director     positive
## 3626   3626          director        trust
## 3627   3627              dirt      disgust
## 3628   3628              dirt     negative
## 3629   3629             dirty      disgust
## 3630   3630             dirty     negative
## 3631   3631        disability     negative
## 3632   3632        disability      sadness
## 3633   3633           disable         fear
## 3634   3634           disable     negative
## 3635   3635           disable      sadness
## 3636   3636          disabled         fear
## 3637   3637          disabled     negative
## 3638   3638          disabled      sadness
## 3639   3639       disaffected     negative
## 3640   3640          disagree        anger
## 3641   3641          disagree     negative
## 3642   3642       disagreeing        anger
## 3643   3643       disagreeing     negative
## 3644   3644       disagreeing      sadness
## 3645   3645      disagreement        anger
## 3646   3646      disagreement     negative
## 3647   3647      disagreement      sadness
## 3648   3648        disallowed        anger
## 3649   3649        disallowed      disgust
## 3650   3650        disallowed         fear
## 3651   3651        disallowed     negative
## 3652   3652        disallowed      sadness
## 3653   3653         disappear         fear
## 3654   3654        disappoint        anger
## 3655   3655        disappoint      disgust
## 3656   3656        disappoint     negative
## 3657   3657        disappoint      sadness
## 3658   3658      disappointed        anger
## 3659   3659      disappointed      disgust
## 3660   3660      disappointed     negative
## 3661   3661      disappointed      sadness
## 3662   3662     disappointing     negative
## 3663   3663     disappointing      sadness
## 3664   3664    disappointment      disgust
## 3665   3665    disappointment     negative
## 3666   3666    disappointment      sadness
## 3667   3667       disapproval     negative
## 3668   3668       disapproval      sadness
## 3669   3669        disapprove        anger
## 3670   3670        disapprove      disgust
## 3671   3671        disapprove         fear
## 3672   3672        disapprove     negative
## 3673   3673        disapprove      sadness
## 3674   3674       disapproved        anger
## 3675   3675       disapproved     negative
## 3676   3676       disapproved      sadness
## 3677   3677      disapproving        anger
## 3678   3678      disapproving      disgust
## 3679   3679      disapproving     negative
## 3680   3680      disapproving      sadness
## 3681   3681          disaster        anger
## 3682   3682          disaster      disgust
## 3683   3683          disaster         fear
## 3684   3684          disaster     negative
## 3685   3685          disaster      sadness
## 3686   3686          disaster     surprise
## 3687   3687        disastrous        anger
## 3688   3688        disastrous         fear
## 3689   3689        disastrous     negative
## 3690   3690        disastrous      sadness
## 3691   3691        disbelieve     negative
## 3692   3692          discards     negative
## 3693   3693         discharge     negative
## 3694   3694          disciple        trust
## 3695   3695        discipline         fear
## 3696   3696        discipline     negative
## 3697   3697          disclaim        anger
## 3698   3698          disclaim      disgust
## 3699   3699          disclaim     negative
## 3700   3700          disclaim        trust
## 3701   3701         disclosed        trust
## 3702   3702     discoloration      disgust
## 3703   3703     discoloration     negative
## 3704   3704        discolored      disgust
## 3705   3705        discolored     negative
## 3706   3706        discolored      sadness
## 3707   3707        discomfort     negative
## 3708   3708        discomfort      sadness
## 3709   3709        disconnect     negative
## 3710   3710        disconnect      sadness
## 3711   3711      disconnected     negative
## 3712   3712      disconnected      sadness
## 3713   3713     disconnection     negative
## 3714   3714        discontent        anger
## 3715   3715        discontent      disgust
## 3716   3716        discontent         fear
## 3717   3717        discontent     negative
## 3718   3718        discontent      sadness
## 3719   3719       discontinue     negative
## 3720   3720     discontinuity      disgust
## 3721   3721     discontinuity         fear
## 3722   3722     discontinuity     negative
## 3723   3723     discontinuity      sadness
## 3724   3724           discord        anger
## 3725   3725           discord      disgust
## 3726   3726           discord     negative
## 3727   3727        discourage         fear
## 3728   3728        discourage     negative
## 3729   3729        discourage      sadness
## 3730   3730    discouragement     negative
## 3731   3731         discovery     positive
## 3732   3732         discredit     negative
## 3733   3733          discreet anticipation
## 3734   3734          discreet     positive
## 3735   3735        discretion anticipation
## 3736   3736        discretion     positive
## 3737   3737        discretion        trust
## 3738   3738     discretionary     positive
## 3739   3739      discriminate        anger
## 3740   3740      discriminate     negative
## 3741   3741      discriminate      sadness
## 3742   3742    discriminating      disgust
## 3743   3743    discriminating     negative
## 3744   3744    discrimination        anger
## 3745   3745    discrimination      disgust
## 3746   3746    discrimination         fear
## 3747   3747    discrimination     negative
## 3748   3748    discrimination      sadness
## 3749   3749        discussion     positive
## 3750   3750           disdain        anger
## 3751   3751           disdain      disgust
## 3752   3752           disdain     negative
## 3753   3753           disease        anger
## 3754   3754           disease      disgust
## 3755   3755           disease         fear
## 3756   3756           disease     negative
## 3757   3757           disease      sadness
## 3758   3758          diseased      disgust
## 3759   3759          diseased         fear
## 3760   3760          diseased     negative
## 3761   3761          diseased      sadness
## 3762   3762       disembodied         fear
## 3763   3763       disembodied     negative
## 3764   3764       disembodied      sadness
## 3765   3765     disengagement     negative
## 3766   3766        disfigured        anger
## 3767   3767        disfigured      disgust
## 3768   3768        disfigured         fear
## 3769   3769        disfigured     negative
## 3770   3770        disfigured      sadness
## 3771   3771          disgrace        anger
## 3772   3772          disgrace      disgust
## 3773   3773          disgrace     negative
## 3774   3774          disgrace      sadness
## 3775   3775         disgraced        anger
## 3776   3776         disgraced      disgust
## 3777   3777         disgraced     negative
## 3778   3778         disgraced      sadness
## 3779   3779       disgraceful        anger
## 3780   3780       disgraceful      disgust
## 3781   3781       disgraceful     negative
## 3782   3782       disgruntled        anger
## 3783   3783       disgruntled      disgust
## 3784   3784       disgruntled     negative
## 3785   3785       disgruntled      sadness
## 3786   3786           disgust        anger
## 3787   3787           disgust      disgust
## 3788   3788           disgust         fear
## 3789   3789           disgust     negative
## 3790   3790           disgust      sadness
## 3791   3791        disgusting        anger
## 3792   3792        disgusting      disgust
## 3793   3793        disgusting         fear
## 3794   3794        disgusting     negative
## 3795   3795      disheartened     negative
## 3796   3796      disheartened      sadness
## 3797   3797     disheartening     negative
## 3798   3798     disheartening      sadness
## 3799   3799         dishonest        anger
## 3800   3800         dishonest      disgust
## 3801   3801         dishonest     negative
## 3802   3802         dishonest      sadness
## 3803   3803        dishonesty      disgust
## 3804   3804        dishonesty     negative
## 3805   3805          dishonor        anger
## 3806   3806          dishonor      disgust
## 3807   3807          dishonor         fear
## 3808   3808          dishonor     negative
## 3809   3809          dishonor      sadness
## 3810   3810   disillusionment        anger
## 3811   3811   disillusionment      disgust
## 3812   3812   disillusionment     negative
## 3813   3813   disillusionment      sadness
## 3814   3814      disinfection     positive
## 3815   3815    disinformation        anger
## 3816   3816    disinformation         fear
## 3817   3817    disinformation     negative
## 3818   3818      disingenuous      disgust
## 3819   3819      disingenuous     negative
## 3820   3820      disintegrate      disgust
## 3821   3821      disintegrate         fear
## 3822   3822      disintegrate     negative
## 3823   3823    disintegration     negative
## 3824   3824     disinterested     negative
## 3825   3825           dislike        anger
## 3826   3826           dislike      disgust
## 3827   3827           dislike     negative
## 3828   3828          disliked        anger
## 3829   3829          disliked     negative
## 3830   3830          disliked      sadness
## 3831   3831        dislocated        anger
## 3832   3832        dislocated      disgust
## 3833   3833        dislocated         fear
## 3834   3834        dislocated     negative
## 3835   3835        dislocated      sadness
## 3836   3836            dismal      disgust
## 3837   3837            dismal         fear
## 3838   3838            dismal     negative
## 3839   3839            dismal      sadness
## 3840   3840            dismay        anger
## 3841   3841            dismay anticipation
## 3842   3842            dismay         fear
## 3843   3843            dismay     negative
## 3844   3844            dismay      sadness
## 3845   3845            dismay     surprise
## 3846   3846     dismemberment      disgust
## 3847   3847     dismemberment         fear
## 3848   3848     dismemberment     negative
## 3849   3849     dismemberment      sadness
## 3850   3850         dismissal        anger
## 3851   3851         dismissal      disgust
## 3852   3852         dismissal         fear
## 3853   3853         dismissal     negative
## 3854   3854         dismissal      sadness
## 3855   3855         dismissal     surprise
## 3856   3856      disobedience        anger
## 3857   3857      disobedience      disgust
## 3858   3858      disobedience     negative
## 3859   3859       disobedient        anger
## 3860   3860       disobedient     negative
## 3861   3861           disobey        anger
## 3862   3862           disobey      disgust
## 3863   3863           disobey     negative
## 3864   3864          disorder         fear
## 3865   3865          disorder     negative
## 3866   3866        disorderly     negative
## 3867   3867      disorganized     negative
## 3868   3868         disparage        anger
## 3869   3869         disparage      disgust
## 3870   3870         disparage     negative
## 3871   3871         disparage      sadness
## 3872   3872       disparaging        anger
## 3873   3873       disparaging      disgust
## 3874   3874       disparaging     negative
## 3875   3875       disparaging      sadness
## 3876   3876         disparity        anger
## 3877   3877         disparity      disgust
## 3878   3878         disparity     negative
## 3879   3879         disparity      sadness
## 3880   3880     dispassionate     negative
## 3881   3881     dispassionate      sadness
## 3882   3882            dispel     negative
## 3883   3883            dispel      sadness
## 3884   3884        dispersion     negative
## 3885   3885          displace     negative
## 3886   3886         displaced        anger
## 3887   3887         displaced         fear
## 3888   3888         displaced      sadness
## 3889   3889        displeased        anger
## 3890   3890        displeased      disgust
## 3891   3891        displeased         fear
## 3892   3892        displeased     negative
## 3893   3893        displeased      sadness
## 3894   3894       displeasure      disgust
## 3895   3895       displeasure     negative
## 3896   3896          disposal     negative
## 3897   3897           dispose      disgust
## 3898   3898          disposed anticipation
## 3899   3899          disposed     positive
## 3900   3900          disposed        trust
## 3901   3901      dispossessed        anger
## 3902   3902      dispossessed         fear
## 3903   3903      dispossessed     negative
## 3904   3904      dispossessed      sadness
## 3905   3905           dispute        anger
## 3906   3906           dispute     negative
## 3907   3907  disqualification     negative
## 3908   3908      disqualified        anger
## 3909   3909      disqualified      disgust
## 3910   3910      disqualified     negative
## 3911   3911      disqualified      sadness
## 3912   3912        disqualify     negative
## 3913   3913        disqualify      sadness
## 3914   3914         disregard     negative
## 3915   3915       disregarded      disgust
## 3916   3916       disregarded     negative
## 3917   3917      disreputable        anger
## 3918   3918      disreputable      disgust
## 3919   3919      disreputable         fear
## 3920   3920      disreputable     negative
## 3921   3921        disrespect        anger
## 3922   3922        disrespect     negative
## 3923   3923     disrespectful        anger
## 3924   3924     disrespectful      disgust
## 3925   3925     disrespectful         fear
## 3926   3926     disrespectful     negative
## 3927   3927     disrespectful      sadness
## 3928   3928        disruption        anger
## 3929   3929        disruption         fear
## 3930   3930        disruption     negative
## 3931   3931        disruption     surprise
## 3932   3932   dissatisfaction     negative
## 3933   3933        dissection      disgust
## 3934   3934       disseminate     positive
## 3935   3935        dissension        anger
## 3936   3936        dissension     negative
## 3937   3937        dissenting     negative
## 3938   3938        disservice        anger
## 3939   3939        disservice      disgust
## 3940   3940        disservice     negative
## 3941   3941        disservice      sadness
## 3942   3942         dissident        anger
## 3943   3943         dissident         fear
## 3944   3944         dissident     negative
## 3945   3945       dissolution        anger
## 3946   3946       dissolution         fear
## 3947   3947       dissolution     negative
## 3948   3948       dissolution      sadness
## 3949   3949       dissolution     surprise
## 3950   3950        dissonance        anger
## 3951   3951        dissonance     negative
## 3952   3952          distaste      disgust
## 3953   3953          distaste     negative
## 3954   3954       distasteful      disgust
## 3955   3955       distasteful     negative
## 3956   3956      distillation     positive
## 3957   3957       distinction     positive
## 3958   3958         distorted      disgust
## 3959   3959         distorted     negative
## 3960   3960        distortion     negative
## 3961   3961          distract     negative
## 3962   3962        distracted        anger
## 3963   3963        distracted     negative
## 3964   3964       distracting        anger
## 3965   3965       distracting anticipation
## 3966   3966       distracting     negative
## 3967   3967       distraction     negative
## 3968   3968        distraught     negative
## 3969   3969        distraught      sadness
## 3970   3970          distress        anger
## 3971   3971          distress      disgust
## 3972   3972          distress         fear
## 3973   3973          distress     negative
## 3974   3974          distress      sadness
## 3975   3975          distress     surprise
## 3976   3976        distressed         fear
## 3977   3977        distressed     negative
## 3978   3978       distressing        anger
## 3979   3979       distressing         fear
## 3980   3980       distressing     negative
## 3981   3981          distrust        anger
## 3982   3982          distrust      disgust
## 3983   3983          distrust         fear
## 3984   3984          distrust     negative
## 3985   3985       disturbance        anger
## 3986   3986       disturbance         fear
## 3987   3987       disturbance     negative
## 3988   3988       disturbance      sadness
## 3989   3989       disturbance     surprise
## 3990   3990         disturbed        anger
## 3991   3991         disturbed     negative
## 3992   3992         disturbed      sadness
## 3993   3993            disuse     negative
## 3994   3994           disused        anger
## 3995   3995           disused     negative
## 3996   3996             ditty          joy
## 3997   3997             ditty     positive
## 3998   3998             divan        trust
## 3999   3999         divergent     negative
## 4000   4000         divergent     surprise
## 4001   4001           diverse     negative
## 4002   4002           diverse     positive
## 4003   4003       diversified     positive
## 4004   4004         diversion     positive
## 4005   4005         diversion     surprise
## 4006   4006          divested     negative
## 4007   4007        divestment     negative
## 4008   4008        divination anticipation
## 4009   4009          divinity     positive
## 4010   4010           divorce        anger
## 4011   4011           divorce      disgust
## 4012   4012           divorce         fear
## 4013   4013           divorce     negative
## 4014   4014           divorce      sadness
## 4015   4015           divorce     surprise
## 4016   4016           divorce        trust
## 4017   4017         dizziness     negative
## 4018   4018             dizzy     negative
## 4019   4019            docked     negative
## 4020   4020            doctor     positive
## 4021   4021            doctor        trust
## 4022   4022          doctrine        trust
## 4023   4023              doer     positive
## 4024   4024            dogged     positive
## 4025   4025             dogma        trust
## 4026   4026              doit     negative
## 4027   4027          doldrums     negative
## 4028   4028          doldrums      sadness
## 4029   4029              dole     negative
## 4030   4030              dole      sadness
## 4031   4031              doll          joy
## 4032   4032             dolor     negative
## 4033   4033             dolor      sadness
## 4034   4034           dolphin          joy
## 4035   4035           dolphin     positive
## 4036   4036           dolphin     surprise
## 4037   4037           dolphin        trust
## 4038   4038          dominant         fear
## 4039   4039          dominant     negative
## 4040   4040          dominate        anger
## 4041   4041          dominate         fear
## 4042   4042          dominate     negative
## 4043   4043          dominate     positive
## 4044   4044        domination        anger
## 4045   4045        domination         fear
## 4046   4046        domination     negative
## 4047   4047        domination      sadness
## 4048   4048          dominion         fear
## 4049   4049          dominion        trust
## 4050   4050               don     positive
## 4051   4051               don        trust
## 4052   4052          donation     positive
## 4053   4053            donkey      disgust
## 4054   4054            donkey     negative
## 4055   4055            doodle     negative
## 4056   4056              doom         fear
## 4057   4057              doom     negative
## 4058   4058            doomed         fear
## 4059   4059            doomed     negative
## 4060   4060            doomed      sadness
## 4061   4061          doomsday        anger
## 4062   4062          doomsday anticipation
## 4063   4063          doomsday      disgust
## 4064   4064          doomsday         fear
## 4065   4065          doomsday     negative
## 4066   4066          doomsday      sadness
## 4067   4067             doubt         fear
## 4068   4068             doubt     negative
## 4069   4069             doubt      sadness
## 4070   4070             doubt        trust
## 4071   4071          doubtful     negative
## 4072   4072          doubting     negative
## 4073   4073         doubtless     positive
## 4074   4074         doubtless        trust
## 4075   4075            douche     negative
## 4076   4076              dour     negative
## 4077   4077              dove anticipation
## 4078   4078              dove          joy
## 4079   4079              dove     positive
## 4080   4080              dove        trust
## 4081   4081          downfall         fear
## 4082   4082          downfall     negative
## 4083   4083          downfall      sadness
## 4084   4084         downright        trust
## 4085   4085             downy     positive
## 4086   4086              drab     negative
## 4087   4087              drab      sadness
## 4088   4088             draft anticipation
## 4089   4089            dragon         fear
## 4090   4090          drainage     negative
## 4091   4091          drawback     negative
## 4092   4092             dread anticipation
## 4093   4093             dread         fear
## 4094   4094             dread     negative
## 4095   4095          dreadful        anger
## 4096   4096          dreadful anticipation
## 4097   4097          dreadful      disgust
## 4098   4098          dreadful         fear
## 4099   4099          dreadful     negative
## 4100   4100          dreadful      sadness
## 4101   4101        dreadfully      disgust
## 4102   4102        dreadfully         fear
## 4103   4103        dreadfully     negative
## 4104   4104        dreadfully      sadness
## 4105   4105        dreadfully     surprise
## 4106   4106            dreary     negative
## 4107   4107            dreary      sadness
## 4108   4108          drinking     negative
## 4109   4109            drivel      disgust
## 4110   4110            drivel     negative
## 4111   4111             drone     negative
## 4112   4112             drool      disgust
## 4113   4113          drooping     negative
## 4114   4114           drought     negative
## 4115   4115             drown         fear
## 4116   4116             drown     negative
## 4117   4117             drown      sadness
## 4118   4118        drowsiness     negative
## 4119   4119          drudgery     negative
## 4120   4120           drugged      sadness
## 4121   4121           drunken      disgust
## 4122   4122           drunken     negative
## 4123   4123       drunkenness     negative
## 4124   4124           dubious         fear
## 4125   4125           dubious     negative
## 4126   4126           dubious        trust
## 4127   4127              duel        anger
## 4128   4128              duel anticipation
## 4129   4129              duel         fear
## 4130   4130              duet     positive
## 4131   4131              duke     positive
## 4132   4132              dull     negative
## 4133   4133              dull      sadness
## 4134   4134              dumb     negative
## 4135   4135             dummy     negative
## 4136   4136             dumps        anger
## 4137   4137             dumps     negative
## 4138   4138             dumps      sadness
## 4139   4139               dun     negative
## 4140   4140              dung      disgust
## 4141   4141           dungeon         fear
## 4142   4142           dungeon     negative
## 4143   4143              dupe        anger
## 4144   4144              dupe     negative
## 4145   4145         duplicity        anger
## 4146   4146         duplicity     negative
## 4147   4147        durability     positive
## 4148   4148        durability        trust
## 4149   4149           durable     positive
## 4150   4150           durable        trust
## 4151   4151            duress        anger
## 4152   4152            duress      disgust
## 4153   4153            duress         fear
## 4154   4154            duress     negative
## 4155   4155            duress      sadness
## 4156   4156              dust     negative
## 4157   4157           dutiful anticipation
## 4158   4158           dutiful     positive
## 4159   4159           dutiful        trust
## 4160   4160           dwarfed         fear
## 4161   4161           dwarfed     negative
## 4162   4162           dwarfed      sadness
## 4163   4163             dying        anger
## 4164   4164             dying      disgust
## 4165   4165             dying         fear
## 4166   4166             dying     negative
## 4167   4167             dying      sadness
## 4168   4168           dynamic     surprise
## 4169   4169         dysentery      disgust
## 4170   4170         dysentery     negative
## 4171   4171         dysentery      sadness
## 4172   4172             eager anticipation
## 4173   4173             eager          joy
## 4174   4174             eager     positive
## 4175   4175             eager     surprise
## 4176   4176             eager        trust
## 4177   4177         eagerness anticipation
## 4178   4178         eagerness          joy
## 4179   4179         eagerness     positive
## 4180   4180         eagerness        trust
## 4181   4181             eagle        trust
## 4182   4182              earl     positive
## 4183   4183              earn     positive
## 4184   4184           earnest     positive
## 4185   4185         earnestly     positive
## 4186   4186       earnestness     positive
## 4187   4187        earthquake        anger
## 4188   4188        earthquake         fear
## 4189   4189        earthquake     negative
## 4190   4190        earthquake      sadness
## 4191   4191        earthquake     surprise
## 4192   4192              ease     positive
## 4193   4193          easement     positive
## 4194   4194         easygoing     positive
## 4195   4195               eat     positive
## 4196   4196     eavesdropping     negative
## 4197   4197           economy        trust
## 4198   4198           ecstasy anticipation
## 4199   4199           ecstasy          joy
## 4200   4200           ecstasy     positive
## 4201   4201          ecstatic anticipation
## 4202   4202          ecstatic          joy
## 4203   4203          ecstatic     positive
## 4204   4204          ecstatic     surprise
## 4205   4205             edict         fear
## 4206   4206             edict     negative
## 4207   4207       edification anticipation
## 4208   4208       edification          joy
## 4209   4209       edification     positive
## 4210   4210       edification        trust
## 4211   4211           edition anticipation
## 4212   4212           educate     positive
## 4213   4213          educated     positive
## 4214   4214       educational     positive
## 4215   4215       educational        trust
## 4216   4216               eel         fear
## 4217   4217         effective     positive
## 4218   4218         effective        trust
## 4219   4219        effeminate     negative
## 4220   4220          efficacy     positive
## 4221   4221        efficiency     positive
## 4222   4222         efficient anticipation
## 4223   4223         efficient     positive
## 4224   4224         efficient        trust
## 4225   4225            effigy        anger
## 4226   4226            effort     positive
## 4227   4227       egotistical      disgust
## 4228   4228       egotistical     negative
## 4229   4229         egregious        anger
## 4230   4230         egregious      disgust
## 4231   4231         egregious     negative
## 4232   4232       ejaculation anticipation
## 4233   4233       ejaculation          joy
## 4234   4234       ejaculation     positive
## 4235   4235       ejaculation     surprise
## 4236   4236       ejaculation        trust
## 4237   4237             eject     negative
## 4238   4238          ejection     negative
## 4239   4239       elaboration     positive
## 4240   4240            elated          joy
## 4241   4241            elated     positive
## 4242   4242             elbow        anger
## 4243   4243             elder     positive
## 4244   4244             elder        trust
## 4245   4245            elders     positive
## 4246   4246            elders        trust
## 4247   4247             elect     positive
## 4248   4248             elect        trust
## 4249   4249        electorate        trust
## 4250   4250          electric          joy
## 4251   4251          electric     positive
## 4252   4252          electric     surprise
## 4253   4253       electricity     positive
## 4254   4254          elegance anticipation
## 4255   4255          elegance          joy
## 4256   4256          elegance     positive
## 4257   4257          elegance        trust
## 4258   4258           elegant          joy
## 4259   4259           elegant     positive
## 4260   4260         elevation anticipation
## 4261   4261         elevation         fear
## 4262   4262         elevation          joy
## 4263   4263         elevation     positive
## 4264   4264         elevation        trust
## 4265   4265               elf        anger
## 4266   4266               elf      disgust
## 4267   4267               elf         fear
## 4268   4268          eligible     positive
## 4269   4269       elimination        anger
## 4270   4270       elimination      disgust
## 4271   4271       elimination         fear
## 4272   4272       elimination     negative
## 4273   4273       elimination      sadness
## 4274   4274             elite anticipation
## 4275   4275             elite          joy
## 4276   4276             elite     positive
## 4277   4277             elite        trust
## 4278   4278         eloquence     positive
## 4279   4279          eloquent     positive
## 4280   4280         elucidate     positive
## 4281   4281         elucidate        trust
## 4282   4282           elusive     negative
## 4283   4283           elusive     surprise
## 4284   4284         emaciated         fear
## 4285   4285         emaciated     negative
## 4286   4286         emaciated      sadness
## 4287   4287      emancipation anticipation
## 4288   4288      emancipation          joy
## 4289   4289      emancipation     positive
## 4290   4290           embargo     negative
## 4291   4291         embarrass     negative
## 4292   4292         embarrass      sadness
## 4293   4293      embarrassing     negative
## 4294   4294     embarrassment         fear
## 4295   4295     embarrassment     negative
## 4296   4296     embarrassment      sadness
## 4297   4297     embarrassment     surprise
## 4298   4298      embezzlement     negative
## 4299   4299          embolism         fear
## 4300   4300          embolism     negative
## 4301   4301          embolism      sadness
## 4302   4302           embrace anticipation
## 4303   4303           embrace          joy
## 4304   4304           embrace     positive
## 4305   4305           embrace     surprise
## 4306   4306           embrace        trust
## 4307   4307         embroiled     negative
## 4308   4308         emergency         fear
## 4309   4309         emergency     negative
## 4310   4310         emergency      sadness
## 4311   4311         emergency     surprise
## 4312   4312          emeritus     positive
## 4313   4313          eminence     positive
## 4314   4314          eminence        trust
## 4315   4315           eminent     positive
## 4316   4316         eminently     positive
## 4317   4317              emir     positive
## 4318   4318           empathy     positive
## 4319   4319         emphasize        trust
## 4320   4320            employ        trust
## 4321   4321           empower     positive
## 4322   4322         emptiness      sadness
## 4323   4323           emulate     positive
## 4324   4324            enable     positive
## 4325   4325            enable        trust
## 4326   4326        enablement     positive
## 4327   4327        enablement        trust
## 4328   4328           enchant anticipation
## 4329   4329           enchant          joy
## 4330   4330           enchant     positive
## 4331   4331           enchant     surprise
## 4332   4332         enchanted          joy
## 4333   4333         enchanted     positive
## 4334   4334         enchanted        trust
## 4335   4335        enchanting anticipation
## 4336   4336        enchanting          joy
## 4337   4337        enchanting     positive
## 4338   4338           enclave     negative
## 4339   4339            encore     positive
## 4340   4340         encourage          joy
## 4341   4341         encourage     positive
## 4342   4342         encourage        trust
## 4343   4343     encouragement     positive
## 4344   4344      encroachment         fear
## 4345   4345      encroachment     negative
## 4346   4346       encumbrance        anger
## 4347   4347       encumbrance         fear
## 4348   4348       encumbrance     negative
## 4349   4349       encumbrance      sadness
## 4350   4350      encyclopedia     positive
## 4351   4351      encyclopedia        trust
## 4352   4352          endanger anticipation
## 4353   4353          endanger         fear
## 4354   4354          endanger     negative
## 4355   4355        endangered         fear
## 4356   4356        endangered     negative
## 4357   4357          endeavor anticipation
## 4358   4358          endeavor     positive
## 4359   4359           endemic      disgust
## 4360   4360           endemic         fear
## 4361   4361           endemic     negative
## 4362   4362           endemic      sadness
## 4363   4363           endless        anger
## 4364   4364           endless         fear
## 4365   4365           endless          joy
## 4366   4366           endless     negative
## 4367   4367           endless     positive
## 4368   4368           endless      sadness
## 4369   4369           endless        trust
## 4370   4370      endocarditis         fear
## 4371   4371      endocarditis      sadness
## 4372   4372             endow     positive
## 4373   4373             endow        trust
## 4374   4374           endowed     positive
## 4375   4375         endowment     positive
## 4376   4376         endowment        trust
## 4377   4377         endurance     positive
## 4378   4378            endure     positive
## 4379   4379             enema      disgust
## 4380   4380             enemy        anger
## 4381   4381             enemy      disgust
## 4382   4382             enemy         fear
## 4383   4383             enemy     negative
## 4384   4384         energetic     positive
## 4385   4385           enforce        anger
## 4386   4386           enforce         fear
## 4387   4387           enforce     negative
## 4388   4388           enforce     positive
## 4389   4389       enforcement     negative
## 4390   4390           engaged anticipation
## 4391   4391           engaged          joy
## 4392   4392           engaged     positive
## 4393   4393           engaged        trust
## 4394   4394          engaging          joy
## 4395   4395          engaging     positive
## 4396   4396          engaging        trust
## 4397   4397            engulf anticipation
## 4398   4398           enhance     positive
## 4399   4399         enigmatic         fear
## 4400   4400         enigmatic     negative
## 4401   4401             enjoy anticipation
## 4402   4402             enjoy          joy
## 4403   4403             enjoy     positive
## 4404   4404             enjoy        trust
## 4405   4405          enjoying anticipation
## 4406   4406          enjoying          joy
## 4407   4407          enjoying     positive
## 4408   4408          enjoying        trust
## 4409   4409         enlighten          joy
## 4410   4410         enlighten     positive
## 4411   4411         enlighten        trust
## 4412   4412     enlightenment          joy
## 4413   4413     enlightenment     positive
## 4414   4414     enlightenment        trust
## 4415   4415           enliven          joy
## 4416   4416           enliven     positive
## 4417   4417           enliven     surprise
## 4418   4418           enliven        trust
## 4419   4419            enmity        anger
## 4420   4420            enmity         fear
## 4421   4421            enmity     negative
## 4422   4422            enmity      sadness
## 4423   4423            enrich     positive
## 4424   4424            enroll anticipation
## 4425   4425            enroll        trust
## 4426   4426          ensemble     positive
## 4427   4427          ensemble        trust
## 4428   4428            ensign     positive
## 4429   4429           enslave     negative
## 4430   4430          enslaved        anger
## 4431   4431          enslaved      disgust
## 4432   4432          enslaved         fear
## 4433   4433          enslaved     negative
## 4434   4434          enslaved      sadness
## 4435   4435       enslavement     negative
## 4436   4436         entangled        anger
## 4437   4437         entangled      disgust
## 4438   4438         entangled         fear
## 4439   4439         entangled     negative
## 4440   4440         entangled      sadness
## 4441   4441      entanglement     negative
## 4442   4442      enterprising     positive
## 4443   4443         entertain          joy
## 4444   4444         entertain     positive
## 4445   4445       entertained          joy
## 4446   4446       entertained     positive
## 4447   4447      entertaining anticipation
## 4448   4448      entertaining          joy
## 4449   4449      entertaining     positive
## 4450   4450     entertainment anticipation
## 4451   4451     entertainment          joy
## 4452   4452     entertainment     positive
## 4453   4453     entertainment     surprise
## 4454   4454     entertainment        trust
## 4455   4455        enthusiasm anticipation
## 4456   4456        enthusiasm          joy
## 4457   4457        enthusiasm     positive
## 4458   4458        enthusiasm     surprise
## 4459   4459        enthusiast anticipation
## 4460   4460        enthusiast          joy
## 4461   4461        enthusiast     positive
## 4462   4462        enthusiast     surprise
## 4463   4463          entrails      disgust
## 4464   4464          entrails     negative
## 4465   4465           entrust        trust
## 4466   4466           envious     negative
## 4467   4467           environ     positive
## 4468   4468         ephemeris     positive
## 4469   4469              epic     positive
## 4470   4470          epidemic        anger
## 4471   4471          epidemic anticipation
## 4472   4472          epidemic      disgust
## 4473   4473          epidemic         fear
## 4474   4474          epidemic     negative
## 4475   4475          epidemic      sadness
## 4476   4476          epidemic     surprise
## 4477   4477          epilepsy     negative
## 4478   4478         episcopal        trust
## 4479   4479           epitaph      sadness
## 4480   4480           epitome     positive
## 4481   4481          equality          joy
## 4482   4482          equality     positive
## 4483   4483          equality        trust
## 4484   4484           equally     positive
## 4485   4485       equilibrium     positive
## 4486   4486            equity     positive
## 4487   4487         eradicate        anger
## 4488   4488         eradicate     negative
## 4489   4489       eradication        anger
## 4490   4490       eradication      disgust
## 4491   4491       eradication         fear
## 4492   4492       eradication     negative
## 4493   4493             erase         fear
## 4494   4494             erase     negative
## 4495   4495           erosion     negative
## 4496   4496            erotic anticipation
## 4497   4497            erotic          joy
## 4498   4498            erotic     negative
## 4499   4499            erotic     positive
## 4500   4500            erotic     surprise
## 4501   4501            erotic        trust
## 4502   4502               err     negative
## 4503   4503            errand anticipation
## 4504   4504            errand     positive
## 4505   4505            errand        trust
## 4506   4506            errant     negative
## 4507   4507           erratic     negative
## 4508   4508           erratic     surprise
## 4509   4509           erratum     negative
## 4510   4510         erroneous     negative
## 4511   4511             error     negative
## 4512   4512             error      sadness
## 4513   4513           erudite     positive
## 4514   4514             erupt        anger
## 4515   4515             erupt     negative
## 4516   4516             erupt     surprise
## 4517   4517          eruption        anger
## 4518   4518          eruption         fear
## 4519   4519          eruption     negative
## 4520   4520          eruption     surprise
## 4521   4521          escalate        anger
## 4522   4522          escalate     negative
## 4523   4523            escape anticipation
## 4524   4524            escape         fear
## 4525   4525            escape     negative
## 4526   4526            escape     positive
## 4527   4527           escaped         fear
## 4528   4528            eschew        anger
## 4529   4529            eschew     negative
## 4530   4530            eschew      sadness
## 4531   4531            escort        trust
## 4532   4532         espionage     negative
## 4533   4533            esprit     positive
## 4534   4534         essential     positive
## 4535   4535         establish        trust
## 4536   4536       established          joy
## 4537   4537       established     positive
## 4538   4538            esteem          joy
## 4539   4539            esteem     positive
## 4540   4540            esteem      sadness
## 4541   4541            esteem        trust
## 4542   4542          esthetic     positive
## 4543   4543         estranged     negative
## 4544   4544          ethereal         fear
## 4545   4545           ethical     positive
## 4546   4546            ethics     positive
## 4547   4547        euthanasia         fear
## 4548   4548        euthanasia     negative
## 4549   4549        euthanasia      sadness
## 4550   4550          evacuate         fear
## 4551   4551          evacuate     negative
## 4552   4552        evacuation     negative
## 4553   4553             evade        anger
## 4554   4554             evade      disgust
## 4555   4555             evade         fear
## 4556   4556             evade     negative
## 4557   4557       evanescence      sadness
## 4558   4558       evanescence     surprise
## 4559   4559           evasion         fear
## 4560   4560           evasion     negative
## 4561   4561           evasion      sadness
## 4562   4562          eventual anticipation
## 4563   4563       eventuality anticipation
## 4564   4564       eventuality         fear
## 4565   4565         evergreen          joy
## 4566   4566         evergreen     positive
## 4567   4567         evergreen        trust
## 4568   4568       everlasting     positive
## 4569   4569             evict     negative
## 4570   4570             evict      sadness
## 4571   4571          eviction        anger
## 4572   4572          eviction      disgust
## 4573   4573          eviction         fear
## 4574   4574          eviction     negative
## 4575   4575          eviction      sadness
## 4576   4576           evident     positive
## 4577   4577           evident        trust
## 4578   4578              evil        anger
## 4579   4579              evil      disgust
## 4580   4580              evil         fear
## 4581   4581              evil     negative
## 4582   4582              evil      sadness
## 4583   4583         evolution     positive
## 4584   4584        exacerbate     negative
## 4585   4585      exacerbation        anger
## 4586   4586      exacerbation         fear
## 4587   4587      exacerbation     negative
## 4588   4588          exacting     negative
## 4589   4589        exaggerate        anger
## 4590   4590        exaggerate     negative
## 4591   4591       exaggerated     negative
## 4592   4592             exalt anticipation
## 4593   4593             exalt          joy
## 4594   4594             exalt     positive
## 4595   4595             exalt        trust
## 4596   4596        exaltation          joy
## 4597   4597        exaltation     positive
## 4598   4598        exaltation        trust
## 4599   4599           exalted          joy
## 4600   4600           exalted     positive
## 4601   4601           exalted        trust
## 4602   4602       examination         fear
## 4603   4603       examination     negative
## 4604   4604       examination     surprise
## 4605   4605      exasperation        anger
## 4606   4606      exasperation      disgust
## 4607   4607      exasperation     negative
## 4608   4608        excavation anticipation
## 4609   4609        excavation     negative
## 4610   4610        excavation     surprise
## 4611   4611            exceed anticipation
## 4612   4612            exceed          joy
## 4613   4613            exceed     positive
## 4614   4614             excel anticipation
## 4615   4615             excel          joy
## 4616   4616             excel     positive
## 4617   4617             excel     surprise
## 4618   4618             excel        trust
## 4619   4619        excellence      disgust
## 4620   4620        excellence          joy
## 4621   4621        excellence     positive
## 4622   4622        excellence        trust
## 4623   4623         excellent          joy
## 4624   4624         excellent     positive
## 4625   4625         excellent        trust
## 4626   4626            excess     negative
## 4627   4627          exchange     positive
## 4628   4628          exchange        trust
## 4629   4629            excise     negative
## 4630   4630         excitable     positive
## 4631   4631        excitation        anger
## 4632   4632        excitation anticipation
## 4633   4633        excitation         fear
## 4634   4634        excitation          joy
## 4635   4635        excitation     positive
## 4636   4636        excitation     surprise
## 4637   4637            excite        anger
## 4638   4638            excite anticipation
## 4639   4639            excite         fear
## 4640   4640            excite          joy
## 4641   4641            excite     positive
## 4642   4642            excite     surprise
## 4643   4643           excited anticipation
## 4644   4644           excited          joy
## 4645   4645           excited     positive
## 4646   4646           excited     surprise
## 4647   4647           excited        trust
## 4648   4648        excitement anticipation
## 4649   4649        excitement          joy
## 4650   4650        excitement     positive
## 4651   4651        excitement     surprise
## 4652   4652          exciting anticipation
## 4653   4653          exciting          joy
## 4654   4654          exciting     positive
## 4655   4655          exciting     surprise
## 4656   4656           exclaim     surprise
## 4657   4657          excluded      disgust
## 4658   4658          excluded     negative
## 4659   4659          excluded      sadness
## 4660   4660         excluding     negative
## 4661   4661         excluding      sadness
## 4662   4662         exclusion      disgust
## 4663   4663         exclusion         fear
## 4664   4664         exclusion     negative
## 4665   4665         exclusion      sadness
## 4666   4666         excrement      disgust
## 4667   4667         excrement     negative
## 4668   4668         excretion      disgust
## 4669   4669      excruciating         fear
## 4670   4670      excruciating     negative
## 4671   4671            excuse     negative
## 4672   4672         execution        anger
## 4673   4673         execution         fear
## 4674   4674         execution     negative
## 4675   4675         execution      sadness
## 4676   4676         execution        trust
## 4677   4677       executioner        anger
## 4678   4678       executioner         fear
## 4679   4679       executioner     negative
## 4680   4680       executioner      sadness
## 4681   4681          executor        trust
## 4682   4682         exemplary     positive
## 4683   4683         exemption     positive
## 4684   4684           exhaust     negative
## 4685   4685         exhausted     negative
## 4686   4686         exhausted      sadness
## 4687   4687        exhaustion anticipation
## 4688   4688        exhaustion     negative
## 4689   4689        exhaustion      sadness
## 4690   4690        exhaustive        trust
## 4691   4691      exhilaration          joy
## 4692   4692      exhilaration     positive
## 4693   4693      exhilaration     surprise
## 4694   4694            exhort     positive
## 4695   4695       exhortation     positive
## 4696   4696           exigent anticipation
## 4697   4697           exigent      disgust
## 4698   4698           exigent         fear
## 4699   4699           exigent     negative
## 4700   4700           exigent     surprise
## 4701   4701             exile        anger
## 4702   4702             exile         fear
## 4703   4703             exile     negative
## 4704   4704             exile      sadness
## 4705   4705         existence     positive
## 4706   4706          exorcism         fear
## 4707   4707          exorcism     negative
## 4708   4708          exorcism      sadness
## 4709   4709            exotic     positive
## 4710   4710        expatriate     negative
## 4711   4711            expect anticipation
## 4712   4712            expect     positive
## 4713   4713            expect     surprise
## 4714   4714            expect        trust
## 4715   4715        expectancy anticipation
## 4716   4716         expectant anticipation
## 4717   4717       expectation anticipation
## 4718   4718       expectation     positive
## 4719   4719          expected anticipation
## 4720   4720         expecting anticipation
## 4721   4721         expedient          joy
## 4722   4722         expedient     positive
## 4723   4723         expedient        trust
## 4724   4724        expedition anticipation
## 4725   4725        expedition     positive
## 4726   4726             expel        anger
## 4727   4727             expel      disgust
## 4728   4728             expel         fear
## 4729   4729             expel     negative
## 4730   4730             expel      sadness
## 4731   4731       expenditure     negative
## 4732   4732          expenses     negative
## 4733   4733       experienced     positive
## 4734   4734       experienced        trust
## 4735   4735        experiment anticipation
## 4736   4736        experiment     surprise
## 4737   4737            expert     positive
## 4738   4738            expert        trust
## 4739   4739         expertise     positive
## 4740   4740         expertise        trust
## 4741   4741            expire     negative
## 4742   4742            expire      sadness
## 4743   4743           expired     negative
## 4744   4744           explain     positive
## 4745   4745           explain        trust
## 4746   4746         expletive        anger
## 4747   4747         expletive     negative
## 4748   4748           explode        anger
## 4749   4749           explode         fear
## 4750   4750           explode     negative
## 4751   4751           explode      sadness
## 4752   4752           explode     surprise
## 4753   4753           explore anticipation
## 4754   4754         explosion         fear
## 4755   4755         explosion     negative
## 4756   4756         explosion     surprise
## 4757   4757         explosive        anger
## 4758   4758         explosive anticipation
## 4759   4759         explosive         fear
## 4760   4760         explosive     negative
## 4761   4761         explosive     surprise
## 4762   4762            expose anticipation
## 4763   4763            expose         fear
## 4764   4764           exposed     negative
## 4765   4765     expropriation     negative
## 4766   4766         expulsion        anger
## 4767   4767         expulsion      disgust
## 4768   4768         expulsion         fear
## 4769   4769         expulsion     negative
## 4770   4770         expulsion      sadness
## 4771   4771         exquisite          joy
## 4772   4772         exquisite     positive
## 4773   4773       exquisitely     positive
## 4774   4774            extend     positive
## 4775   4775         extensive     positive
## 4776   4776       exterminate         fear
## 4777   4777       exterminate     negative
## 4778   4778       exterminate      sadness
## 4779   4779     extermination        anger
## 4780   4780     extermination         fear
## 4781   4781     extermination     negative
## 4782   4782           extinct     negative
## 4783   4783           extinct      sadness
## 4784   4784        extinguish        anger
## 4785   4785        extinguish     negative
## 4786   4786             extra     positive
## 4787   4787     extrajudicial         fear
## 4788   4788     extrajudicial     negative
## 4789   4789     extraordinary     positive
## 4790   4790         extremity     negative
## 4791   4791         extricate anticipation
## 4792   4792         extricate     positive
## 4793   4793        exuberance          joy
## 4794   4794        exuberance     positive
## 4795   4795        eyewitness        trust
## 4796   4796         fabricate     negative
## 4797   4797       fabrication     negative
## 4798   4798       fabrication        trust
## 4799   4799        facilitate     positive
## 4800   4800              fact        trust
## 4801   4801             facts     positive
## 4802   4802             facts        trust
## 4803   4803           faculty     positive
## 4804   4804           faculty        trust
## 4805   4805              fade     negative
## 4806   4806            faeces      disgust
## 4807   4807            faeces     negative
## 4808   4808           failing        anger
## 4809   4809           failing anticipation
## 4810   4810           failing         fear
## 4811   4811           failing     negative
## 4812   4812           failing      sadness
## 4813   4813           failure      disgust
## 4814   4814           failure         fear
## 4815   4815           failure     negative
## 4816   4816           failure      sadness
## 4817   4817              fain anticipation
## 4818   4818              fain          joy
## 4819   4819              fain     positive
## 4820   4820              fain        trust
## 4821   4821          fainting         fear
## 4822   4822          fainting     negative
## 4823   4823          fainting      sadness
## 4824   4824          fainting     surprise
## 4825   4825              fair     positive
## 4826   4826            fairly     positive
## 4827   4827            fairly        trust
## 4828   4828             faith anticipation
## 4829   4829             faith          joy
## 4830   4830             faith     positive
## 4831   4831             faith        trust
## 4832   4832          faithful     positive
## 4833   4833          faithful        trust
## 4834   4834         faithless     negative
## 4835   4835         faithless      sadness
## 4836   4836              fake     negative
## 4837   4837              fall     negative
## 4838   4838              fall      sadness
## 4839   4839        fallacious        anger
## 4840   4840        fallacious     negative
## 4841   4841           fallacy     negative
## 4842   4842          fallible     negative
## 4843   4843           falling     negative
## 4844   4844           falling      sadness
## 4845   4845            fallow     negative
## 4846   4846         falsehood        anger
## 4847   4847         falsehood     negative
## 4848   4848         falsehood        trust
## 4849   4849           falsely     negative
## 4850   4850     falsification        anger
## 4851   4851     falsification     negative
## 4852   4852           falsify      disgust
## 4853   4853           falsify     negative
## 4854   4854           falsity      disgust
## 4855   4855           falsity     negative
## 4856   4856            falter         fear
## 4857   4857            falter     negative
## 4858   4858              fame     positive
## 4859   4859          familiar     positive
## 4860   4860          familiar        trust
## 4861   4861       familiarity anticipation
## 4862   4862       familiarity          joy
## 4863   4863       familiarity     positive
## 4864   4864       familiarity        trust
## 4865   4865            famine     negative
## 4866   4866            famine      sadness
## 4867   4867            famous     positive
## 4868   4868          famously     positive
## 4869   4869           fanatic     negative
## 4870   4870        fanaticism         fear
## 4871   4871             fancy anticipation
## 4872   4872             fancy          joy
## 4873   4873             fancy     positive
## 4874   4874           fanfare anticipation
## 4875   4875           fanfare          joy
## 4876   4876           fanfare     positive
## 4877   4877           fanfare     surprise
## 4878   4878              fang         fear
## 4879   4879             fangs         fear
## 4880   4880             farce     negative
## 4881   4881          farcical      disgust
## 4882   4882          farcical     negative
## 4883   4883              farm anticipation
## 4884   4884       fascinating     positive
## 4885   4885       fascination     positive
## 4886   4886       fashionable     positive
## 4887   4887           fasting     negative
## 4888   4888           fasting      sadness
## 4889   4889               fat      disgust
## 4890   4890               fat     negative
## 4891   4891               fat      sadness
## 4892   4892             fatal        anger
## 4893   4893             fatal         fear
## 4894   4894             fatal     negative
## 4895   4895             fatal      sadness
## 4896   4896          fatality         fear
## 4897   4897          fatality     negative
## 4898   4898          fatality      sadness
## 4899   4899              fate anticipation
## 4900   4900              fate     negative
## 4901   4901            father        trust
## 4902   4902           fatigue     negative
## 4903   4903          fatigued     negative
## 4904   4904          fatigued      sadness
## 4905   4905             fatty      disgust
## 4906   4906             fatty     negative
## 4907   4907             fatty      sadness
## 4908   4908             fault     negative
## 4909   4909             fault      sadness
## 4910   4910         faultless     positive
## 4911   4911         faultless        trust
## 4912   4912            faulty     negative
## 4913   4913         favorable anticipation
## 4914   4914         favorable          joy
## 4915   4915         favorable     positive
## 4916   4916         favorable     surprise
## 4917   4917         favorable        trust
## 4918   4918          favorite          joy
## 4919   4919          favorite     positive
## 4920   4920          favorite        trust
## 4921   4921        favoritism     positive
## 4922   4922              fawn     negative
## 4923   4923              fear        anger
## 4924   4924              fear         fear
## 4925   4925              fear     negative
## 4926   4926           fearful         fear
## 4927   4927           fearful     negative
## 4928   4928           fearful      sadness
## 4929   4929         fearfully         fear
## 4930   4930         fearfully     negative
## 4931   4931         fearfully      sadness
## 4932   4932         fearfully     surprise
## 4933   4933           fearing         fear
## 4934   4934           fearing     negative
## 4935   4935          fearless         fear
## 4936   4936          fearless     positive
## 4937   4937              feat anticipation
## 4938   4938              feat          joy
## 4939   4939              feat     positive
## 4940   4940              feat     surprise
## 4941   4941           feature     positive
## 4942   4942           febrile     negative
## 4943   4943             fecal      disgust
## 4944   4944             fecal     negative
## 4945   4945             feces      disgust
## 4946   4946             feces     negative
## 4947   4947               fee        anger
## 4948   4948               fee     negative
## 4949   4949            feeble     negative
## 4950   4950            feeble      sadness
## 4951   4951           feeling        anger
## 4952   4952           feeling anticipation
## 4953   4953           feeling      disgust
## 4954   4954           feeling         fear
## 4955   4955           feeling          joy
## 4956   4956           feeling     negative
## 4957   4957           feeling     positive
## 4958   4958           feeling      sadness
## 4959   4959           feeling     surprise
## 4960   4960           feeling        trust
## 4961   4961           feigned     negative
## 4962   4962          felicity          joy
## 4963   4963          felicity     positive
## 4964   4964              fell     negative
## 4965   4965              fell      sadness
## 4966   4966            fellow     positive
## 4967   4967            fellow        trust
## 4968   4968        fellowship     positive
## 4969   4969             felon         fear
## 4970   4970             felon     negative
## 4971   4971            felony     negative
## 4972   4972            fenced        anger
## 4973   4973            fender        trust
## 4974   4974           ferment anticipation
## 4975   4975           ferment     negative
## 4976   4976      fermentation anticipation
## 4977   4977         ferocious        anger
## 4978   4978         ferocious      disgust
## 4979   4979         ferocious         fear
## 4980   4980         ferocious     negative
## 4981   4981          ferocity        anger
## 4982   4982          ferocity     negative
## 4983   4983           fertile     positive
## 4984   4984            fervor        anger
## 4985   4985            fervor          joy
## 4986   4986            fervor     positive
## 4987   4987          festival anticipation
## 4988   4988          festival          joy
## 4989   4989          festival     positive
## 4990   4990          festival     surprise
## 4991   4991           festive          joy
## 4992   4992           festive     positive
## 4993   4993              fete anticipation
## 4994   4994              fete          joy
## 4995   4995              fete     positive
## 4996   4996              fete     surprise
## 4997   4997              feud        anger
## 4998   4998              feud     negative
## 4999   4999            feudal     negative
## 5000   5000         feudalism        anger
## 5001   5001         feudalism     negative
## 5002   5002         feudalism      sadness
## 5003   5003             fever         fear
## 5004   5004          feverish     negative
## 5005   5005            fiasco     negative
## 5006   5006               fib        anger
## 5007   5007               fib     negative
## 5008   5008            fickle     negative
## 5009   5009        fictitious     negative
## 5010   5010          fidelity          joy
## 5011   5011          fidelity     positive
## 5012   5012          fidelity        trust
## 5013   5013             fiend        anger
## 5014   5014             fiend      disgust
## 5015   5015             fiend         fear
## 5016   5016             fiend     negative
## 5017   5017            fierce        anger
## 5018   5018            fierce      disgust
## 5019   5019            fierce         fear
## 5020   5020            fierce     negative
## 5021   5021            fiesta anticipation
## 5022   5022            fiesta          joy
## 5023   5023            fiesta     positive
## 5024   5024            fiesta     surprise
## 5025   5025            fiesta        trust
## 5026   5026             fight        anger
## 5027   5027             fight         fear
## 5028   5028             fight     negative
## 5029   5029          fighting        anger
## 5030   5030          fighting     negative
## 5031   5031        filibuster     negative
## 5032   5032              fill        trust
## 5033   5033             filth      disgust
## 5034   5034             filth     negative
## 5035   5035            filthy      disgust
## 5036   5036            filthy     negative
## 5037   5037           finally anticipation
## 5038   5038           finally      disgust
## 5039   5039           finally          joy
## 5040   5040           finally     positive
## 5041   5041           finally     surprise
## 5042   5042           finally        trust
## 5043   5043            finery     positive
## 5044   5044           finesse     positive
## 5045   5045              fire         fear
## 5046   5046          firearms        anger
## 5047   5047          firearms         fear
## 5048   5048          firearms     negative
## 5049   5049          fireball     positive
## 5050   5050           fireman        trust
## 5051   5051         fireproof     positive
## 5052   5052          firmness     positive
## 5053   5053          firmness        trust
## 5054   5054         firstborn anticipation
## 5055   5055         firstborn          joy
## 5056   5056         firstborn     positive
## 5057   5057         firstborn        trust
## 5058   5058              fits        anger
## 5059   5059              fits     negative
## 5060   5060           fitting anticipation
## 5061   5061           fitting          joy
## 5062   5062           fitting     positive
## 5063   5063           fitting        trust
## 5064   5064             fixed        trust
## 5065   5065           fixture     positive
## 5066   5066            flabby      disgust
## 5067   5067            flabby     negative
## 5068   5068           flaccid     negative
## 5069   5069           flaccid      sadness
## 5070   5070          flagging     negative
## 5071   5071          flagrant        anger
## 5072   5072          flagrant      disgust
## 5073   5073          flagrant     negative
## 5074   5074          flagship        trust
## 5075   5075             flake     negative
## 5076   5076            flange        trust
## 5077   5077              flap     negative
## 5078   5078        flattering          joy
## 5079   5079        flattering     positive
## 5080   5080        flatulence      disgust
## 5081   5081        flatulence     negative
## 5082   5082            flaunt     negative
## 5083   5083              flaw     negative
## 5084   5084              flaw      sadness
## 5085   5085              flea      disgust
## 5086   5086              flea     negative
## 5087   5087              fled         fear
## 5088   5088              flee         fear
## 5089   5089              flee     negative
## 5090   5090            fleece        anger
## 5091   5091            fleece      disgust
## 5092   5092            fleece     negative
## 5093   5093            fleece      sadness
## 5094   5094             fleet     positive
## 5095   5095             flesh      disgust
## 5096   5096            fleshy     negative
## 5097   5097       flexibility     positive
## 5098   5098            flinch anticipation
## 5099   5099            flinch      disgust
## 5100   5100            flinch         fear
## 5101   5101            flinch     negative
## 5102   5102            flinch      sadness
## 5103   5103            flinch     surprise
## 5104   5104             flirt anticipation
## 5105   5105             flirt          joy
## 5106   5106             flirt     negative
## 5107   5107             flirt     positive
## 5108   5108             flirt     surprise
## 5109   5109             flirt        trust
## 5110   5110              flog        anger
## 5111   5111              flog      disgust
## 5112   5112              flog         fear
## 5113   5113              flog     negative
## 5114   5114              flog      sadness
## 5115   5115             flood         fear
## 5116   5116              flop      disgust
## 5117   5117              flop     negative
## 5118   5118              flop      sadness
## 5119   5119            floral     positive
## 5120   5120          flounder         fear
## 5121   5121          flounder     negative
## 5122   5122          flounder      sadness
## 5123   5123              flow     positive
## 5124   5124           flowery     positive
## 5125   5125               flu         fear
## 5126   5126               flu     negative
## 5127   5127       fluctuation        anger
## 5128   5128       fluctuation         fear
## 5129   5129       fluctuation     negative
## 5130   5130             fluke     surprise
## 5131   5131             flush     positive
## 5132   5132            flying         fear
## 5133   5133            flying     positive
## 5134   5134             focus     positive
## 5135   5135               foe        anger
## 5136   5136               foe         fear
## 5137   5137               foe     negative
## 5138   5138            foiled     negative
## 5139   5139          follower        trust
## 5140   5140             folly     negative
## 5141   5141          fondness          joy
## 5142   5142          fondness     positive
## 5143   5143              food          joy
## 5144   5144              food     positive
## 5145   5145              food        trust
## 5146   5146              fool      disgust
## 5147   5147              fool     negative
## 5148   5148           foolish     negative
## 5149   5149       foolishness     negative
## 5150   5150          football anticipation
## 5151   5151          football          joy
## 5152   5152          football     positive
## 5153   5153           footing        trust
## 5154   5154            forage     negative
## 5155   5155             foray        anger
## 5156   5156             foray     negative
## 5157   5157       forbearance     positive
## 5158   5158            forbid     negative
## 5159   5159            forbid      sadness
## 5160   5160        forbidding        anger
## 5161   5161        forbidding         fear
## 5162   5162        forbidding     negative
## 5163   5163             force        anger
## 5164   5164             force         fear
## 5165   5165             force     negative
## 5166   5166            forced         fear
## 5167   5167            forced     negative
## 5168   5168          forcibly        anger
## 5169   5169          forcibly         fear
## 5170   5170          forcibly     negative
## 5171   5171              fore     positive
## 5172   5172           forearm        anger
## 5173   5173           forearm anticipation
## 5174   5174        foreboding anticipation
## 5175   5175        foreboding         fear
## 5176   5176        foreboding     negative
## 5177   5177          forecast anticipation
## 5178   5178          forecast        trust
## 5179   5179         foreclose         fear
## 5180   5180         foreclose     negative
## 5181   5181         foreclose      sadness
## 5182   5182       forefathers          joy
## 5183   5183       forefathers     positive
## 5184   5184       forefathers        trust
## 5185   5185            forego     negative
## 5186   5186         foregoing     positive
## 5187   5187           foreign     negative
## 5188   5188         foreigner         fear
## 5189   5189         foreigner     negative
## 5190   5190           foreman     positive
## 5191   5191        forerunner     positive
## 5192   5192           foresee anticipation
## 5193   5193           foresee     positive
## 5194   5194           foresee     surprise
## 5195   5195           foresee        trust
## 5196   5196          foreseen anticipation
## 5197   5197          foreseen     positive
## 5198   5198         foresight anticipation
## 5199   5199         foresight     positive
## 5200   5200         foresight        trust
## 5201   5201        forewarned anticipation
## 5202   5202        forewarned         fear
## 5203   5203        forewarned     negative
## 5204   5204           forfeit        anger
## 5205   5205           forfeit     negative
## 5206   5206           forfeit      sadness
## 5207   5207         forfeited     negative
## 5208   5208        forfeiture         fear
## 5209   5209        forfeiture     negative
## 5210   5210        forfeiture      sadness
## 5211   5211             forge     positive
## 5212   5212           forgery     negative
## 5213   5213            forget     negative
## 5214   5214           forgive     positive
## 5215   5215          forgiven     positive
## 5216   5216         forgiving     positive
## 5217   5217         forgiving        trust
## 5218   5218         forgotten         fear
## 5219   5219         forgotten     negative
## 5220   5220         forgotten      sadness
## 5221   5221           forlorn     negative
## 5222   5222           forlorn      sadness
## 5223   5223         formality        trust
## 5224   5224         formative     positive
## 5225   5225         formative        trust
## 5226   5226        formidable         fear
## 5227   5227           forming anticipation
## 5228   5228          formless     negative
## 5229   5229           formula     positive
## 5230   5230           formula        trust
## 5231   5231       fornication     negative
## 5232   5232           forsake     negative
## 5233   5233           forsake      sadness
## 5234   5234          forsaken        anger
## 5235   5235          forsaken     negative
## 5236   5236          forsaken      sadness
## 5237   5237              fort        trust
## 5238   5238             forte     positive
## 5239   5239       forthcoming     positive
## 5240   5240           fortify     positive
## 5241   5241         fortitude          joy
## 5242   5242         fortitude     positive
## 5243   5243         fortitude        trust
## 5244   5244          fortress         fear
## 5245   5245          fortress     positive
## 5246   5246          fortress      sadness
## 5247   5247          fortress        trust
## 5248   5248         fortunate     positive
## 5249   5249           fortune anticipation
## 5250   5250           fortune          joy
## 5251   5251           fortune     positive
## 5252   5252           fortune     surprise
## 5253   5253           fortune        trust
## 5254   5254           forward     positive
## 5255   5255              foul        anger
## 5256   5256              foul      disgust
## 5257   5257              foul         fear
## 5258   5258              foul     negative
## 5259   5259             found          joy
## 5260   5260             found     positive
## 5261   5261             found        trust
## 5262   5262        foundation     positive
## 5263   5263          fracture     negative
## 5264   5264           fragile         fear
## 5265   5265           fragile     negative
## 5266   5266           fragile      sadness
## 5267   5267          fragrant     positive
## 5268   5268           frailty     negative
## 5269   5269           frailty      sadness
## 5270   5270         framework        trust
## 5271   5271             frank     positive
## 5272   5272             frank        trust
## 5273   5273         frankness     positive
## 5274   5274         frankness        trust
## 5275   5275           frantic anticipation
## 5276   5276           frantic      disgust
## 5277   5277           frantic         fear
## 5278   5278           frantic     negative
## 5279   5279           frantic     surprise
## 5280   5280         fraternal          joy
## 5281   5281         fraternal     positive
## 5282   5282         fraternal        trust
## 5283   5283             fraud        anger
## 5284   5284             fraud     negative
## 5285   5285        fraudulent        anger
## 5286   5286        fraudulent      disgust
## 5287   5287        fraudulent     negative
## 5288   5288           fraught         fear
## 5289   5289           fraught     negative
## 5290   5290           fraught      sadness
## 5291   5291              fray     negative
## 5292   5292            frayed     negative
## 5293   5293            frayed      sadness
## 5294   5294          freakish      disgust
## 5295   5295          freakish         fear
## 5296   5296          freakish     negative
## 5297   5297          freakish     surprise
## 5298   5298           freedom          joy
## 5299   5299           freedom     positive
## 5300   5300           freedom        trust
## 5301   5301            freely          joy
## 5302   5302            freely     positive
## 5303   5303            freely        trust
## 5304   5304          freezing     negative
## 5305   5305          frenetic        anger
## 5306   5306          frenetic         fear
## 5307   5307          frenetic     negative
## 5308   5308          frenetic     surprise
## 5309   5309          frenzied        anger
## 5310   5310          frenzied         fear
## 5311   5311          frenzied     negative
## 5312   5312            frenzy     negative
## 5313   5313              fret         fear
## 5314   5314              fret     negative
## 5315   5315          friction        anger
## 5316   5316            friend          joy
## 5317   5317            friend     positive
## 5318   5318            friend        trust
## 5319   5319      friendliness          joy
## 5320   5320      friendliness     positive
## 5321   5321      friendliness        trust
## 5322   5322          friendly anticipation
## 5323   5323          friendly          joy
## 5324   5324          friendly     positive
## 5325   5325          friendly        trust
## 5326   5326        friendship          joy
## 5327   5327        friendship     positive
## 5328   5328        friendship        trust
## 5329   5329           frigate         fear
## 5330   5330            fright         fear
## 5331   5331            fright     negative
## 5332   5332            fright     surprise
## 5333   5333          frighten         fear
## 5334   5334          frighten     negative
## 5335   5335          frighten      sadness
## 5336   5336          frighten     surprise
## 5337   5337        frightened         fear
## 5338   5338        frightened     negative
## 5339   5339        frightened     surprise
## 5340   5340         frightful        anger
## 5341   5341         frightful         fear
## 5342   5342         frightful     negative
## 5343   5343         frightful      sadness
## 5344   5344            frigid     negative
## 5345   5345            frisky anticipation
## 5346   5346            frisky          joy
## 5347   5347            frisky     positive
## 5348   5348            frisky     surprise
## 5349   5349         frivolous     negative
## 5350   5350            frolic          joy
## 5351   5351            frolic     positive
## 5352   5352         frostbite     negative
## 5353   5353             froth     negative
## 5354   5354             frown     negative
## 5355   5355             frown      sadness
## 5356   5356          frowning        anger
## 5357   5357          frowning      disgust
## 5358   5358          frowning     negative
## 5359   5359          frowning      sadness
## 5360   5360            frugal     positive
## 5361   5361          fruitful     positive
## 5362   5362         fruitless     negative
## 5363   5363         fruitless      sadness
## 5364   5364         frustrate        anger
## 5365   5365         frustrate      disgust
## 5366   5366         frustrate     negative
## 5367   5367         frustrate      sadness
## 5368   5368        frustrated        anger
## 5369   5369        frustrated     negative
## 5370   5370       frustration        anger
## 5371   5371       frustration     negative
## 5372   5372             fudge     negative
## 5373   5373          fugitive        anger
## 5374   5374          fugitive      disgust
## 5375   5375          fugitive         fear
## 5376   5376          fugitive     negative
## 5377   5377          fugitive      sadness
## 5378   5378          fugitive        trust
## 5379   5379           fulfill          joy
## 5380   5380           fulfill     positive
## 5381   5381       fulfillment anticipation
## 5382   5382       fulfillment          joy
## 5383   5383       fulfillment     positive
## 5384   5384       fulfillment        trust
## 5385   5385              full     positive
## 5386   5386             fully     positive
## 5387   5387             fully        trust
## 5388   5388            fumble     negative
## 5389   5389              fume     negative
## 5390   5390            fuming        anger
## 5391   5391            fuming     negative
## 5392   5392               fun anticipation
## 5393   5393               fun          joy
## 5394   5394               fun     positive
## 5395   5395       fundamental     positive
## 5396   5396       fundamental        trust
## 5397   5397           funeral      sadness
## 5398   5398            fungus      disgust
## 5399   5399            fungus     negative
## 5400   5400              funk     negative
## 5401   5401              funk      sadness
## 5402   5402           furious        anger
## 5403   5403           furious      disgust
## 5404   5404           furious     negative
## 5405   5405         furiously        anger
## 5406   5406           furnace        anger
## 5407   5407             furor        anger
## 5408   5408             furor     negative
## 5409   5409            furrow      sadness
## 5410   5410              fury        anger
## 5411   5411              fury         fear
## 5412   5412              fury     negative
## 5413   5413              fury      sadness
## 5414   5414              fuse     positive
## 5415   5415              fuse        trust
## 5416   5416            fusion     positive
## 5417   5417              fuss        anger
## 5418   5418              fuss     negative
## 5419   5419              fuss      sadness
## 5420   5420             fussy      disgust
## 5421   5421             fussy     negative
## 5422   5422            futile     negative
## 5423   5423            futile      sadness
## 5424   5424          futility     negative
## 5425   5425              gaby      disgust
## 5426   5426              gaby     negative
## 5427   5427               gag      disgust
## 5428   5428               gag     negative
## 5429   5429              gage        trust
## 5430   5430              gain anticipation
## 5431   5431              gain          joy
## 5432   5432              gain     positive
## 5433   5433           gaining     positive
## 5434   5434              gall        anger
## 5435   5435              gall      disgust
## 5436   5436              gall     negative
## 5437   5437           gallant     positive
## 5438   5438         gallantry     positive
## 5439   5439           gallows        anger
## 5440   5440           gallows         fear
## 5441   5441           gallows     negative
## 5442   5442           gallows      sadness
## 5443   5443            galore     positive
## 5444   5444            gamble     negative
## 5445   5445           gambler anticipation
## 5446   5446           gambler     negative
## 5447   5447           gambler     surprise
## 5448   5448          gambling anticipation
## 5449   5449          gambling     negative
## 5450   5450          gambling     surprise
## 5451   5451              gang        anger
## 5452   5452              gang         fear
## 5453   5453              gang     negative
## 5454   5454              gaol     negative
## 5455   5455               gap     negative
## 5456   5456              gape     surprise
## 5457   5457           garbage      disgust
## 5458   5458           garbage     negative
## 5459   5459            garden          joy
## 5460   5460            garden     positive
## 5461   5461            garish      disgust
## 5462   5462            garish     negative
## 5463   5463            garish     surprise
## 5464   5464            garnet     positive
## 5465   5465           garnish     negative
## 5466   5466          garrison     positive
## 5467   5467          garrison        trust
## 5468   5468              gash         fear
## 5469   5469              gash     negative
## 5470   5470              gasp     surprise
## 5471   5471           gasping         fear
## 5472   5472           gasping     negative
## 5473   5473              gate        trust
## 5474   5474           gateway        trust
## 5475   5475            gauche     negative
## 5476   5476           gauging        trust
## 5477   5477             gaunt     negative
## 5478   5478              gawk     surprise
## 5479   5479           gazette     positive
## 5480   5480           gazette        trust
## 5481   5481              gear     positive
## 5482   5482           gelatin      disgust
## 5483   5483               gem          joy
## 5484   5484               gem     positive
## 5485   5485           general     positive
## 5486   5486           general        trust
## 5487   5487        generosity anticipation
## 5488   5488        generosity          joy
## 5489   5489        generosity     positive
## 5490   5490        generosity     surprise
## 5491   5491        generosity        trust
## 5492   5492          generous          joy
## 5493   5493          generous     positive
## 5494   5494          generous        trust
## 5495   5495            genial          joy
## 5496   5496            genial     positive
## 5497   5497            genius     positive
## 5498   5498              gent        anger
## 5499   5499              gent      disgust
## 5500   5500              gent         fear
## 5501   5501              gent     negative
## 5502   5502           genteel     positive
## 5503   5503         gentleman     positive
## 5504   5504         gentleman        trust
## 5505   5505        gentleness     positive
## 5506   5506            gentry     positive
## 5507   5507            gentry        trust
## 5508   5508           genuine     positive
## 5509   5509           genuine        trust
## 5510   5510          geranium     positive
## 5511   5511         geriatric     negative
## 5512   5512         geriatric      sadness
## 5513   5513              germ anticipation
## 5514   5514              germ      disgust
## 5515   5515       germination anticipation
## 5516   5516           ghastly      disgust
## 5517   5517           ghastly         fear
## 5518   5518           ghastly     negative
## 5519   5519            ghetto      disgust
## 5520   5520            ghetto         fear
## 5521   5521            ghetto     negative
## 5522   5522            ghetto      sadness
## 5523   5523             ghost         fear
## 5524   5524           ghostly         fear
## 5525   5525           ghostly     negative
## 5526   5526             giant         fear
## 5527   5527         gibberish        anger
## 5528   5528         gibberish     negative
## 5529   5529              gift anticipation
## 5530   5530              gift          joy
## 5531   5531              gift     positive
## 5532   5532              gift     surprise
## 5533   5533            gifted     positive
## 5534   5534          gigantic     positive
## 5535   5535            giggle          joy
## 5536   5536            giggle     positive
## 5537   5537            girder     positive
## 5538   5538            girder        trust
## 5539   5539            giving     positive
## 5540   5540           glacial     negative
## 5541   5541              glad anticipation
## 5542   5542              glad          joy
## 5543   5543              glad     positive
## 5544   5544         gladiator         fear
## 5545   5545          gladness          joy
## 5546   5546          gladness     positive
## 5547   5547             glare        anger
## 5548   5548             glare         fear
## 5549   5549             glare     negative
## 5550   5550           glaring        anger
## 5551   5551           glaring     negative
## 5552   5552              glee          joy
## 5553   5553              glee     positive
## 5554   5554              glib     negative
## 5555   5555             glide anticipation
## 5556   5556             glide          joy
## 5557   5557             glide     positive
## 5558   5558           glimmer anticipation
## 5559   5559           glimmer          joy
## 5560   5560           glimmer     positive
## 5561   5561           glimmer     surprise
## 5562   5562           glitter      disgust
## 5563   5563           glitter          joy
## 5564   5564        glittering     positive
## 5565   5565             gloom     negative
## 5566   5566             gloom      sadness
## 5567   5567            gloomy     negative
## 5568   5568            gloomy      sadness
## 5569   5569     glorification          joy
## 5570   5570     glorification     positive
## 5571   5571           glorify anticipation
## 5572   5572           glorify          joy
## 5573   5573           glorify     positive
## 5574   5574           glorify     surprise
## 5575   5575           glorify        trust
## 5576   5576             glory anticipation
## 5577   5577             glory          joy
## 5578   5578             glory     positive
## 5579   5579             glory        trust
## 5580   5580             gloss     positive
## 5581   5581              glow anticipation
## 5582   5582              glow          joy
## 5583   5583              glow     positive
## 5584   5584              glow        trust
## 5585   5585           glowing     positive
## 5586   5586              glum     negative
## 5587   5587              glum      sadness
## 5588   5588              glut      disgust
## 5589   5589              glut     negative
## 5590   5590          gluttony      disgust
## 5591   5591          gluttony     negative
## 5592   5592             gnome        anger
## 5593   5593             gnome      disgust
## 5594   5594             gnome         fear
## 5595   5595             gnome     negative
## 5596   5596               gob      disgust
## 5597   5597            goblin      disgust
## 5598   5598            goblin         fear
## 5599   5599            goblin     negative
## 5600   5600               god anticipation
## 5601   5601               god         fear
## 5602   5602               god          joy
## 5603   5603               god     positive
## 5604   5604               god        trust
## 5605   5605           godless        anger
## 5606   5606           godless     negative
## 5607   5607             godly          joy
## 5608   5608             godly     positive
## 5609   5609             godly        trust
## 5610   5610           godsend          joy
## 5611   5611           godsend     positive
## 5612   5612           godsend     surprise
## 5613   5613              gold     positive
## 5614   5614         gonorrhea        anger
## 5615   5615         gonorrhea      disgust
## 5616   5616         gonorrhea         fear
## 5617   5617         gonorrhea     negative
## 5618   5618         gonorrhea      sadness
## 5619   5619               goo      disgust
## 5620   5620               goo     negative
## 5621   5621              good anticipation
## 5622   5622              good          joy
## 5623   5623              good     positive
## 5624   5624              good     surprise
## 5625   5625              good        trust
## 5626   5626            goodly     positive
## 5627   5627          goodness anticipation
## 5628   5628          goodness          joy
## 5629   5629          goodness     positive
## 5630   5630          goodness     surprise
## 5631   5631          goodness        trust
## 5632   5632             goods     positive
## 5633   5633          goodwill     positive
## 5634   5634              gore        anger
## 5635   5635              gore      disgust
## 5636   5636              gore         fear
## 5637   5637              gore     negative
## 5638   5638              gore      sadness
## 5639   5639             gorge      disgust
## 5640   5640             gorge     negative
## 5641   5641          gorgeous          joy
## 5642   5642          gorgeous     positive
## 5643   5643           gorilla     negative
## 5644   5644              gory        anger
## 5645   5645              gory      disgust
## 5646   5646              gory         fear
## 5647   5647              gory     negative
## 5648   5648              gory      sadness
## 5649   5649            gospel     positive
## 5650   5650            gospel        trust
## 5651   5651            gossip     negative
## 5652   5652             gouge     negative
## 5653   5653              gout     negative
## 5654   5654            govern     positive
## 5655   5655            govern        trust
## 5656   5656         governess        trust
## 5657   5657        government         fear
## 5658   5658        government     negative
## 5659   5659          governor        trust
## 5660   5660              grab        anger
## 5661   5661              grab     negative
## 5662   5662             grace     positive
## 5663   5663          graceful     positive
## 5664   5664          gracious     positive
## 5665   5665        graciously     positive
## 5666   5666           gradual anticipation
## 5667   5667        graduation anticipation
## 5668   5668        graduation         fear
## 5669   5669        graduation          joy
## 5670   5670        graduation     positive
## 5671   5671        graduation     surprise
## 5672   5672        graduation        trust
## 5673   5673           grammar        trust
## 5674   5674     grandchildren anticipation
## 5675   5675     grandchildren          joy
## 5676   5676     grandchildren     positive
## 5677   5677     grandchildren        trust
## 5678   5678          grandeur     positive
## 5679   5679       grandfather        trust
## 5680   5680       grandmother     positive
## 5681   5681             grant anticipation
## 5682   5682             grant          joy
## 5683   5683             grant     positive
## 5684   5684             grant        trust
## 5685   5685           granted     positive
## 5686   5686          grasping anticipation
## 5687   5687          grasping     negative
## 5688   5688             grate     negative
## 5689   5689            grated        anger
## 5690   5690            grated     negative
## 5691   5691          grateful     positive
## 5692   5692           gratify          joy
## 5693   5693           gratify     positive
## 5694   5694           gratify     surprise
## 5695   5695           grating        anger
## 5696   5696           grating      disgust
## 5697   5697           grating     negative
## 5698   5698         gratitude          joy
## 5699   5699         gratitude     positive
## 5700   5700        gratuitous      disgust
## 5701   5701             grave         fear
## 5702   5702             grave     negative
## 5703   5703             grave      sadness
## 5704   5704         gravitate anticipation
## 5705   5705              gray      disgust
## 5706   5706              gray      sadness
## 5707   5707            greasy      disgust
## 5708   5708           greater     positive
## 5709   5709         greatness          joy
## 5710   5710         greatness     positive
## 5711   5711         greatness     surprise
## 5712   5712         greatness        trust
## 5713   5713             greed        anger
## 5714   5714             greed      disgust
## 5715   5715             greed     negative
## 5716   5716            greedy      disgust
## 5717   5717            greedy     negative
## 5718   5718             green          joy
## 5719   5719             green     positive
## 5720   5720             green        trust
## 5721   5721          greeting     positive
## 5722   5722          greeting     surprise
## 5723   5723        gregarious     positive
## 5724   5724           grenade         fear
## 5725   5725           grenade     negative
## 5726   5726             grief     negative
## 5727   5727             grief      sadness
## 5728   5728         grievance        anger
## 5729   5729         grievance      disgust
## 5730   5730         grievance     negative
## 5731   5731         grievance      sadness
## 5732   5732            grieve         fear
## 5733   5733            grieve     negative
## 5734   5734            grieve      sadness
## 5735   5735          grievous        anger
## 5736   5736          grievous         fear
## 5737   5737          grievous     negative
## 5738   5738          grievous      sadness
## 5739   5739              grim        anger
## 5740   5740              grim anticipation
## 5741   5741              grim      disgust
## 5742   5742              grim         fear
## 5743   5743              grim     negative
## 5744   5744              grim      sadness
## 5745   5745             grime      disgust
## 5746   5746             grime     negative
## 5747   5747             grimy      disgust
## 5748   5748             grimy     negative
## 5749   5749              grin anticipation
## 5750   5750              grin          joy
## 5751   5751              grin     positive
## 5752   5752              grin     surprise
## 5753   5753              grin        trust
## 5754   5754          grinding     negative
## 5755   5755            grisly      disgust
## 5756   5756            grisly         fear
## 5757   5757            grisly     negative
## 5758   5758             grist     positive
## 5759   5759              grit     positive
## 5760   5760              grit        trust
## 5761   5761           grizzly         fear
## 5762   5762           grizzly     negative
## 5763   5763             groan      disgust
## 5764   5764             groan     negative
## 5765   5765             groan      sadness
## 5766   5766             grope        anger
## 5767   5767             grope      disgust
## 5768   5768             grope         fear
## 5769   5769             grope     negative
## 5770   5770             gross      disgust
## 5771   5771             gross     negative
## 5772   5772         grotesque      disgust
## 5773   5773         grotesque     negative
## 5774   5774            ground        trust
## 5775   5775          grounded         fear
## 5776   5776          grounded     negative
## 5777   5777          grounded      sadness
## 5778   5778        groundless     negative
## 5779   5779        groundwork     positive
## 5780   5780              grow anticipation
## 5781   5781              grow          joy
## 5782   5782              grow     positive
## 5783   5783              grow        trust
## 5784   5784             growl        anger
## 5785   5785             growl         fear
## 5786   5786             growl     negative
## 5787   5787          growling        anger
## 5788   5788          growling      disgust
## 5789   5789          growling         fear
## 5790   5790          growling     negative
## 5791   5791            growth     positive
## 5792   5792            grudge        anger
## 5793   5793            grudge     negative
## 5794   5794        grudgingly     negative
## 5795   5795          gruesome      disgust
## 5796   5796          gruesome     negative
## 5797   5797             gruff        anger
## 5798   5798             gruff      disgust
## 5799   5799             gruff     negative
## 5800   5800           grumble        anger
## 5801   5801           grumble      disgust
## 5802   5802           grumble     negative
## 5803   5803            grumpy        anger
## 5804   5804            grumpy      disgust
## 5805   5805            grumpy     negative
## 5806   5806            grumpy      sadness
## 5807   5807         guarantee     positive
## 5808   5808         guarantee        trust
## 5809   5809             guard         fear
## 5810   5810             guard     positive
## 5811   5811             guard        trust
## 5812   5812           guarded        trust
## 5813   5813          guardian     positive
## 5814   5814          guardian        trust
## 5815   5815      guardianship     positive
## 5816   5816      guardianship        trust
## 5817   5817     gubernatorial     positive
## 5818   5818     gubernatorial        trust
## 5819   5819          guerilla         fear
## 5820   5820          guerilla     negative
## 5821   5821             guess     surprise
## 5822   5822          guidance     positive
## 5823   5823          guidance        trust
## 5824   5824             guide     positive
## 5825   5825             guide        trust
## 5826   5826         guidebook     positive
## 5827   5827         guidebook        trust
## 5828   5828             guile     negative
## 5829   5829        guillotine        anger
## 5830   5830        guillotine anticipation
## 5831   5831        guillotine      disgust
## 5832   5832        guillotine         fear
## 5833   5833        guillotine     negative
## 5834   5834        guillotine      sadness
## 5835   5835             guilt      disgust
## 5836   5836             guilt     negative
## 5837   5837             guilt      sadness
## 5838   5838            guilty        anger
## 5839   5839            guilty     negative
## 5840   5840            guilty      sadness
## 5841   5841             guise     negative
## 5842   5842              gull     negative
## 5843   5843          gullible     negative
## 5844   5844          gullible      sadness
## 5845   5845          gullible        trust
## 5846   5846              gulp         fear
## 5847   5847              gulp     surprise
## 5848   5848               gun        anger
## 5849   5849               gun         fear
## 5850   5850               gun     negative
## 5851   5851         gunpowder         fear
## 5852   5852              guru     positive
## 5853   5853              guru        trust
## 5854   5854              gush      disgust
## 5855   5855              gush          joy
## 5856   5856              gush     negative
## 5857   5857            gusset        trust
## 5858   5858               gut      disgust
## 5859   5859              guts     positive
## 5860   5860            gutter      disgust
## 5861   5861          guzzling     negative
## 5862   5862           gymnast     positive
## 5863   5863             gypsy     negative
## 5864   5864           habitat     positive
## 5865   5865          habitual anticipation
## 5866   5866               hag      disgust
## 5867   5867               hag         fear
## 5868   5868               hag     negative
## 5869   5869           haggard     negative
## 5870   5870           haggard      sadness
## 5871   5871              hail     negative
## 5872   5872              hail     positive
## 5873   5873              hail        trust
## 5874   5874             hairy      disgust
## 5875   5875             hairy     negative
## 5876   5876              hale     positive
## 5877   5877           halfway     negative
## 5878   5878     hallucination         fear
## 5879   5879     hallucination     negative
## 5880   5880            halter        anger
## 5881   5881            halter         fear
## 5882   5882            halter     negative
## 5883   5883            halter      sadness
## 5884   5884           halting         fear
## 5885   5885           halting     negative
## 5886   5886           halting      sadness
## 5887   5887            hamper     negative
## 5888   5888         hamstring        anger
## 5889   5889         hamstring     negative
## 5890   5890         hamstring      sadness
## 5891   5891          handbook        trust
## 5892   5892          handicap     negative
## 5893   5893          handicap      sadness
## 5894   5894             handy     positive
## 5895   5895           hanging        anger
## 5896   5896           hanging      disgust
## 5897   5897           hanging         fear
## 5898   5898           hanging     negative
## 5899   5899           hanging      sadness
## 5900   5900           hangman         fear
## 5901   5901           hangman     negative
## 5902   5902         hankering anticipation
## 5903   5903               hap anticipation
## 5904   5904               hap     surprise
## 5905   5905            happen anticipation
## 5906   5906           happily          joy
## 5907   5907           happily     positive
## 5908   5908         happiness anticipation
## 5909   5909         happiness          joy
## 5910   5910         happiness     positive
## 5911   5911             happy anticipation
## 5912   5912             happy          joy
## 5913   5913             happy     positive
## 5914   5914             happy        trust
## 5915   5915            harass        anger
## 5916   5916            harass      disgust
## 5917   5917            harass     negative
## 5918   5918         harassing        anger
## 5919   5919         harbinger        anger
## 5920   5920         harbinger anticipation
## 5921   5921         harbinger         fear
## 5922   5922         harbinger     negative
## 5923   5923            harbor        trust
## 5924   5924          hardened        anger
## 5925   5925          hardened      disgust
## 5926   5926          hardened         fear
## 5927   5927          hardened     negative
## 5928   5928          hardness     negative
## 5929   5929          hardship     negative
## 5930   5930          hardship      sadness
## 5931   5931             hardy          joy
## 5932   5932             hardy     positive
## 5933   5933             hardy        trust
## 5934   5934            harlot      disgust
## 5935   5935            harlot     negative
## 5936   5936              harm         fear
## 5937   5937              harm     negative
## 5938   5938           harmful        anger
## 5939   5939           harmful      disgust
## 5940   5940           harmful         fear
## 5941   5941           harmful     negative
## 5942   5942           harmful      sadness
## 5943   5943      harmoniously          joy
## 5944   5944      harmoniously     positive
## 5945   5945      harmoniously        trust
## 5946   5946           harmony          joy
## 5947   5947           harmony     positive
## 5948   5948           harmony        trust
## 5949   5949         harrowing         fear
## 5950   5950         harrowing     negative
## 5951   5951             harry        anger
## 5952   5952             harry     negative
## 5953   5953             harry      sadness
## 5954   5954         harshness        anger
## 5955   5955         harshness         fear
## 5956   5956         harshness     negative
## 5957   5957           harvest anticipation
## 5958   5958           harvest          joy
## 5959   5959           harvest     positive
## 5960   5960              hash     negative
## 5961   5961           hashish     negative
## 5962   5962             haste anticipation
## 5963   5963             hasty     negative
## 5964   5964              hate        anger
## 5965   5965              hate      disgust
## 5966   5966              hate         fear
## 5967   5967              hate     negative
## 5968   5968              hate      sadness
## 5969   5969           hateful        anger
## 5970   5970           hateful      disgust
## 5971   5971           hateful         fear
## 5972   5972           hateful     negative
## 5973   5973           hateful      sadness
## 5974   5974            hating        anger
## 5975   5975            hating     negative
## 5976   5976            hatred        anger
## 5977   5977            hatred      disgust
## 5978   5978            hatred         fear
## 5979   5979            hatred     negative
## 5980   5980            hatred      sadness
## 5981   5981           haughty        anger
## 5982   5982           haughty     negative
## 5983   5983             haunt         fear
## 5984   5984             haunt     negative
## 5985   5985           haunted         fear
## 5986   5986           haunted     negative
## 5987   5987           haunted      sadness
## 5988   5988             haven     positive
## 5989   5989             haven        trust
## 5990   5990             havoc        anger
## 5991   5991             havoc         fear
## 5992   5992             havoc     negative
## 5993   5993              hawk         fear
## 5994   5994            hazard         fear
## 5995   5995            hazard     negative
## 5996   5996         hazardous         fear
## 5997   5997         hazardous     negative
## 5998   5998              haze         fear
## 5999   5999              haze     negative
## 6000   6000          headache     negative
## 6001   6001         headlight anticipation
## 6002   6002           headway     positive
## 6003   6003             heady     negative
## 6004   6004              heal          joy
## 6005   6005              heal     positive
## 6006   6006              heal        trust
## 6007   6007           healing anticipation
## 6008   6008           healing          joy
## 6009   6009           healing     positive
## 6010   6010           healing        trust
## 6011   6011         healthful          joy
## 6012   6012         healthful     positive
## 6013   6013           healthy     positive
## 6014   6014           hearing         fear
## 6015   6015           hearing     negative
## 6016   6016           hearsay     negative
## 6017   6017            hearse         fear
## 6018   6018            hearse     negative
## 6019   6019            hearse      sadness
## 6020   6020         heartache     negative
## 6021   6021         heartache      sadness
## 6022   6022         heartburn     negative
## 6023   6023         heartfelt          joy
## 6024   6024         heartfelt     positive
## 6025   6025         heartfelt      sadness
## 6026   6026         heartfelt        trust
## 6027   6027            hearth     positive
## 6028   6028          heartily          joy
## 6029   6029          heartily     positive
## 6030   6030         heartless     negative
## 6031   6031         heartless      sadness
## 6032   6032         heartworm      disgust
## 6033   6033           heathen         fear
## 6034   6034           heathen     negative
## 6035   6035          heavenly anticipation
## 6036   6036          heavenly          joy
## 6037   6037          heavenly     positive
## 6038   6038          heavenly        trust
## 6039   6039           heavens          joy
## 6040   6040           heavens     positive
## 6041   6041           heavens        trust
## 6042   6042           heavily     negative
## 6043   6043          hedonism          joy
## 6044   6044          hedonism     negative
## 6045   6045          hedonism     positive
## 6046   6046              heel     negative
## 6047   6047              heft anticipation
## 6048   6048              heft         fear
## 6049   6049              heft     positive
## 6050   6050          heighten         fear
## 6051   6051          heighten     negative
## 6052   6052           heinous     negative
## 6053   6053              hell        anger
## 6054   6054              hell      disgust
## 6055   6055              hell         fear
## 6056   6056              hell     negative
## 6057   6057              hell      sadness
## 6058   6058           hellish        anger
## 6059   6059           hellish      disgust
## 6060   6060           hellish         fear
## 6061   6061           hellish     negative
## 6062   6062           hellish      sadness
## 6063   6063            helmet         fear
## 6064   6064            helmet     positive
## 6065   6065            helper     positive
## 6066   6066            helper        trust
## 6067   6067           helpful          joy
## 6068   6068           helpful     positive
## 6069   6069           helpful        trust
## 6070   6070          helpless         fear
## 6071   6071          helpless     negative
## 6072   6072          helpless      sadness
## 6073   6073      helplessness         fear
## 6074   6074      helplessness     negative
## 6075   6075      helplessness      sadness
## 6076   6076        hemorrhage      disgust
## 6077   6077        hemorrhage         fear
## 6078   6078        hemorrhage     negative
## 6079   6079        hemorrhage      sadness
## 6080   6080       hemorrhoids     negative
## 6081   6081            herbal     positive
## 6082   6082            heresy     negative
## 6083   6083           heretic      disgust
## 6084   6084           heretic     negative
## 6085   6085          heritage        trust
## 6086   6086     hermaphrodite     negative
## 6087   6087     hermaphrodite     surprise
## 6088   6088            hermit      sadness
## 6089   6089            hermit        trust
## 6090   6090              hero anticipation
## 6091   6091              hero          joy
## 6092   6092              hero     positive
## 6093   6093              hero     surprise
## 6094   6094              hero        trust
## 6095   6095            heroic          joy
## 6096   6096            heroic     positive
## 6097   6097            heroic     surprise
## 6098   6098            heroic        trust
## 6099   6099           heroics     positive
## 6100   6100            heroin     negative
## 6101   6101           heroine     positive
## 6102   6102           heroine        trust
## 6103   6103           heroism anticipation
## 6104   6104           heroism          joy
## 6105   6105           heroism     positive
## 6106   6106           heroism     surprise
## 6107   6107           heroism        trust
## 6108   6108            herpes      disgust
## 6109   6109            herpes     negative
## 6110   6110       herpesvirus      disgust
## 6111   6111       herpesvirus     negative
## 6112   6112        hesitation         fear
## 6113   6113        hesitation     negative
## 6114   6114            heyday anticipation
## 6115   6115            heyday          joy
## 6116   6116            heyday     positive
## 6117   6117            heyday        trust
## 6118   6118            hidden     negative
## 6119   6119              hide         fear
## 6120   6120           hideous      disgust
## 6121   6121           hideous         fear
## 6122   6122           hideous     negative
## 6123   6123           hideous      sadness
## 6124   6124            hiding         fear
## 6125   6125           highest anticipation
## 6126   6126           highest         fear
## 6127   6127           highest          joy
## 6128   6128           highest     negative
## 6129   6129           highest     positive
## 6130   6130           highest     surprise
## 6131   6131         hilarious          joy
## 6132   6132         hilarious     positive
## 6133   6133         hilarious     surprise
## 6134   6134          hilarity          joy
## 6135   6135          hilarity     positive
## 6136   6136         hindering     negative
## 6137   6137         hindering      sadness
## 6138   6138         hindrance     negative
## 6139   6139            hippie     negative
## 6140   6140              hire anticipation
## 6141   6141              hire          joy
## 6142   6142              hire     positive
## 6143   6143              hire        trust
## 6144   6144              hiss        anger
## 6145   6145              hiss         fear
## 6146   6146              hiss     negative
## 6147   6147           hissing     negative
## 6148   6148               hit        anger
## 6149   6149               hit     negative
## 6150   6150          hitherto     negative
## 6151   6151              hive     negative
## 6152   6152            hoarse     negative
## 6153   6153             hoary     negative
## 6154   6154             hoary      sadness
## 6155   6155              hoax        anger
## 6156   6156              hoax      disgust
## 6157   6157              hoax     negative
## 6158   6158              hoax      sadness
## 6159   6159              hoax     surprise
## 6160   6160             hobby          joy
## 6161   6161             hobby     positive
## 6162   6162              hobo     negative
## 6163   6163              hobo      sadness
## 6164   6164               hog      disgust
## 6165   6165               hog     negative
## 6166   6166           holiday anticipation
## 6167   6167           holiday          joy
## 6168   6168           holiday     positive
## 6169   6169          holiness anticipation
## 6170   6170          holiness         fear
## 6171   6171          holiness          joy
## 6172   6172          holiness     positive
## 6173   6173          holiness     surprise
## 6174   6174          holiness        trust
## 6175   6175            hollow     negative
## 6176   6176            hollow      sadness
## 6177   6177         holocaust        anger
## 6178   6178         holocaust      disgust
## 6179   6179         holocaust         fear
## 6180   6180         holocaust     negative
## 6181   6181         holocaust      sadness
## 6182   6182              holy     positive
## 6183   6183            homage     positive
## 6184   6184          homeless        anger
## 6185   6185          homeless anticipation
## 6186   6186          homeless      disgust
## 6187   6187          homeless         fear
## 6188   6188          homeless     negative
## 6189   6189          homeless      sadness
## 6190   6190          homesick     negative
## 6191   6191          homesick      sadness
## 6192   6192          homework         fear
## 6193   6193         homicidal        anger
## 6194   6194         homicidal         fear
## 6195   6195         homicidal     negative
## 6196   6196          homicide        anger
## 6197   6197          homicide      disgust
## 6198   6198          homicide         fear
## 6199   6199          homicide     negative
## 6200   6200          homicide      sadness
## 6201   6201          homology     positive
## 6202   6202            honest        anger
## 6203   6203            honest      disgust
## 6204   6204            honest         fear
## 6205   6205            honest          joy
## 6206   6206            honest     positive
## 6207   6207            honest      sadness
## 6208   6208            honest        trust
## 6209   6209           honesty     positive
## 6210   6210           honesty        trust
## 6211   6211             honey     positive
## 6212   6212         honeymoon anticipation
## 6213   6213         honeymoon          joy
## 6214   6214         honeymoon     positive
## 6215   6215         honeymoon     surprise
## 6216   6216         honeymoon        trust
## 6217   6217             honor     positive
## 6218   6218             honor        trust
## 6219   6219         honorable     positive
## 6220   6220         honorable        trust
## 6221   6221              hood        anger
## 6222   6222              hood      disgust
## 6223   6223              hood         fear
## 6224   6224              hood     negative
## 6225   6225            hooded         fear
## 6226   6226            hooked     negative
## 6227   6227              hoot        anger
## 6228   6228              hoot      disgust
## 6229   6229              hoot     negative
## 6230   6230              hope anticipation
## 6231   6231              hope          joy
## 6232   6232              hope     positive
## 6233   6233              hope     surprise
## 6234   6234              hope        trust
## 6235   6235           hopeful anticipation
## 6236   6236           hopeful          joy
## 6237   6237           hopeful     positive
## 6238   6238           hopeful     surprise
## 6239   6239           hopeful        trust
## 6240   6240          hopeless         fear
## 6241   6241          hopeless     negative
## 6242   6242          hopeless      sadness
## 6243   6243      hopelessness        anger
## 6244   6244      hopelessness      disgust
## 6245   6245      hopelessness         fear
## 6246   6246      hopelessness     negative
## 6247   6247      hopelessness      sadness
## 6248   6248             horde     negative
## 6249   6249             horde     surprise
## 6250   6250           horizon anticipation
## 6251   6251           horizon     positive
## 6252   6252         horoscope anticipation
## 6253   6253          horrible        anger
## 6254   6254          horrible      disgust
## 6255   6255          horrible         fear
## 6256   6256          horrible     negative
## 6257   6257          horribly     negative
## 6258   6258            horrid        anger
## 6259   6259            horrid      disgust
## 6260   6260            horrid         fear
## 6261   6261            horrid     negative
## 6262   6262            horrid      sadness
## 6263   6263          horrific        anger
## 6264   6264          horrific      disgust
## 6265   6265          horrific         fear
## 6266   6266          horrific     negative
## 6267   6267          horrific      sadness
## 6268   6268         horrified         fear
## 6269   6269         horrified     negative
## 6270   6270        horrifying      disgust
## 6271   6271        horrifying         fear
## 6272   6272        horrifying     negative
## 6273   6273        horrifying      sadness
## 6274   6274            horror        anger
## 6275   6275            horror      disgust
## 6276   6276            horror         fear
## 6277   6277            horror     negative
## 6278   6278            horror      sadness
## 6279   6279            horror     surprise
## 6280   6280           horrors         fear
## 6281   6281           horrors     negative
## 6282   6282           horrors      sadness
## 6283   6283             horse        trust
## 6284   6284           hospice      sadness
## 6285   6285          hospital         fear
## 6286   6286          hospital      sadness
## 6287   6287          hospital        trust
## 6288   6288       hospitality     positive
## 6289   6289           hostage        anger
## 6290   6290           hostage         fear
## 6291   6291           hostage     negative
## 6292   6292           hostile        anger
## 6293   6293           hostile      disgust
## 6294   6294           hostile         fear
## 6295   6295           hostile     negative
## 6296   6296       hostilities        anger
## 6297   6297       hostilities         fear
## 6298   6298       hostilities     negative
## 6299   6299         hostility        anger
## 6300   6300         hostility      disgust
## 6301   6301         hostility     negative
## 6302   6302               hot        anger
## 6303   6303         household     positive
## 6304   6304      housekeeping     positive
## 6305   6305              howl        anger
## 6306   6306              howl      disgust
## 6307   6307              howl         fear
## 6308   6308              howl     negative
## 6309   6309              howl      sadness
## 6310   6310              howl     surprise
## 6311   6311              huff        anger
## 6312   6312              huff      disgust
## 6313   6313              huff     negative
## 6314   6314               hug          joy
## 6315   6315               hug     positive
## 6316   6316               hug        trust
## 6317   6317              hulk      disgust
## 6318   6318            humane     positive
## 6319   6319      humanitarian anticipation
## 6320   6320      humanitarian          joy
## 6321   6321      humanitarian     positive
## 6322   6322      humanitarian     surprise
## 6323   6323      humanitarian        trust
## 6324   6324          humanity          joy
## 6325   6325          humanity     positive
## 6326   6326          humanity        trust
## 6327   6327            humble      disgust
## 6328   6328            humble     negative
## 6329   6329            humble     positive
## 6330   6330            humble      sadness
## 6331   6331           humbled     positive
## 6332   6332           humbled      sadness
## 6333   6333            humbly     positive
## 6334   6334            humbug        anger
## 6335   6335            humbug      disgust
## 6336   6336            humbug     negative
## 6337   6337            humbug      sadness
## 6338   6338         humiliate        anger
## 6339   6339         humiliate     negative
## 6340   6340         humiliate      sadness
## 6341   6341       humiliating      disgust
## 6342   6342       humiliating     negative
## 6343   6343       humiliation      disgust
## 6344   6344       humiliation     negative
## 6345   6345       humiliation      sadness
## 6346   6346          humility     positive
## 6347   6347          humility        trust
## 6348   6348          humorist     positive
## 6349   6349          humorous          joy
## 6350   6350          humorous     positive
## 6351   6351             hunch     negative
## 6352   6352            hungry anticipation
## 6353   6353            hungry     negative
## 6354   6354            hunter anticipation
## 6355   6355            hunter         fear
## 6356   6356            hunter     negative
## 6357   6357            hunter      sadness
## 6358   6358           hunting        anger
## 6359   6359           hunting anticipation
## 6360   6360           hunting         fear
## 6361   6361           hunting     negative
## 6362   6362            hurrah          joy
## 6363   6363            hurrah     positive
## 6364   6364         hurricane         fear
## 6365   6365         hurricane     negative
## 6366   6366           hurried anticipation
## 6367   6367           hurried     negative
## 6368   6368             hurry anticipation
## 6369   6369              hurt        anger
## 6370   6370              hurt         fear
## 6371   6371              hurt     negative
## 6372   6372              hurt      sadness
## 6373   6373           hurtful        anger
## 6374   6374           hurtful      disgust
## 6375   6375           hurtful         fear
## 6376   6376           hurtful     negative
## 6377   6377           hurtful      sadness
## 6378   6378           hurting        anger
## 6379   6379           hurting         fear
## 6380   6380           hurting     negative
## 6381   6381           hurting      sadness
## 6382   6382         husbandry     positive
## 6383   6383         husbandry        trust
## 6384   6384              hush     positive
## 6385   6385           hustler     negative
## 6386   6386               hut     positive
## 6387   6387               hut      sadness
## 6388   6388             hydra         fear
## 6389   6389             hydra     negative
## 6390   6390     hydrocephalus      disgust
## 6391   6391     hydrocephalus         fear
## 6392   6392     hydrocephalus     negative
## 6393   6393     hydrocephalus      sadness
## 6394   6394          hygienic     positive
## 6395   6395              hymn anticipation
## 6396   6396              hymn          joy
## 6397   6397              hymn     positive
## 6398   6398              hymn      sadness
## 6399   6399              hymn        trust
## 6400   6400              hype anticipation
## 6401   6401              hype     negative
## 6402   6402         hyperbole     negative
## 6403   6403       hypertrophy      disgust
## 6404   6404       hypertrophy         fear
## 6405   6405       hypertrophy     surprise
## 6406   6406         hypocrisy     negative
## 6407   6407         hypocrite      disgust
## 6408   6408         hypocrite     negative
## 6409   6409      hypocritical      disgust
## 6410   6410      hypocritical     negative
## 6411   6411        hypothesis anticipation
## 6412   6412        hypothesis     surprise
## 6413   6413          hysteria         fear
## 6414   6414          hysteria     negative
## 6415   6415        hysterical        anger
## 6416   6416        hysterical         fear
## 6417   6417        hysterical     negative
## 6418   6418          idealism     positive
## 6419   6419            idiocy        anger
## 6420   6420            idiocy      disgust
## 6421   6421            idiocy     negative
## 6422   6422            idiocy      sadness
## 6423   6423             idiot      disgust
## 6424   6424             idiot     negative
## 6425   6425           idiotic        anger
## 6426   6426           idiotic      disgust
## 6427   6427           idiotic     negative
## 6428   6428             idler     negative
## 6429   6429              idol     positive
## 6430   6430          idolatry      disgust
## 6431   6431          idolatry         fear
## 6432   6432          idolatry     negative
## 6433   6433         ignorance     negative
## 6434   6434          ignorant      disgust
## 6435   6435          ignorant     negative
## 6436   6436            ignore     negative
## 6437   6437               ill        anger
## 6438   6438               ill      disgust
## 6439   6439               ill         fear
## 6440   6440               ill     negative
## 6441   6441               ill      sadness
## 6442   6442           illegal        anger
## 6443   6443           illegal      disgust
## 6444   6444           illegal         fear
## 6445   6445           illegal     negative
## 6446   6446           illegal      sadness
## 6447   6447        illegality        anger
## 6448   6448        illegality      disgust
## 6449   6449        illegality         fear
## 6450   6450        illegality     negative
## 6451   6451         illegible     negative
## 6452   6452      illegitimate        anger
## 6453   6453      illegitimate      disgust
## 6454   6454      illegitimate         fear
## 6455   6455      illegitimate     negative
## 6456   6456      illegitimate      sadness
## 6457   6457      illegitimate     surprise
## 6458   6458           illicit        anger
## 6459   6459           illicit      disgust
## 6460   6460           illicit         fear
## 6461   6461           illicit     negative
## 6462   6462        illiterate      disgust
## 6463   6463        illiterate     negative
## 6464   6464           illness         fear
## 6465   6465           illness     negative
## 6466   6466           illness      sadness
## 6467   6467         illogical     negative
## 6468   6468        illuminate anticipation
## 6469   6469        illuminate          joy
## 6470   6470        illuminate     positive
## 6471   6471        illuminate     surprise
## 6472   6472      illumination          joy
## 6473   6473      illumination     positive
## 6474   6474      illumination     surprise
## 6475   6475      illumination        trust
## 6476   6476          illusion     negative
## 6477   6477          illusion     surprise
## 6478   6478        illustrate     positive
## 6479   6479       illustrious     positive
## 6480   6480       imaginative     positive
## 6481   6481          imitated     negative
## 6482   6482         imitation     negative
## 6483   6483        immaculate          joy
## 6484   6484        immaculate     positive
## 6485   6485        immaculate        trust
## 6486   6486          immature anticipation
## 6487   6487          immature     negative
## 6488   6488        immaturity        anger
## 6489   6489        immaturity anticipation
## 6490   6490        immaturity     negative
## 6491   6491         immediacy     surprise
## 6492   6492       immediately anticipation
## 6493   6493       immediately     negative
## 6494   6494       immediately     positive
## 6495   6495           immense     positive
## 6496   6496           immerse anticipation
## 6497   6497           immerse         fear
## 6498   6498           immerse          joy
## 6499   6499           immerse     positive
## 6500   6500           immerse     surprise
## 6501   6501           immerse        trust
## 6502   6502         immigrant         fear
## 6503   6503          imminent anticipation
## 6504   6504          imminent         fear
## 6505   6505           immoral        anger
## 6506   6506           immoral      disgust
## 6507   6507           immoral         fear
## 6508   6508           immoral     negative
## 6509   6509           immoral      sadness
## 6510   6510        immorality        anger
## 6511   6511        immorality      disgust
## 6512   6512        immorality     negative
## 6513   6513          immortal     positive
## 6514   6514       immortality anticipation
## 6515   6515         immovable     negative
## 6516   6516         immovable     positive
## 6517   6517         immovable        trust
## 6518   6518      immunization        trust
## 6519   6519            impair     negative
## 6520   6520        impairment     negative
## 6521   6521            impart     positive
## 6522   6522            impart        trust
## 6523   6523         impartial     positive
## 6524   6524         impartial        trust
## 6525   6525      impartiality     positive
## 6526   6526      impartiality        trust
## 6527   6527        impassable     negative
## 6528   6528        impatience     negative
## 6529   6529         impatient anticipation
## 6530   6530         impatient     negative
## 6531   6531           impeach      disgust
## 6532   6532           impeach         fear
## 6533   6533           impeach     negative
## 6534   6534       impeachment     negative
## 6535   6535        impeccable     positive
## 6536   6536        impeccable        trust
## 6537   6537            impede     negative
## 6538   6538         impending anticipation
## 6539   6539         impending         fear
## 6540   6540      impenetrable        trust
## 6541   6541      imperfection     negative
## 6542   6542       imperfectly     negative
## 6543   6543       impermeable        anger
## 6544   6544       impermeable         fear
## 6545   6545       impersonate     negative
## 6546   6546     impersonation     negative
## 6547   6547        impervious     positive
## 6548   6548        implacable     negative
## 6549   6549         implicate        anger
## 6550   6550         implicate     negative
## 6551   6551          impolite      disgust
## 6552   6552          impolite     negative
## 6553   6553        importance anticipation
## 6554   6554        importance     positive
## 6555   6555         important     positive
## 6556   6556         important        trust
## 6557   6557        imposition     negative
## 6558   6558        impossible     negative
## 6559   6559        impossible      sadness
## 6560   6560         impotence        anger
## 6561   6561         impotence         fear
## 6562   6562         impotence     negative
## 6563   6563         impotence      sadness
## 6564   6564          impotent     negative
## 6565   6565           impound     negative
## 6566   6566     impracticable     negative
## 6567   6567           impress     positive
## 6568   6568        impression     positive
## 6569   6569    impressionable        trust
## 6570   6570          imprison     negative
## 6571   6571        imprisoned        anger
## 6572   6572        imprisoned      disgust
## 6573   6573        imprisoned         fear
## 6574   6574        imprisoned     negative
## 6575   6575        imprisoned      sadness
## 6576   6576      imprisonment        anger
## 6577   6577      imprisonment      disgust
## 6578   6578      imprisonment         fear
## 6579   6579      imprisonment     negative
## 6580   6580      imprisonment      sadness
## 6581   6581       impropriety     negative
## 6582   6582           improve anticipation
## 6583   6583           improve          joy
## 6584   6584           improve     positive
## 6585   6585           improve        trust
## 6586   6586          improved     positive
## 6587   6587       improvement          joy
## 6588   6588       improvement     positive
## 6589   6589       improvement        trust
## 6590   6590         improving     positive
## 6591   6591     improvisation     surprise
## 6592   6592         improvise anticipation
## 6593   6593         improvise     positive
## 6594   6594         improvise     surprise
## 6595   6595         imprudent     negative
## 6596   6596         imprudent      sadness
## 6597   6597            impure      disgust
## 6598   6598            impure     negative
## 6599   6599          impurity      disgust
## 6600   6600          impurity     negative
## 6601   6601        imputation     negative
## 6602   6602         inability     negative
## 6603   6603         inability      sadness
## 6604   6604      inaccessible     negative
## 6605   6605        inaccurate     negative
## 6606   6606          inaction     negative
## 6607   6607        inactivity     negative
## 6608   6608        inadequacy     negative
## 6609   6609        inadequate     negative
## 6610   6610        inadequate      sadness
## 6611   6611      inadmissible        anger
## 6612   6612      inadmissible      disgust
## 6613   6613      inadmissible     negative
## 6614   6614       inalienable     positive
## 6615   6615             inane     negative
## 6616   6616      inapplicable     negative
## 6617   6617     inappropriate        anger
## 6618   6618     inappropriate      disgust
## 6619   6619     inappropriate     negative
## 6620   6620     inappropriate      sadness
## 6621   6621       inattention        anger
## 6622   6622       inattention     negative
## 6623   6623         inaudible     negative
## 6624   6624         inaugural anticipation
## 6625   6625      inauguration anticipation
## 6626   6626      inauguration          joy
## 6627   6627      inauguration     positive
## 6628   6628      inauguration        trust
## 6629   6629      incalculable     negative
## 6630   6630        incapacity     negative
## 6631   6631     incarceration        anger
## 6632   6632     incarceration      disgust
## 6633   6633     incarceration         fear
## 6634   6634     incarceration     negative
## 6635   6635     incarceration      sadness
## 6636   6636            incase        anger
## 6637   6637            incase      disgust
## 6638   6638            incase         fear
## 6639   6639            incase     negative
## 6640   6640            incase      sadness
## 6641   6641        incendiary        anger
## 6642   6642        incendiary         fear
## 6643   6643        incendiary     negative
## 6644   6644        incendiary     surprise
## 6645   6645           incense        anger
## 6646   6646           incense     negative
## 6647   6647         incessant     negative
## 6648   6648            incest        anger
## 6649   6649            incest      disgust
## 6650   6650            incest         fear
## 6651   6651            incest     negative
## 6652   6652            incest      sadness
## 6653   6653        incestuous      disgust
## 6654   6654        incestuous     negative
## 6655   6655          incident     surprise
## 6656   6656      incineration     negative
## 6657   6657          incisive     positive
## 6658   6658            incite        anger
## 6659   6659            incite anticipation
## 6660   6660            incite         fear
## 6661   6661            incite     negative
## 6662   6662         inclement     negative
## 6663   6663           incline        trust
## 6664   6664           include     positive
## 6665   6665          included     positive
## 6666   6666         including     positive
## 6667   6667         inclusion        trust
## 6668   6668         inclusive     positive
## 6669   6669        incoherent     negative
## 6670   6670            income anticipation
## 6671   6671            income          joy
## 6672   6672            income     negative
## 6673   6673            income     positive
## 6674   6674            income      sadness
## 6675   6675            income        trust
## 6676   6676      incompatible        anger
## 6677   6677      incompatible      disgust
## 6678   6678      incompatible     negative
## 6679   6679      incompatible      sadness
## 6680   6680      incompetence     negative
## 6681   6681       incompetent        anger
## 6682   6682       incompetent     negative
## 6683   6683       incompetent      sadness
## 6684   6684    incompleteness     negative
## 6685   6685  incomprehensible     negative
## 6686   6686       incongruous        anger
## 6687   6687       incongruous     negative
## 6688   6688   inconsequential     negative
## 6689   6689   inconsequential      sadness
## 6690   6690     inconsiderate        anger
## 6691   6691     inconsiderate      disgust
## 6692   6692     inconsiderate     negative
## 6693   6693     inconsiderate      sadness
## 6694   6694     inconsistency     negative
## 6695   6695      incontinence     surprise
## 6696   6696      inconvenient        anger
## 6697   6697      inconvenient      disgust
## 6698   6698      inconvenient     negative
## 6699   6699      inconvenient      sadness
## 6700   6700         incorrect     negative
## 6701   6701          increase     positive
## 6702   6702       incredulous        anger
## 6703   6703       incredulous      disgust
## 6704   6704       incredulous     negative
## 6705   6705     incrimination         fear
## 6706   6706     incrimination     negative
## 6707   6707     incrimination      sadness
## 6708   6708           incubus      disgust
## 6709   6709           incubus         fear
## 6710   6710           incubus     negative
## 6711   6711             incur     negative
## 6712   6712         incurable        anger
## 6713   6713         incurable      disgust
## 6714   6714         incurable         fear
## 6715   6715         incurable     negative
## 6716   6716         incurable      sadness
## 6717   6717         incursion         fear
## 6718   6718         incursion     negative
## 6719   6719         indecency        anger
## 6720   6720         indecency      disgust
## 6721   6721          indecent      disgust
## 6722   6722          indecent     negative
## 6723   6723        indecision     negative
## 6724   6724        indecisive     negative
## 6725   6725      indefensible         fear
## 6726   6726      indefensible     negative
## 6727   6727         indelible     positive
## 6728   6728         indelible        trust
## 6729   6729         indemnify     negative
## 6730   6730         indemnity     positive
## 6731   6731         indemnity        trust
## 6732   6732            indent        trust
## 6733   6733         indenture        anger
## 6734   6734         indenture     negative
## 6735   6735      independence anticipation
## 6736   6736      independence          joy
## 6737   6737      independence     positive
## 6738   6738      independence     surprise
## 6739   6739      independence        trust
## 6740   6740    indestructible     positive
## 6741   6741    indestructible        trust
## 6742   6742     indeterminate     negative
## 6743   6743            indict        anger
## 6744   6744            indict         fear
## 6745   6745            indict     negative
## 6746   6746        indictment         fear
## 6747   6747        indictment     negative
## 6748   6748      indifference        anger
## 6749   6749      indifference      disgust
## 6750   6750      indifference         fear
## 6751   6751      indifference     negative
## 6752   6752      indifference      sadness
## 6753   6753          indigent     negative
## 6754   6754          indigent      sadness
## 6755   6755         indignant        anger
## 6756   6756         indignant     negative
## 6757   6757       indignation        anger
## 6758   6758       indignation      disgust
## 6759   6759       indignation     negative
## 6760   6760        indistinct     negative
## 6761   6761     individuality     positive
## 6762   6762       indivisible        trust
## 6763   6763    indoctrination        anger
## 6764   6764    indoctrination         fear
## 6765   6765    indoctrination     negative
## 6766   6766          indolent     negative
## 6767   6767       indomitable         fear
## 6768   6768       indomitable     positive
## 6769   6769         ineffable     positive
## 6770   6770       ineffective     negative
## 6771   6771       ineffectual      disgust
## 6772   6772       ineffectual     negative
## 6773   6773      inefficiency      disgust
## 6774   6774      inefficiency     negative
## 6775   6775      inefficiency      sadness
## 6776   6776       inefficient     negative
## 6777   6777       inefficient      sadness
## 6778   6778             inept        anger
## 6779   6779             inept      disgust
## 6780   6780             inept     negative
## 6781   6781        ineptitude      disgust
## 6782   6782        ineptitude         fear
## 6783   6783        ineptitude     negative
## 6784   6784        ineptitude      sadness
## 6785   6785        inequality        anger
## 6786   6786        inequality         fear
## 6787   6787        inequality     negative
## 6788   6788        inequality      sadness
## 6789   6789       inequitable     negative
## 6790   6790             inert     negative
## 6791   6791       inexcusable        anger
## 6792   6792       inexcusable      disgust
## 6793   6793       inexcusable     negative
## 6794   6794       inexcusable      sadness
## 6795   6795       inexpensive     positive
## 6796   6796      inexperience     negative
## 6797   6797     inexperienced     negative
## 6798   6798      inexplicable     negative
## 6799   6799      inexplicable     surprise
## 6800   6800     infallibility        trust
## 6801   6801        infallible     positive
## 6802   6802          infamous        anger
## 6803   6803          infamous      disgust
## 6804   6804          infamous         fear
## 6805   6805          infamous     negative
## 6806   6806            infamy     negative
## 6807   6807            infamy      sadness
## 6808   6808            infant anticipation
## 6809   6809            infant         fear
## 6810   6810            infant          joy
## 6811   6811            infant     positive
## 6812   6812            infant     surprise
## 6813   6813       infanticide        anger
## 6814   6814       infanticide anticipation
## 6815   6815       infanticide      disgust
## 6816   6816       infanticide         fear
## 6817   6817       infanticide     negative
## 6818   6818       infanticide      sadness
## 6819   6819         infantile        anger
## 6820   6820         infantile      disgust
## 6821   6821         infantile     negative
## 6822   6822           infarct         fear
## 6823   6823           infarct     negative
## 6824   6824           infarct     surprise
## 6825   6825            infect      disgust
## 6826   6826            infect     negative
## 6827   6827         infection         fear
## 6828   6828         infection     negative
## 6829   6829        infectious      disgust
## 6830   6830        infectious         fear
## 6831   6831        infectious     negative
## 6832   6832        infectious      sadness
## 6833   6833          inferior     negative
## 6834   6834          inferior      sadness
## 6835   6835       inferiority     negative
## 6836   6836           inferno        anger
## 6837   6837           inferno         fear
## 6838   6838           inferno     negative
## 6839   6839       infertility     negative
## 6840   6840       infertility      sadness
## 6841   6841       infestation      disgust
## 6842   6842       infestation         fear
## 6843   6843       infestation     negative
## 6844   6844           infidel        anger
## 6845   6845           infidel      disgust
## 6846   6846           infidel         fear
## 6847   6847           infidel     negative
## 6848   6848        infidelity        anger
## 6849   6849        infidelity      disgust
## 6850   6850        infidelity         fear
## 6851   6851        infidelity     negative
## 6852   6852        infidelity      sadness
## 6853   6853      infiltration     negative
## 6854   6854      infiltration     positive
## 6855   6855          infinite     positive
## 6856   6856          infinity anticipation
## 6857   6857          infinity          joy
## 6858   6858          infinity     positive
## 6859   6859          infinity        trust
## 6860   6860            infirm     negative
## 6861   6861         infirmity         fear
## 6862   6862         infirmity     negative
## 6863   6863      inflammation     negative
## 6864   6864          inflated     negative
## 6865   6865         inflation         fear
## 6866   6866         inflation     negative
## 6867   6867           inflict        anger
## 6868   6868           inflict         fear
## 6869   6869           inflict     negative
## 6870   6870           inflict      sadness
## 6871   6871        infliction         fear
## 6872   6872        infliction     negative
## 6873   6873        infliction      sadness
## 6874   6874         influence     negative
## 6875   6875         influence     positive
## 6876   6876       influential     positive
## 6877   6877       influential        trust
## 6878   6878         influenza     negative
## 6879   6879            inform        trust
## 6880   6880       information     positive
## 6881   6881          informer     negative
## 6882   6882        infraction        anger
## 6883   6883        infraction     negative
## 6884   6884        infrequent     surprise
## 6885   6885      infrequently     negative
## 6886   6886      infringement     negative
## 6887   6887         ingenious     positive
## 6888   6888       inheritance anticipation
## 6889   6889       inheritance          joy
## 6890   6890       inheritance     positive
## 6891   6891       inheritance     surprise
## 6892   6892       inheritance        trust
## 6893   6893           inhibit        anger
## 6894   6894           inhibit      disgust
## 6895   6895           inhibit     negative
## 6896   6896           inhibit      sadness
## 6897   6897      inhospitable     negative
## 6898   6898      inhospitable      sadness
## 6899   6899           inhuman        anger
## 6900   6900           inhuman      disgust
## 6901   6901           inhuman         fear
## 6902   6902           inhuman     negative
## 6903   6903           inhuman      sadness
## 6904   6904        inhumanity     negative
## 6905   6905        inhumanity      sadness
## 6906   6906          inimical        anger
## 6907   6907          inimical     negative
## 6908   6908          inimical      sadness
## 6909   6909        inimitable     positive
## 6910   6910        inimitable        trust
## 6911   6911          iniquity      disgust
## 6912   6912          iniquity     negative
## 6913   6913         injection         fear
## 6914   6914        injunction     negative
## 6915   6915            injure        anger
## 6916   6916            injure         fear
## 6917   6917            injure     negative
## 6918   6918            injure      sadness
## 6919   6919           injured         fear
## 6920   6920           injured     negative
## 6921   6921           injured      sadness
## 6922   6922         injurious        anger
## 6923   6923         injurious         fear
## 6924   6924         injurious     negative
## 6925   6925         injurious      sadness
## 6926   6926            injury        anger
## 6927   6927            injury         fear
## 6928   6928            injury     negative
## 6929   6929            injury      sadness
## 6930   6930         injustice        anger
## 6931   6931         injustice     negative
## 6932   6932            inmate      disgust
## 6933   6933            inmate         fear
## 6934   6934            inmate     negative
## 6935   6935         innocence     positive
## 6936   6936          innocent     positive
## 6937   6937          innocent        trust
## 6938   6938        innocently     positive
## 6939   6939         innocuous     positive
## 6940   6940          innovate     positive
## 6941   6941        innovation     positive
## 6942   6942       inoculation anticipation
## 6943   6943       inoculation        trust
## 6944   6944       inoperative        anger
## 6945   6945       inoperative     negative
## 6946   6946          inquirer     positive
## 6947   6947           inquiry anticipation
## 6948   6948           inquiry     positive
## 6949   6949       inquisitive     positive
## 6950   6950            insane        anger
## 6951   6951            insane         fear
## 6952   6952            insane     negative
## 6953   6953          insanity        anger
## 6954   6954          insanity      disgust
## 6955   6955          insanity         fear
## 6956   6956          insanity     negative
## 6957   6957          insanity      sadness
## 6958   6958          insecure        anger
## 6959   6959          insecure         fear
## 6960   6960          insecure     negative
## 6961   6961          insecure      sadness
## 6962   6962        insecurity         fear
## 6963   6963        insecurity     negative
## 6964   6964       inseparable          joy
## 6965   6965       inseparable     positive
## 6966   6966       inseparable        trust
## 6967   6967         insidious        anger
## 6968   6968         insidious      disgust
## 6969   6969         insidious         fear
## 6970   6970         insidious     negative
## 6971   6971          insignia     positive
## 6972   6972    insignificance     negative
## 6973   6973     insignificant        anger
## 6974   6974     insignificant     negative
## 6975   6975     insignificant      sadness
## 6976   6976           insipid     negative
## 6977   6977          insolent     negative
## 6978   6978        insolvency         fear
## 6979   6979        insolvency     negative
## 6980   6980        insolvency      sadness
## 6981   6981        insolvency     surprise
## 6982   6982         insolvent         fear
## 6983   6983         insolvent     negative
## 6984   6984         insolvent      sadness
## 6985   6985         insolvent        trust
## 6986   6986         inspector     positive
## 6987   6987       inspiration anticipation
## 6988   6988       inspiration          joy
## 6989   6989       inspiration     positive
## 6990   6990           inspire anticipation
## 6991   6991           inspire          joy
## 6992   6992           inspire     positive
## 6993   6993           inspire        trust
## 6994   6994          inspired          joy
## 6995   6995          inspired     positive
## 6996   6996          inspired     surprise
## 6997   6997          inspired        trust
## 6998   6998       instability      disgust
## 6999   6999       instability         fear
## 7000   7000       instability     negative
## 7001   7001           install anticipation
## 7002   7002         instigate     negative
## 7003   7003       instigation     negative
## 7004   7004       instinctive        anger
## 7005   7005       instinctive      disgust
## 7006   7006       instinctive         fear
## 7007   7007       instinctive     positive
## 7008   7008         institute        trust
## 7009   7009          instruct     positive
## 7010   7010          instruct        trust
## 7011   7011       instruction     positive
## 7012   7012       instruction        trust
## 7013   7013      instructions anticipation
## 7014   7014      instructions        trust
## 7015   7015        instructor anticipation
## 7016   7016        instructor     positive
## 7017   7017        instructor        trust
## 7018   7018      instrumental     positive
## 7019   7019     insufficiency        anger
## 7020   7020     insufficiency     negative
## 7021   7021      insufficient     negative
## 7022   7022    insufficiently     negative
## 7023   7023        insulation        trust
## 7024   7024            insult        anger
## 7025   7025            insult      disgust
## 7026   7026            insult     negative
## 7027   7027            insult      sadness
## 7028   7028            insult     surprise
## 7029   7029         insulting        anger
## 7030   7030         insulting      disgust
## 7031   7031         insulting         fear
## 7032   7032         insulting     negative
## 7033   7033         insulting      sadness
## 7034   7034            insure     positive
## 7035   7035            insure        trust
## 7036   7036         insurgent     negative
## 7037   7037    insurmountable         fear
## 7038   7038    insurmountable     negative
## 7039   7039    insurmountable      sadness
## 7040   7040      insurrection        anger
## 7041   7041      insurrection     negative
## 7042   7042            intact     positive
## 7043   7043            intact        trust
## 7044   7044         integrity     positive
## 7045   7045         integrity        trust
## 7046   7046         intellect     positive
## 7047   7047      intellectual     positive
## 7048   7048      intelligence         fear
## 7049   7049      intelligence          joy
## 7050   7050      intelligence     positive
## 7051   7051      intelligence        trust
## 7052   7052       intelligent     positive
## 7053   7053       intelligent        trust
## 7054   7054            intend        trust
## 7055   7055          intended anticipation
## 7056   7056          intended     positive
## 7057   7057           intense        anger
## 7058   7058           intense      disgust
## 7059   7059           intense         fear
## 7060   7060           intense          joy
## 7061   7061           intense     negative
## 7062   7062           intense     positive
## 7063   7063           intense     surprise
## 7064   7064           intense        trust
## 7065   7065             inter     negative
## 7066   7066             inter      sadness
## 7067   7067         intercede         fear
## 7068   7068         intercede      sadness
## 7069   7069      intercession        trust
## 7070   7070       intercourse     positive
## 7071   7071      interdiction     negative
## 7072   7072          interest     positive
## 7073   7073        interested      disgust
## 7074   7074        interested     positive
## 7075   7075        interested      sadness
## 7076   7076       interesting     positive
## 7077   7077      interference     negative
## 7078   7078           interim anticipation
## 7079   7079          interior      disgust
## 7080   7080          interior     positive
## 7081   7081          interior        trust
## 7082   7082     interlocutory     positive
## 7083   7083         interlude     positive
## 7084   7084         interment     negative
## 7085   7085         interment      sadness
## 7086   7086      interminable        anger
## 7087   7087      interminable anticipation
## 7088   7088      interminable     negative
## 7089   7089      interminable     positive
## 7090   7090      intermission anticipation
## 7091   7091       interrogate         fear
## 7092   7092     interrogation         fear
## 7093   7093         interrupt        anger
## 7094   7094         interrupt     negative
## 7095   7095         interrupt     surprise
## 7096   7096       interrupted     negative
## 7097   7097       interrupted      sadness
## 7098   7098      intervention     negative
## 7099   7099      intervention     positive
## 7100   7100      intervention      sadness
## 7101   7101       interviewer         fear
## 7102   7102         intestate     negative
## 7103   7103        intestinal      disgust
## 7104   7104          intimate anticipation
## 7105   7105          intimate          joy
## 7106   7106          intimate     positive
## 7107   7107          intimate        trust
## 7108   7108        intimately anticipation
## 7109   7109        intimately         fear
## 7110   7110        intimately          joy
## 7111   7111        intimidate         fear
## 7112   7112        intimidate     negative
## 7113   7113      intimidation        anger
## 7114   7114      intimidation         fear
## 7115   7115      intimidation     negative
## 7116   7116       intolerable        anger
## 7117   7117       intolerable     negative
## 7118   7118       intolerance        anger
## 7119   7119       intolerance      disgust
## 7120   7120       intolerance         fear
## 7121   7121       intolerance     negative
## 7122   7122        intolerant        anger
## 7123   7123        intolerant      disgust
## 7124   7124        intolerant         fear
## 7125   7125        intolerant     negative
## 7126   7126        intolerant      sadness
## 7127   7127        intonation     positive
## 7128   7128       intoxicated      disgust
## 7129   7129       intoxicated     negative
## 7130   7130       intractable        anger
## 7131   7131       intractable     negative
## 7132   7132          intrepid     positive
## 7133   7133          intrigue anticipation
## 7134   7134          intrigue         fear
## 7135   7135          intrigue     negative
## 7136   7136          intrigue     surprise
## 7137   7137          intruder        anger
## 7138   7138          intruder         fear
## 7139   7139          intruder     negative
## 7140   7140          intruder     surprise
## 7141   7141         intrusion         fear
## 7142   7142         intrusion     negative
## 7143   7143         intrusive        anger
## 7144   7144         intrusive      disgust
## 7145   7145         intrusive         fear
## 7146   7146         intrusive     negative
## 7147   7147         intrusive     surprise
## 7148   7148         intuition     positive
## 7149   7149         intuition        trust
## 7150   7150         intuitive     positive
## 7151   7151       intuitively anticipation
## 7152   7152            invade        anger
## 7153   7153            invade         fear
## 7154   7154            invade     negative
## 7155   7155            invade      sadness
## 7156   7156            invade     surprise
## 7157   7157           invader        anger
## 7158   7158           invader         fear
## 7159   7159           invader     negative
## 7160   7160           invader      sadness
## 7161   7161           invalid      sadness
## 7162   7162        invalidate     negative
## 7163   7163      invalidation     negative
## 7164   7164        invalidity     negative
## 7165   7165        invariably     positive
## 7166   7166          invasion        anger
## 7167   7167          invasion     negative
## 7168   7168         inventive     positive
## 7169   7169          inventor     positive
## 7170   7170       investigate     positive
## 7171   7171     investigation anticipation
## 7172   7172        invigorate     positive
## 7173   7173        invitation anticipation
## 7174   7174        invitation     positive
## 7175   7175            invite anticipation
## 7176   7176            invite          joy
## 7177   7177            invite     positive
## 7178   7178            invite     surprise
## 7179   7179            invite        trust
## 7180   7180          inviting anticipation
## 7181   7181          inviting          joy
## 7182   7182          inviting     positive
## 7183   7183          inviting     surprise
## 7184   7184          inviting        trust
## 7185   7185        invocation anticipation
## 7186   7186        invocation        trust
## 7187   7187            invoke anticipation
## 7188   7188       involuntary     negative
## 7189   7189        involution        anger
## 7190   7190        involution     negative
## 7191   7191       involvement        anger
## 7192   7192             irate        anger
## 7193   7193             irate     negative
## 7194   7194               ire        anger
## 7195   7195               ire     negative
## 7196   7196              iris         fear
## 7197   7197              iron     positive
## 7198   7198              iron        trust
## 7199   7199             irons     negative
## 7200   7200        irrational      disgust
## 7201   7201        irrational         fear
## 7202   7202        irrational     negative
## 7203   7203     irrationality     negative
## 7204   7204    irreconcilable        anger
## 7205   7205    irreconcilable         fear
## 7206   7206    irreconcilable     negative
## 7207   7207    irreconcilable      sadness
## 7208   7208       irreducible     positive
## 7209   7209       irrefutable     positive
## 7210   7210       irrefutable        trust
## 7211   7211         irregular     negative
## 7212   7212      irregularity     negative
## 7213   7213        irrelevant     negative
## 7214   7214       irreparable         fear
## 7215   7215       irreparable     negative
## 7216   7216       irreparable      sadness
## 7217   7217     irresponsible     negative
## 7218   7218        irreverent     negative
## 7219   7219       irrevocable     negative
## 7220   7220      irritability        anger
## 7221   7221      irritability     negative
## 7222   7222         irritable        anger
## 7223   7223         irritable     negative
## 7224   7224        irritating        anger
## 7225   7225        irritating      disgust
## 7226   7226        irritating     negative
## 7227   7227        irritation        anger
## 7228   7228        irritation      disgust
## 7229   7229        irritation     negative
## 7230   7230        irritation      sadness
## 7231   7231           isolate      sadness
## 7232   7232          isolated         fear
## 7233   7233          isolated     negative
## 7234   7234          isolated      sadness
## 7235   7235         isolation     negative
## 7236   7236         isolation      sadness
## 7237   7237               jab        anger
## 7238   7238            jabber     negative
## 7239   7239           jackpot anticipation
## 7240   7240           jackpot          joy
## 7241   7241           jackpot     positive
## 7242   7242           jackpot     surprise
## 7243   7243              jail         fear
## 7244   7244              jail     negative
## 7245   7245              jail      sadness
## 7246   7246               jam     positive
## 7247   7247           janitor      disgust
## 7248   7248            jargon     negative
## 7249   7249           jarring         fear
## 7250   7250           jarring     negative
## 7251   7251           jarring      sadness
## 7252   7252          jaundice         fear
## 7253   7253          jaundice     negative
## 7254   7254              jaws         fear
## 7255   7255           jealous        anger
## 7256   7256           jealous      disgust
## 7257   7257           jealous     negative
## 7258   7258          jealousy        anger
## 7259   7259          jealousy      disgust
## 7260   7260          jealousy         fear
## 7261   7261          jealousy     negative
## 7262   7262          jealousy      sadness
## 7263   7263        jeopardize        anger
## 7264   7264        jeopardize         fear
## 7265   7265        jeopardize     negative
## 7266   7266          jeopardy anticipation
## 7267   7267          jeopardy         fear
## 7268   7268          jeopardy     negative
## 7269   7269              jerk        anger
## 7270   7270              jerk     surprise
## 7271   7271              jest          joy
## 7272   7272              jest     positive
## 7273   7273              jest     surprise
## 7274   7274               job     positive
## 7275   7275              john      disgust
## 7276   7276              john     negative
## 7277   7277              join     positive
## 7278   7278            joined     positive
## 7279   7279              joke     negative
## 7280   7280             joker          joy
## 7281   7281             joker     positive
## 7282   7282             joker     surprise
## 7283   7283            joking     positive
## 7284   7284              jolt     surprise
## 7285   7285           jornada     negative
## 7286   7286        journalism        trust
## 7287   7287        journalist     positive
## 7288   7288           journey anticipation
## 7289   7289           journey         fear
## 7290   7290           journey          joy
## 7291   7291           journey     positive
## 7292   7292        journeyman        trust
## 7293   7293            jovial          joy
## 7294   7294            jovial     positive
## 7295   7295               joy          joy
## 7296   7296               joy     positive
## 7297   7297            joyful          joy
## 7298   7298            joyful     positive
## 7299   7299            joyful        trust
## 7300   7300            joyous          joy
## 7301   7301            joyous     positive
## 7302   7302          jubilant          joy
## 7303   7303          jubilant     positive
## 7304   7304          jubilant     surprise
## 7305   7305          jubilant        trust
## 7306   7306           jubilee          joy
## 7307   7307           jubilee     positive
## 7308   7308           jubilee     surprise
## 7309   7309          judgment     surprise
## 7310   7310          judicial anticipation
## 7311   7311          judicial     positive
## 7312   7312          judicial        trust
## 7313   7313         judiciary anticipation
## 7314   7314         judiciary        trust
## 7315   7315         judicious     positive
## 7316   7316         judicious        trust
## 7317   7317            jumble     negative
## 7318   7318              jump          joy
## 7319   7319              jump     positive
## 7320   7320            jungle         fear
## 7321   7321              junk     negative
## 7322   7322             junta     negative
## 7323   7323     jurisprudence      sadness
## 7324   7324            jurist        trust
## 7325   7325              jury        trust
## 7326   7326           justice     positive
## 7327   7327           justice        trust
## 7328   7328       justifiable     positive
## 7329   7329       justifiable        trust
## 7330   7330     justification     positive
## 7331   7331          juvenile     negative
## 7332   7332          keepsake     positive
## 7333   7333               ken     positive
## 7334   7334            kennel      sadness
## 7335   7335              kern     negative
## 7336   7336          kerosene         fear
## 7337   7337           keynote     positive
## 7338   7338          keystone     positive
## 7339   7339              khan         fear
## 7340   7340              khan        trust
## 7341   7341              kick        anger
## 7342   7342              kick     negative
## 7343   7343           kicking        anger
## 7344   7344            kidnap        anger
## 7345   7345            kidnap         fear
## 7346   7346            kidnap     negative
## 7347   7347            kidnap      sadness
## 7348   7348            kidnap     surprise
## 7349   7349              kill         fear
## 7350   7350              kill     negative
## 7351   7351              kill      sadness
## 7352   7352           killing        anger
## 7353   7353           killing         fear
## 7354   7354           killing     negative
## 7355   7355           killing      sadness
## 7356   7356              kind          joy
## 7357   7357              kind     positive
## 7358   7358              kind        trust
## 7359   7359          kindness     positive
## 7360   7360           kindred anticipation
## 7361   7361           kindred          joy
## 7362   7362           kindred     positive
## 7363   7363           kindred        trust
## 7364   7364              king     positive
## 7365   7365              kiss anticipation
## 7366   7366              kiss          joy
## 7367   7367              kiss     positive
## 7368   7368              kiss     surprise
## 7369   7369              kite      disgust
## 7370   7370              kite     negative
## 7371   7371            kitten          joy
## 7372   7372            kitten     positive
## 7373   7373            kitten        trust
## 7374   7374             knack     positive
## 7375   7375             knell         fear
## 7376   7376             knell     negative
## 7377   7377             knell      sadness
## 7378   7378          knickers        trust
## 7379   7379            knight     positive
## 7380   7380           knotted     negative
## 7381   7381           knowing     positive
## 7382   7382         knowledge     positive
## 7383   7383             kudos          joy
## 7384   7384             kudos     positive
## 7385   7385             label        trust
## 7386   7386             labor anticipation
## 7387   7387             labor          joy
## 7388   7388             labor     positive
## 7389   7389             labor     surprise
## 7390   7390             labor        trust
## 7391   7391           labored     negative
## 7392   7392           labored      sadness
## 7393   7393         laborious     negative
## 7394   7394         labyrinth anticipation
## 7395   7395         labyrinth     negative
## 7396   7396              lace        anger
## 7397   7397              lace         fear
## 7398   7398              lace     negative
## 7399   7399              lace     positive
## 7400   7400              lace      sadness
## 7401   7401              lace        trust
## 7402   7402              lack     negative
## 7403   7403           lacking     negative
## 7404   7404        lackluster     negative
## 7405   7405             laden     negative
## 7406   7406               lag     negative
## 7407   7407           lagging        anger
## 7408   7408           lagging anticipation
## 7409   7409           lagging      disgust
## 7410   7410           lagging     negative
## 7411   7411           lagging      sadness
## 7412   7412              lair     negative
## 7413   7413              lamb          joy
## 7414   7414              lamb     positive
## 7415   7415              lamb        trust
## 7416   7416            lament      disgust
## 7417   7417            lament         fear
## 7418   7418            lament     negative
## 7419   7419            lament      sadness
## 7420   7420         lamenting      sadness
## 7421   7421              land     positive
## 7422   7422            landed     positive
## 7423   7423          landmark        trust
## 7424   7424         landslide         fear
## 7425   7425         landslide     negative
## 7426   7426         landslide      sadness
## 7427   7427           languid     negative
## 7428   7428          languish     negative
## 7429   7429       languishing         fear
## 7430   7430       languishing     negative
## 7431   7431       languishing      sadness
## 7432   7432             lapse     negative
## 7433   7433           larceny      disgust
## 7434   7434           larceny     negative
## 7435   7435            larger      disgust
## 7436   7436            larger     surprise
## 7437   7437            larger        trust
## 7438   7438             laser     positive
## 7439   7439             laser        trust
## 7440   7440              lash        anger
## 7441   7441              lash         fear
## 7442   7442              lash     negative
## 7443   7443              late     negative
## 7444   7444              late      sadness
## 7445   7445          lateness     negative
## 7446   7446            latent        anger
## 7447   7447            latent anticipation
## 7448   7448            latent      disgust
## 7449   7449            latent     negative
## 7450   7450            latent     surprise
## 7451   7451          latrines      disgust
## 7452   7452          latrines     negative
## 7453   7453          laudable     positive
## 7454   7454             laugh          joy
## 7455   7455             laugh     positive
## 7456   7456             laugh     surprise
## 7457   7457         laughable      disgust
## 7458   7458         laughable     negative
## 7459   7459          laughing          joy
## 7460   7460          laughing     positive
## 7461   7461          laughter anticipation
## 7462   7462          laughter          joy
## 7463   7463          laughter     positive
## 7464   7464          laughter     surprise
## 7465   7465            launch anticipation
## 7466   7466            launch     positive
## 7467   7467          laureate     positive
## 7468   7468          laureate        trust
## 7469   7469            laurel     positive
## 7470   7470           laurels          joy
## 7471   7471           laurels     positive
## 7472   7472              lava        anger
## 7473   7473              lava         fear
## 7474   7474              lava     negative
## 7475   7475          lavatory      disgust
## 7476   7476            lavish     positive
## 7477   7477               law        trust
## 7478   7478            lawful     positive
## 7479   7479            lawful        trust
## 7480   7480       lawlessness        anger
## 7481   7481       lawlessness         fear
## 7482   7482       lawlessness     negative
## 7483   7483           lawsuit        anger
## 7484   7484           lawsuit      disgust
## 7485   7485           lawsuit         fear
## 7486   7486           lawsuit     negative
## 7487   7487           lawsuit      sadness
## 7488   7488           lawsuit     surprise
## 7489   7489            lawyer        anger
## 7490   7490            lawyer      disgust
## 7491   7491            lawyer         fear
## 7492   7492            lawyer     negative
## 7493   7493               lax     negative
## 7494   7494               lax      sadness
## 7495   7495          laxative      disgust
## 7496   7496          laxative         fear
## 7497   7497          laxative     negative
## 7498   7498              lazy     negative
## 7499   7499              lead     positive
## 7500   7500            leader     positive
## 7501   7501            leader        trust
## 7502   7502           leading        trust
## 7503   7503            league     positive
## 7504   7504              leak     negative
## 7505   7505           leakage     negative
## 7506   7506             leaky     negative
## 7507   7507           leaning        trust
## 7508   7508             learn     positive
## 7509   7509          learning     positive
## 7510   7510             leave     negative
## 7511   7511             leave      sadness
## 7512   7512             leave     surprise
## 7513   7513          lecturer     positive
## 7514   7514             leech     negative
## 7515   7515           leeches      disgust
## 7516   7516           leeches         fear
## 7517   7517           leeches     negative
## 7518   7518              leer      disgust
## 7519   7519              leer     negative
## 7520   7520             leery     surprise
## 7521   7521            leeway     positive
## 7522   7522             legal     positive
## 7523   7523             legal        trust
## 7524   7524         legalized        anger
## 7525   7525         legalized         fear
## 7526   7526         legalized          joy
## 7527   7527         legalized     positive
## 7528   7528         legalized        trust
## 7529   7529         legendary     positive
## 7530   7530        legibility     positive
## 7531   7531           legible     positive
## 7532   7532        legislator        trust
## 7533   7533       legislature        trust
## 7534   7534        legitimacy        trust
## 7535   7535           leisure anticipation
## 7536   7536           leisure          joy
## 7537   7537           leisure     positive
## 7538   7538           leisure     surprise
## 7539   7539           leisure        trust
## 7540   7540         leisurely     positive
## 7541   7541             lemma     positive
## 7542   7542             lemon      disgust
## 7543   7543             lemon     negative
## 7544   7544            lender        trust
## 7545   7545           lenient     positive
## 7546   7546           leprosy      disgust
## 7547   7547           leprosy         fear
## 7548   7548           leprosy     negative
## 7549   7549           leprosy      sadness
## 7550   7550            lessen anticipation
## 7551   7551            lessen     negative
## 7552   7552            lesser      disgust
## 7553   7553            lesser     negative
## 7554   7554            lesson anticipation
## 7555   7555            lesson     positive
## 7556   7556            lesson        trust
## 7557   7557            lethal      disgust
## 7558   7558            lethal         fear
## 7559   7559            lethal     negative
## 7560   7560            lethal      sadness
## 7561   7561          lethargy     negative
## 7562   7562          lethargy      sadness
## 7563   7563            letter anticipation
## 7564   7564          lettered anticipation
## 7565   7565          lettered     positive
## 7566   7566          lettered        trust
## 7567   7567          leukemia        anger
## 7568   7568          leukemia         fear
## 7569   7569          leukemia     negative
## 7570   7570          leukemia      sadness
## 7571   7571             levee        trust
## 7572   7572             level     positive
## 7573   7573             level        trust
## 7574   7574          leverage     positive
## 7575   7575              levy     negative
## 7576   7576              lewd      disgust
## 7577   7577              lewd     negative
## 7578   7578           liaison     negative
## 7579   7579              liar      disgust
## 7580   7580              liar     negative
## 7581   7581             libel        anger
## 7582   7582             libel         fear
## 7583   7583             libel     negative
## 7584   7584             libel        trust
## 7585   7585           liberal     negative
## 7586   7586           liberal     positive
## 7587   7587          liberate        anger
## 7588   7588          liberate anticipation
## 7589   7589          liberate          joy
## 7590   7590          liberate     positive
## 7591   7591          liberate     surprise
## 7592   7592          liberate        trust
## 7593   7593        liberation anticipation
## 7594   7594        liberation          joy
## 7595   7595        liberation     positive
## 7596   7596        liberation     surprise
## 7597   7597           liberty anticipation
## 7598   7598           liberty          joy
## 7599   7599           liberty     positive
## 7600   7600           liberty     surprise
## 7601   7601           liberty        trust
## 7602   7602           library     positive
## 7603   7603              lick      disgust
## 7604   7604              lick     negative
## 7605   7605               lie        anger
## 7606   7606               lie      disgust
## 7607   7607               lie     negative
## 7608   7608               lie      sadness
## 7609   7609        lieutenant        trust
## 7610   7610         lifeblood     positive
## 7611   7611          lifeless         fear
## 7612   7612          lifeless     negative
## 7613   7613          lifeless      sadness
## 7614   7614        lighthouse     positive
## 7615   7615         lightning        anger
## 7616   7616         lightning         fear
## 7617   7617         lightning     surprise
## 7618   7618            liking          joy
## 7619   7619            liking     positive
## 7620   7620            liking        trust
## 7621   7621           limited        anger
## 7622   7622           limited     negative
## 7623   7623           limited      sadness
## 7624   7624              limp     negative
## 7625   7625             lines         fear
## 7626   7626            linger anticipation
## 7627   7627          linguist     positive
## 7628   7628          linguist        trust
## 7629   7629              lint     negative
## 7630   7630              lion         fear
## 7631   7631              lion     positive
## 7632   7632            liquor        anger
## 7633   7633            liquor          joy
## 7634   7634            liquor     negative
## 7635   7635            liquor      sadness
## 7636   7636          listless     negative
## 7637   7637          listless      sadness
## 7638   7638             lithe     positive
## 7639   7639          litigant     negative
## 7640   7640          litigate        anger
## 7641   7641          litigate anticipation
## 7642   7642          litigate      disgust
## 7643   7643          litigate         fear
## 7644   7644          litigate     negative
## 7645   7645          litigate      sadness
## 7646   7646        litigation     negative
## 7647   7647         litigious        anger
## 7648   7648         litigious      disgust
## 7649   7649         litigious     negative
## 7650   7650            litter     negative
## 7651   7651             livid        anger
## 7652   7652             livid      disgust
## 7653   7653             livid     negative
## 7654   7654              loaf     negative
## 7655   7655            loafer     negative
## 7656   7656             loath        anger
## 7657   7657             loath     negative
## 7658   7658            loathe        anger
## 7659   7659            loathe      disgust
## 7660   7660            loathe     negative
## 7661   7661          loathing      disgust
## 7662   7662          loathing     negative
## 7663   7663         loathsome        anger
## 7664   7664         loathsome      disgust
## 7665   7665         loathsome     negative
## 7666   7666          lobbyist     negative
## 7667   7667          localize anticipation
## 7668   7668            lockup         fear
## 7669   7669            lockup     negative
## 7670   7670            lockup      sadness
## 7671   7671            locust         fear
## 7672   7672            locust     negative
## 7673   7673           lodging        trust
## 7674   7674             lofty     negative
## 7675   7675           logical     positive
## 7676   7676              lone      sadness
## 7677   7677        loneliness         fear
## 7678   7678        loneliness     negative
## 7679   7679        loneliness      sadness
## 7680   7680            lonely        anger
## 7681   7681            lonely      disgust
## 7682   7682            lonely         fear
## 7683   7683            lonely     negative
## 7684   7684            lonely      sadness
## 7685   7685          lonesome     negative
## 7686   7686          lonesome      sadness
## 7687   7687              long anticipation
## 7688   7688         longevity     positive
## 7689   7689           longing anticipation
## 7690   7690           longing      sadness
## 7691   7691               loo      disgust
## 7692   7692               loo     negative
## 7693   7693              loom anticipation
## 7694   7694              loom         fear
## 7695   7695              loom     negative
## 7696   7696              loon      disgust
## 7697   7697              loon     negative
## 7698   7698             loony     negative
## 7699   7699              loot     negative
## 7700   7700              lord      disgust
## 7701   7701              lord     negative
## 7702   7702              lord     positive
## 7703   7703              lord        trust
## 7704   7704          lordship     positive
## 7705   7705              lose        anger
## 7706   7706              lose      disgust
## 7707   7707              lose         fear
## 7708   7708              lose     negative
## 7709   7709              lose      sadness
## 7710   7710              lose     surprise
## 7711   7711            losing        anger
## 7712   7712            losing     negative
## 7713   7713            losing      sadness
## 7714   7714              loss        anger
## 7715   7715              loss         fear
## 7716   7716              loss     negative
## 7717   7717              loss      sadness
## 7718   7718              lost     negative
## 7719   7719              lost      sadness
## 7720   7720           lottery anticipation
## 7721   7721          loudness        anger
## 7722   7722          loudness     negative
## 7723   7723            lounge     negative
## 7724   7724             louse      disgust
## 7725   7725             louse     negative
## 7726   7726           lovable          joy
## 7727   7727           lovable     positive
## 7728   7728           lovable        trust
## 7729   7729              love          joy
## 7730   7730              love     positive
## 7731   7731            lovely anticipation
## 7732   7732            lovely          joy
## 7733   7733            lovely     positive
## 7734   7734            lovely      sadness
## 7735   7735            lovely     surprise
## 7736   7736            lovely        trust
## 7737   7737        lovemaking          joy
## 7738   7738        lovemaking     positive
## 7739   7739        lovemaking        trust
## 7740   7740             lover anticipation
## 7741   7741             lover          joy
## 7742   7742             lover     positive
## 7743   7743             lover        trust
## 7744   7744            loving          joy
## 7745   7745            loving     positive
## 7746   7746            loving        trust
## 7747   7747             lower     negative
## 7748   7748             lower      sadness
## 7749   7749          lowering     negative
## 7750   7750            lowest     negative
## 7751   7751            lowest      sadness
## 7752   7752          lowlands     negative
## 7753   7753             lowly     negative
## 7754   7754             lowly      sadness
## 7755   7755             loyal         fear
## 7756   7756             loyal          joy
## 7757   7757             loyal     positive
## 7758   7758             loyal     surprise
## 7759   7759             loyal        trust
## 7760   7760           loyalty     positive
## 7761   7761           loyalty        trust
## 7762   7762              luck anticipation
## 7763   7763              luck          joy
## 7764   7764              luck     positive
## 7765   7765              luck     surprise
## 7766   7766             lucky          joy
## 7767   7767             lucky     positive
## 7768   7768             lucky     surprise
## 7769   7769         ludicrous     negative
## 7770   7770              lull anticipation
## 7771   7771         lumbering     negative
## 7772   7772              lump     negative
## 7773   7773             lumpy      disgust
## 7774   7774             lumpy     negative
## 7775   7775            lunacy        anger
## 7776   7776            lunacy      disgust
## 7777   7777            lunacy         fear
## 7778   7778            lunacy     negative
## 7779   7779            lunacy      sadness
## 7780   7780           lunatic        anger
## 7781   7781           lunatic      disgust
## 7782   7782           lunatic         fear
## 7783   7783           lunatic     negative
## 7784   7784             lunge     surprise
## 7785   7785             lurch     negative
## 7786   7786              lure     negative
## 7787   7787             lurid      disgust
## 7788   7788             lurid     negative
## 7789   7789              lurk     negative
## 7790   7790           lurking     negative
## 7791   7791          luscious anticipation
## 7792   7792          luscious          joy
## 7793   7793          luscious     positive
## 7794   7794              lush      disgust
## 7795   7795              lush     negative
## 7796   7796              lush      sadness
## 7797   7797              lust anticipation
## 7798   7798              lust     negative
## 7799   7799            luster          joy
## 7800   7800            luster     positive
## 7801   7801           lustful     negative
## 7802   7802          lustrous     positive
## 7803   7803             lusty      disgust
## 7804   7804         luxuriant     positive
## 7805   7805         luxurious          joy
## 7806   7806         luxurious     positive
## 7807   7807            luxury          joy
## 7808   7808            luxury     positive
## 7809   7809             lying        anger
## 7810   7810             lying      disgust
## 7811   7811             lying     negative
## 7812   7812             lynch        anger
## 7813   7813             lynch      disgust
## 7814   7814             lynch         fear
## 7815   7815             lynch     negative
## 7816   7816             lynch      sadness
## 7817   7817              lyre          joy
## 7818   7818              lyre     positive
## 7819   7819           lyrical          joy
## 7820   7820           lyrical     positive
## 7821   7821              mace         fear
## 7822   7822              mace     negative
## 7823   7823           machine        trust
## 7824   7824               mad        anger
## 7825   7825               mad      disgust
## 7826   7826               mad         fear
## 7827   7827               mad     negative
## 7828   7828               mad      sadness
## 7829   7829            madden        anger
## 7830   7830            madden         fear
## 7831   7831            madden     negative
## 7832   7832            madman        anger
## 7833   7833            madman         fear
## 7834   7834            madman     negative
## 7835   7835           madness        anger
## 7836   7836           madness         fear
## 7837   7837           madness     negative
## 7838   7838             mafia         fear
## 7839   7839             mafia     negative
## 7840   7840              mage         fear
## 7841   7841            maggot      disgust
## 7842   7842            maggot     negative
## 7843   7843           magical anticipation
## 7844   7844           magical          joy
## 7845   7845           magical     positive
## 7846   7846           magical     surprise
## 7847   7847          magician     surprise
## 7848   7848            magnet     positive
## 7849   7849            magnet        trust
## 7850   7850         magnetism     positive
## 7851   7851         magnetite     positive
## 7852   7852      magnificence anticipation
## 7853   7853      magnificence          joy
## 7854   7854      magnificence     positive
## 7855   7855      magnificence        trust
## 7856   7856       magnificent anticipation
## 7857   7857       magnificent          joy
## 7858   7858       magnificent     positive
## 7859   7859       magnificent     surprise
## 7860   7860       magnificent        trust
## 7861   7861            maiden     positive
## 7862   7862              mail anticipation
## 7863   7863              main     positive
## 7864   7864          mainstay     positive
## 7865   7865          mainstay        trust
## 7866   7866       maintenance        trust
## 7867   7867          majestic anticipation
## 7868   7868          majestic          joy
## 7869   7869          majestic     positive
## 7870   7870          majestic     surprise
## 7871   7871          majestic        trust
## 7872   7872           majesty     positive
## 7873   7873           majesty        trust
## 7874   7874             major     positive
## 7875   7875          majority          joy
## 7876   7876          majority     positive
## 7877   7877          majority        trust
## 7878   7878         makeshift     negative
## 7879   7879            malady     negative
## 7880   7880           malaise     negative
## 7881   7881           malaise      sadness
## 7882   7882           malaria      disgust
## 7883   7883           malaria         fear
## 7884   7884           malaria     negative
## 7885   7885           malaria      sadness
## 7886   7886        malevolent        anger
## 7887   7887        malevolent      disgust
## 7888   7888        malevolent         fear
## 7889   7889        malevolent     negative
## 7890   7890        malevolent      sadness
## 7891   7891       malfeasance      disgust
## 7892   7892       malfeasance     negative
## 7893   7893      malformation     negative
## 7894   7894            malice        anger
## 7895   7895            malice         fear
## 7896   7896            malice     negative
## 7897   7897         malicious        anger
## 7898   7898         malicious      disgust
## 7899   7899         malicious         fear
## 7900   7900         malicious     negative
## 7901   7901         malicious      sadness
## 7902   7902            malign        anger
## 7903   7903            malign      disgust
## 7904   7904            malign     negative
## 7905   7905        malignancy         fear
## 7906   7906        malignancy     negative
## 7907   7907        malignancy      sadness
## 7908   7908         malignant        anger
## 7909   7909         malignant         fear
## 7910   7910         malignant     negative
## 7911   7911       malpractice        anger
## 7912   7912       malpractice     negative
## 7913   7913             mamma        trust
## 7914   7914            manage     positive
## 7915   7915            manage        trust
## 7916   7916        management     positive
## 7917   7917        management        trust
## 7918   7918          mandamus         fear
## 7919   7919          mandamus     negative
## 7920   7920          mandarin     positive
## 7921   7921          mandarin        trust
## 7922   7922             mange      disgust
## 7923   7923             mange         fear
## 7924   7924             mange     negative
## 7925   7925            mangle        anger
## 7926   7926            mangle      disgust
## 7927   7927            mangle         fear
## 7928   7928            mangle     negative
## 7929   7929            mangle      sadness
## 7930   7930           manhood     positive
## 7931   7931             mania     negative
## 7932   7932            maniac        anger
## 7933   7933            maniac         fear
## 7934   7934            maniac     negative
## 7935   7935          maniacal     negative
## 7936   7936     manifestation         fear
## 7937   7937        manifested     positive
## 7938   7938        manipulate     negative
## 7939   7939      manipulation        anger
## 7940   7940      manipulation         fear
## 7941   7941      manipulation     negative
## 7942   7942             manly     positive
## 7943   7943             manna     positive
## 7944   7944          mannered     positive
## 7945   7945           manners     positive
## 7946   7946      manslaughter        anger
## 7947   7947      manslaughter      disgust
## 7948   7948      manslaughter         fear
## 7949   7949      manslaughter     negative
## 7950   7950      manslaughter      sadness
## 7951   7951      manslaughter     surprise
## 7952   7952            manual        trust
## 7953   7953      manufacturer     positive
## 7954   7954            manure      disgust
## 7955   7955            manure     negative
## 7956   7956               mar     negative
## 7957   7957             march     positive
## 7958   7958            margin     negative
## 7959   7959            margin      sadness
## 7960   7960            marine        trust
## 7961   7961            marked     positive
## 7962   7962        marketable     positive
## 7963   7963            maroon     negative
## 7964   7964           marquis     positive
## 7965   7965          marriage anticipation
## 7966   7966          marriage          joy
## 7967   7967          marriage     positive
## 7968   7968          marriage        trust
## 7969   7969            marrow          joy
## 7970   7970            marrow     positive
## 7971   7971            marrow        trust
## 7972   7972             marry anticipation
## 7973   7973             marry         fear
## 7974   7974             marry          joy
## 7975   7975             marry     positive
## 7976   7976             marry     surprise
## 7977   7977             marry        trust
## 7978   7978           marshal     positive
## 7979   7979           marshal        trust
## 7980   7980           martial        anger
## 7981   7981        martingale     negative
## 7982   7982            martyr         fear
## 7983   7983            martyr     negative
## 7984   7984            martyr      sadness
## 7985   7985         martyrdom         fear
## 7986   7986         martyrdom     negative
## 7987   7987         martyrdom      sadness
## 7988   7988            marvel     positive
## 7989   7989            marvel     surprise
## 7990   7990         marvelous          joy
## 7991   7991         marvelous     positive
## 7992   7992       marvelously          joy
## 7993   7993       marvelously     positive
## 7994   7994         masculine     positive
## 7995   7995         masochism        anger
## 7996   7996         masochism      disgust
## 7997   7997         masochism         fear
## 7998   7998         masochism     negative
## 7999   7999          massacre        anger
## 8000   8000          massacre      disgust
## 8001   8001          massacre         fear
## 8002   8002          massacre     negative
## 8003   8003          massacre      sadness
## 8004   8004           massage          joy
## 8005   8005           massage     positive
## 8006   8006            master     positive
## 8007   8007       masterpiece          joy
## 8008   8008       masterpiece     positive
## 8009   8009           mastery        anger
## 8010   8010           mastery          joy
## 8011   8011           mastery     positive
## 8012   8012           mastery        trust
## 8013   8013        matchmaker anticipation
## 8014   8014              mate     positive
## 8015   8015              mate        trust
## 8016   8016       materialism     negative
## 8017   8017       materialist      disgust
## 8018   8018       materialist     negative
## 8019   8019          maternal anticipation
## 8020   8020          maternal     negative
## 8021   8021          maternal     positive
## 8022   8022      mathematical        trust
## 8023   8023         matrimony anticipation
## 8024   8024         matrimony          joy
## 8025   8025         matrimony     positive
## 8026   8026         matrimony        trust
## 8027   8027            matron     positive
## 8028   8028            matron        trust
## 8029   8029         mausoleum      sadness
## 8030   8030             maxim        trust
## 8031   8031           maximum     positive
## 8032   8032             mayor     positive
## 8033   8033            meadow     positive
## 8034   8034        meandering     negative
## 8035   8035       meaningless     negative
## 8036   8036       meaningless      sadness
## 8037   8037           measles      disgust
## 8038   8038           measles         fear
## 8039   8039           measles     negative
## 8040   8040           measles      sadness
## 8041   8041           measure        trust
## 8042   8042          measured     positive
## 8043   8043          measured        trust
## 8044   8044             medal anticipation
## 8045   8045             medal          joy
## 8046   8046             medal     positive
## 8047   8047             medal     surprise
## 8048   8048             medal        trust
## 8049   8049            meddle        anger
## 8050   8050            meddle     negative
## 8051   8051           mediate anticipation
## 8052   8052           mediate     positive
## 8053   8053           mediate        trust
## 8054   8054         mediation     positive
## 8055   8055          mediator anticipation
## 8056   8056          mediator     positive
## 8057   8057          mediator        trust
## 8058   8058           medical anticipation
## 8059   8059           medical         fear
## 8060   8060           medical     positive
## 8061   8061           medical        trust
## 8062   8062          mediocre     negative
## 8063   8063        mediocrity     negative
## 8064   8064          meditate anticipation
## 8065   8065          meditate          joy
## 8066   8066          meditate     positive
## 8067   8067          meditate        trust
## 8068   8068     mediterranean     positive
## 8069   8069            medley     positive
## 8070   8070              meek      sadness
## 8071   8071       melancholic     negative
## 8072   8072       melancholic      sadness
## 8073   8073        melancholy     negative
## 8074   8074        melancholy      sadness
## 8075   8075             melee         fear
## 8076   8076             melee     negative
## 8077   8077         melodrama        anger
## 8078   8078         melodrama     negative
## 8079   8079         melodrama      sadness
## 8080   8080          meltdown     negative
## 8081   8081          meltdown      sadness
## 8082   8082           memento     positive
## 8083   8083         memorable          joy
## 8084   8084         memorable     positive
## 8085   8085         memorable     surprise
## 8086   8086         memorable        trust
## 8087   8087         memorials      sadness
## 8088   8088            menace        anger
## 8089   8089            menace         fear
## 8090   8090            menace     negative
## 8091   8091          menacing        anger
## 8092   8092          menacing         fear
## 8093   8093          menacing     negative
## 8094   8094           mending     positive
## 8095   8095            menial     negative
## 8096   8096            menses     positive
## 8097   8097            mentor     positive
## 8098   8098            mentor        trust
## 8099   8099         mercenary         fear
## 8100   8100         mercenary     negative
## 8101   8101          merchant        trust
## 8102   8102          merciful     positive
## 8103   8103         merciless         fear
## 8104   8104         merciless     negative
## 8105   8105             mercy     positive
## 8106   8106             merge anticipation
## 8107   8107             merge     positive
## 8108   8108             merit     positive
## 8109   8109             merit        trust
## 8110   8110       meritorious          joy
## 8111   8111       meritorious     positive
## 8112   8112       meritorious        trust
## 8113   8113         merriment          joy
## 8114   8114         merriment     positive
## 8115   8115         merriment     surprise
## 8116   8116             merry          joy
## 8117   8117             merry     positive
## 8118   8118              mess      disgust
## 8119   8119              mess     negative
## 8120   8120         messenger        trust
## 8121   8121             messy      disgust
## 8122   8122             messy     negative
## 8123   8123        metastasis     negative
## 8124   8124          methanol     negative
## 8125   8125      metropolitan     positive
## 8126   8126            mettle     positive
## 8127   8127        microscope        trust
## 8128   8128        microscopy     positive
## 8129   8129           midwife anticipation
## 8130   8130           midwife          joy
## 8131   8131           midwife     negative
## 8132   8132           midwife     positive
## 8133   8133           midwife        trust
## 8134   8134         midwifery     positive
## 8135   8135            mighty        anger
## 8136   8136            mighty         fear
## 8137   8137            mighty          joy
## 8138   8138            mighty     positive
## 8139   8139            mighty        trust
## 8140   8140            mildew      disgust
## 8141   8141            mildew     negative
## 8142   8142          military         fear
## 8143   8143           militia        anger
## 8144   8144           militia         fear
## 8145   8145           militia     negative
## 8146   8146           militia      sadness
## 8147   8147              mill anticipation
## 8148   8148              mime     positive
## 8149   8149           mimicry     negative
## 8150   8150           mimicry     surprise
## 8151   8151           mindful     positive
## 8152   8152       mindfulness     positive
## 8153   8153          minimize     negative
## 8154   8154           minimum     negative
## 8155   8155          ministry          joy
## 8156   8156          ministry     positive
## 8157   8157          ministry        trust
## 8158   8158          minority     negative
## 8159   8159           miracle anticipation
## 8160   8160           miracle          joy
## 8161   8161           miracle     positive
## 8162   8162           miracle     surprise
## 8163   8163           miracle        trust
## 8164   8164        miraculous          joy
## 8165   8165        miraculous     positive
## 8166   8166        miraculous     surprise
## 8167   8167              mire      disgust
## 8168   8168              mire     negative
## 8169   8169             mirth          joy
## 8170   8170             mirth     positive
## 8171   8171       misbehavior        anger
## 8172   8172       misbehavior      disgust
## 8173   8173       misbehavior     negative
## 8174   8174       misbehavior     surprise
## 8175   8175       miscarriage         fear
## 8176   8176       miscarriage     negative
## 8177   8177       miscarriage      sadness
## 8178   8178          mischief     negative
## 8179   8179       mischievous     negative
## 8180   8180     misconception        anger
## 8181   8181     misconception      disgust
## 8182   8182     misconception         fear
## 8183   8183     misconception     negative
## 8184   8184        misconduct      disgust
## 8185   8185        misconduct     negative
## 8186   8186         miserable        anger
## 8187   8187         miserable      disgust
## 8188   8188         miserable     negative
## 8189   8189         miserable      sadness
## 8190   8190         miserably     negative
## 8191   8191         miserably      sadness
## 8192   8192            misery        anger
## 8193   8193            misery      disgust
## 8194   8194            misery         fear
## 8195   8195            misery     negative
## 8196   8196            misery      sadness
## 8197   8197        misfortune         fear
## 8198   8198        misfortune     negative
## 8199   8199        misfortune      sadness
## 8200   8200         misguided      disgust
## 8201   8201         misguided     negative
## 8202   8202            mishap      disgust
## 8203   8203            mishap         fear
## 8204   8204            mishap     negative
## 8205   8205            mishap      sadness
## 8206   8206            mishap     surprise
## 8207   8207 misinterpretation     negative
## 8208   8208           mislead        anger
## 8209   8209           mislead         fear
## 8210   8210           mislead     negative
## 8211   8211           mislead        trust
## 8212   8212        misleading        anger
## 8213   8213        misleading      disgust
## 8214   8214        misleading     negative
## 8215   8215     mismanagement     negative
## 8216   8216          mismatch     negative
## 8217   8217          misnomer     negative
## 8218   8218          misplace        anger
## 8219   8219          misplace      disgust
## 8220   8220          misplace     negative
## 8221   8221         misplaced     negative
## 8222   8222      misrepresent     negative
## 8223   8223 misrepresentation     negative
## 8224   8224 misrepresentation      sadness
## 8225   8225    misrepresented        anger
## 8226   8226    misrepresented     negative
## 8227   8227           missile         fear
## 8228   8228           missing         fear
## 8229   8229           missing     negative
## 8230   8230           missing      sadness
## 8231   8231        missionary     positive
## 8232   8232      misstatement        anger
## 8233   8233      misstatement      disgust
## 8234   8234      misstatement     negative
## 8235   8235           mistake     negative
## 8236   8236           mistake      sadness
## 8237   8237          mistaken         fear
## 8238   8238          mistaken     negative
## 8239   8239          mistress        anger
## 8240   8240          mistress      disgust
## 8241   8241          mistress     negative
## 8242   8242          mistrust      disgust
## 8243   8243          mistrust         fear
## 8244   8244          mistrust     negative
## 8245   8245     misunderstand     negative
## 8246   8246  misunderstanding        anger
## 8247   8247  misunderstanding     negative
## 8248   8248  misunderstanding      sadness
## 8249   8249            misuse     negative
## 8250   8250              mite      disgust
## 8251   8251              mite     negative
## 8252   8252              moan         fear
## 8253   8253              moan      sadness
## 8254   8254              moat        trust
## 8255   8255               mob        anger
## 8256   8256               mob         fear
## 8257   8257               mob     negative
## 8258   8258            mobile anticipation
## 8259   8259           mockery      disgust
## 8260   8260           mockery     negative
## 8261   8261           mocking        anger
## 8262   8262           mocking      disgust
## 8263   8263           mocking     negative
## 8264   8264           mocking      sadness
## 8265   8265             model     positive
## 8266   8266          moderate     positive
## 8267   8267         moderator     positive
## 8268   8268         moderator        trust
## 8269   8269            modest     positive
## 8270   8270            modest        trust
## 8271   8271           modesty     positive
## 8272   8272            modify     surprise
## 8273   8273       molestation        anger
## 8274   8274       molestation      disgust
## 8275   8275       molestation         fear
## 8276   8276       molestation     negative
## 8277   8277       molestation      sadness
## 8278   8278          momentum anticipation
## 8279   8279          momentum     positive
## 8280   8280          monetary anticipation
## 8281   8281          monetary     positive
## 8282   8282             money        anger
## 8283   8283             money anticipation
## 8284   8284             money          joy
## 8285   8285             money     positive
## 8286   8286             money     surprise
## 8287   8287             money        trust
## 8288   8288              monk     positive
## 8289   8289              monk        trust
## 8290   8290        monochrome      disgust
## 8291   8291        monochrome     negative
## 8292   8292          monogamy        trust
## 8293   8293        monopolist     negative
## 8294   8294           monsoon     negative
## 8295   8295           monsoon      sadness
## 8296   8296           monster         fear
## 8297   8297           monster     negative
## 8298   8298       monstrosity        anger
## 8299   8299       monstrosity      disgust
## 8300   8300       monstrosity         fear
## 8301   8301       monstrosity     negative
## 8302   8302       monstrosity     surprise
## 8303   8303          monument     positive
## 8304   8304             moody        anger
## 8305   8305             moody     negative
## 8306   8306             moody      sadness
## 8307   8307          moorings        trust
## 8308   8308              moot     negative
## 8309   8309             moral        anger
## 8310   8310             moral     positive
## 8311   8311             moral        trust
## 8312   8312          morality     positive
## 8313   8313          morality        trust
## 8314   8314            morals        anger
## 8315   8315            morals anticipation
## 8316   8316            morals      disgust
## 8317   8317            morals          joy
## 8318   8318            morals     positive
## 8319   8319            morals     surprise
## 8320   8320            morals        trust
## 8321   8321            morbid     negative
## 8322   8322            morbid      sadness
## 8323   8323         morbidity        anger
## 8324   8324         morbidity      disgust
## 8325   8325         morbidity         fear
## 8326   8326         morbidity     negative
## 8327   8327         morbidity      sadness
## 8328   8328            morgue      disgust
## 8329   8329            morgue         fear
## 8330   8330            morgue     negative
## 8331   8331            morgue      sadness
## 8332   8332          moribund     negative
## 8333   8333          moribund      sadness
## 8334   8334              morn anticipation
## 8335   8335             moron     negative
## 8336   8336           moronic     negative
## 8337   8337            morrow anticipation
## 8338   8338            morsel     negative
## 8339   8339            mortal     negative
## 8340   8340         mortality        anger
## 8341   8341         mortality         fear
## 8342   8342         mortality     negative
## 8343   8343         mortality      sadness
## 8344   8344            mortar     positive
## 8345   8345          mortgage         fear
## 8346   8346         mortgagee        trust
## 8347   8347         mortgagor         fear
## 8348   8348     mortification anticipation
## 8349   8349     mortification      disgust
## 8350   8350     mortification         fear
## 8351   8351     mortification     negative
## 8352   8352     mortification      sadness
## 8353   8353          mortuary         fear
## 8354   8354          mortuary     negative
## 8355   8355          mortuary      sadness
## 8356   8356          mosquito        anger
## 8357   8357          mosquito      disgust
## 8358   8358          mosquito     negative
## 8359   8359            mother anticipation
## 8360   8360            mother          joy
## 8361   8361            mother     negative
## 8362   8362            mother     positive
## 8363   8363            mother      sadness
## 8364   8364            mother        trust
## 8365   8365        motherhood          joy
## 8366   8366        motherhood     positive
## 8367   8367        motherhood        trust
## 8368   8368            motion anticipation
## 8369   8369            motive     positive
## 8370   8370          mountain anticipation
## 8371   8371             mourn     negative
## 8372   8372             mourn      sadness
## 8373   8373          mournful        anger
## 8374   8374          mournful         fear
## 8375   8375          mournful     negative
## 8376   8376          mournful      sadness
## 8377   8377          mourning     negative
## 8378   8378          mourning      sadness
## 8379   8379             mouth     surprise
## 8380   8380          mouthful      disgust
## 8381   8381           movable     positive
## 8382   8382             mover     positive
## 8383   8383              muck      disgust
## 8384   8384              muck     negative
## 8385   8385            mucous      disgust
## 8386   8386             mucus      disgust
## 8387   8387               mud     negative
## 8388   8388            muddle     negative
## 8389   8389           muddled     negative
## 8390   8390             muddy      disgust
## 8391   8391             muddy     negative
## 8392   8392              muff        anger
## 8393   8393              muff      disgust
## 8394   8394              muff     negative
## 8395   8395               mug        anger
## 8396   8396               mug         fear
## 8397   8397               mug     negative
## 8398   8398               mug     positive
## 8399   8399               mug      sadness
## 8400   8400              mule        anger
## 8401   8401              mule     negative
## 8402   8402              mule        trust
## 8403   8403               mum         fear
## 8404   8404               mum     negative
## 8405   8405            mumble     negative
## 8406   8406             mumps     negative
## 8407   8407            murder        anger
## 8408   8408            murder      disgust
## 8409   8409            murder         fear
## 8410   8410            murder     negative
## 8411   8411            murder      sadness
## 8412   8412            murder     surprise
## 8413   8413          murderer        anger
## 8414   8414          murderer      disgust
## 8415   8415          murderer         fear
## 8416   8416          murderer     negative
## 8417   8417          murderer      sadness
## 8418   8418         murderous        anger
## 8419   8419         murderous      disgust
## 8420   8420         murderous         fear
## 8421   8421         murderous     negative
## 8422   8422         murderous      sadness
## 8423   8423         murderous     surprise
## 8424   8424             murky      disgust
## 8425   8425             murky     negative
## 8426   8426             murky      sadness
## 8427   8427          muscular     positive
## 8428   8428             music          joy
## 8429   8429             music     positive
## 8430   8430             music      sadness
## 8431   8431           musical        anger
## 8432   8432           musical anticipation
## 8433   8433           musical          joy
## 8434   8434           musical     positive
## 8435   8435           musical      sadness
## 8436   8436           musical     surprise
## 8437   8437           musical        trust
## 8438   8438            musket         fear
## 8439   8439              muss     negative
## 8440   8440             musty      disgust
## 8441   8441             musty     negative
## 8442   8442           mutable anticipation
## 8443   8443           mutable     positive
## 8444   8444            mutant     negative
## 8445   8445         mutilated      disgust
## 8446   8446         mutilated     negative
## 8447   8447        mutilation        anger
## 8448   8448        mutilation      disgust
## 8449   8449        mutilation         fear
## 8450   8450        mutilation     negative
## 8451   8451        mutilation      sadness
## 8452   8452            mutiny        anger
## 8453   8453            mutiny      disgust
## 8454   8454            mutiny         fear
## 8455   8455            mutiny     negative
## 8456   8456            mutiny     surprise
## 8457   8457            mutter        anger
## 8458   8458            mutter     negative
## 8459   8459            mutual     positive
## 8460   8460            muzzle         fear
## 8461   8461            muzzle     negative
## 8462   8462            myopia        anger
## 8463   8463            myopia     negative
## 8464   8464            myopia      sadness
## 8465   8465        mysterious anticipation
## 8466   8466        mysterious         fear
## 8467   8467        mysterious     surprise
## 8468   8468           mystery anticipation
## 8469   8469           mystery     surprise
## 8470   8470            mystic     surprise
## 8471   8471               nab     negative
## 8472   8472               nab     surprise
## 8473   8473             nadir     negative
## 8474   8474               nag        anger
## 8475   8475               nag     negative
## 8476   8476             naive     negative
## 8477   8477          nameless      disgust
## 8478   8478          nameless     negative
## 8479   8479               nap          joy
## 8480   8480               nap     positive
## 8481   8481            napkin      sadness
## 8482   8482             nappy      disgust
## 8483   8483             nappy     negative
## 8484   8484          narcotic     negative
## 8485   8485           nascent anticipation
## 8486   8486             nasty        anger
## 8487   8487             nasty      disgust
## 8488   8488             nasty         fear
## 8489   8489             nasty     negative
## 8490   8490             nasty      sadness
## 8491   8491            nation        trust
## 8492   8492        naturalist     positive
## 8493   8493           naughty     negative
## 8494   8494            nausea      disgust
## 8495   8495            nausea     negative
## 8496   8496          nauseous      disgust
## 8497   8497          nauseous     negative
## 8498   8498          nauseous      sadness
## 8499   8499         navigable anticipation
## 8500   8500         navigable     positive
## 8501   8501         navigator anticipation
## 8502   8502         navigator        trust
## 8503   8503               nay     negative
## 8504   8504            neatly     positive
## 8505   8505         necessity      sadness
## 8506   8506            nectar     positive
## 8507   8507           needful     negative
## 8508   8508            needle     positive
## 8509   8509             needy     negative
## 8510   8510         nefarious      disgust
## 8511   8511         nefarious         fear
## 8512   8512         nefarious     negative
## 8513   8513         nefarious      sadness
## 8514   8514         nefarious     surprise
## 8515   8515          negation        anger
## 8516   8516          negation     negative
## 8517   8517          negative     negative
## 8518   8518          negative      sadness
## 8519   8519           neglect     negative
## 8520   8520         neglected        anger
## 8521   8521         neglected      disgust
## 8522   8522         neglected     negative
## 8523   8523         neglected      sadness
## 8524   8524        neglecting     negative
## 8525   8525        negligence     negative
## 8526   8526         negligent     negative
## 8527   8527       negligently     negative
## 8528   8528         negotiate     positive
## 8529   8529         negotiate        trust
## 8530   8530        negotiator     positive
## 8531   8531             negro     negative
## 8532   8532             negro      sadness
## 8533   8533          neighbor anticipation
## 8534   8534          neighbor     positive
## 8535   8535          neighbor        trust
## 8536   8536      neighborhood anticipation
## 8537   8537          nepotism        anger
## 8538   8538          nepotism      disgust
## 8539   8539          nepotism     negative
## 8540   8540          nepotism      sadness
## 8541   8541             nerve     positive
## 8542   8542           nervous anticipation
## 8543   8543           nervous         fear
## 8544   8544           nervous     negative
## 8545   8545       nervousness         fear
## 8546   8546              nest        trust
## 8547   8547            nestle     positive
## 8548   8548            nestle        trust
## 8549   8549            nether        anger
## 8550   8550            nether         fear
## 8551   8551            nether     negative
## 8552   8552            nether      sadness
## 8553   8553            nettle        anger
## 8554   8554            nettle      disgust
## 8555   8555            nettle     negative
## 8556   8556           network anticipation
## 8557   8557         neuralgia         fear
## 8558   8558         neuralgia     negative
## 8559   8559         neuralgia      sadness
## 8560   8560          neurosis         fear
## 8561   8561          neurosis     negative
## 8562   8562          neurosis      sadness
## 8563   8563          neurotic      disgust
## 8564   8564          neurotic         fear
## 8565   8565          neurotic     negative
## 8566   8566           neutral anticipation
## 8567   8567           neutral        trust
## 8568   8568        neutrality        trust
## 8569   8569          newcomer         fear
## 8570   8570          newcomer     surprise
## 8571   8571          nicotine      disgust
## 8572   8572          nicotine     negative
## 8573   8573         nightmare         fear
## 8574   8574         nightmare     negative
## 8575   8575          nihilism     negative
## 8576   8576          nobility anticipation
## 8577   8577          nobility     positive
## 8578   8578          nobility        trust
## 8579   8579             noble     positive
## 8580   8580             noble        trust
## 8581   8581          nobleman     positive
## 8582   8582          nobleman        trust
## 8583   8583             noise     negative
## 8584   8584             noisy        anger
## 8585   8585             noisy     negative
## 8586   8586        nomination     positive
## 8587   8587     noncompliance        anger
## 8588   8588     noncompliance anticipation
## 8589   8589     noncompliance         fear
## 8590   8590     noncompliance     negative
## 8591   8591     noncompliance      sadness
## 8592   8592          nonsense     negative
## 8593   8593       nonsensical     negative
## 8594   8594       nonsensical      sadness
## 8595   8595             noose     negative
## 8596   8596             noose      sadness
## 8597   8597         normality     positive
## 8598   8598              nose      disgust
## 8599   8599           notable          joy
## 8600   8600           notable     positive
## 8601   8601           notable        trust
## 8602   8602          notables     positive
## 8603   8603            notary        trust
## 8604   8604             noted     positive
## 8605   8605       nothingness     negative
## 8606   8606       nothingness      sadness
## 8607   8607      notification anticipation
## 8608   8608            notion     positive
## 8609   8609         notoriety        anger
## 8610   8610         notoriety      disgust
## 8611   8611         notoriety         fear
## 8612   8612         notoriety     negative
## 8613   8613         notoriety     positive
## 8614   8614       nourishment     positive
## 8615   8615           noxious      disgust
## 8616   8616           noxious         fear
## 8617   8617           noxious     negative
## 8618   8618          nuisance        anger
## 8619   8619          nuisance     negative
## 8620   8620               nul     negative
## 8621   8621           nullify     negative
## 8622   8622           nullify     surprise
## 8623   8623              numb     negative
## 8624   8624           numbers     positive
## 8625   8625          numbness     negative
## 8626   8626          numbness      sadness
## 8627   8627               nun     negative
## 8628   8628               nun        trust
## 8629   8629             nurse     positive
## 8630   8630             nurse        trust
## 8631   8631           nursery          joy
## 8632   8632           nursery     positive
## 8633   8633           nursery        trust
## 8634   8634           nurture        anger
## 8635   8635           nurture anticipation
## 8636   8636           nurture      disgust
## 8637   8637           nurture         fear
## 8638   8638           nurture          joy
## 8639   8639           nurture     positive
## 8640   8640           nurture        trust
## 8641   8641        nutritious     positive
## 8642   8642        nutritious      sadness
## 8643   8643               oaf     negative
## 8644   8644               oak     positive
## 8645   8645             oasis anticipation
## 8646   8646             oasis          joy
## 8647   8647             oasis     positive
## 8648   8648             oasis        trust
## 8649   8649              oath     positive
## 8650   8650              oath        trust
## 8651   8651         obedience     positive
## 8652   8652         obedience        trust
## 8653   8653             obese      disgust
## 8654   8654             obese     negative
## 8655   8655           obesity      disgust
## 8656   8656           obesity     negative
## 8657   8657           obesity      sadness
## 8658   8658              obey         fear
## 8659   8659              obey        trust
## 8660   8660               obi      disgust
## 8661   8661               obi         fear
## 8662   8662               obi     negative
## 8663   8663              obit     negative
## 8664   8664              obit      sadness
## 8665   8665              obit     surprise
## 8666   8666          obituary     negative
## 8667   8667          obituary      sadness
## 8668   8668         objection        anger
## 8669   8669         objection     negative
## 8670   8670     objectionable     negative
## 8671   8671         objective anticipation
## 8672   8672         objective     positive
## 8673   8673         objective        trust
## 8674   8674            oblige     negative
## 8675   8675            oblige        trust
## 8676   8676          obliging        anger
## 8677   8677          obliging anticipation
## 8678   8678          obliging      disgust
## 8679   8679          obliging         fear
## 8680   8680          obliging          joy
## 8681   8681          obliging     positive
## 8682   8682          obliging     surprise
## 8683   8683          obliging        trust
## 8684   8684           obligor         fear
## 8685   8685           obligor     negative
## 8686   8686        obliterate        anger
## 8687   8687        obliterate         fear
## 8688   8688        obliterate     negative
## 8689   8689        obliterate      sadness
## 8690   8690       obliterated        anger
## 8691   8691       obliterated         fear
## 8692   8692       obliterated     negative
## 8693   8693      obliteration         fear
## 8694   8694      obliteration     negative
## 8695   8695      obliteration      sadness
## 8696   8696          oblivion        anger
## 8697   8697          oblivion         fear
## 8698   8698          oblivion     negative
## 8699   8699         obnoxious        anger
## 8700   8700         obnoxious      disgust
## 8701   8701         obnoxious     negative
## 8702   8702         obnoxious      sadness
## 8703   8703           obscene      disgust
## 8704   8704           obscene     negative
## 8705   8705         obscenity        anger
## 8706   8706         obscenity      disgust
## 8707   8707         obscenity     negative
## 8708   8708         obscurity     negative
## 8709   8709         observant     positive
## 8710   8710          obstacle        anger
## 8711   8711          obstacle         fear
## 8712   8712          obstacle     negative
## 8713   8713          obstacle      sadness
## 8714   8714      obstetrician        trust
## 8715   8715         obstinate     negative
## 8716   8716          obstruct        anger
## 8717   8717          obstruct         fear
## 8718   8718          obstruct     negative
## 8719   8719       obstruction     negative
## 8720   8720       obstructive        anger
## 8721   8721       obstructive     negative
## 8722   8722        obtainable          joy
## 8723   8723        obtainable     positive
## 8724   8724            obtuse     negative
## 8725   8725           obvious     positive
## 8726   8726           obvious        trust
## 8727   8727        occasional     surprise
## 8728   8728            occult      disgust
## 8729   8729            occult         fear
## 8730   8730            occult     negative
## 8731   8731          occupant     positive
## 8732   8732          occupant        trust
## 8733   8733        occupation     positive
## 8734   8734            occupy     positive
## 8735   8735           octopus      disgust
## 8736   8736            oddity      disgust
## 8737   8737            oddity     negative
## 8738   8738            oddity      sadness
## 8739   8739            oddity     surprise
## 8740   8740            odious        anger
## 8741   8741            odious      disgust
## 8742   8742            odious         fear
## 8743   8743            odious     negative
## 8744   8744              odor     negative
## 8745   8745            offend        anger
## 8746   8746            offend      disgust
## 8747   8747            offend     negative
## 8748   8748          offended        anger
## 8749   8749          offended     negative
## 8750   8750          offended      sadness
## 8751   8751          offender        anger
## 8752   8752          offender      disgust
## 8753   8753          offender         fear
## 8754   8754          offender     negative
## 8755   8755          offender      sadness
## 8756   8756           offense        anger
## 8757   8757           offense      disgust
## 8758   8758           offense         fear
## 8759   8759           offense     negative
## 8760   8760           offense      sadness
## 8761   8761         offensive        anger
## 8762   8762         offensive      disgust
## 8763   8763         offensive     negative
## 8764   8764             offer     positive
## 8765   8765          offering        trust
## 8766   8766           offhand     negative
## 8767   8767           officer     positive
## 8768   8768           officer        trust
## 8769   8769          official        trust
## 8770   8770            offing     negative
## 8771   8771            offset anticipation
## 8772   8772            offset     positive
## 8773   8773          offshoot     positive
## 8774   8774              ogre      disgust
## 8775   8775              ogre         fear
## 8776   8776              ogre     negative
## 8777   8777         olfactory anticipation
## 8778   8778         olfactory     negative
## 8779   8779         oligarchy     negative
## 8780   8780              omen anticipation
## 8781   8781              omen         fear
## 8782   8782              omen     negative
## 8783   8783           ominous anticipation
## 8784   8784           ominous         fear
## 8785   8785           ominous     negative
## 8786   8786              omit     negative
## 8787   8787       omnipotence         fear
## 8788   8788       omnipotence     negative
## 8789   8789       omnipotence     positive
## 8790   8790        omniscient     positive
## 8791   8791        omniscient        trust
## 8792   8792           onerous        anger
## 8793   8793           onerous     negative
## 8794   8794           onerous      sadness
## 8795   8795           ongoing anticipation
## 8796   8796             onset anticipation
## 8797   8797              onus     negative
## 8798   8798              ooze      disgust
## 8799   8799              ooze     negative
## 8800   8800            opaque     negative
## 8801   8801          openness     positive
## 8802   8802             opera        anger
## 8803   8803             opera anticipation
## 8804   8804             opera         fear
## 8805   8805             opera          joy
## 8806   8806             opera     positive
## 8807   8807             opera      sadness
## 8808   8808             opera     surprise
## 8809   8809             opera        trust
## 8810   8810          operatic     negative
## 8811   8811         operation         fear
## 8812   8812         operation        trust
## 8813   8813            opiate     negative
## 8814   8814       opinionated        anger
## 8815   8815       opinionated     negative
## 8816   8816             opium        anger
## 8817   8817             opium      disgust
## 8818   8818             opium         fear
## 8819   8819             opium     negative
## 8820   8820             opium      sadness
## 8821   8821          opponent        anger
## 8822   8822          opponent anticipation
## 8823   8823          opponent      disgust
## 8824   8824          opponent         fear
## 8825   8825          opponent     negative
## 8826   8826         opportune          joy
## 8827   8827         opportune     positive
## 8828   8828       opportunity anticipation
## 8829   8829       opportunity     positive
## 8830   8830            oppose     negative
## 8831   8831           opposed        anger
## 8832   8832           opposed         fear
## 8833   8833           opposed     negative
## 8834   8834        opposition        anger
## 8835   8835        opposition     negative
## 8836   8836           oppress        anger
## 8837   8837           oppress      disgust
## 8838   8838           oppress         fear
## 8839   8839           oppress     negative
## 8840   8840           oppress      sadness
## 8841   8841        oppression        anger
## 8842   8842        oppression      disgust
## 8843   8843        oppression         fear
## 8844   8844        oppression     negative
## 8845   8845        oppression      sadness
## 8846   8846        oppressive        anger
## 8847   8847        oppressive      disgust
## 8848   8848        oppressive         fear
## 8849   8849        oppressive     negative
## 8850   8850        oppressive      sadness
## 8851   8851         oppressor        anger
## 8852   8852         oppressor         fear
## 8853   8853         oppressor     negative
## 8854   8854         oppressor      sadness
## 8855   8855          optimism anticipation
## 8856   8856          optimism          joy
## 8857   8857          optimism     positive
## 8858   8858          optimism     surprise
## 8859   8859          optimism        trust
## 8860   8860          optimist     positive
## 8861   8861          optimist        trust
## 8862   8862            option     positive
## 8863   8863          optional     positive
## 8864   8864            oracle anticipation
## 8865   8865            oracle     positive
## 8866   8866            oracle        trust
## 8867   8867           oration     positive
## 8868   8868               orc        anger
## 8869   8869               orc      disgust
## 8870   8870               orc         fear
## 8871   8871               orc     negative
## 8872   8872         orchestra        anger
## 8873   8873         orchestra          joy
## 8874   8874         orchestra     positive
## 8875   8875         orchestra      sadness
## 8876   8876         orchestra        trust
## 8877   8877          ordained     positive
## 8878   8878          ordained        trust
## 8879   8879            ordeal        anger
## 8880   8880            ordeal     negative
## 8881   8881            ordeal     surprise
## 8882   8882           orderly     positive
## 8883   8883         ordinance        trust
## 8884   8884        ordination anticipation
## 8885   8885        ordination          joy
## 8886   8886        ordination     positive
## 8887   8887        ordination        trust
## 8888   8888          ordnance         fear
## 8889   8889          ordnance     negative
## 8890   8890             organ anticipation
## 8891   8891             organ          joy
## 8892   8892           organic     positive
## 8893   8893      organization anticipation
## 8894   8894      organization          joy
## 8895   8895      organization     positive
## 8896   8896      organization     surprise
## 8897   8897      organization        trust
## 8898   8898          organize     positive
## 8899   8899         organized     positive
## 8900   8900            orgasm anticipation
## 8901   8901            orgasm          joy
## 8902   8902            orgasm     positive
## 8903   8903       originality     positive
## 8904   8904       originality     surprise
## 8905   8905        ornamented     positive
## 8906   8906            ornate     positive
## 8907   8907            orphan         fear
## 8908   8908            orphan     negative
## 8909   8909            orphan      sadness
## 8910   8910         orthodoxy        trust
## 8911   8911        ostensibly     negative
## 8912   8912              oust        anger
## 8913   8913              oust     negative
## 8914   8914              oust      sadness
## 8915   8915          outburst        anger
## 8916   8916          outburst         fear
## 8917   8917          outburst          joy
## 8918   8918          outburst     negative
## 8919   8919          outburst     positive
## 8920   8920          outburst      sadness
## 8921   8921          outburst     surprise
## 8922   8922           outcast      disgust
## 8923   8923           outcast         fear
## 8924   8924           outcast     negative
## 8925   8925           outcast      sadness
## 8926   8926           outcome     positive
## 8927   8927            outcry        anger
## 8928   8928            outcry         fear
## 8929   8929            outcry     negative
## 8930   8930            outcry     surprise
## 8931   8931             outdo anticipation
## 8932   8932             outdo     positive
## 8933   8933          outhouse      disgust
## 8934   8934          outhouse     negative
## 8935   8935        outlandish     negative
## 8936   8936            outlaw     negative
## 8937   8937           outpost         fear
## 8938   8938           outrage        anger
## 8939   8939           outrage      disgust
## 8940   8940           outrage     negative
## 8941   8941        outrageous     surprise
## 8942   8942          outsider         fear
## 8943   8943       outstanding          joy
## 8944   8944       outstanding     negative
## 8945   8945       outstanding     positive
## 8946   8946           outward     positive
## 8947   8947           ovation     negative
## 8948   8948           ovation      sadness
## 8949   8949       overbearing        anger
## 8950   8950       overbearing     negative
## 8951   8951        overburden     negative
## 8952   8952          overcast     negative
## 8953   8953            overdo     negative
## 8954   8954          overdose     negative
## 8955   8955           overdue anticipation
## 8956   8956           overdue     negative
## 8957   8957           overdue      sadness
## 8958   8958           overdue     surprise
## 8959   8959      overestimate     surprise
## 8960   8960     overestimated     negative
## 8961   8961          overflow     negative
## 8962   8962         overgrown     negative
## 8963   8963         overjoyed          joy
## 8964   8964         overjoyed     positive
## 8965   8965          overload     negative
## 8966   8966          overload      sadness
## 8967   8967          overpaid     negative
## 8968   8968         overpower     negative
## 8969   8969      overpowering        anger
## 8970   8970      overpowering         fear
## 8971   8971      overpowering     negative
## 8972   8972        overpriced        anger
## 8973   8973        overpriced      disgust
## 8974   8974        overpriced     negative
## 8975   8975        overpriced      sadness
## 8976   8976         oversight     negative
## 8977   8977             overt         fear
## 8978   8978         overthrow anticipation
## 8979   8979         overthrow         fear
## 8980   8980         overthrow     negative
## 8981   8981          overture anticipation
## 8982   8982          overturn     negative
## 8983   8983         overwhelm     negative
## 8984   8984       overwhelmed     negative
## 8985   8985       overwhelmed      sadness
## 8986   8986      overwhelming     positive
## 8987   8987             owing        anger
## 8988   8988             owing anticipation
## 8989   8989             owing      disgust
## 8990   8990             owing         fear
## 8991   8991             owing     negative
## 8992   8992             owing      sadness
## 8993   8993             owing        trust
## 8994   8994         ownership     positive
## 8995   8995         oxidation     negative
## 8996   8996           pacific     positive
## 8997   8997              pact        trust
## 8998   8998               pad     positive
## 8999   8999           padding     positive
## 9000   9000            paddle anticipation
## 9001   9001            paddle     positive
## 9002   9002              pain         fear
## 9003   9003              pain     negative
## 9004   9004              pain      sadness
## 9005   9005            pained         fear
## 9006   9006            pained     negative
## 9007   9007            pained      sadness
## 9008   9008           painful        anger
## 9009   9009           painful      disgust
## 9010   9010           painful         fear
## 9011   9011           painful     negative
## 9012   9012           painful      sadness
## 9013   9013         painfully     negative
## 9014   9014         painfully      sadness
## 9015   9015             pains     negative
## 9016   9016         palatable     positive
## 9017   9017        palliative     positive
## 9018   9018          palpable     surprise
## 9019   9019             palsy      disgust
## 9020   9020             palsy         fear
## 9021   9021             palsy     negative
## 9022   9022             palsy      sadness
## 9023   9023           panacea     positive
## 9024   9024           panache     positive
## 9025   9025          pandemic         fear
## 9026   9026          pandemic     negative
## 9027   9027          pandemic      sadness
## 9028   9028              pang     negative
## 9029   9029              pang     surprise
## 9030   9030             panic         fear
## 9031   9031             panic     negative
## 9032   9032            panier     positive
## 9033   9033           paprika     positive
## 9034   9034         parachute         fear
## 9035   9035            parade anticipation
## 9036   9036            parade         fear
## 9037   9037            parade          joy
## 9038   9038            parade     negative
## 9039   9039            parade     positive
## 9040   9040            parade     surprise
## 9041   9041           paragon anticipation
## 9042   9042           paragon          joy
## 9043   9043           paragon     positive
## 9044   9044           paragon        trust
## 9045   9045         paralysis        anger
## 9046   9046         paralysis anticipation
## 9047   9047         paralysis         fear
## 9048   9048         paralysis     negative
## 9049   9049         paralysis      sadness
## 9050   9050         paramount     positive
## 9051   9051          paranoia         fear
## 9052   9052          paranoia     negative
## 9053   9053        paraphrase     negative
## 9054   9054        paraphrase     positive
## 9055   9055          parasite      disgust
## 9056   9056          parasite         fear
## 9057   9057          parasite     negative
## 9058   9058            pardon     positive
## 9059   9059              pare        anger
## 9060   9060              pare anticipation
## 9061   9061              pare         fear
## 9062   9062              pare     negative
## 9063   9063              pare      sadness
## 9064   9064         parentage     positive
## 9065   9065          parietal     positive
## 9066   9066          parietal        trust
## 9067   9067            parish        trust
## 9068   9068        parliament        trust
## 9069   9069            parole anticipation
## 9070   9070            parrot      disgust
## 9071   9071            parrot     negative
## 9072   9072      parsimonious     negative
## 9073   9073           partake     positive
## 9074   9074           partake        trust
## 9075   9075     participation     positive
## 9076   9076           parting      sadness
## 9077   9077          partisan     negative
## 9078   9078           partner     positive
## 9079   9079       partnership     positive
## 9080   9080       partnership        trust
## 9081   9081             passe     negative
## 9082   9082         passenger anticipation
## 9083   9083           passion anticipation
## 9084   9084           passion          joy
## 9085   9085           passion     positive
## 9086   9086           passion        trust
## 9087   9087        passionate anticipation
## 9088   9088        passionate          joy
## 9089   9089        passionate     positive
## 9090   9090        passionate        trust
## 9091   9091           passive     negative
## 9092   9092         passivity     negative
## 9093   9093           pastime     positive
## 9094   9094            pastor          joy
## 9095   9095            pastor     positive
## 9096   9096            pastor        trust
## 9097   9097            pastry          joy
## 9098   9098            pastry     positive
## 9099   9099           pasture     positive
## 9100   9100             patch     negative
## 9101   9101            patent     positive
## 9102   9102          pathetic      disgust
## 9103   9103          pathetic     negative
## 9104   9104          pathetic      sadness
## 9105   9105          patience anticipation
## 9106   9106          patience     positive
## 9107   9107          patience        trust
## 9108   9108           patient anticipation
## 9109   9109           patient     positive
## 9110   9110       patriarchal     positive
## 9111   9111       patriarchal        trust
## 9112   9112            patrol        trust
## 9113   9113            patron     positive
## 9114   9114            patron        trust
## 9115   9115         patronage     positive
## 9116   9116         patronage        trust
## 9117   9117       patronizing     negative
## 9118   9118            patter        anger
## 9119   9119            patter     negative
## 9120   9120           paucity        anger
## 9121   9121           paucity      disgust
## 9122   9122           paucity     negative
## 9123   9123           paucity      sadness
## 9124   9124            pauper     negative
## 9125   9125            pauper      sadness
## 9126   9126          pavement        trust
## 9127   9127              pawn     negative
## 9128   9128              pawn        trust
## 9129   9129               pay anticipation
## 9130   9130               pay          joy
## 9131   9131               pay     positive
## 9132   9132               pay        trust
## 9133   9133           payback        anger
## 9134   9134           payback     negative
## 9135   9135           payment     negative
## 9136   9136             peace anticipation
## 9137   9137             peace          joy
## 9138   9138             peace     positive
## 9139   9139             peace        trust
## 9140   9140         peaceable     positive
## 9141   9141          peaceful anticipation
## 9142   9142          peaceful          joy
## 9143   9143          peaceful     positive
## 9144   9144          peaceful     surprise
## 9145   9145          peaceful        trust
## 9146   9146           peacock     positive
## 9147   9147              peck     positive
## 9148   9148     peculiarities     negative
## 9149   9149       peculiarity     positive
## 9150   9150        pedestrian     negative
## 9151   9151          pedigree     positive
## 9152   9152          pedigree        trust
## 9153   9153          peerless     positive
## 9154   9154             penal         fear
## 9155   9155             penal     negative
## 9156   9156             penal      sadness
## 9157   9157           penalty        anger
## 9158   9158           penalty         fear
## 9159   9159           penalty     negative
## 9160   9160           penalty      sadness
## 9161   9161           penance         fear
## 9162   9162           penance      sadness
## 9163   9163          penchant     positive
## 9164   9164       penetration        anger
## 9165   9165       penetration         fear
## 9166   9166       penetration     negative
## 9167   9167      penitentiary        anger
## 9168   9168      penitentiary     negative
## 9169   9169           pensive      sadness
## 9170   9170          perceive     positive
## 9171   9171          perceive        trust
## 9172   9172       perceptible     positive
## 9173   9173         perchance     surprise
## 9174   9174         perdition        anger
## 9175   9175         perdition      disgust
## 9176   9176         perdition         fear
## 9177   9177         perdition     negative
## 9178   9178         perdition      sadness
## 9179   9179         perennial     positive
## 9180   9180         perennial        trust
## 9181   9181           perfect anticipation
## 9182   9182           perfect          joy
## 9183   9183           perfect     positive
## 9184   9184           perfect        trust
## 9185   9185        perfection anticipation
## 9186   9186        perfection          joy
## 9187   9187        perfection     positive
## 9188   9188        perfection     surprise
## 9189   9189        perfection        trust
## 9190   9190         performer     positive
## 9191   9191              peri     surprise
## 9192   9192             peril anticipation
## 9193   9193             peril         fear
## 9194   9194             peril     negative
## 9195   9195             peril      sadness
## 9196   9196          perilous anticipation
## 9197   9197          perilous         fear
## 9198   9198          perilous     negative
## 9199   9199          perilous      sadness
## 9200   9200       periodicity        trust
## 9201   9201            perish         fear
## 9202   9202            perish     negative
## 9203   9203            perish      sadness
## 9204   9204        perishable     negative
## 9205   9205          perished     negative
## 9206   9206          perished      sadness
## 9207   9207         perishing         fear
## 9208   9208         perishing     negative
## 9209   9209         perishing      sadness
## 9210   9210           perjury         fear
## 9211   9211           perjury     negative
## 9212   9212           perjury     surprise
## 9213   9213              perk     positive
## 9214   9214        permission     positive
## 9215   9215        pernicious        anger
## 9216   9216        pernicious         fear
## 9217   9217        pernicious     negative
## 9218   9218        pernicious      sadness
## 9219   9219       perpetrator        anger
## 9220   9220       perpetrator      disgust
## 9221   9221       perpetrator         fear
## 9222   9222       perpetrator     negative
## 9223   9223       perpetrator      sadness
## 9224   9224        perpetuate anticipation
## 9225   9225      perpetuation     negative
## 9226   9226        perpetuity anticipation
## 9227   9227        perpetuity     positive
## 9228   9228        perpetuity        trust
## 9229   9229         perplexed     negative
## 9230   9230        perplexity     negative
## 9231   9231        perplexity      sadness
## 9232   9232         persecute        anger
## 9233   9233         persecute         fear
## 9234   9234         persecute     negative
## 9235   9235       persecution        anger
## 9236   9236       persecution      disgust
## 9237   9237       persecution         fear
## 9238   9238       persecution     negative
## 9239   9239       persecution      sadness
## 9240   9240       persistence     positive
## 9241   9241        persistent     positive
## 9242   9242        personable     positive
## 9243   9243          personal        trust
## 9244   9244      perspiration      disgust
## 9245   9245          persuade        trust
## 9246   9246         pertinent     positive
## 9247   9247         pertinent        trust
## 9248   9248      perturbation         fear
## 9249   9249      perturbation     negative
## 9250   9250         pertussis     negative
## 9251   9251          perverse        anger
## 9252   9252          perverse      disgust
## 9253   9253          perverse         fear
## 9254   9254          perverse     negative
## 9255   9255        perversion        anger
## 9256   9256        perversion      disgust
## 9257   9257        perversion     negative
## 9258   9258        perversion      sadness
## 9259   9259           pervert        anger
## 9260   9260           pervert      disgust
## 9261   9261           pervert     negative
## 9262   9262         perverted      disgust
## 9263   9263         perverted     negative
## 9264   9264         pessimism        anger
## 9265   9265         pessimism         fear
## 9266   9266         pessimism     negative
## 9267   9267         pessimism      sadness
## 9268   9268         pessimist         fear
## 9269   9269         pessimist     negative
## 9270   9270         pessimist      sadness
## 9271   9271              pest        anger
## 9272   9272              pest      disgust
## 9273   9273              pest         fear
## 9274   9274              pest     negative
## 9275   9275        pestilence      disgust
## 9276   9276        pestilence         fear
## 9277   9277        pestilence     negative
## 9278   9278               pet     negative
## 9279   9279         petroleum      disgust
## 9280   9280         petroleum     negative
## 9281   9281         petroleum     positive
## 9282   9282             petty     negative
## 9283   9283           phalanx         fear
## 9284   9284           phalanx        trust
## 9285   9285           phantom         fear
## 9286   9286           phantom     negative
## 9287   9287    pharmaceutical     positive
## 9288   9288     philanthropic        trust
## 9289   9289    philanthropist     positive
## 9290   9290    philanthropist        trust
## 9291   9291      philanthropy     positive
## 9292   9292       philosopher     positive
## 9293   9293       philosopher        trust
## 9294   9294            phlegm      disgust
## 9295   9295            phlegm     negative
## 9296   9296           phoenix     positive
## 9297   9297          phonetic     positive
## 9298   9298             phony        anger
## 9299   9299             phony      disgust
## 9300   9300             phony     negative
## 9301   9301         physician     positive
## 9302   9302         physician        trust
## 9303   9303         physicist        trust
## 9304   9304           physics     positive
## 9305   9305        physiology     positive
## 9306   9306          physique     positive
## 9307   9307              pick     positive
## 9308   9308            picket        anger
## 9309   9309            picket anticipation
## 9310   9310            picket         fear
## 9311   9311            picket     negative
## 9312   9312         picketing        anger
## 9313   9313         picketing     negative
## 9314   9314            pickle     negative
## 9315   9315            picnic anticipation
## 9316   9316            picnic          joy
## 9317   9317            picnic     positive
## 9318   9318            picnic     surprise
## 9319   9319            picnic        trust
## 9320   9320       picturesque          joy
## 9321   9321       picturesque     positive
## 9322   9322             piety     positive
## 9323   9323               pig      disgust
## 9324   9324               pig     negative
## 9325   9325            pigeon     negative
## 9326   9326             piles      disgust
## 9327   9327             piles     negative
## 9328   9328              pill     positive
## 9329   9329              pill        trust
## 9330   9330           pillage        anger
## 9331   9331           pillage      disgust
## 9332   9332           pillage         fear
## 9333   9333           pillage     negative
## 9334   9334            pillow     positive
## 9335   9335             pilot     positive
## 9336   9336             pilot        trust
## 9337   9337              pimp     negative
## 9338   9338            pimple      disgust
## 9339   9339            pimple     negative
## 9340   9340              pine     negative
## 9341   9341              pine      sadness
## 9342   9342            pinion         fear
## 9343   9343            pinion     negative
## 9344   9344          pinnacle     positive
## 9345   9345           pioneer     positive
## 9346   9346             pious      disgust
## 9347   9347             pious     positive
## 9348   9348             pious      sadness
## 9349   9349             pious        trust
## 9350   9350             pique        anger
## 9351   9351             pique     negative
## 9352   9352            piracy     negative
## 9353   9353            pirate        anger
## 9354   9354            pirate     negative
## 9355   9355            pistol     negative
## 9356   9356           pitfall        anger
## 9357   9357           pitfall      disgust
## 9358   9358           pitfall         fear
## 9359   9359           pitfall     negative
## 9360   9360           pitfall      sadness
## 9361   9361           pitfall     surprise
## 9362   9362              pith     positive
## 9363   9363              pith        trust
## 9364   9364              pity      sadness
## 9365   9365             pivot     positive
## 9366   9366             pivot        trust
## 9367   9367           placard     surprise
## 9368   9368            placid     positive
## 9369   9369        plagiarism      disgust
## 9370   9370        plagiarism     negative
## 9371   9371            plague      disgust
## 9372   9372            plague         fear
## 9373   9373            plague     negative
## 9374   9374            plague      sadness
## 9375   9375         plaintiff     negative
## 9376   9376         plaintive      sadness
## 9377   9377              plan anticipation
## 9378   9378          planning anticipation
## 9379   9379          planning     positive
## 9380   9380          planning        trust
## 9381   9381            plated     negative
## 9382   9382            player     negative
## 9383   9383           playful        anger
## 9384   9384           playful          joy
## 9385   9385           playful     positive
## 9386   9386           playful     surprise
## 9387   9387           playful        trust
## 9388   9388        playground anticipation
## 9389   9389        playground          joy
## 9390   9390        playground     positive
## 9391   9391        playground     surprise
## 9392   9392        playground        trust
## 9393   9393         playhouse          joy
## 9394   9394         playhouse     positive
## 9395   9395              plea anticipation
## 9396   9396              plea         fear
## 9397   9397              plea     negative
## 9398   9398              plea      sadness
## 9399   9399          pleasant anticipation
## 9400   9400          pleasant          joy
## 9401   9401          pleasant     positive
## 9402   9402          pleasant     surprise
## 9403   9403          pleasant        trust
## 9404   9404           pleased          joy
## 9405   9405           pleased     positive
## 9406   9406       pleasurable          joy
## 9407   9407       pleasurable     positive
## 9408   9408            pledge          joy
## 9409   9409            pledge     positive
## 9410   9410            pledge        trust
## 9411   9411           plenary     positive
## 9412   9412         plentiful     positive
## 9413   9413            plexus     positive
## 9414   9414            plight anticipation
## 9415   9415            plight      disgust
## 9416   9416            plight         fear
## 9417   9417            plight     negative
## 9418   9418            plight      sadness
## 9419   9419          plodding     negative
## 9420   9420              plum     positive
## 9421   9421             plumb     positive
## 9422   9422           plummet         fear
## 9423   9423           plummet     negative
## 9424   9424             plump anticipation
## 9425   9425           plunder        anger
## 9426   9426           plunder      disgust
## 9427   9427           plunder         fear
## 9428   9428           plunder     negative
## 9429   9429           plunder      sadness
## 9430   9430           plunder     surprise
## 9431   9431            plunge         fear
## 9432   9432            plunge     negative
## 9433   9433             plush     positive
## 9434   9434               ply     positive
## 9435   9435         pneumonia         fear
## 9436   9436         pneumonia     negative
## 9437   9437          poaching        anger
## 9438   9438          poaching      disgust
## 9439   9439          poaching         fear
## 9440   9440          poaching     negative
## 9441   9441          poaching      sadness
## 9442   9442         pointedly     positive
## 9443   9443         pointless     negative
## 9444   9444         pointless      sadness
## 9445   9445            poison        anger
## 9446   9446            poison      disgust
## 9447   9447            poison         fear
## 9448   9448            poison     negative
## 9449   9449            poison      sadness
## 9450   9450          poisoned        anger
## 9451   9451          poisoned      disgust
## 9452   9452          poisoned         fear
## 9453   9453          poisoned     negative
## 9454   9454          poisoned      sadness
## 9455   9455         poisoning      disgust
## 9456   9456         poisoning     negative
## 9457   9457         poisonous        anger
## 9458   9458         poisonous      disgust
## 9459   9459         poisonous         fear
## 9460   9460         poisonous     negative
## 9461   9461         poisonous      sadness
## 9462   9462              poke anticipation
## 9463   9463              poke     negative
## 9464   9464          polarity     surprise
## 9465   9465           polemic        anger
## 9466   9466           polemic      disgust
## 9467   9467           polemic     negative
## 9468   9468            police         fear
## 9469   9469            police     positive
## 9470   9470            police        trust
## 9471   9471         policeman         fear
## 9472   9472         policeman     positive
## 9473   9473         policeman        trust
## 9474   9474            policy        trust
## 9475   9475             polio         fear
## 9476   9476             polio     negative
## 9477   9477             polio      sadness
## 9478   9478            polish     positive
## 9479   9479          polished     positive
## 9480   9480            polite     positive
## 9481   9481        politeness     positive
## 9482   9482           politic      disgust
## 9483   9483           politic     positive
## 9484   9484          politics        anger
## 9485   9485              poll        trust
## 9486   9486           pollute      disgust
## 9487   9487           pollute     negative
## 9488   9488         pollution      disgust
## 9489   9489         pollution     negative
## 9490   9490          polygamy      disgust
## 9491   9491          polygamy     negative
## 9492   9492              pomp     negative
## 9493   9493           pompous      disgust
## 9494   9494           pompous     negative
## 9495   9495         ponderous     negative
## 9496   9496           pontiff        trust
## 9497   9497              pool     positive
## 9498   9498            poorly     negative
## 9499   9499               pop     negative
## 9500   9500               pop     surprise
## 9501   9501              pope     positive
## 9502   9502        popularity     positive
## 9503   9503       popularized     positive
## 9504   9504        population     positive
## 9505   9505         porcupine     negative
## 9506   9506              porn      disgust
## 9507   9507              porn     negative
## 9508   9508             porno     negative
## 9509   9509      pornographic     negative
## 9510   9510       pornography      disgust
## 9511   9511       pornography     negative
## 9512   9512          portable     positive
## 9513   9513              pose     negative
## 9514   9514             posse         fear
## 9515   9515           possess anticipation
## 9516   9516           possess          joy
## 9517   9517           possess     positive
## 9518   9518           possess        trust
## 9519   9519         possessed        anger
## 9520   9520         possessed      disgust
## 9521   9521         possessed         fear
## 9522   9522         possessed     negative
## 9523   9523        possession        anger
## 9524   9524        possession      disgust
## 9525   9525        possession         fear
## 9526   9526        possession     negative
## 9527   9527       possibility anticipation
## 9528   9528        posthumous     negative
## 9529   9529        posthumous      sadness
## 9530   9530      postponement     negative
## 9531   9531      postponement     surprise
## 9532   9532           potable     positive
## 9533   9533           potency     positive
## 9534   9534             pound        anger
## 9535   9535             pound     negative
## 9536   9536           poverty        anger
## 9537   9537           poverty      disgust
## 9538   9538           poverty         fear
## 9539   9539           poverty     negative
## 9540   9540           poverty      sadness
## 9541   9541               pow        anger
## 9542   9542          powerful        anger
## 9543   9543          powerful anticipation
## 9544   9544          powerful      disgust
## 9545   9545          powerful         fear
## 9546   9546          powerful          joy
## 9547   9547          powerful     positive
## 9548   9548          powerful        trust
## 9549   9549        powerfully         fear
## 9550   9550        powerfully     positive
## 9551   9551         powerless        anger
## 9552   9552         powerless      disgust
## 9553   9553         powerless         fear
## 9554   9554         powerless     negative
## 9555   9555         powerless      sadness
## 9556   9556          practice     positive
## 9557   9557         practiced          joy
## 9558   9558         practiced     positive
## 9559   9559         practiced     surprise
## 9560   9560         practiced        trust
## 9561   9561          practise anticipation
## 9562   9562          practise     positive
## 9563   9563            praise          joy
## 9564   9564            praise     positive
## 9565   9565            praise        trust
## 9566   9566           praised          joy
## 9567   9567           praised     positive
## 9568   9568      praiseworthy anticipation
## 9569   9569      praiseworthy          joy
## 9570   9570      praiseworthy     positive
## 9571   9571      praiseworthy     surprise
## 9572   9572      praiseworthy        trust
## 9573   9573             prank     negative
## 9574   9574             prank     surprise
## 9575   9575              pray anticipation
## 9576   9576              pray         fear
## 9577   9577              pray          joy
## 9578   9578              pray     positive
## 9579   9579              pray     surprise
## 9580   9580              pray        trust
## 9581   9581        precarious anticipation
## 9582   9582        precarious         fear
## 9583   9583        precarious     negative
## 9584   9584        precarious      sadness
## 9585   9585        precaution     positive
## 9586   9586           precede     positive
## 9587   9587        precedence     positive
## 9588   9588        precedence        trust
## 9589   9589          precinct     negative
## 9590   9590          precious anticipation
## 9591   9591          precious          joy
## 9592   9592          precious     positive
## 9593   9593          precious     surprise
## 9594   9594         precipice         fear
## 9595   9595           precise     positive
## 9596   9596         precision     positive
## 9597   9597          preclude        anger
## 9598   9598         precursor anticipation
## 9599   9599         predatory     negative
## 9600   9600       predicament         fear
## 9601   9601       predicament     negative
## 9602   9602           predict anticipation
## 9603   9603        prediction anticipation
## 9604   9604      predilection anticipation
## 9605   9605      predilection     positive
## 9606   9606        predispose anticipation
## 9607   9607       predominant     positive
## 9608   9608       predominant        trust
## 9609   9609        preeminent     positive
## 9610   9610            prefer     positive
## 9611   9611            prefer        trust
## 9612   9612         pregnancy      disgust
## 9613   9613         pregnancy     negative
## 9614   9614         prejudice        anger
## 9615   9615         prejudice     negative
## 9616   9616        prejudiced      disgust
## 9617   9617        prejudiced         fear
## 9618   9618        prejudiced     negative
## 9619   9619       prejudicial        anger
## 9620   9620       prejudicial     negative
## 9621   9621       preliminary anticipation
## 9622   9622         premature     surprise
## 9623   9623      premeditated         fear
## 9624   9624      premeditated     negative
## 9625   9625           premier     positive
## 9626   9626          premises     positive
## 9627   9627       preparation anticipation
## 9628   9628       preparatory anticipation
## 9629   9629           prepare anticipation
## 9630   9630           prepare     positive
## 9631   9631          prepared anticipation
## 9632   9632          prepared     positive
## 9633   9633          prepared        trust
## 9634   9634      preparedness anticipation
## 9635   9635     preponderance        trust
## 9636   9636      prerequisite anticipation
## 9637   9637         prescient anticipation
## 9638   9638         prescient     positive
## 9639   9639          presence     positive
## 9640   9640           present anticipation
## 9641   9641           present          joy
## 9642   9642           present     positive
## 9643   9643           present     surprise
## 9644   9644           present        trust
## 9645   9645       presentable     positive
## 9646   9646       presentment     negative
## 9647   9647       presentment     positive
## 9648   9648      preservative anticipation
## 9649   9649      preservative          joy
## 9650   9650      preservative     positive
## 9651   9651      preservative     surprise
## 9652   9652      preservative        trust
## 9653   9653          preserve     positive
## 9654   9654         president     positive
## 9655   9655         president        trust
## 9656   9656          pressure     negative
## 9657   9657          prestige          joy
## 9658   9658          prestige     positive
## 9659   9659          prestige        trust
## 9660   9660            presto          joy
## 9661   9661            presto     positive
## 9662   9662            presto     surprise
## 9663   9663       presumption        trust
## 9664   9664      presumptuous        anger
## 9665   9665      presumptuous      disgust
## 9666   9666      presumptuous     negative
## 9667   9667           pretend     negative
## 9668   9668         pretended     negative
## 9669   9669        pretending        anger
## 9670   9670        pretending     negative
## 9671   9671          pretense     negative
## 9672   9672       pretensions     negative
## 9673   9673            pretty anticipation
## 9674   9674            pretty          joy
## 9675   9675            pretty     positive
## 9676   9676            pretty        trust
## 9677   9677           prevail anticipation
## 9678   9678           prevail          joy
## 9679   9679           prevail     positive
## 9680   9680         prevalent        trust
## 9681   9681           prevent         fear
## 9682   9682        prevention anticipation
## 9683   9683        prevention     positive
## 9684   9684        preventive     negative
## 9685   9685              prey         fear
## 9686   9686              prey     negative
## 9687   9687         priceless     positive
## 9688   9688             prick        anger
## 9689   9689             prick      disgust
## 9690   9690             prick         fear
## 9691   9691             prick     negative
## 9692   9692             prick     surprise
## 9693   9693           prickly     negative
## 9694   9694             pride          joy
## 9695   9695             pride     positive
## 9696   9696            priest     positive
## 9697   9697            priest        trust
## 9698   9698        priesthood anticipation
## 9699   9699        priesthood          joy
## 9700   9700        priesthood     positive
## 9701   9701        priesthood      sadness
## 9702   9702        priesthood        trust
## 9703   9703          priestly     positive
## 9704   9704           primacy     positive
## 9705   9705           primary     positive
## 9706   9706             prime     positive
## 9707   9707            primer     positive
## 9708   9708            primer        trust
## 9709   9709            prince     positive
## 9710   9710          princely anticipation
## 9711   9711          princely          joy
## 9712   9712          princely     positive
## 9713   9713          princely     surprise
## 9714   9714          princely        trust
## 9715   9715          princess     positive
## 9716   9716         principal     positive
## 9717   9717         principal        trust
## 9718   9718            prison        anger
## 9719   9719            prison         fear
## 9720   9720            prison     negative
## 9721   9721            prison      sadness
## 9722   9722          prisoner        anger
## 9723   9723          prisoner      disgust
## 9724   9724          prisoner         fear
## 9725   9725          prisoner     negative
## 9726   9726          prisoner      sadness
## 9727   9727          pristine     positive
## 9728   9728        privileged          joy
## 9729   9729        privileged     positive
## 9730   9730        privileged        trust
## 9731   9731             privy     negative
## 9732   9732             privy        trust
## 9733   9733       probability anticipation
## 9734   9734         probation anticipation
## 9735   9735         probation         fear
## 9736   9736         probation      sadness
## 9737   9737           probity     positive
## 9738   9738           probity        trust
## 9739   9739           problem         fear
## 9740   9740           problem     negative
## 9741   9741           problem      sadness
## 9742   9742         procedure         fear
## 9743   9743         procedure     positive
## 9744   9744        proceeding anticipation
## 9745   9745        procession          joy
## 9746   9746        procession     positive
## 9747   9747        procession      sadness
## 9748   9748        procession     surprise
## 9749   9749     procrastinate     negative
## 9750   9750   procrastination     negative
## 9751   9751           proctor     positive
## 9752   9752           proctor        trust
## 9753   9753           procure     positive
## 9754   9754          prodigal     negative
## 9755   9755          prodigal     positive
## 9756   9756        prodigious     positive
## 9757   9757           prodigy     positive
## 9758   9758          producer     positive
## 9759   9759         producing     positive
## 9760   9760        production anticipation
## 9761   9761        production     positive
## 9762   9762        productive     positive
## 9763   9763      productivity     positive
## 9764   9764           profane        anger
## 9765   9765           profane     negative
## 9766   9766         profanity        anger
## 9767   9767         profanity     negative
## 9768   9768        profession     positive
## 9769   9769      professional     positive
## 9770   9770      professional        trust
## 9771   9771         professor     positive
## 9772   9772         professor        trust
## 9773   9773     professorship        trust
## 9774   9774       proficiency anticipation
## 9775   9775       proficiency          joy
## 9776   9776       proficiency     positive
## 9777   9777       proficiency     surprise
## 9778   9778       proficiency        trust
## 9779   9779        proficient     positive
## 9780   9780        proficient        trust
## 9781   9781           profuse     positive
## 9782   9782         profusion     negative
## 9783   9783         prognosis anticipation
## 9784   9784         prognosis         fear
## 9785   9785        prognostic anticipation
## 9786   9786          progress anticipation
## 9787   9787          progress          joy
## 9788   9788          progress     positive
## 9789   9789       progression anticipation
## 9790   9790       progression          joy
## 9791   9791       progression     positive
## 9792   9792       progression      sadness
## 9793   9793       progression        trust
## 9794   9794       progressive     positive
## 9795   9795        prohibited        anger
## 9796   9796        prohibited      disgust
## 9797   9797        prohibited         fear
## 9798   9798        prohibited     negative
## 9799   9799       prohibition     negative
## 9800   9800        projectile         fear
## 9801   9801       projectiles         fear
## 9802   9802          prolific     positive
## 9803   9803          prologue anticipation
## 9804   9804           prolong      disgust
## 9805   9805           prolong     negative
## 9806   9806        prominence     positive
## 9807   9807       prominently     positive
## 9808   9808       promiscuous     negative
## 9809   9809           promise          joy
## 9810   9810           promise     positive
## 9811   9811           promise        trust
## 9812   9812         promising     positive
## 9813   9813         promotion     positive
## 9814   9814             proof        trust
## 9815   9815              prop     positive
## 9816   9816        propaganda     negative
## 9817   9817            proper     positive
## 9818   9818          prophecy anticipation
## 9819   9819           prophet anticipation
## 9820   9820           prophet     positive
## 9821   9821           prophet        trust
## 9822   9822         prophetic anticipation
## 9823   9823      prophylactic anticipation
## 9824   9824      prophylactic     positive
## 9825   9825      prophylactic        trust
## 9826   9826       proposition     positive
## 9827   9827         prosecute        anger
## 9828   9828         prosecute         fear
## 9829   9829         prosecute     negative
## 9830   9830         prosecute      sadness
## 9831   9831       prosecution      disgust
## 9832   9832       prosecution     negative
## 9833   9833          prospect     positive
## 9834   9834     prospectively anticipation
## 9835   9835           prosper anticipation
## 9836   9836           prosper          joy
## 9837   9837           prosper     positive
## 9838   9838        prosperity     positive
## 9839   9839        prosperous          joy
## 9840   9840        prosperous     positive
## 9841   9841        prostitute      disgust
## 9842   9842        prostitute     negative
## 9843   9843      prostitution      disgust
## 9844   9844      prostitution     negative
## 9845   9845      prostitution      sadness
## 9846   9846           protect     positive
## 9847   9847         protected        trust
## 9848   9848        protecting     positive
## 9849   9849        protecting        trust
## 9850   9850        protective     positive
## 9851   9851         protector     positive
## 9852   9852         protector        trust
## 9853   9853             proud anticipation
## 9854   9854             proud          joy
## 9855   9855             proud     positive
## 9856   9856             proud        trust
## 9857   9857             prove     positive
## 9858   9858            proven        trust
## 9859   9859        proverbial     positive
## 9860   9860           provide     positive
## 9861   9861           provide        trust
## 9862   9862         providing anticipation
## 9863   9863         providing          joy
## 9864   9864         providing     positive
## 9865   9865         providing        trust
## 9866   9866           proviso        trust
## 9867   9867       provocation        anger
## 9868   9868       provocation     negative
## 9869   9869         provoking        anger
## 9870   9870         provoking      disgust
## 9871   9871         provoking     negative
## 9872   9872             prowl         fear
## 9873   9873             prowl     surprise
## 9874   9874             proxy        trust
## 9875   9875          prudence     positive
## 9876   9876           prudent     positive
## 9877   9877           prudent        trust
## 9878   9878               pry        anger
## 9879   9879               pry anticipation
## 9880   9880               pry     negative
## 9881   9881               pry        trust
## 9882   9882            prying     negative
## 9883   9883             psalm     positive
## 9884   9884         psychosis        anger
## 9885   9885         psychosis         fear
## 9886   9886         psychosis     negative
## 9887   9887         psychosis      sadness
## 9888   9888            public anticipation
## 9889   9889            public     positive
## 9890   9890         publicist     negative
## 9891   9891             puffy     negative
## 9892   9892              puke      disgust
## 9893   9893              pull     positive
## 9894   9894            pulpit     positive
## 9895   9895              puma         fear
## 9896   9896              puma     surprise
## 9897   9897             punch        anger
## 9898   9898             punch         fear
## 9899   9899             punch     negative
## 9900   9900             punch      sadness
## 9901   9901             punch     surprise
## 9902   9902          punctual anticipation
## 9903   9903          punctual     positive
## 9904   9904          punctual        trust
## 9905   9905       punctuality     positive
## 9906   9906           pungent      disgust
## 9907   9907           pungent     negative
## 9908   9908            punish         fear
## 9909   9909            punish     negative
## 9910   9910          punished        anger
## 9911   9911          punished anticipation
## 9912   9912          punished      disgust
## 9913   9913          punished         fear
## 9914   9914          punished     negative
## 9915   9915          punished      sadness
## 9916   9916         punishing        anger
## 9917   9917         punishing         fear
## 9918   9918         punishing     negative
## 9919   9919         punishing      sadness
## 9920   9920        punishment        anger
## 9921   9921        punishment      disgust
## 9922   9922        punishment         fear
## 9923   9923        punishment     negative
## 9924   9924          punitive        anger
## 9925   9925          punitive         fear
## 9926   9926          punitive     negative
## 9927   9927          punitive      sadness
## 9928   9928              punt anticipation
## 9929   9929             puppy anticipation
## 9930   9930             puppy     positive
## 9931   9931             puppy        trust
## 9932   9932            purely     positive
## 9933   9933            purely        trust
## 9934   9934         purgatory      disgust
## 9935   9935         purgatory         fear
## 9936   9936         purgatory     negative
## 9937   9937             purge         fear
## 9938   9938             purge     negative
## 9939   9939      purification     positive
## 9940   9940      purification        trust
## 9941   9941            purify          joy
## 9942   9942            purify     positive
## 9943   9943            purify        trust
## 9944   9944            purist     positive
## 9945   9945            purity     positive
## 9946   9946            purity     surprise
## 9947   9947              purr          joy
## 9948   9948              purr     positive
## 9949   9949              purr        trust
## 9950   9950               pus      disgust
## 9951   9951               pus     negative
## 9952   9952          putative        trust
## 9953   9953             quack      disgust
## 9954   9954             quack     negative
## 9955   9955          quagmire      disgust
## 9956   9956          quagmire     negative
## 9957   9957             quail         fear
## 9958   9958             quail     negative
## 9959   9959            quaint          joy
## 9960   9960            quaint     positive
## 9961   9961            quaint        trust
## 9962   9962             quake         fear
## 9963   9963         qualified     positive
## 9964   9964         qualified        trust
## 9965   9965        qualifying     positive
## 9966   9966          quandary        anger
## 9967   9967          quandary         fear
## 9968   9968          quandary     negative
## 9969   9969        quarantine         fear
## 9970   9970           quarrel        anger
## 9971   9971           quarrel     negative
## 9972   9972             quash         fear
## 9973   9973             quash     negative
## 9974   9974             quell     negative
## 9975   9975             quest anticipation
## 9976   9976             quest     positive
## 9977   9977          question     positive
## 9978   9978      questionable      disgust
## 9979   9979      questionable     negative
## 9980   9980           quicken anticipation
## 9981   9981         quickness     positive
## 9982   9982         quickness     surprise
## 9983   9983       quicksilver     negative
## 9984   9984       quicksilver     surprise
## 9985   9985         quiescent     positive
## 9986   9986             quiet     positive
## 9987   9987             quiet      sadness
## 9988   9988           quinine     positive
## 9989   9989              quit     negative
## 9990   9990            quiver         fear
## 9991   9991            quiver     negative
## 9992   9992         quivering         fear
## 9993   9993         quivering     negative
## 9994   9994              quiz     negative
## 9995   9995             quote anticipation
## 9996   9996             quote     negative
## 9997   9997             quote     positive
## 9998   9998             quote     surprise
## 9999   9999            rabble        anger
## 10000 10000            rabble         fear
## 10001 10001            rabble     negative
## 10002 10002             rabid        anger
## 10003 10003             rabid anticipation
## 10004 10004             rabid      disgust
## 10005 10005             rabid         fear
## 10006 10006             rabid     negative
## 10007 10007             rabid      sadness
## 10008 10008            rabies     negative
## 10009 10009              rack     negative
## 10010 10010              rack      sadness
## 10011 10011            racket     negative
## 10012 10012             radar        trust
## 10013 10013          radiance anticipation
## 10014 10014          radiance          joy
## 10015 10015          radiance     positive
## 10016 10016          radiance        trust
## 10017 10017           radiant          joy
## 10018 10018           radiant     positive
## 10019 10019           radiate     positive
## 10020 10020         radiation         fear
## 10021 10021         radiation     negative
## 10022 10022             radio     positive
## 10023 10023       radioactive         fear
## 10024 10024       radioactive     negative
## 10025 10025             radon         fear
## 10026 10026             radon     negative
## 10027 10027            raffle anticipation
## 10028 10028            raffle     surprise
## 10029 10029              rage        anger
## 10030 10030              rage     negative
## 10031 10031            raging        anger
## 10032 10032            raging      disgust
## 10033 10033            raging         fear
## 10034 10034            raging     negative
## 10035 10035              rags      disgust
## 10036 10036              rags     negative
## 10037 10037              raid        anger
## 10038 10038              raid         fear
## 10039 10039              raid     negative
## 10040 10040              raid     surprise
## 10041 10041              rail        anger
## 10042 10042              rail anticipation
## 10043 10043              rail     negative
## 10044 10044             rainy      sadness
## 10045 10045               ram        anger
## 10046 10046               ram anticipation
## 10047 10047               ram     negative
## 10048 10048          rambling     negative
## 10049 10049           rampage        anger
## 10050 10050           rampage         fear
## 10051 10051           rampage     negative
## 10052 10052            rancid      disgust
## 10053 10053            rancid     negative
## 10054 10054          randomly     surprise
## 10055 10055            ranger        trust
## 10056 10056            ransom        anger
## 10057 10057            ransom         fear
## 10058 10058            ransom     negative
## 10059 10059              rape        anger
## 10060 10060              rape      disgust
## 10061 10061              rape         fear
## 10062 10062              rape     negative
## 10063 10063              rape      sadness
## 10064 10064             rapid     surprise
## 10065 10065           rapping        anger
## 10066 10066              rapt          joy
## 10067 10067              rapt     positive
## 10068 10068              rapt     surprise
## 10069 10069              rapt        trust
## 10070 10070           raptors         fear
## 10071 10071           raptors     negative
## 10072 10072           rapture anticipation
## 10073 10073           rapture          joy
## 10074 10074           rapture     positive
## 10075 10075            rarity     surprise
## 10076 10076            rascal        anger
## 10077 10077            rascal      disgust
## 10078 10078            rascal         fear
## 10079 10079            rascal     negative
## 10080 10080              rash      disgust
## 10081 10081              rash     negative
## 10082 10082               rat      disgust
## 10083 10083               rat         fear
## 10084 10084               rat     negative
## 10085 10085            ratify        trust
## 10086 10086            rating        anger
## 10087 10087            rating         fear
## 10088 10088            rating     negative
## 10089 10089            rating      sadness
## 10090 10090          rational     positive
## 10091 10091          rational        trust
## 10092 10092       rattlesnake         fear
## 10093 10093           raucous     negative
## 10094 10094              rave        anger
## 10095 10095              rave      disgust
## 10096 10096              rave          joy
## 10097 10097              rave     negative
## 10098 10098              rave     positive
## 10099 10099              rave     surprise
## 10100 10100              rave        trust
## 10101 10101          ravenous        anger
## 10102 10102          ravenous         fear
## 10103 10103          ravenous     negative
## 10104 10104          ravenous      sadness
## 10105 10105            ravine         fear
## 10106 10106            raving        anger
## 10107 10107            raving anticipation
## 10108 10108            raving         fear
## 10109 10109            raving          joy
## 10110 10110            raving     negative
## 10111 10111            raving     surprise
## 10112 10112             razor         fear
## 10113 10113             react        anger
## 10114 10114             react         fear
## 10115 10115       reactionary     negative
## 10116 10116            reader     positive
## 10117 10117           readily     positive
## 10118 10118         readiness anticipation
## 10119 10119         readiness          joy
## 10120 10120         readiness     positive
## 10121 10121         readiness        trust
## 10122 10122           reading     positive
## 10123 10123             ready anticipation
## 10124 10124          reaffirm     positive
## 10125 10125              real     positive
## 10126 10126              real        trust
## 10127 10127          reappear     surprise
## 10128 10128              rear     negative
## 10129 10129            reason     positive
## 10130 10130       reassurance     positive
## 10131 10131       reassurance        trust
## 10132 10132          reassure     positive
## 10133 10133          reassure        trust
## 10134 10134            rebate     positive
## 10135 10135             rebel        anger
## 10136 10136             rebel         fear
## 10137 10137             rebel     negative
## 10138 10138         rebellion        anger
## 10139 10139         rebellion      disgust
## 10140 10140         rebellion         fear
## 10141 10141            rebuke     negative
## 10142 10142             rebut     negative
## 10143 10143      recalcitrant        anger
## 10144 10144      recalcitrant      disgust
## 10145 10145      recalcitrant     negative
## 10146 10146            recast     positive
## 10147 10147          received     positive
## 10148 10148         receiving anticipation
## 10149 10149         receiving          joy
## 10150 10150         receiving     positive
## 10151 10151         receiving     surprise
## 10152 10152          recesses         fear
## 10153 10153         recession        anger
## 10154 10154         recession      disgust
## 10155 10155         recession         fear
## 10156 10156         recession     negative
## 10157 10157         recession      sadness
## 10158 10158         recherche     positive
## 10159 10159        recidivism        anger
## 10160 10160        recidivism      disgust
## 10161 10161        recidivism     negative
## 10162 10162        recidivism      sadness
## 10163 10163         recipient anticipation
## 10164 10164       reciprocate     positive
## 10165 10165          reckless        anger
## 10166 10166          reckless         fear
## 10167 10167          reckless     negative
## 10168 10168      recklessness        anger
## 10169 10169      recklessness      disgust
## 10170 10170      recklessness         fear
## 10171 10171      recklessness     negative
## 10172 10172      recklessness     surprise
## 10173 10173       reclamation     positive
## 10174 10174           recline     positive
## 10175 10175           recline        trust
## 10176 10176      recognizable anticipation
## 10177 10177      recognizable     positive
## 10178 10178     recombination anticipation
## 10179 10179         recommend     positive
## 10180 10180         recommend        trust
## 10181 10181    reconciliation anticipation
## 10182 10182    reconciliation          joy
## 10183 10183    reconciliation     positive
## 10184 10184    reconciliation        trust
## 10185 10185   reconsideration     positive
## 10186 10186   reconsideration        trust
## 10187 10187       reconstruct anticipation
## 10188 10188       reconstruct     positive
## 10189 10189    reconstruction anticipation
## 10190 10190    reconstruction     positive
## 10191 10191          recorder     positive
## 10192 10192            recoup     positive
## 10193 10193          recovery     positive
## 10194 10194        recreation anticipation
## 10195 10195        recreation          joy
## 10196 10196        recreation     positive
## 10197 10197      recreational anticipation
## 10198 10198      recreational          joy
## 10199 10199      recreational     positive
## 10200 10200          recruits        trust
## 10201 10201           rectify     positive
## 10202 10202         recurrent anticipation
## 10203 10203        redemption     positive
## 10204 10204           redress     positive
## 10205 10205         redundant     negative
## 10206 10206           referee        trust
## 10207 10207            refine     positive
## 10208 10208        refinement     positive
## 10209 10209            reflex     surprise
## 10210 10210            reflux      disgust
## 10211 10211            reflux     negative
## 10212 10212            reform     positive
## 10213 10213       reformation     positive
## 10214 10214          reformer     positive
## 10215 10215        refractory     negative
## 10216 10216        refreshing     positive
## 10217 10217           refugee      sadness
## 10218 10218         refurbish     positive
## 10219 10219           refusal     negative
## 10220 10220            refuse     negative
## 10221 10221           refused     negative
## 10222 10222           refused      sadness
## 10223 10223        refutation         fear
## 10224 10224             regal     positive
## 10225 10225             regal        trust
## 10226 10226           regatta anticipation
## 10227 10227            regent     positive
## 10228 10228            regent        trust
## 10229 10229          regiment         fear
## 10230 10230          registry        trust
## 10231 10231           regress     negative
## 10232 10232        regression     negative
## 10233 10233        regressive     negative
## 10234 10234        regressive     positive
## 10235 10235            regret     negative
## 10236 10236            regret      sadness
## 10237 10237       regrettable     negative
## 10238 10238       regrettable      sadness
## 10239 10239         regretted     negative
## 10240 10240         regretted      sadness
## 10241 10241        regretting     negative
## 10242 10242        regretting      sadness
## 10243 10243        regularity anticipation
## 10244 10244        regularity     positive
## 10245 10245        regularity        trust
## 10246 10246          regulate     positive
## 10247 10247        regulatory         fear
## 10248 10248        regulatory     negative
## 10249 10249     regurgitation      disgust
## 10250 10250      rehabilitate     positive
## 10251 10251    rehabilitation anticipation
## 10252 10252    rehabilitation     positive
## 10253 10253         reimburse     positive
## 10254 10254     reimbursement     positive
## 10255 10255     reimbursement        trust
## 10256 10256              rein     negative
## 10257 10257     reinforcement     positive
## 10258 10258     reinforcement        trust
## 10259 10259    reinforcements        trust
## 10260 10260         reinstate     positive
## 10261 10261            reject        anger
## 10262 10262            reject         fear
## 10263 10263            reject     negative
## 10264 10264            reject      sadness
## 10265 10265          rejected     negative
## 10266 10266         rejection        anger
## 10267 10267         rejection      disgust
## 10268 10268         rejection         fear
## 10269 10269         rejection     negative
## 10270 10270         rejection      sadness
## 10271 10271           rejects        anger
## 10272 10272           rejects         fear
## 10273 10273           rejects     negative
## 10274 10274           rejects      sadness
## 10275 10275           rejoice anticipation
## 10276 10276           rejoice          joy
## 10277 10277           rejoice     positive
## 10278 10278           rejoice     surprise
## 10279 10279           rejoice        trust
## 10280 10280         rejoicing anticipation
## 10281 10281         rejoicing          joy
## 10282 10282         rejoicing     positive
## 10283 10283         rejoicing     surprise
## 10284 10284        rejuvenate     positive
## 10285 10285       rejuvenated     positive
## 10286 10286          rekindle anticipation
## 10287 10287          rekindle         fear
## 10288 10288          rekindle          joy
## 10289 10289          rekindle     negative
## 10290 10290          rekindle     positive
## 10291 10291          rekindle     surprise
## 10292 10292           relapse         fear
## 10293 10293           relapse     negative
## 10294 10294           relapse      sadness
## 10295 10295           related        trust
## 10296 10296          relative        trust
## 10297 10297        relaxation     positive
## 10298 10298        relegation     negative
## 10299 10299          relevant     positive
## 10300 10300          relevant        trust
## 10301 10301       reliability     positive
## 10302 10302       reliability        trust
## 10303 10303          reliable     positive
## 10304 10304          reliable        trust
## 10305 10305          reliance     positive
## 10306 10306          reliance        trust
## 10307 10307            relics      sadness
## 10308 10308            relief     positive
## 10309 10309         relieving     positive
## 10310 10310          religion        trust
## 10311 10311        relinquish     negative
## 10312 10312         reluctant         fear
## 10313 10313         reluctant     negative
## 10314 10314           remains      disgust
## 10315 10315           remains         fear
## 10316 10316           remains     negative
## 10317 10317           remains     positive
## 10318 10318           remains        trust
## 10319 10319            remake     positive
## 10320 10320            remand        anger
## 10321 10321            remand     negative
## 10322 10322        remarkable          joy
## 10323 10323        remarkable     positive
## 10324 10324        remarkable     surprise
## 10325 10325        remarkable        trust
## 10326 10326        remarkably     positive
## 10327 10327          remedial     negative
## 10328 10328            remedy anticipation
## 10329 10329            remedy          joy
## 10330 10330            remedy     positive
## 10331 10331            remedy        trust
## 10332 10332            remiss        anger
## 10333 10333            remiss      disgust
## 10334 10334            remiss     negative
## 10335 10335            remiss      sadness
## 10336 10336         remission     positive
## 10337 10337           remodel     positive
## 10338 10338           remorse     negative
## 10339 10339           remorse      sadness
## 10340 10340           removal     negative
## 10341 10341            remove        anger
## 10342 10342            remove         fear
## 10343 10343            remove     negative
## 10344 10344            remove      sadness
## 10345 10345       renaissance     positive
## 10346 10346         rencontre     negative
## 10347 10347              rend     negative
## 10348 10348            render     positive
## 10349 10349          renegade        anger
## 10350 10350          renegade     negative
## 10351 10351           renewal     positive
## 10352 10352          renounce        anger
## 10353 10353          renounce     negative
## 10354 10354          renovate anticipation
## 10355 10355          renovate     positive
## 10356 10356        renovation anticipation
## 10357 10357        renovation          joy
## 10358 10358        renovation     positive
## 10359 10359            renown     positive
## 10360 10360          renowned     positive
## 10361 10361      renunciation     negative
## 10362 10362        reorganize     positive
## 10363 10363        reparation     positive
## 10364 10364        reparation        trust
## 10365 10365             repay        anger
## 10366 10366             repay anticipation
## 10367 10367             repay          joy
## 10368 10368             repay     positive
## 10369 10369             repay        trust
## 10370 10370         repellant      disgust
## 10371 10371         repellant         fear
## 10372 10372         repellant     negative
## 10373 10373         repellent        anger
## 10374 10374         repellent      disgust
## 10375 10375         repellent         fear
## 10376 10376         repellent     negative
## 10377 10377         repelling      disgust
## 10378 10378         repelling     negative
## 10379 10379            repent         fear
## 10380 10380            repent     positive
## 10381 10381         replenish     positive
## 10382 10382           replete     positive
## 10383 10383          reporter     positive
## 10384 10384          reporter        trust
## 10385 10385            repose     positive
## 10386 10386       represented     positive
## 10387 10387      representing anticipation
## 10388 10388           repress     negative
## 10389 10389           repress      sadness
## 10390 10390        repression         fear
## 10391 10391        repression     negative
## 10392 10392         reprimand        anger
## 10393 10393         reprimand     negative
## 10394 10394           reprint     negative
## 10395 10395          reprisal        anger
## 10396 10396          reprisal         fear
## 10397 10397          reprisal     negative
## 10398 10398          reprisal      sadness
## 10399 10399          reproach        anger
## 10400 10400          reproach      disgust
## 10401 10401          reproach     negative
## 10402 10402          reproach      sadness
## 10403 10403      reproductive          joy
## 10404 10404      reproductive     positive
## 10405 10405          republic     negative
## 10406 10406       repudiation        anger
## 10407 10407       repudiation      disgust
## 10408 10408       repudiation     negative
## 10409 10409         repulsion      disgust
## 10410 10410         repulsion         fear
## 10411 10411         repulsion     negative
## 10412 10412         reputable     positive
## 10413 10413         reputable        trust
## 10414 10414           requiem      sadness
## 10415 10415           rescind     negative
## 10416 10416        rescission     negative
## 10417 10417            rescue anticipation
## 10418 10418            rescue          joy
## 10419 10419            rescue     positive
## 10420 10420            rescue     surprise
## 10421 10421            rescue        trust
## 10422 10422         resection         fear
## 10423 10423            resent        anger
## 10424 10424            resent     negative
## 10425 10425         resentful        anger
## 10426 10426         resentful     negative
## 10427 10427        resentment        anger
## 10428 10428        resentment      disgust
## 10429 10429        resentment     negative
## 10430 10430        resentment      sadness
## 10431 10431           reserve     positive
## 10432 10432          resident     positive
## 10433 10433            resign        anger
## 10434 10434            resign      disgust
## 10435 10435            resign         fear
## 10436 10436            resign     negative
## 10437 10437            resign      sadness
## 10438 10438       resignation     negative
## 10439 10439       resignation      sadness
## 10440 10440       resignation     surprise
## 10441 10441          resigned     negative
## 10442 10442          resigned      sadness
## 10443 10443         resilient     positive
## 10444 10444            resist     negative
## 10445 10445        resistance        anger
## 10446 10446        resistance     negative
## 10447 10447         resistant         fear
## 10448 10448         resistant     negative
## 10449 10449         resisting        anger
## 10450 10450         resisting         fear
## 10451 10451         resisting     negative
## 10452 10452         resisting      sadness
## 10453 10453         resistive     positive
## 10454 10454        resolutely     positive
## 10455 10455         resources          joy
## 10456 10456         resources     positive
## 10457 10457         resources        trust
## 10458 10458           respect anticipation
## 10459 10459           respect          joy
## 10460 10460           respect     positive
## 10461 10461           respect        trust
## 10462 10462    respectability     positive
## 10463 10463       respectable     positive
## 10464 10464       respectable        trust
## 10465 10465        respectful     positive
## 10466 10466        respectful        trust
## 10467 10467        respecting     positive
## 10468 10468          respects     positive
## 10469 10469          respects        trust
## 10470 10470           respite          joy
## 10471 10471           respite     positive
## 10472 10472           respite        trust
## 10473 10473       resplendent          joy
## 10474 10474       resplendent     positive
## 10475 10475       responsible     positive
## 10476 10476       responsible        trust
## 10477 10477        responsive anticipation
## 10478 10478        responsive     positive
## 10479 10479        responsive        trust
## 10480 10480              rest     positive
## 10481 10481           restful     positive
## 10482 10482       restitution        anger
## 10483 10483       restitution     positive
## 10484 10484      restlessness anticipation
## 10485 10485       restorative anticipation
## 10486 10486       restorative          joy
## 10487 10487       restorative     positive
## 10488 10488       restorative        trust
## 10489 10489         restoring     positive
## 10490 10490          restrain        anger
## 10491 10491          restrain         fear
## 10492 10492          restrain     negative
## 10493 10493        restrained         fear
## 10494 10494         restraint     positive
## 10495 10495          restrict     negative
## 10496 10496          restrict      sadness
## 10497 10497       restriction        anger
## 10498 10498       restriction         fear
## 10499 10499       restriction     negative
## 10500 10500       restriction      sadness
## 10501 10501       restrictive     negative
## 10502 10502            result anticipation
## 10503 10503         resultant anticipation
## 10504 10504        resumption     positive
## 10505 10505            retain        trust
## 10506 10506         retaliate        anger
## 10507 10507         retaliate     negative
## 10508 10508       retaliation        anger
## 10509 10509       retaliation         fear
## 10510 10510       retaliation     negative
## 10511 10511       retaliatory        anger
## 10512 10512       retaliatory     negative
## 10513 10513            retard      disgust
## 10514 10514            retard         fear
## 10515 10515            retard     negative
## 10516 10516            retard      sadness
## 10517 10517       retardation     negative
## 10518 10518         retention     positive
## 10519 10519          reticent         fear
## 10520 10520          reticent     negative
## 10521 10521        retirement anticipation
## 10522 10522        retirement         fear
## 10523 10523        retirement          joy
## 10524 10524        retirement     negative
## 10525 10525        retirement     positive
## 10526 10526        retirement      sadness
## 10527 10527        retirement        trust
## 10528 10528            retort     negative
## 10529 10529           retract        anger
## 10530 10530           retract     negative
## 10531 10531        retraction     negative
## 10532 10532      retrenchment         fear
## 10533 10533      retrenchment     negative
## 10534 10534       retribution        anger
## 10535 10535       retribution         fear
## 10536 10536       retribution     negative
## 10537 10537       retribution      sadness
## 10538 10538        retrograde     negative
## 10539 10539           reunion anticipation
## 10540 10540           reunion     positive
## 10541 10541           reunion        trust
## 10542 10542             revel          joy
## 10543 10543             revel     positive
## 10544 10544            revels          joy
## 10545 10545            revels     positive
## 10546 10546           revenge        anger
## 10547 10547           revenge anticipation
## 10548 10548           revenge         fear
## 10549 10549           revenge     negative
## 10550 10550           revenge     surprise
## 10551 10551            revere anticipation
## 10552 10552            revere          joy
## 10553 10553            revere     positive
## 10554 10554            revere        trust
## 10555 10555         reverence          joy
## 10556 10556         reverence     positive
## 10557 10557         reverence        trust
## 10558 10558          reverend          joy
## 10559 10559          reverend     positive
## 10560 10560           reverie          joy
## 10561 10561           reverie     positive
## 10562 10562           reverie        trust
## 10563 10563          reversal        anger
## 10564 10564          reversal      disgust
## 10565 10565          reversal     negative
## 10566 10566          reversal     surprise
## 10567 10567            revise     positive
## 10568 10568           revival anticipation
## 10569 10569           revival          joy
## 10570 10570           revival     positive
## 10571 10571           revival        trust
## 10572 10572            revive anticipation
## 10573 10573            revive     negative
## 10574 10574            revive     positive
## 10575 10575        revocation     negative
## 10576 10576            revoke        anger
## 10577 10577            revoke      disgust
## 10578 10578            revoke         fear
## 10579 10579            revoke     negative
## 10580 10580            revoke      sadness
## 10581 10581            revolt        anger
## 10582 10582            revolt     negative
## 10583 10583            revolt     surprise
## 10584 10584         revolting        anger
## 10585 10585         revolting      disgust
## 10586 10586         revolting         fear
## 10587 10587         revolting     negative
## 10588 10588        revolution        anger
## 10589 10589        revolution anticipation
## 10590 10590        revolution         fear
## 10591 10591        revolution     negative
## 10592 10592        revolution     positive
## 10593 10593        revolution      sadness
## 10594 10594        revolution     surprise
## 10595 10595     revolutionary     positive
## 10596 10596          revolver        anger
## 10597 10597          revolver         fear
## 10598 10598          revolver     negative
## 10599 10599          revolver      sadness
## 10600 10600         revulsion        anger
## 10601 10601         revulsion      disgust
## 10602 10602         revulsion         fear
## 10603 10603         revulsion     negative
## 10604 10604            reward anticipation
## 10605 10605            reward          joy
## 10606 10606            reward     positive
## 10607 10607            reward     surprise
## 10608 10608            reward        trust
## 10609 10609        rheumatism        anger
## 10610 10610        rheumatism         fear
## 10611 10611        rheumatism     negative
## 10612 10612        rheumatism      sadness
## 10613 10613            rhythm     positive
## 10614 10614        rhythmical          joy
## 10615 10615        rhythmical     positive
## 10616 10616        rhythmical     surprise
## 10617 10617            ribbon        anger
## 10618 10618            ribbon anticipation
## 10619 10619            ribbon          joy
## 10620 10620            ribbon     positive
## 10621 10621          richness     positive
## 10622 10622           rickety     negative
## 10623 10623            riddle     surprise
## 10624 10624           riddled     negative
## 10625 10625             rider     positive
## 10626 10626          ridicule        anger
## 10627 10627          ridicule      disgust
## 10628 10628          ridicule     negative
## 10629 10629          ridicule      sadness
## 10630 10630        ridiculous        anger
## 10631 10631        ridiculous      disgust
## 10632 10632        ridiculous     negative
## 10633 10633              rife     negative
## 10634 10634             rifle        anger
## 10635 10635             rifle         fear
## 10636 10636             rifle     negative
## 10637 10637              rift     negative
## 10638 10638         righteous     positive
## 10639 10639          rightful     positive
## 10640 10640           rightly     positive
## 10641 10641             rigid     negative
## 10642 10642          rigidity     negative
## 10643 10643             rigor      disgust
## 10644 10644             rigor         fear
## 10645 10645             rigor     negative
## 10646 10646          rigorous     negative
## 10647 10647            ringer        anger
## 10648 10648            ringer     negative
## 10649 10649              riot        anger
## 10650 10650              riot         fear
## 10651 10651              riot     negative
## 10652 10652           riotous        anger
## 10653 10653           riotous         fear
## 10654 10654           riotous     negative
## 10655 10655           riotous     surprise
## 10656 10656              ripe     positive
## 10657 10657             ripen anticipation
## 10658 10658             ripen     positive
## 10659 10659            rising anticipation
## 10660 10660            rising          joy
## 10661 10661            rising     positive
## 10662 10662              risk anticipation
## 10663 10663              risk         fear
## 10664 10664              risk     negative
## 10665 10665             risky anticipation
## 10666 10666             risky         fear
## 10667 10667             risky     negative
## 10668 10668           rivalry        anger
## 10669 10669           rivalry     negative
## 10670 10670          riveting     positive
## 10671 10671          roadster          joy
## 10672 10672          roadster     positive
## 10673 10673          roadster        trust
## 10674 10674               rob        anger
## 10675 10675               rob      disgust
## 10676 10676               rob         fear
## 10677 10677               rob     negative
## 10678 10678               rob      sadness
## 10679 10679            robber      disgust
## 10680 10680            robber         fear
## 10681 10681            robber     negative
## 10682 10682           robbery        anger
## 10683 10683           robbery      disgust
## 10684 10684           robbery         fear
## 10685 10685           robbery     negative
## 10686 10686           robbery      sadness
## 10687 10687            robust     positive
## 10688 10688              rock     positive
## 10689 10689            rocket        anger
## 10690 10690               rod         fear
## 10691 10691               rod     positive
## 10692 10692               rod        trust
## 10693 10693             rogue      disgust
## 10694 10694             rogue     negative
## 10695 10695        rollicking          joy
## 10696 10696        rollicking     positive
## 10697 10697           romance anticipation
## 10698 10698           romance         fear
## 10699 10699           romance          joy
## 10700 10700           romance     positive
## 10701 10701           romance      sadness
## 10702 10702           romance     surprise
## 10703 10703           romance        trust
## 10704 10704          romantic anticipation
## 10705 10705          romantic          joy
## 10706 10706          romantic     positive
## 10707 10707          romantic        trust
## 10708 10708       romanticism          joy
## 10709 10709       romanticism     positive
## 10710 10710              romp          joy
## 10711 10711              romp     positive
## 10712 10712              rook        anger
## 10713 10713              rook      disgust
## 10714 10714              rook     negative
## 10715 10715            rooted     positive
## 10716 10716            rooted        trust
## 10717 10717              rosy     positive
## 10718 10718               rot      disgust
## 10719 10719               rot         fear
## 10720 10720               rot     negative
## 10721 10721               rot      sadness
## 10722 10722              rota     positive
## 10723 10723              rota        trust
## 10724 10724           rotting      disgust
## 10725 10725           rotting     negative
## 10726 10726         roughness     negative
## 10727 10727          roulette anticipation
## 10728 10728              rout     negative
## 10729 10729           routine     positive
## 10730 10730           routine        trust
## 10731 10731               row        anger
## 10732 10732               row     negative
## 10733 10733             rowdy     negative
## 10734 10734           royalty     positive
## 10735 10735           rubbish      disgust
## 10736 10736           rubbish     negative
## 10737 10737            rubble         fear
## 10738 10738            rubble     negative
## 10739 10739            rubble      sadness
## 10740 10740            rubric     positive
## 10741 10741               rue     negative
## 10742 10742               rue      sadness
## 10743 10743            ruffle     negative
## 10744 10744            rugged     negative
## 10745 10745              ruin         fear
## 10746 10746              ruin     negative
## 10747 10747              ruin      sadness
## 10748 10748            ruined        anger
## 10749 10749            ruined      disgust
## 10750 10750            ruined         fear
## 10751 10751            ruined     negative
## 10752 10752            ruined      sadness
## 10753 10753           ruinous        anger
## 10754 10754           ruinous      disgust
## 10755 10755           ruinous         fear
## 10756 10756           ruinous     negative
## 10757 10757           ruinous      sadness
## 10758 10758              rule         fear
## 10759 10759              rule        trust
## 10760 10760             rumor     negative
## 10761 10761             rumor      sadness
## 10762 10762           runaway     negative
## 10763 10763           runaway      sadness
## 10764 10764           rupture         fear
## 10765 10765           rupture     negative
## 10766 10766           rupture      sadness
## 10767 10767           rupture     surprise
## 10768 10768              ruse     negative
## 10769 10769              rust     negative
## 10770 10770             rusty     negative
## 10771 10771              ruth     positive
## 10772 10772          ruthless        anger
## 10773 10773          ruthless      disgust
## 10774 10774          ruthless         fear
## 10775 10775          ruthless     negative
## 10776 10776             saber        anger
## 10777 10777             saber         fear
## 10778 10778             saber     negative
## 10779 10779          sabotage        anger
## 10780 10780          sabotage      disgust
## 10781 10781          sabotage         fear
## 10782 10782          sabotage     negative
## 10783 10783          sabotage      sadness
## 10784 10784          sabotage     surprise
## 10785 10785        sacrifices      disgust
## 10786 10786        sacrifices         fear
## 10787 10787        sacrifices     negative
## 10788 10788        sacrifices      sadness
## 10789 10789             sadly     negative
## 10790 10790             sadly      sadness
## 10791 10791           sadness     negative
## 10792 10792           sadness      sadness
## 10793 10793           sadness        trust
## 10794 10794              safe          joy
## 10795 10795              safe     positive
## 10796 10796              safe        trust
## 10797 10797         safeguard     positive
## 10798 10798         safeguard        trust
## 10799 10799       safekeeping        trust
## 10800 10800               sag         fear
## 10801 10801               sag     negative
## 10802 10802              sage     positive
## 10803 10803              sage        trust
## 10804 10804             saint anticipation
## 10805 10805             saint          joy
## 10806 10806             saint     positive
## 10807 10807             saint     surprise
## 10808 10808             saint        trust
## 10809 10809           saintly anticipation
## 10810 10810           saintly          joy
## 10811 10811           saintly     positive
## 10812 10812           saintly     surprise
## 10813 10813           saintly        trust
## 10814 10814            salary anticipation
## 10815 10815            salary          joy
## 10816 10816            salary     positive
## 10817 10817            salary        trust
## 10818 10818           salient     positive
## 10819 10819            saliva anticipation
## 10820 10820             sally     surprise
## 10821 10821            saloon        anger
## 10822 10822          salutary          joy
## 10823 10823          salutary     positive
## 10824 10824          salutary        trust
## 10825 10825            salute          joy
## 10826 10826            salute     positive
## 10827 10827         salvation anticipation
## 10828 10828         salvation          joy
## 10829 10829         salvation     positive
## 10830 10830         salvation        trust
## 10831 10831             salve     positive
## 10832 10832           samurai         fear
## 10833 10833           samurai     positive
## 10834 10834    sanctification          joy
## 10835 10835    sanctification     positive
## 10836 10836    sanctification        trust
## 10837 10837          sanctify anticipation
## 10838 10838          sanctify          joy
## 10839 10839          sanctify     positive
## 10840 10840          sanctify      sadness
## 10841 10841          sanctify     surprise
## 10842 10842          sanctify        trust
## 10843 10843         sanctuary anticipation
## 10844 10844         sanctuary          joy
## 10845 10845         sanctuary     positive
## 10846 10846         sanctuary        trust
## 10847 10847          sanguine     positive
## 10848 10848          sanitary     positive
## 10849 10849               sap     negative
## 10850 10850               sap      sadness
## 10851 10851             sappy        trust
## 10852 10852           sarcasm        anger
## 10853 10853           sarcasm      disgust
## 10854 10854           sarcasm     negative
## 10855 10855           sarcasm      sadness
## 10856 10856           sarcoma         fear
## 10857 10857           sarcoma     negative
## 10858 10858           sarcoma      sadness
## 10859 10859          sardonic     negative
## 10860 10860           satanic        anger
## 10861 10861           satanic     negative
## 10862 10862             satin     positive
## 10863 10863    satisfactorily     positive
## 10864 10864         satisfied          joy
## 10865 10865         satisfied     positive
## 10866 10866         saturated      disgust
## 10867 10867         saturated     negative
## 10868 10868            savage        anger
## 10869 10869            savage         fear
## 10870 10870            savage     negative
## 10871 10871          savagery        anger
## 10872 10872          savagery         fear
## 10873 10873          savagery     negative
## 10874 10874              save          joy
## 10875 10875              save     positive
## 10876 10876              save        trust
## 10877 10877           savings     positive
## 10878 10878             savor anticipation
## 10879 10879             savor      disgust
## 10880 10880             savor          joy
## 10881 10881             savor     positive
## 10882 10882             savor      sadness
## 10883 10883             savor        trust
## 10884 10884            savory     positive
## 10885 10885             savvy     positive
## 10886 10886              scab     negative
## 10887 10887          scaffold         fear
## 10888 10888          scaffold     negative
## 10889 10889           scalpel         fear
## 10890 10890           scalpel     negative
## 10891 10891             scaly     negative
## 10892 10892           scandal         fear
## 10893 10893           scandal     negative
## 10894 10894        scandalous        anger
## 10895 10895        scandalous     negative
## 10896 10896            scanty     negative
## 10897 10897         scapegoat        anger
## 10898 10898         scapegoat         fear
## 10899 10899         scapegoat     negative
## 10900 10900              scar        anger
## 10901 10901              scar      disgust
## 10902 10902              scar         fear
## 10903 10903              scar     negative
## 10904 10904              scar      sadness
## 10905 10905            scarce         fear
## 10906 10906            scarce     negative
## 10907 10907            scarce      sadness
## 10908 10908          scarcely     negative
## 10909 10909          scarcely      sadness
## 10910 10910          scarcity        anger
## 10911 10911          scarcity         fear
## 10912 10912          scarcity     negative
## 10913 10913          scarcity      sadness
## 10914 10914             scare        anger
## 10915 10915             scare anticipation
## 10916 10916             scare         fear
## 10917 10917             scare     negative
## 10918 10918             scare     surprise
## 10919 10919         scarecrow         fear
## 10920 10920         scarecrow     negative
## 10921 10921         scarecrow     positive
## 10922 10922         scavenger     negative
## 10923 10923         sceptical        trust
## 10924 10924            scheme     negative
## 10925 10925            schism        anger
## 10926 10926            schism     negative
## 10927 10927     schizophrenia        anger
## 10928 10928     schizophrenia      disgust
## 10929 10929     schizophrenia         fear
## 10930 10930     schizophrenia     negative
## 10931 10931     schizophrenia      sadness
## 10932 10932           scholar     positive
## 10933 10933       scholarship          joy
## 10934 10934       scholarship     positive
## 10935 10935            school        trust
## 10936 10936          sciatica     negative
## 10937 10937        scientific     positive
## 10938 10938        scientific        trust
## 10939 10939         scientist anticipation
## 10940 10940         scientist     positive
## 10941 10941         scientist        trust
## 10942 10942         scintilla     positive
## 10943 10943             scoff        anger
## 10944 10944             scoff      disgust
## 10945 10945             scoff     negative
## 10946 10946             scold        anger
## 10947 10947             scold      disgust
## 10948 10948             scold         fear
## 10949 10949             scold     negative
## 10950 10950             scold      sadness
## 10951 10951          scolding        anger
## 10952 10952          scolding     negative
## 10953 10953         scorching        anger
## 10954 10954         scorching     negative
## 10955 10955             score anticipation
## 10956 10956             score          joy
## 10957 10957             score     positive
## 10958 10958             score     surprise
## 10959 10959             scorn        anger
## 10960 10960             scorn     negative
## 10961 10961          scorpion        anger
## 10962 10962          scorpion      disgust
## 10963 10963          scorpion         fear
## 10964 10964          scorpion     negative
## 10965 10965          scorpion     surprise
## 10966 10966            scotch     negative
## 10967 10967         scoundrel        anger
## 10968 10968         scoundrel      disgust
## 10969 10969         scoundrel         fear
## 10970 10970         scoundrel     negative
## 10971 10971         scoundrel        trust
## 10972 10972           scourge        anger
## 10973 10973           scourge         fear
## 10974 10974           scourge     negative
## 10975 10975           scourge      sadness
## 10976 10976        scrambling     negative
## 10977 10977           scrapie        anger
## 10978 10978           scrapie         fear
## 10979 10979           scrapie     negative
## 10980 10980           scrapie      sadness
## 10981 10981            scream        anger
## 10982 10982            scream      disgust
## 10983 10983            scream         fear
## 10984 10984            scream     negative
## 10985 10985            scream     surprise
## 10986 10986         screaming        anger
## 10987 10987         screaming      disgust
## 10988 10988         screaming         fear
## 10989 10989         screaming     negative
## 10990 10990           screech         fear
## 10991 10991           screech     negative
## 10992 10992           screech     surprise
## 10993 10993           screwed        anger
## 10994 10994           screwed     negative
## 10995 10995            scribe     positive
## 10996 10996         scrimmage     negative
## 10997 10997         scrimmage     surprise
## 10998 10998            script     positive
## 10999 10999         scripture        trust
## 11000 11000             scrub      disgust
## 11001 11001             scrub     negative
## 11002 11002       scrumptious     positive
## 11003 11003        scrutinize anticipation
## 11004 11004        scrutinize     negative
## 11005 11005          scrutiny     negative
## 11006 11006         sculpture     positive
## 11007 11007              scum      disgust
## 11008 11008              scum     negative
## 11009 11009               sea     positive
## 11010 11010              seal     positive
## 11011 11011              seal        trust
## 11012 11012             seals        trust
## 11013 11013              sear     negative
## 11014 11014          seasoned     positive
## 11015 11015         secession     negative
## 11016 11016          secluded     negative
## 11017 11017          secluded      sadness
## 11018 11018         seclusion         fear
## 11019 11019         seclusion     negative
## 11020 11020         seclusion     positive
## 11021 11021        secondhand     negative
## 11022 11022           secrecy     surprise
## 11023 11023           secrecy        trust
## 11024 11024            secret        trust
## 11025 11025       secretariat     positive
## 11026 11026           secrete      disgust
## 11027 11027         secretion      disgust
## 11028 11028         secretion     negative
## 11029 11029         secretive     negative
## 11030 11030         sectarian        anger
## 11031 11031         sectarian         fear
## 11032 11032         sectarian     negative
## 11033 11033           secular anticipation
## 11034 11034        securities        trust
## 11035 11035          sedition        anger
## 11036 11036          sedition     negative
## 11037 11037          sedition      sadness
## 11038 11038            seduce     negative
## 11039 11039         seduction     negative
## 11040 11040         seductive anticipation
## 11041 11041              seek anticipation
## 11042 11042         segregate        anger
## 11043 11043         segregate      disgust
## 11044 11044         segregate     negative
## 11045 11045         segregate      sadness
## 11046 11046        segregated     negative
## 11047 11047             seize         fear
## 11048 11048             seize     negative
## 11049 11049           seizure         fear
## 11050 11050           selfish        anger
## 11051 11051           selfish      disgust
## 11052 11052           selfish     negative
## 11053 11053       selfishness     negative
## 11054 11054            senate        trust
## 11055 11055            senile         fear
## 11056 11056            senile     negative
## 11057 11057            senile      sadness
## 11058 11058         seniority     positive
## 11059 11059         seniority        trust
## 11060 11060       sensational          joy
## 11061 11061       sensational     positive
## 11062 11062             sense     positive
## 11063 11063         senseless        anger
## 11064 11064         senseless      disgust
## 11065 11065         senseless         fear
## 11066 11066         senseless     negative
## 11067 11067         senseless      sadness
## 11068 11068         senseless     surprise
## 11069 11069       sensibility     positive
## 11070 11070          sensibly     positive
## 11071 11071           sensual anticipation
## 11072 11072           sensual          joy
## 11073 11073           sensual     negative
## 11074 11074           sensual     positive
## 11075 11075           sensual     surprise
## 11076 11076           sensual        trust
## 11077 11077        sensuality anticipation
## 11078 11078        sensuality          joy
## 11079 11079        sensuality     positive
## 11080 11080          sensuous          joy
## 11081 11081          sensuous     positive
## 11082 11082          sentence        anger
## 11083 11083          sentence anticipation
## 11084 11084          sentence      disgust
## 11085 11085          sentence         fear
## 11086 11086          sentence     negative
## 11087 11087          sentence      sadness
## 11088 11088       sentimental     positive
## 11089 11089    sentimentality     positive
## 11090 11090          sentinel     positive
## 11091 11091          sentinel        trust
## 11092 11092            sentry        trust
## 11093 11093        separatist        anger
## 11094 11094        separatist      disgust
## 11095 11095        separatist     negative
## 11096 11096            sepsis         fear
## 11097 11097            sepsis     negative
## 11098 11098            sepsis      sadness
## 11099 11099            septic      disgust
## 11100 11100            septic     negative
## 11101 11101            sequel anticipation
## 11102 11102     sequestration     negative
## 11103 11103     sequestration      sadness
## 11104 11104            serene     negative
## 11105 11105            serene        trust
## 11106 11106          serenity anticipation
## 11107 11107          serenity          joy
## 11108 11108          serenity     positive
## 11109 11109          serenity        trust
## 11110 11110            serial anticipation
## 11111 11111            series        trust
## 11112 11112       seriousness         fear
## 11113 11113       seriousness      sadness
## 11114 11114            sermon     positive
## 11115 11115            sermon        trust
## 11116 11116           serpent      disgust
## 11117 11117           serpent         fear
## 11118 11118           serpent     negative
## 11119 11119             serum     positive
## 11120 11120           servant     negative
## 11121 11121           servant        trust
## 11122 11122             serve     negative
## 11123 11123             serve        trust
## 11124 11124           servile      disgust
## 11125 11125           servile         fear
## 11126 11126           servile     negative
## 11127 11127           servile      sadness
## 11128 11128         servitude     negative
## 11129 11129           setback     negative
## 11130 11130           setback      sadness
## 11131 11131           settlor         fear
## 11132 11132           settlor     positive
## 11133 11133             sever     negative
## 11134 11134         severance      sadness
## 11135 11135            sewage      disgust
## 11136 11136            sewage     negative
## 11137 11137             sewer      disgust
## 11138 11138          sewerage      disgust
## 11139 11139          sewerage     negative
## 11140 11140               sex anticipation
## 11141 11141               sex          joy
## 11142 11142               sex     positive
## 11143 11143               sex        trust
## 11144 11144            shabby      disgust
## 11145 11145            shabby     negative
## 11146 11146             shack      disgust
## 11147 11147             shack     negative
## 11148 11148             shack      sadness
## 11149 11149           shackle        anger
## 11150 11150           shackle anticipation
## 11151 11151           shackle      disgust
## 11152 11152           shackle         fear
## 11153 11153           shackle     negative
## 11154 11154           shackle      sadness
## 11155 11155             shady         fear
## 11156 11156             shady     negative
## 11157 11157           shaking         fear
## 11158 11158           shaking     negative
## 11159 11159             shaky        anger
## 11160 11160             shaky anticipation
## 11161 11161             shaky         fear
## 11162 11162             shaky     negative
## 11163 11163              sham        anger
## 11164 11164              sham      disgust
## 11165 11165              sham     negative
## 11166 11166          shambles     negative
## 11167 11167             shame      disgust
## 11168 11168             shame         fear
## 11169 11169             shame     negative
## 11170 11170             shame      sadness
## 11171 11171          shameful     negative
## 11172 11172          shameful      sadness
## 11173 11173         shameless      disgust
## 11174 11174         shameless     negative
## 11175 11175          shanghai      disgust
## 11176 11176          shanghai         fear
## 11177 11177          shanghai     negative
## 11178 11178             shank         fear
## 11179 11179             shape     positive
## 11180 11180           shapely     positive
## 11181 11181             share anticipation
## 11182 11182             share          joy
## 11183 11183             share     positive
## 11184 11184             share        trust
## 11185 11185             shark     negative
## 11186 11186           sharpen        anger
## 11187 11187           sharpen anticipation
## 11188 11188           shatter        anger
## 11189 11189           shatter         fear
## 11190 11190           shatter     negative
## 11191 11191           shatter      sadness
## 11192 11192           shatter     surprise
## 11193 11193         shattered     negative
## 11194 11194         shattered      sadness
## 11195 11195              shed     negative
## 11196 11196             shell        anger
## 11197 11197             shell         fear
## 11198 11198             shell     negative
## 11199 11199             shell      sadness
## 11200 11200             shell     surprise
## 11201 11201           shelter     positive
## 11202 11202           shelter        trust
## 11203 11203           shelved     negative
## 11204 11204          shepherd     positive
## 11205 11205          shepherd        trust
## 11206 11206           sheriff        trust
## 11207 11207             shine     positive
## 11208 11208           shining anticipation
## 11209 11209           shining          joy
## 11210 11210           shining     positive
## 11211 11211              ship anticipation
## 11212 11212         shipwreck         fear
## 11213 11213         shipwreck     negative
## 11214 11214         shipwreck      sadness
## 11215 11215              shit        anger
## 11216 11216              shit      disgust
## 11217 11217              shit     negative
## 11218 11218            shiver        anger
## 11219 11219            shiver anticipation
## 11220 11220            shiver         fear
## 11221 11221            shiver     negative
## 11222 11222            shiver      sadness
## 11223 11223             shock        anger
## 11224 11224             shock         fear
## 11225 11225             shock     negative
## 11226 11226             shock     surprise
## 11227 11227        shockingly     surprise
## 11228 11228            shoddy        anger
## 11229 11229            shoddy      disgust
## 11230 11230            shoddy     negative
## 11231 11231             shoot        anger
## 11232 11232             shoot         fear
## 11233 11233             shoot     negative
## 11234 11234           shooter         fear
## 11235 11235          shooting        anger
## 11236 11236          shooting         fear
## 11237 11237          shooting     negative
## 11238 11238        shopkeeper        trust
## 11239 11239       shoplifting        anger
## 11240 11240       shoplifting      disgust
## 11241 11241       shoplifting     negative
## 11242 11242          shopping anticipation
## 11243 11243          shopping          joy
## 11244 11244          shopping     positive
## 11245 11245          shopping     surprise
## 11246 11246          shopping        trust
## 11247 11247          shortage        anger
## 11248 11248          shortage         fear
## 11249 11249          shortage     negative
## 11250 11250          shortage      sadness
## 11251 11251       shortcoming     negative
## 11252 11252           shortly anticipation
## 11253 11253              shot        anger
## 11254 11254              shot         fear
## 11255 11255              shot     negative
## 11256 11256              shot      sadness
## 11257 11257              shot     surprise
## 11258 11258          shoulder     positive
## 11259 11259          shoulder        trust
## 11260 11260             shout        anger
## 11261 11261             shout     surprise
## 11262 11262             shove        anger
## 11263 11263             shove     negative
## 11264 11264              show        trust
## 11265 11265             showy     negative
## 11266 11266          shrapnel         fear
## 11267 11267            shrewd     positive
## 11268 11268            shriek        anger
## 11269 11269            shriek         fear
## 11270 11270            shriek     negative
## 11271 11271            shriek      sadness
## 11272 11272            shriek     surprise
## 11273 11273            shrill        anger
## 11274 11274            shrill         fear
## 11275 11275            shrill     negative
## 11276 11276            shrill     surprise
## 11277 11277            shrink         fear
## 11278 11278            shrink     negative
## 11279 11279            shrink      sadness
## 11280 11280            shroud      sadness
## 11281 11281            shrunk     negative
## 11282 11282           shudder         fear
## 11283 11283           shudder     negative
## 11284 11284              shun        anger
## 11285 11285              shun      disgust
## 11286 11286              shun     negative
## 11287 11287              shun      sadness
## 11288 11288               sib        trust
## 11289 11289              sick      disgust
## 11290 11290              sick     negative
## 11291 11291              sick      sadness
## 11292 11292         sickening        anger
## 11293 11293         sickening      disgust
## 11294 11294         sickening         fear
## 11295 11295         sickening     negative
## 11296 11296         sickening      sadness
## 11297 11297            sickly      disgust
## 11298 11298            sickly     negative
## 11299 11299            sickly      sadness
## 11300 11300          sickness      disgust
## 11301 11301          sickness         fear
## 11302 11302          sickness     negative
## 11303 11303          sickness      sadness
## 11304 11304         signature        trust
## 11305 11305           signify anticipation
## 11306 11306              silk     positive
## 11307 11307             silly          joy
## 11308 11308             silly     negative
## 11309 11309            simmer        anger
## 11310 11310            simmer anticipation
## 11311 11311         simmering anticipation
## 11312 11312          simplify anticipation
## 11313 11313          simplify          joy
## 11314 11314          simplify     positive
## 11315 11315          simplify     surprise
## 11316 11316          simplify        trust
## 11317 11317               sin        anger
## 11318 11318               sin      disgust
## 11319 11319               sin         fear
## 11320 11320               sin     negative
## 11321 11321               sin      sadness
## 11322 11322           sincere     positive
## 11323 11323           sincere        trust
## 11324 11324         sincerity     positive
## 11325 11325            sinful        anger
## 11326 11326            sinful      disgust
## 11327 11327            sinful         fear
## 11328 11328            sinful     negative
## 11329 11329            sinful      sadness
## 11330 11330              sing anticipation
## 11331 11331              sing          joy
## 11332 11332              sing     positive
## 11333 11333              sing      sadness
## 11334 11334              sing        trust
## 11335 11335            singly     positive
## 11336 11336        singularly     surprise
## 11337 11337          sinister        anger
## 11338 11338          sinister      disgust
## 11339 11339          sinister         fear
## 11340 11340          sinister     negative
## 11341 11341            sinner        anger
## 11342 11342            sinner      disgust
## 11343 11343            sinner         fear
## 11344 11344            sinner     negative
## 11345 11345            sinner      sadness
## 11346 11346           sinning      disgust
## 11347 11347           sinning     negative
## 11348 11348               sir     positive
## 11349 11349               sir        trust
## 11350 11350             siren         fear
## 11351 11351             siren     negative
## 11352 11352             sissy     negative
## 11353 11353        sisterhood        anger
## 11354 11354        sisterhood     positive
## 11355 11355        sisterhood      sadness
## 11356 11356        sisterhood     surprise
## 11357 11357        sisterhood        trust
## 11358 11358            sizzle        anger
## 11359 11359         skeptical     negative
## 11360 11360           sketchy     negative
## 11361 11361            skewed        anger
## 11362 11362            skewed anticipation
## 11363 11363            skewed     negative
## 11364 11364              skid        anger
## 11365 11365              skid         fear
## 11366 11366              skid     negative
## 11367 11367              skid      sadness
## 11368 11368           skilled     positive
## 11369 11369          skillful     positive
## 11370 11370          skillful        trust
## 11371 11371              skip     negative
## 11372 11372          skirmish        anger
## 11373 11373          skirmish     negative
## 11374 11374               sky     positive
## 11375 11375             slack     negative
## 11376 11376              slag     negative
## 11377 11377              slam        anger
## 11378 11378              slam         fear
## 11379 11379              slam     negative
## 11380 11380              slam     surprise
## 11381 11381           slander        anger
## 11382 11382           slander      disgust
## 11383 11383           slander     negative
## 11384 11384        slanderous     negative
## 11385 11385              slap        anger
## 11386 11386              slap     negative
## 11387 11387              slap     surprise
## 11388 11388             slash        anger
## 11389 11389             slate     positive
## 11390 11390         slaughter        anger
## 11391 11391         slaughter      disgust
## 11392 11392         slaughter         fear
## 11393 11393         slaughter     negative
## 11394 11394         slaughter      sadness
## 11395 11395         slaughter     surprise
## 11396 11396    slaughterhouse        anger
## 11397 11397    slaughterhouse      disgust
## 11398 11398    slaughterhouse         fear
## 11399 11399    slaughterhouse     negative
## 11400 11400    slaughterhouse      sadness
## 11401 11401      slaughtering        anger
## 11402 11402      slaughtering      disgust
## 11403 11403      slaughtering         fear
## 11404 11404      slaughtering     negative
## 11405 11405      slaughtering      sadness
## 11406 11406      slaughtering     surprise
## 11407 11407             slave        anger
## 11408 11408             slave         fear
## 11409 11409             slave     negative
## 11410 11410             slave      sadness
## 11411 11411           slavery        anger
## 11412 11412           slavery      disgust
## 11413 11413           slavery         fear
## 11414 11414           slavery     negative
## 11415 11415           slavery      sadness
## 11416 11416              slay        anger
## 11417 11417              slay     negative
## 11418 11418            slayer        anger
## 11419 11419            slayer      disgust
## 11420 11420            slayer         fear
## 11421 11421            slayer     negative
## 11422 11422            slayer      sadness
## 11423 11423            slayer     surprise
## 11424 11424             sleek     positive
## 11425 11425             sleet     negative
## 11426 11426           slender     positive
## 11427 11427              slim     positive
## 11428 11428             slime      disgust
## 11429 11429             slimy      disgust
## 11430 11430             slimy     negative
## 11431 11431             slink     negative
## 11432 11432              slip     negative
## 11433 11433              slip     surprise
## 11434 11434              slop      disgust
## 11435 11435              slop     negative
## 11436 11436            sloppy      disgust
## 11437 11437            sloppy     negative
## 11438 11438             sloth      disgust
## 11439 11439             sloth     negative
## 11440 11440            slouch     negative
## 11441 11441            slough     negative
## 11442 11442          slowness     negative
## 11443 11443            sludge      disgust
## 11444 11444            sludge     negative
## 11445 11445              slug      disgust
## 11446 11446              slug     negative
## 11447 11447          sluggish     negative
## 11448 11448          sluggish      sadness
## 11449 11449              slum      disgust
## 11450 11450              slum     negative
## 11451 11451             slump     negative
## 11452 11452             slump      sadness
## 11453 11453              slur        anger
## 11454 11454              slur      disgust
## 11455 11455              slur     negative
## 11456 11456              slur      sadness
## 11457 11457             slush      disgust
## 11458 11458             slush     negative
## 11459 11459             slush     surprise
## 11460 11460              slut        anger
## 11461 11461              slut      disgust
## 11462 11462              slut     negative
## 11463 11463               sly        anger
## 11464 11464               sly      disgust
## 11465 11465               sly         fear
## 11466 11466               sly     negative
## 11467 11467             smack        anger
## 11468 11468             smack     negative
## 11469 11469             small     negative
## 11470 11470             smash        anger
## 11471 11471             smash         fear
## 11472 11472             smash     negative
## 11473 11473           smashed     negative
## 11474 11474        smattering     negative
## 11475 11475             smell        anger
## 11476 11476             smell      disgust
## 11477 11477             smell     negative
## 11478 11478          smelling      disgust
## 11479 11479          smelling     negative
## 11480 11480             smile          joy
## 11481 11481             smile     positive
## 11482 11482             smile     surprise
## 11483 11483             smile        trust
## 11484 11484           smiling          joy
## 11485 11485           smiling     positive
## 11486 11486             smirk     negative
## 11487 11487             smite        anger
## 11488 11488             smite         fear
## 11489 11489             smite     negative
## 11490 11490             smite      sadness
## 11491 11491             smith        trust
## 11492 11492           smitten     positive
## 11493 11493            smoker     negative
## 11494 11494        smoothness     positive
## 11495 11495           smother        anger
## 11496 11496           smother     negative
## 11497 11497            smudge     negative
## 11498 11498              smug     negative
## 11499 11499           smuggle         fear
## 11500 11500           smuggle     negative
## 11501 11501          smuggler        anger
## 11502 11502          smuggler      disgust
## 11503 11503          smuggler         fear
## 11504 11504          smuggler     negative
## 11505 11505         smuggling     negative
## 11506 11506              smut      disgust
## 11507 11507              smut         fear
## 11508 11508              smut     negative
## 11509 11509              snag     negative
## 11510 11510              snag     surprise
## 11511 11511             snags     negative
## 11512 11512             snake      disgust
## 11513 11513             snake         fear
## 11514 11514             snake     negative
## 11515 11515             snare         fear
## 11516 11516             snare     negative
## 11517 11517             snarl        anger
## 11518 11518             snarl      disgust
## 11519 11519             snarl     negative
## 11520 11520          snarling        anger
## 11521 11521          snarling     negative
## 11522 11522             sneak        anger
## 11523 11523             sneak         fear
## 11524 11524             sneak     negative
## 11525 11525             sneak     surprise
## 11526 11526          sneaking anticipation
## 11527 11527          sneaking         fear
## 11528 11528          sneaking     negative
## 11529 11529          sneaking        trust
## 11530 11530             sneer        anger
## 11531 11531             sneer      disgust
## 11532 11532             sneer     negative
## 11533 11533            sneeze      disgust
## 11534 11534            sneeze     negative
## 11535 11535            sneeze     surprise
## 11536 11536           snicker     positive
## 11537 11537             snide     negative
## 11538 11538              snob     negative
## 11539 11539             snort      sadness
## 11540 11540              soak     negative
## 11541 11541               sob     negative
## 11542 11542               sob      sadness
## 11543 11543          sobriety     positive
## 11544 11544          sobriety        trust
## 11545 11545          sociable     positive
## 11546 11546         socialism      disgust
## 11547 11547         socialism         fear
## 11548 11548         socialist        anger
## 11549 11549         socialist      disgust
## 11550 11550         socialist         fear
## 11551 11551         socialist     negative
## 11552 11552         socialist      sadness
## 11553 11553              soil      disgust
## 11554 11554              soil     negative
## 11555 11555            soiled      disgust
## 11556 11556            soiled     negative
## 11557 11557            solace     positive
## 11558 11558           soldier        anger
## 11559 11559           soldier     positive
## 11560 11560           soldier      sadness
## 11561 11561             solid     positive
## 11562 11562        solidarity        trust
## 11563 11563          solidity     positive
## 11564 11564          solidity        trust
## 11565 11565          solution     positive
## 11566 11566          solvency     positive
## 11567 11567           somatic     negative
## 11568 11568           somatic     surprise
## 11569 11569            somber     negative
## 11570 11570            somber      sadness
## 11571 11571             sonar anticipation
## 11572 11572             sonar     positive
## 11573 11573            sonata     positive
## 11574 11574            sonnet          joy
## 11575 11575            sonnet     positive
## 11576 11576            sonnet      sadness
## 11577 11577          sonorous          joy
## 11578 11578          sonorous     positive
## 11579 11579              soot      disgust
## 11580 11580              soot     negative
## 11581 11581            soothe     positive
## 11582 11582          soothing          joy
## 11583 11583          soothing     positive
## 11584 11584          soothing        trust
## 11585 11585           sorcery anticipation
## 11586 11586           sorcery         fear
## 11587 11587           sorcery     negative
## 11588 11588           sorcery     surprise
## 11589 11589            sordid        anger
## 11590 11590            sordid      disgust
## 11591 11591            sordid         fear
## 11592 11592            sordid     negative
## 11593 11593            sordid      sadness
## 11594 11594              sore        anger
## 11595 11595              sore     negative
## 11596 11596              sore      sadness
## 11597 11597            sorely     negative
## 11598 11598            sorely      sadness
## 11599 11599          soreness      disgust
## 11600 11600          soreness     negative
## 11601 11601          soreness      sadness
## 11602 11602            sorrow         fear
## 11603 11603            sorrow     negative
## 11604 11604            sorrow      sadness
## 11605 11605         sorrowful     negative
## 11606 11606         sorrowful      sadness
## 11607 11607            sorter     positive
## 11608 11608            sortie         fear
## 11609 11609            sortie     negative
## 11610 11610          soulless      disgust
## 11611 11611          soulless         fear
## 11612 11612          soulless     negative
## 11613 11613          soulless      sadness
## 11614 11614          soulmate         fear
## 11615 11615          soulmate     negative
## 11616 11616         soundness anticipation
## 11617 11617         soundness          joy
## 11618 11618         soundness     positive
## 11619 11619         soundness        trust
## 11620 11620              soup     positive
## 11621 11621              sour      disgust
## 11622 11622              sour     negative
## 11623 11623         sovereign        trust
## 11624 11624               spa anticipation
## 11625 11625               spa          joy
## 11626 11626               spa     positive
## 11627 11627               spa     surprise
## 11628 11628               spa        trust
## 11629 11629          spacious     positive
## 11630 11630           spaniel          joy
## 11631 11631           spaniel     positive
## 11632 11632           spaniel        trust
## 11633 11633             spank        anger
## 11634 11634             spank         fear
## 11635 11635             spank     negative
## 11636 11636             spank      sadness
## 11637 11637          spanking        anger
## 11638 11638           sparkle anticipation
## 11639 11639           sparkle          joy
## 11640 11640           sparkle     positive
## 11641 11641           sparkle     surprise
## 11642 11642             spasm         fear
## 11643 11643             spasm     negative
## 11644 11644              spat        anger
## 11645 11645              spat     negative
## 11646 11646             spear        anger
## 11647 11647             spear anticipation
## 11648 11648             spear         fear
## 11649 11649             spear     negative
## 11650 11650           special          joy
## 11651 11651           special     positive
## 11652 11652        specialist        trust
## 11653 11653        specialize        trust
## 11654 11654            specie     positive
## 11655 11655             speck      disgust
## 11656 11656             speck     negative
## 11657 11657         spectacle     negative
## 11658 11658         spectacle     positive
## 11659 11659       spectacular anticipation
## 11660 11660       spectacular     surprise
## 11661 11661           specter         fear
## 11662 11662           specter     negative
## 11663 11663           specter      sadness
## 11664 11664          spectral     negative
## 11665 11665       speculation         fear
## 11666 11666       speculation     negative
## 11667 11667       speculation      sadness
## 11668 11668       speculative anticipation
## 11669 11669            speech     positive
## 11670 11670            speedy     positive
## 11671 11671          spelling     positive
## 11672 11672             spent     negative
## 11673 11673              spew      disgust
## 11674 11674             spice     positive
## 11675 11675            spider      disgust
## 11676 11676            spider         fear
## 11677 11677             spike         fear
## 11678 11678             spine        anger
## 11679 11679             spine     negative
## 11680 11680             spine     positive
## 11681 11681          spinster         fear
## 11682 11682          spinster     negative
## 11683 11683          spinster      sadness
## 11684 11684            spirit     positive
## 11685 11685           spirits anticipation
## 11686 11686           spirits          joy
## 11687 11687           spirits     positive
## 11688 11688           spirits     surprise
## 11689 11689              spit      disgust
## 11690 11690             spite        anger
## 11691 11691             spite     negative
## 11692 11692          spiteful        anger
## 11693 11693          spiteful     negative
## 11694 11694            splash     surprise
## 11695 11695          splendid          joy
## 11696 11696          splendid     positive
## 11697 11697          splendid     surprise
## 11698 11698          splendor anticipation
## 11699 11699          splendor          joy
## 11700 11700          splendor     positive
## 11701 11701          splendor     surprise
## 11702 11702          splinter     negative
## 11703 11703             split     negative
## 11704 11704         splitting     negative
## 11705 11705         splitting      sadness
## 11706 11706             spoil      disgust
## 11707 11707             spoil     negative
## 11708 11708           spoiler     negative
## 11709 11709           spoiler      sadness
## 11710 11710             spoke     negative
## 11711 11711         spokesman        trust
## 11712 11712            sponge     negative
## 11713 11713           sponsor     positive
## 11714 11714           sponsor        trust
## 11715 11715             spook         fear
## 11716 11716             spook     negative
## 11717 11717          spotless     positive
## 11718 11718          spotless        trust
## 11719 11719            spouse          joy
## 11720 11720            spouse     positive
## 11721 11721            spouse        trust
## 11722 11722            sprain     negative
## 11723 11723            sprain      sadness
## 11724 11724             spree     negative
## 11725 11725            sprite         fear
## 11726 11726            sprite     negative
## 11727 11727            spruce     positive
## 11728 11728              spur         fear
## 11729 11729          spurious      disgust
## 11730 11730          spurious     negative
## 11731 11731            squall         fear
## 11732 11732            squall     negative
## 11733 11733            squall      sadness
## 11734 11734          squatter     negative
## 11735 11735         squeamish      disgust
## 11736 11736         squeamish         fear
## 11737 11737         squeamish     negative
## 11738 11738           squelch        anger
## 11739 11739           squelch      disgust
## 11740 11740           squelch     negative
## 11741 11741            squirm      disgust
## 11742 11742            squirm     negative
## 11743 11743              stab        anger
## 11744 11744              stab         fear
## 11745 11745              stab     negative
## 11746 11746              stab      sadness
## 11747 11747              stab     surprise
## 11748 11748            stable     positive
## 11749 11749            stable        trust
## 11750 11750          staccato     positive
## 11751 11751           stagger     surprise
## 11752 11752        staggering     negative
## 11753 11753          stagnant     negative
## 11754 11754          stagnant      sadness
## 11755 11755             stain      disgust
## 11756 11756             stain     negative
## 11757 11757         stainless     positive
## 11758 11758             stale     negative
## 11759 11759         stalemate        anger
## 11760 11760         stalemate      disgust
## 11761 11761             stalk         fear
## 11762 11762             stalk     negative
## 11763 11763             stall      disgust
## 11764 11764          stallion     positive
## 11765 11765          stalwart     positive
## 11766 11766           stamina     positive
## 11767 11767           stamina        trust
## 11768 11768          standing     positive
## 11769 11769          standoff        anger
## 11770 11770          standoff         fear
## 11771 11771          standoff     negative
## 11772 11772        standstill        anger
## 11773 11773        standstill     negative
## 11774 11774              star anticipation
## 11775 11775              star          joy
## 11776 11776              star     positive
## 11777 11777              star        trust
## 11778 11778           staring     negative
## 11779 11779             stark     negative
## 11780 11780             stark        trust
## 11781 11781         starlight     positive
## 11782 11782            starry anticipation
## 11783 11783            starry          joy
## 11784 11784            starry     positive
## 11785 11785             start anticipation
## 11786 11786           startle         fear
## 11787 11787           startle     negative
## 11788 11788           startle     surprise
## 11789 11789         startling     surprise
## 11790 11790        starvation         fear
## 11791 11791        starvation     negative
## 11792 11792        starvation      sadness
## 11793 11793           starved     negative
## 11794 11794          starving     negative
## 11795 11795           stately     positive
## 11796 11796         statement     positive
## 11797 11797         statement        trust
## 11798 11798        stationary     negative
## 11799 11799       statistical        trust
## 11800 11800            statue     positive
## 11801 11801            status     positive
## 11802 11802           staunch     positive
## 11803 11803             stave     negative
## 11804 11804         steadfast     positive
## 11805 11805         steadfast        trust
## 11806 11806            steady     surprise
## 11807 11807            steady        trust
## 11808 11808             steal        anger
## 11809 11809             steal         fear
## 11810 11810             steal     negative
## 11811 11811             steal      sadness
## 11812 11812          stealing      disgust
## 11813 11813          stealing         fear
## 11814 11814          stealing     negative
## 11815 11815           stealth     surprise
## 11816 11816        stealthily     surprise
## 11817 11817          stealthy anticipation
## 11818 11818          stealthy         fear
## 11819 11819          stealthy     negative
## 11820 11820          stealthy     surprise
## 11821 11821           stellar     positive
## 11822 11822        stereotype     negative
## 11823 11823       stereotyped     negative
## 11824 11824           sterile     negative
## 11825 11825           sterile      sadness
## 11826 11826         sterility     negative
## 11827 11827          sterling        anger
## 11828 11828          sterling anticipation
## 11829 11829          sterling          joy
## 11830 11830          sterling     negative
## 11831 11831          sterling     positive
## 11832 11832          sterling        trust
## 11833 11833             stern     negative
## 11834 11834           steward     positive
## 11835 11835           steward        trust
## 11836 11836            sticky      disgust
## 11837 11837             stiff     negative
## 11838 11838         stiffness     negative
## 11839 11839            stifle     negative
## 11840 11840           stifled        anger
## 11841 11841           stifled         fear
## 11842 11842           stifled     negative
## 11843 11843           stifled      sadness
## 11844 11844            stigma        anger
## 11845 11845            stigma      disgust
## 11846 11846            stigma         fear
## 11847 11847            stigma     negative
## 11848 11848            stigma      sadness
## 11849 11849         stillborn     negative
## 11850 11850         stillborn      sadness
## 11851 11851         stillness         fear
## 11852 11852         stillness     positive
## 11853 11853         stillness      sadness
## 11854 11854             sting        anger
## 11855 11855             sting         fear
## 11856 11856             sting     negative
## 11857 11857          stinging     negative
## 11858 11858            stingy        anger
## 11859 11859            stingy      disgust
## 11860 11860            stingy         fear
## 11861 11861            stingy     negative
## 11862 11862            stingy      sadness
## 11863 11863             stink      disgust
## 11864 11864             stink     negative
## 11865 11865          stinking      disgust
## 11866 11866          stinking     negative
## 11867 11867             stint         fear
## 11868 11868             stint     negative
## 11869 11869             stint      sadness
## 11870 11870            stocks     negative
## 11871 11871            stolen        anger
## 11872 11872            stolen     negative
## 11873 11873           stomach      disgust
## 11874 11874             stone        anger
## 11875 11875             stone     negative
## 11876 11876            stoned     negative
## 11877 11877            stools      disgust
## 11878 11878            stools     negative
## 11879 11879          stoppage     negative
## 11880 11880             store anticipation
## 11881 11881             store     positive
## 11882 11882             storm        anger
## 11883 11883             storm     negative
## 11884 11884          storming        anger
## 11885 11885            stormy         fear
## 11886 11886            stormy     negative
## 11887 11887   straightforward     positive
## 11888 11888   straightforward        trust
## 11889 11889          strained        anger
## 11890 11890          strained     negative
## 11891 11891           straits         fear
## 11892 11892           straits     negative
## 11893 11893          stranded     negative
## 11894 11894          stranger         fear
## 11895 11895          stranger     negative
## 11896 11896          strangle        anger
## 11897 11897          strangle      disgust
## 11898 11898          strangle         fear
## 11899 11899          strangle     negative
## 11900 11900          strangle      sadness
## 11901 11901          strangle     surprise
## 11902 11902         strategic     positive
## 11903 11903        strategist anticipation
## 11904 11904        strategist     positive
## 11905 11905        strategist        trust
## 11906 11906             stray     negative
## 11907 11907          strength     positive
## 11908 11908          strength        trust
## 11909 11909        strengthen     positive
## 11910 11910     strengthening          joy
## 11911 11911     strengthening     positive
## 11912 11912     strengthening        trust
## 11913 11913            stress     negative
## 11914 11914         stretcher         fear
## 11915 11915         stretcher      sadness
## 11916 11916          stricken      sadness
## 11917 11917            strife        anger
## 11918 11918            strife     negative
## 11919 11919            strike        anger
## 11920 11920            strike     negative
## 11921 11921          striking     positive
## 11922 11922        strikingly     positive
## 11923 11923             strip     negative
## 11924 11924             strip      sadness
## 11925 11925            stripe     negative
## 11926 11926          stripped        anger
## 11927 11927          stripped anticipation
## 11928 11928          stripped      disgust
## 11929 11929          stripped         fear
## 11930 11930          stripped     negative
## 11931 11931          stripped      sadness
## 11932 11932            strive anticipation
## 11933 11933            stroke         fear
## 11934 11934            stroke     negative
## 11935 11935            stroke      sadness
## 11936 11936          strongly     positive
## 11937 11937        structural        trust
## 11938 11938         structure     positive
## 11939 11939         structure        trust
## 11940 11940          struggle        anger
## 11941 11941          struggle         fear
## 11942 11942          struggle     negative
## 11943 11943          struggle      sadness
## 11944 11944             strut     negative
## 11945 11945              stud     positive
## 11946 11946             study     positive
## 11947 11947            stuffy     negative
## 11948 11948           stumble     negative
## 11949 11949           stunned         fear
## 11950 11950           stunned     negative
## 11951 11951           stunned     surprise
## 11952 11952           stunted     negative
## 11953 11953            stupid     negative
## 11954 11954         stupidity     negative
## 11955 11955            stupor     negative
## 11956 11956            sturdy     positive
## 11957 11957               sty      disgust
## 11958 11958               sty     negative
## 11959 11959            subdue     negative
## 11960 11960            subito     surprise
## 11961 11961           subject     negative
## 11962 11962         subjected     negative
## 11963 11963         subjected      sadness
## 11964 11964        subjection     negative
## 11965 11965       subjugation        anger
## 11966 11966       subjugation      disgust
## 11967 11967       subjugation         fear
## 11968 11968       subjugation     negative
## 11969 11969       subjugation      sadness
## 11970 11970       sublimation          joy
## 11971 11971       sublimation     positive
## 11972 11972            submit anticipation
## 11973 11973       subordinate         fear
## 11974 11974       subordinate     negative
## 11975 11975          subpoena     negative
## 11976 11976         subscribe anticipation
## 11977 11977        subsidence     negative
## 11978 11978        subsidence      sadness
## 11979 11979           subsidy        anger
## 11980 11980           subsidy      disgust
## 11981 11981           subsidy     negative
## 11982 11982           subsist     negative
## 11983 11983         substance     positive
## 11984 11984      substantiate        trust
## 11985 11985       substantive     positive
## 11986 11986          subtract     negative
## 11987 11987        subversion        anger
## 11988 11988        subversion         fear
## 11989 11989        subversion     negative
## 11990 11990        subversive        anger
## 11991 11991        subversive     negative
## 11992 11992        subversive     surprise
## 11993 11993           subvert      disgust
## 11994 11994           subvert         fear
## 11995 11995           subvert     negative
## 11996 11996           subvert      sadness
## 11997 11997           succeed anticipation
## 11998 11998           succeed          joy
## 11999 11999           succeed     positive
## 12000 12000           succeed     surprise
## 12001 12001           succeed        trust
## 12002 12002        succeeding anticipation
## 12003 12003        succeeding          joy
## 12004 12004        succeeding     positive
## 12005 12005        succeeding        trust
## 12006 12006           success anticipation
## 12007 12007           success          joy
## 12008 12008           success     positive
## 12009 12009        successful anticipation
## 12010 12010        successful          joy
## 12011 12011        successful     positive
## 12012 12012        successful        trust
## 12013 12013          succinct     positive
## 12014 12014         succulent     negative
## 12015 12015         succulent     positive
## 12016 12016           succumb     negative
## 12017 12017              suck     negative
## 12018 12018            sucker        anger
## 12019 12019            sucker     negative
## 12020 12020            sudden     surprise
## 12021 12021          suddenly     surprise
## 12022 12022               sue        anger
## 12023 12023               sue     negative
## 12024 12024               sue      sadness
## 12025 12025            suffer     negative
## 12026 12026          sufferer         fear
## 12027 12027          sufferer     negative
## 12028 12028          sufferer      sadness
## 12029 12029         suffering      disgust
## 12030 12030         suffering         fear
## 12031 12031         suffering     negative
## 12032 12032         suffering      sadness
## 12033 12033       sufficiency     positive
## 12034 12034       suffocating      disgust
## 12035 12035       suffocating         fear
## 12036 12036       suffocating     negative
## 12037 12037       suffocating      sadness
## 12038 12038       suffocation        anger
## 12039 12039       suffocation         fear
## 12040 12040       suffocation     negative
## 12041 12041             sugar     positive
## 12042 12042           suggest        trust
## 12043 12043          suicidal        anger
## 12044 12044          suicidal      disgust
## 12045 12045          suicidal         fear
## 12046 12046          suicidal     negative
## 12047 12047          suicidal      sadness
## 12048 12048           suicide        anger
## 12049 12049           suicide         fear
## 12050 12050           suicide     negative
## 12051 12051           suicide      sadness
## 12052 12052          suitable     positive
## 12053 12053            sullen        anger
## 12054 12054            sullen     negative
## 12055 12055            sullen      sadness
## 12056 12056            sultan         fear
## 12057 12057            sultry     positive
## 12058 12058           summons     negative
## 12059 12059              sump      disgust
## 12060 12060               sun anticipation
## 12061 12061               sun          joy
## 12062 12062               sun     positive
## 12063 12063               sun     surprise
## 12064 12064               sun        trust
## 12065 12065           sundial anticipation
## 12066 12066           sundial        trust
## 12067 12067              sunk      disgust
## 12068 12068              sunk         fear
## 12069 12069              sunk     negative
## 12070 12070              sunk      sadness
## 12071 12071             sunny anticipation
## 12072 12072             sunny          joy
## 12073 12073             sunny     positive
## 12074 12074             sunny     surprise
## 12075 12075            sunset anticipation
## 12076 12076            sunset     positive
## 12077 12077          sunshine          joy
## 12078 12078          sunshine     positive
## 12079 12079            superb     positive
## 12080 12080       superficial     negative
## 12081 12081       superfluous     negative
## 12082 12082        superhuman     positive
## 12083 12083          superior     positive
## 12084 12084       superiority     positive
## 12085 12085          superman          joy
## 12086 12086          superman     positive
## 12087 12087          superman        trust
## 12088 12088         superstar          joy
## 12089 12089         superstar     positive
## 12090 12090         superstar        trust
## 12091 12091      superstition         fear
## 12092 12092      superstition     negative
## 12093 12093      superstition     positive
## 12094 12094     superstitious anticipation
## 12095 12095     superstitious         fear
## 12096 12096     superstitious     negative
## 12097 12097      supplication     positive
## 12098 12098      supplication        trust
## 12099 12099          supplies     positive
## 12100 12100            supply     positive
## 12101 12101         supported     positive
## 12102 12102         supporter          joy
## 12103 12103         supporter     positive
## 12104 12104         supporter        trust
## 12105 12105        supporting     positive
## 12106 12106        supporting        trust
## 12107 12107          suppress        anger
## 12108 12108          suppress         fear
## 12109 12109          suppress     negative
## 12110 12110          suppress      sadness
## 12111 12111       suppression        anger
## 12112 12112       suppression      disgust
## 12113 12113       suppression         fear
## 12114 12114       suppression     negative
## 12115 12115         supremacy        anger
## 12116 12116         supremacy anticipation
## 12117 12117         supremacy         fear
## 12118 12118         supremacy          joy
## 12119 12119         supremacy     negative
## 12120 12120         supremacy     positive
## 12121 12121         supremacy     surprise
## 12122 12122         supremacy        trust
## 12123 12123           supreme     positive
## 12124 12124         supremely     positive
## 12125 12125         surcharge        anger
## 12126 12126         surcharge     negative
## 12127 12127            surety     positive
## 12128 12128            surety        trust
## 12129 12129             surge     surprise
## 12130 12130           surgery         fear
## 12131 12131           surgery      sadness
## 12132 12132             surly        anger
## 12133 12133             surly      disgust
## 12134 12134             surly     negative
## 12135 12135           surmise     positive
## 12136 12136        surpassing     positive
## 12137 12137          surprise         fear
## 12138 12138          surprise          joy
## 12139 12139          surprise     positive
## 12140 12140          surprise     surprise
## 12141 12141         surprised     surprise
## 12142 12142        surprising     surprise
## 12143 12143      surprisingly anticipation
## 12144 12144      surprisingly     surprise
## 12145 12145         surrender         fear
## 12146 12146         surrender     negative
## 12147 12147         surrender      sadness
## 12148 12148      surrendering     negative
## 12149 12149      surrendering      sadness
## 12150 12150         surrogate        trust
## 12151 12151          surround anticipation
## 12152 12152          surround     negative
## 12153 12153          surround     positive
## 12154 12154      surveillance         fear
## 12155 12155         surveying     positive
## 12156 12156           survive     positive
## 12157 12157       susceptible     negative
## 12158 12158           suspect         fear
## 12159 12159           suspect     negative
## 12160 12160          suspense anticipation
## 12161 12161          suspense         fear
## 12162 12162          suspense     surprise
## 12163 12163        suspension         fear
## 12164 12164        suspension     negative
## 12165 12165         suspicion         fear
## 12166 12166         suspicion     negative
## 12167 12167        suspicious        anger
## 12168 12168        suspicious anticipation
## 12169 12169        suspicious     negative
## 12170 12170              swab     negative
## 12171 12171             swamp      disgust
## 12172 12172             swamp         fear
## 12173 12173             swamp     negative
## 12174 12174            swampy      disgust
## 12175 12175            swampy         fear
## 12176 12176            swampy     negative
## 12177 12177             swarm      disgust
## 12178 12178          swastika        anger
## 12179 12179          swastika         fear
## 12180 12180          swastika     negative
## 12181 12181             swear     positive
## 12182 12182             swear        trust
## 12183 12183             sweat         fear
## 12184 12184             sweet anticipation
## 12185 12185             sweet          joy
## 12186 12186             sweet     positive
## 12187 12187             sweet     surprise
## 12188 12188             sweet        trust
## 12189 12189        sweetheart anticipation
## 12190 12190        sweetheart          joy
## 12191 12191        sweetheart     positive
## 12192 12192        sweetheart      sadness
## 12193 12193        sweetheart        trust
## 12194 12194           sweetie     positive
## 12195 12195         sweetness     positive
## 12196 12196            sweets anticipation
## 12197 12197            sweets          joy
## 12198 12198            sweets     positive
## 12199 12199          swelling         fear
## 12200 12200          swelling     negative
## 12201 12201            swerve         fear
## 12202 12202            swerve     surprise
## 12203 12203             swift     positive
## 12204 12204              swig      disgust
## 12205 12205              swig     negative
## 12206 12206              swim anticipation
## 12207 12207              swim         fear
## 12208 12208              swim          joy
## 12209 12209              swim     positive
## 12210 12210             swine      disgust
## 12211 12211             swine     negative
## 12212 12212           swollen     negative
## 12213 12213          symbolic     positive
## 12214 12214       symmetrical     positive
## 12215 12215          symmetry          joy
## 12216 12216          symmetry     positive
## 12217 12217          symmetry        trust
## 12218 12218       sympathetic         fear
## 12219 12219       sympathetic          joy
## 12220 12220       sympathetic     positive
## 12221 12221       sympathetic      sadness
## 12222 12222       sympathetic        trust
## 12223 12223        sympathize      sadness
## 12224 12224          sympathy     positive
## 12225 12225          sympathy      sadness
## 12226 12226          symphony anticipation
## 12227 12227          symphony          joy
## 12228 12228          symphony     positive
## 12229 12229           symptom     negative
## 12230 12230       synchronize anticipation
## 12231 12231       synchronize          joy
## 12232 12232       synchronize     positive
## 12233 12233       synchronize     surprise
## 12234 12234       synchronize        trust
## 12235 12235           syncope         fear
## 12236 12236           syncope     negative
## 12237 12237           syncope      sadness
## 12238 12238           syncope     surprise
## 12239 12239       synergistic     positive
## 12240 12240       synergistic        trust
## 12241 12241             synod     positive
## 12242 12242             synod        trust
## 12243 12243        synonymous         fear
## 12244 12244        synonymous     negative
## 12245 12245        synonymous     positive
## 12246 12246        synonymous        trust
## 12247 12247           syringe         fear
## 12248 12248            system        trust
## 12249 12249             taboo      disgust
## 12250 12250             taboo         fear
## 12251 12251             taboo     negative
## 12252 12252          tabulate anticipation
## 12253 12253            tackle        anger
## 12254 12254            tackle     surprise
## 12255 12255              tact     positive
## 12256 12256           tactics         fear
## 12257 12257           tactics        trust
## 12258 12258             taint     negative
## 12259 12259             taint      sadness
## 12260 12260              tale     positive
## 12261 12261            talent     positive
## 12262 12262          talisman     positive
## 12263 12263              talk     positive
## 12264 12264            talons        anger
## 12265 12265            talons         fear
## 12266 12266            talons     negative
## 12267 12267            tandem        trust
## 12268 12268           tangled     negative
## 12269 12269            tanned     positive
## 12270 12270       tantalizing anticipation
## 12271 12271       tantalizing          joy
## 12272 12272       tantalizing     negative
## 12273 12273       tantalizing     positive
## 12274 12274       tantalizing     surprise
## 12275 12275        tantamount        trust
## 12276 12276         tardiness     negative
## 12277 12277             tardy     negative
## 12278 12278            tariff        anger
## 12279 12279            tariff      disgust
## 12280 12280            tariff     negative
## 12281 12281           tarnish      disgust
## 12282 12282           tarnish     negative
## 12283 12283           tarnish      sadness
## 12284 12284             tarry     negative
## 12285 12285              task     positive
## 12286 12286          tasteful     positive
## 12287 12287         tasteless      disgust
## 12288 12288         tasteless     negative
## 12289 12289             tasty     positive
## 12290 12290            taught        trust
## 12291 12291             taunt        anger
## 12292 12292             taunt         fear
## 12293 12293             taunt     negative
## 12294 12294             taunt      sadness
## 12295 12295             tawny      disgust
## 12296 12296               tax     negative
## 12297 12297               tax      sadness
## 12298 12298             teach          joy
## 12299 12299             teach     positive
## 12300 12300             teach     surprise
## 12301 12301             teach        trust
## 12302 12302           teacher     positive
## 12303 12303           teacher        trust
## 12304 12304              team        trust
## 12305 12305           tearful      disgust
## 12306 12306           tearful         fear
## 12307 12307           tearful      sadness
## 12308 12308             tease        anger
## 12309 12309             tease anticipation
## 12310 12310             tease     negative
## 12311 12311             tease      sadness
## 12312 12312           teasing        anger
## 12313 12313           teasing         fear
## 12314 12314           teasing     negative
## 12315 12315        technology     positive
## 12316 12316           tedious     negative
## 12317 12317            tedium     negative
## 12318 12318           teeming      disgust
## 12319 12319             teens     negative
## 12320 12320             teens     positive
## 12321 12321        temperance     positive
## 12322 12322         temperate        trust
## 12323 12323          tempered     positive
## 12324 12324           tempest        anger
## 12325 12325           tempest anticipation
## 12326 12326           tempest         fear
## 12327 12327           tempest     negative
## 12328 12328           tempest      sadness
## 12329 12329           tempest     surprise
## 12330 12330        temptation     negative
## 12331 12331           tenable     positive
## 12332 12332         tenacious     positive
## 12333 12333          tenacity     positive
## 12334 12334           tenancy     positive
## 12335 12335            tenant     positive
## 12336 12336            tender          joy
## 12337 12337            tender     positive
## 12338 12338            tender        trust
## 12339 12339        tenderness          joy
## 12340 12340        tenderness     positive
## 12341 12341          tenement     negative
## 12342 12342           tension        anger
## 12343 12343          terminal         fear
## 12344 12344          terminal     negative
## 12345 12345          terminal      sadness
## 12346 12346         terminate      sadness
## 12347 12347       termination     negative
## 12348 12348       termination      sadness
## 12349 12349           termite      disgust
## 12350 12350           termite     negative
## 12351 12351          terrible        anger
## 12352 12352          terrible      disgust
## 12353 12353          terrible         fear
## 12354 12354          terrible     negative
## 12355 12355          terrible      sadness
## 12356 12356          terribly      sadness
## 12357 12357          terrific      sadness
## 12358 12358            terror         fear
## 12359 12359            terror     negative
## 12360 12360         terrorism        anger
## 12361 12361         terrorism      disgust
## 12362 12362         terrorism         fear
## 12363 12363         terrorism     negative
## 12364 12364         terrorism      sadness
## 12365 12365         terrorist        anger
## 12366 12366         terrorist      disgust
## 12367 12367         terrorist         fear
## 12368 12368         terrorist     negative
## 12369 12369         terrorist      sadness
## 12370 12370         terrorist     surprise
## 12371 12371         terrorize        anger
## 12372 12372         terrorize         fear
## 12373 12373         terrorize     negative
## 12374 12374         terrorize      sadness
## 12375 12375         testament anticipation
## 12376 12376         testament        trust
## 12377 12377         testimony        trust
## 12378 12378           tetanus      disgust
## 12379 12379           tetanus     negative
## 12380 12380            tether     negative
## 12381 12381          thankful          joy
## 12382 12382          thankful     positive
## 12383 12383      thanksgiving          joy
## 12384 12384      thanksgiving     positive
## 12385 12385             theft        anger
## 12386 12386             theft      disgust
## 12387 12387             theft         fear
## 12388 12388             theft     negative
## 12389 12389             theft      sadness
## 12390 12390            theism      disgust
## 12391 12391            theism     negative
## 12392 12392        theocratic        anger
## 12393 12393        theocratic         fear
## 12394 12394        theocratic     negative
## 12395 12395        theocratic      sadness
## 12396 12396        theocratic        trust
## 12397 12397       theological        trust
## 12398 12398          theology anticipation
## 12399 12399           theorem        trust
## 12400 12400       theoretical     positive
## 12401 12401            theory anticipation
## 12402 12402            theory        trust
## 12403 12403       therapeutic          joy
## 12404 12404       therapeutic     positive
## 12405 12405       therapeutic        trust
## 12406 12406      therapeutics     positive
## 12407 12407      thermocouple anticipation
## 12408 12408       thermometer        trust
## 12409 12409             thief        anger
## 12410 12410             thief      disgust
## 12411 12411             thief         fear
## 12412 12412             thief     negative
## 12413 12413             thief      sadness
## 12414 12414             thief     surprise
## 12415 12415           thinker     positive
## 12416 12416            thirst anticipation
## 12417 12417            thirst      sadness
## 12418 12418            thirst     surprise
## 12419 12419           thirsty     negative
## 12420 12420        thirteenth         fear
## 12421 12421             thorn     negative
## 12422 12422            thorny         fear
## 12423 12423            thorny     negative
## 12424 12424      thoroughbred     positive
## 12425 12425           thought anticipation
## 12426 12426        thoughtful     positive
## 12427 12427        thoughtful        trust
## 12428 12428    thoughtfulness     positive
## 12429 12429       thoughtless        anger
## 12430 12430       thoughtless      disgust
## 12431 12431       thoughtless     negative
## 12432 12432            thrash        anger
## 12433 12433            thrash      disgust
## 12434 12434            thrash         fear
## 12435 12435            thrash     negative
## 12436 12436            thrash      sadness
## 12437 12437            threat        anger
## 12438 12438            threat         fear
## 12439 12439            threat     negative
## 12440 12440          threaten        anger
## 12441 12441          threaten anticipation
## 12442 12442          threaten         fear
## 12443 12443          threaten     negative
## 12444 12444       threatening        anger
## 12445 12445       threatening      disgust
## 12446 12446       threatening         fear
## 12447 12447       threatening     negative
## 12448 12448            thresh        anger
## 12449 12449            thresh         fear
## 12450 12450            thresh     negative
## 12451 12451            thresh      sadness
## 12452 12452            thrift      disgust
## 12453 12453            thrift     positive
## 12454 12454            thrift        trust
## 12455 12455            thrill anticipation
## 12456 12456            thrill         fear
## 12457 12457            thrill          joy
## 12458 12458            thrill     positive
## 12459 12459            thrill     surprise
## 12460 12460         thrilling anticipation
## 12461 12461         thrilling          joy
## 12462 12462         thrilling     positive
## 12463 12463         thrilling     surprise
## 12464 12464          thriving anticipation
## 12465 12465          thriving          joy
## 12466 12466          thriving     positive
## 12467 12467             throb         fear
## 12468 12468             throb     negative
## 12469 12469             throb      sadness
## 12470 12470            throne     positive
## 12471 12471            throne        trust
## 12472 12472          throttle        anger
## 12473 12473          throttle     negative
## 12474 12474              thug        anger
## 12475 12475              thug      disgust
## 12476 12476              thug         fear
## 12477 12477              thug     negative
## 12478 12478             thump        anger
## 12479 12479             thump     negative
## 12480 12480          thumping         fear
## 12481 12481        thundering        anger
## 12482 12482        thundering         fear
## 12483 12483        thundering     negative
## 12484 12484            thwart     negative
## 12485 12485            thwart     surprise
## 12486 12486            tickle anticipation
## 12487 12487            tickle          joy
## 12488 12488            tickle     positive
## 12489 12489            tickle     surprise
## 12490 12490            tickle        trust
## 12491 12491              tiff        anger
## 12492 12492              tiff     negative
## 12493 12493           tighten        anger
## 12494 12494            tiling     positive
## 12495 12495              time anticipation
## 12496 12496            timely     positive
## 12497 12497             timid         fear
## 12498 12498             timid     negative
## 12499 12499             timid      sadness
## 12500 12500          timidity anticipation
## 12501 12501          timidity         fear
## 12502 12502          timidity     negative
## 12503 12503            tinsel          joy
## 12504 12504            tinsel     positive
## 12505 12505             tipsy     negative
## 12506 12506            tirade        anger
## 12507 12507            tirade      disgust
## 12508 12508            tirade     negative
## 12509 12509             tired     negative
## 12510 12510         tiredness     negative
## 12511 12511          tiresome     negative
## 12512 12512               tit     negative
## 12513 12513             title     positive
## 12514 12514             title        trust
## 12515 12515              toad      disgust
## 12516 12516              toad     negative
## 12517 12517             toast          joy
## 12518 12518             toast     positive
## 12519 12519           tobacco     negative
## 12520 12520            toilet      disgust
## 12521 12521            toilet     negative
## 12522 12522             toils     negative
## 12523 12523          tolerant     positive
## 12524 12524          tolerate        anger
## 12525 12525          tolerate     negative
## 12526 12526          tolerate      sadness
## 12527 12527        toleration     positive
## 12528 12528              tomb      sadness
## 12529 12529          tomorrow anticipation
## 12530 12530         toothache         fear
## 12531 12531         toothache     negative
## 12532 12532               top anticipation
## 12533 12533               top     positive
## 12534 12534               top        trust
## 12535 12535            topple     surprise
## 12536 12536           torment        anger
## 12537 12537           torment         fear
## 12538 12538           torment     negative
## 12539 12539           torment      sadness
## 12540 12540              torn     negative
## 12541 12541           tornado         fear
## 12542 12542           torpedo        anger
## 12543 12543           torpedo     negative
## 12544 12544           torrent         fear
## 12545 12545            torrid     negative
## 12546 12546              tort     negative
## 12547 12547          tortious        anger
## 12548 12548          tortious      disgust
## 12549 12549          tortious     negative
## 12550 12550           torture        anger
## 12551 12551           torture anticipation
## 12552 12552           torture      disgust
## 12553 12553           torture         fear
## 12554 12554           torture     negative
## 12555 12555           torture      sadness
## 12556 12556           touched     negative
## 12557 12557            touchy        anger
## 12558 12558            touchy     negative
## 12559 12559            touchy      sadness
## 12560 12560             tough     negative
## 12561 12561             tough      sadness
## 12562 12562         toughness        anger
## 12563 12563         toughness         fear
## 12564 12564         toughness     positive
## 12565 12565         toughness        trust
## 12566 12566             tower     positive
## 12567 12567          towering anticipation
## 12568 12568          towering         fear
## 12569 12569          towering     positive
## 12570 12570             toxic      disgust
## 12571 12571             toxic     negative
## 12572 12572             toxin         fear
## 12573 12573             toxin     negative
## 12574 12574             track anticipation
## 12575 12575             tract         fear
## 12576 12576             trade        trust
## 12577 12577       traditional     positive
## 12578 12578           tragedy         fear
## 12579 12579           tragedy     negative
## 12580 12580           tragedy      sadness
## 12581 12581            tragic     negative
## 12582 12582           trainer        trust
## 12583 12583           traitor        anger
## 12584 12584           traitor      disgust
## 12585 12585           traitor         fear
## 12586 12586           traitor     negative
## 12587 12587           traitor      sadness
## 12588 12588             tramp      disgust
## 12589 12589             tramp         fear
## 12590 12590             tramp     negative
## 12591 12591             tramp      sadness
## 12592 12592            trance     negative
## 12593 12593          tranquil          joy
## 12594 12594          tranquil     positive
## 12595 12595       tranquility          joy
## 12596 12596       tranquility     positive
## 12597 12597       tranquility        trust
## 12598 12598       transaction        trust
## 12599 12599     transcendence anticipation
## 12600 12600     transcendence          joy
## 12601 12601     transcendence     positive
## 12602 12602     transcendence     surprise
## 12603 12603     transcendence        trust
## 12604 12604    transcendental     positive
## 12605 12605        transcript        trust
## 12606 12606     transgression     negative
## 12607 12607      transitional anticipation
## 12608 12608       translation        trust
## 12609 12609         trappings     negative
## 12610 12610             traps     negative
## 12611 12611             trash      disgust
## 12612 12612             trash     negative
## 12613 12613             trash      sadness
## 12614 12614            trashy      disgust
## 12615 12615            trashy     negative
## 12616 12616         traumatic        anger
## 12617 12617         traumatic         fear
## 12618 12618         traumatic     negative
## 12619 12619         traumatic      sadness
## 12620 12620           travail     negative
## 12621 12621         traveling     positive
## 12622 12622          travesty      disgust
## 12623 12623          travesty         fear
## 12624 12624          travesty     negative
## 12625 12625          travesty      sadness
## 12626 12626       treacherous        anger
## 12627 12627       treacherous      disgust
## 12628 12628       treacherous         fear
## 12629 12629       treacherous     negative
## 12630 12630         treachery        anger
## 12631 12631         treachery         fear
## 12632 12632         treachery     negative
## 12633 12633         treachery      sadness
## 12634 12634         treachery     surprise
## 12635 12635         treadmill anticipation
## 12636 12636           treason        anger
## 12637 12637           treason      disgust
## 12638 12638           treason         fear
## 12639 12639           treason     negative
## 12640 12640           treason     surprise
## 12641 12641          treasure anticipation
## 12642 12642          treasure          joy
## 12643 12643          treasure     positive
## 12644 12644          treasure        trust
## 12645 12645         treasurer        trust
## 12646 12646             treat        anger
## 12647 12647             treat anticipation
## 12648 12648             treat      disgust
## 12649 12649             treat         fear
## 12650 12650             treat          joy
## 12651 12651             treat     negative
## 12652 12652             treat     positive
## 12653 12653             treat      sadness
## 12654 12654             treat     surprise
## 12655 12655             treat        trust
## 12656 12656              tree        anger
## 12657 12657              tree anticipation
## 12658 12658              tree      disgust
## 12659 12659              tree          joy
## 12660 12660              tree     positive
## 12661 12661              tree     surprise
## 12662 12662              tree        trust
## 12663 12663         trembling         fear
## 12664 12664         trembling     negative
## 12665 12665      tremendously     positive
## 12666 12666            tremor        anger
## 12667 12667            tremor anticipation
## 12668 12668            tremor         fear
## 12669 12669            tremor     negative
## 12670 12670            tremor      sadness
## 12671 12671             trend     positive
## 12672 12672            trendy     positive
## 12673 12673       trepidation anticipation
## 12674 12674       trepidation         fear
## 12675 12675       trepidation     negative
## 12676 12676       trepidation     surprise
## 12677 12677          trespass        anger
## 12678 12678          trespass     negative
## 12679 12679             tribe        trust
## 12680 12680       tribulation         fear
## 12681 12681       tribulation     negative
## 12682 12682       tribulation      sadness
## 12683 12683          tribunal anticipation
## 12684 12684          tribunal      disgust
## 12685 12685          tribunal         fear
## 12686 12686          tribunal     negative
## 12687 12687          tribunal        trust
## 12688 12688           tribune        trust
## 12689 12689         tributary anticipation
## 12690 12690         tributary     positive
## 12691 12691           tribute     positive
## 12692 12692             trick     negative
## 12693 12693             trick     surprise
## 12694 12694          trickery        anger
## 12695 12695          trickery      disgust
## 12696 12696          trickery         fear
## 12697 12697          trickery     negative
## 12698 12698          trickery      sadness
## 12699 12699          trickery     surprise
## 12700 12700            trifle     negative
## 12701 12701              trig     positive
## 12702 12702              trip     surprise
## 12703 12703          tripping        anger
## 12704 12704          tripping     negative
## 12705 12705          tripping      sadness
## 12706 12706           triumph anticipation
## 12707 12707           triumph          joy
## 12708 12708           triumph     positive
## 12709 12709        triumphant anticipation
## 12710 12710        triumphant          joy
## 12711 12711        triumphant     positive
## 12712 12712        triumphant        trust
## 12713 12713             troll        anger
## 12714 12714             troll         fear
## 12715 12715             troll     negative
## 12716 12716            trophy anticipation
## 12717 12717            trophy          joy
## 12718 12718            trophy     positive
## 12719 12719            trophy     surprise
## 12720 12720            trophy        trust
## 12721 12721       troublesome        anger
## 12722 12722       troublesome         fear
## 12723 12723       troublesome     negative
## 12724 12724             truce          joy
## 12725 12725             truce     positive
## 12726 12726             truce        trust
## 12727 12727             truck        trust
## 12728 12728              true          joy
## 12729 12729              true     positive
## 12730 12730              true        trust
## 12731 12731             trump     surprise
## 12732 12732           trumpet     negative
## 12733 12733             truss        trust
## 12734 12734             trust        trust
## 12735 12735           trustee        trust
## 12736 12736            trusty     positive
## 12737 12737             truth     positive
## 12738 12738             truth        trust
## 12739 12739          truthful        trust
## 12740 12740      truthfulness     positive
## 12741 12741      truthfulness        trust
## 12742 12742            tumble     negative
## 12743 12743             tumor         fear
## 12744 12744             tumor     negative
## 12745 12745            tumour         fear
## 12746 12746            tumour     negative
## 12747 12747            tumour      sadness
## 12748 12748            tumult        anger
## 12749 12749            tumult         fear
## 12750 12750            tumult     negative
## 12751 12751            tumult     surprise
## 12752 12752        tumultuous        anger
## 12753 12753        tumultuous         fear
## 12754 12754        tumultuous     negative
## 12755 12755        turbulence        anger
## 12756 12756        turbulence         fear
## 12757 12757        turbulence     negative
## 12758 12758         turbulent         fear
## 12759 12759         turbulent     negative
## 12760 12760           turmoil        anger
## 12761 12761           turmoil         fear
## 12762 12762           turmoil     negative
## 12763 12763           turmoil      sadness
## 12764 12764            tussle        anger
## 12765 12765          tutelage     positive
## 12766 12766          tutelage        trust
## 12767 12767             tutor     positive
## 12768 12768              twin     positive
## 12769 12769           twinkle anticipation
## 12770 12770           twinkle          joy
## 12771 12771           twinkle     positive
## 12772 12772            twitch     negative
## 12773 12773           typhoon         fear
## 12774 12774           typhoon     negative
## 12775 12775        tyrannical        anger
## 12776 12776        tyrannical      disgust
## 12777 12777        tyrannical         fear
## 12778 12778        tyrannical     negative
## 12779 12779           tyranny         fear
## 12780 12780           tyranny     negative
## 12781 12781           tyranny      sadness
## 12782 12782            tyrant        anger
## 12783 12783            tyrant      disgust
## 12784 12784            tyrant         fear
## 12785 12785            tyrant     negative
## 12786 12786            tyrant      sadness
## 12787 12787          ugliness      disgust
## 12788 12788          ugliness         fear
## 12789 12789          ugliness     negative
## 12790 12790          ugliness      sadness
## 12791 12791              ugly      disgust
## 12792 12792              ugly     negative
## 12793 12793             ulcer        anger
## 12794 12794             ulcer      disgust
## 12795 12795             ulcer         fear
## 12796 12796             ulcer     negative
## 12797 12797             ulcer      sadness
## 12798 12798          ulterior     negative
## 12799 12799          ultimate anticipation
## 12800 12800          ultimate      sadness
## 12801 12801        ultimately anticipation
## 12802 12802        ultimately     positive
## 12803 12803         ultimatum        anger
## 12804 12804         ultimatum         fear
## 12805 12805         ultimatum     negative
## 12806 12806            umpire     positive
## 12807 12807            umpire        trust
## 12808 12808            unable     negative
## 12809 12809            unable      sadness
## 12810 12810      unacceptable     negative
## 12811 12811      unacceptable      sadness
## 12812 12812     unaccountable anticipation
## 12813 12813     unaccountable      disgust
## 12814 12814     unaccountable     negative
## 12815 12815     unaccountable      sadness
## 12816 12816     unaccountable        trust
## 12817 12817    unacknowledged      sadness
## 12818 12818         unanimity     positive
## 12819 12819         unanimous     positive
## 12820 12820     unanticipated     surprise
## 12821 12821        unapproved     negative
## 12822 12822        unassuming     positive
## 12823 12823        unattached     negative
## 12824 12824      unattainable        anger
## 12825 12825      unattainable     negative
## 12826 12826      unattainable      sadness
## 12827 12827      unattractive      disgust
## 12828 12828      unattractive     negative
## 12829 12829      unattractive      sadness
## 12830 12830      unauthorized     negative
## 12831 12831       unavoidable     negative
## 12832 12832           unaware     negative
## 12833 12833        unbearable      disgust
## 12834 12834        unbearable     negative
## 12835 12835        unbearable      sadness
## 12836 12836          unbeaten anticipation
## 12837 12837          unbeaten          joy
## 12838 12838          unbeaten     negative
## 12839 12839          unbeaten     positive
## 12840 12840          unbeaten      sadness
## 12841 12841          unbeaten     surprise
## 12842 12842          unbelief     negative
## 12843 12843      unbelievable     negative
## 12844 12844          unbiased     positive
## 12845 12845            unborn     negative
## 12846 12846       unbreakable     positive
## 12847 12847         unbridled        anger
## 12848 12848         unbridled anticipation
## 12849 12849         unbridled         fear
## 12850 12850         unbridled     negative
## 12851 12851         unbridled     positive
## 12852 12852         unbridled     surprise
## 12853 12853          unbroken     positive
## 12854 12854          unbroken        trust
## 12855 12855           uncanny         fear
## 12856 12856           uncanny     negative
## 12857 12857           uncanny     surprise
## 12858 12858          uncaring        anger
## 12859 12859          uncaring      disgust
## 12860 12860          uncaring     negative
## 12861 12861          uncaring      sadness
## 12862 12862         uncertain        anger
## 12863 12863         uncertain      disgust
## 12864 12864         uncertain         fear
## 12865 12865         uncertain     negative
## 12866 12866         uncertain     surprise
## 12867 12867      unchangeable     negative
## 12868 12868           unclean      disgust
## 12869 12869           unclean     negative
## 12870 12870     uncomfortable     negative
## 12871 12871    unconscionable      disgust
## 12872 12872    unconscionable     negative
## 12873 12873       unconscious     negative
## 12874 12874  unconstitutional     negative
## 12875 12875     unconstrained          joy
## 12876 12876     unconstrained     positive
## 12877 12877    uncontrollable        anger
## 12878 12878    uncontrollable anticipation
## 12879 12879    uncontrollable     negative
## 12880 12880    uncontrollable     surprise
## 12881 12881      uncontrolled     negative
## 12882 12882           uncover     surprise
## 12883 12883         undecided anticipation
## 12884 12884         undecided         fear
## 12885 12885         undecided     negative
## 12886 12886     underestimate     surprise
## 12887 12887         underline     positive
## 12888 12888        undermined     negative
## 12889 12889         underpaid        anger
## 12890 12890         underpaid     negative
## 12891 12891         underpaid      sadness
## 12892 12892        undersized     negative
## 12893 12893     understanding     positive
## 12894 12894     understanding        trust
## 12895 12895        undertaker      sadness
## 12896 12896       undertaking anticipation
## 12897 12897        underwrite     positive
## 12898 12898        underwrite        trust
## 12899 12899       undesirable        anger
## 12900 12900       undesirable      disgust
## 12901 12901       undesirable         fear
## 12902 12902       undesirable     negative
## 12903 12903       undesirable      sadness
## 12904 12904         undesired     negative
## 12905 12905         undesired      sadness
## 12906 12906       undisclosed anticipation
## 12907 12907      undiscovered     surprise
## 12908 12908         undivided     positive
## 12909 12909              undo     negative
## 12910 12910         undoubted anticipation
## 12911 12911         undoubted      disgust
## 12912 12912           undying anticipation
## 12913 12913           undying          joy
## 12914 12914           undying     positive
## 12915 12915           undying      sadness
## 12916 12916           undying        trust
## 12917 12917        uneasiness anticipation
## 12918 12918        uneasiness     negative
## 12919 12919        uneasiness      sadness
## 12920 12920            uneasy      disgust
## 12921 12921            uneasy         fear
## 12922 12922            uneasy     negative
## 12923 12923        uneducated     negative
## 12924 12924        uneducated      sadness
## 12925 12925        unemployed         fear
## 12926 12926        unemployed     negative
## 12927 12927        unemployed      sadness
## 12928 12928           unequal        anger
## 12929 12929           unequal      disgust
## 12930 12930           unequal         fear
## 12931 12931           unequal     negative
## 12932 12932           unequal      sadness
## 12933 12933       unequivocal        trust
## 12934 12934     unequivocally     positive
## 12935 12935            uneven     negative
## 12936 12936        unexpected anticipation
## 12937 12937        unexpected         fear
## 12938 12938        unexpected          joy
## 12939 12939        unexpected     negative
## 12940 12940        unexpected     positive
## 12941 12941        unexpected     surprise
## 12942 12942      unexpectedly     surprise
## 12943 12943       unexplained anticipation
## 12944 12944       unexplained     negative
## 12945 12945       unexplained      sadness
## 12946 12946            unfair        anger
## 12947 12947            unfair      disgust
## 12948 12948            unfair     negative
## 12949 12949            unfair      sadness
## 12950 12950        unfairness        anger
## 12951 12951        unfairness     negative
## 12952 12952        unfairness      sadness
## 12953 12953        unfaithful      disgust
## 12954 12954        unfaithful     negative
## 12955 12955       unfavorable      disgust
## 12956 12956       unfavorable     negative
## 12957 12957       unfavorable      sadness
## 12958 12958        unfinished     negative
## 12959 12959            unfold anticipation
## 12960 12960            unfold     positive
## 12961 12961        unforeseen     surprise
## 12962 12962       unforgiving        anger
## 12963 12963       unforgiving     negative
## 12964 12964       unforgiving      sadness
## 12965 12965       unfortunate     negative
## 12966 12966       unfortunate      sadness
## 12967 12967        unfriendly        anger
## 12968 12968        unfriendly      disgust
## 12969 12969        unfriendly         fear
## 12970 12970        unfriendly     negative
## 12971 12971        unfriendly      sadness
## 12972 12972       unfulfilled        anger
## 12973 12973       unfulfilled anticipation
## 12974 12974       unfulfilled     negative
## 12975 12975       unfulfilled      sadness
## 12976 12976       unfulfilled     surprise
## 12977 12977       unfurnished     negative
## 12978 12978           ungodly     negative
## 12979 12979           ungodly      sadness
## 12980 12980        ungrateful        anger
## 12981 12981        ungrateful      disgust
## 12982 12982        ungrateful     negative
## 12983 12983         unguarded     surprise
## 12984 12984       unhappiness     negative
## 12985 12985       unhappiness      sadness
## 12986 12986           unhappy        anger
## 12987 12987           unhappy      disgust
## 12988 12988           unhappy     negative
## 12989 12989           unhappy      sadness
## 12990 12990         unhealthy      disgust
## 12991 12991         unhealthy         fear
## 12992 12992         unhealthy     negative
## 12993 12993         unhealthy      sadness
## 12994 12994            unholy         fear
## 12995 12995            unholy     negative
## 12996 12996       unification anticipation
## 12997 12997       unification          joy
## 12998 12998       unification     positive
## 12999 12999       unification        trust
## 13000 13000         uniformly     positive
## 13001 13001      unimaginable     negative
## 13002 13002      unimaginable     positive
## 13003 13003      unimaginable     surprise
## 13004 13004       unimportant     negative
## 13005 13005       unimportant      sadness
## 13006 13006       unimpressed     negative
## 13007 13007        unimproved     negative
## 13008 13008        uninfected     positive
## 13009 13009        uninformed     negative
## 13010 13010       uninitiated     negative
## 13011 13011        uninspired     negative
## 13012 13012        uninspired      sadness
## 13013 13013    unintelligible     negative
## 13014 13014        unintended     surprise
## 13015 13015     unintentional     surprise
## 13016 13016   unintentionally     negative
## 13017 13017   unintentionally     surprise
## 13018 13018      uninterested     negative
## 13019 13019      uninterested      sadness
## 13020 13020     uninteresting     negative
## 13021 13021     uninteresting      sadness
## 13022 13022         uninvited      sadness
## 13023 13023            unique     positive
## 13024 13024            unique     surprise
## 13025 13025            unison     positive
## 13026 13026           unitary     positive
## 13027 13027            united     positive
## 13028 13028            united        trust
## 13029 13029             unity     positive
## 13030 13030             unity        trust
## 13031 13031        university anticipation
## 13032 13032        university     positive
## 13033 13033            unjust        anger
## 13034 13034            unjust     negative
## 13035 13035     unjustifiable        anger
## 13036 13036     unjustifiable      disgust
## 13037 13037     unjustifiable         fear
## 13038 13038     unjustifiable     negative
## 13039 13039       unjustified     negative
## 13040 13040            unkind        anger
## 13041 13041            unkind      disgust
## 13042 13042            unkind         fear
## 13043 13043            unkind     negative
## 13044 13044            unkind      sadness
## 13045 13045           unknown anticipation
## 13046 13046           unknown         fear
## 13047 13047           unknown     negative
## 13048 13048          unlawful        anger
## 13049 13049          unlawful      disgust
## 13050 13050          unlawful         fear
## 13051 13051          unlawful     negative
## 13052 13052          unlawful      sadness
## 13053 13053        unlicensed     negative
## 13054 13054         unlimited     positive
## 13055 13055           unlucky        anger
## 13056 13056           unlucky      disgust
## 13057 13057           unlucky         fear
## 13058 13058           unlucky     negative
## 13059 13059           unlucky      sadness
## 13060 13060      unmanageable      disgust
## 13061 13061      unmanageable     negative
## 13062 13062         unnatural      disgust
## 13063 13063         unnatural         fear
## 13064 13064         unnatural     negative
## 13065 13065        unofficial     negative
## 13066 13066            unpaid        anger
## 13067 13067            unpaid     negative
## 13068 13068            unpaid      sadness
## 13069 13069        unpleasant      disgust
## 13070 13070        unpleasant     negative
## 13071 13071        unpleasant      sadness
## 13072 13072         unpopular      disgust
## 13073 13073         unpopular     negative
## 13074 13074         unpopular      sadness
## 13075 13075     unprecedented     surprise
## 13076 13076     unpredictable     negative
## 13077 13077     unpredictable     surprise
## 13078 13078        unprepared     negative
## 13079 13079     unpretentious     positive
## 13080 13080      unproductive     negative
## 13081 13081      unprofitable     negative
## 13082 13082       unprotected     negative
## 13083 13083       unpublished anticipation
## 13084 13084       unpublished     negative
## 13085 13085       unpublished      sadness
## 13086 13086    unquestionable     positive
## 13087 13087    unquestionable        trust
## 13088 13088    unquestionably     positive
## 13089 13089    unquestionably        trust
## 13090 13090      unquestioned     positive
## 13091 13091      unquestioned        trust
## 13092 13092        unreliable     negative
## 13093 13093        unreliable        trust
## 13094 13094        unrequited     negative
## 13095 13095        unrequited      sadness
## 13096 13096        unresolved anticipation
## 13097 13097            unrest         fear
## 13098 13098            unrest      sadness
## 13099 13099            unruly        anger
## 13100 13100            unruly      disgust
## 13101 13101            unruly         fear
## 13102 13102            unruly     negative
## 13103 13103            unsafe         fear
## 13104 13104            unsafe     negative
## 13105 13105    unsatisfactory      disgust
## 13106 13106    unsatisfactory     negative
## 13107 13107       unsatisfied      disgust
## 13108 13108       unsatisfied     negative
## 13109 13109       unsatisfied      sadness
## 13110 13110          unsavory     negative
## 13111 13111         unscathed     positive
## 13112 13112      unscrupulous     negative
## 13113 13113            unseat      sadness
## 13114 13114         unselfish     positive
## 13115 13115         unsettled        anger
## 13116 13116         unsettled      disgust
## 13117 13117         unsettled         fear
## 13118 13118         unsettled     negative
## 13119 13119         unsightly      disgust
## 13120 13120         unsightly     negative
## 13121 13121   unsophisticated     negative
## 13122 13122       unspeakable         fear
## 13123 13123       unspeakable     negative
## 13124 13124          unstable         fear
## 13125 13125          unstable     negative
## 13126 13126          unstable     surprise
## 13127 13127          unsteady         fear
## 13128 13128      unsuccessful     negative
## 13129 13129      unsuccessful      sadness
## 13130 13130        unsuitable     negative
## 13131 13131            unsung     negative
## 13132 13132       unsupported     negative
## 13133 13133       unsurpassed anticipation
## 13134 13134       unsurpassed         fear
## 13135 13135       unsurpassed          joy
## 13136 13136       unsurpassed     positive
## 13137 13137       unsurpassed        trust
## 13138 13138      unsuspecting     surprise
## 13139 13139     unsustainable     negative
## 13140 13140     unsympathetic        anger
## 13141 13141     unsympathetic     negative
## 13142 13142           untamed     negative
## 13143 13143         untenable     negative
## 13144 13144       unthinkable        anger
## 13145 13145       unthinkable      disgust
## 13146 13146       unthinkable         fear
## 13147 13147       unthinkable     negative
## 13148 13148            untidy      disgust
## 13149 13149            untidy     negative
## 13150 13150             untie          joy
## 13151 13151             untie     negative
## 13152 13152             untie     positive
## 13153 13153          untimely     negative
## 13154 13154          untitled     negative
## 13155 13155          untitled      sadness
## 13156 13156            untold anticipation
## 13157 13157            untold     negative
## 13158 13158          untoward        anger
## 13159 13159          untoward      disgust
## 13160 13160          untoward     negative
## 13161 13161         untrained     negative
## 13162 13162            untrue     negative
## 13163 13163     untrustworthy        anger
## 13164 13164     untrustworthy     negative
## 13165 13165        unverified anticipation
## 13166 13166       unwarranted     negative
## 13167 13167          unwashed      disgust
## 13168 13168          unwashed     negative
## 13169 13169        unwavering     positive
## 13170 13170        unwavering        trust
## 13171 13171         unwelcome     negative
## 13172 13172         unwelcome      sadness
## 13173 13173            unwell     negative
## 13174 13174            unwell      sadness
## 13175 13175     unwillingness     negative
## 13176 13176            unwise     negative
## 13177 13177         unwitting     negative
## 13178 13178          unworthy      disgust
## 13179 13179          unworthy     negative
## 13180 13180        unyielding     negative
## 13181 13181          upheaval        anger
## 13182 13182          upheaval         fear
## 13183 13183          upheaval     negative
## 13184 13184          upheaval      sadness
## 13185 13185            uphill anticipation
## 13186 13186            uphill         fear
## 13187 13187            uphill     negative
## 13188 13188            uphill     positive
## 13189 13189            uplift anticipation
## 13190 13190            uplift          joy
## 13191 13191            uplift     positive
## 13192 13192            uplift        trust
## 13193 13193           upright     positive
## 13194 13194           upright        trust
## 13195 13195          uprising        anger
## 13196 13196          uprising anticipation
## 13197 13197          uprising         fear
## 13198 13198          uprising     negative
## 13199 13199            uproar     negative
## 13200 13200             upset        anger
## 13201 13201             upset     negative
## 13202 13202             upset      sadness
## 13203 13203            urchin     negative
## 13204 13204           urgency anticipation
## 13205 13205           urgency         fear
## 13206 13206           urgency     surprise
## 13207 13207            urgent anticipation
## 13208 13208            urgent         fear
## 13209 13209            urgent     negative
## 13210 13210            urgent     surprise
## 13211 13211               urn      sadness
## 13212 13212        usefulness     positive
## 13213 13213           useless     negative
## 13214 13214             usher     positive
## 13215 13215             usher        trust
## 13216 13216             usual     positive
## 13217 13217             usual        trust
## 13218 13218             usurp        anger
## 13219 13219             usurp     negative
## 13220 13220           usurped        anger
## 13221 13221           usurped         fear
## 13222 13222           usurped     negative
## 13223 13223             usury     negative
## 13224 13224           utility     positive
## 13225 13225           utopian anticipation
## 13226 13226           utopian          joy
## 13227 13227           utopian     positive
## 13228 13228           utopian        trust
## 13229 13229           vacancy     negative
## 13230 13230          vacation anticipation
## 13231 13231          vacation          joy
## 13232 13232          vacation     positive
## 13233 13233           vaccine     positive
## 13234 13234           vacuous      disgust
## 13235 13235           vacuous     negative
## 13236 13236             vague     negative
## 13237 13237         vagueness     negative
## 13238 13238            vainly      disgust
## 13239 13239            vainly     negative
## 13240 13240            vainly      sadness
## 13241 13241           valiant     positive
## 13242 13242          validity         fear
## 13243 13243             valor     positive
## 13244 13244             valor        trust
## 13245 13245          valuable     positive
## 13246 13246           vampire        anger
## 13247 13247           vampire      disgust
## 13248 13248           vampire         fear
## 13249 13249           vampire     negative
## 13250 13250          vanguard     positive
## 13251 13251            vanish     surprise
## 13252 13252          vanished         fear
## 13253 13253          vanished     negative
## 13254 13254          vanished      sadness
## 13255 13255          vanished     surprise
## 13256 13256            vanity     negative
## 13257 13257          vanquish     positive
## 13258 13258          variable     surprise
## 13259 13259         varicella      disgust
## 13260 13260         varicella         fear
## 13261 13261         varicella     negative
## 13262 13262         varicella      sadness
## 13263 13263          varicose     negative
## 13264 13264              veal      sadness
## 13265 13265              veal        trust
## 13266 13266              veer         fear
## 13267 13267              veer     surprise
## 13268 13268        vegetative      disgust
## 13269 13269        vegetative     negative
## 13270 13270        vegetative      sadness
## 13271 13271          vehement        anger
## 13272 13272          vehement         fear
## 13273 13273          vehement     negative
## 13274 13274            velvet     positive
## 13275 13275           velvety     positive
## 13276 13276          vendetta        anger
## 13277 13277          vendetta         fear
## 13278 13278          vendetta     negative
## 13279 13279          vendetta      sadness
## 13280 13280         venerable anticipation
## 13281 13281         venerable          joy
## 13282 13282         venerable     positive
## 13283 13283         venerable        trust
## 13284 13284        veneration     positive
## 13285 13285         vengeance        anger
## 13286 13286         vengeance     negative
## 13287 13287          vengeful        anger
## 13288 13288          vengeful         fear
## 13289 13289          vengeful     negative
## 13290 13290             venom        anger
## 13291 13291             venom      disgust
## 13292 13292             venom         fear
## 13293 13293             venom     negative
## 13294 13294          venomous        anger
## 13295 13295          venomous      disgust
## 13296 13296          venomous         fear
## 13297 13297          venomous     negative
## 13298 13298              vent        anger
## 13299 13299          veracity anticipation
## 13300 13300          veracity          joy
## 13301 13301          veracity     positive
## 13302 13302          veracity     surprise
## 13303 13303          veracity        trust
## 13304 13304         verbosity     negative
## 13305 13305           verdant     positive
## 13306 13306           verdict         fear
## 13307 13307             verge anticipation
## 13308 13308             verge         fear
## 13309 13309             verge     negative
## 13310 13310      verification     positive
## 13311 13311      verification        trust
## 13312 13312          verified     positive
## 13313 13313          verified        trust
## 13314 13314            verily     positive
## 13315 13315            verily        trust
## 13316 13316         veritable     positive
## 13317 13317            vermin        anger
## 13318 13318            vermin      disgust
## 13319 13319            vermin         fear
## 13320 13320            vermin     negative
## 13321 13321            vernal          joy
## 13322 13322            vernal     positive
## 13323 13323            versus        anger
## 13324 13324            versus     negative
## 13325 13325           vertigo         fear
## 13326 13326           vertigo     negative
## 13327 13327             verve     positive
## 13328 13328         vesicular      disgust
## 13329 13329           veteran     positive
## 13330 13330           veteran        trust
## 13331 13331              veto        anger
## 13332 13332              veto     negative
## 13333 13333             vicar     positive
## 13334 13334             vicar        trust
## 13335 13335              vice     negative
## 13336 13336           vicious        anger
## 13337 13337           vicious      disgust
## 13338 13338           vicious     negative
## 13339 13339            victim        anger
## 13340 13340            victim         fear
## 13341 13341            victim     negative
## 13342 13342            victim      sadness
## 13343 13343        victimized        anger
## 13344 13344        victimized      disgust
## 13345 13345        victimized         fear
## 13346 13346        victimized     negative
## 13347 13347        victimized      sadness
## 13348 13348        victimized     surprise
## 13349 13349            victor          joy
## 13350 13350            victor     positive
## 13351 13351        victorious          joy
## 13352 13352        victorious     positive
## 13353 13353           victory anticipation
## 13354 13354           victory          joy
## 13355 13355           victory     positive
## 13356 13356           victory        trust
## 13357 13357             vigil anticipation
## 13358 13358         vigilance anticipation
## 13359 13359         vigilance     positive
## 13360 13360         vigilance        trust
## 13361 13361          vigilant         fear
## 13362 13362          vigilant     positive
## 13363 13363          vigilant        trust
## 13364 13364             vigor     positive
## 13365 13365          vigorous     positive
## 13366 13366          vigorous        trust
## 13367 13367          villager     positive
## 13368 13368          villager        trust
## 13369 13369           villain         fear
## 13370 13370           villain     negative
## 13371 13371        villainous        anger
## 13372 13372        villainous      disgust
## 13373 13373        villainous         fear
## 13374 13374        villainous     negative
## 13375 13375         vindicate        anger
## 13376 13376        vindicated     positive
## 13377 13377       vindication anticipation
## 13378 13378       vindication          joy
## 13379 13379       vindication     positive
## 13380 13380       vindication        trust
## 13381 13381        vindictive        anger
## 13382 13382        vindictive      disgust
## 13383 13383        vindictive     negative
## 13384 13384         violation        anger
## 13385 13385         violation         fear
## 13386 13386         violation     negative
## 13387 13387         violation      sadness
## 13388 13388         violation     surprise
## 13389 13389          violence        anger
## 13390 13390          violence         fear
## 13391 13391          violence     negative
## 13392 13392          violence      sadness
## 13393 13393           violent        anger
## 13394 13394           violent      disgust
## 13395 13395           violent         fear
## 13396 13396           violent     negative
## 13397 13397           violent     surprise
## 13398 13398         violently        anger
## 13399 13399         violently      disgust
## 13400 13400         violently         fear
## 13401 13401         violently     negative
## 13402 13402         violently      sadness
## 13403 13403             viper         fear
## 13404 13404             viper     negative
## 13405 13405            virgin     positive
## 13406 13406            virgin        trust
## 13407 13407         virginity anticipation
## 13408 13408         virginity     positive
## 13409 13409            virtue     positive
## 13410 13410            virtue        trust
## 13411 13411          virtuous          joy
## 13412 13412          virtuous     positive
## 13413 13413          virtuous        trust
## 13414 13414         virulence        anger
## 13415 13415         virulence         fear
## 13416 13416         virulence     negative
## 13417 13417             virus     negative
## 13418 13418            vision anticipation
## 13419 13419            vision     positive
## 13420 13420         visionary anticipation
## 13421 13421         visionary          joy
## 13422 13422         visionary     positive
## 13423 13423         visionary        trust
## 13424 13424             visit     positive
## 13425 13425        visitation     negative
## 13426 13426           visitor anticipation
## 13427 13427           visitor          joy
## 13428 13428           visitor     positive
## 13429 13429             visor anticipation
## 13430 13430             visor     surprise
## 13431 13431             vital     positive
## 13432 13432          vitality          joy
## 13433 13433          vitality     positive
## 13434 13434          vitality        trust
## 13435 13435         vivacious          joy
## 13436 13436         vivacious     positive
## 13437 13437             vivid          joy
## 13438 13438             vivid     positive
## 13439 13439             vixen     negative
## 13440 13440        vocabulary     positive
## 13441 13441        volatility        anger
## 13442 13442        volatility anticipation
## 13443 13443        volatility         fear
## 13444 13444        volatility     negative
## 13445 13445        volatility     surprise
## 13446 13446           volcano         fear
## 13447 13447           volcano     negative
## 13448 13448           volcano     surprise
## 13449 13449         volunteer anticipation
## 13450 13450         volunteer         fear
## 13451 13451         volunteer          joy
## 13452 13452         volunteer     positive
## 13453 13453         volunteer        trust
## 13454 13454        volunteers        trust
## 13455 13455        voluptuous anticipation
## 13456 13456        voluptuous          joy
## 13457 13457        voluptuous     positive
## 13458 13458             vomit      disgust
## 13459 13459          vomiting     negative
## 13460 13460            voodoo     negative
## 13461 13461              vote        anger
## 13462 13462              vote anticipation
## 13463 13463              vote          joy
## 13464 13464              vote     negative
## 13465 13465              vote     positive
## 13466 13466              vote      sadness
## 13467 13467              vote     surprise
## 13468 13468              vote        trust
## 13469 13469            votive        trust
## 13470 13470             vouch     positive
## 13471 13471             vouch        trust
## 13472 13472           voucher        trust
## 13473 13473               vow anticipation
## 13474 13474               vow          joy
## 13475 13475               vow     positive
## 13476 13476               vow        trust
## 13477 13477            voyage anticipation
## 13478 13478            vulgar      disgust
## 13479 13479            vulgar     negative
## 13480 13480         vulgarity        anger
## 13481 13481         vulgarity      disgust
## 13482 13482         vulgarity     negative
## 13483 13483         vulgarity      sadness
## 13484 13484     vulnerability         fear
## 13485 13485     vulnerability     negative
## 13486 13486     vulnerability      sadness
## 13487 13487           vulture      disgust
## 13488 13488           vulture         fear
## 13489 13489           vulture     negative
## 13490 13490            waffle        anger
## 13491 13491            waffle     negative
## 13492 13492            waffle      sadness
## 13493 13493             wages          joy
## 13494 13494             wages     positive
## 13495 13495              wail         fear
## 13496 13496              wail     negative
## 13497 13497              wail      sadness
## 13498 13498              wait anticipation
## 13499 13499              wait     negative
## 13500 13500            wallow      disgust
## 13501 13501            wallow     negative
## 13502 13502            wallow      sadness
## 13503 13503               wan         fear
## 13504 13504               wan     negative
## 13505 13505               wan      sadness
## 13506 13506              wane     negative
## 13507 13507              wane      sadness
## 13508 13508           wanting     negative
## 13509 13509           wanting      sadness
## 13510 13510               war         fear
## 13511 13511               war     negative
## 13512 13512            warden        anger
## 13513 13513            warden         fear
## 13514 13514            warden     negative
## 13515 13515            warden        trust
## 13516 13516              ware         fear
## 13517 13517              ware     negative
## 13518 13518           warfare        anger
## 13519 13519           warfare         fear
## 13520 13520           warfare     negative
## 13521 13521           warfare      sadness
## 13522 13522           warlike        anger
## 13523 13523           warlike         fear
## 13524 13524           warlike     negative
## 13525 13525           warlock         fear
## 13526 13526              warn anticipation
## 13527 13527              warn         fear
## 13528 13528              warn     negative
## 13529 13529              warn     surprise
## 13530 13530              warn        trust
## 13531 13531            warned anticipation
## 13532 13532            warned         fear
## 13533 13533            warned     surprise
## 13534 13534           warning         fear
## 13535 13535              warp        anger
## 13536 13536              warp     negative
## 13537 13537              warp      sadness
## 13538 13538            warped     negative
## 13539 13539          warranty     positive
## 13540 13540          warranty        trust
## 13541 13541           warrior        anger
## 13542 13542           warrior         fear
## 13543 13543           warrior     positive
## 13544 13544              wart      disgust
## 13545 13545              wart     negative
## 13546 13546              wary         fear
## 13547 13547             waste      disgust
## 13548 13548             waste     negative
## 13549 13549            wasted        anger
## 13550 13550            wasted      disgust
## 13551 13551            wasted     negative
## 13552 13552          wasteful        anger
## 13553 13553          wasteful      disgust
## 13554 13554          wasteful     negative
## 13555 13555          wasteful      sadness
## 13556 13556           wasting      disgust
## 13557 13557           wasting         fear
## 13558 13558           wasting     negative
## 13559 13559           wasting      sadness
## 13560 13560             watch anticipation
## 13561 13561             watch         fear
## 13562 13562          watchdog     positive
## 13563 13563          watchdog        trust
## 13564 13564          watchful     positive
## 13565 13565          watchful        trust
## 13566 13566          watchman     positive
## 13567 13567          watchman        trust
## 13568 13568        waterproof     positive
## 13569 13569            watery     negative
## 13570 13570             waver         fear
## 13571 13571             waver     negative
## 13572 13572          weakened     negative
## 13573 13573            weakly         fear
## 13574 13574            weakly     negative
## 13575 13575            weakly      sadness
## 13576 13576          weakness     negative
## 13577 13577            wealth          joy
## 13578 13578            wealth     positive
## 13579 13579            wealth        trust
## 13580 13580              wear     negative
## 13581 13581              wear        trust
## 13582 13582           wearily     negative
## 13583 13583           wearily      sadness
## 13584 13584         weariness     negative
## 13585 13585         weariness      sadness
## 13586 13586             weary     negative
## 13587 13587             weary      sadness
## 13588 13588      weatherproof     positive
## 13589 13589             weeds     negative
## 13590 13590             weeds      sadness
## 13591 13591              weep     negative
## 13592 13592              weep      sadness
## 13593 13593           weeping      sadness
## 13594 13594             weigh anticipation
## 13595 13595             weigh        trust
## 13596 13596            weight anticipation
## 13597 13597            weight      disgust
## 13598 13598            weight         fear
## 13599 13599            weight          joy
## 13600 13600            weight     negative
## 13601 13601            weight     positive
## 13602 13602            weight      sadness
## 13603 13603            weight     surprise
## 13604 13604            weight        trust
## 13605 13605           weighty         fear
## 13606 13606             weird      disgust
## 13607 13607             weird     negative
## 13608 13608            weirdo         fear
## 13609 13609            weirdo     negative
## 13610 13610          welcomed          joy
## 13611 13611          welcomed     positive
## 13612 13612               wen     negative
## 13613 13613             wench        anger
## 13614 13614             wench      disgust
## 13615 13615             wench     negative
## 13616 13616             whack     negative
## 13617 13617              whim anticipation
## 13618 13618              whim          joy
## 13619 13619              whim     negative
## 13620 13620              whim     surprise
## 13621 13621           whimper         fear
## 13622 13622           whimper      sadness
## 13623 13623         whimsical          joy
## 13624 13624             whine      disgust
## 13625 13625             whine     negative
## 13626 13626             whine      sadness
## 13627 13627              whip        anger
## 13628 13628              whip     negative
## 13629 13629         whirlpool         fear
## 13630 13630         whirlwind         fear
## 13631 13631         whirlwind     negative
## 13632 13632            whisky     negative
## 13633 13633         whiteness          joy
## 13634 13634         whiteness     positive
## 13635 13635         wholesome     positive
## 13636 13636         wholesome        trust
## 13637 13637             whore      disgust
## 13638 13638             whore     negative
## 13639 13639            wicked         fear
## 13640 13640            wicked     negative
## 13641 13641        wickedness      disgust
## 13642 13642        wickedness     negative
## 13643 13643            wicket     positive
## 13644 13644        widespread     positive
## 13645 13645             widow      sadness
## 13646 13646           widower      sadness
## 13647 13647              wild     negative
## 13648 13648              wild     surprise
## 13649 13649           wildcat     negative
## 13650 13650        wilderness anticipation
## 13651 13651        wilderness         fear
## 13652 13652        wilderness      sadness
## 13653 13653          wildfire         fear
## 13654 13654          wildfire     negative
## 13655 13655          wildfire      sadness
## 13656 13656          wildfire     surprise
## 13657 13657           willful        anger
## 13658 13658           willful     negative
## 13659 13659           willful      sadness
## 13660 13660         willingly     positive
## 13661 13661       willingness     positive
## 13662 13662              wimp      disgust
## 13663 13663              wimp         fear
## 13664 13664              wimp     negative
## 13665 13665             wimpy        anger
## 13666 13666             wimpy      disgust
## 13667 13667             wimpy         fear
## 13668 13668             wimpy     negative
## 13669 13669             wimpy      sadness
## 13670 13670             wince        anger
## 13671 13671             wince      disgust
## 13672 13672             wince         fear
## 13673 13673             wince     negative
## 13674 13674             wince      sadness
## 13675 13675          windfall     positive
## 13676 13676            winner anticipation
## 13677 13677            winner          joy
## 13678 13678            winner     positive
## 13679 13679            winner     surprise
## 13680 13680           winning anticipation
## 13681 13681           winning      disgust
## 13682 13682           winning          joy
## 13683 13683           winning     positive
## 13684 13684           winning      sadness
## 13685 13685           winning     surprise
## 13686 13686           winning        trust
## 13687 13687          winnings anticipation
## 13688 13688          winnings          joy
## 13689 13689          winnings     positive
## 13690 13690          wireless        anger
## 13691 13691          wireless anticipation
## 13692 13692          wireless     positive
## 13693 13693          wireless     surprise
## 13694 13694               wis     positive
## 13695 13695            wisdom     positive
## 13696 13696            wisdom        trust
## 13697 13697              wise     positive
## 13698 13698           wishful anticipation
## 13699 13699               wit     positive
## 13700 13700             witch        anger
## 13701 13701             witch      disgust
## 13702 13702             witch         fear
## 13703 13703             witch     negative
## 13704 13704        witchcraft        anger
## 13705 13705        witchcraft         fear
## 13706 13706        witchcraft     negative
## 13707 13707        witchcraft      sadness
## 13708 13708          withdraw     negative
## 13709 13709          withdraw      sadness
## 13710 13710            wither     negative
## 13711 13711            wither      sadness
## 13712 13712          withered      disgust
## 13713 13713          withered     negative
## 13714 13714         withstand anticipation
## 13715 13715         withstand         fear
## 13716 13716         withstand     positive
## 13717 13717           witness        trust
## 13718 13718              wits     positive
## 13719 13719             witty          joy
## 13720 13720             witty     positive
## 13721 13721            wizard anticipation
## 13722 13722            wizard     positive
## 13723 13723            wizard     surprise
## 13724 13724               woe      disgust
## 13725 13725               woe         fear
## 13726 13726               woe     negative
## 13727 13727               woe      sadness
## 13728 13728            woeful     negative
## 13729 13729            woeful      sadness
## 13730 13730          woefully      disgust
## 13731 13731          woefully     negative
## 13732 13732          woefully      sadness
## 13733 13733              womb     positive
## 13734 13734         wonderful          joy
## 13735 13735         wonderful     positive
## 13736 13736         wonderful     surprise
## 13737 13737         wonderful        trust
## 13738 13738       wonderfully          joy
## 13739 13739       wonderfully     positive
## 13740 13740       wonderfully     surprise
## 13741 13741          wondrous     positive
## 13742 13742              wont anticipation
## 13743 13743               wop        anger
## 13744 13744              word     positive
## 13745 13745              word        trust
## 13746 13746             words        anger
## 13747 13747             words     negative
## 13748 13748           working     positive
## 13749 13749              worm anticipation
## 13750 13750              worm     negative
## 13751 13751              worm     surprise
## 13752 13752              worn     negative
## 13753 13753              worn      sadness
## 13754 13754           worried     negative
## 13755 13755           worried      sadness
## 13756 13756             worry anticipation
## 13757 13757             worry         fear
## 13758 13758             worry     negative
## 13759 13759             worry      sadness
## 13760 13760          worrying anticipation
## 13761 13761          worrying         fear
## 13762 13762          worrying     negative
## 13763 13763          worrying      sadness
## 13764 13764             worse         fear
## 13765 13765             worse     negative
## 13766 13766             worse      sadness
## 13767 13767         worsening      disgust
## 13768 13768         worsening     negative
## 13769 13769         worsening      sadness
## 13770 13770           worship anticipation
## 13771 13771           worship         fear
## 13772 13772           worship          joy
## 13773 13773           worship     positive
## 13774 13774           worship        trust
## 13775 13775             worth     positive
## 13776 13776         worthless        anger
## 13777 13777         worthless      disgust
## 13778 13778         worthless     negative
## 13779 13779         worthless      sadness
## 13780 13780            worthy     positive
## 13781 13781            worthy        trust
## 13782 13782               wot     positive
## 13783 13783               wot        trust
## 13784 13784             wound        anger
## 13785 13785             wound         fear
## 13786 13786             wound     negative
## 13787 13787             wound      sadness
## 13788 13788         wrangling        anger
## 13789 13789         wrangling      disgust
## 13790 13790         wrangling         fear
## 13791 13791         wrangling     negative
## 13792 13792         wrangling      sadness
## 13793 13793             wrath        anger
## 13794 13794             wrath         fear
## 13795 13795             wrath     negative
## 13796 13796             wreak        anger
## 13797 13797             wreak     negative
## 13798 13798             wreck        anger
## 13799 13799             wreck      disgust
## 13800 13800             wreck         fear
## 13801 13801             wreck     negative
## 13802 13802             wreck      sadness
## 13803 13803             wreck     surprise
## 13804 13804           wrecked        anger
## 13805 13805           wrecked         fear
## 13806 13806           wrecked     negative
## 13807 13807           wrecked      sadness
## 13808 13808            wrench     negative
## 13809 13809         wrestling     negative
## 13810 13810            wretch        anger
## 13811 13811            wretch      disgust
## 13812 13812            wretch     negative
## 13813 13813            wretch      sadness
## 13814 13814          wretched      disgust
## 13815 13815          wretched     negative
## 13816 13816          wretched      sadness
## 13817 13817             wring        anger
## 13818 13818          wrinkled      sadness
## 13819 13819            writer     positive
## 13820 13820             wrong     negative
## 13821 13821        wrongdoing        anger
## 13822 13822        wrongdoing      disgust
## 13823 13823        wrongdoing     negative
## 13824 13824        wrongdoing      sadness
## 13825 13825          wrongful        anger
## 13826 13826          wrongful      disgust
## 13827 13827          wrongful     negative
## 13828 13828          wrongful      sadness
## 13829 13829           wrongly        anger
## 13830 13830           wrongly         fear
## 13831 13831           wrongly     negative
## 13832 13832           wrongly      sadness
## 13833 13833           wrought     negative
## 13834 13834               wry     negative
## 13835 13835        xenophobia         fear
## 13836 13836        xenophobia     negative
## 13837 13837              yawn     negative
## 13838 13838           yawning     negative
## 13839 13839          yearning anticipation
## 13840 13840          yearning          joy
## 13841 13841          yearning     negative
## 13842 13842          yearning     positive
## 13843 13843          yearning        trust
## 13844 13844              yell        anger
## 13845 13845              yell         fear
## 13846 13846              yell     negative
## 13847 13847              yell     surprise
## 13848 13848           yellows     negative
## 13849 13849              yelp        anger
## 13850 13850              yelp         fear
## 13851 13851              yelp     negative
## 13852 13852              yelp     surprise
## 13853 13853             youth        anger
## 13854 13854             youth anticipation
## 13855 13855             youth         fear
## 13856 13856             youth          joy
## 13857 13857             youth     positive
## 13858 13858             youth     surprise
## 13859 13859              zany     surprise
## 13860 13860              zeal anticipation
## 13861 13861              zeal          joy
## 13862 13862              zeal     positive
## 13863 13863              zeal     surprise
## 13864 13864              zeal        trust
## 13865 13865           zealous          joy
## 13866 13866           zealous     positive
## 13867 13867           zealous        trust
## 13868 13868              zest anticipation
## 13869 13869              zest          joy
## 13870 13870              zest     positive
## 13871 13871              zest        trust
## 13872 13872               zip     negative

These libraries were created either using crowdsourcing or cloud computing/ai like Amazon Mechanical Turk, or by labor of one of the authors, and then validating with crowdsourcing. Let’s look at the words with a joy score from NRC.

library(gutenbergr)
library(dplyr)
library(stringr)

darwin <- gutenberg_download(c(944, 1227, 1228, 2300), mirror = "https://mirror2.sandyriver.net/pub/gutenberg")

tidy_books <- darwin %>%
  group_by(gutenberg_id) %>%
  dplyr::mutate(linenumber = row_number(), chapter = cumsum(str_detect(text, regex("^chapter [\\divxlc]", ignore_case = TRUE)))) %>%
  ungroup() %>%
  unnest_tokens(word, text)

tidy_books
## # A tibble: 786,575 × 4
##    gutenberg_id linenumber chapter word   
##           <int>      <int>   <int> <chr>  
##  1          944          1       0 the    
##  2          944          1       0 voyage 
##  3          944          1       0 of     
##  4          944          1       0 the    
##  5          944          1       0 beagle 
##  6          944          1       0 by     
##  7          944          2       0 charles
##  8          944          2       0 darwin 
##  9          944          8       0 about  
## 10          944          8       0 the    
## # … with 786,565 more rows

Let’s add the book name instead of GID

colnames(tidy_books)[1] <- "book"

tidy_books$book[tidy_books$book == 944] <- "The Voyage of the Beagle"
tidy_books$book[tidy_books$book == 1227] <- "The Expression of the Emotions in Man and Animals"
tidy_books$book[tidy_books$book == 1228] <- "On the Origin of Species By Means of Natural Selection"
tidy_books$book[tidy_books$book == 2300] <- "The Descent of Man, and Selection in Relation to Sex"

tidy_books
## # A tibble: 786,575 × 4
##    book                     linenumber chapter word   
##    <chr>                         <int>   <int> <chr>  
##  1 The Voyage of the Beagle          1       0 the    
##  2 The Voyage of the Beagle          1       0 voyage 
##  3 The Voyage of the Beagle          1       0 of     
##  4 The Voyage of the Beagle          1       0 the    
##  5 The Voyage of the Beagle          1       0 beagle 
##  6 The Voyage of the Beagle          1       0 by     
##  7 The Voyage of the Beagle          2       0 charles
##  8 The Voyage of the Beagle          2       0 darwin 
##  9 The Voyage of the Beagle          8       0 about  
## 10 The Voyage of the Beagle          8       0 the    
## # … with 786,565 more rows

Now that we have a tidy format with one word per row, we are ready for sentiment analysis. First, let’s use NRC.

nrc_joy <- nrc %>%
  filter(sentiment == "joy")

tidy_books %>%
  filter(book == "The Voyage of the Beagle") %>%
  inner_join(nrc_joy) %>%
  count(word, sort = TRUE)
## Joining, by = "word"
## # A tibble: 277 × 2
##    word           n
##    <chr>      <int>
##  1 found        301
##  2 good         161
##  3 remarkable   114
##  4 green         95
##  5 kind          92
##  6 tree          86
##  7 present       85
##  8 food          78
##  9 beautiful     61
## 10 elevation     60
## # … with 267 more rows

We can also examine how sentiment changes throughout a work.

library(tidyr)

Charles_Darwin_sentiment <- tidy_books %>%
  inner_join(get_sentiments("bing")) %>%
  count(book, index = linenumber %/% 80, sentiment) %>%
  pivot_wider(names_from = sentiment, values_from = n, values_fill = 0) %>%
  dplyr::mutate(sentiments = positive - negative)
## Joining, by = "word"

Now, let’s plot it

library(ggplot2)

ggplot(Charles_Darwin_sentiment, aes(index, sentiments, fill = book)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~book, ncol = 2, scales = "free_x")

Let’s compare the three sentiment dictionaries. There are several options for sentiment lexicons, you might want some more information on which is more appropriate for your purpose. Here we will use all three of our dictionaries and examine how the sentiment changes across the arc of TVOTB.

library(tidyr)

voyage <- tidy_books %>%
  filter(book == "The Voyage of the Beagle")

voyage
## # A tibble: 208,118 × 4
##    book                     linenumber chapter word   
##    <chr>                         <int>   <int> <chr>  
##  1 The Voyage of the Beagle          1       0 the    
##  2 The Voyage of the Beagle          1       0 voyage 
##  3 The Voyage of the Beagle          1       0 of     
##  4 The Voyage of the Beagle          1       0 the    
##  5 The Voyage of the Beagle          1       0 beagle 
##  6 The Voyage of the Beagle          1       0 by     
##  7 The Voyage of the Beagle          2       0 charles
##  8 The Voyage of the Beagle          2       0 darwin 
##  9 The Voyage of the Beagle          8       0 about  
## 10 The Voyage of the Beagle          8       0 the    
## # … with 208,108 more rows

Let’s again use integer division (“%/%”) to define larger sections of the text that span multiple lines, and we can use the same pattern with “count()”, “pivot_wider()”, and “dplyr::mutate()”, to find the sentiment in each of these sections of text.

affin <- voyage %>%
  inner_join(afinn) %>%
  group_by(index = linenumber %/% 80) %>%
  summarise(sentiment = sum(value)) %>%
  dplyr::mutate(method = "AFINN")   
## Joining, by = "word"
bing_and_nrc <- bind_rows(
  voyage%>%
    inner_join(get_sentiments("bing")) %>%
    dplyr::mutate(method = "Bing et al."),
  voyage %>%
    inner_join(nrc) %>%
    filter(sentiment %in% c("positive", "negative"))
) %>%
  dplyr::mutate(method = "NRC") %>%
  count(method, index = linenumber %/% 80, sentiment) %>%
  pivot_wider(names_from = sentiment, 
              values_from = n,
              values_fill = 0) %>%
  dplyr::mutate(sentiment = positive - negative)
## Joining, by = "word"
## Joining, by = "word"

Now, we can estimate the net sentiment (positive-negative) in each chunk of the novel text for each lexicon (dictionary). Let’s bind them all together and visualize them with ggplot.

bind_rows(affin, bing_and_nrc) %>%
  ggplot(aes(index, sentiment, fill = method)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~method, ncol = 1, scales = "free_y")

Let’s look at the counts based on each dictionary

nrc %>%
  filter(sentiment %in% c("positive", "negative")) %>%
  count(sentiment)
##   sentiment    n
## 1  negative 3316
## 2  positive 2308

And for bing

get_sentiments("bing") %>%
  count(sentiment)
## # A tibble: 2 × 2
##   sentiment     n
##   <chr>     <int>
## 1 negative   4781
## 2 positive   2005

Let’s create the function

bing_word_counts <- tidy_books %>%
  inner_join(get_sentiments("bing")) %>%
  count(word, sentiment, sort = TRUE) %>%
  ungroup()
## Joining, by = "word"
bing_word_counts
## # A tibble: 2,492 × 3
##    word       sentiment     n
##    <chr>      <chr>     <int>
##  1 great      positive   1226
##  2 well       positive    855
##  3 like       positive    813
##  4 good       positive    487
##  5 doubt      negative    414
##  6 wild       negative    317
##  7 respect    positive    310
##  8 remarkable positive    295
##  9 important  positive    281
## 10 bright     positive    258
## # … with 2,482 more rows

This can be shown visually, and we can pipe straight into ggplot2.

bing_word_counts %>%
  group_by(sentiment) %>%
  slice_max(n, n = 10) %>%
  ungroup() %>%
 dplyr:: mutate(word = reorder(word, n)) %>%
  ggplot(aes(n, word, fill = sentiment)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~sentiment, scale = "free_y") +
  labs(x = "contribution to sentiment", y = NULL)

Let’s spot an anomaly in the dataset.

custom_stop_words <- bind_rows(tibble(word = c("wild", "dark", "great", "like"), lexicon = c("custom")), stop_words)

custom_stop_words
## # A tibble: 1,153 × 2
##    word      lexicon
##    <chr>     <chr>  
##  1 wild      custom 
##  2 dark      custom 
##  3 great     custom 
##  4 like      custom 
##  5 a         SMART  
##  6 a's       SMART  
##  7 able      SMART  
##  8 about     SMART  
##  9 above     SMART  
## 10 according SMART  
## # … with 1,143 more rows

Word Clouds! We can see that tidy text mining and sentiment analysis works well with ggplot2, but having our data in tidy format leads to other nice graphing techniques. Let’s use the wordcloud package.

library(wordcloud)
## 
## Attaching package: 'wordcloud'
## The following object is masked from 'package:gplots':
## 
##     textplot
tidy_books %>%
  anti_join(stop_words) %>%
  count(word) %>%
  with(wordcloud(word, n, max.words = 100))
## Joining, by = "word"

Let’s also look at the comparison.cloud(), which may require turning the dataframe into a matrix. We can change to matrix using the acast() function.

library(reshape2)
## 
## Attaching package: 'reshape2'
## The following object is masked from 'package:tigerstats':
## 
##     tips
## The following object is masked from 'package:tidyr':
## 
##     smiths
tidy_books %>%
  inner_join(get_sentiments("bing")) %>%
  count(word, sentiment, sort = TRUE) %>%
  acast(word ~ sentiment, value.var = "n", fill = 0) %>%
  comparison.cloud(colors = c("gray20", "gray80"), max.words = 100)
## Joining, by = "word"

Looking at units beyond words. A lot of useful work can be done by tokenizing at the word level, but sometimes it is nice to look at different units or text. For example, we can look beyond just unigrams. Ex. I am not having a good day.

bingnegative <- get_sentiments("bing") %>%
  filter(sentiment == "negative")

word_counts <- tidy_books %>%
  group_by(book, chapter) %>%
  dplyr::summarize(words = n())
## `summarise()` has grouped output by 'book'. You can override using the
## `.groups` argument.
tidy_books %>%
  semi_join(bingnegative) %>%
  group_by(book, chapter) %>%
  dplyr::summarize(negativewords = n()) %>%
  left_join(word_counts, by = c("book", "chapter")) %>%
  dplyr::mutate(ratio = negativewords/words) %>%
  filter(chapter !=0) %>%
  slice_max(ratio, n = 1) %>%
  ungroup()
## Joining, by = "word"
## `summarise()` has grouped output by 'book'. You can override using the
## `.groups` argument.
## # A tibble: 4 × 5
##   book                                              chapter negat…¹ words  ratio
##   <chr>                                               <int>   <int> <int>  <dbl>
## 1 On the Origin of Species By Means of Natural Sel…       3       5    86 0.0581
## 2 The Descent of Man, and Selection in Relation to…      20       4    87 0.0460
## 3 The Expression of the Emotions in Man and Animals      10     249  4220 0.0590
## 4 The Voyage of the Beagle                               10     375 11202 0.0335
## # … with abbreviated variable name ¹​negativewords

N-Grams

So far, we have only looked at single words, but many interesting (more accurate) analyses are based on the relationship between words. Let’s look at some methods of tidytext for calculating and visualizing word relationships.

library(dplyr)
library(tidytext)
library(gutenbergr)

darwin_books <- gutenberg_download(c(944, 1227, 1228, 2300), mirror = "https://mirror2.sandyriver.net/pub/gutenberg")

colnames(darwin_books)[1] <- "book"

darwin_books$book[darwin_books$book == 944] <- "The Voyage of the Beagle"
darwin_books$book[darwin_books$book == 1227] <- "The Expression of the Emotions in Man and Animals"
darwin_books$book[darwin_books$book == 1228] <- "On the Origin of Species By Means of Natural Selection"
darwin_books$book[darwin_books$book == 2300] <- "The Descent of Man, and Selection in Relation to Sex"

darwin_bigrams <- darwin_books %>%
  unnest_tokens(bigram, text, token = "ngrams", n = 2)

darwin_bigrams
## # A tibble: 724,531 × 2
##    book                     bigram        
##    <chr>                    <chr>         
##  1 The Voyage of the Beagle the voyage    
##  2 The Voyage of the Beagle voyage of     
##  3 The Voyage of the Beagle of the        
##  4 The Voyage of the Beagle the beagle    
##  5 The Voyage of the Beagle beagle by     
##  6 The Voyage of the Beagle charles darwin
##  7 The Voyage of the Beagle <NA>          
##  8 The Voyage of the Beagle <NA>          
##  9 The Voyage of the Beagle <NA>          
## 10 The Voyage of the Beagle <NA>          
## # … with 724,521 more rows

This data is still in tidytext format, and is not structured as one-token-per-row. Each token is a bigram.

Counting and filtering n-grams.

darwin_bigrams %>%
  count(bigram, sort = TRUE)
## # A tibble: 238,516 × 2
##    bigram       n
##    <chr>    <int>
##  1 of the   11297
##  2 <NA>      8947
##  3 in the    5257
##  4 on the    4093
##  5 to the    2849
##  6 the same  2048
##  7 that the  1947
##  8 it is     1830
##  9 of a      1610
## 10 and the   1590
## # … with 238,506 more rows

Most of the common bigrams are stop-words. This can be a good time to use tidyr’s separate command which splilts a common into multiple based on a delimiter. This will let us make a column for word one and word two.

library(tidyr)

bigrams_separated <- darwin_bigrams %>%
  separate(bigram, c("word1", "word2"), sep = " ")

bigrams_filtered <- bigrams_separated %>%
  filter(!word1 %in% stop_words$word) %>%
  filter(!word2 %in% stop_words$word)

bigrams_filtered
## # A tibble: 94,896 × 3
##    book                     word1   word2  
##    <chr>                    <chr>   <chr>  
##  1 The Voyage of the Beagle charles darwin 
##  2 The Voyage of the Beagle <NA>    <NA>   
##  3 The Voyage of the Beagle <NA>    <NA>   
##  4 The Voyage of the Beagle <NA>    <NA>   
##  5 The Voyage of the Beagle <NA>    <NA>   
##  6 The Voyage of the Beagle <NA>    <NA>   
##  7 The Voyage of the Beagle online  edition
##  8 The Voyage of the Beagle <NA>    <NA>   
##  9 The Voyage of the Beagle degree  symbol 
## 10 The Voyage of the Beagle degs    italics
## # … with 94,886 more rows

New bigram counts.

bigram_counts <- bigrams_filtered %>%
  unite(bigram, word1, word2, sep = " ")

bigram_counts
## # A tibble: 94,896 × 2
##    book                     bigram        
##    <chr>                    <chr>         
##  1 The Voyage of the Beagle charles darwin
##  2 The Voyage of the Beagle NA NA         
##  3 The Voyage of the Beagle NA NA         
##  4 The Voyage of the Beagle NA NA         
##  5 The Voyage of the Beagle NA NA         
##  6 The Voyage of the Beagle NA NA         
##  7 The Voyage of the Beagle online edition
##  8 The Voyage of the Beagle NA NA         
##  9 The Voyage of the Beagle degree symbol 
## 10 The Voyage of the Beagle degs italics  
## # … with 94,886 more rows

We may also be interested in trigrams, which are three word combos.

trigrams <- darwin_books %>%
  unnest_tokens(trigram, text, token = "ngrams", n =3) %>%
  separate(trigram, c("word1", "word2", "word3"), sep = " ") %>%
  filter(!word1 %in% stop_words$word,
         !word2 %in% stop_words$word,
         !word3 %in% stop_words$word) %>%
  count(word1, word2, word3, sort = TRUE)

trigrams
## # A tibble: 19,971 × 4
##    word1         word2  word3           n
##    <chr>         <chr>  <chr>       <int>
##  1 <NA>          <NA>   <NA>         9884
##  2 tierra        del    fuego          92
##  3 secondary     sexual characters     91
##  4 captain       fitz   roy            45
##  5 closely       allied species        30
##  6 de            la     physionomie    30
##  7 domestication vol    ii             26
##  8 vol           ii     pp             22
##  9 vertebrates   vol    iii            21
## 10 proc          zoolog soc            18
## # … with 19,961 more rows

Let’s analyze some bigrams

bigrams_filtered %>%
  filter(word2 == "selection") %>%
  count(book, word1, sort = TRUE)
## # A tibble: 39 × 3
##    book                                                   word1           n
##    <chr>                                                  <chr>       <int>
##  1 The Descent of Man, and Selection in Relation to Sex   sexual        254
##  2 On the Origin of Species By Means of Natural Selection natural       250
##  3 The Descent of Man, and Selection in Relation to Sex   natural       156
##  4 On the Origin of Species By Means of Natural Selection sexual         18
##  5 On the Origin of Species By Means of Natural Selection continued       6
##  6 The Descent of Man, and Selection in Relation to Sex   unconscious     6
##  7 On the Origin of Species By Means of Natural Selection methodical      5
##  8 The Descent of Man, and Selection in Relation to Sex   continued       5
##  9 On the Origin of Species By Means of Natural Selection unconscious     4
## 10 The Expression of the Emotions in Man and Animals      natural         4
## # … with 29 more rows

Let’s again look at tf-idf across bigrams across Darwin’s works

bigram_tf_idf <- bigram_counts %>%
  count(book, bigram) %>%
  bind_tf_idf(bigram, book, n) %>%
  arrange(desc(tf_idf))

bigram_tf_idf
## # A tibble: 60,595 × 6
##    book                                       bigram     n      tf   idf  tf_idf
##    <chr>                                      <chr>  <int>   <dbl> <dbl>   <dbl>
##  1 The Expression of the Emotions in Man and… nerve…    47 0.00350 1.39  0.00485
##  2 On the Origin of Species By Means of Natu… natur…   250 0.0160  0.288 0.00460
##  3 The Expression of the Emotions in Man and… la ph…    35 0.00260 1.39  0.00361
##  4 The Voyage of the Beagle                   bueno…    54 0.00245 1.39  0.00339
##  5 The Voyage of the Beagle                   capta…    53 0.00240 1.39  0.00333
##  6 On the Origin of Species By Means of Natu… glaci…    36 0.00230 1.39  0.00319
##  7 The Voyage of the Beagle                   fitz …    50 0.00227 1.39  0.00314
##  8 The Expression of the Emotions in Man and… muscl…    30 0.00223 1.39  0.00310
##  9 The Expression of the Emotions in Man and… orbic…    29 0.00216 1.39  0.00299
## 10 The Expression of the Emotions in Man and… dr du…    26 0.00194 1.39  0.00268
## # … with 60,585 more rows

Let’s load the required package.

library(ggplot2)

Now, let’s plot.

bigram_tf_idf %>%
  arrange(desc(tf_idf)) %>%
  group_by(book) %>%
  slice_max(tf_idf, n = 10) %>%
  ungroup() %>%
 dplyr:: mutate(bigram = reorder(bigram, tf_idf)) %>%
  ggplot(aes(tf_idf, bigram, fill = book)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~book, ncol = 2, scales = "free") +
  labs(x = "tf-idf of bigrams", y = NULL)

Using bigrams to provide context in sentiment analysis.

bigrams_separated %>%
  filter(word1 == "not") %>%
  count(word1, word2, sort = TRUE)
## # A tibble: 867 × 3
##    word1 word2     n
##    <chr> <chr> <int>
##  1 not   be      128
##  2 not   have    104
##  3 not   only    103
##  4 not   a       100
##  5 not   to       98
##  6 not   been     89
##  7 not   the      82
##  8 not   at       70
##  9 not   know     60
## 10 not   so       58
## # … with 857 more rows

By doing sentiment analysis on bigrams, we can examine how often sentiment-associated words are preceded by a modifier like “not” or other negating words. Let’s load the required package.

library(textdata)

Let’s get the data.

AFINN <- afinn

AFINN
##         X               word value
## 1       1            abandon    -2
## 2       2          abandoned    -2
## 3       3           abandons    -2
## 4       4           abducted    -2
## 5       5          abduction    -2
## 6       6         abductions    -2
## 7       7              abhor    -3
## 8       8           abhorred    -3
## 9       9          abhorrent    -3
## 10     10             abhors    -3
## 11     11          abilities     2
## 12     12            ability     2
## 13     13             aboard     1
## 14     14           absentee    -1
## 15     15          absentees    -1
## 16     16            absolve     2
## 17     17           absolved     2
## 18     18           absolves     2
## 19     19          absolving     2
## 20     20           absorbed     1
## 21     21              abuse    -3
## 22     22             abused    -3
## 23     23             abuses    -3
## 24     24            abusive    -3
## 25     25             accept     1
## 26     26           accepted     1
## 27     27          accepting     1
## 28     28            accepts     1
## 29     29           accident    -2
## 30     30         accidental    -2
## 31     31       accidentally    -2
## 32     32          accidents    -2
## 33     33         accomplish     2
## 34     34       accomplished     2
## 35     35       accomplishes     2
## 36     36         accusation    -2
## 37     37        accusations    -2
## 38     38             accuse    -2
## 39     39            accused    -2
## 40     40            accuses    -2
## 41     41           accusing    -2
## 42     42               ache    -2
## 43     43         achievable     1
## 44     44             aching    -2
## 45     45             acquit     2
## 46     46            acquits     2
## 47     47          acquitted     2
## 48     48         acquitting     2
## 49     49        acrimonious    -3
## 50     50             active     1
## 51     51           adequate     1
## 52     52             admire     3
## 53     53            admired     3
## 54     54            admires     3
## 55     55           admiring     3
## 56     56              admit    -1
## 57     57             admits    -1
## 58     58           admitted    -1
## 59     59           admonish    -2
## 60     60         admonished    -2
## 61     61              adopt     1
## 62     62             adopts     1
## 63     63           adorable     3
## 64     64              adore     3
## 65     65             adored     3
## 66     66             adores     3
## 67     67           advanced     1
## 68     68          advantage     2
## 69     69         advantages     2
## 70     70          adventure     2
## 71     71         adventures     2
## 72     72        adventurous     2
## 73     73           affected    -1
## 74     74          affection     3
## 75     75       affectionate     3
## 76     76          afflicted    -1
## 77     77          affronted    -1
## 78     78             afraid    -2
## 79     79          aggravate    -2
## 80     80         aggravated    -2
## 81     81         aggravates    -2
## 82     82        aggravating    -2
## 83     83         aggression    -2
## 84     84        aggressions    -2
## 85     85         aggressive    -2
## 86     86             aghast    -2
## 87     87               agog     2
## 88     88            agonise    -3
## 89     89           agonised    -3
## 90     90           agonises    -3
## 91     91          agonising    -3
## 92     92            agonize    -3
## 93     93           agonized    -3
## 94     94           agonizes    -3
## 95     95          agonizing    -3
## 96     96              agree     1
## 97     97          agreeable     2
## 98     98             agreed     1
## 99     99          agreement     1
## 100   100             agrees     1
## 101   101              alarm    -2
## 102   102            alarmed    -2
## 103   103           alarmist    -2
## 104   104          alarmists    -2
## 105   105               alas    -1
## 106   106              alert    -1
## 107   107         alienation    -2
## 108   108              alive     1
## 109   109           allergic    -2
## 110   110              allow     1
## 111   111              alone    -2
## 112   112              amaze     2
## 113   113             amazed     2
## 114   114             amazes     2
## 115   115            amazing     4
## 116   116          ambitious     2
## 117   117         ambivalent    -1
## 118   118              amuse     3
## 119   119             amused     3
## 120   120          amusement     3
## 121   121         amusements     3
## 122   122              anger    -3
## 123   123             angers    -3
## 124   124              angry    -3
## 125   125            anguish    -3
## 126   126          anguished    -3
## 127   127          animosity    -2
## 128   128              annoy    -2
## 129   129          annoyance    -2
## 130   130            annoyed    -2
## 131   131           annoying    -2
## 132   132             annoys    -2
## 133   133       antagonistic    -2
## 134   134               anti    -1
## 135   135       anticipation     1
## 136   136            anxiety    -2
## 137   137            anxious    -2
## 138   138          apathetic    -3
## 139   139             apathy    -3
## 140   140            apeshit    -3
## 141   141        apocalyptic    -2
## 142   142          apologise    -1
## 143   143         apologised    -1
## 144   144         apologises    -1
## 145   145        apologising    -1
## 146   146          apologize    -1
## 147   147         apologized    -1
## 148   148         apologizes    -1
## 149   149        apologizing    -1
## 150   150            apology    -1
## 151   151           appalled    -2
## 152   152          appalling    -2
## 153   153            appease     2
## 154   154           appeased     2
## 155   155           appeases     2
## 156   156          appeasing     2
## 157   157            applaud     2
## 158   158          applauded     2
## 159   159         applauding     2
## 160   160           applauds     2
## 161   161           applause     2
## 162   162         appreciate     2
## 163   163        appreciated     2
## 164   164        appreciates     2
## 165   165       appreciating     2
## 166   166       appreciation     2
## 167   167       apprehensive    -2
## 168   168           approval     2
## 169   169           approved     2
## 170   170           approves     2
## 171   171             ardent     1
## 172   172             arrest    -2
## 173   173           arrested    -3
## 174   174            arrests    -2
## 175   175           arrogant    -2
## 176   176             ashame    -2
## 177   177            ashamed    -2
## 178   178                ass    -4
## 179   179      assassination    -3
## 180   180     assassinations    -3
## 181   181              asset     2
## 182   182             assets     2
## 183   183         assfucking    -4
## 184   184            asshole    -4
## 185   185         astonished     2
## 186   186            astound     3
## 187   187          astounded     3
## 188   188         astounding     3
## 189   189       astoundingly     3
## 190   190           astounds     3
## 191   191             attack    -1
## 192   192           attacked    -1
## 193   193          attacking    -1
## 194   194            attacks    -1
## 195   195            attract     1
## 196   196          attracted     1
## 197   197         attracting     2
## 198   198         attraction     2
## 199   199        attractions     2
## 200   200           attracts     1
## 201   201          audacious     3
## 202   202          authority     1
## 203   203              avert    -1
## 204   204            averted    -1
## 205   205             averts    -1
## 206   206               avid     2
## 207   207              avoid    -1
## 208   208            avoided    -1
## 209   209             avoids    -1
## 210   210              await    -1
## 211   211            awaited    -1
## 212   212             awaits    -1
## 213   213              award     3
## 214   214            awarded     3
## 215   215             awards     3
## 216   216            awesome     4
## 217   217              awful    -3
## 218   218            awkward    -2
## 219   219                axe    -1
## 220   220               axed    -1
## 221   221             backed     1
## 222   222            backing     2
## 223   223              backs     1
## 224   224                bad    -3
## 225   225             badass    -3
## 226   226              badly    -3
## 227   227            bailout    -2
## 228   228          bamboozle    -2
## 229   229         bamboozled    -2
## 230   230         bamboozles    -2
## 231   231                ban    -2
## 232   232             banish    -1
## 233   233           bankrupt    -3
## 234   234           bankster    -3
## 235   235             banned    -2
## 236   236            bargain     2
## 237   237            barrier    -2
## 238   238            bastard    -5
## 239   239           bastards    -5
## 240   240             battle    -1
## 241   241            battles    -1
## 242   242             beaten    -2
## 243   243           beatific     3
## 244   244            beating    -1
## 245   245           beauties     3
## 246   246          beautiful     3
## 247   247        beautifully     3
## 248   248           beautify     3
## 249   249           belittle    -2
## 250   250          belittled    -2
## 251   251            beloved     3
## 252   252            benefit     2
## 253   253           benefits     2
## 254   254         benefitted     2
## 255   255        benefitting     2
## 256   256            bereave    -2
## 257   257           bereaved    -2
## 258   258           bereaves    -2
## 259   259          bereaving    -2
## 260   260               best     3
## 261   261             betray    -3
## 262   262           betrayal    -3
## 263   263           betrayed    -3
## 264   264          betraying    -3
## 265   265            betrays    -3
## 266   266             better     2
## 267   267               bias    -1
## 268   268             biased    -2
## 269   269                big     1
## 270   270              bitch    -5
## 271   271            bitches    -5
## 272   272             bitter    -2
## 273   273           bitterly    -2
## 274   274            bizarre    -2
## 275   275               blah    -2
## 276   276              blame    -2
## 277   277             blamed    -2
## 278   278             blames    -2
## 279   279            blaming    -2
## 280   280              bless     2
## 281   281            blesses     2
## 282   282           blessing     3
## 283   283              blind    -1
## 284   284              bliss     3
## 285   285           blissful     3
## 286   286             blithe     2
## 287   287              block    -1
## 288   288        blockbuster     3
## 289   289            blocked    -1
## 290   290           blocking    -1
## 291   291             blocks    -1
## 292   292             bloody    -3
## 293   293             blurry    -2
## 294   294           boastful    -2
## 295   295               bold     2
## 296   296             boldly     2
## 297   297               bomb    -1
## 298   298              boost     1
## 299   299            boosted     1
## 300   300           boosting     1
## 301   301             boosts     1
## 302   302               bore    -2
## 303   303              bored    -2
## 304   304             boring    -3
## 305   305             bother    -2
## 306   306           bothered    -2
## 307   307            bothers    -2
## 308   308         bothersome    -2
## 309   309            boycott    -2
## 310   310          boycotted    -2
## 311   311         boycotting    -2
## 312   312           boycotts    -2
## 313   313       brainwashing    -3
## 314   314              brave     2
## 315   315       breakthrough     3
## 316   316       breathtaking     5
## 317   317              bribe    -3
## 318   318             bright     1
## 319   319          brightest     2
## 320   320         brightness     1
## 321   321          brilliant     4
## 322   322              brisk     2
## 323   323              broke    -1
## 324   324             broken    -1
## 325   325           brooding    -2
## 326   326            bullied    -2
## 327   327           bullshit    -4
## 328   328              bully    -2
## 329   329           bullying    -2
## 330   330             bummer    -2
## 331   331            buoyant     2
## 332   332             burden    -2
## 333   333           burdened    -2
## 334   334          burdening    -2
## 335   335            burdens    -2
## 336   336               calm     2
## 337   337             calmed     2
## 338   338            calming     2
## 339   339              calms     2
## 340   340        can't stand    -3
## 341   341             cancel    -1
## 342   342          cancelled    -1
## 343   343         cancelling    -1
## 344   344            cancels    -1
## 345   345             cancer    -1
## 346   346            capable     1
## 347   347         captivated     3
## 348   348               care     2
## 349   349           carefree     1
## 350   350            careful     2
## 351   351          carefully     2
## 352   352           careless    -2
## 353   353              cares     2
## 354   354         cashing in    -2
## 355   355           casualty    -2
## 356   356        catastrophe    -3
## 357   357       catastrophic    -4
## 358   358           cautious    -1
## 359   359          celebrate     3
## 360   360         celebrated     3
## 361   361         celebrates     3
## 362   362        celebrating     3
## 363   363             censor    -2
## 364   364           censored    -2
## 365   365            censors    -2
## 366   366            certain     1
## 367   367            chagrin    -2
## 368   368          chagrined    -2
## 369   369          challenge    -1
## 370   370             chance     2
## 371   371            chances     2
## 372   372              chaos    -2
## 373   373            chaotic    -2
## 374   374            charged    -3
## 375   375            charges    -2
## 376   376              charm     3
## 377   377           charming     3
## 378   378          charmless    -3
## 379   379           chastise    -3
## 380   380          chastised    -3
## 381   381          chastises    -3
## 382   382         chastising    -3
## 383   383              cheat    -3
## 384   384            cheated    -3
## 385   385            cheater    -3
## 386   386           cheaters    -3
## 387   387             cheats    -3
## 388   388              cheer     2
## 389   389            cheered     2
## 390   390           cheerful     2
## 391   391           cheering     2
## 392   392          cheerless    -2
## 393   393             cheers     2
## 394   394             cheery     3
## 395   395            cherish     2
## 396   396          cherished     2
## 397   397          cherishes     2
## 398   398         cherishing     2
## 399   399               chic     2
## 400   400           childish    -2
## 401   401           chilling    -1
## 402   402              choke    -2
## 403   403             choked    -2
## 404   404             chokes    -2
## 405   405            choking    -2
## 406   406          clarifies     2
## 407   407            clarity     2
## 408   408              clash    -2
## 409   409             classy     3
## 410   410              clean     2
## 411   411            cleaner     2
## 412   412              clear     1
## 413   413            cleared     1
## 414   414            clearly     1
## 415   415             clears     1
## 416   416             clever     2
## 417   417            clouded    -1
## 418   418           clueless    -2
## 419   419               cock    -5
## 420   420         cocksucker    -5
## 421   421        cocksuckers    -5
## 422   422              cocky    -2
## 423   423            coerced    -2
## 424   424           collapse    -2
## 425   425          collapsed    -2
## 426   426          collapses    -2
## 427   427         collapsing    -2
## 428   428            collide    -1
## 429   429           collides    -1
## 430   430          colliding    -1
## 431   431          collision    -2
## 432   432         collisions    -2
## 433   433          colluding    -3
## 434   434             combat    -1
## 435   435            combats    -1
## 436   436             comedy     1
## 437   437            comfort     2
## 438   438        comfortable     2
## 439   439         comforting     2
## 440   440           comforts     2
## 441   441            commend     2
## 442   442          commended     2
## 443   443             commit     1
## 444   444         commitment     2
## 445   445            commits     1
## 446   446          committed     1
## 447   447         committing     1
## 448   448      compassionate     2
## 449   449          compelled     1
## 450   450          competent     2
## 451   451        competitive     2
## 452   452         complacent    -2
## 453   453           complain    -2
## 454   454         complained    -2
## 455   455          complains    -2
## 456   456      comprehensive     2
## 457   457         conciliate     2
## 458   458        conciliated     2
## 459   459        conciliates     2
## 460   460       conciliating     2
## 461   461            condemn    -2
## 462   462       condemnation    -2
## 463   463          condemned    -2
## 464   464           condemns    -2
## 465   465         confidence     2
## 466   466          confident     2
## 467   467           conflict    -2
## 468   468        conflicting    -2
## 469   469        conflictive    -2
## 470   470          conflicts    -2
## 471   471            confuse    -2
## 472   472           confused    -2
## 473   473          confusing    -2
## 474   474           congrats     2
## 475   475       congratulate     2
## 476   476     congratulation     2
## 477   477    congratulations     2
## 478   478            consent     2
## 479   479           consents     2
## 480   480         consolable     2
## 481   481         conspiracy    -3
## 482   482        constrained    -2
## 483   483          contagion    -2
## 484   484         contagions    -2
## 485   485         contagious    -1
## 486   486           contempt    -2
## 487   487       contemptuous    -2
## 488   488     contemptuously    -2
## 489   489            contend    -1
## 490   490          contender    -1
## 491   491         contending    -1
## 492   492        contentious    -2
## 493   493        contestable    -2
## 494   494      controversial    -2
## 495   495    controversially    -2
## 496   496           convince     1
## 497   497          convinced     1
## 498   498          convinces     1
## 499   499          convivial     2
## 500   500               cool     1
## 501   501         cool stuff     3
## 502   502           cornered    -2
## 503   503             corpse    -1
## 504   504             costly    -2
## 505   505            courage     2
## 506   506         courageous     2
## 507   507          courteous     2
## 508   508           courtesy     2
## 509   509           cover-up    -3
## 510   510             coward    -2
## 511   511           cowardly    -2
## 512   512           coziness     2
## 513   513              cramp    -1
## 514   514               crap    -3
## 515   515              crash    -2
## 516   516            crazier    -2
## 517   517           craziest    -2
## 518   518              crazy    -2
## 519   519           creative     2
## 520   520        crestfallen    -2
## 521   521              cried    -2
## 522   522              cries    -2
## 523   523              crime    -3
## 524   524           criminal    -3
## 525   525          criminals    -3
## 526   526             crisis    -3
## 527   527             critic    -2
## 528   528          criticism    -2
## 529   529          criticize    -2
## 530   530         criticized    -2
## 531   531         criticizes    -2
## 532   532        criticizing    -2
## 533   533            critics    -2
## 534   534              cruel    -3
## 535   535            cruelty    -3
## 536   536              crush    -1
## 537   537            crushed    -2
## 538   538            crushes    -1
## 539   539           crushing    -1
## 540   540                cry    -1
## 541   541             crying    -2
## 542   542               cunt    -5
## 543   543            curious     1
## 544   544              curse    -1
## 545   545                cut    -1
## 546   546               cute     2
## 547   547               cuts    -1
## 548   548            cutting    -1
## 549   549              cynic    -2
## 550   550            cynical    -2
## 551   551           cynicism    -2
## 552   552             damage    -3
## 553   553            damages    -3
## 554   554               damn    -4
## 555   555             damned    -4
## 556   556             damnit    -4
## 557   557             danger    -2
## 558   558          daredevil     2
## 559   559             daring     2
## 560   560            darkest    -2
## 561   561           darkness    -1
## 562   562          dauntless     2
## 563   563               dead    -3
## 564   564           deadlock    -2
## 565   565          deafening    -1
## 566   566               dear     2
## 567   567             dearly     3
## 568   568              death    -2
## 569   569           debonair     2
## 570   570               debt    -2
## 571   571             deceit    -3
## 572   572          deceitful    -3
## 573   573            deceive    -3
## 574   574           deceived    -3
## 575   575           deceives    -3
## 576   576          deceiving    -3
## 577   577          deception    -3
## 578   578           decisive     1
## 579   579          dedicated     2
## 580   580           defeated    -2
## 581   581             defect    -3
## 582   582            defects    -3
## 583   583           defender     2
## 584   584          defenders     2
## 585   585        defenseless    -2
## 586   586              defer    -1
## 587   587          deferring    -1
## 588   588            defiant    -1
## 589   589            deficit    -2
## 590   590            degrade    -2
## 591   591           degraded    -2
## 592   592           degrades    -2
## 593   593         dehumanize    -2
## 594   594        dehumanized    -2
## 595   595        dehumanizes    -2
## 596   596       dehumanizing    -2
## 597   597             deject    -2
## 598   598           dejected    -2
## 599   599          dejecting    -2
## 600   600            dejects    -2
## 601   601              delay    -1
## 602   602            delayed    -1
## 603   603            delight     3
## 604   604          delighted     3
## 605   605         delighting     3
## 606   606           delights     3
## 607   607             demand    -1
## 608   608           demanded    -1
## 609   609          demanding    -1
## 610   610            demands    -1
## 611   611      demonstration    -1
## 612   612        demoralized    -2
## 613   613             denied    -2
## 614   614             denier    -2
## 615   615            deniers    -2
## 616   616             denies    -2
## 617   617           denounce    -2
## 618   618          denounces    -2
## 619   619               deny    -2
## 620   620            denying    -2
## 621   621          depressed    -2
## 622   622         depressing    -2
## 623   623             derail    -2
## 624   624           derailed    -2
## 625   625            derails    -2
## 626   626             deride    -2
## 627   627            derided    -2
## 628   628            derides    -2
## 629   629           deriding    -2
## 630   630           derision    -2
## 631   631          desirable     2
## 632   632             desire     1
## 633   633            desired     2
## 634   634           desirous     2
## 635   635            despair    -3
## 636   636         despairing    -3
## 637   637           despairs    -3
## 638   638          desperate    -3
## 639   639        desperately    -3
## 640   640         despondent    -3
## 641   641            destroy    -3
## 642   642          destroyed    -3
## 643   643         destroying    -3
## 644   644           destroys    -3
## 645   645        destruction    -3
## 646   646        destructive    -3
## 647   647           detached    -1
## 648   648             detain    -2
## 649   649           detained    -2
## 650   650          detention    -2
## 651   651         determined     2
## 652   652          devastate    -2
## 653   653         devastated    -2
## 654   654        devastating    -2
## 655   655            devoted     3
## 656   656            diamond     1
## 657   657               dick    -4
## 658   658           dickhead    -4
## 659   659                die    -3
## 660   660               died    -3
## 661   661          difficult    -1
## 662   662          diffident    -2
## 663   663            dilemma    -1
## 664   664            dipshit    -3
## 665   665               dire    -3
## 666   666            direful    -3
## 667   667               dirt    -2
## 668   668            dirtier    -2
## 669   669           dirtiest    -2
## 670   670              dirty    -2
## 671   671          disabling    -1
## 672   672       disadvantage    -2
## 673   673      disadvantaged    -2
## 674   674          disappear    -1
## 675   675        disappeared    -1
## 676   676         disappears    -1
## 677   677         disappoint    -2
## 678   678       disappointed    -2
## 679   679      disappointing    -2
## 680   680     disappointment    -2
## 681   681    disappointments    -2
## 682   682        disappoints    -2
## 683   683           disaster    -2
## 684   684          disasters    -2
## 685   685         disastrous    -3
## 686   686         disbelieve    -2
## 687   687            discard    -1
## 688   688          discarded    -1
## 689   689         discarding    -1
## 690   690           discards    -1
## 691   691       disconsolate    -2
## 692   692     disconsolation    -2
## 693   693       discontented    -2
## 694   694            discord    -2
## 695   695         discounted    -1
## 696   696        discouraged    -2
## 697   697        discredited    -2
## 698   698            disdain    -2
## 699   699           disgrace    -2
## 700   700          disgraced    -2
## 701   701           disguise    -1
## 702   702          disguised    -1
## 703   703          disguises    -1
## 704   704         disguising    -1
## 705   705            disgust    -3
## 706   706          disgusted    -3
## 707   707         disgusting    -3
## 708   708       disheartened    -2
## 709   709          dishonest    -2
## 710   710      disillusioned    -2
## 711   711        disinclined    -2
## 712   712         disjointed    -2
## 713   713            dislike    -2
## 714   714             dismal    -2
## 715   715           dismayed    -2
## 716   716           disorder    -2
## 717   717       disorganized    -2
## 718   718        disoriented    -2
## 719   719          disparage    -2
## 720   720         disparaged    -2
## 721   721         disparages    -2
## 722   722        disparaging    -2
## 723   723         displeased    -2
## 724   724            dispute    -2
## 725   725           disputed    -2
## 726   726           disputes    -2
## 727   727          disputing    -2
## 728   728       disqualified    -2
## 729   729           disquiet    -2
## 730   730          disregard    -2
## 731   731        disregarded    -2
## 732   732       disregarding    -2
## 733   733         disregards    -2
## 734   734         disrespect    -2
## 735   735       disrespected    -2
## 736   736         disruption    -2
## 737   737        disruptions    -2
## 738   738         disruptive    -2
## 739   739       dissatisfied    -2
## 740   740            distort    -2
## 741   741          distorted    -2
## 742   742         distorting    -2
## 743   743           distorts    -2
## 744   744           distract    -2
## 745   745         distracted    -2
## 746   746        distraction    -2
## 747   747          distracts    -2
## 748   748           distress    -2
## 749   749         distressed    -2
## 750   750         distresses    -2
## 751   751        distressing    -2
## 752   752           distrust    -3
## 753   753        distrustful    -3
## 754   754            disturb    -2
## 755   755          disturbed    -2
## 756   756         disturbing    -2
## 757   757           disturbs    -2
## 758   758          dithering    -2
## 759   759              dizzy    -1
## 760   760            dodging    -2
## 761   761              dodgy    -2
## 762   762      does not work    -3
## 763   763           dolorous    -2
## 764   764          dont like    -2
## 765   765               doom    -2
## 766   766             doomed    -2
## 767   767              doubt    -1
## 768   768            doubted    -1
## 769   769           doubtful    -1
## 770   770           doubting    -1
## 771   771             doubts    -1
## 772   772             douche    -3
## 773   773          douchebag    -3
## 774   774           downcast    -2
## 775   775        downhearted    -2
## 776   776           downside    -2
## 777   777               drag    -1
## 778   778            dragged    -1
## 779   779              drags    -1
## 780   780            drained    -2
## 781   781              dread    -2
## 782   782            dreaded    -2
## 783   783           dreadful    -3
## 784   784           dreading    -2
## 785   785              dream     1
## 786   786             dreams     1
## 787   787             dreary    -2
## 788   788             droopy    -2
## 789   789               drop    -1
## 790   790              drown    -2
## 791   791            drowned    -2
## 792   792             drowns    -2
## 793   793              drunk    -2
## 794   794            dubious    -2
## 795   795                dud    -2
## 796   796               dull    -2
## 797   797               dumb    -3
## 798   798            dumbass    -3
## 799   799               dump    -1
## 800   800             dumped    -2
## 801   801              dumps    -1
## 802   802               dupe    -2
## 803   803              duped    -2
## 804   804        dysfunction    -2
## 805   805              eager     2
## 806   806            earnest     2
## 807   807               ease     2
## 808   808               easy     1
## 809   809           ecstatic     4
## 810   810              eerie    -2
## 811   811               eery    -2
## 812   812          effective     2
## 813   813        effectively     2
## 814   814             elated     3
## 815   815            elation     3
## 816   816            elegant     2
## 817   817          elegantly     2
## 818   818          embarrass    -2
## 819   819        embarrassed    -2
## 820   820        embarrasses    -2
## 821   821       embarrassing    -2
## 822   822      embarrassment    -2
## 823   823         embittered    -2
## 824   824            embrace     1
## 825   825          emergency    -2
## 826   826         empathetic     2
## 827   827          emptiness    -1
## 828   828              empty    -1
## 829   829          enchanted     2
## 830   830          encourage     2
## 831   831         encouraged     2
## 832   832      encouragement     2
## 833   833         encourages     2
## 834   834            endorse     2
## 835   835           endorsed     2
## 836   836        endorsement     2
## 837   837           endorses     2
## 838   838            enemies    -2
## 839   839              enemy    -2
## 840   840          energetic     2
## 841   841             engage     1
## 842   842            engages     1
## 843   843          engrossed     1
## 844   844              enjoy     2
## 845   845           enjoying     2
## 846   846             enjoys     2
## 847   847          enlighten     2
## 848   848        enlightened     2
## 849   849       enlightening     2
## 850   850         enlightens     2
## 851   851              ennui    -2
## 852   852             enrage    -2
## 853   853            enraged    -2
## 854   854            enrages    -2
## 855   855           enraging    -2
## 856   856          enrapture     3
## 857   857            enslave    -2
## 858   858           enslaved    -2
## 859   859           enslaves    -2
## 860   860             ensure     1
## 861   861           ensuring     1
## 862   862       enterprising     1
## 863   863       entertaining     2
## 864   864            enthral     3
## 865   865       enthusiastic     3
## 866   866           entitled     1
## 867   867          entrusted     2
## 868   868             envies    -1
## 869   869            envious    -2
## 870   870               envy    -1
## 871   871            envying    -1
## 872   872          erroneous    -2
## 873   873              error    -2
## 874   874             errors    -2
## 875   875             escape    -1
## 876   876            escapes    -1
## 877   877           escaping    -1
## 878   878           esteemed     2
## 879   879            ethical     2
## 880   880           euphoria     3
## 881   881           euphoric     4
## 882   882           eviction    -1
## 883   883               evil    -3
## 884   884         exaggerate    -2
## 885   885        exaggerated    -2
## 886   886        exaggerates    -2
## 887   887       exaggerating    -2
## 888   888        exasperated     2
## 889   889         excellence     3
## 890   890          excellent     3
## 891   891             excite     3
## 892   892            excited     3
## 893   893         excitement     3
## 894   894           exciting     3
## 895   895            exclude    -1
## 896   896           excluded    -2
## 897   897          exclusion    -1
## 898   898          exclusive     2
## 899   899             excuse    -1
## 900   900             exempt    -1
## 901   901          exhausted    -2
## 902   902        exhilarated     3
## 903   903        exhilarates     3
## 904   904       exhilarating     3
## 905   905          exonerate     2
## 906   906         exonerated     2
## 907   907         exonerates     2
## 908   908        exonerating     2
## 909   909             expand     1
## 910   910            expands     1
## 911   911              expel    -2
## 912   912           expelled    -2
## 913   913          expelling    -2
## 914   914             expels    -2
## 915   915            exploit    -2
## 916   916          exploited    -2
## 917   917         exploiting    -2
## 918   918           exploits    -2
## 919   919        exploration     1
## 920   920       explorations     1
## 921   921             expose    -1
## 922   922            exposed    -1
## 923   923            exposes    -1
## 924   924           exposing    -1
## 925   925             extend     1
## 926   926            extends     1
## 927   927          exuberant     4
## 928   928           exultant     3
## 929   929         exultantly     3
## 930   930           fabulous     4
## 931   931                fad    -2
## 932   932                fag    -3
## 933   933             faggot    -3
## 934   934            faggots    -3
## 935   935               fail    -2
## 936   936             failed    -2
## 937   937            failing    -2
## 938   938              fails    -2
## 939   939            failure    -2
## 940   940           failures    -2
## 941   941       fainthearted    -2
## 942   942               fair     2
## 943   943              faith     1
## 944   944           faithful     3
## 945   945               fake    -3
## 946   946              fakes    -3
## 947   947             faking    -3
## 948   948             fallen    -2
## 949   949            falling    -1
## 950   950          falsified    -3
## 951   951            falsify    -3
## 952   952               fame     1
## 953   953                fan     3
## 954   954          fantastic     4
## 955   955              farce    -1
## 956   956          fascinate     3
## 957   957         fascinated     3
## 958   958         fascinates     3
## 959   959        fascinating     3
## 960   960            fascist    -2
## 961   961           fascists    -2
## 962   962         fatalities    -3
## 963   963           fatality    -3
## 964   964            fatigue    -2
## 965   965           fatigued    -2
## 966   966           fatigues    -2
## 967   967          fatiguing    -2
## 968   968              favor     2
## 969   969            favored     2
## 970   970           favorite     2
## 971   971          favorited     2
## 972   972          favorites     2
## 973   973             favors     2
## 974   974               fear    -2
## 975   975            fearful    -2
## 976   976            fearing    -2
## 977   977           fearless     2
## 978   978           fearsome    -2
## 979   979             fed up    -3
## 980   980             feeble    -2
## 981   981            feeling     1
## 982   982           felonies    -3
## 983   983             felony    -3
## 984   984            fervent     2
## 985   985             fervid     2
## 986   986            festive     2
## 987   987             fiasco    -3
## 988   988            fidgety    -2
## 989   989              fight    -1
## 990   990               fine     2
## 991   991               fire    -2
## 992   992              fired    -2
## 993   993             firing    -2
## 994   994                fit     1
## 995   995            fitness     1
## 996   996           flagship     2
## 997   997              flees    -1
## 998   998               flop    -2
## 999   999              flops    -2
## 1000 1000                flu    -2
## 1001 1001          flustered    -2
## 1002 1002            focused     2
## 1003 1003               fond     2
## 1004 1004           fondness     2
## 1005 1005               fool    -2
## 1006 1006            foolish    -2
## 1007 1007              fools    -2
## 1008 1008             forced    -1
## 1009 1009        foreclosure    -2
## 1010 1010       foreclosures    -2
## 1011 1011             forget    -1
## 1012 1012          forgetful    -2
## 1013 1013            forgive     1
## 1014 1014          forgiving     1
## 1015 1015          forgotten    -1
## 1016 1016          fortunate     2
## 1017 1017            frantic    -1
## 1018 1018              fraud    -4
## 1019 1019             frauds    -4
## 1020 1020          fraudster    -4
## 1021 1021         fraudsters    -4
## 1022 1022        fraudulence    -4
## 1023 1023         fraudulent    -4
## 1024 1024               free     1
## 1025 1025            freedom     2
## 1026 1026             frenzy    -3
## 1027 1027              fresh     1
## 1028 1028           friendly     2
## 1029 1029             fright    -2
## 1030 1030         frightened    -2
## 1031 1031        frightening    -3
## 1032 1032             frikin    -2
## 1033 1033             frisky     2
## 1034 1034           frowning    -1
## 1035 1035          frustrate    -2
## 1036 1036         frustrated    -2
## 1037 1037         frustrates    -2
## 1038 1038        frustrating    -2
## 1039 1039        frustration    -2
## 1040 1040                ftw     3
## 1041 1041               fuck    -4
## 1042 1042             fucked    -4
## 1043 1043             fucker    -4
## 1044 1044            fuckers    -4
## 1045 1045           fuckface    -4
## 1046 1046           fuckhead    -4
## 1047 1047            fucking    -4
## 1048 1048           fucktard    -4
## 1049 1049                fud    -3
## 1050 1050              fuked    -4
## 1051 1051             fuking    -4
## 1052 1052            fulfill     2
## 1053 1053          fulfilled     2
## 1054 1054           fulfills     2
## 1055 1055             fuming    -2
## 1056 1056                fun     4
## 1057 1057            funeral    -1
## 1058 1058           funerals    -1
## 1059 1059              funky     2
## 1060 1060            funnier     4
## 1061 1061              funny     4
## 1062 1062            furious    -3
## 1063 1063             futile     2
## 1064 1064                gag    -2
## 1065 1065             gagged    -2
## 1066 1066               gain     2
## 1067 1067             gained     2
## 1068 1068            gaining     2
## 1069 1069              gains     2
## 1070 1070            gallant     3
## 1071 1071          gallantly     3
## 1072 1072          gallantry     3
## 1073 1073           generous     2
## 1074 1074             genial     3
## 1075 1075              ghost    -1
## 1076 1076              giddy    -2
## 1077 1077               gift     2
## 1078 1078               glad     3
## 1079 1079          glamorous     3
## 1080 1080         glamourous     3
## 1081 1081               glee     3
## 1082 1082            gleeful     3
## 1083 1083              gloom    -1
## 1084 1084             gloomy    -2
## 1085 1085           glorious     2
## 1086 1086              glory     2
## 1087 1087               glum    -2
## 1088 1088                god     1
## 1089 1089            goddamn    -3
## 1090 1090            godsend     4
## 1091 1091               good     3
## 1092 1092           goodness     3
## 1093 1093              grace     1
## 1094 1094           gracious     3
## 1095 1095              grand     3
## 1096 1096              grant     1
## 1097 1097            granted     1
## 1098 1098           granting     1
## 1099 1099             grants     1
## 1100 1100           grateful     3
## 1101 1101      gratification     2
## 1102 1102              grave    -2
## 1103 1103               gray    -1
## 1104 1104              great     3
## 1105 1105            greater     3
## 1106 1106           greatest     3
## 1107 1107              greed    -3
## 1108 1108             greedy    -2
## 1109 1109         green wash    -3
## 1110 1110      green washing    -3
## 1111 1111          greenwash    -3
## 1112 1112        greenwasher    -3
## 1113 1113       greenwashers    -3
## 1114 1114       greenwashing    -3
## 1115 1115              greet     1
## 1116 1116            greeted     1
## 1117 1117           greeting     1
## 1118 1118          greetings     2
## 1119 1119             greets     1
## 1120 1120               grey    -1
## 1121 1121              grief    -2
## 1122 1122            grieved    -2
## 1123 1123              gross    -2
## 1124 1124            growing     1
## 1125 1125             growth     2
## 1126 1126          guarantee     1
## 1127 1127              guilt    -3
## 1128 1128             guilty    -3
## 1129 1129        gullibility    -2
## 1130 1130           gullible    -2
## 1131 1131                gun    -1
## 1132 1132                 ha     2
## 1133 1133             hacked    -1
## 1134 1134               haha     3
## 1135 1135             hahaha     3
## 1136 1136            hahahah     3
## 1137 1137               hail     2
## 1138 1138             hailed     2
## 1139 1139            hapless    -2
## 1140 1140        haplessness    -2
## 1141 1141          happiness     3
## 1142 1142              happy     3
## 1143 1143               hard    -1
## 1144 1144            hardier     2
## 1145 1145           hardship    -2
## 1146 1146              hardy     2
## 1147 1147               harm    -2
## 1148 1148             harmed    -2
## 1149 1149            harmful    -2
## 1150 1150            harming    -2
## 1151 1151              harms    -2
## 1152 1152            harried    -2
## 1153 1153              harsh    -2
## 1154 1154            harsher    -2
## 1155 1155           harshest    -2
## 1156 1156               hate    -3
## 1157 1157              hated    -3
## 1158 1158             haters    -3
## 1159 1159              hates    -3
## 1160 1160             hating    -3
## 1161 1161              haunt    -1
## 1162 1162            haunted    -2
## 1163 1163           haunting     1
## 1164 1164             haunts    -1
## 1165 1165              havoc    -2
## 1166 1166            healthy     2
## 1167 1167      heartbreaking    -3
## 1168 1168        heartbroken    -3
## 1169 1169          heartfelt     3
## 1170 1170             heaven     2
## 1171 1171           heavenly     4
## 1172 1172       heavyhearted    -2
## 1173 1173               hell    -4
## 1174 1174               help     2
## 1175 1175            helpful     2
## 1176 1176            helping     2
## 1177 1177           helpless    -2
## 1178 1178              helps     2
## 1179 1179               hero     2
## 1180 1180             heroes     2
## 1181 1181             heroic     3
## 1182 1182           hesitant    -2
## 1183 1183           hesitate    -2
## 1184 1184                hid    -1
## 1185 1185               hide    -1
## 1186 1186              hides    -1
## 1187 1187             hiding    -1
## 1188 1188          highlight     2
## 1189 1189          hilarious     2
## 1190 1190          hindrance    -2
## 1191 1191               hoax    -2
## 1192 1192           homesick    -2
## 1193 1193             honest     2
## 1194 1194              honor     2
## 1195 1195            honored     2
## 1196 1196           honoring     2
## 1197 1197             honour     2
## 1198 1198           honoured     2
## 1199 1199          honouring     2
## 1200 1200           hooligan    -2
## 1201 1201        hooliganism    -2
## 1202 1202          hooligans    -2
## 1203 1203               hope     2
## 1204 1204            hopeful     2
## 1205 1205          hopefully     2
## 1206 1206           hopeless    -2
## 1207 1207       hopelessness    -2
## 1208 1208              hopes     2
## 1209 1209             hoping     2
## 1210 1210         horrendous    -3
## 1211 1211           horrible    -3
## 1212 1212           horrific    -3
## 1213 1213          horrified    -3
## 1214 1214            hostile    -2
## 1215 1215           huckster    -2
## 1216 1216                hug     2
## 1217 1217               huge     1
## 1218 1218               hugs     2
## 1219 1219           humerous     3
## 1220 1220         humiliated    -3
## 1221 1221        humiliation    -3
## 1222 1222              humor     2
## 1223 1223           humorous     2
## 1224 1224             humour     2
## 1225 1225          humourous     2
## 1226 1226             hunger    -2
## 1227 1227             hurrah     5
## 1228 1228               hurt    -2
## 1229 1229            hurting    -2
## 1230 1230              hurts    -2
## 1231 1231       hypocritical    -2
## 1232 1232           hysteria    -3
## 1233 1233         hysterical    -3
## 1234 1234          hysterics    -3
## 1235 1235              idiot    -3
## 1236 1236            idiotic    -3
## 1237 1237          ignorance    -2
## 1238 1238           ignorant    -2
## 1239 1239             ignore    -1
## 1240 1240            ignored    -2
## 1241 1241            ignores    -1
## 1242 1242                ill    -2
## 1243 1243            illegal    -3
## 1244 1244         illiteracy    -2
## 1245 1245            illness    -2
## 1246 1246          illnesses    -2
## 1247 1247           imbecile    -3
## 1248 1248        immobilized    -1
## 1249 1249           immortal     2
## 1250 1250             immune     1
## 1251 1251          impatient    -2
## 1252 1252          imperfect    -2
## 1253 1253         importance     2
## 1254 1254          important     2
## 1255 1255             impose    -1
## 1256 1256            imposed    -1
## 1257 1257            imposes    -1
## 1258 1258           imposing    -1
## 1259 1259           impotent    -2
## 1260 1260            impress     3
## 1261 1261          impressed     3
## 1262 1262          impresses     3
## 1263 1263         impressive     3
## 1264 1264         imprisoned    -2
## 1265 1265            improve     2
## 1266 1266           improved     2
## 1267 1267        improvement     2
## 1268 1268           improves     2
## 1269 1269          improving     2
## 1270 1270          inability    -2
## 1271 1271           inaction    -2
## 1272 1272         inadequate    -2
## 1273 1273          incapable    -2
## 1274 1274      incapacitated    -2
## 1275 1275           incensed    -2
## 1276 1276       incompetence    -2
## 1277 1277        incompetent    -2
## 1278 1278      inconsiderate    -2
## 1279 1279      inconvenience    -2
## 1280 1280       inconvenient    -2
## 1281 1281           increase     1
## 1282 1282          increased     1
## 1283 1283         indecisive    -2
## 1284 1284     indestructible     2
## 1285 1285       indifference    -2
## 1286 1286        indifferent    -2
## 1287 1287          indignant    -2
## 1288 1288        indignation    -2
## 1289 1289       indoctrinate    -2
## 1290 1290      indoctrinated    -2
## 1291 1291      indoctrinates    -2
## 1292 1292     indoctrinating    -2
## 1293 1293        ineffective    -2
## 1294 1294      ineffectively    -2
## 1295 1295         infatuated     2
## 1296 1296        infatuation     2
## 1297 1297           infected    -2
## 1298 1298           inferior    -2
## 1299 1299           inflamed    -2
## 1300 1300        influential     2
## 1301 1301       infringement    -2
## 1302 1302          infuriate    -2
## 1303 1303         infuriated    -2
## 1304 1304         infuriates    -2
## 1305 1305        infuriating    -2
## 1306 1306            inhibit    -1
## 1307 1307            injured    -2
## 1308 1308             injury    -2
## 1309 1309          injustice    -2
## 1310 1310           innovate     1
## 1311 1311          innovates     1
## 1312 1312         innovation     1
## 1313 1313         innovative     2
## 1314 1314        inquisition    -2
## 1315 1315        inquisitive     2
## 1316 1316             insane    -2
## 1317 1317           insanity    -2
## 1318 1318           insecure    -2
## 1319 1319        insensitive    -2
## 1320 1320      insensitivity    -2
## 1321 1321      insignificant    -2
## 1322 1322            insipid    -2
## 1323 1323        inspiration     2
## 1324 1324      inspirational     2
## 1325 1325            inspire     2
## 1326 1326           inspired     2
## 1327 1327           inspires     2
## 1328 1328          inspiring     3
## 1329 1329             insult    -2
## 1330 1330           insulted    -2
## 1331 1331          insulting    -2
## 1332 1332            insults    -2
## 1333 1333             intact     2
## 1334 1334          integrity     2
## 1335 1335        intelligent     2
## 1336 1336            intense     1
## 1337 1337           interest     1
## 1338 1338         interested     2
## 1339 1339        interesting     2
## 1340 1340          interests     1
## 1341 1341       interrogated    -2
## 1342 1342          interrupt    -2
## 1343 1343        interrupted    -2
## 1344 1344       interrupting    -2
## 1345 1345       interruption    -2
## 1346 1346         interrupts    -2
## 1347 1347         intimidate    -2
## 1348 1348        intimidated    -2
## 1349 1349        intimidates    -2
## 1350 1350       intimidating    -2
## 1351 1351       intimidation    -2
## 1352 1352          intricate     2
## 1353 1353          intrigues     1
## 1354 1354         invincible     2
## 1355 1355             invite     1
## 1356 1356           inviting     1
## 1357 1357       invulnerable     2
## 1358 1358              irate    -3
## 1359 1359             ironic    -1
## 1360 1360              irony    -1
## 1361 1361         irrational    -1
## 1362 1362       irresistible     2
## 1363 1363         irresolute    -2
## 1364 1364      irresponsible     2
## 1365 1365       irreversible    -1
## 1366 1366           irritate    -3
## 1367 1367          irritated    -3
## 1368 1368         irritating    -3
## 1369 1369           isolated    -1
## 1370 1370              itchy    -2
## 1371 1371            jackass    -4
## 1372 1372          jackasses    -4
## 1373 1373             jailed    -2
## 1374 1374             jaunty     2
## 1375 1375            jealous    -2
## 1376 1376           jeopardy    -2
## 1377 1377               jerk    -3
## 1378 1378              jesus     1
## 1379 1379              jewel     1
## 1380 1380             jewels     1
## 1381 1381            jocular     2
## 1382 1382               join     1
## 1383 1383               joke     2
## 1384 1384              jokes     2
## 1385 1385              jolly     2
## 1386 1386             jovial     2
## 1387 1387                joy     3
## 1388 1388             joyful     3
## 1389 1389           joyfully     3
## 1390 1390            joyless    -2
## 1391 1391             joyous     3
## 1392 1392           jubilant     3
## 1393 1393              jumpy    -1
## 1394 1394            justice     2
## 1395 1395        justifiably     2
## 1396 1396          justified     2
## 1397 1397               keen     1
## 1398 1398               kill    -3
## 1399 1399             killed    -3
## 1400 1400            killing    -3
## 1401 1401              kills    -3
## 1402 1402               kind     2
## 1403 1403             kinder     2
## 1404 1404               kiss     2
## 1405 1405              kudos     3
## 1406 1406               lack    -2
## 1407 1407      lackadaisical    -2
## 1408 1408                lag    -1
## 1409 1409             lagged    -2
## 1410 1410            lagging    -2
## 1411 1411               lags    -2
## 1412 1412               lame    -2
## 1413 1413           landmark     2
## 1414 1414              laugh     1
## 1415 1415            laughed     1
## 1416 1416           laughing     1
## 1417 1417             laughs     1
## 1418 1418          laughting     1
## 1419 1419           launched     1
## 1420 1420               lawl     3
## 1421 1421            lawsuit    -2
## 1422 1422           lawsuits    -2
## 1423 1423               lazy    -1
## 1424 1424               leak    -1
## 1425 1425             leaked    -1
## 1426 1426              leave    -1
## 1427 1427              legal     1
## 1428 1428            legally     1
## 1429 1429            lenient     1
## 1430 1430          lethargic    -2
## 1431 1431           lethargy    -2
## 1432 1432               liar    -3
## 1433 1433              liars    -3
## 1434 1434           libelous    -2
## 1435 1435               lied    -2
## 1436 1436          lifesaver     4
## 1437 1437       lighthearted     1
## 1438 1438               like     2
## 1439 1439              liked     2
## 1440 1440              likes     2
## 1441 1441         limitation    -1
## 1442 1442            limited    -1
## 1443 1443             limits    -1
## 1444 1444         litigation    -1
## 1445 1445          litigious    -2
## 1446 1446             lively     2
## 1447 1447              livid    -2
## 1448 1448               lmao     4
## 1449 1449              lmfao     4
## 1450 1450             loathe    -3
## 1451 1451            loathed    -3
## 1452 1452            loathes    -3
## 1453 1453           loathing    -3
## 1454 1454              lobby    -2
## 1455 1455           lobbying    -2
## 1456 1456                lol     3
## 1457 1457             lonely    -2
## 1458 1458           lonesome    -2
## 1459 1459            longing    -1
## 1460 1460               loom    -1
## 1461 1461             loomed    -1
## 1462 1462            looming    -1
## 1463 1463              looms    -1
## 1464 1464              loose    -3
## 1465 1465             looses    -3
## 1466 1466              loser    -3
## 1467 1467             losing    -3
## 1468 1468               loss    -3
## 1469 1469               lost    -3
## 1470 1470            lovable     3
## 1471 1471               love     3
## 1472 1472              loved     3
## 1473 1473           lovelies     3
## 1474 1474             lovely     3
## 1475 1475             loving     2
## 1476 1476             lowest    -1
## 1477 1477              loyal     3
## 1478 1478            loyalty     3
## 1479 1479               luck     3
## 1480 1480            luckily     3
## 1481 1481              lucky     3
## 1482 1482         lugubrious    -2
## 1483 1483            lunatic    -3
## 1484 1484           lunatics    -3
## 1485 1485               lurk    -1
## 1486 1486            lurking    -1
## 1487 1487              lurks    -1
## 1488 1488                mad    -3
## 1489 1489          maddening    -3
## 1490 1490            made-up    -1
## 1491 1491              madly    -3
## 1492 1492            madness    -3
## 1493 1493          mandatory    -1
## 1494 1494        manipulated    -1
## 1495 1495       manipulating    -1
## 1496 1496       manipulation    -1
## 1497 1497             marvel     3
## 1498 1498          marvelous     3
## 1499 1499            marvels     3
## 1500 1500        masterpiece     4
## 1501 1501       masterpieces     4
## 1502 1502             matter     1
## 1503 1503            matters     1
## 1504 1504             mature     2
## 1505 1505         meaningful     2
## 1506 1506        meaningless    -2
## 1507 1507              medal     3
## 1508 1508         mediocrity    -3
## 1509 1509         meditative     1
## 1510 1510         melancholy    -2
## 1511 1511             menace    -2
## 1512 1512            menaced    -2
## 1513 1513              mercy     2
## 1514 1514              merry     3
## 1515 1515               mess    -2
## 1516 1516             messed    -2
## 1517 1517         messing up    -2
## 1518 1518         methodical     2
## 1519 1519           mindless    -2
## 1520 1520            miracle     4
## 1521 1521              mirth     3
## 1522 1522           mirthful     3
## 1523 1523         mirthfully     3
## 1524 1524          misbehave    -2
## 1525 1525         misbehaved    -2
## 1526 1526         misbehaves    -2
## 1527 1527        misbehaving    -2
## 1528 1528           mischief    -1
## 1529 1529          mischiefs    -1
## 1530 1530          miserable    -3
## 1531 1531             misery    -2
## 1532 1532          misgiving    -2
## 1533 1533     misinformation    -2
## 1534 1534        misinformed    -2
## 1535 1535     misinterpreted    -2
## 1536 1536         misleading    -3
## 1537 1537            misread    -1
## 1538 1538       misreporting    -2
## 1539 1539  misrepresentation    -2
## 1540 1540               miss    -2
## 1541 1541             missed    -2
## 1542 1542            missing    -2
## 1543 1543            mistake    -2
## 1544 1544           mistaken    -2
## 1545 1545           mistakes    -2
## 1546 1546          mistaking    -2
## 1547 1547      misunderstand    -2
## 1548 1548   misunderstanding    -2
## 1549 1549     misunderstands    -2
## 1550 1550      misunderstood    -2
## 1551 1551               moan    -2
## 1552 1552             moaned    -2
## 1553 1553            moaning    -2
## 1554 1554              moans    -2
## 1555 1555               mock    -2
## 1556 1556             mocked    -2
## 1557 1557            mocking    -2
## 1558 1558              mocks    -2
## 1559 1559          mongering    -2
## 1560 1560         monopolize    -2
## 1561 1561        monopolized    -2
## 1562 1562        monopolizes    -2
## 1563 1563       monopolizing    -2
## 1564 1564              moody    -1
## 1565 1565               mope    -1
## 1566 1566             moping    -1
## 1567 1567              moron    -3
## 1568 1568       motherfucker    -5
## 1569 1569      motherfucking    -5
## 1570 1570           motivate     1
## 1571 1571          motivated     2
## 1572 1572         motivating     2
## 1573 1573         motivation     1
## 1574 1574              mourn    -2
## 1575 1575            mourned    -2
## 1576 1576           mournful    -2
## 1577 1577           mourning    -2
## 1578 1578             mourns    -2
## 1579 1579            mumpish    -2
## 1580 1580             murder    -2
## 1581 1581           murderer    -2
## 1582 1582          murdering    -3
## 1583 1583          murderous    -3
## 1584 1584            murders    -2
## 1585 1585               myth    -1
## 1586 1586               n00b    -2
## 1587 1587              naive    -2
## 1588 1588              nasty    -3
## 1589 1589            natural     1
## 1590 1590           na\xefve    -2
## 1591 1591              needy    -2
## 1592 1592           negative    -2
## 1593 1593         negativity    -2
## 1594 1594            neglect    -2
## 1595 1595          neglected    -2
## 1596 1596         neglecting    -2
## 1597 1597           neglects    -2
## 1598 1598             nerves    -1
## 1599 1599            nervous    -2
## 1600 1600          nervously    -2
## 1601 1601               nice     3
## 1602 1602              nifty     2
## 1603 1603             niggas    -5
## 1604 1604             nigger    -5
## 1605 1605                 no    -1
## 1606 1606             no fun    -3
## 1607 1607              noble     2
## 1608 1608              noisy    -1
## 1609 1609           nonsense    -2
## 1610 1610               noob    -2
## 1611 1611              nosey    -2
## 1612 1612           not good    -2
## 1613 1613        not working    -3
## 1614 1614          notorious    -2
## 1615 1615              novel     2
## 1616 1616               numb    -1
## 1617 1617               nuts    -3
## 1618 1618         obliterate    -2
## 1619 1619        obliterated    -2
## 1620 1620          obnoxious    -3
## 1621 1621            obscene    -2
## 1622 1622           obsessed     2
## 1623 1623           obsolete    -2
## 1624 1624           obstacle    -2
## 1625 1625          obstacles    -2
## 1626 1626          obstinate    -2
## 1627 1627                odd    -2
## 1628 1628             offend    -2
## 1629 1629           offended    -2
## 1630 1630           offender    -2
## 1631 1631          offending    -2
## 1632 1632            offends    -2
## 1633 1633            offline    -1
## 1634 1634                oks     2
## 1635 1635            ominous     3
## 1636 1636 once-in-a-lifetime     3
## 1637 1637      opportunities     2
## 1638 1638        opportunity     2
## 1639 1639          oppressed    -2
## 1640 1640         oppressive    -2
## 1641 1641           optimism     2
## 1642 1642         optimistic     2
## 1643 1643         optionless    -2
## 1644 1644             outcry    -2
## 1645 1645      outmaneuvered    -2
## 1646 1646            outrage    -3
## 1647 1647           outraged    -3
## 1648 1648           outreach     2
## 1649 1649        outstanding     5
## 1650 1650          overjoyed     4
## 1651 1651           overload    -1
## 1652 1652         overlooked    -1
## 1653 1653          overreact    -2
## 1654 1654        overreacted    -2
## 1655 1655       overreaction    -2
## 1656 1656         overreacts    -2
## 1657 1657           oversell    -2
## 1658 1658        overselling    -2
## 1659 1659          oversells    -2
## 1660 1660 oversimplification    -2
## 1661 1661     oversimplified    -2
## 1662 1662     oversimplifies    -2
## 1663 1663       oversimplify    -2
## 1664 1664      overstatement    -2
## 1665 1665     overstatements    -2
## 1666 1666         overweight    -1
## 1667 1667           oxymoron    -1
## 1668 1668               pain    -2
## 1669 1669             pained    -2
## 1670 1670              panic    -3
## 1671 1671           panicked    -3
## 1672 1672             panics    -3
## 1673 1673           paradise     3
## 1674 1674            paradox    -1
## 1675 1675             pardon     2
## 1676 1676           pardoned     2
## 1677 1677          pardoning     2
## 1678 1678            pardons     2
## 1679 1679             parley    -1
## 1680 1680         passionate     2
## 1681 1681            passive    -1
## 1682 1682          passively    -1
## 1683 1683           pathetic    -2
## 1684 1684                pay    -1
## 1685 1685              peace     2
## 1686 1686           peaceful     2
## 1687 1687         peacefully     2
## 1688 1688            penalty    -2
## 1689 1689            pensive    -1
## 1690 1690            perfect     3
## 1691 1691          perfected     2
## 1692 1692          perfectly     3
## 1693 1693           perfects     2
## 1694 1694              peril    -2
## 1695 1695            perjury    -3
## 1696 1696        perpetrator    -2
## 1697 1697       perpetrators    -2
## 1698 1698          perplexed    -2
## 1699 1699          persecute    -2
## 1700 1700         persecuted    -2
## 1701 1701         persecutes    -2
## 1702 1702        persecuting    -2
## 1703 1703          perturbed    -2
## 1704 1704              pesky    -2
## 1705 1705          pessimism    -2
## 1706 1706        pessimistic    -2
## 1707 1707          petrified    -2
## 1708 1708             phobic    -2
## 1709 1709        picturesque     2
## 1710 1710             pileup    -1
## 1711 1711              pique    -2
## 1712 1712             piqued    -2
## 1713 1713               piss    -4
## 1714 1714             pissed    -4
## 1715 1715            pissing    -3
## 1716 1716            piteous    -2
## 1717 1717             pitied    -1
## 1718 1718               pity    -2
## 1719 1719            playful     2
## 1720 1720           pleasant     3
## 1721 1721             please     1
## 1722 1722            pleased     3
## 1723 1723           pleasure     3
## 1724 1724             poised    -2
## 1725 1725             poison    -2
## 1726 1726           poisoned    -2
## 1727 1727            poisons    -2
## 1728 1728            pollute    -2
## 1729 1729           polluted    -2
## 1730 1730           polluter    -2
## 1731 1731          polluters    -2
## 1732 1732           pollutes    -2
## 1733 1733               poor    -2
## 1734 1734             poorer    -2
## 1735 1735            poorest    -2
## 1736 1736            popular     3
## 1737 1737           positive     2
## 1738 1738         positively     2
## 1739 1739         possessive    -2
## 1740 1740           postpone    -1
## 1741 1741          postponed    -1
## 1742 1742          postpones    -1
## 1743 1743         postponing    -1
## 1744 1744            poverty    -1
## 1745 1745           powerful     2
## 1746 1746          powerless    -2
## 1747 1747             praise     3
## 1748 1748            praised     3
## 1749 1749            praises     3
## 1750 1750           praising     3
## 1751 1751               pray     1
## 1752 1752            praying     1
## 1753 1753              prays     1
## 1754 1754              prblm    -2
## 1755 1755             prblms    -2
## 1756 1756           prepared     1
## 1757 1757           pressure    -1
## 1758 1758          pressured    -2
## 1759 1759            pretend    -1
## 1760 1760         pretending    -1
## 1761 1761           pretends    -1
## 1762 1762             pretty     1
## 1763 1763            prevent    -1
## 1764 1764          prevented    -1
## 1765 1765         preventing    -1
## 1766 1766           prevents    -1
## 1767 1767              prick    -5
## 1768 1768             prison    -2
## 1769 1769           prisoner    -2
## 1770 1770          prisoners    -2
## 1771 1771         privileged     2
## 1772 1772          proactive     2
## 1773 1773            problem    -2
## 1774 1774           problems    -2
## 1775 1775          profiteer    -2
## 1776 1776           progress     2
## 1777 1777          prominent     2
## 1778 1778            promise     1
## 1779 1779           promised     1
## 1780 1780           promises     1
## 1781 1781            promote     1
## 1782 1782           promoted     1
## 1783 1783           promotes     1
## 1784 1784          promoting     1
## 1785 1785         propaganda    -2
## 1786 1786          prosecute    -1
## 1787 1787         prosecuted    -2
## 1788 1788         prosecutes    -1
## 1789 1789        prosecution    -1
## 1790 1790           prospect     1
## 1791 1791          prospects     1
## 1792 1792         prosperous     3
## 1793 1793            protect     1
## 1794 1794          protected     1
## 1795 1795           protects     1
## 1796 1796            protest    -2
## 1797 1797         protesters    -2
## 1798 1798         protesting    -2
## 1799 1799           protests    -2
## 1800 1800              proud     2
## 1801 1801            proudly     2
## 1802 1802            provoke    -1
## 1803 1803           provoked    -1
## 1804 1804           provokes    -1
## 1805 1805          provoking    -1
## 1806 1806      pseudoscience    -3
## 1807 1807             punish    -2
## 1808 1808           punished    -2
## 1809 1809           punishes    -2
## 1810 1810           punitive    -2
## 1811 1811              pushy    -1
## 1812 1812            puzzled    -2
## 1813 1813            quaking    -2
## 1814 1814       questionable    -2
## 1815 1815         questioned    -1
## 1816 1816        questioning    -1
## 1817 1817             racism    -3
## 1818 1818             racist    -3
## 1819 1819            racists    -3
## 1820 1820               rage    -2
## 1821 1821            rageful    -2
## 1822 1822              rainy    -1
## 1823 1823               rant    -3
## 1824 1824             ranter    -3
## 1825 1825            ranters    -3
## 1826 1826              rants    -3
## 1827 1827               rape    -4
## 1828 1828             rapist    -4
## 1829 1829            rapture     2
## 1830 1830           raptured     2
## 1831 1831           raptures     2
## 1832 1832          rapturous     4
## 1833 1833               rash    -2
## 1834 1834           ratified     2
## 1835 1835              reach     1
## 1836 1836            reached     1
## 1837 1837            reaches     1
## 1838 1838           reaching     1
## 1839 1839           reassure     1
## 1840 1840          reassured     1
## 1841 1841          reassures     1
## 1842 1842         reassuring     2
## 1843 1843          rebellion    -2
## 1844 1844          recession    -2
## 1845 1845           reckless    -2
## 1846 1846          recommend     2
## 1847 1847        recommended     2
## 1848 1848         recommends     2
## 1849 1849           redeemed     2
## 1850 1850             refuse    -2
## 1851 1851            refused    -2
## 1852 1852           refusing    -2
## 1853 1853             regret    -2
## 1854 1854          regretful    -2
## 1855 1855            regrets    -2
## 1856 1856          regretted    -2
## 1857 1857         regretting    -2
## 1858 1858             reject    -1
## 1859 1859           rejected    -1
## 1860 1860          rejecting    -1
## 1861 1861            rejects    -1
## 1862 1862            rejoice     4
## 1863 1863           rejoiced     4
## 1864 1864           rejoices     4
## 1865 1865          rejoicing     4
## 1866 1866            relaxed     2
## 1867 1867         relentless    -1
## 1868 1868            reliant     2
## 1869 1869            relieve     1
## 1870 1870           relieved     2
## 1871 1871           relieves     1
## 1872 1872          relieving     2
## 1873 1873          relishing     2
## 1874 1874         remarkable     2
## 1875 1875            remorse    -2
## 1876 1876            repulse    -1
## 1877 1877           repulsed    -2
## 1878 1878             rescue     2
## 1879 1879            rescued     2
## 1880 1880            rescues     2
## 1881 1881          resentful    -2
## 1882 1882             resign    -1
## 1883 1883           resigned    -1
## 1884 1884          resigning    -1
## 1885 1885            resigns    -1
## 1886 1886           resolute     2
## 1887 1887            resolve     2
## 1888 1888           resolved     2
## 1889 1889           resolves     2
## 1890 1890          resolving     2
## 1891 1891          respected     2
## 1892 1892        responsible     2
## 1893 1893         responsive     2
## 1894 1894            restful     2
## 1895 1895           restless    -2
## 1896 1896            restore     1
## 1897 1897           restored     1
## 1898 1898           restores     1
## 1899 1899          restoring     1
## 1900 1900           restrict    -2
## 1901 1901         restricted    -2
## 1902 1902        restricting    -2
## 1903 1903        restriction    -2
## 1904 1904          restricts    -2
## 1905 1905           retained    -1
## 1906 1906             retard    -2
## 1907 1907           retarded    -2
## 1908 1908            retreat    -1
## 1909 1909            revenge    -2
## 1910 1910         revengeful    -2
## 1911 1911            revered     2
## 1912 1912             revive     2
## 1913 1913            revives     2
## 1914 1914             reward     2
## 1915 1915           rewarded     2
## 1916 1916          rewarding     2
## 1917 1917            rewards     2
## 1918 1918               rich     2
## 1919 1919         ridiculous    -3
## 1920 1920                rig    -1
## 1921 1921             rigged    -1
## 1922 1922    right direction     3
## 1923 1923           rigorous     3
## 1924 1924         rigorously     3
## 1925 1925               riot    -2
## 1926 1926              riots    -2
## 1927 1927               risk    -2
## 1928 1928              risks    -2
## 1929 1929                rob    -2
## 1930 1930             robber    -2
## 1931 1931              robed    -2
## 1932 1932             robing    -2
## 1933 1933               robs    -2
## 1934 1934             robust     2
## 1935 1935               rofl     4
## 1936 1936         roflcopter     4
## 1937 1937            roflmao     4
## 1938 1938            romance     2
## 1939 1939              rotfl     4
## 1940 1940          rotflmfao     4
## 1941 1941            rotflol     4
## 1942 1942               ruin    -2
## 1943 1943             ruined    -2
## 1944 1944            ruining    -2
## 1945 1945              ruins    -2
## 1946 1946           sabotage    -2
## 1947 1947                sad    -2
## 1948 1948             sadden    -2
## 1949 1949           saddened    -2
## 1950 1950              sadly    -2
## 1951 1951               safe     1
## 1952 1952             safely     1
## 1953 1953             safety     1
## 1954 1954            salient     1
## 1955 1955              sappy    -1
## 1956 1956          sarcastic    -2
## 1957 1957          satisfied     2
## 1958 1958               save     2
## 1959 1959              saved     2
## 1960 1960               scam    -2
## 1961 1961              scams    -2
## 1962 1962            scandal    -3
## 1963 1963         scandalous    -3
## 1964 1964           scandals    -3
## 1965 1965          scapegoat    -2
## 1966 1966         scapegoats    -2
## 1967 1967              scare    -2
## 1968 1968             scared    -2
## 1969 1969              scary    -2
## 1970 1970          sceptical    -2
## 1971 1971              scold    -2
## 1972 1972              scoop     3
## 1973 1973              scorn    -2
## 1974 1974           scornful    -2
## 1975 1975             scream    -2
## 1976 1976           screamed    -2
## 1977 1977          screaming    -2
## 1978 1978            screams    -2
## 1979 1979            screwed    -2
## 1980 1980         screwed up    -3
## 1981 1981            scumbag    -4
## 1982 1982             secure     2
## 1983 1983            secured     2
## 1984 1984            secures     2
## 1985 1985           sedition    -2
## 1986 1986          seditious    -2
## 1987 1987            seduced    -1
## 1988 1988     self-confident     2
## 1989 1989       self-deluded    -2
## 1990 1990            selfish    -3
## 1991 1991        selfishness    -3
## 1992 1992           sentence    -2
## 1993 1993          sentenced    -2
## 1994 1994          sentences    -2
## 1995 1995         sentencing    -2
## 1996 1996             serene     2
## 1997 1997             severe    -2
## 1998 1998               sexy     3
## 1999 1999              shaky    -2
## 2000 2000              shame    -2
## 2001 2001             shamed    -2
## 2002 2002           shameful    -2
## 2003 2003              share     1
## 2004 2004             shared     1
## 2005 2005             shares     1
## 2006 2006          shattered    -2
## 2007 2007               shit    -4
## 2008 2008           shithead    -4
## 2009 2009             shitty    -3
## 2010 2010              shock    -2
## 2011 2011            shocked    -2
## 2012 2012           shocking    -2
## 2013 2013             shocks    -2
## 2014 2014              shoot    -1
## 2015 2015      short-sighted    -2
## 2016 2016  short-sightedness    -2
## 2017 2017           shortage    -2
## 2018 2018          shortages    -2
## 2019 2019              shrew    -4
## 2020 2020                shy    -1
## 2021 2021               sick    -2
## 2022 2022               sigh    -2
## 2023 2023       significance     1
## 2024 2024        significant     1
## 2025 2025          silencing    -1
## 2026 2026              silly    -1
## 2027 2027            sincere     2
## 2028 2028          sincerely     2
## 2029 2029          sincerest     2
## 2030 2030          sincerity     2
## 2031 2031             sinful    -3
## 2032 2032       singleminded    -2
## 2033 2033            skeptic    -2
## 2034 2034          skeptical    -2
## 2035 2035         skepticism    -2
## 2036 2036           skeptics    -2
## 2037 2037               slam    -2
## 2038 2038              slash    -2
## 2039 2039            slashed    -2
## 2040 2040            slashes    -2
## 2041 2041           slashing    -2
## 2042 2042            slavery    -3
## 2043 2043      sleeplessness    -2
## 2044 2044              slick     2
## 2045 2045            slicker     2
## 2046 2046           slickest     2
## 2047 2047           sluggish    -2
## 2048 2048               slut    -5
## 2049 2049              smart     1
## 2050 2050            smarter     2
## 2051 2051           smartest     2
## 2052 2052              smear    -2
## 2053 2053              smile     2
## 2054 2054             smiled     2
## 2055 2055             smiles     2
## 2056 2056            smiling     2
## 2057 2057               smog    -2
## 2058 2058             sneaky    -1
## 2059 2059               snub    -2
## 2060 2060            snubbed    -2
## 2061 2061           snubbing    -2
## 2062 2062              snubs    -2
## 2063 2063           sobering     1
## 2064 2064             solemn    -1
## 2065 2065              solid     2
## 2066 2066         solidarity     2
## 2067 2067           solution     1
## 2068 2068          solutions     1
## 2069 2069              solve     1
## 2070 2070             solved     1
## 2071 2071             solves     1
## 2072 2072            solving     1
## 2073 2073             somber    -2
## 2074 2074          some kind     0
## 2075 2075     son-of-a-bitch    -5
## 2076 2076             soothe     3
## 2077 2077            soothed     3
## 2078 2078           soothing     3
## 2079 2079      sophisticated     2
## 2080 2080               sore    -1
## 2081 2081             sorrow    -2
## 2082 2082          sorrowful    -2
## 2083 2083              sorry    -1
## 2084 2084               spam    -2
## 2085 2085            spammer    -3
## 2086 2086           spammers    -3
## 2087 2087           spamming    -2
## 2088 2088              spark     1
## 2089 2089            sparkle     3
## 2090 2090           sparkles     3
## 2091 2091          sparkling     3
## 2092 2092        speculative    -2
## 2093 2093             spirit     1
## 2094 2094           spirited     2
## 2095 2095         spiritless    -2
## 2096 2096           spiteful    -2
## 2097 2097           splendid     3
## 2098 2098          sprightly     2
## 2099 2099          squelched    -1
## 2100 2100               stab    -2
## 2101 2101            stabbed    -2
## 2102 2102             stable     2
## 2103 2103              stabs    -2
## 2104 2104              stall    -2
## 2105 2105            stalled    -2
## 2106 2106           stalling    -2
## 2107 2107            stamina     2
## 2108 2108           stampede    -2
## 2109 2109           startled    -2
## 2110 2110             starve    -2
## 2111 2111            starved    -2
## 2112 2112            starves    -2
## 2113 2113           starving    -2
## 2114 2114          steadfast     2
## 2115 2115              steal    -2
## 2116 2116             steals    -2
## 2117 2117         stereotype    -2
## 2118 2118        stereotyped    -2
## 2119 2119            stifled    -1
## 2120 2120          stimulate     1
## 2121 2121         stimulated     1
## 2122 2122         stimulates     1
## 2123 2123        stimulating     2
## 2124 2124             stingy    -2
## 2125 2125             stolen    -2
## 2126 2126               stop    -1
## 2127 2127            stopped    -1
## 2128 2128           stopping    -1
## 2129 2129              stops    -1
## 2130 2130              stout     2
## 2131 2131           straight     1
## 2132 2132            strange    -1
## 2133 2133          strangely    -1
## 2134 2134          strangled    -2
## 2135 2135           strength     2
## 2136 2136         strengthen     2
## 2137 2137       strengthened     2
## 2138 2138      strengthening     2
## 2139 2139        strengthens     2
## 2140 2140           stressed    -2
## 2141 2141           stressor    -2
## 2142 2142          stressors    -2
## 2143 2143           stricken    -2
## 2144 2144             strike    -1
## 2145 2145           strikers    -2
## 2146 2146            strikes    -1
## 2147 2147             strong     2
## 2148 2148           stronger     2
## 2149 2149          strongest     2
## 2150 2150             struck    -1
## 2151 2151           struggle    -2
## 2152 2152          struggled    -2
## 2153 2153          struggles    -2
## 2154 2154         struggling    -2
## 2155 2155           stubborn    -2
## 2156 2156              stuck    -2
## 2157 2157            stunned    -2
## 2158 2158           stunning     4
## 2159 2159             stupid    -2
## 2160 2160           stupidly    -2
## 2161 2161              suave     2
## 2162 2162        substantial     1
## 2163 2163      substantially     1
## 2164 2164         subversive    -2
## 2165 2165            success     2
## 2166 2166         successful     3
## 2167 2167               suck    -3
## 2168 2168              sucks    -3
## 2169 2169             suffer    -2
## 2170 2170          suffering    -2
## 2171 2171            suffers    -2
## 2172 2172           suicidal    -2
## 2173 2173            suicide    -2
## 2174 2174              suing    -2
## 2175 2175            sulking    -2
## 2176 2176              sulky    -2
## 2177 2177             sullen    -2
## 2178 2178           sunshine     2
## 2179 2179              super     3
## 2180 2180             superb     5
## 2181 2181           superior     2
## 2182 2182            support     2
## 2183 2183          supported     2
## 2184 2184          supporter     1
## 2185 2185         supporters     1
## 2186 2186         supporting     1
## 2187 2187         supportive     2
## 2188 2188           supports     2
## 2189 2189           survived     2
## 2190 2190          surviving     2
## 2191 2191           survivor     2
## 2192 2192            suspect    -1
## 2193 2193          suspected    -1
## 2194 2194         suspecting    -1
## 2195 2195           suspects    -1
## 2196 2196            suspend    -1
## 2197 2197          suspended    -1
## 2198 2198         suspicious    -2
## 2199 2199              swear    -2
## 2200 2200           swearing    -2
## 2201 2201             swears    -2
## 2202 2202              sweet     2
## 2203 2203              swift     2
## 2204 2204            swiftly     2
## 2205 2205            swindle    -3
## 2206 2206           swindles    -3
## 2207 2207          swindling    -3
## 2208 2208        sympathetic     2
## 2209 2209           sympathy     2
## 2210 2210               tard    -2
## 2211 2211              tears    -2
## 2212 2212             tender     2
## 2213 2213              tense    -2
## 2214 2214            tension    -1
## 2215 2215           terrible    -3
## 2216 2216           terribly    -3
## 2217 2217           terrific     4
## 2218 2218          terrified    -3
## 2219 2219             terror    -3
## 2220 2220          terrorize    -3
## 2221 2221         terrorized    -3
## 2222 2222         terrorizes    -3
## 2223 2223              thank     2
## 2224 2224           thankful     2
## 2225 2225             thanks     2
## 2226 2226             thorny    -2
## 2227 2227         thoughtful     2
## 2228 2228        thoughtless    -2
## 2229 2229             threat    -2
## 2230 2230           threaten    -2
## 2231 2231         threatened    -2
## 2232 2232        threatening    -2
## 2233 2233          threatens    -2
## 2234 2234            threats    -2
## 2235 2235           thrilled     5
## 2236 2236             thwart    -2
## 2237 2237           thwarted    -2
## 2238 2238          thwarting    -2
## 2239 2239            thwarts    -2
## 2240 2240              timid    -2
## 2241 2241           timorous    -2
## 2242 2242              tired    -2
## 2243 2243               tits    -2
## 2244 2244           tolerant     2
## 2245 2245          toothless    -2
## 2246 2246                top     2
## 2247 2247               tops     2
## 2248 2248               torn    -2
## 2249 2249            torture    -4
## 2250 2250           tortured    -4
## 2251 2251           tortures    -4
## 2252 2252          torturing    -4
## 2253 2253       totalitarian    -2
## 2254 2254    totalitarianism    -2
## 2255 2255               tout    -2
## 2256 2256             touted    -2
## 2257 2257            touting    -2
## 2258 2258              touts    -2
## 2259 2259            tragedy    -2
## 2260 2260             tragic    -2
## 2261 2261           tranquil     2
## 2262 2262               trap    -1
## 2263 2263            trapped    -2
## 2264 2264             trauma    -3
## 2265 2265          traumatic    -3
## 2266 2266           travesty    -2
## 2267 2267            treason    -3
## 2268 2268         treasonous    -3
## 2269 2269           treasure     2
## 2270 2270          treasures     2
## 2271 2271          trembling    -2
## 2272 2272          tremulous    -2
## 2273 2273            tricked    -2
## 2274 2274           trickery    -2
## 2275 2275            triumph     4
## 2276 2276         triumphant     4
## 2277 2277            trouble    -2
## 2278 2278           troubled    -2
## 2279 2279           troubles    -2
## 2280 2280               true     2
## 2281 2281              trust     1
## 2282 2282            trusted     2
## 2283 2283              tumor    -2
## 2284 2284               twat    -5
## 2285 2285               ugly    -3
## 2286 2286       unacceptable    -2
## 2287 2287      unappreciated    -2
## 2288 2288         unapproved    -2
## 2289 2289            unaware    -2
## 2290 2290       unbelievable    -1
## 2291 2291        unbelieving    -1
## 2292 2292           unbiased     2
## 2293 2293          uncertain    -1
## 2294 2294            unclear    -1
## 2295 2295      uncomfortable    -2
## 2296 2296        unconcerned    -2
## 2297 2297        unconfirmed    -1
## 2298 2298        unconvinced    -1
## 2299 2299         uncredited    -1
## 2300 2300          undecided    -1
## 2301 2301      underestimate    -1
## 2302 2302     underestimated    -1
## 2303 2303     underestimates    -1
## 2304 2304    underestimating    -1
## 2305 2305          undermine    -2
## 2306 2306         undermined    -2
## 2307 2307         undermines    -2
## 2308 2308        undermining    -2
## 2309 2309        undeserving    -2
## 2310 2310        undesirable    -2
## 2311 2311             uneasy    -2
## 2312 2312       unemployment    -2
## 2313 2313            unequal    -1
## 2314 2314          unequaled     2
## 2315 2315          unethical    -2
## 2316 2316             unfair    -2
## 2317 2317          unfocused    -2
## 2318 2318        unfulfilled    -2
## 2319 2319            unhappy    -2
## 2320 2320          unhealthy    -2
## 2321 2321            unified     1
## 2322 2322        unimpressed    -2
## 2323 2323      unintelligent    -2
## 2324 2324             united     1
## 2325 2325             unjust    -2
## 2326 2326          unlovable    -2
## 2327 2327            unloved    -2
## 2328 2328          unmatched     1
## 2329 2329        unmotivated    -2
## 2330 2330     unprofessional    -2
## 2331 2331       unresearched    -2
## 2332 2332        unsatisfied    -2
## 2333 2333          unsecured    -2
## 2334 2334          unsettled    -1
## 2335 2335    unsophisticated    -2
## 2336 2336           unstable    -2
## 2337 2337        unstoppable     2
## 2338 2338        unsupported    -2
## 2339 2339             unsure    -1
## 2340 2340        untarnished     2
## 2341 2341           unwanted    -2
## 2342 2342           unworthy    -2
## 2343 2343              upset    -2
## 2344 2344             upsets    -2
## 2345 2345          upsetting    -2
## 2346 2346            uptight    -2
## 2347 2347             urgent    -1
## 2348 2348             useful     2
## 2349 2349         usefulness     2
## 2350 2350            useless    -2
## 2351 2351        uselessness    -2
## 2352 2352              vague    -2
## 2353 2353           validate     1
## 2354 2354          validated     1
## 2355 2355          validates     1
## 2356 2356         validating     1
## 2357 2357            verdict    -1
## 2358 2358           verdicts    -1
## 2359 2359             vested     1
## 2360 2360           vexation    -2
## 2361 2361             vexing    -2
## 2362 2362            vibrant     3
## 2363 2363            vicious    -2
## 2364 2364             victim    -3
## 2365 2365          victimize    -3
## 2366 2366         victimized    -3
## 2367 2367         victimizes    -3
## 2368 2368        victimizing    -3
## 2369 2369            victims    -3
## 2370 2370           vigilant     3
## 2371 2371               vile    -3
## 2372 2372          vindicate     2
## 2373 2373         vindicated     2
## 2374 2374         vindicates     2
## 2375 2375        vindicating     2
## 2376 2376            violate    -2
## 2377 2377           violated    -2
## 2378 2378           violates    -2
## 2379 2379          violating    -2
## 2380 2380           violence    -3
## 2381 2381            violent    -3
## 2382 2382           virtuous     2
## 2383 2383           virulent    -2
## 2384 2384             vision     1
## 2385 2385          visionary     3
## 2386 2386          visioning     1
## 2387 2387            visions     1
## 2388 2388           vitality     3
## 2389 2389            vitamin     1
## 2390 2390          vitriolic    -3
## 2391 2391          vivacious     3
## 2392 2392         vociferous    -1
## 2393 2393      vulnerability    -2
## 2394 2394         vulnerable    -2
## 2395 2395            walkout    -2
## 2396 2396           walkouts    -2
## 2397 2397             wanker    -3
## 2398 2398               want     1
## 2399 2399                war    -2
## 2400 2400            warfare    -2
## 2401 2401               warm     1
## 2402 2402             warmth     2
## 2403 2403               warn    -2
## 2404 2404             warned    -2
## 2405 2405            warning    -3
## 2406 2406           warnings    -3
## 2407 2407              warns    -2
## 2408 2408              waste    -1
## 2409 2409             wasted    -2
## 2410 2410            wasting    -2
## 2411 2411           wavering    -1
## 2412 2412               weak    -2
## 2413 2413           weakness    -2
## 2414 2414             wealth     3
## 2415 2415            wealthy     2
## 2416 2416              weary    -2
## 2417 2417               weep    -2
## 2418 2418            weeping    -2
## 2419 2419              weird    -2
## 2420 2420            welcome     2
## 2421 2421           welcomed     2
## 2422 2422           welcomes     2
## 2423 2423          whimsical     1
## 2424 2424          whitewash    -3
## 2425 2425              whore    -4
## 2426 2426             wicked    -2
## 2427 2427            widowed    -1
## 2428 2428        willingness     2
## 2429 2429                win     4
## 2430 2430             winner     4
## 2431 2431            winning     4
## 2432 2432               wins     4
## 2433 2433             winwin     3
## 2434 2434               wish     1
## 2435 2435             wishes     1
## 2436 2436            wishing     1
## 2437 2437         withdrawal    -3
## 2438 2438          woebegone    -2
## 2439 2439             woeful    -3
## 2440 2440                won     3
## 2441 2441          wonderful     4
## 2442 2442                woo     3
## 2443 2443             woohoo     3
## 2444 2444               wooo     4
## 2445 2445               woow     4
## 2446 2446               worn    -1
## 2447 2447            worried    -3
## 2448 2448              worry    -3
## 2449 2449           worrying    -3
## 2450 2450              worse    -3
## 2451 2451             worsen    -3
## 2452 2452           worsened    -3
## 2453 2453          worsening    -3
## 2454 2454            worsens    -3
## 2455 2455          worshiped     3
## 2456 2456              worst    -3
## 2457 2457              worth     2
## 2458 2458          worthless    -2
## 2459 2459             worthy     2
## 2460 2460                wow     4
## 2461 2461              wowow     4
## 2462 2462              wowww     4
## 2463 2463           wrathful    -3
## 2464 2464              wreck    -2
## 2465 2465              wrong    -2
## 2466 2466            wronged    -2
## 2467 2467                wtf    -4
## 2468 2468               yeah     1
## 2469 2469           yearning     1
## 2470 2470              yeees     2
## 2471 2471                yes     1
## 2472 2472           youthful     2
## 2473 2473              yucky    -2
## 2474 2474              yummy     3
## 2475 2475             zealot    -2
## 2476 2476            zealots    -2
## 2477 2477            zealous     2

We can examine the most frequent words that were preceded by “not”, and associate with sentiment.

not_words <- bigrams_separated %>%
  filter(word1 == "not") %>%
  inner_join(AFINN, by = c(word2 = "word")) %>%
  count(word2, value, sort = TRUE)

not_words
## # A tibble: 114 × 3
##    word2     value     n
##    <chr>     <int> <int>
##  1 doubt        -1    25
##  2 like          2    11
##  3 pretend      -1     9
##  4 wish          1     8
##  5 admit        -1     7
##  6 difficult    -1     5
##  7 easy          1     5
##  8 reach         1     5
##  9 extend        1     4
## 10 forget       -1     4
## # … with 104 more rows

Let’s visualize

library(ggplot2)

not_words %>%
  dplyr::mutate(contribution = n * value) %>%
  arrange(desc(abs(contribution))) %>%
  head(20) %>%
  dplyr::mutate(word2 = reorder(word2, contribution)) %>%
  ggplot(aes(n * value, word2, fill = n * value > 0)) +
  geom_col(show.legend = FALSE) +
  labs(x = "Sentiment value * number of occurences", y = "words preceded by \"not\"")

negation_words <- c("not", "no", "never", "non", "without")

negated_words <- bigrams_separated %>%
  filter(word1 %in% negation_words) %>%
  inner_join(AFINN, by = c(word2 = "word")) %>%
  count(word1, word2, value, sort = TRUE)

negated_words
## # A tibble: 208 × 4
##    word1   word2     value     n
##    <chr>   <chr>     <int> <int>
##  1 no      doubt        -1   210
##  2 not     doubt        -1    25
##  3 no      great         3    19
##  4 not     like          2    11
##  5 not     pretend      -1     9
##  6 not     wish          1     8
##  7 without doubt        -1     8
##  8 not     admit        -1     7
##  9 no      greater       3     6
## 10 not     difficult    -1     5
## # … with 198 more rows

Let’s visualize the negation words.

negated_words %>%
  dplyr::mutate(contribution = n *value,
         word2 = reorder(paste(word2, word1, sep = "_"), contribution)) %>%
  group_by(word1) %>%
  slice_max(abs(contribution), n = 12, with_ties = FALSE) %>%
  ggplot(aes(word2, contribution, fill = n * value > 0)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~word1, scales = "free") +
  scale_x_discrete(labels = function(x) gsub("_.+$", "", x)) +
  xlab("words preceded by negation term") +
  ylab("Sentiment value * # of occurences") +
  coord_flip()

Visualize a network of bigrams with ggraph

library(igraph)
## 
## Attaching package: 'igraph'
## The following object is masked from 'package:mosaic':
## 
##     compare
## The following objects are masked from 'package:lubridate':
## 
##     %--%, union
## The following object is masked from 'package:plotly':
## 
##     groups
## The following object is masked from 'package:tidyr':
## 
##     crossing
## The following objects are masked from 'package:dplyr':
## 
##     as_data_frame, groups, union
## The following objects are masked from 'package:stats':
## 
##     decompose, spectrum
## The following object is masked from 'package:base':
## 
##     union
bigram_counts <- bigrams_filtered %>%
  count(word1, word2, sort = TRUE)

bigram_graph <- bigram_counts %>%
  filter(n > 20) %>%
  graph_from_data_frame()
## Warning in graph_from_data_frame(.): In `d' `NA' elements were replaced with
## string "NA"
bigram_graph
## IGRAPH 20653a8 DN-- 203 140 -- 
## + attr: name (v/c), n (e/n)
## + edges from 20653a8 (vertex names):
##  [1] NA        ->NA          natural   ->selection   sexual    ->selection  
##  [4] vol       ->ii          lower     ->animals     sexual    ->differences
##  [7] south     ->america     distinct  ->species     secondary ->sexual     
## [10] breeding  ->season      closely   ->allied      sexual    ->characters 
## [13] tierra    ->del         del       ->fuego       vol       ->iii        
## [16] de        ->la          natural   ->history     fresh     ->water      
## [19] north     ->america     bright    ->colours     sexual    ->difference 
## [22] allied    ->species     tail      ->feathers    strongly  ->marked     
## + ... omitted several edges

Let’s graph the data

library(ggraph)
set.seed(1234)

ggraph(bigram_graph, layout = "fr") +
  geom_edge_link() +
  geom_node_point() +
  geom_node_text(aes(label = name), vjust = 1, hjust = 1)

We can also add directionality to this network.

set.seed(1234)

a <- grid::arrow(type = "closed", length = unit(0.15, "inches"))

ggraph(bigram_graph, layout = "fr") +
  geom_edge_link(aes(edge_alpha = n), show.legend = FALSE, arrow = a, end_cap = circle(0.7, 'inches')) +
  geom_node_point(color = "lightblue", size = 5) +
  geom_node_text(aes(label = name), vjust = 1, hjust = 1) +
  theme_void()

Word Frequencies

A control question in text mining is how to quantify what a document is about. We can do this by looking at words that make up the document, and measuring the term frequency. There are a lot of words that may not be important, these are the stop words. One way to remedy this is to look at inverse document frequency words, which decreases the weight for commonly used words and increases the weight for words that are not used very much. Term frequency in Darwin’s work.

library(dplyr)
library(tidytext)

book_words <- gutenberg_download(c(944, 1227, 1228, 2300), mirror = "https://mirror2.sandyriver.net/pub/gutenberg")

colnames(book_words)[1] <- "book"

book_words$book[book_words$book == 944] <- "The Voyage of the Beagle"
book_words$book[book_words$book == 1227] <- "The Expression of the Emotions in Man and Animals"
book_words$book[book_words$book == 1228] <- "On the Origin of Species By Means of Natural Selection"
book_words$book[book_words$book == 2300] <- "The Descent of Man, and Selection in Relation to Sex"

Now, let’s dissect

book_words <- book_words %>%
  unnest_tokens(word, text) %>%
  count(book, word, sort = TRUE)

book_words
## # A tibble: 43,024 × 3
##    book                                                   word      n
##    <chr>                                                  <chr> <int>
##  1 The Descent of Man, and Selection in Relation to Sex   the   25490
##  2 The Voyage of the Beagle                               the   16930
##  3 The Descent of Man, and Selection in Relation to Sex   of    16762
##  4 On the Origin of Species By Means of Natural Selection the   10301
##  5 The Voyage of the Beagle                               of     9438
##  6 The Descent of Man, and Selection in Relation to Sex   in     8882
##  7 The Expression of the Emotions in Man and Animals      the    8045
##  8 On the Origin of Species By Means of Natural Selection of     7864
##  9 The Descent of Man, and Selection in Relation to Sex   and    7854
## 10 The Descent of Man, and Selection in Relation to Sex   to     5901
## # … with 43,014 more rows
book_words$n <- as.numeric(book_words$n)

total_words <- book_words %>%
  group_by(book) %>%
  dplyr::summarize(total = sum(n))

book_words
## # A tibble: 43,024 × 3
##    book                                                   word      n
##    <chr>                                                  <chr> <dbl>
##  1 The Descent of Man, and Selection in Relation to Sex   the   25490
##  2 The Voyage of the Beagle                               the   16930
##  3 The Descent of Man, and Selection in Relation to Sex   of    16762
##  4 On the Origin of Species By Means of Natural Selection the   10301
##  5 The Voyage of the Beagle                               of     9438
##  6 The Descent of Man, and Selection in Relation to Sex   in     8882
##  7 The Expression of the Emotions in Man and Animals      the    8045
##  8 On the Origin of Species By Means of Natural Selection of     7864
##  9 The Descent of Man, and Selection in Relation to Sex   and    7854
## 10 The Descent of Man, and Selection in Relation to Sex   to     5901
## # … with 43,014 more rows
book_words <- left_join(book_words, total_words)
## Joining, by = "book"
book_words
## # A tibble: 43,024 × 4
##    book                                                   word      n  total
##    <chr>                                                  <chr> <dbl>  <dbl>
##  1 The Descent of Man, and Selection in Relation to Sex   the   25490 311041
##  2 The Voyage of the Beagle                               the   16930 208118
##  3 The Descent of Man, and Selection in Relation to Sex   of    16762 311041
##  4 On the Origin of Species By Means of Natural Selection the   10301 157002
##  5 The Voyage of the Beagle                               of     9438 208118
##  6 The Descent of Man, and Selection in Relation to Sex   in     8882 311041
##  7 The Expression of the Emotions in Man and Animals      the    8045 110414
##  8 On the Origin of Species By Means of Natural Selection of     7864 157002
##  9 The Descent of Man, and Selection in Relation to Sex   and    7854 311041
## 10 The Descent of Man, and Selection in Relation to Sex   to     5901 311041
## # … with 43,014 more rows

You can see that the unusual suspects are the most common words, but do not tell us anything about what the book’s topic is.

library(ggplot2)

ggplot(book_words, aes(n/total, fill=book)) +
  geom_histogram(show.legend=FALSE) +
  xlim(NA, 0.0009) +
  facet_wrap(~book, ncol=2, scales='free_y')
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## Warning: Removed 515 rows containing non-finite values (stat_bin).
## Warning: Removed 4 rows containing missing values (geom_bar).

Zipf’s Law The frequency that a word appears inversely proportional to its rank when predicting a topic. Let’s apply Zipf’s Law to Darwin’s work.

freq_by_rank <- book_words %>%
  group_by(book) %>%
  dplyr::mutate(rank = row_number(),
         'term frequency' = n/total) %>%
  ungroup()

freq_by_rank
## # A tibble: 43,024 × 6
##    book                                         word      n  total  rank term …¹
##    <chr>                                        <chr> <dbl>  <dbl> <int>   <dbl>
##  1 The Descent of Man, and Selection in Relati… the   25490 311041     1  0.0820
##  2 The Voyage of the Beagle                     the   16930 208118     1  0.0813
##  3 The Descent of Man, and Selection in Relati… of    16762 311041     2  0.0539
##  4 On the Origin of Species By Means of Natura… the   10301 157002     1  0.0656
##  5 The Voyage of the Beagle                     of     9438 208118     2  0.0453
##  6 The Descent of Man, and Selection in Relati… in     8882 311041     3  0.0286
##  7 The Expression of the Emotions in Man and A… the    8045 110414     1  0.0729
##  8 On the Origin of Species By Means of Natura… of     7864 157002     2  0.0501
##  9 The Descent of Man, and Selection in Relati… and    7854 311041     4  0.0253
## 10 The Descent of Man, and Selection in Relati… to     5901 311041     5  0.0190
## # … with 43,014 more rows, and abbreviated variable name ¹​`term frequency`

Let’s plot the data

freq_by_rank %>%
  ggplot(aes(rank, `term frequency`, color = book)) +
  geom_line(size = 1.1, alpha = 0.8, show.legend = FALSE) +
  scale_x_log10() +
  scale_y_log10()

Let’s use TF – IDF to find words for each document by decreasing the weight from commonly used words and increasing the weight for words that are not used very much in a collection of documents.

book_tf_idf <- book_words %>%
  bind_tf_idf(word, book, n)

book_tf_idf
## # A tibble: 43,024 × 7
##    book                                   word      n  total     tf   idf tf_idf
##    <chr>                                  <chr> <dbl>  <dbl>  <dbl> <dbl>  <dbl>
##  1 The Descent of Man, and Selection in … the   25490 311041 0.0820     0      0
##  2 The Voyage of the Beagle               the   16930 208118 0.0813     0      0
##  3 The Descent of Man, and Selection in … of    16762 311041 0.0539     0      0
##  4 On the Origin of Species By Means of … the   10301 157002 0.0656     0      0
##  5 The Voyage of the Beagle               of     9438 208118 0.0453     0      0
##  6 The Descent of Man, and Selection in … in     8882 311041 0.0286     0      0
##  7 The Expression of the Emotions in Man… the    8045 110414 0.0729     0      0
##  8 On the Origin of Species By Means of … of     7864 157002 0.0501     0      0
##  9 The Descent of Man, and Selection in … and    7854 311041 0.0253     0      0
## 10 The Descent of Man, and Selection in … to     5901 311041 0.0190     0      0
## # … with 43,014 more rows

Let’s look at terms with high tf-idf in Darwin’s works.

book_tf_idf %>%
  select(-total) %>%
  arrange(desc(tf_idf))
## # A tibble: 43,024 × 6
##    book                                        word      n      tf   idf  tf_idf
##    <chr>                                       <chr> <dbl>   <dbl> <dbl>   <dbl>
##  1 The Expression of the Emotions in Man and … tears   126 1.14e-3 1.39  1.58e-3
##  2 The Expression of the Emotions in Man and … blush   114 1.03e-3 1.39  1.43e-3
##  3 The Expression of the Emotions in Man and … eyeb…   149 1.35e-3 0.693 9.35e-4
##  4 The Voyage of the Beagle                    degs    117 5.62e-4 1.39  7.79e-4
##  5 On the Origin of Species By Means of Natur… sele…   412 2.62e-3 0.288 7.55e-4
##  6 The Descent of Man, and Selection in Relat… sexu…   745 2.40e-3 0.288 6.89e-4
##  7 The Descent of Man, and Selection in Relat… shewn   143 4.60e-4 1.39  6.37e-4
##  8 On the Origin of Species By Means of Natur… hybr…   133 8.47e-4 0.693 5.87e-4
##  9 The Expression of the Emotions in Man and … frown    46 4.17e-4 1.39  5.78e-4
## 10 The Descent of Man, and Selection in Relat… sele…   621 2.00e-3 0.288 5.74e-4
## # … with 43,014 more rows

Let’s load the required package

library(forcats)

Let’s look at a visualization for these tf-idf words.

book_tf_idf %>%
  group_by(book) %>%
  slice_max(tf_idf, n = 15) %>%
  ungroup() %>%
  ggplot(aes(tf_idf, fct_reorder(word, tf_idf), fill = book)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~book, ncol = 2, scales = "free") +
  labs(x = "tf-idf", y = NULL)

Mining APIs

Twitter Sentiment Analysis

First thing, let’s load our required libraries and data Let’s load the Canada Data

tweets20CA<-read.csv("tweets20CA.csv", row.names = 1)
tweets21CA <- read.csv("tweets21CA.csv", row.names = 1)

tweets22CA <- read.csv("tweets22CA.csv", row.names = 1)

Let’s load the US data.

tweets20US <- read.csv("tweets20us.csv", row.names = 1)

tweets21US <- read.csv("tweets21us.csv", row.names = 1)

tweets22US <- read.csv("tweets22us.csv", row.names = 1)

Let’s load the GB data.

tweets20GB <- read.csv("tweets20GB.csv", row.names = 1)

tweets21GB <- read.csv("tweets21GB.csv", row.names = 1)

tweets22GB <- read.csv("tweets22GB.csv", row.names = 1)

Now, let’s load our required libraries.

library(lubridate)
library(ggplot2)
library(dplyr)
library(readr)

Let’s combine our US tweet.

tweetsUS <- bind_rows(tweets21US %>%
                       dplyr:: mutate(year = "y2021"), 
                      tweets22US %>%
                       dplyr:: mutate(year = "y2022"), 
                      tweets20US %>%
                       dplyr:: mutate(year = "y2020")) %>%
  dplyr::mutate(timestamp = ymd_hms(created_at))

Let’s combine our GB tweets.

tweetsGB <- bind_rows(tweets21GB %>%
                        dplyr::mutate(year = "y2021"), 
                      tweets22GB %>%
                        dplyr::mutate(year = "y2022"), 
                      tweets20GB %>%
                        dplyr::mutate(year = "y2020")) %>%
  dplyr::mutate(timestamp = ymd_hms(created_at))

Let’s combine our Canada tweets.

tweetsCA <- bind_rows(tweets21CA %>%
                       dplyr:: mutate(year = "y2021"), 
                      tweets22CA %>%
                        dplyr::mutate(year = "y2022"), 
                      tweets20CA %>%
                        dplyr::mutate(year = "y2020")) %>%
  dplyr::mutate(timestamp = ymd_hms(created_at))

Load required libraries

library(stringr)
library(tidytext)

Now, let’s clean our US tweets.

remove_reg <- "&amp;|&lt;|&gt;"
tidy_tweetsUS <- tweetsUS %>%
  filter(!str_detect(text, "^RT")) %>%
  dplyr::mutate(text = str_remove_all(text, remove_reg)) %>%
  unnest_tokens(word, text, token = "tweets") %>%
  filter(!word %in% stop_words$word, 
         !word %in% str_remove_all(stop_words$word, "'"), 
         str_detect(word, "[a-z]"))
## Using `to_lower = TRUE` with `token = 'tweets'` may not preserve URLs.

Now, let’s clean our GB tweets.

remove_reg <- "&amp;|&lt;|&gt;"
tidy_tweetsGB <- tweetsGB %>%
  filter(!str_detect(text, "^RT")) %>%
 dplyr:: mutate(text = str_remove_all(text, remove_reg)) %>%
  unnest_tokens(word, text, token = "tweets") %>%
  filter(!word %in% stop_words$word, 
         !word %in% str_remove_all(stop_words$word, "'"), 
         str_detect(word, "[a-z]"))
## Using `to_lower = TRUE` with `token = 'tweets'` may not preserve URLs.

Now, let’s clean our Canada tweets.

remove_reg <- "&amp;|&lt;|&gt;"
tidy_tweetsCA <- tweetsCA %>%
  filter(!str_detect(text, "^RT")) %>%
  dplyr::mutate(text = str_remove_all(text, remove_reg)) %>%
  unnest_tokens(word, text, token = "tweets") %>%
  filter(!word %in% stop_words$word, 
         !word %in% str_remove_all(stop_words$word, "'"), 
         str_detect(word, "[a-z]"))
## Using `to_lower = TRUE` with `token = 'tweets'` may not preserve URLs.

Let’s take a look at our US data.

ggplot(tweetsUS, aes(x = timestamp, fill = year)) +
  geom_histogram(position = "identity", bins = 20, show.legend = FALSE) +
  facet_wrap(~year, ncol = 1)

Let’s look at our GB data

ggplot(tweetsGB, aes(x = timestamp, fill = year)) +
  geom_histogram(position = "identity", bins = 20, show.legend = FALSE) +
  facet_wrap(~year, ncol = 1)

Let’s load our Canada data.

ggplot(tweetsCA, aes(x = timestamp, fill = year)) +
  geom_histogram(position = "identity", bins = 20, show.legend = FALSE) +
  facet_wrap(~year, ncol = 1)

Let’s look at the word frequencies for the US COVID data.

frequencyUS <- tidy_tweetsUS %>%
  count(year, word, sort = TRUE) %>%
  left_join(tidy_tweetsUS %>%
              count(year, name = "total")) %>%
  dplyr::mutate(freq = n/total)
## Joining, by = "year"
frequencyUS
##        year
## 1     y2021
## 2     y2020
## 3     y2022
## 4     y2022
## 5     y2021
## 6     y2020
## 7     y2021
## 8     y2022
## 9     y2021
## 10    y2020
## 11    y2020
## 12    y2021
## 13    y2022
## 14    y2022
## 15    y2022
## 16    y2020
## 17    y2022
## 18    y2020
## 19    y2021
## 20    y2020
## 21    y2022
## 22    y2022
## 23    y2021
## 24    y2021
## 25    y2021
## 26    y2020
## 27    y2021
## 28    y2020
## 29    y2021
## 30    y2020
## 31    y2022
## 32    y2021
## 33    y2020
## 34    y2021
## 35    y2021
## 36    y2022
## 37    y2020
## 38    y2020
## 39    y2022
## 40    y2022
## 41    y2021
## 42    y2021
## 43    y2021
## 44    y2022
## 45    y2020
## 46    y2022
## 47    y2020
## 48    y2022
## 49    y2020
## 50    y2020
## 51    y2020
## 52    y2021
## 53    y2020
## 54    y2020
## 55    y2022
## 56    y2020
## 57    y2020
## 58    y2021
## 59    y2021
## 60    y2022
## 61    y2022
## 62    y2021
## 63    y2022
## 64    y2022
## 65    y2021
## 66    y2021
## 67    y2020
## 68    y2020
## 69    y2021
## 70    y2020
## 71    y2020
## 72    y2021
## 73    y2022
## 74    y2020
## 75    y2022
## 76    y2022
## 77    y2021
## 78    y2022
## 79    y2020
## 80    y2021
## 81    y2022
## 82    y2020
## 83    y2021
## 84    y2022
## 85    y2021
## 86    y2021
## 87    y2020
## 88    y2021
## 89    y2022
## 90    y2022
## 91    y2020
## 92    y2020
## 93    y2021
## 94    y2020
## 95    y2020
## 96    y2021
## 97    y2022
## 98    y2021
## 99    y2020
## 100   y2021
## 101   y2020
## 102   y2021
## 103   y2021
## 104   y2022
## 105   y2020
## 106   y2021
## 107   y2020
## 108   y2020
## 109   y2022
## 110   y2020
## 111   y2021
## 112   y2021
## 113   y2022
## 114   y2021
## 115   y2021
## 116   y2022
## 117   y2020
## 118   y2020
## 119   y2021
## 120   y2022
## 121   y2020
## 122   y2022
## 123   y2022
## 124   y2021
## 125   y2020
## 126   y2021
## 127   y2022
## 128   y2020
## 129   y2021
## 130   y2021
## 131   y2021
## 132   y2020
## 133   y2022
## 134   y2020
## 135   y2021
## 136   y2020
## 137   y2020
## 138   y2021
## 139   y2021
## 140   y2022
## 141   y2020
## 142   y2020
## 143   y2021
## 144   y2021
## 145   y2022
## 146   y2022
## 147   y2022
## 148   y2020
## 149   y2020
## 150   y2021
## 151   y2022
## 152   y2020
## 153   y2020
## 154   y2021
## 155   y2021
## 156   y2022
## 157   y2020
## 158   y2020
## 159   y2021
## 160   y2021
## 161   y2022
## 162   y2022
## 163   y2020
## 164   y2021
## 165   y2020
## 166   y2020
## 167   y2020
## 168   y2021
## 169   y2020
## 170   y2021
## 171   y2021
## 172   y2020
## 173   y2020
## 174   y2020
## 175   y2020
## 176   y2021
## 177   y2020
## 178   y2021
## 179   y2022
## 180   y2022
## 181   y2020
## 182   y2021
## 183   y2022
## 184   y2020
## 185   y2021
## 186   y2021
## 187   y2021
## 188   y2022
## 189   y2021
## 190   y2021
## 191   y2021
## 192   y2022
## 193   y2022
## 194   y2021
## 195   y2020
## 196   y2020
## 197   y2020
## 198   y2022
## 199   y2022
## 200   y2022
## 201   y2022
## 202   y2022
## 203   y2022
## 204   y2022
## 205   y2022
## 206   y2020
## 207   y2021
## 208   y2021
## 209   y2021
## 210   y2020
## 211   y2020
## 212   y2020
## 213   y2021
## 214   y2022
## 215   y2020
## 216   y2020
## 217   y2022
## 218   y2020
## 219   y2020
## 220   y2020
## 221   y2021
## 222   y2021
## 223   y2020
## 224   y2020
## 225   y2020
## 226   y2020
## 227   y2021
## 228   y2021
## 229   y2022
## 230   y2022
## 231   y2022
## 232   y2020
## 233   y2020
## 234   y2020
## 235   y2020
## 236   y2020
## 237   y2021
## 238   y2021
## 239   y2021
## 240   y2021
## 241   y2022
## 242   y2021
## 243   y2021
## 244   y2021
## 245   y2021
## 246   y2022
## 247   y2022
## 248   y2020
## 249   y2022
## 250   y2022
## 251   y2022
## 252   y2022
## 253   y2022
## 254   y2021
## 255   y2021
## 256   y2022
## 257   y2022
## 258   y2020
## 259   y2020
## 260   y2020
## 261   y2021
## 262   y2021
## 263   y2021
## 264   y2022
## 265   y2020
## 266   y2020
## 267   y2020
## 268   y2021
## 269   y2021
## 270   y2021
## 271   y2021
## 272   y2022
## 273   y2022
## 274   y2022
## 275   y2022
## 276   y2020
## 277   y2020
## 278   y2021
## 279   y2021
## 280   y2021
## 281   y2021
## 282   y2021
## 283   y2021
## 284   y2022
## 285   y2022
## 286   y2020
## 287   y2020
## 288   y2020
## 289   y2021
## 290   y2021
## 291   y2021
## 292   y2022
## 293   y2022
## 294   y2020
## 295   y2020
## 296   y2020
## 297   y2020
## 298   y2020
## 299   y2021
## 300   y2021
## 301   y2021
## 302   y2021
## 303   y2021
## 304   y2022
## 305   y2022
## 306   y2020
## 307   y2021
## 308   y2021
## 309   y2022
## 310   y2022
## 311   y2021
## 312   y2021
## 313   y2021
## 314   y2021
## 315   y2021
## 316   y2021
## 317   y2022
## 318   y2022
## 319   y2020
## 320   y2020
## 321   y2020
## 322   y2020
## 323   y2020
## 324   y2021
## 325   y2021
## 326   y2021
## 327   y2021
## 328   y2022
## 329   y2022
## 330   y2020
## 331   y2020
## 332   y2020
## 333   y2020
## 334   y2021
## 335   y2022
## 336   y2022
## 337   y2020
## 338   y2020
## 339   y2020
## 340   y2020
## 341   y2020
## 342   y2020
## 343   y2021
## 344   y2021
## 345   y2021
## 346   y2021
## 347   y2021
## 348   y2021
## 349   y2021
## 350   y2021
## 351   y2021
## 352   y2021
## 353   y2020
## 354   y2020
## 355   y2020
## 356   y2021
## 357   y2021
## 358   y2021
## 359   y2021
## 360   y2021
## 361   y2021
## 362   y2021
## 363   y2021
## 364   y2021
## 365   y2022
## 366   y2022
## 367   y2022
## 368   y2022
## 369   y2022
## 370   y2020
## 371   y2020
## 372   y2020
## 373   y2020
## 374   y2020
## 375   y2021
## 376   y2021
## 377   y2021
## 378   y2021
## 379   y2021
## 380   y2021
## 381   y2021
## 382   y2021
## 383   y2021
## 384   y2021
## 385   y2022
## 386   y2022
## 387   y2022
## 388   y2022
## 389   y2022
## 390   y2020
## 391   y2020
## 392   y2020
## 393   y2020
## 394   y2020
## 395   y2020
## 396   y2021
## 397   y2021
## 398   y2021
## 399   y2021
## 400   y2021
## 401   y2021
## 402   y2021
## 403   y2022
## 404   y2022
## 405   y2020
## 406   y2020
## 407   y2020
## 408   y2021
## 409   y2021
## 410   y2021
## 411   y2022
## 412   y2022
## 413   y2022
## 414   y2022
## 415   y2022
## 416   y2020
## 417   y2020
## 418   y2020
## 419   y2020
## 420   y2020
## 421   y2020
## 422   y2021
## 423   y2021
## 424   y2021
## 425   y2021
## 426   y2021
## 427   y2021
## 428   y2021
## 429   y2022
## 430   y2022
## 431   y2022
## 432   y2020
## 433   y2020
## 434   y2020
## 435   y2020
## 436   y2020
## 437   y2021
## 438   y2021
## 439   y2021
## 440   y2021
## 441   y2021
## 442   y2022
## 443   y2022
## 444   y2022
## 445   y2022
## 446   y2022
## 447   y2020
## 448   y2020
## 449   y2020
## 450   y2020
## 451   y2020
## 452   y2020
## 453   y2020
## 454   y2020
## 455   y2021
## 456   y2021
## 457   y2021
## 458   y2021
## 459   y2021
## 460   y2021
## 461   y2021
## 462   y2022
## 463   y2022
## 464   y2022
## 465   y2022
## 466   y2022
## 467   y2022
## 468   y2020
## 469   y2020
## 470   y2020
## 471   y2020
## 472   y2020
## 473   y2020
## 474   y2020
## 475   y2020
## 476   y2020
## 477   y2021
## 478   y2021
## 479   y2021
## 480   y2021
## 481   y2021
## 482   y2021
## 483   y2021
## 484   y2021
## 485   y2021
## 486   y2021
## 487   y2021
## 488   y2022
## 489   y2022
## 490   y2022
## 491   y2022
## 492   y2022
## 493   y2022
## 494   y2022
## 495   y2022
## 496   y2022
## 497   y2022
## 498   y2022
## 499   y2020
## 500   y2020
## 501   y2020
## 502   y2020
## 503   y2021
## 504   y2021
## 505   y2021
## 506   y2021
## 507   y2021
## 508   y2021
## 509   y2021
## 510   y2021
## 511   y2022
## 512   y2022
## 513   y2022
## 514   y2022
## 515   y2022
## 516   y2022
## 517   y2022
## 518   y2020
## 519   y2020
## 520   y2020
## 521   y2020
## 522   y2020
## 523   y2020
## 524   y2020
## 525   y2020
## 526   y2020
## 527   y2021
## 528   y2021
## 529   y2021
## 530   y2021
## 531   y2021
## 532   y2021
## 533   y2022
## 534   y2022
## 535   y2022
## 536   y2022
## 537   y2020
## 538   y2020
## 539   y2020
## 540   y2020
## 541   y2020
## 542   y2020
## 543   y2020
## 544   y2020
## 545   y2020
## 546   y2020
## 547   y2020
## 548   y2020
## 549   y2020
## 550   y2021
## 551   y2021
## 552   y2021
## 553   y2021
## 554   y2021
## 555   y2021
## 556   y2022
## 557   y2022
## 558   y2022
## 559   y2022
## 560   y2020
## 561   y2020
## 562   y2020
## 563   y2020
## 564   y2020
## 565   y2020
## 566   y2020
## 567   y2020
## 568   y2020
## 569   y2020
## 570   y2020
## 571   y2020
## 572   y2020
## 573   y2021
## 574   y2021
## 575   y2021
## 576   y2021
## 577   y2021
## 578   y2021
## 579   y2021
## 580   y2021
## 581   y2022
## 582   y2022
## 583   y2022
## 584   y2022
## 585   y2022
## 586   y2022
## 587   y2022
## 588   y2022
## 589   y2020
## 590   y2020
## 591   y2020
## 592   y2020
## 593   y2020
## 594   y2021
## 595   y2021
## 596   y2021
## 597   y2021
## 598   y2021
## 599   y2021
## 600   y2021
## 601   y2021
## 602   y2022
## 603   y2022
## 604   y2022
## 605   y2022
## 606   y2022
## 607   y2022
## 608   y2020
## 609   y2020
## 610   y2020
## 611   y2020
## 612   y2020
## 613   y2020
## 614   y2020
## 615   y2020
## 616   y2021
## 617   y2021
## 618   y2021
## 619   y2021
## 620   y2021
## 621   y2021
## 622   y2021
## 623   y2021
## 624   y2021
## 625   y2021
## 626   y2022
## 627   y2022
## 628   y2022
## 629   y2020
## 630   y2020
## 631   y2020
## 632   y2021
## 633   y2021
## 634   y2021
## 635   y2021
## 636   y2021
## 637   y2021
## 638   y2021
## 639   y2021
## 640   y2021
## 641   y2021
## 642   y2022
## 643   y2022
## 644   y2022
## 645   y2022
## 646   y2022
## 647   y2022
## 648   y2022
## 649   y2020
## 650   y2020
## 651   y2020
## 652   y2020
## 653   y2020
## 654   y2020
## 655   y2020
## 656   y2020
## 657   y2020
## 658   y2020
## 659   y2021
## 660   y2021
## 661   y2021
## 662   y2021
## 663   y2021
## 664   y2021
## 665   y2021
## 666   y2021
## 667   y2021
## 668   y2021
## 669   y2021
## 670   y2022
## 671   y2022
## 672   y2022
## 673   y2022
## 674   y2022
## 675   y2022
## 676   y2020
## 677   y2020
## 678   y2020
## 679   y2020
## 680   y2020
## 681   y2020
## 682   y2020
## 683   y2020
## 684   y2020
## 685   y2020
## 686   y2020
## 687   y2020
## 688   y2020
## 689   y2020
## 690   y2020
## 691   y2021
## 692   y2021
## 693   y2021
## 694   y2021
## 695   y2021
## 696   y2021
## 697   y2021
## 698   y2021
## 699   y2021
## 700   y2021
## 701   y2021
## 702   y2021
## 703   y2021
## 704   y2022
## 705   y2022
## 706   y2022
## 707   y2022
## 708   y2022
## 709   y2022
## 710   y2022
## 711   y2022
## 712   y2022
## 713   y2022
## 714   y2022
## 715   y2020
## 716   y2020
## 717   y2020
## 718   y2020
## 719   y2020
## 720   y2020
## 721   y2020
## 722   y2020
## 723   y2021
## 724   y2021
## 725   y2021
## 726   y2021
## 727   y2021
## 728   y2021
## 729   y2021
## 730   y2021
## 731   y2021
## 732   y2021
## 733   y2022
## 734   y2022
## 735   y2022
## 736   y2022
## 737   y2022
## 738   y2022
## 739   y2022
## 740   y2022
## 741   y2022
## 742   y2022
## 743   y2022
## 744   y2022
## 745   y2022
## 746   y2020
## 747   y2020
## 748   y2020
## 749   y2020
## 750   y2020
## 751   y2020
## 752   y2020
## 753   y2020
## 754   y2020
## 755   y2020
## 756   y2020
## 757   y2020
## 758   y2020
## 759   y2020
## 760   y2020
## 761   y2021
## 762   y2021
## 763   y2021
## 764   y2021
## 765   y2021
## 766   y2021
## 767   y2021
## 768   y2021
## 769   y2021
## 770   y2021
## 771   y2021
## 772   y2021
## 773   y2021
## 774   y2021
## 775   y2021
## 776   y2021
## 777   y2021
## 778   y2022
## 779   y2022
## 780   y2022
## 781   y2022
## 782   y2022
## 783   y2022
## 784   y2022
## 785   y2020
## 786   y2020
## 787   y2020
## 788   y2020
## 789   y2020
## 790   y2020
## 791   y2020
## 792   y2020
## 793   y2020
## 794   y2020
## 795   y2020
## 796   y2020
## 797   y2020
## 798   y2020
## 799   y2020
## 800   y2020
## 801   y2020
## 802   y2020
## 803   y2020
## 804   y2020
## 805   y2020
## 806   y2020
## 807   y2020
## 808   y2020
## 809   y2020
## 810   y2020
## 811   y2021
## 812   y2021
## 813   y2021
## 814   y2021
## 815   y2021
## 816   y2021
## 817   y2021
## 818   y2021
## 819   y2021
## 820   y2021
## 821   y2021
## 822   y2021
## 823   y2021
## 824   y2021
## 825   y2022
## 826   y2022
## 827   y2022
## 828   y2022
## 829   y2022
## 830   y2022
## 831   y2022
## 832   y2020
## 833   y2020
## 834   y2020
## 835   y2020
## 836   y2020
## 837   y2020
## 838   y2020
## 839   y2020
## 840   y2020
## 841   y2020
## 842   y2020
## 843   y2020
## 844   y2021
## 845   y2021
## 846   y2021
## 847   y2021
## 848   y2021
## 849   y2021
## 850   y2021
## 851   y2021
## 852   y2022
## 853   y2022
## 854   y2022
## 855   y2022
## 856   y2022
## 857   y2022
## 858   y2022
## 859   y2022
## 860   y2022
## 861   y2022
## 862   y2022
## 863   y2022
## 864   y2022
## 865   y2022
## 866   y2022
## 867   y2022
## 868   y2020
## 869   y2020
## 870   y2020
## 871   y2020
## 872   y2020
## 873   y2020
## 874   y2020
## 875   y2020
## 876   y2020
## 877   y2020
## 878   y2020
## 879   y2020
## 880   y2020
## 881   y2020
## 882   y2020
## 883   y2020
## 884   y2020
## 885   y2020
## 886   y2020
## 887   y2020
## 888   y2021
## 889   y2021
## 890   y2021
## 891   y2021
## 892   y2021
## 893   y2021
## 894   y2021
## 895   y2021
## 896   y2021
## 897   y2021
## 898   y2021
## 899   y2021
## 900   y2021
## 901   y2022
## 902   y2022
## 903   y2022
## 904   y2022
## 905   y2022
## 906   y2022
## 907   y2022
## 908   y2022
## 909   y2022
## 910   y2022
## 911   y2022
## 912   y2022
## 913   y2022
## 914   y2022
## 915   y2022
## 916   y2022
## 917   y2022
## 918   y2022
## 919   y2020
## 920   y2020
## 921   y2020
## 922   y2020
## 923   y2020
## 924   y2020
## 925   y2020
## 926   y2020
## 927   y2020
## 928   y2020
## 929   y2020
## 930   y2020
## 931   y2020
## 932   y2020
## 933   y2020
## 934   y2020
## 935   y2020
## 936   y2020
## 937   y2020
## 938   y2020
## 939   y2020
## 940   y2021
## 941   y2021
## 942   y2021
## 943   y2021
## 944   y2021
## 945   y2021
## 946   y2021
## 947   y2021
## 948   y2021
## 949   y2021
## 950   y2021
## 951   y2021
## 952   y2021
## 953   y2021
## 954   y2021
## 955   y2022
## 956   y2022
## 957   y2022
## 958   y2022
## 959   y2022
## 960   y2022
## 961   y2022
## 962   y2022
## 963   y2022
## 964   y2022
## 965   y2022
## 966   y2022
## 967   y2022
## 968   y2022
## 969   y2020
## 970   y2020
## 971   y2020
## 972   y2020
## 973   y2020
## 974   y2020
## 975   y2020
## 976   y2020
## 977   y2020
## 978   y2020
## 979   y2020
## 980   y2020
## 981   y2020
## 982   y2021
## 983   y2021
## 984   y2021
## 985   y2021
## 986   y2021
## 987   y2021
## 988   y2021
## 989   y2021
## 990   y2021
## 991   y2021
## 992   y2021
## 993   y2021
## 994   y2021
## 995   y2021
## 996   y2021
## 997   y2021
## 998   y2021
## 999   y2021
## 1000  y2021
## 1001  y2021
## 1002  y2021
## 1003  y2021
## 1004  y2021
## 1005  y2021
## 1006  y2021
## 1007  y2021
## 1008  y2022
## 1009  y2022
## 1010  y2022
## 1011  y2022
## 1012  y2022
## 1013  y2022
## 1014  y2022
## 1015  y2022
## 1016  y2022
## 1017  y2022
## 1018  y2022
## 1019  y2022
## 1020  y2020
## 1021  y2020
## 1022  y2020
## 1023  y2020
## 1024  y2020
## 1025  y2020
## 1026  y2020
## 1027  y2020
## 1028  y2020
## 1029  y2020
## 1030  y2020
## 1031  y2020
## 1032  y2020
## 1033  y2020
## 1034  y2020
## 1035  y2020
## 1036  y2020
## 1037  y2020
## 1038  y2021
## 1039  y2021
## 1040  y2021
## 1041  y2021
## 1042  y2021
## 1043  y2021
## 1044  y2021
## 1045  y2021
## 1046  y2021
## 1047  y2021
## 1048  y2021
## 1049  y2021
## 1050  y2021
## 1051  y2021
## 1052  y2021
## 1053  y2021
## 1054  y2021
## 1055  y2021
## 1056  y2021
## 1057  y2021
## 1058  y2021
## 1059  y2021
## 1060  y2021
## 1061  y2021
## 1062  y2022
## 1063  y2022
## 1064  y2022
## 1065  y2022
## 1066  y2022
## 1067  y2022
## 1068  y2022
## 1069  y2022
## 1070  y2022
## 1071  y2022
## 1072  y2022
## 1073  y2022
## 1074  y2022
## 1075  y2022
## 1076  y2022
## 1077  y2022
## 1078  y2022
## 1079  y2022
## 1080  y2022
## 1081  y2022
## 1082  y2022
## 1083  y2022
## 1084  y2022
## 1085  y2022
## 1086  y2022
## 1087  y2020
## 1088  y2020
## 1089  y2020
## 1090  y2020
## 1091  y2020
## 1092  y2020
## 1093  y2020
## 1094  y2020
## 1095  y2020
## 1096  y2020
## 1097  y2020
## 1098  y2020
## 1099  y2020
## 1100  y2020
## 1101  y2020
## 1102  y2020
## 1103  y2020
## 1104  y2020
## 1105  y2020
## 1106  y2020
## 1107  y2020
## 1108  y2021
## 1109  y2021
## 1110  y2021
## 1111  y2021
## 1112  y2021
## 1113  y2021
## 1114  y2021
## 1115  y2021
## 1116  y2021
## 1117  y2021
## 1118  y2021
## 1119  y2021
## 1120  y2021
## 1121  y2021
## 1122  y2021
## 1123  y2021
## 1124  y2021
## 1125  y2021
## 1126  y2021
## 1127  y2021
## 1128  y2021
## 1129  y2021
## 1130  y2021
## 1131  y2022
## 1132  y2022
## 1133  y2022
## 1134  y2022
## 1135  y2022
## 1136  y2022
## 1137  y2022
## 1138  y2022
## 1139  y2022
## 1140  y2022
## 1141  y2022
## 1142  y2022
## 1143  y2022
## 1144  y2022
## 1145  y2022
## 1146  y2022
## 1147  y2022
## 1148  y2022
## 1149  y2022
## 1150  y2022
## 1151  y2022
## 1152  y2022
## 1153  y2022
## 1154  y2020
## 1155  y2020
## 1156  y2020
## 1157  y2020
## 1158  y2020
## 1159  y2020
## 1160  y2020
## 1161  y2020
## 1162  y2020
## 1163  y2020
## 1164  y2020
## 1165  y2020
## 1166  y2020
## 1167  y2020
## 1168  y2020
## 1169  y2020
## 1170  y2020
## 1171  y2020
## 1172  y2020
## 1173  y2020
## 1174  y2020
## 1175  y2020
## 1176  y2020
## 1177  y2020
## 1178  y2020
## 1179  y2020
## 1180  y2020
## 1181  y2020
## 1182  y2020
## 1183  y2020
## 1184  y2021
## 1185  y2021
## 1186  y2021
## 1187  y2021
## 1188  y2021
## 1189  y2021
## 1190  y2021
## 1191  y2021
## 1192  y2021
## 1193  y2021
## 1194  y2021
## 1195  y2021
## 1196  y2021
## 1197  y2021
## 1198  y2021
## 1199  y2021
## 1200  y2021
## 1201  y2021
## 1202  y2021
## 1203  y2021
## 1204  y2021
## 1205  y2021
## 1206  y2022
## 1207  y2022
## 1208  y2022
## 1209  y2022
## 1210  y2022
## 1211  y2022
## 1212  y2022
## 1213  y2022
## 1214  y2022
## 1215  y2022
## 1216  y2022
## 1217  y2022
## 1218  y2022
## 1219  y2022
## 1220  y2022
## 1221  y2022
## 1222  y2022
## 1223  y2022
## 1224  y2022
## 1225  y2022
## 1226  y2022
## 1227  y2020
## 1228  y2020
## 1229  y2020
## 1230  y2020
## 1231  y2020
## 1232  y2020
## 1233  y2020
## 1234  y2020
## 1235  y2020
## 1236  y2020
## 1237  y2020
## 1238  y2020
## 1239  y2020
## 1240  y2020
## 1241  y2020
## 1242  y2020
## 1243  y2020
## 1244  y2020
## 1245  y2020
## 1246  y2020
## 1247  y2020
## 1248  y2020
## 1249  y2020
## 1250  y2020
## 1251  y2020
## 1252  y2020
## 1253  y2020
## 1254  y2020
## 1255  y2020
## 1256  y2020
## 1257  y2020
## 1258  y2020
## 1259  y2020
## 1260  y2020
## 1261  y2020
## 1262  y2020
## 1263  y2020
## 1264  y2020
## 1265  y2020
## 1266  y2020
## 1267  y2020
## 1268  y2021
## 1269  y2021
## 1270  y2021
## 1271  y2021
## 1272  y2021
## 1273  y2021
## 1274  y2021
## 1275  y2021
## 1276  y2021
## 1277  y2021
## 1278  y2021
## 1279  y2021
## 1280  y2021
## 1281  y2021
## 1282  y2021
## 1283  y2021
## 1284  y2021
## 1285  y2021
## 1286  y2021
## 1287  y2021
## 1288  y2021
## 1289  y2021
## 1290  y2021
## 1291  y2021
## 1292  y2021
## 1293  y2021
## 1294  y2021
## 1295  y2021
## 1296  y2021
## 1297  y2021
## 1298  y2021
## 1299  y2021
## 1300  y2021
## 1301  y2022
## 1302  y2022
## 1303  y2022
## 1304  y2022
## 1305  y2022
## 1306  y2022
## 1307  y2022
## 1308  y2022
## 1309  y2022
## 1310  y2022
## 1311  y2022
## 1312  y2022
## 1313  y2022
## 1314  y2022
## 1315  y2022
## 1316  y2022
## 1317  y2022
## 1318  y2022
## 1319  y2022
## 1320  y2022
## 1321  y2022
## 1322  y2022
## 1323  y2022
## 1324  y2022
## 1325  y2020
## 1326  y2020
## 1327  y2020
## 1328  y2020
## 1329  y2020
## 1330  y2020
## 1331  y2020
## 1332  y2020
## 1333  y2020
## 1334  y2020
## 1335  y2020
## 1336  y2020
## 1337  y2020
## 1338  y2020
## 1339  y2020
## 1340  y2020
## 1341  y2020
## 1342  y2020
## 1343  y2020
## 1344  y2020
## 1345  y2020
## 1346  y2020
## 1347  y2020
## 1348  y2020
## 1349  y2020
## 1350  y2020
## 1351  y2020
## 1352  y2020
## 1353  y2020
## 1354  y2020
## 1355  y2020
## 1356  y2021
## 1357  y2021
## 1358  y2021
## 1359  y2021
## 1360  y2021
## 1361  y2021
## 1362  y2021
## 1363  y2021
## 1364  y2021
## 1365  y2021
## 1366  y2021
## 1367  y2021
## 1368  y2021
## 1369  y2021
## 1370  y2021
## 1371  y2021
## 1372  y2021
## 1373  y2021
## 1374  y2021
## 1375  y2021
## 1376  y2021
## 1377  y2021
## 1378  y2021
## 1379  y2021
## 1380  y2021
## 1381  y2021
## 1382  y2021
## 1383  y2021
## 1384  y2021
## 1385  y2021
## 1386  y2021
## 1387  y2021
## 1388  y2021
## 1389  y2021
## 1390  y2022
## 1391  y2022
## 1392  y2022
## 1393  y2022
## 1394  y2022
## 1395  y2022
## 1396  y2022
## 1397  y2022
## 1398  y2022
## 1399  y2022
## 1400  y2022
## 1401  y2022
## 1402  y2022
## 1403  y2022
## 1404  y2022
## 1405  y2022
## 1406  y2022
## 1407  y2022
## 1408  y2022
## 1409  y2022
## 1410  y2022
## 1411  y2022
## 1412  y2022
## 1413  y2022
## 1414  y2022
## 1415  y2022
## 1416  y2020
## 1417  y2020
## 1418  y2020
## 1419  y2020
## 1420  y2020
## 1421  y2020
## 1422  y2020
## 1423  y2020
## 1424  y2020
## 1425  y2020
## 1426  y2020
## 1427  y2020
## 1428  y2020
## 1429  y2020
## 1430  y2020
## 1431  y2020
## 1432  y2020
## 1433  y2020
## 1434  y2020
## 1435  y2020
## 1436  y2020
## 1437  y2020
## 1438  y2020
## 1439  y2020
## 1440  y2020
## 1441  y2020
## 1442  y2020
## 1443  y2020
## 1444  y2020
## 1445  y2020
## 1446  y2020
## 1447  y2020
## 1448  y2020
## 1449  y2020
## 1450  y2020
## 1451  y2020
## 1452  y2020
## 1453  y2020
## 1454  y2020
## 1455  y2020
## 1456  y2020
## 1457  y2020
## 1458  y2020
## 1459  y2020
## 1460  y2020
## 1461  y2021
## 1462  y2021
## 1463  y2021
## 1464  y2021
## 1465  y2021
## 1466  y2021
## 1467  y2021
## 1468  y2021
## 1469  y2021
## 1470  y2021
## 1471  y2021
## 1472  y2021
## 1473  y2021
## 1474  y2021
## 1475  y2021
## 1476  y2021
## 1477  y2021
## 1478  y2021
## 1479  y2021
## 1480  y2021
## 1481  y2021
## 1482  y2021
## 1483  y2021
## 1484  y2021
## 1485  y2021
## 1486  y2021
## 1487  y2021
## 1488  y2021
## 1489  y2021
## 1490  y2021
## 1491  y2021
## 1492  y2021
## 1493  y2021
## 1494  y2021
## 1495  y2021
## 1496  y2021
## 1497  y2021
## 1498  y2021
## 1499  y2021
## 1500  y2021
## 1501  y2021
## 1502  y2021
## 1503  y2021
## 1504  y2021
## 1505  y2022
## 1506  y2022
## 1507  y2022
## 1508  y2022
## 1509  y2022
## 1510  y2022
## 1511  y2022
## 1512  y2022
## 1513  y2022
## 1514  y2022
## 1515  y2022
## 1516  y2022
## 1517  y2022
## 1518  y2022
## 1519  y2022
## 1520  y2022
## 1521  y2022
## 1522  y2022
## 1523  y2022
## 1524  y2022
## 1525  y2022
## 1526  y2022
## 1527  y2022
## 1528  y2022
## 1529  y2022
## 1530  y2022
## 1531  y2022
## 1532  y2022
## 1533  y2022
## 1534  y2022
## 1535  y2022
## 1536  y2022
## 1537  y2022
## 1538  y2022
## 1539  y2020
## 1540  y2020
## 1541  y2020
## 1542  y2020
## 1543  y2020
## 1544  y2020
## 1545  y2020
## 1546  y2020
## 1547  y2020
## 1548  y2020
## 1549  y2020
## 1550  y2020
## 1551  y2020
## 1552  y2020
## 1553  y2020
## 1554  y2020
## 1555  y2020
## 1556  y2020
## 1557  y2020
## 1558  y2020
## 1559  y2020
## 1560  y2020
## 1561  y2020
## 1562  y2020
## 1563  y2020
## 1564  y2020
## 1565  y2020
## 1566  y2020
## 1567  y2020
## 1568  y2020
## 1569  y2020
## 1570  y2020
## 1571  y2020
## 1572  y2020
## 1573  y2020
## 1574  y2020
## 1575  y2020
## 1576  y2020
## 1577  y2020
## 1578  y2020
## 1579  y2020
## 1580  y2020
## 1581  y2020
## 1582  y2020
## 1583  y2020
## 1584  y2020
## 1585  y2020
## 1586  y2020
## 1587  y2020
## 1588  y2020
## 1589  y2020
## 1590  y2020
## 1591  y2021
## 1592  y2021
## 1593  y2021
## 1594  y2021
## 1595  y2021
## 1596  y2021
## 1597  y2021
## 1598  y2021
## 1599  y2021
## 1600  y2021
## 1601  y2021
## 1602  y2021
## 1603  y2021
## 1604  y2021
## 1605  y2021
## 1606  y2021
## 1607  y2021
## 1608  y2021
## 1609  y2021
## 1610  y2021
## 1611  y2021
## 1612  y2021
## 1613  y2021
## 1614  y2021
## 1615  y2021
## 1616  y2021
## 1617  y2021
## 1618  y2021
## 1619  y2021
## 1620  y2021
## 1621  y2021
## 1622  y2021
## 1623  y2021
## 1624  y2021
## 1625  y2021
## 1626  y2022
## 1627  y2022
## 1628  y2022
## 1629  y2022
## 1630  y2022
## 1631  y2022
## 1632  y2022
## 1633  y2022
## 1634  y2022
## 1635  y2022
## 1636  y2022
## 1637  y2022
## 1638  y2022
## 1639  y2022
## 1640  y2022
## 1641  y2022
## 1642  y2022
## 1643  y2022
## 1644  y2022
## 1645  y2022
## 1646  y2022
## 1647  y2022
## 1648  y2022
## 1649  y2022
## 1650  y2022
## 1651  y2022
## 1652  y2022
## 1653  y2022
## 1654  y2022
## 1655  y2022
## 1656  y2022
## 1657  y2022
## 1658  y2020
## 1659  y2020
## 1660  y2020
## 1661  y2020
## 1662  y2020
## 1663  y2020
## 1664  y2020
## 1665  y2020
## 1666  y2020
## 1667  y2020
## 1668  y2020
## 1669  y2020
## 1670  y2020
## 1671  y2020
## 1672  y2020
## 1673  y2020
## 1674  y2020
## 1675  y2020
## 1676  y2020
## 1677  y2020
## 1678  y2020
## 1679  y2020
## 1680  y2020
## 1681  y2020
## 1682  y2020
## 1683  y2020
## 1684  y2020
## 1685  y2020
## 1686  y2020
## 1687  y2020
## 1688  y2020
## 1689  y2020
## 1690  y2020
## 1691  y2020
## 1692  y2020
## 1693  y2020
## 1694  y2020
## 1695  y2020
## 1696  y2020
## 1697  y2020
## 1698  y2020
## 1699  y2020
## 1700  y2020
## 1701  y2020
## 1702  y2020
## 1703  y2020
## 1704  y2020
## 1705  y2020
## 1706  y2020
## 1707  y2020
## 1708  y2020
## 1709  y2020
## 1710  y2020
## 1711  y2021
## 1712  y2021
## 1713  y2021
## 1714  y2021
## 1715  y2021
## 1716  y2021
## 1717  y2021
## 1718  y2021
## 1719  y2021
## 1720  y2021
## 1721  y2021
## 1722  y2021
## 1723  y2021
## 1724  y2021
## 1725  y2021
## 1726  y2021
## 1727  y2021
## 1728  y2021
## 1729  y2021
## 1730  y2021
## 1731  y2021
## 1732  y2021
## 1733  y2021
## 1734  y2021
## 1735  y2021
## 1736  y2021
## 1737  y2021
## 1738  y2021
## 1739  y2021
## 1740  y2021
## 1741  y2021
## 1742  y2021
## 1743  y2021
## 1744  y2021
## 1745  y2021
## 1746  y2021
## 1747  y2021
## 1748  y2021
## 1749  y2021
## 1750  y2021
## 1751  y2021
## 1752  y2022
## 1753  y2022
## 1754  y2022
## 1755  y2022
## 1756  y2022
## 1757  y2022
## 1758  y2022
## 1759  y2022
## 1760  y2022
## 1761  y2022
## 1762  y2022
## 1763  y2022
## 1764  y2022
## 1765  y2022
## 1766  y2022
## 1767  y2022
## 1768  y2022
## 1769  y2022
## 1770  y2022
## 1771  y2022
## 1772  y2022
## 1773  y2022
## 1774  y2022
## 1775  y2022
## 1776  y2022
## 1777  y2022
## 1778  y2022
## 1779  y2022
## 1780  y2022
## 1781  y2022
## 1782  y2022
## 1783  y2022
## 1784  y2022
## 1785  y2022
## 1786  y2022
## 1787  y2020
## 1788  y2020
## 1789  y2020
## 1790  y2020
## 1791  y2020
## 1792  y2020
## 1793  y2020
## 1794  y2020
## 1795  y2020
## 1796  y2020
## 1797  y2020
## 1798  y2020
## 1799  y2020
## 1800  y2020
## 1801  y2020
## 1802  y2020
## 1803  y2020
## 1804  y2020
## 1805  y2020
## 1806  y2020
## 1807  y2020
## 1808  y2020
## 1809  y2020
## 1810  y2020
## 1811  y2020
## 1812  y2020
## 1813  y2020
## 1814  y2020
## 1815  y2020
## 1816  y2020
## 1817  y2020
## 1818  y2020
## 1819  y2020
## 1820  y2020
## 1821  y2020
## 1822  y2020
## 1823  y2020
## 1824  y2020
## 1825  y2020
## 1826  y2020
## 1827  y2020
## 1828  y2020
## 1829  y2020
## 1830  y2020
## 1831  y2020
## 1832  y2020
## 1833  y2020
## 1834  y2020
## 1835  y2020
## 1836  y2020
## 1837  y2020
## 1838  y2020
## 1839  y2020
## 1840  y2020
## 1841  y2020
## 1842  y2020
## 1843  y2020
## 1844  y2020
## 1845  y2020
## 1846  y2020
## 1847  y2020
## 1848  y2020
## 1849  y2020
## 1850  y2020
## 1851  y2020
## 1852  y2020
## 1853  y2020
## 1854  y2020
## 1855  y2020
## 1856  y2020
## 1857  y2020
## 1858  y2021
## 1859  y2021
## 1860  y2021
## 1861  y2021
## 1862  y2021
## 1863  y2021
## 1864  y2021
## 1865  y2021
## 1866  y2021
## 1867  y2021
## 1868  y2021
## 1869  y2021
## 1870  y2021
## 1871  y2021
## 1872  y2021
## 1873  y2021
## 1874  y2021
## 1875  y2021
## 1876  y2021
## 1877  y2021
## 1878  y2021
## 1879  y2021
## 1880  y2021
## 1881  y2021
## 1882  y2021
## 1883  y2021
## 1884  y2021
## 1885  y2021
## 1886  y2021
## 1887  y2021
## 1888  y2021
## 1889  y2021
## 1890  y2021
## 1891  y2021
## 1892  y2021
## 1893  y2021
## 1894  y2021
## 1895  y2021
## 1896  y2021
## 1897  y2021
## 1898  y2021
## 1899  y2021
## 1900  y2021
## 1901  y2021
## 1902  y2021
## 1903  y2021
## 1904  y2021
## 1905  y2021
## 1906  y2021
## 1907  y2021
## 1908  y2021
## 1909  y2022
## 1910  y2022
## 1911  y2022
## 1912  y2022
## 1913  y2022
## 1914  y2022
## 1915  y2022
## 1916  y2022
## 1917  y2022
## 1918  y2022
## 1919  y2022
## 1920  y2022
## 1921  y2022
## 1922  y2022
## 1923  y2022
## 1924  y2022
## 1925  y2022
## 1926  y2022
## 1927  y2022
## 1928  y2022
## 1929  y2022
## 1930  y2022
## 1931  y2022
## 1932  y2022
## 1933  y2022
## 1934  y2022
## 1935  y2022
## 1936  y2022
## 1937  y2022
## 1938  y2022
## 1939  y2022
## 1940  y2022
## 1941  y2022
## 1942  y2022
## 1943  y2022
## 1944  y2022
## 1945  y2022
## 1946  y2022
## 1947  y2022
## 1948  y2022
## 1949  y2022
## 1950  y2022
## 1951  y2022
## 1952  y2022
## 1953  y2022
## 1954  y2022
## 1955  y2022
## 1956  y2022
## 1957  y2022
## 1958  y2020
## 1959  y2020
## 1960  y2020
## 1961  y2020
## 1962  y2020
## 1963  y2020
## 1964  y2020
## 1965  y2020
## 1966  y2020
## 1967  y2020
## 1968  y2020
## 1969  y2020
## 1970  y2020
## 1971  y2020
## 1972  y2020
## 1973  y2020
## 1974  y2020
## 1975  y2020
## 1976  y2020
## 1977  y2020
## 1978  y2020
## 1979  y2020
## 1980  y2020
## 1981  y2020
## 1982  y2020
## 1983  y2020
## 1984  y2020
## 1985  y2020
## 1986  y2020
## 1987  y2020
## 1988  y2020
## 1989  y2020
## 1990  y2020
## 1991  y2020
## 1992  y2020
## 1993  y2020
## 1994  y2020
## 1995  y2020
## 1996  y2020
## 1997  y2020
## 1998  y2020
## 1999  y2020
## 2000  y2020
## 2001  y2020
## 2002  y2020
## 2003  y2020
## 2004  y2020
## 2005  y2020
## 2006  y2020
## 2007  y2020
## 2008  y2020
## 2009  y2020
## 2010  y2020
## 2011  y2020
## 2012  y2020
## 2013  y2020
## 2014  y2020
## 2015  y2020
## 2016  y2020
## 2017  y2020
## 2018  y2020
## 2019  y2021
## 2020  y2021
## 2021  y2021
## 2022  y2021
## 2023  y2021
## 2024  y2021
## 2025  y2021
## 2026  y2021
## 2027  y2021
## 2028  y2021
## 2029  y2021
## 2030  y2021
## 2031  y2021
## 2032  y2021
## 2033  y2021
## 2034  y2021
## 2035  y2021
## 2036  y2021
## 2037  y2021
## 2038  y2021
## 2039  y2021
## 2040  y2021
## 2041  y2021
## 2042  y2021
## 2043  y2021
## 2044  y2021
## 2045  y2021
## 2046  y2021
## 2047  y2021
## 2048  y2021
## 2049  y2021
## 2050  y2021
## 2051  y2021
## 2052  y2021
## 2053  y2021
## 2054  y2021
## 2055  y2021
## 2056  y2021
## 2057  y2021
## 2058  y2021
## 2059  y2021
## 2060  y2021
## 2061  y2021
## 2062  y2021
## 2063  y2021
## 2064  y2021
## 2065  y2021
## 2066  y2021
## 2067  y2021
## 2068  y2021
## 2069  y2021
## 2070  y2021
## 2071  y2021
## 2072  y2021
## 2073  y2021
## 2074  y2021
## 2075  y2021
## 2076  y2021
## 2077  y2021
## 2078  y2021
## 2079  y2021
## 2080  y2021
## 2081  y2021
## 2082  y2021
## 2083  y2021
## 2084  y2021
## 2085  y2022
## 2086  y2022
## 2087  y2022
## 2088  y2022
## 2089  y2022
## 2090  y2022
## 2091  y2022
## 2092  y2022
## 2093  y2022
## 2094  y2022
## 2095  y2022
## 2096  y2022
## 2097  y2022
## 2098  y2022
## 2099  y2022
## 2100  y2022
## 2101  y2022
## 2102  y2022
## 2103  y2022
## 2104  y2022
## 2105  y2022
## 2106  y2022
## 2107  y2022
## 2108  y2022
## 2109  y2022
## 2110  y2022
## 2111  y2022
## 2112  y2022
## 2113  y2022
## 2114  y2022
## 2115  y2022
## 2116  y2022
## 2117  y2022
## 2118  y2022
## 2119  y2022
## 2120  y2022
## 2121  y2022
## 2122  y2022
## 2123  y2022
## 2124  y2022
## 2125  y2022
## 2126  y2022
## 2127  y2022
## 2128  y2022
## 2129  y2020
## 2130  y2020
## 2131  y2020
## 2132  y2020
## 2133  y2020
## 2134  y2020
## 2135  y2020
## 2136  y2020
## 2137  y2020
## 2138  y2020
## 2139  y2020
## 2140  y2020
## 2141  y2020
## 2142  y2020
## 2143  y2020
## 2144  y2020
## 2145  y2020
## 2146  y2020
## 2147  y2020
## 2148  y2020
## 2149  y2020
## 2150  y2020
## 2151  y2020
## 2152  y2020
## 2153  y2020
## 2154  y2020
## 2155  y2020
## 2156  y2020
## 2157  y2020
## 2158  y2020
## 2159  y2020
## 2160  y2020
## 2161  y2020
## 2162  y2020
## 2163  y2020
## 2164  y2020
## 2165  y2020
## 2166  y2020
## 2167  y2020
## 2168  y2020
## 2169  y2020
## 2170  y2020
## 2171  y2020
## 2172  y2020
## 2173  y2020
## 2174  y2020
## 2175  y2020
## 2176  y2020
## 2177  y2020
## 2178  y2020
## 2179  y2020
## 2180  y2020
## 2181  y2020
## 2182  y2020
## 2183  y2020
## 2184  y2020
## 2185  y2020
## 2186  y2020
## 2187  y2020
## 2188  y2020
## 2189  y2020
## 2190  y2020
## 2191  y2020
## 2192  y2020
## 2193  y2020
## 2194  y2020
## 2195  y2020
## 2196  y2020
## 2197  y2020
## 2198  y2020
## 2199  y2020
## 2200  y2020
## 2201  y2020
## 2202  y2020
## 2203  y2020
## 2204  y2020
## 2205  y2020
## 2206  y2020
## 2207  y2020
## 2208  y2020
## 2209  y2020
## 2210  y2020
## 2211  y2020
## 2212  y2020
## 2213  y2020
## 2214  y2020
## 2215  y2020
## 2216  y2020
## 2217  y2020
## 2218  y2020
## 2219  y2020
## 2220  y2020
## 2221  y2020
## 2222  y2020
## 2223  y2020
## 2224  y2020
## 2225  y2020
## 2226  y2020
## 2227  y2021
## 2228  y2021
## 2229  y2021
## 2230  y2021
## 2231  y2021
## 2232  y2021
## 2233  y2021
## 2234  y2021
## 2235  y2021
## 2236  y2021
## 2237  y2021
## 2238  y2021
## 2239  y2021
## 2240  y2021
## 2241  y2021
## 2242  y2021
## 2243  y2021
## 2244  y2021
## 2245  y2021
## 2246  y2021
## 2247  y2021
## 2248  y2021
## 2249  y2021
## 2250  y2021
## 2251  y2021
## 2252  y2021
## 2253  y2021
## 2254  y2021
## 2255  y2021
## 2256  y2021
## 2257  y2021
## 2258  y2021
## 2259  y2021
## 2260  y2021
## 2261  y2021
## 2262  y2021
## 2263  y2021
## 2264  y2021
## 2265  y2021
## 2266  y2021
## 2267  y2021
## 2268  y2021
## 2269  y2021
## 2270  y2021
## 2271  y2021
## 2272  y2021
## 2273  y2021
## 2274  y2021
## 2275  y2021
## 2276  y2021
## 2277  y2021
## 2278  y2021
## 2279  y2021
## 2280  y2021
## 2281  y2021
## 2282  y2021
## 2283  y2021
## 2284  y2021
## 2285  y2021
## 2286  y2021
## 2287  y2021
## 2288  y2021
## 2289  y2021
## 2290  y2021
## 2291  y2021
## 2292  y2021
## 2293  y2021
## 2294  y2021
## 2295  y2021
## 2296  y2021
## 2297  y2021
## 2298  y2021
## 2299  y2021
## 2300  y2021
## 2301  y2021
## 2302  y2021
## 2303  y2021
## 2304  y2021
## 2305  y2021
## 2306  y2021
## 2307  y2021
## 2308  y2022
## 2309  y2022
## 2310  y2022
## 2311  y2022
## 2312  y2022
## 2313  y2022
## 2314  y2022
## 2315  y2022
## 2316  y2022
## 2317  y2022
## 2318  y2022
## 2319  y2022
## 2320  y2022
## 2321  y2022
## 2322  y2022
## 2323  y2022
## 2324  y2022
## 2325  y2022
## 2326  y2022
## 2327  y2022
## 2328  y2022
## 2329  y2022
## 2330  y2022
## 2331  y2022
## 2332  y2022
## 2333  y2022
## 2334  y2022
## 2335  y2022
## 2336  y2022
## 2337  y2022
## 2338  y2022
## 2339  y2022
## 2340  y2022
## 2341  y2022
## 2342  y2022
## 2343  y2022
## 2344  y2022
## 2345  y2022
## 2346  y2022
## 2347  y2022
## 2348  y2022
## 2349  y2022
## 2350  y2022
## 2351  y2022
## 2352  y2022
## 2353  y2022
## 2354  y2022
## 2355  y2022
## 2356  y2022
## 2357  y2022
## 2358  y2022
## 2359  y2022
## 2360  y2022
## 2361  y2022
## 2362  y2022
## 2363  y2022
## 2364  y2022
## 2365  y2022
## 2366  y2022
## 2367  y2022
## 2368  y2022
## 2369  y2022
## 2370  y2022
## 2371  y2022
## 2372  y2022
## 2373  y2022
## 2374  y2022
## 2375  y2022
## 2376  y2020
## 2377  y2020
## 2378  y2020
## 2379  y2020
## 2380  y2020
## 2381  y2020
## 2382  y2020
## 2383  y2020
## 2384  y2020
## 2385  y2020
## 2386  y2020
## 2387  y2020
## 2388  y2020
## 2389  y2020
## 2390  y2020
## 2391  y2020
## 2392  y2020
## 2393  y2020
## 2394  y2020
## 2395  y2020
## 2396  y2020
## 2397  y2020
## 2398  y2020
## 2399  y2020
## 2400  y2020
## 2401  y2020
## 2402  y2020
## 2403  y2020
## 2404  y2020
## 2405  y2020
## 2406  y2020
## 2407  y2020
## 2408  y2020
## 2409  y2020
## 2410  y2020
## 2411  y2020
## 2412  y2020
## 2413  y2020
## 2414  y2020
## 2415  y2020
## 2416  y2020
## 2417  y2020
## 2418  y2020
## 2419  y2020
## 2420  y2020
## 2421  y2020
## 2422  y2020
## 2423  y2020
## 2424  y2020
## 2425  y2020
## 2426  y2020
## 2427  y2020
## 2428  y2020
## 2429  y2020
## 2430  y2020
## 2431  y2020
## 2432  y2020
## 2433  y2020
## 2434  y2020
## 2435  y2020
## 2436  y2020
## 2437  y2020
## 2438  y2020
## 2439  y2020
## 2440  y2020
## 2441  y2020
## 2442  y2020
## 2443  y2020
## 2444  y2020
## 2445  y2020
## 2446  y2020
## 2447  y2020
## 2448  y2020
## 2449  y2020
## 2450  y2020
## 2451  y2020
## 2452  y2020
## 2453  y2020
## 2454  y2020
## 2455  y2020
## 2456  y2020
## 2457  y2020
## 2458  y2020
## 2459  y2020
## 2460  y2020
## 2461  y2020
## 2462  y2020
## 2463  y2020
## 2464  y2020
## 2465  y2020
## 2466  y2020
## 2467  y2020
## 2468  y2020
## 2469  y2020
## 2470  y2020
## 2471  y2020
## 2472  y2020
## 2473  y2021
## 2474  y2021
## 2475  y2021
## 2476  y2021
## 2477  y2021
## 2478  y2021
## 2479  y2021
## 2480  y2021
## 2481  y2021
## 2482  y2021
## 2483  y2021
## 2484  y2021
## 2485  y2021
## 2486  y2021
## 2487  y2021
## 2488  y2021
## 2489  y2021
## 2490  y2021
## 2491  y2021
## 2492  y2021
## 2493  y2021
## 2494  y2021
## 2495  y2021
## 2496  y2021
## 2497  y2021
## 2498  y2021
## 2499  y2021
## 2500  y2021
## 2501  y2021
## 2502  y2021
## 2503  y2021
## 2504  y2021
## 2505  y2021
## 2506  y2021
## 2507  y2021
## 2508  y2021
## 2509  y2021
## 2510  y2021
## 2511  y2021
## 2512  y2021
## 2513  y2021
## 2514  y2021
## 2515  y2021
## 2516  y2021
## 2517  y2021
## 2518  y2021
## 2519  y2021
## 2520  y2021
## 2521  y2021
## 2522  y2021
## 2523  y2021
## 2524  y2021
## 2525  y2021
## 2526  y2021
## 2527  y2021
## 2528  y2021
## 2529  y2021
## 2530  y2021
## 2531  y2021
## 2532  y2021
## 2533  y2021
## 2534  y2021
## 2535  y2021
## 2536  y2021
## 2537  y2021
## 2538  y2021
## 2539  y2021
## 2540  y2021
## 2541  y2021
## 2542  y2021
## 2543  y2021
## 2544  y2021
## 2545  y2021
## 2546  y2021
## 2547  y2021
## 2548  y2021
## 2549  y2021
## 2550  y2021
## 2551  y2021
## 2552  y2021
## 2553  y2021
## 2554  y2021
## 2555  y2021
## 2556  y2021
## 2557  y2021
## 2558  y2021
## 2559  y2021
## 2560  y2021
## 2561  y2022
## 2562  y2022
## 2563  y2022
## 2564  y2022
## 2565  y2022
## 2566  y2022
## 2567  y2022
## 2568  y2022
## 2569  y2022
## 2570  y2022
## 2571  y2022
## 2572  y2022
## 2573  y2022
## 2574  y2022
## 2575  y2022
## 2576  y2022
## 2577  y2022
## 2578  y2022
## 2579  y2022
## 2580  y2022
## 2581  y2022
## 2582  y2022
## 2583  y2022
## 2584  y2022
## 2585  y2022
## 2586  y2022
## 2587  y2022
## 2588  y2022
## 2589  y2022
## 2590  y2022
## 2591  y2022
## 2592  y2022
## 2593  y2022
## 2594  y2022
## 2595  y2022
## 2596  y2022
## 2597  y2022
## 2598  y2022
## 2599  y2022
## 2600  y2022
## 2601  y2022
## 2602  y2022
## 2603  y2022
## 2604  y2022
## 2605  y2022
## 2606  y2022
## 2607  y2022
## 2608  y2022
## 2609  y2022
## 2610  y2022
## 2611  y2022
## 2612  y2022
## 2613  y2022
## 2614  y2022
## 2615  y2022
## 2616  y2022
## 2617  y2022
## 2618  y2022
## 2619  y2022
## 2620  y2022
## 2621  y2022
## 2622  y2022
## 2623  y2022
## 2624  y2022
## 2625  y2022
## 2626  y2022
## 2627  y2022
## 2628  y2022
## 2629  y2022
## 2630  y2022
## 2631  y2022
## 2632  y2022
## 2633  y2022
## 2634  y2020
## 2635  y2020
## 2636  y2020
## 2637  y2020
## 2638  y2020
## 2639  y2020
## 2640  y2020
## 2641  y2020
## 2642  y2020
## 2643  y2020
## 2644  y2020
## 2645  y2020
## 2646  y2020
## 2647  y2020
## 2648  y2020
## 2649  y2020
## 2650  y2020
## 2651  y2020
## 2652  y2020
## 2653  y2020
## 2654  y2020
## 2655  y2020
## 2656  y2020
## 2657  y2020
## 2658  y2020
## 2659  y2020
## 2660  y2020
## 2661  y2020
## 2662  y2020
## 2663  y2020
## 2664  y2020
## 2665  y2020
## 2666  y2020
## 2667  y2020
## 2668  y2020
## 2669  y2020
## 2670  y2020
## 2671  y2020
## 2672  y2020
## 2673  y2020
## 2674  y2020
## 2675  y2020
## 2676  y2020
## 2677  y2020
## 2678  y2020
## 2679  y2020
## 2680  y2020
## 2681  y2020
## 2682  y2020
## 2683  y2020
## 2684  y2020
## 2685  y2020
## 2686  y2020
## 2687  y2020
## 2688  y2020
## 2689  y2020
## 2690  y2020
## 2691  y2020
## 2692  y2020
## 2693  y2020
## 2694  y2020
## 2695  y2020
## 2696  y2020
## 2697  y2020
## 2698  y2020
## 2699  y2020
## 2700  y2020
## 2701  y2020
## 2702  y2020
## 2703  y2020
## 2704  y2020
## 2705  y2020
## 2706  y2020
## 2707  y2020
## 2708  y2020
## 2709  y2020
## 2710  y2020
## 2711  y2020
## 2712  y2020
## 2713  y2020
## 2714  y2020
## 2715  y2020
## 2716  y2020
## 2717  y2020
## 2718  y2020
## 2719  y2020
## 2720  y2020
## 2721  y2020
## 2722  y2020
## 2723  y2020
## 2724  y2020
## 2725  y2020
## 2726  y2020
## 2727  y2020
## 2728  y2020
## 2729  y2020
## 2730  y2020
## 2731  y2020
## 2732  y2020
## 2733  y2020
## 2734  y2020
## 2735  y2021
## 2736  y2021
## 2737  y2021
## 2738  y2021
## 2739  y2021
## 2740  y2021
## 2741  y2021
## 2742  y2021
## 2743  y2021
## 2744  y2021
## 2745  y2021
## 2746  y2021
## 2747  y2021
## 2748  y2021
## 2749  y2021
## 2750  y2021
## 2751  y2021
## 2752  y2021
## 2753  y2021
## 2754  y2021
## 2755  y2021
## 2756  y2021
## 2757  y2021
## 2758  y2021
## 2759  y2021
## 2760  y2021
## 2761  y2021
## 2762  y2021
## 2763  y2021
## 2764  y2021
## 2765  y2021
## 2766  y2021
## 2767  y2021
## 2768  y2021
## 2769  y2021
## 2770  y2021
## 2771  y2021
## 2772  y2021
## 2773  y2021
## 2774  y2021
## 2775  y2021
## 2776  y2021
## 2777  y2021
## 2778  y2021
## 2779  y2021
## 2780  y2021
## 2781  y2021
## 2782  y2021
## 2783  y2021
## 2784  y2021
## 2785  y2021
## 2786  y2021
## 2787  y2021
## 2788  y2021
## 2789  y2021
## 2790  y2021
## 2791  y2021
## 2792  y2021
## 2793  y2021
## 2794  y2021
## 2795  y2021
## 2796  y2021
## 2797  y2021
## 2798  y2021
## 2799  y2021
## 2800  y2021
## 2801  y2021
## 2802  y2021
## 2803  y2021
## 2804  y2021
## 2805  y2021
## 2806  y2021
## 2807  y2021
## 2808  y2021
## 2809  y2021
## 2810  y2021
## 2811  y2021
## 2812  y2021
## 2813  y2021
## 2814  y2021
## 2815  y2021
## 2816  y2021
## 2817  y2021
## 2818  y2021
## 2819  y2022
## 2820  y2022
## 2821  y2022
## 2822  y2022
## 2823  y2022
## 2824  y2022
## 2825  y2022
## 2826  y2022
## 2827  y2022
## 2828  y2022
## 2829  y2022
## 2830  y2022
## 2831  y2022
## 2832  y2022
## 2833  y2022
## 2834  y2022
## 2835  y2022
## 2836  y2022
## 2837  y2022
## 2838  y2022
## 2839  y2022
## 2840  y2022
## 2841  y2022
## 2842  y2022
## 2843  y2022
## 2844  y2022
## 2845  y2022
## 2846  y2022
## 2847  y2022
## 2848  y2022
## 2849  y2022
## 2850  y2022
## 2851  y2022
## 2852  y2022
## 2853  y2022
## 2854  y2022
## 2855  y2022
## 2856  y2022
## 2857  y2022
## 2858  y2022
## 2859  y2022
## 2860  y2022
## 2861  y2022
## 2862  y2022
## 2863  y2022
## 2864  y2022
## 2865  y2022
## 2866  y2022
## 2867  y2022
## 2868  y2022
## 2869  y2022
## 2870  y2022
## 2871  y2022
## 2872  y2022
## 2873  y2022
## 2874  y2022
## 2875  y2022
## 2876  y2022
## 2877  y2022
## 2878  y2022
## 2879  y2022
## 2880  y2022
## 2881  y2022
## 2882  y2022
## 2883  y2022
## 2884  y2022
## 2885  y2022
## 2886  y2022
## 2887  y2022
## 2888  y2022
## 2889  y2022
## 2890  y2022
## 2891  y2022
## 2892  y2022
## 2893  y2022
## 2894  y2022
## 2895  y2022
## 2896  y2022
## 2897  y2022
## 2898  y2022
## 2899  y2022
## 2900  y2022
## 2901  y2022
## 2902  y2022
## 2903  y2022
## 2904  y2022
## 2905  y2022
## 2906  y2022
## 2907  y2022
## 2908  y2022
## 2909  y2022
## 2910  y2022
## 2911  y2022
## 2912  y2022
## 2913  y2022
## 2914  y2022
## 2915  y2022
## 2916  y2022
## 2917  y2022
## 2918  y2022
## 2919  y2022
## 2920  y2022
## 2921  y2022
## 2922  y2022
## 2923  y2020
## 2924  y2020
## 2925  y2020
## 2926  y2020
## 2927  y2020
## 2928  y2020
## 2929  y2020
## 2930  y2020
## 2931  y2020
## 2932  y2020
## 2933  y2020
## 2934  y2020
## 2935  y2020
## 2936  y2020
## 2937  y2020
## 2938  y2020
## 2939  y2020
## 2940  y2020
## 2941  y2020
## 2942  y2020
## 2943  y2020
## 2944  y2020
## 2945  y2020
## 2946  y2020
## 2947  y2020
## 2948  y2020
## 2949  y2020
## 2950  y2020
## 2951  y2020
## 2952  y2020
## 2953  y2020
## 2954  y2020
## 2955  y2020
## 2956  y2020
## 2957  y2020
## 2958  y2020
## 2959  y2020
## 2960  y2020
## 2961  y2020
## 2962  y2020
## 2963  y2020
## 2964  y2020
## 2965  y2020
## 2966  y2020
## 2967  y2020
## 2968  y2020
## 2969  y2020
## 2970  y2020
## 2971  y2020
## 2972  y2020
## 2973  y2020
## 2974  y2020
## 2975  y2020
## 2976  y2020
## 2977  y2020
## 2978  y2020
## 2979  y2020
## 2980  y2020
## 2981  y2020
## 2982  y2020
## 2983  y2020
## 2984  y2020
## 2985  y2020
## 2986  y2020
## 2987  y2020
## 2988  y2020
## 2989  y2020
## 2990  y2020
## 2991  y2020
## 2992  y2020
## 2993  y2020
## 2994  y2020
## 2995  y2020
## 2996  y2020
## 2997  y2020
## 2998  y2020
## 2999  y2020
## 3000  y2020
## 3001  y2020
## 3002  y2020
## 3003  y2020
## 3004  y2020
## 3005  y2020
## 3006  y2020
## 3007  y2020
## 3008  y2020
## 3009  y2020
## 3010  y2020
## 3011  y2020
## 3012  y2020
## 3013  y2020
## 3014  y2020
## 3015  y2020
## 3016  y2020
## 3017  y2020
## 3018  y2020
## 3019  y2020
## 3020  y2020
## 3021  y2020
## 3022  y2020
## 3023  y2020
## 3024  y2020
## 3025  y2020
## 3026  y2020
## 3027  y2020
## 3028  y2020
## 3029  y2020
## 3030  y2020
## 3031  y2020
## 3032  y2020
## 3033  y2020
## 3034  y2020
## 3035  y2020
## 3036  y2020
## 3037  y2020
## 3038  y2020
## 3039  y2020
## 3040  y2020
## 3041  y2020
## 3042  y2020
## 3043  y2020
## 3044  y2020
## 3045  y2020
## 3046  y2020
## 3047  y2020
## 3048  y2020
## 3049  y2020
## 3050  y2020
## 3051  y2021
## 3052  y2021
## 3053  y2021
## 3054  y2021
## 3055  y2021
## 3056  y2021
## 3057  y2021
## 3058  y2021
## 3059  y2021
## 3060  y2021
## 3061  y2021
## 3062  y2021
## 3063  y2021
## 3064  y2021
## 3065  y2021
## 3066  y2021
## 3067  y2021
## 3068  y2021
## 3069  y2021
## 3070  y2021
## 3071  y2021
## 3072  y2021
## 3073  y2021
## 3074  y2021
## 3075  y2021
## 3076  y2021
## 3077  y2021
## 3078  y2021
## 3079  y2021
## 3080  y2021
## 3081  y2021
## 3082  y2021
## 3083  y2021
## 3084  y2021
## 3085  y2021
## 3086  y2021
## 3087  y2021
## 3088  y2021
## 3089  y2021
## 3090  y2021
## 3091  y2021
## 3092  y2021
## 3093  y2021
## 3094  y2021
## 3095  y2021
## 3096  y2021
## 3097  y2021
## 3098  y2021
## 3099  y2021
## 3100  y2021
## 3101  y2021
## 3102  y2021
## 3103  y2021
## 3104  y2021
## 3105  y2021
## 3106  y2021
## 3107  y2021
## 3108  y2021
## 3109  y2021
## 3110  y2021
## 3111  y2021
## 3112  y2021
## 3113  y2021
## 3114  y2021
## 3115  y2021
## 3116  y2021
## 3117  y2021
## 3118  y2021
## 3119  y2021
## 3120  y2021
## 3121  y2021
## 3122  y2021
## 3123  y2021
## 3124  y2021
## 3125  y2021
## 3126  y2021
## 3127  y2021
## 3128  y2021
## 3129  y2021
## 3130  y2021
## 3131  y2021
## 3132  y2021
## 3133  y2021
## 3134  y2021
## 3135  y2021
## 3136  y2021
## 3137  y2021
## 3138  y2021
## 3139  y2021
## 3140  y2021
## 3141  y2021
## 3142  y2021
## 3143  y2021
## 3144  y2021
## 3145  y2021
## 3146  y2021
## 3147  y2021
## 3148  y2021
## 3149  y2021
## 3150  y2021
## 3151  y2021
## 3152  y2021
## 3153  y2021
## 3154  y2021
## 3155  y2021
## 3156  y2021
## 3157  y2021
## 3158  y2021
## 3159  y2021
## 3160  y2021
## 3161  y2021
## 3162  y2021
## 3163  y2021
## 3164  y2021
## 3165  y2021
## 3166  y2021
## 3167  y2021
## 3168  y2021
## 3169  y2021
## 3170  y2021
## 3171  y2021
## 3172  y2021
## 3173  y2021
## 3174  y2021
## 3175  y2021
## 3176  y2021
## 3177  y2022
## 3178  y2022
## 3179  y2022
## 3180  y2022
## 3181  y2022
## 3182  y2022
## 3183  y2022
## 3184  y2022
## 3185  y2022
## 3186  y2022
## 3187  y2022
## 3188  y2022
## 3189  y2022
## 3190  y2022
## 3191  y2022
## 3192  y2022
## 3193  y2022
## 3194  y2022
## 3195  y2022
## 3196  y2022
## 3197  y2022
## 3198  y2022
## 3199  y2022
## 3200  y2022
## 3201  y2022
## 3202  y2022
## 3203  y2022
## 3204  y2022
## 3205  y2022
## 3206  y2022
## 3207  y2022
## 3208  y2022
## 3209  y2022
## 3210  y2022
## 3211  y2022
## 3212  y2022
## 3213  y2022
## 3214  y2022
## 3215  y2022
## 3216  y2022
## 3217  y2022
## 3218  y2022
## 3219  y2022
## 3220  y2022
## 3221  y2022
## 3222  y2022
## 3223  y2022
## 3224  y2022
## 3225  y2022
## 3226  y2022
## 3227  y2022
## 3228  y2022
## 3229  y2022
## 3230  y2022
## 3231  y2022
## 3232  y2022
## 3233  y2022
## 3234  y2022
## 3235  y2022
## 3236  y2022
## 3237  y2022
## 3238  y2022
## 3239  y2022
## 3240  y2022
## 3241  y2022
## 3242  y2022
## 3243  y2022
## 3244  y2022
## 3245  y2022
## 3246  y2022
## 3247  y2022
## 3248  y2022
## 3249  y2022
## 3250  y2022
## 3251  y2022
## 3252  y2022
## 3253  y2022
## 3254  y2022
## 3255  y2022
## 3256  y2022
## 3257  y2022
## 3258  y2022
## 3259  y2022
## 3260  y2022
## 3261  y2022
## 3262  y2022
## 3263  y2022
## 3264  y2022
## 3265  y2022
## 3266  y2022
## 3267  y2022
## 3268  y2022
## 3269  y2022
## 3270  y2022
## 3271  y2022
## 3272  y2022
## 3273  y2022
## 3274  y2022
## 3275  y2022
## 3276  y2022
## 3277  y2022
## 3278  y2022
## 3279  y2022
## 3280  y2022
## 3281  y2022
## 3282  y2022
## 3283  y2022
## 3284  y2020
## 3285  y2020
## 3286  y2020
## 3287  y2020
## 3288  y2020
## 3289  y2020
## 3290  y2020
## 3291  y2020
## 3292  y2020
## 3293  y2020
## 3294  y2020
## 3295  y2020
## 3296  y2020
## 3297  y2020
## 3298  y2020
## 3299  y2020
## 3300  y2020
## 3301  y2020
## 3302  y2020
## 3303  y2020
## 3304  y2020
## 3305  y2020
## 3306  y2020
## 3307  y2020
## 3308  y2020
## 3309  y2020
## 3310  y2020
## 3311  y2020
## 3312  y2020
## 3313  y2020
## 3314  y2020
## 3315  y2020
## 3316  y2020
## 3317  y2020
## 3318  y2020
## 3319  y2020
## 3320  y2020
## 3321  y2020
## 3322  y2020
## 3323  y2020
## 3324  y2020
## 3325  y2020
## 3326  y2020
## 3327  y2020
## 3328  y2020
## 3329  y2020
## 3330  y2020
## 3331  y2020
## 3332  y2020
## 3333  y2020
## 3334  y2020
## 3335  y2020
## 3336  y2020
## 3337  y2020
## 3338  y2020
## 3339  y2020
## 3340  y2020
## 3341  y2020
## 3342  y2020
## 3343  y2020
## 3344  y2020
## 3345  y2020
## 3346  y2020
## 3347  y2020
## 3348  y2020
## 3349  y2020
## 3350  y2020
## 3351  y2020
## 3352  y2020
## 3353  y2020
## 3354  y2020
## 3355  y2020
## 3356  y2020
## 3357  y2020
## 3358  y2020
## 3359  y2020
## 3360  y2020
## 3361  y2020
## 3362  y2020
## 3363  y2020
## 3364  y2020
## 3365  y2020
## 3366  y2020
## 3367  y2020
## 3368  y2020
## 3369  y2020
## 3370  y2020
## 3371  y2020
## 3372  y2020
## 3373  y2020
## 3374  y2020
## 3375  y2020
## 3376  y2020
## 3377  y2020
## 3378  y2020
## 3379  y2020
## 3380  y2020
## 3381  y2020
## 3382  y2020
## 3383  y2020
## 3384  y2020
## 3385  y2020
## 3386  y2020
## 3387  y2020
## 3388  y2020
## 3389  y2020
## 3390  y2020
## 3391  y2020
## 3392  y2020
## 3393  y2020
## 3394  y2020
## 3395  y2020
## 3396  y2020
## 3397  y2020
## 3398  y2020
## 3399  y2020
## 3400  y2020
## 3401  y2020
## 3402  y2020
## 3403  y2020
## 3404  y2020
## 3405  y2020
## 3406  y2020
## 3407  y2020
## 3408  y2020
## 3409  y2020
## 3410  y2020
## 3411  y2020
## 3412  y2020
## 3413  y2020
## 3414  y2020
## 3415  y2020
## 3416  y2020
## 3417  y2020
## 3418  y2020
## 3419  y2020
## 3420  y2020
## 3421  y2020
## 3422  y2020
## 3423  y2020
## 3424  y2020
## 3425  y2020
## 3426  y2020
## 3427  y2020
## 3428  y2020
## 3429  y2020
## 3430  y2020
## 3431  y2020
## 3432  y2020
## 3433  y2021
## 3434  y2021
## 3435  y2021
## 3436  y2021
## 3437  y2021
## 3438  y2021
## 3439  y2021
## 3440  y2021
## 3441  y2021
## 3442  y2021
## 3443  y2021
## 3444  y2021
## 3445  y2021
## 3446  y2021
## 3447  y2021
## 3448  y2021
## 3449  y2021
## 3450  y2021
## 3451  y2021
## 3452  y2021
## 3453  y2021
## 3454  y2021
## 3455  y2021
## 3456  y2021
## 3457  y2021
## 3458  y2021
## 3459  y2021
## 3460  y2021
## 3461  y2021
## 3462  y2021
## 3463  y2021
## 3464  y2021
## 3465  y2021
## 3466  y2021
## 3467  y2021
## 3468  y2021
## 3469  y2021
## 3470  y2021
## 3471  y2021
## 3472  y2021
## 3473  y2021
## 3474  y2021
## 3475  y2021
## 3476  y2021
## 3477  y2021
## 3478  y2021
## 3479  y2021
## 3480  y2021
## 3481  y2021
## 3482  y2021
## 3483  y2021
## 3484  y2021
## 3485  y2021
## 3486  y2021
## 3487  y2021
## 3488  y2021
## 3489  y2021
## 3490  y2021
## 3491  y2021
## 3492  y2021
## 3493  y2021
## 3494  y2021
## 3495  y2021
## 3496  y2021
## 3497  y2021
## 3498  y2021
## 3499  y2021
## 3500  y2021
## 3501  y2021
## 3502  y2021
## 3503  y2021
## 3504  y2021
## 3505  y2021
## 3506  y2021
## 3507  y2021
## 3508  y2021
## 3509  y2021
## 3510  y2021
## 3511  y2021
## 3512  y2021
## 3513  y2021
## 3514  y2021
## 3515  y2021
## 3516  y2021
## 3517  y2021
## 3518  y2021
## 3519  y2021
## 3520  y2021
## 3521  y2021
## 3522  y2021
## 3523  y2021
## 3524  y2021
## 3525  y2021
## 3526  y2021
## 3527  y2021
## 3528  y2021
## 3529  y2021
## 3530  y2021
## 3531  y2021
## 3532  y2021
## 3533  y2021
## 3534  y2021
## 3535  y2021
## 3536  y2021
## 3537  y2021
## 3538  y2021
## 3539  y2021
## 3540  y2021
## 3541  y2021
## 3542  y2021
## 3543  y2021
## 3544  y2021
## 3545  y2021
## 3546  y2021
## 3547  y2021
## 3548  y2021
## 3549  y2021
## 3550  y2021
## 3551  y2021
## 3552  y2021
## 3553  y2021
## 3554  y2021
## 3555  y2021
## 3556  y2021
## 3557  y2021
## 3558  y2021
## 3559  y2021
## 3560  y2021
## 3561  y2021
## 3562  y2021
## 3563  y2021
## 3564  y2021
## 3565  y2021
## 3566  y2021
## 3567  y2021
## 3568  y2021
## 3569  y2021
## 3570  y2021
## 3571  y2021
## 3572  y2021
## 3573  y2021
## 3574  y2021
## 3575  y2021
## 3576  y2021
## 3577  y2021
## 3578  y2021
## 3579  y2021
## 3580  y2021
## 3581  y2021
## 3582  y2021
## 3583  y2021
## 3584  y2021
## 3585  y2021
## 3586  y2022
## 3587  y2022
## 3588  y2022
## 3589  y2022
## 3590  y2022
## 3591  y2022
## 3592  y2022
## 3593  y2022
## 3594  y2022
## 3595  y2022
## 3596  y2022
## 3597  y2022
## 3598  y2022
## 3599  y2022
## 3600  y2022
## 3601  y2022
## 3602  y2022
## 3603  y2022
## 3604  y2022
## 3605  y2022
## 3606  y2022
## 3607  y2022
## 3608  y2022
## 3609  y2022
## 3610  y2022
## 3611  y2022
## 3612  y2022
## 3613  y2022
## 3614  y2022
## 3615  y2022
## 3616  y2022
## 3617  y2022
## 3618  y2022
## 3619  y2022
## 3620  y2022
## 3621  y2022
## 3622  y2022
## 3623  y2022
## 3624  y2022
## 3625  y2022
## 3626  y2022
## 3627  y2022
## 3628  y2022
## 3629  y2022
## 3630  y2022
## 3631  y2022
## 3632  y2022
## 3633  y2022
## 3634  y2022
## 3635  y2022
## 3636  y2022
## 3637  y2022
## 3638  y2022
## 3639  y2022
## 3640  y2022
## 3641  y2022
## 3642  y2022
## 3643  y2022
## 3644  y2022
## 3645  y2022
## 3646  y2022
## 3647  y2022
## 3648  y2022
## 3649  y2022
## 3650  y2022
## 3651  y2022
## 3652  y2022
## 3653  y2022
## 3654  y2022
## 3655  y2022
## 3656  y2022
## 3657  y2022
## 3658  y2022
## 3659  y2022
## 3660  y2022
## 3661  y2022
## 3662  y2022
## 3663  y2022
## 3664  y2022
## 3665  y2022
## 3666  y2022
## 3667  y2022
## 3668  y2022
## 3669  y2022
## 3670  y2022
## 3671  y2022
## 3672  y2022
## 3673  y2022
## 3674  y2022
## 3675  y2022
## 3676  y2022
## 3677  y2022
## 3678  y2022
## 3679  y2022
## 3680  y2022
## 3681  y2022
## 3682  y2022
## 3683  y2022
## 3684  y2022
## 3685  y2022
## 3686  y2022
## 3687  y2022
## 3688  y2022
## 3689  y2022
## 3690  y2022
## 3691  y2022
## 3692  y2022
## 3693  y2022
## 3694  y2022
## 3695  y2022
## 3696  y2022
## 3697  y2022
## 3698  y2022
## 3699  y2022
## 3700  y2022
## 3701  y2022
## 3702  y2022
## 3703  y2022
## 3704  y2022
## 3705  y2022
## 3706  y2022
## 3707  y2022
## 3708  y2022
## 3709  y2022
## 3710  y2022
## 3711  y2022
## 3712  y2022
## 3713  y2022
## 3714  y2022
## 3715  y2022
## 3716  y2022
## 3717  y2022
## 3718  y2020
## 3719  y2020
## 3720  y2020
## 3721  y2020
## 3722  y2020
## 3723  y2020
## 3724  y2020
## 3725  y2020
## 3726  y2020
## 3727  y2020
## 3728  y2020
## 3729  y2020
## 3730  y2020
## 3731  y2020
## 3732  y2020
## 3733  y2020
## 3734  y2020
## 3735  y2020
## 3736  y2020
## 3737  y2020
## 3738  y2020
## 3739  y2020
## 3740  y2020
## 3741  y2020
## 3742  y2020
## 3743  y2020
## 3744  y2020
## 3745  y2020
## 3746  y2020
## 3747  y2020
## 3748  y2020
## 3749  y2020
## 3750  y2020
## 3751  y2020
## 3752  y2020
## 3753  y2020
## 3754  y2020
## 3755  y2020
## 3756  y2020
## 3757  y2020
## 3758  y2020
## 3759  y2020
## 3760  y2020
## 3761  y2020
## 3762  y2020
## 3763  y2020
## 3764  y2020
## 3765  y2020
## 3766  y2020
## 3767  y2020
## 3768  y2020
## 3769  y2020
## 3770  y2020
## 3771  y2020
## 3772  y2020
## 3773  y2020
## 3774  y2020
## 3775  y2020
## 3776  y2020
## 3777  y2020
## 3778  y2020
## 3779  y2020
## 3780  y2020
## 3781  y2020
## 3782  y2020
## 3783  y2020
## 3784  y2020
## 3785  y2020
## 3786  y2020
## 3787  y2020
## 3788  y2020
## 3789  y2020
## 3790  y2020
## 3791  y2020
## 3792  y2020
## 3793  y2020
## 3794  y2020
## 3795  y2020
## 3796  y2020
## 3797  y2020
## 3798  y2020
## 3799  y2020
## 3800  y2020
## 3801  y2020
## 3802  y2020
## 3803  y2020
## 3804  y2020
## 3805  y2020
## 3806  y2020
## 3807  y2020
## 3808  y2020
## 3809  y2020
## 3810  y2020
## 3811  y2020
## 3812  y2020
## 3813  y2020
## 3814  y2020
## 3815  y2020
## 3816  y2020
## 3817  y2020
## 3818  y2020
## 3819  y2020
## 3820  y2020
## 3821  y2020
## 3822  y2020
## 3823  y2020
## 3824  y2020
## 3825  y2020
## 3826  y2020
## 3827  y2020
## 3828  y2020
## 3829  y2020
## 3830  y2020
## 3831  y2020
## 3832  y2020
## 3833  y2020
## 3834  y2020
## 3835  y2020
## 3836  y2020
## 3837  y2020
## 3838  y2020
## 3839  y2020
## 3840  y2020
## 3841  y2020
## 3842  y2020
## 3843  y2020
## 3844  y2020
## 3845  y2020
## 3846  y2020
## 3847  y2020
## 3848  y2020
## 3849  y2020
## 3850  y2020
## 3851  y2020
## 3852  y2020
## 3853  y2020
## 3854  y2020
## 3855  y2020
## 3856  y2020
## 3857  y2020
## 3858  y2020
## 3859  y2020
## 3860  y2020
## 3861  y2020
## 3862  y2020
## 3863  y2020
## 3864  y2020
## 3865  y2020
## 3866  y2020
## 3867  y2020
## 3868  y2020
## 3869  y2020
## 3870  y2020
## 3871  y2020
## 3872  y2020
## 3873  y2020
## 3874  y2020
## 3875  y2020
## 3876  y2020
## 3877  y2020
## 3878  y2020
## 3879  y2020
## 3880  y2020
## 3881  y2020
## 3882  y2020
## 3883  y2020
## 3884  y2020
## 3885  y2020
## 3886  y2020
## 3887  y2020
## 3888  y2020
## 3889  y2020
## 3890  y2020
## 3891  y2020
## 3892  y2020
## 3893  y2020
## 3894  y2020
## 3895  y2020
## 3896  y2020
## 3897  y2020
## 3898  y2020
## 3899  y2020
## 3900  y2020
## 3901  y2020
## 3902  y2020
## 3903  y2020
## 3904  y2020
## 3905  y2020
## 3906  y2020
## 3907  y2020
## 3908  y2020
## 3909  y2020
## 3910  y2020
## 3911  y2020
## 3912  y2020
## 3913  y2020
## 3914  y2020
## 3915  y2020
## 3916  y2020
## 3917  y2020
## 3918  y2020
## 3919  y2020
## 3920  y2020
## 3921  y2020
## 3922  y2020
## 3923  y2020
## 3924  y2020
## 3925  y2020
## 3926  y2020
## 3927  y2020
## 3928  y2020
## 3929  y2020
## 3930  y2020
## 3931  y2020
## 3932  y2020
## 3933  y2020
## 3934  y2020
## 3935  y2020
## 3936  y2020
## 3937  y2020
## 3938  y2020
## 3939  y2020
## 3940  y2020
## 3941  y2020
## 3942  y2021
## 3943  y2021
## 3944  y2021
## 3945  y2021
## 3946  y2021
## 3947  y2021
## 3948  y2021
## 3949  y2021
## 3950  y2021
## 3951  y2021
## 3952  y2021
## 3953  y2021
## 3954  y2021
## 3955  y2021
## 3956  y2021
## 3957  y2021
## 3958  y2021
## 3959  y2021
## 3960  y2021
## 3961  y2021
## 3962  y2021
## 3963  y2021
## 3964  y2021
## 3965  y2021
## 3966  y2021
## 3967  y2021
## 3968  y2021
## 3969  y2021
## 3970  y2021
## 3971  y2021
## 3972  y2021
## 3973  y2021
## 3974  y2021
## 3975  y2021
## 3976  y2021
## 3977  y2021
## 3978  y2021
## 3979  y2021
## 3980  y2021
## 3981  y2021
## 3982  y2021
## 3983  y2021
## 3984  y2021
## 3985  y2021
## 3986  y2021
## 3987  y2021
## 3988  y2021
## 3989  y2021
## 3990  y2021
## 3991  y2021
## 3992  y2021
## 3993  y2021
## 3994  y2021
## 3995  y2021
## 3996  y2021
## 3997  y2021
## 3998  y2021
## 3999  y2021
## 4000  y2021
## 4001  y2021
## 4002  y2021
## 4003  y2021
## 4004  y2021
## 4005  y2021
## 4006  y2021
## 4007  y2021
## 4008  y2021
## 4009  y2021
## 4010  y2021
## 4011  y2021
## 4012  y2021
## 4013  y2021
## 4014  y2021
## 4015  y2021
## 4016  y2021
## 4017  y2021
## 4018  y2021
## 4019  y2021
## 4020  y2021
## 4021  y2021
## 4022  y2021
## 4023  y2021
## 4024  y2021
## 4025  y2021
## 4026  y2021
## 4027  y2021
## 4028  y2021
## 4029  y2021
## 4030  y2021
## 4031  y2021
## 4032  y2021
## 4033  y2021
## 4034  y2021
## 4035  y2021
## 4036  y2021
## 4037  y2021
## 4038  y2021
## 4039  y2021
## 4040  y2021
## 4041  y2021
## 4042  y2021
## 4043  y2021
## 4044  y2021
## 4045  y2021
## 4046  y2021
## 4047  y2021
## 4048  y2021
## 4049  y2021
## 4050  y2021
## 4051  y2021
## 4052  y2021
## 4053  y2021
## 4054  y2021
## 4055  y2021
## 4056  y2021
## 4057  y2021
## 4058  y2021
## 4059  y2021
## 4060  y2021
## 4061  y2021
## 4062  y2021
## 4063  y2021
## 4064  y2021
## 4065  y2021
## 4066  y2021
## 4067  y2021
## 4068  y2021
## 4069  y2021
## 4070  y2021
## 4071  y2021
## 4072  y2021
## 4073  y2021
## 4074  y2021
## 4075  y2021
## 4076  y2021
## 4077  y2021
## 4078  y2021
## 4079  y2021
## 4080  y2021
## 4081  y2021
## 4082  y2021
## 4083  y2021
## 4084  y2021
## 4085  y2021
## 4086  y2021
## 4087  y2021
## 4088  y2021
## 4089  y2021
## 4090  y2021
## 4091  y2021
## 4092  y2021
## 4093  y2021
## 4094  y2021
## 4095  y2021
## 4096  y2021
## 4097  y2021
## 4098  y2021
## 4099  y2021
## 4100  y2021
## 4101  y2021
## 4102  y2021
## 4103  y2021
## 4104  y2021
## 4105  y2021
## 4106  y2021
## 4107  y2021
## 4108  y2021
## 4109  y2021
## 4110  y2021
## 4111  y2021
## 4112  y2021
## 4113  y2021
## 4114  y2021
## 4115  y2021
## 4116  y2021
## 4117  y2021
## 4118  y2021
## 4119  y2021
## 4120  y2021
## 4121  y2021
## 4122  y2021
## 4123  y2021
## 4124  y2021
## 4125  y2021
## 4126  y2021
## 4127  y2021
## 4128  y2021
## 4129  y2022
## 4130  y2022
## 4131  y2022
## 4132  y2022
## 4133  y2022
## 4134  y2022
## 4135  y2022
## 4136  y2022
## 4137  y2022
## 4138  y2022
## 4139  y2022
## 4140  y2022
## 4141  y2022
## 4142  y2022
## 4143  y2022
## 4144  y2022
## 4145  y2022
## 4146  y2022
## 4147  y2022
## 4148  y2022
## 4149  y2022
## 4150  y2022
## 4151  y2022
## 4152  y2022
## 4153  y2022
## 4154  y2022
## 4155  y2022
## 4156  y2022
## 4157  y2022
## 4158  y2022
## 4159  y2022
## 4160  y2022
## 4161  y2022
## 4162  y2022
## 4163  y2022
## 4164  y2022
## 4165  y2022
## 4166  y2022
## 4167  y2022
## 4168  y2022
## 4169  y2022
## 4170  y2022
## 4171  y2022
## 4172  y2022
## 4173  y2022
## 4174  y2022
## 4175  y2022
## 4176  y2022
## 4177  y2022
## 4178  y2022
## 4179  y2022
## 4180  y2022
## 4181  y2022
## 4182  y2022
## 4183  y2022
## 4184  y2022
## 4185  y2022
## 4186  y2022
## 4187  y2022
## 4188  y2022
## 4189  y2022
## 4190  y2022
## 4191  y2022
## 4192  y2022
## 4193  y2022
## 4194  y2022
## 4195  y2022
## 4196  y2022
## 4197  y2022
## 4198  y2022
## 4199  y2022
## 4200  y2022
## 4201  y2022
## 4202  y2022
## 4203  y2022
## 4204  y2022
## 4205  y2022
## 4206  y2022
## 4207  y2022
## 4208  y2022
## 4209  y2022
## 4210  y2022
## 4211  y2022
## 4212  y2022
## 4213  y2022
## 4214  y2022
## 4215  y2022
## 4216  y2022
## 4217  y2022
## 4218  y2022
## 4219  y2022
## 4220  y2022
## 4221  y2022
## 4222  y2022
## 4223  y2022
## 4224  y2022
## 4225  y2022
## 4226  y2022
## 4227  y2022
## 4228  y2022
## 4229  y2022
## 4230  y2022
## 4231  y2022
## 4232  y2022
## 4233  y2022
## 4234  y2022
## 4235  y2022
## 4236  y2022
## 4237  y2022
## 4238  y2022
## 4239  y2022
## 4240  y2022
## 4241  y2022
## 4242  y2022
## 4243  y2022
## 4244  y2022
## 4245  y2022
## 4246  y2022
## 4247  y2022
## 4248  y2022
## 4249  y2022
## 4250  y2022
## 4251  y2022
## 4252  y2022
## 4253  y2022
## 4254  y2022
## 4255  y2022
## 4256  y2022
## 4257  y2022
## 4258  y2022
## 4259  y2022
## 4260  y2022
## 4261  y2022
## 4262  y2022
## 4263  y2022
## 4264  y2022
## 4265  y2022
## 4266  y2022
## 4267  y2022
## 4268  y2022
## 4269  y2022
## 4270  y2022
## 4271  y2022
## 4272  y2022
## 4273  y2022
## 4274  y2022
## 4275  y2022
## 4276  y2022
## 4277  y2022
## 4278  y2022
## 4279  y2022
## 4280  y2022
## 4281  y2022
## 4282  y2022
## 4283  y2022
## 4284  y2022
## 4285  y2022
## 4286  y2022
## 4287  y2022
## 4288  y2020
## 4289  y2020
## 4290  y2020
## 4291  y2020
## 4292  y2020
## 4293  y2020
## 4294  y2020
## 4295  y2020
## 4296  y2020
## 4297  y2020
## 4298  y2020
## 4299  y2020
## 4300  y2020
## 4301  y2020
## 4302  y2020
## 4303  y2020
## 4304  y2020
## 4305  y2020
## 4306  y2020
## 4307  y2020
## 4308  y2020
## 4309  y2020
## 4310  y2020
## 4311  y2020
## 4312  y2020
## 4313  y2020
## 4314  y2020
## 4315  y2020
## 4316  y2020
## 4317  y2020
## 4318  y2020
## 4319  y2020
## 4320  y2020
## 4321  y2020
## 4322  y2020
## 4323  y2020
## 4324  y2020
## 4325  y2020
## 4326  y2020
## 4327  y2020
## 4328  y2020
## 4329  y2020
## 4330  y2020
## 4331  y2020
## 4332  y2020
## 4333  y2020
## 4334  y2020
## 4335  y2020
## 4336  y2020
## 4337  y2020
## 4338  y2020
## 4339  y2020
## 4340  y2020
## 4341  y2020
## 4342  y2020
## 4343  y2020
## 4344  y2020
## 4345  y2020
## 4346  y2020
## 4347  y2020
## 4348  y2020
## 4349  y2020
## 4350  y2020
## 4351  y2020
## 4352  y2020
## 4353  y2020
## 4354  y2020
## 4355  y2020
## 4356  y2020
## 4357  y2020
## 4358  y2020
## 4359  y2020
## 4360  y2020
## 4361  y2020
## 4362  y2020
## 4363  y2020
## 4364  y2020
## 4365  y2020
## 4366  y2020
## 4367  y2020
## 4368  y2020
## 4369  y2020
## 4370  y2020
## 4371  y2020
## 4372  y2020
## 4373  y2020
## 4374  y2020
## 4375  y2020
## 4376  y2020
## 4377  y2020
## 4378  y2020
## 4379  y2020
## 4380  y2020
## 4381  y2020
## 4382  y2020
## 4383  y2020
## 4384  y2020
## 4385  y2020
## 4386  y2020
## 4387  y2020
## 4388  y2020
## 4389  y2020
## 4390  y2020
## 4391  y2020
## 4392  y2020
## 4393  y2020
## 4394  y2020
## 4395  y2020
## 4396  y2020
## 4397  y2020
## 4398  y2020
## 4399  y2020
## 4400  y2020
## 4401  y2020
## 4402  y2020
## 4403  y2020
## 4404  y2020
## 4405  y2020
## 4406  y2020
## 4407  y2020
## 4408  y2020
## 4409  y2020
## 4410  y2020
## 4411  y2020
## 4412  y2020
## 4413  y2020
## 4414  y2020
## 4415  y2020
## 4416  y2020
## 4417  y2020
## 4418  y2020
## 4419  y2020
## 4420  y2020
## 4421  y2020
## 4422  y2020
## 4423  y2020
## 4424  y2020
## 4425  y2020
## 4426  y2020
## 4427  y2020
## 4428  y2020
## 4429  y2020
## 4430  y2020
## 4431  y2020
## 4432  y2020
## 4433  y2020
## 4434  y2020
## 4435  y2020
## 4436  y2020
## 4437  y2020
## 4438  y2020
## 4439  y2020
## 4440  y2020
## 4441  y2020
## 4442  y2020
## 4443  y2020
## 4444  y2020
## 4445  y2020
## 4446  y2020
## 4447  y2020
## 4448  y2020
## 4449  y2020
## 4450  y2020
## 4451  y2020
## 4452  y2020
## 4453  y2020
## 4454  y2020
## 4455  y2020
## 4456  y2020
## 4457  y2020
## 4458  y2020
## 4459  y2020
## 4460  y2020
## 4461  y2020
## 4462  y2020
## 4463  y2020
## 4464  y2020
## 4465  y2020
## 4466  y2020
## 4467  y2020
## 4468  y2020
## 4469  y2020
## 4470  y2020
## 4471  y2020
## 4472  y2020
## 4473  y2020
## 4474  y2020
## 4475  y2020
## 4476  y2020
## 4477  y2020
## 4478  y2020
## 4479  y2020
## 4480  y2020
## 4481  y2020
## 4482  y2020
## 4483  y2020
## 4484  y2020
## 4485  y2020
## 4486  y2020
## 4487  y2020
## 4488  y2020
## 4489  y2020
## 4490  y2020
## 4491  y2020
## 4492  y2020
## 4493  y2020
## 4494  y2020
## 4495  y2020
## 4496  y2020
## 4497  y2020
## 4498  y2020
## 4499  y2020
## 4500  y2020
## 4501  y2020
## 4502  y2020
## 4503  y2020
## 4504  y2020
## 4505  y2020
## 4506  y2020
## 4507  y2020
## 4508  y2020
## 4509  y2020
## 4510  y2020
## 4511  y2020
## 4512  y2020
## 4513  y2020
## 4514  y2020
## 4515  y2020
## 4516  y2020
## 4517  y2020
## 4518  y2020
## 4519  y2020
## 4520  y2020
## 4521  y2020
## 4522  y2020
## 4523  y2020
## 4524  y2020
## 4525  y2020
## 4526  y2020
## 4527  y2020
## 4528  y2020
## 4529  y2020
## 4530  y2020
## 4531  y2020
## 4532  y2020
## 4533  y2020
## 4534  y2020
## 4535  y2020
## 4536  y2020
## 4537  y2020
## 4538  y2020
## 4539  y2020
## 4540  y2020
## 4541  y2020
## 4542  y2020
## 4543  y2021
## 4544  y2021
## 4545  y2021
## 4546  y2021
## 4547  y2021
## 4548  y2021
## 4549  y2021
## 4550  y2021
## 4551  y2021
## 4552  y2021
## 4553  y2021
## 4554  y2021
## 4555  y2021
## 4556  y2021
## 4557  y2021
## 4558  y2021
## 4559  y2021
## 4560  y2021
## 4561  y2021
## 4562  y2021
## 4563  y2021
## 4564  y2021
## 4565  y2021
## 4566  y2021
## 4567  y2021
## 4568  y2021
## 4569  y2021
## 4570  y2021
## 4571  y2021
## 4572  y2021
## 4573  y2021
## 4574  y2021
## 4575  y2021
## 4576  y2021
## 4577  y2021
## 4578  y2021
## 4579  y2021
## 4580  y2021
## 4581  y2021
## 4582  y2021
## 4583  y2021
## 4584  y2021
## 4585  y2021
## 4586  y2021
## 4587  y2021
## 4588  y2021
## 4589  y2021
## 4590  y2021
## 4591  y2021
## 4592  y2021
## 4593  y2021
## 4594  y2021
## 4595  y2021
## 4596  y2021
## 4597  y2021
## 4598  y2021
## 4599  y2021
## 4600  y2021
## 4601  y2021
## 4602  y2021
## 4603  y2021
## 4604  y2021
## 4605  y2021
## 4606  y2021
## 4607  y2021
## 4608  y2021
## 4609  y2021
## 4610  y2021
## 4611  y2021
## 4612  y2021
## 4613  y2021
## 4614  y2021
## 4615  y2021
## 4616  y2021
## 4617  y2021
## 4618  y2021
## 4619  y2021
## 4620  y2021
## 4621  y2021
## 4622  y2021
## 4623  y2021
## 4624  y2021
## 4625  y2021
## 4626  y2021
## 4627  y2021
## 4628  y2021
## 4629  y2021
## 4630  y2021
## 4631  y2021
## 4632  y2021
## 4633  y2021
## 4634  y2021
## 4635  y2021
## 4636  y2021
## 4637  y2021
## 4638  y2021
## 4639  y2021
## 4640  y2021
## 4641  y2021
## 4642  y2021
## 4643  y2021
## 4644  y2021
## 4645  y2021
## 4646  y2021
## 4647  y2021
## 4648  y2021
## 4649  y2021
## 4650  y2021
## 4651  y2021
## 4652  y2021
## 4653  y2021
## 4654  y2021
## 4655  y2021
## 4656  y2021
## 4657  y2021
## 4658  y2021
## 4659  y2021
## 4660  y2021
## 4661  y2021
## 4662  y2021
## 4663  y2021
## 4664  y2021
## 4665  y2021
## 4666  y2021
## 4667  y2021
## 4668  y2021
## 4669  y2021
## 4670  y2021
## 4671  y2021
## 4672  y2021
## 4673  y2021
## 4674  y2021
## 4675  y2021
## 4676  y2021
## 4677  y2021
## 4678  y2021
## 4679  y2021
## 4680  y2021
## 4681  y2021
## 4682  y2021
## 4683  y2021
## 4684  y2021
## 4685  y2021
## 4686  y2021
## 4687  y2021
## 4688  y2021
## 4689  y2021
## 4690  y2021
## 4691  y2021
## 4692  y2021
## 4693  y2021
## 4694  y2021
## 4695  y2021
## 4696  y2021
## 4697  y2021
## 4698  y2021
## 4699  y2021
## 4700  y2021
## 4701  y2021
## 4702  y2021
## 4703  y2021
## 4704  y2021
## 4705  y2021
## 4706  y2021
## 4707  y2021
## 4708  y2021
## 4709  y2021
## 4710  y2021
## 4711  y2021
## 4712  y2021
## 4713  y2021
## 4714  y2021
## 4715  y2021
## 4716  y2021
## 4717  y2021
## 4718  y2021
## 4719  y2021
## 4720  y2021
## 4721  y2021
## 4722  y2021
## 4723  y2021
## 4724  y2021
## 4725  y2021
## 4726  y2021
## 4727  y2021
## 4728  y2021
## 4729  y2021
## 4730  y2021
## 4731  y2021
## 4732  y2021
## 4733  y2021
## 4734  y2021
## 4735  y2021
## 4736  y2021
## 4737  y2021
## 4738  y2021
## 4739  y2021
## 4740  y2021
## 4741  y2021
## 4742  y2021
## 4743  y2021
## 4744  y2021
## 4745  y2021
## 4746  y2021
## 4747  y2021
## 4748  y2021
## 4749  y2021
## 4750  y2021
## 4751  y2021
## 4752  y2021
## 4753  y2021
## 4754  y2021
## 4755  y2021
## 4756  y2021
## 4757  y2021
## 4758  y2021
## 4759  y2021
## 4760  y2021
## 4761  y2021
## 4762  y2021
## 4763  y2021
## 4764  y2021
## 4765  y2021
## 4766  y2021
## 4767  y2021
## 4768  y2021
## 4769  y2021
## 4770  y2021
## 4771  y2021
## 4772  y2021
## 4773  y2021
## 4774  y2021
## 4775  y2021
## 4776  y2021
## 4777  y2021
## 4778  y2021
## 4779  y2021
## 4780  y2021
## 4781  y2021
## 4782  y2021
## 4783  y2021
## 4784  y2021
## 4785  y2021
## 4786  y2021
## 4787  y2021
## 4788  y2022
## 4789  y2022
## 4790  y2022
## 4791  y2022
## 4792  y2022
## 4793  y2022
## 4794  y2022
## 4795  y2022
## 4796  y2022
## 4797  y2022
## 4798  y2022
## 4799  y2022
## 4800  y2022
## 4801  y2022
## 4802  y2022
## 4803  y2022
## 4804  y2022
## 4805  y2022
## 4806  y2022
## 4807  y2022
## 4808  y2022
## 4809  y2022
## 4810  y2022
## 4811  y2022
## 4812  y2022
## 4813  y2022
## 4814  y2022
## 4815  y2022
## 4816  y2022
## 4817  y2022
## 4818  y2022
## 4819  y2022
## 4820  y2022
## 4821  y2022
## 4822  y2022
## 4823  y2022
## 4824  y2022
## 4825  y2022
## 4826  y2022
## 4827  y2022
## 4828  y2022
## 4829  y2022
## 4830  y2022
## 4831  y2022
## 4832  y2022
## 4833  y2022
## 4834  y2022
## 4835  y2022
## 4836  y2022
## 4837  y2022
## 4838  y2022
## 4839  y2022
## 4840  y2022
## 4841  y2022
## 4842  y2022
## 4843  y2022
## 4844  y2022
## 4845  y2022
## 4846  y2022
## 4847  y2022
## 4848  y2022
## 4849  y2022
## 4850  y2022
## 4851  y2022
## 4852  y2022
## 4853  y2022
## 4854  y2022
## 4855  y2022
## 4856  y2022
## 4857  y2022
## 4858  y2022
## 4859  y2022
## 4860  y2022
## 4861  y2022
## 4862  y2022
## 4863  y2022
## 4864  y2022
## 4865  y2022
## 4866  y2022
## 4867  y2022
## 4868  y2022
## 4869  y2022
## 4870  y2022
## 4871  y2022
## 4872  y2022
## 4873  y2022
## 4874  y2022
## 4875  y2022
## 4876  y2022
## 4877  y2022
## 4878  y2022
## 4879  y2022
## 4880  y2022
## 4881  y2022
## 4882  y2022
## 4883  y2022
## 4884  y2022
## 4885  y2022
## 4886  y2022
## 4887  y2022
## 4888  y2022
## 4889  y2022
## 4890  y2022
## 4891  y2022
## 4892  y2022
## 4893  y2022
## 4894  y2022
## 4895  y2022
## 4896  y2022
## 4897  y2022
## 4898  y2022
## 4899  y2022
## 4900  y2022
## 4901  y2022
## 4902  y2022
## 4903  y2022
## 4904  y2022
## 4905  y2022
## 4906  y2022
## 4907  y2022
## 4908  y2022
## 4909  y2022
## 4910  y2022
## 4911  y2022
## 4912  y2022
## 4913  y2022
## 4914  y2022
## 4915  y2022
## 4916  y2022
## 4917  y2022
## 4918  y2022
## 4919  y2022
## 4920  y2022
## 4921  y2022
## 4922  y2022
## 4923  y2022
## 4924  y2022
## 4925  y2022
## 4926  y2022
## 4927  y2022
## 4928  y2022
## 4929  y2022
## 4930  y2022
## 4931  y2022
## 4932  y2022
## 4933  y2022
## 4934  y2022
## 4935  y2022
## 4936  y2022
## 4937  y2022
## 4938  y2022
## 4939  y2022
## 4940  y2022
## 4941  y2022
## 4942  y2022
## 4943  y2022
## 4944  y2022
## 4945  y2022
## 4946  y2022
## 4947  y2022
## 4948  y2022
## 4949  y2022
## 4950  y2022
## 4951  y2022
## 4952  y2022
## 4953  y2022
## 4954  y2022
## 4955  y2022
## 4956  y2022
## 4957  y2022
## 4958  y2022
## 4959  y2022
## 4960  y2022
## 4961  y2022
## 4962  y2022
## 4963  y2022
## 4964  y2022
## 4965  y2022
## 4966  y2022
## 4967  y2022
## 4968  y2022
## 4969  y2022
## 4970  y2022
## 4971  y2022
## 4972  y2022
## 4973  y2022
## 4974  y2022
## 4975  y2022
## 4976  y2022
## 4977  y2022
## 4978  y2022
## 4979  y2022
## 4980  y2022
## 4981  y2022
## 4982  y2022
## 4983  y2022
## 4984  y2022
## 4985  y2022
## 4986  y2022
## 4987  y2022
## 4988  y2022
## 4989  y2022
## 4990  y2022
## 4991  y2022
## 4992  y2022
## 4993  y2022
## 4994  y2022
## 4995  y2022
## 4996  y2022
## 4997  y2022
## 4998  y2022
## 4999  y2022
## 5000  y2022
## 5001  y2022
## 5002  y2022
## 5003  y2022
## 5004  y2022
## 5005  y2022
## 5006  y2022
## 5007  y2022
## 5008  y2022
## 5009  y2022
## 5010  y2022
## 5011  y2022
## 5012  y2022
## 5013  y2022
## 5014  y2022
## 5015  y2022
## 5016  y2022
## 5017  y2022
## 5018  y2022
## 5019  y2022
## 5020  y2022
## 5021  y2022
## 5022  y2022
## 5023  y2022
## 5024  y2022
## 5025  y2022
## 5026  y2022
## 5027  y2022
## 5028  y2022
## 5029  y2022
## 5030  y2022
## 5031  y2022
## 5032  y2022
## 5033  y2022
## 5034  y2022
## 5035  y2022
## 5036  y2022
## 5037  y2022
## 5038  y2022
## 5039  y2022
## 5040  y2022
## 5041  y2022
## 5042  y2022
## 5043  y2022
## 5044  y2020
## 5045  y2020
## 5046  y2020
## 5047  y2020
## 5048  y2020
## 5049  y2020
## 5050  y2020
## 5051  y2020
## 5052  y2020
## 5053  y2020
## 5054  y2020
## 5055  y2020
## 5056  y2020
## 5057  y2020
## 5058  y2020
## 5059  y2020
## 5060  y2020
## 5061  y2020
## 5062  y2020
## 5063  y2020
## 5064  y2020
## 5065  y2020
## 5066  y2020
## 5067  y2020
## 5068  y2020
## 5069  y2020
## 5070  y2020
## 5071  y2020
## 5072  y2020
## 5073  y2020
## 5074  y2020
## 5075  y2020
## 5076  y2020
## 5077  y2020
## 5078  y2020
## 5079  y2020
## 5080  y2020
## 5081  y2020
## 5082  y2020
## 5083  y2020
## 5084  y2020
## 5085  y2020
## 5086  y2020
## 5087  y2020
## 5088  y2020
## 5089  y2020
## 5090  y2020
## 5091  y2020
## 5092  y2020
## 5093  y2020
## 5094  y2020
## 5095  y2020
## 5096  y2020
## 5097  y2020
## 5098  y2020
## 5099  y2020
## 5100  y2020
## 5101  y2020
## 5102  y2020
## 5103  y2020
## 5104  y2020
## 5105  y2020
## 5106  y2020
## 5107  y2020
## 5108  y2020
## 5109  y2020
## 5110  y2020
## 5111  y2020
## 5112  y2020
## 5113  y2020
## 5114  y2020
## 5115  y2020
## 5116  y2020
## 5117  y2020
## 5118  y2020
## 5119  y2020
## 5120  y2020
## 5121  y2020
## 5122  y2020
## 5123  y2020
## 5124  y2020
## 5125  y2020
## 5126  y2020
## 5127  y2020
## 5128  y2020
## 5129  y2020
## 5130  y2020
## 5131  y2020
## 5132  y2020
## 5133  y2020
## 5134  y2020
## 5135  y2020
## 5136  y2020
## 5137  y2020
## 5138  y2020
## 5139  y2020
## 5140  y2020
## 5141  y2020
## 5142  y2020
## 5143  y2020
## 5144  y2020
## 5145  y2020
## 5146  y2020
## 5147  y2020
## 5148  y2020
## 5149  y2020
## 5150  y2020
## 5151  y2020
## 5152  y2020
## 5153  y2020
## 5154  y2020
## 5155  y2020
## 5156  y2020
## 5157  y2020
## 5158  y2020
## 5159  y2020
## 5160  y2020
## 5161  y2020
## 5162  y2020
## 5163  y2020
## 5164  y2020
## 5165  y2020
## 5166  y2020
## 5167  y2020
## 5168  y2020
## 5169  y2020
## 5170  y2020
## 5171  y2020
## 5172  y2020
## 5173  y2020
## 5174  y2020
## 5175  y2020
## 5176  y2020
## 5177  y2020
## 5178  y2020
## 5179  y2020
## 5180  y2020
## 5181  y2020
## 5182  y2020
## 5183  y2020
## 5184  y2020
## 5185  y2020
## 5186  y2020
## 5187  y2020
## 5188  y2020
## 5189  y2020
## 5190  y2020
## 5191  y2020
## 5192  y2020
## 5193  y2020
## 5194  y2020
## 5195  y2020
## 5196  y2020
## 5197  y2020
## 5198  y2020
## 5199  y2020
## 5200  y2020
## 5201  y2020
## 5202  y2020
## 5203  y2020
## 5204  y2020
## 5205  y2020
## 5206  y2020
## 5207  y2020
## 5208  y2020
## 5209  y2020
## 5210  y2020
## 5211  y2020
## 5212  y2020
## 5213  y2020
## 5214  y2020
## 5215  y2020
## 5216  y2020
## 5217  y2020
## 5218  y2020
## 5219  y2020
## 5220  y2020
## 5221  y2020
## 5222  y2020
## 5223  y2020
## 5224  y2020
## 5225  y2020
## 5226  y2020
## 5227  y2020
## 5228  y2020
## 5229  y2020
## 5230  y2020
## 5231  y2020
## 5232  y2020
## 5233  y2020
## 5234  y2020
## 5235  y2020
## 5236  y2020
## 5237  y2020
## 5238  y2020
## 5239  y2020
## 5240  y2020
## 5241  y2020
## 5242  y2020
## 5243  y2020
## 5244  y2020
## 5245  y2020
## 5246  y2020
## 5247  y2020
## 5248  y2020
## 5249  y2020
## 5250  y2020
## 5251  y2020
## 5252  y2020
## 5253  y2020
## 5254  y2020
## 5255  y2020
## 5256  y2020
## 5257  y2020
## 5258  y2020
## 5259  y2020
## 5260  y2020
## 5261  y2020
## 5262  y2020
## 5263  y2020
## 5264  y2020
## 5265  y2020
## 5266  y2020
## 5267  y2020
## 5268  y2020
## 5269  y2020
## 5270  y2020
## 5271  y2020
## 5272  y2020
## 5273  y2020
## 5274  y2020
## 5275  y2020
## 5276  y2020
## 5277  y2020
## 5278  y2020
## 5279  y2020
## 5280  y2020
## 5281  y2020
## 5282  y2020
## 5283  y2020
## 5284  y2020
## 5285  y2020
## 5286  y2020
## 5287  y2020
## 5288  y2020
## 5289  y2020
## 5290  y2020
## 5291  y2020
## 5292  y2020
## 5293  y2020
## 5294  y2020
## 5295  y2020
## 5296  y2020
## 5297  y2020
## 5298  y2020
## 5299  y2020
## 5300  y2020
## 5301  y2020
## 5302  y2020
## 5303  y2020
## 5304  y2020
## 5305  y2020
## 5306  y2020
## 5307  y2020
## 5308  y2020
## 5309  y2020
## 5310  y2020
## 5311  y2020
## 5312  y2020
## 5313  y2020
## 5314  y2020
## 5315  y2020
## 5316  y2020
## 5317  y2020
## 5318  y2020
## 5319  y2020
## 5320  y2020
## 5321  y2020
## 5322  y2020
## 5323  y2020
## 5324  y2020
## 5325  y2020
## 5326  y2020
## 5327  y2020
## 5328  y2020
## 5329  y2020
## 5330  y2020
## 5331  y2020
## 5332  y2020
## 5333  y2020
## 5334  y2020
## 5335  y2020
## 5336  y2020
## 5337  y2020
## 5338  y2020
## 5339  y2020
## 5340  y2020
## 5341  y2020
## 5342  y2020
## 5343  y2020
## 5344  y2020
## 5345  y2020
## 5346  y2020
## 5347  y2020
## 5348  y2020
## 5349  y2020
## 5350  y2020
## 5351  y2020
## 5352  y2020
## 5353  y2020
## 5354  y2020
## 5355  y2020
## 5356  y2020
## 5357  y2020
## 5358  y2020
## 5359  y2020
## 5360  y2020
## 5361  y2020
## 5362  y2020
## 5363  y2020
## 5364  y2020
## 5365  y2020
## 5366  y2020
## 5367  y2020
## 5368  y2020
## 5369  y2020
## 5370  y2020
## 5371  y2020
## 5372  y2020
## 5373  y2020
## 5374  y2020
## 5375  y2020
## 5376  y2020
## 5377  y2020
## 5378  y2020
## 5379  y2020
## 5380  y2020
## 5381  y2020
## 5382  y2020
## 5383  y2020
## 5384  y2020
## 5385  y2020
## 5386  y2020
## 5387  y2020
## 5388  y2020
## 5389  y2020
## 5390  y2020
## 5391  y2020
## 5392  y2020
## 5393  y2020
## 5394  y2020
## 5395  y2020
## 5396  y2020
## 5397  y2020
## 5398  y2020
## 5399  y2020
## 5400  y2020
## 5401  y2020
## 5402  y2020
## 5403  y2020
## 5404  y2020
## 5405  y2020
## 5406  y2020
## 5407  y2020
## 5408  y2020
## 5409  y2020
## 5410  y2020
## 5411  y2020
## 5412  y2020
## 5413  y2020
## 5414  y2020
## 5415  y2020
## 5416  y2020
## 5417  y2020
## 5418  y2020
## 5419  y2021
## 5420  y2021
## 5421  y2021
## 5422  y2021
## 5423  y2021
## 5424  y2021
## 5425  y2021
## 5426  y2021
## 5427  y2021
## 5428  y2021
## 5429  y2021
## 5430  y2021
## 5431  y2021
## 5432  y2021
## 5433  y2021
## 5434  y2021
## 5435  y2021
## 5436  y2021
## 5437  y2021
## 5438  y2021
## 5439  y2021
## 5440  y2021
## 5441  y2021
## 5442  y2021
## 5443  y2021
## 5444  y2021
## 5445  y2021
## 5446  y2021
## 5447  y2021
## 5448  y2021
## 5449  y2021
## 5450  y2021
## 5451  y2021
## 5452  y2021
## 5453  y2021
## 5454  y2021
## 5455  y2021
## 5456  y2021
## 5457  y2021
## 5458  y2021
## 5459  y2021
## 5460  y2021
## 5461  y2021
## 5462  y2021
## 5463  y2021
## 5464  y2021
## 5465  y2021
## 5466  y2021
## 5467  y2021
## 5468  y2021
## 5469  y2021
## 5470  y2021
## 5471  y2021
## 5472  y2021
## 5473  y2021
## 5474  y2021
## 5475  y2021
## 5476  y2021
## 5477  y2021
## 5478  y2021
## 5479  y2021
## 5480  y2021
## 5481  y2021
## 5482  y2021
## 5483  y2021
## 5484  y2021
## 5485  y2021
## 5486  y2021
## 5487  y2021
## 5488  y2021
## 5489  y2021
## 5490  y2021
## 5491  y2021
## 5492  y2021
## 5493  y2021
## 5494  y2021
## 5495  y2021
## 5496  y2021
## 5497  y2021
## 5498  y2021
## 5499  y2021
## 5500  y2021
## 5501  y2021
## 5502  y2021
## 5503  y2021
## 5504  y2021
## 5505  y2021
## 5506  y2021
## 5507  y2021
## 5508  y2021
## 5509  y2021
## 5510  y2021
## 5511  y2021
## 5512  y2021
## 5513  y2021
## 5514  y2021
## 5515  y2021
## 5516  y2021
## 5517  y2021
## 5518  y2021
## 5519  y2021
## 5520  y2021
## 5521  y2021
## 5522  y2021
## 5523  y2021
## 5524  y2021
## 5525  y2021
## 5526  y2021
## 5527  y2021
## 5528  y2021
## 5529  y2021
## 5530  y2021
## 5531  y2021
## 5532  y2021
## 5533  y2021
## 5534  y2021
## 5535  y2021
## 5536  y2021
## 5537  y2021
## 5538  y2021
## 5539  y2021
## 5540  y2021
## 5541  y2021
## 5542  y2021
## 5543  y2021
## 5544  y2021
## 5545  y2021
## 5546  y2021
## 5547  y2021
## 5548  y2021
## 5549  y2021
## 5550  y2021
## 5551  y2021
## 5552  y2021
## 5553  y2021
## 5554  y2021
## 5555  y2021
## 5556  y2021
## 5557  y2021
## 5558  y2021
## 5559  y2021
## 5560  y2021
## 5561  y2021
## 5562  y2021
## 5563  y2021
## 5564  y2021
## 5565  y2021
## 5566  y2021
## 5567  y2021
## 5568  y2021
## 5569  y2021
## 5570  y2021
## 5571  y2021
## 5572  y2021
## 5573  y2021
## 5574  y2021
## 5575  y2021
## 5576  y2021
## 5577  y2021
## 5578  y2021
## 5579  y2021
## 5580  y2021
## 5581  y2021
## 5582  y2021
## 5583  y2021
## 5584  y2021
## 5585  y2021
## 5586  y2021
## 5587  y2021
## 5588  y2021
## 5589  y2021
## 5590  y2021
## 5591  y2021
## 5592  y2021
## 5593  y2021
## 5594  y2021
## 5595  y2021
## 5596  y2021
## 5597  y2021
## 5598  y2021
## 5599  y2021
## 5600  y2021
## 5601  y2021
## 5602  y2021
## 5603  y2021
## 5604  y2021
## 5605  y2021
## 5606  y2021
## 5607  y2021
## 5608  y2021
## 5609  y2021
## 5610  y2021
## 5611  y2021
## 5612  y2021
## 5613  y2021
## 5614  y2021
## 5615  y2021
## 5616  y2021
## 5617  y2021
## 5618  y2021
## 5619  y2021
## 5620  y2021
## 5621  y2021
## 5622  y2021
## 5623  y2021
## 5624  y2021
## 5625  y2021
## 5626  y2021
## 5627  y2021
## 5628  y2021
## 5629  y2021
## 5630  y2021
## 5631  y2021
## 5632  y2021
## 5633  y2021
## 5634  y2021
## 5635  y2021
## 5636  y2021
## 5637  y2021
## 5638  y2021
## 5639  y2021
## 5640  y2021
## 5641  y2021
## 5642  y2021
## 5643  y2021
## 5644  y2021
## 5645  y2021
## 5646  y2021
## 5647  y2021
## 5648  y2021
## 5649  y2021
## 5650  y2021
## 5651  y2021
## 5652  y2021
## 5653  y2021
## 5654  y2021
## 5655  y2021
## 5656  y2021
## 5657  y2021
## 5658  y2021
## 5659  y2021
## 5660  y2021
## 5661  y2021
## 5662  y2021
## 5663  y2021
## 5664  y2021
## 5665  y2021
## 5666  y2021
## 5667  y2021
## 5668  y2021
## 5669  y2021
## 5670  y2021
## 5671  y2021
## 5672  y2021
## 5673  y2021
## 5674  y2021
## 5675  y2021
## 5676  y2021
## 5677  y2021
## 5678  y2021
## 5679  y2021
## 5680  y2021
## 5681  y2021
## 5682  y2021
## 5683  y2021
## 5684  y2021
## 5685  y2021
## 5686  y2021
## 5687  y2021
## 5688  y2021
## 5689  y2021
## 5690  y2021
## 5691  y2021
## 5692  y2021
## 5693  y2021
## 5694  y2021
## 5695  y2021
## 5696  y2021
## 5697  y2021
## 5698  y2021
## 5699  y2021
## 5700  y2021
## 5701  y2021
## 5702  y2021
## 5703  y2021
## 5704  y2021
## 5705  y2021
## 5706  y2021
## 5707  y2021
## 5708  y2021
## 5709  y2021
## 5710  y2021
## 5711  y2021
## 5712  y2021
## 5713  y2021
## 5714  y2021
## 5715  y2021
## 5716  y2021
## 5717  y2021
## 5718  y2021
## 5719  y2021
## 5720  y2021
## 5721  y2021
## 5722  y2021
## 5723  y2021
## 5724  y2021
## 5725  y2021
## 5726  y2021
## 5727  y2021
## 5728  y2021
## 5729  y2021
## 5730  y2021
## 5731  y2021
## 5732  y2021
## 5733  y2021
## 5734  y2021
## 5735  y2021
## 5736  y2021
## 5737  y2021
## 5738  y2021
## 5739  y2021
## 5740  y2021
## 5741  y2021
## 5742  y2021
## 5743  y2021
## 5744  y2021
## 5745  y2021
## 5746  y2021
## 5747  y2021
## 5748  y2021
## 5749  y2021
## 5750  y2021
## 5751  y2021
## 5752  y2021
## 5753  y2021
## 5754  y2021
## 5755  y2021
## 5756  y2021
## 5757  y2021
## 5758  y2021
## 5759  y2021
## 5760  y2021
## 5761  y2021
## 5762  y2021
## 5763  y2021
## 5764  y2021
## 5765  y2021
## 5766  y2021
## 5767  y2021
## 5768  y2021
## 5769  y2021
## 5770  y2021
## 5771  y2021
## 5772  y2021
## 5773  y2021
## 5774  y2021
## 5775  y2021
## 5776  y2021
## 5777  y2021
## 5778  y2021
## 5779  y2021
## 5780  y2021
## 5781  y2021
## 5782  y2021
## 5783  y2021
## 5784  y2021
## 5785  y2021
## 5786  y2021
## 5787  y2021
## 5788  y2021
## 5789  y2021
## 5790  y2021
## 5791  y2021
## 5792  y2021
## 5793  y2021
## 5794  y2021
## 5795  y2021
## 5796  y2021
## 5797  y2021
## 5798  y2021
## 5799  y2021
## 5800  y2021
## 5801  y2021
## 5802  y2021
## 5803  y2021
## 5804  y2021
## 5805  y2021
## 5806  y2021
## 5807  y2021
## 5808  y2021
## 5809  y2021
## 5810  y2021
## 5811  y2021
## 5812  y2021
## 5813  y2021
## 5814  y2021
## 5815  y2021
## 5816  y2021
## 5817  y2021
## 5818  y2021
## 5819  y2021
## 5820  y2021
## 5821  y2021
## 5822  y2021
## 5823  y2021
## 5824  y2021
## 5825  y2021
## 5826  y2022
## 5827  y2022
## 5828  y2022
## 5829  y2022
## 5830  y2022
## 5831  y2022
## 5832  y2022
## 5833  y2022
## 5834  y2022
## 5835  y2022
## 5836  y2022
## 5837  y2022
## 5838  y2022
## 5839  y2022
## 5840  y2022
## 5841  y2022
## 5842  y2022
## 5843  y2022
## 5844  y2022
## 5845  y2022
## 5846  y2022
## 5847  y2022
## 5848  y2022
## 5849  y2022
## 5850  y2022
## 5851  y2022
## 5852  y2022
## 5853  y2022
## 5854  y2022
## 5855  y2022
## 5856  y2022
## 5857  y2022
## 5858  y2022
## 5859  y2022
## 5860  y2022
## 5861  y2022
## 5862  y2022
## 5863  y2022
## 5864  y2022
## 5865  y2022
## 5866  y2022
## 5867  y2022
## 5868  y2022
## 5869  y2022
## 5870  y2022
## 5871  y2022
## 5872  y2022
## 5873  y2022
## 5874  y2022
## 5875  y2022
## 5876  y2022
## 5877  y2022
## 5878  y2022
## 5879  y2022
## 5880  y2022
## 5881  y2022
## 5882  y2022
## 5883  y2022
## 5884  y2022
## 5885  y2022
## 5886  y2022
## 5887  y2022
## 5888  y2022
## 5889  y2022
## 5890  y2022
## 5891  y2022
## 5892  y2022
## 5893  y2022
## 5894  y2022
## 5895  y2022
## 5896  y2022
## 5897  y2022
## 5898  y2022
## 5899  y2022
## 5900  y2022
## 5901  y2022
## 5902  y2022
## 5903  y2022
## 5904  y2022
## 5905  y2022
## 5906  y2022
## 5907  y2022
## 5908  y2022
## 5909  y2022
## 5910  y2022
## 5911  y2022
## 5912  y2022
## 5913  y2022
## 5914  y2022
## 5915  y2022
## 5916  y2022
## 5917  y2022
## 5918  y2022
## 5919  y2022
## 5920  y2022
## 5921  y2022
## 5922  y2022
## 5923  y2022
## 5924  y2022
## 5925  y2022
## 5926  y2022
## 5927  y2022
## 5928  y2022
## 5929  y2022
## 5930  y2022
## 5931  y2022
## 5932  y2022
## 5933  y2022
## 5934  y2022
## 5935  y2022
## 5936  y2022
## 5937  y2022
## 5938  y2022
## 5939  y2022
## 5940  y2022
## 5941  y2022
## 5942  y2022
## 5943  y2022
## 5944  y2022
## 5945  y2022
## 5946  y2022
## 5947  y2022
## 5948  y2022
## 5949  y2022
## 5950  y2022
## 5951  y2022
## 5952  y2022
## 5953  y2022
## 5954  y2022
## 5955  y2022
## 5956  y2022
## 5957  y2022
## 5958  y2022
## 5959  y2022
## 5960  y2022
## 5961  y2022
## 5962  y2022
## 5963  y2022
## 5964  y2022
## 5965  y2022
## 5966  y2022
## 5967  y2022
## 5968  y2022
## 5969  y2022
## 5970  y2022
## 5971  y2022
## 5972  y2022
## 5973  y2022
## 5974  y2022
## 5975  y2022
## 5976  y2022
## 5977  y2022
## 5978  y2022
## 5979  y2022
## 5980  y2022
## 5981  y2022
## 5982  y2022
## 5983  y2022
## 5984  y2022
## 5985  y2022
## 5986  y2022
## 5987  y2022
## 5988  y2022
## 5989  y2022
## 5990  y2022
## 5991  y2022
## 5992  y2022
## 5993  y2022
## 5994  y2022
## 5995  y2022
## 5996  y2022
## 5997  y2022
## 5998  y2022
## 5999  y2022
## 6000  y2022
## 6001  y2022
## 6002  y2022
## 6003  y2022
## 6004  y2022
## 6005  y2022
## 6006  y2022
## 6007  y2022
## 6008  y2022
## 6009  y2022
## 6010  y2022
## 6011  y2022
## 6012  y2022
## 6013  y2022
## 6014  y2022
## 6015  y2022
## 6016  y2022
## 6017  y2022
## 6018  y2022
## 6019  y2022
## 6020  y2022
## 6021  y2022
## 6022  y2022
## 6023  y2022
## 6024  y2022
## 6025  y2022
## 6026  y2022
## 6027  y2022
## 6028  y2022
## 6029  y2022
## 6030  y2022
## 6031  y2022
## 6032  y2022
## 6033  y2022
## 6034  y2022
## 6035  y2022
## 6036  y2022
## 6037  y2022
## 6038  y2022
## 6039  y2022
## 6040  y2022
## 6041  y2022
## 6042  y2022
## 6043  y2022
## 6044  y2022
## 6045  y2022
## 6046  y2022
## 6047  y2022
## 6048  y2022
## 6049  y2022
## 6050  y2022
## 6051  y2022
## 6052  y2022
## 6053  y2022
## 6054  y2022
## 6055  y2022
## 6056  y2022
## 6057  y2022
## 6058  y2022
## 6059  y2022
## 6060  y2022
## 6061  y2022
## 6062  y2022
## 6063  y2022
## 6064  y2022
## 6065  y2022
## 6066  y2022
## 6067  y2022
## 6068  y2022
## 6069  y2022
## 6070  y2022
## 6071  y2022
## 6072  y2022
## 6073  y2022
## 6074  y2022
## 6075  y2022
## 6076  y2022
## 6077  y2022
## 6078  y2022
## 6079  y2022
## 6080  y2022
## 6081  y2022
## 6082  y2022
## 6083  y2022
## 6084  y2022
## 6085  y2022
## 6086  y2022
## 6087  y2022
## 6088  y2022
## 6089  y2022
## 6090  y2022
## 6091  y2022
## 6092  y2022
## 6093  y2022
## 6094  y2022
## 6095  y2022
## 6096  y2022
## 6097  y2022
## 6098  y2022
## 6099  y2022
## 6100  y2022
## 6101  y2022
## 6102  y2022
## 6103  y2022
## 6104  y2022
## 6105  y2022
## 6106  y2022
## 6107  y2022
## 6108  y2022
## 6109  y2022
## 6110  y2022
## 6111  y2022
## 6112  y2022
## 6113  y2022
## 6114  y2022
## 6115  y2022
## 6116  y2022
## 6117  y2022
## 6118  y2022
## 6119  y2022
## 6120  y2022
## 6121  y2022
## 6122  y2022
## 6123  y2022
## 6124  y2022
## 6125  y2022
## 6126  y2022
## 6127  y2022
## 6128  y2022
## 6129  y2022
## 6130  y2022
## 6131  y2022
## 6132  y2022
## 6133  y2022
## 6134  y2022
## 6135  y2022
## 6136  y2022
## 6137  y2022
## 6138  y2022
## 6139  y2022
## 6140  y2022
## 6141  y2022
## 6142  y2022
## 6143  y2020
## 6144  y2020
## 6145  y2020
## 6146  y2020
## 6147  y2020
## 6148  y2020
## 6149  y2020
## 6150  y2020
## 6151  y2020
## 6152  y2020
## 6153  y2020
## 6154  y2020
## 6155  y2020
## 6156  y2020
## 6157  y2020
## 6158  y2020
## 6159  y2020
## 6160  y2020
## 6161  y2020
## 6162  y2020
## 6163  y2020
## 6164  y2020
## 6165  y2020
## 6166  y2020
## 6167  y2020
## 6168  y2020
## 6169  y2020
## 6170  y2020
## 6171  y2020
## 6172  y2020
## 6173  y2020
## 6174  y2020
## 6175  y2020
## 6176  y2020
## 6177  y2020
## 6178  y2020
## 6179  y2020
## 6180  y2020
## 6181  y2020
## 6182  y2020
## 6183  y2020
## 6184  y2020
## 6185  y2020
## 6186  y2020
## 6187  y2020
## 6188  y2020
## 6189  y2020
## 6190  y2020
## 6191  y2020
## 6192  y2020
## 6193  y2020
## 6194  y2020
## 6195  y2020
## 6196  y2020
## 6197  y2020
## 6198  y2020
## 6199  y2020
## 6200  y2020
## 6201  y2020
## 6202  y2020
## 6203  y2020
## 6204  y2020
## 6205  y2020
## 6206  y2020
## 6207  y2020
## 6208  y2020
## 6209  y2020
## 6210  y2020
## 6211  y2020
## 6212  y2020
## 6213  y2020
## 6214  y2020
## 6215  y2020
## 6216  y2020
## 6217  y2020
## 6218  y2020
## 6219  y2020
## 6220  y2020
## 6221  y2020
## 6222  y2020
## 6223  y2020
## 6224  y2020
## 6225  y2020
## 6226  y2020
## 6227  y2020
## 6228  y2020
## 6229  y2020
## 6230  y2020
## 6231  y2020
## 6232  y2020
## 6233  y2020
## 6234  y2020
## 6235  y2020
## 6236  y2020
## 6237  y2020
## 6238  y2020
## 6239  y2020
## 6240  y2020
## 6241  y2020
## 6242  y2020
## 6243  y2020
## 6244  y2020
## 6245  y2020
## 6246  y2020
## 6247  y2020
## 6248  y2020
## 6249  y2020
## 6250  y2020
## 6251  y2020
## 6252  y2020
## 6253  y2020
## 6254  y2020
## 6255  y2020
## 6256  y2020
## 6257  y2020
## 6258  y2020
## 6259  y2020
## 6260  y2020
## 6261  y2020
## 6262  y2020
## 6263  y2020
## 6264  y2020
## 6265  y2020
## 6266  y2020
## 6267  y2020
## 6268  y2020
## 6269  y2020
## 6270  y2020
## 6271  y2020
## 6272  y2020
## 6273  y2020
## 6274  y2020
## 6275  y2020
## 6276  y2020
## 6277  y2020
## 6278  y2020
## 6279  y2020
## 6280  y2020
## 6281  y2020
## 6282  y2020
## 6283  y2020
## 6284  y2020
## 6285  y2020
## 6286  y2020
## 6287  y2020
## 6288  y2020
## 6289  y2020
## 6290  y2020
## 6291  y2020
## 6292  y2020
## 6293  y2020
## 6294  y2020
## 6295  y2020
## 6296  y2020
## 6297  y2020
## 6298  y2020
## 6299  y2020
## 6300  y2020
## 6301  y2020
## 6302  y2020
## 6303  y2020
## 6304  y2020
## 6305  y2020
## 6306  y2020
## 6307  y2020
## 6308  y2020
## 6309  y2020
## 6310  y2020
## 6311  y2020
## 6312  y2020
## 6313  y2020
## 6314  y2020
## 6315  y2020
## 6316  y2020
## 6317  y2020
## 6318  y2020
## 6319  y2020
## 6320  y2020
## 6321  y2020
## 6322  y2020
## 6323  y2020
## 6324  y2020
## 6325  y2020
## 6326  y2020
## 6327  y2020
## 6328  y2020
## 6329  y2020
## 6330  y2020
## 6331  y2020
## 6332  y2020
## 6333  y2020
## 6334  y2020
## 6335  y2020
## 6336  y2020
## 6337  y2020
## 6338  y2020
## 6339  y2020
## 6340  y2020
## 6341  y2020
## 6342  y2020
## 6343  y2020
## 6344  y2020
## 6345  y2020
## 6346  y2020
## 6347  y2020
## 6348  y2020
## 6349  y2020
## 6350  y2020
## 6351  y2020
## 6352  y2020
## 6353  y2020
## 6354  y2020
## 6355  y2020
## 6356  y2020
## 6357  y2020
## 6358  y2020
## 6359  y2020
## 6360  y2020
## 6361  y2020
## 6362  y2020
## 6363  y2020
## 6364  y2020
## 6365  y2020
## 6366  y2020
## 6367  y2020
## 6368  y2020
## 6369  y2020
## 6370  y2020
## 6371  y2020
## 6372  y2020
## 6373  y2020
## 6374  y2020
## 6375  y2020
## 6376  y2020
## 6377  y2020
## 6378  y2020
## 6379  y2020
## 6380  y2020
## 6381  y2020
## 6382  y2020
## 6383  y2020
## 6384  y2020
## 6385  y2020
## 6386  y2020
## 6387  y2020
## 6388  y2020
## 6389  y2020
## 6390  y2020
## 6391  y2020
## 6392  y2020
## 6393  y2020
## 6394  y2020
## 6395  y2020
## 6396  y2020
## 6397  y2020
## 6398  y2020
## 6399  y2020
## 6400  y2020
## 6401  y2020
## 6402  y2020
## 6403  y2020
## 6404  y2020
## 6405  y2020
## 6406  y2020
## 6407  y2020
## 6408  y2020
## 6409  y2020
## 6410  y2020
## 6411  y2020
## 6412  y2020
## 6413  y2020
## 6414  y2020
## 6415  y2020
## 6416  y2020
## 6417  y2020
## 6418  y2020
## 6419  y2020
## 6420  y2020
## 6421  y2020
## 6422  y2020
## 6423  y2020
## 6424  y2020
## 6425  y2020
## 6426  y2020
## 6427  y2020
## 6428  y2020
## 6429  y2020
## 6430  y2020
## 6431  y2020
## 6432  y2020
## 6433  y2020
## 6434  y2020
## 6435  y2020
## 6436  y2020
## 6437  y2020
## 6438  y2020
## 6439  y2020
## 6440  y2020
## 6441  y2020
## 6442  y2020
## 6443  y2020
## 6444  y2020
## 6445  y2020
## 6446  y2020
## 6447  y2020
## 6448  y2020
## 6449  y2020
## 6450  y2020
## 6451  y2020
## 6452  y2020
## 6453  y2020
## 6454  y2020
## 6455  y2020
## 6456  y2020
## 6457  y2020
## 6458  y2020
## 6459  y2020
## 6460  y2020
## 6461  y2020
## 6462  y2020
## 6463  y2020
## 6464  y2020
## 6465  y2020
## 6466  y2020
## 6467  y2020
## 6468  y2020
## 6469  y2020
## 6470  y2020
## 6471  y2020
## 6472  y2020
## 6473  y2020
## 6474  y2020
## 6475  y2020
## 6476  y2020
## 6477  y2020
## 6478  y2020
## 6479  y2020
## 6480  y2020
## 6481  y2020
## 6482  y2020
## 6483  y2020
## 6484  y2020
## 6485  y2020
## 6486  y2020
## 6487  y2020
## 6488  y2020
## 6489  y2020
## 6490  y2020
## 6491  y2020
## 6492  y2020
## 6493  y2020
## 6494  y2020
## 6495  y2020
## 6496  y2020
## 6497  y2020
## 6498  y2020
## 6499  y2020
## 6500  y2020
## 6501  y2020
## 6502  y2020
## 6503  y2020
## 6504  y2020
## 6505  y2020
## 6506  y2020
## 6507  y2020
## 6508  y2020
## 6509  y2020
## 6510  y2020
## 6511  y2020
## 6512  y2020
## 6513  y2020
## 6514  y2020
## 6515  y2020
## 6516  y2020
## 6517  y2020
## 6518  y2020
## 6519  y2020
## 6520  y2020
## 6521  y2020
## 6522  y2020
## 6523  y2020
## 6524  y2020
## 6525  y2020
## 6526  y2020
## 6527  y2020
## 6528  y2020
## 6529  y2020
## 6530  y2020
## 6531  y2020
## 6532  y2020
## 6533  y2020
## 6534  y2020
## 6535  y2020
## 6536  y2020
## 6537  y2020
## 6538  y2020
## 6539  y2020
## 6540  y2020
## 6541  y2020
## 6542  y2020
## 6543  y2020
## 6544  y2020
## 6545  y2020
## 6546  y2020
## 6547  y2020
## 6548  y2020
## 6549  y2020
## 6550  y2020
## 6551  y2020
## 6552  y2020
## 6553  y2020
## 6554  y2020
## 6555  y2020
## 6556  y2020
## 6557  y2020
## 6558  y2020
## 6559  y2020
## 6560  y2020
## 6561  y2020
## 6562  y2020
## 6563  y2020
## 6564  y2020
## 6565  y2020
## 6566  y2020
## 6567  y2020
## 6568  y2020
## 6569  y2020
## 6570  y2020
## 6571  y2020
## 6572  y2020
## 6573  y2020
## 6574  y2020
## 6575  y2020
## 6576  y2020
## 6577  y2020
## 6578  y2020
## 6579  y2020
## 6580  y2020
## 6581  y2020
## 6582  y2020
## 6583  y2020
## 6584  y2020
## 6585  y2020
## 6586  y2020
## 6587  y2020
## 6588  y2020
## 6589  y2020
## 6590  y2020
## 6591  y2020
## 6592  y2020
## 6593  y2020
## 6594  y2020
## 6595  y2020
## 6596  y2020
## 6597  y2020
## 6598  y2020
## 6599  y2020
## 6600  y2020
## 6601  y2020
## 6602  y2020
## 6603  y2020
## 6604  y2020
## 6605  y2020
## 6606  y2020
## 6607  y2020
## 6608  y2020
## 6609  y2020
## 6610  y2020
## 6611  y2020
## 6612  y2020
## 6613  y2020
## 6614  y2020
## 6615  y2020
## 6616  y2020
## 6617  y2020
## 6618  y2020
## 6619  y2020
## 6620  y2020
## 6621  y2020
## 6622  y2020
## 6623  y2020
## 6624  y2020
## 6625  y2020
## 6626  y2020
## 6627  y2020
## 6628  y2020
## 6629  y2020
## 6630  y2020
## 6631  y2020
## 6632  y2020
## 6633  y2020
## 6634  y2020
## 6635  y2020
## 6636  y2020
## 6637  y2020
## 6638  y2020
## 6639  y2020
## 6640  y2020
## 6641  y2020
## 6642  y2020
## 6643  y2020
## 6644  y2020
## 6645  y2020
## 6646  y2020
## 6647  y2020
## 6648  y2020
## 6649  y2020
## 6650  y2020
## 6651  y2020
## 6652  y2020
## 6653  y2020
## 6654  y2020
## 6655  y2020
## 6656  y2020
## 6657  y2020
## 6658  y2020
## 6659  y2020
## 6660  y2020
## 6661  y2020
## 6662  y2020
## 6663  y2020
## 6664  y2020
## 6665  y2020
## 6666  y2020
## 6667  y2020
## 6668  y2020
## 6669  y2020
## 6670  y2020
## 6671  y2020
## 6672  y2020
## 6673  y2020
## 6674  y2020
## 6675  y2020
## 6676  y2020
## 6677  y2020
## 6678  y2020
## 6679  y2020
## 6680  y2020
## 6681  y2020
## 6682  y2020
## 6683  y2020
## 6684  y2020
## 6685  y2020
## 6686  y2020
## 6687  y2020
## 6688  y2020
## 6689  y2020
## 6690  y2020
## 6691  y2020
## 6692  y2020
## 6693  y2020
## 6694  y2020
## 6695  y2020
## 6696  y2020
## 6697  y2020
## 6698  y2020
## 6699  y2020
## 6700  y2020
## 6701  y2020
## 6702  y2020
## 6703  y2020
## 6704  y2020
## 6705  y2020
## 6706  y2020
## 6707  y2020
## 6708  y2020
## 6709  y2020
## 6710  y2020
## 6711  y2020
## 6712  y2020
## 6713  y2020
## 6714  y2020
## 6715  y2020
## 6716  y2020
## 6717  y2020
## 6718  y2020
## 6719  y2020
## 6720  y2020
## 6721  y2020
## 6722  y2020
## 6723  y2020
## 6724  y2020
## 6725  y2020
## 6726  y2020
## 6727  y2020
## 6728  y2020
## 6729  y2020
## 6730  y2020
## 6731  y2020
## 6732  y2020
## 6733  y2020
## 6734  y2020
## 6735  y2020
## 6736  y2020
## 6737  y2020
## 6738  y2020
## 6739  y2020
## 6740  y2020
## 6741  y2020
## 6742  y2020
## 6743  y2020
## 6744  y2020
## 6745  y2020
## 6746  y2020
## 6747  y2020
## 6748  y2020
## 6749  y2020
## 6750  y2021
## 6751  y2021
## 6752  y2021
## 6753  y2021
## 6754  y2021
## 6755  y2021
## 6756  y2021
## 6757  y2021
## 6758  y2021
## 6759  y2021
## 6760  y2021
## 6761  y2021
## 6762  y2021
## 6763  y2021
## 6764  y2021
## 6765  y2021
## 6766  y2021
## 6767  y2021
## 6768  y2021
## 6769  y2021
## 6770  y2021
## 6771  y2021
## 6772  y2021
## 6773  y2021
## 6774  y2021
## 6775  y2021
## 6776  y2021
## 6777  y2021
## 6778  y2021
## 6779  y2021
## 6780  y2021
## 6781  y2021
## 6782  y2021
## 6783  y2021
## 6784  y2021
## 6785  y2021
## 6786  y2021
## 6787  y2021
## 6788  y2021
## 6789  y2021
## 6790  y2021
## 6791  y2021
## 6792  y2021
## 6793  y2021
## 6794  y2021
## 6795  y2021
## 6796  y2021
## 6797  y2021
## 6798  y2021
## 6799  y2021
## 6800  y2021
## 6801  y2021
## 6802  y2021
## 6803  y2021
## 6804  y2021
## 6805  y2021
## 6806  y2021
## 6807  y2021
## 6808  y2021
## 6809  y2021
## 6810  y2021
## 6811  y2021
## 6812  y2021
## 6813  y2021
## 6814  y2021
## 6815  y2021
## 6816  y2021
## 6817  y2021
## 6818  y2021
## 6819  y2021
## 6820  y2021
## 6821  y2021
## 6822  y2021
## 6823  y2021
## 6824  y2021
## 6825  y2021
## 6826  y2021
## 6827  y2021
## 6828  y2021
## 6829  y2021
## 6830  y2021
## 6831  y2021
## 6832  y2021
## 6833  y2021
## 6834  y2021
## 6835  y2021
## 6836  y2021
## 6837  y2021
## 6838  y2021
## 6839  y2021
## 6840  y2021
## 6841  y2021
## 6842  y2021
## 6843  y2021
## 6844  y2021
## 6845  y2021
## 6846  y2021
## 6847  y2021
## 6848  y2021
## 6849  y2021
## 6850  y2021
## 6851  y2021
## 6852  y2021
## 6853  y2021
## 6854  y2021
## 6855  y2021
## 6856  y2021
## 6857  y2021
## 6858  y2021
## 6859  y2021
## 6860  y2021
## 6861  y2021
## 6862  y2021
## 6863  y2021
## 6864  y2021
## 6865  y2021
## 6866  y2021
## 6867  y2021
## 6868  y2021
## 6869  y2021
## 6870  y2021
## 6871  y2021
## 6872  y2021
## 6873  y2021
## 6874  y2021
## 6875  y2021
## 6876  y2021
## 6877  y2021
## 6878  y2021
## 6879  y2021
## 6880  y2021
## 6881  y2021
## 6882  y2021
## 6883  y2021
## 6884  y2021
## 6885  y2021
## 6886  y2021
## 6887  y2021
## 6888  y2021
## 6889  y2021
## 6890  y2021
## 6891  y2021
## 6892  y2021
## 6893  y2021
## 6894  y2021
## 6895  y2021
## 6896  y2021
## 6897  y2021
## 6898  y2021
## 6899  y2021
## 6900  y2021
## 6901  y2021
## 6902  y2021
## 6903  y2021
## 6904  y2021
## 6905  y2021
## 6906  y2021
## 6907  y2021
## 6908  y2021
## 6909  y2021
## 6910  y2021
## 6911  y2021
## 6912  y2021
## 6913  y2021
## 6914  y2021
## 6915  y2021
## 6916  y2021
## 6917  y2021
## 6918  y2021
## 6919  y2021
## 6920  y2021
## 6921  y2021
## 6922  y2021
## 6923  y2021
## 6924  y2021
## 6925  y2021
## 6926  y2021
## 6927  y2021
## 6928  y2021
## 6929  y2021
## 6930  y2021
## 6931  y2021
## 6932  y2021
## 6933  y2021
## 6934  y2021
## 6935  y2021
## 6936  y2021
## 6937  y2021
## 6938  y2021
## 6939  y2021
## 6940  y2021
## 6941  y2021
## 6942  y2021
## 6943  y2021
## 6944  y2021
## 6945  y2021
## 6946  y2021
## 6947  y2021
## 6948  y2021
## 6949  y2021
## 6950  y2021
## 6951  y2021
## 6952  y2021
## 6953  y2021
## 6954  y2021
## 6955  y2021
## 6956  y2021
## 6957  y2021
## 6958  y2021
## 6959  y2021
## 6960  y2021
## 6961  y2021
## 6962  y2021
## 6963  y2021
## 6964  y2021
## 6965  y2021
## 6966  y2021
## 6967  y2021
## 6968  y2021
## 6969  y2021
## 6970  y2021
## 6971  y2021
## 6972  y2021
## 6973  y2021
## 6974  y2021
## 6975  y2021
## 6976  y2021
## 6977  y2021
## 6978  y2021
## 6979  y2021
## 6980  y2021
## 6981  y2021
## 6982  y2021
## 6983  y2021
## 6984  y2021
## 6985  y2021
## 6986  y2021
## 6987  y2021
## 6988  y2021
## 6989  y2021
## 6990  y2021
## 6991  y2021
## 6992  y2021
## 6993  y2021
## 6994  y2021
## 6995  y2021
## 6996  y2021
## 6997  y2021
## 6998  y2021
## 6999  y2021
## 7000  y2021
## 7001  y2021
## 7002  y2021
## 7003  y2021
## 7004  y2021
## 7005  y2021
## 7006  y2021
## 7007  y2021
## 7008  y2021
## 7009  y2021
## 7010  y2021
## 7011  y2021
## 7012  y2021
## 7013  y2021
## 7014  y2021
## 7015  y2021
## 7016  y2021
## 7017  y2021
## 7018  y2021
## 7019  y2021
## 7020  y2021
## 7021  y2021
## 7022  y2021
## 7023  y2021
## 7024  y2021
## 7025  y2021
## 7026  y2021
## 7027  y2021
## 7028  y2021
## 7029  y2021
## 7030  y2021
## 7031  y2021
## 7032  y2021
## 7033  y2021
## 7034  y2021
## 7035  y2021
## 7036  y2021
## 7037  y2021
## 7038  y2021
## 7039  y2021
## 7040  y2021
## 7041  y2021
## 7042  y2021
## 7043  y2021
## 7044  y2021
## 7045  y2021
## 7046  y2021
## 7047  y2021
## 7048  y2021
## 7049  y2021
## 7050  y2021
## 7051  y2021
## 7052  y2021
## 7053  y2021
## 7054  y2021
## 7055  y2021
## 7056  y2021
## 7057  y2021
## 7058  y2021
## 7059  y2021
## 7060  y2021
## 7061  y2021
## 7062  y2021
## 7063  y2021
## 7064  y2021
## 7065  y2021
## 7066  y2021
## 7067  y2021
## 7068  y2021
## 7069  y2021
## 7070  y2021
## 7071  y2021
## 7072  y2021
## 7073  y2021
## 7074  y2021
## 7075  y2021
## 7076  y2021
## 7077  y2021
## 7078  y2021
## 7079  y2021
## 7080  y2021
## 7081  y2021
## 7082  y2021
## 7083  y2021
## 7084  y2021
## 7085  y2021
## 7086  y2021
## 7087  y2021
## 7088  y2021
## 7089  y2021
## 7090  y2021
## 7091  y2021
## 7092  y2021
## 7093  y2021
## 7094  y2021
## 7095  y2021
## 7096  y2021
## 7097  y2021
## 7098  y2021
## 7099  y2021
## 7100  y2021
## 7101  y2021
## 7102  y2021
## 7103  y2021
## 7104  y2021
## 7105  y2021
## 7106  y2021
## 7107  y2021
## 7108  y2021
## 7109  y2021
## 7110  y2021
## 7111  y2021
## 7112  y2021
## 7113  y2021
## 7114  y2021
## 7115  y2021
## 7116  y2021
## 7117  y2021
## 7118  y2021
## 7119  y2021
## 7120  y2021
## 7121  y2021
## 7122  y2021
## 7123  y2021
## 7124  y2021
## 7125  y2021
## 7126  y2021
## 7127  y2021
## 7128  y2021
## 7129  y2021
## 7130  y2021
## 7131  y2021
## 7132  y2021
## 7133  y2021
## 7134  y2021
## 7135  y2021
## 7136  y2021
## 7137  y2021
## 7138  y2021
## 7139  y2021
## 7140  y2021
## 7141  y2021
## 7142  y2021
## 7143  y2021
## 7144  y2021
## 7145  y2021
## 7146  y2021
## 7147  y2021
## 7148  y2021
## 7149  y2021
## 7150  y2021
## 7151  y2021
## 7152  y2021
## 7153  y2021
## 7154  y2021
## 7155  y2021
## 7156  y2021
## 7157  y2021
## 7158  y2021
## 7159  y2021
## 7160  y2021
## 7161  y2021
## 7162  y2021
## 7163  y2021
## 7164  y2021
## 7165  y2021
## 7166  y2021
## 7167  y2021
## 7168  y2021
## 7169  y2021
## 7170  y2021
## 7171  y2021
## 7172  y2021
## 7173  y2021
## 7174  y2021
## 7175  y2021
## 7176  y2021
## 7177  y2021
## 7178  y2021
## 7179  y2021
## 7180  y2021
## 7181  y2021
## 7182  y2021
## 7183  y2021
## 7184  y2021
## 7185  y2021
## 7186  y2021
## 7187  y2021
## 7188  y2021
## 7189  y2021
## 7190  y2021
## 7191  y2021
## 7192  y2021
## 7193  y2021
## 7194  y2021
## 7195  y2021
## 7196  y2021
## 7197  y2021
## 7198  y2021
## 7199  y2021
## 7200  y2021
## 7201  y2021
## 7202  y2021
## 7203  y2021
## 7204  y2021
## 7205  y2021
## 7206  y2021
## 7207  y2021
## 7208  y2021
## 7209  y2021
## 7210  y2021
## 7211  y2021
## 7212  y2021
## 7213  y2021
## 7214  y2021
## 7215  y2021
## 7216  y2021
## 7217  y2021
## 7218  y2021
## 7219  y2021
## 7220  y2021
## 7221  y2021
## 7222  y2021
## 7223  y2021
## 7224  y2021
## 7225  y2021
## 7226  y2021
## 7227  y2021
## 7228  y2021
## 7229  y2021
## 7230  y2021
## 7231  y2021
## 7232  y2021
## 7233  y2021
## 7234  y2021
## 7235  y2021
## 7236  y2021
## 7237  y2021
## 7238  y2021
## 7239  y2021
## 7240  y2021
## 7241  y2021
## 7242  y2021
## 7243  y2021
## 7244  y2021
## 7245  y2021
## 7246  y2021
## 7247  y2021
## 7248  y2021
## 7249  y2021
## 7250  y2021
## 7251  y2021
## 7252  y2021
## 7253  y2021
## 7254  y2021
## 7255  y2021
## 7256  y2021
## 7257  y2021
## 7258  y2021
## 7259  y2021
## 7260  y2021
## 7261  y2021
## 7262  y2021
## 7263  y2021
## 7264  y2021
## 7265  y2021
## 7266  y2021
## 7267  y2021
## 7268  y2021
## 7269  y2021
## 7270  y2021
## 7271  y2021
## 7272  y2021
## 7273  y2021
## 7274  y2021
## 7275  y2021
## 7276  y2021
## 7277  y2021
## 7278  y2021
## 7279  y2021
## 7280  y2021
## 7281  y2021
## 7282  y2021
## 7283  y2021
## 7284  y2021
## 7285  y2021
## 7286  y2021
## 7287  y2021
## 7288  y2021
## 7289  y2021
## 7290  y2021
## 7291  y2021
## 7292  y2021
## 7293  y2021
## 7294  y2021
## 7295  y2021
## 7296  y2021
## 7297  y2021
## 7298  y2021
## 7299  y2021
## 7300  y2021
## 7301  y2021
## 7302  y2021
## 7303  y2021
## 7304  y2021
## 7305  y2021
## 7306  y2021
## 7307  y2021
## 7308  y2021
## 7309  y2021
## 7310  y2021
## 7311  y2021
## 7312  y2021
## 7313  y2021
## 7314  y2021
## 7315  y2021
## 7316  y2021
## 7317  y2021
## 7318  y2021
## 7319  y2021
## 7320  y2021
## 7321  y2021
## 7322  y2021
## 7323  y2021
## 7324  y2021
## 7325  y2021
## 7326  y2021
## 7327  y2021
## 7328  y2021
## 7329  y2021
## 7330  y2021
## 7331  y2021
## 7332  y2021
## 7333  y2021
## 7334  y2021
## 7335  y2021
## 7336  y2021
## 7337  y2021
## 7338  y2021
## 7339  y2021
## 7340  y2021
## 7341  y2021
## 7342  y2021
## 7343  y2021
## 7344  y2021
## 7345  y2021
## 7346  y2021
## 7347  y2021
## 7348  y2021
## 7349  y2021
## 7350  y2021
## 7351  y2021
## 7352  y2021
## 7353  y2021
## 7354  y2021
## 7355  y2021
## 7356  y2021
## 7357  y2021
## 7358  y2021
## 7359  y2021
## 7360  y2021
## 7361  y2021
## 7362  y2021
## 7363  y2021
## 7364  y2021
## 7365  y2021
## 7366  y2021
## 7367  y2021
## 7368  y2021
## 7369  y2021
## 7370  y2021
## 7371  y2021
## 7372  y2021
## 7373  y2021
## 7374  y2021
## 7375  y2021
## 7376  y2021
## 7377  y2021
## 7378  y2021
## 7379  y2021
## 7380  y2021
## 7381  y2021
## 7382  y2021
## 7383  y2021
## 7384  y2021
## 7385  y2021
## 7386  y2021
## 7387  y2021
## 7388  y2021
## 7389  y2021
## 7390  y2021
## 7391  y2021
## 7392  y2021
## 7393  y2021
## 7394  y2021
## 7395  y2021
## 7396  y2021
## 7397  y2021
## 7398  y2021
## 7399  y2021
## 7400  y2021
## 7401  y2021
## 7402  y2022
## 7403  y2022
## 7404  y2022
## 7405  y2022
## 7406  y2022
## 7407  y2022
## 7408  y2022
## 7409  y2022
## 7410  y2022
## 7411  y2022
## 7412  y2022
## 7413  y2022
## 7414  y2022
## 7415  y2022
## 7416  y2022
## 7417  y2022
## 7418  y2022
## 7419  y2022
## 7420  y2022
## 7421  y2022
## 7422  y2022
## 7423  y2022
## 7424  y2022
## 7425  y2022
## 7426  y2022
## 7427  y2022
## 7428  y2022
## 7429  y2022
## 7430  y2022
## 7431  y2022
## 7432  y2022
## 7433  y2022
## 7434  y2022
## 7435  y2022
## 7436  y2022
## 7437  y2022
## 7438  y2022
## 7439  y2022
## 7440  y2022
## 7441  y2022
## 7442  y2022
## 7443  y2022
## 7444  y2022
## 7445  y2022
## 7446  y2022
## 7447  y2022
## 7448  y2022
## 7449  y2022
## 7450  y2022
## 7451  y2022
## 7452  y2022
## 7453  y2022
## 7454  y2022
## 7455  y2022
## 7456  y2022
## 7457  y2022
## 7458  y2022
## 7459  y2022
## 7460  y2022
## 7461  y2022
## 7462  y2022
## 7463  y2022
## 7464  y2022
## 7465  y2022
## 7466  y2022
## 7467  y2022
## 7468  y2022
## 7469  y2022
## 7470  y2022
## 7471  y2022
## 7472  y2022
## 7473  y2022
## 7474  y2022
## 7475  y2022
## 7476  y2022
## 7477  y2022
## 7478  y2022
## 7479  y2022
## 7480  y2022
## 7481  y2022
## 7482  y2022
## 7483  y2022
## 7484  y2022
## 7485  y2022
## 7486  y2022
## 7487  y2022
## 7488  y2022
## 7489  y2022
## 7490  y2022
## 7491  y2022
## 7492  y2022
## 7493  y2022
## 7494  y2022
## 7495  y2022
## 7496  y2022
## 7497  y2022
## 7498  y2022
## 7499  y2022
## 7500  y2022
## 7501  y2022
## 7502  y2022
## 7503  y2022
## 7504  y2022
## 7505  y2022
## 7506  y2022
## 7507  y2022
## 7508  y2022
## 7509  y2022
## 7510  y2022
## 7511  y2022
## 7512  y2022
## 7513  y2022
## 7514  y2022
## 7515  y2022
## 7516  y2022
## 7517  y2022
## 7518  y2022
## 7519  y2022
## 7520  y2022
## 7521  y2022
## 7522  y2022
## 7523  y2022
## 7524  y2022
## 7525  y2022
## 7526  y2022
## 7527  y2022
## 7528  y2022
## 7529  y2022
## 7530  y2022
## 7531  y2022
## 7532  y2022
## 7533  y2022
## 7534  y2022
## 7535  y2022
## 7536  y2022
## 7537  y2022
## 7538  y2022
## 7539  y2022
## 7540  y2022
## 7541  y2022
## 7542  y2022
## 7543  y2022
## 7544  y2022
## 7545  y2022
## 7546  y2022
## 7547  y2022
## 7548  y2022
## 7549  y2022
## 7550  y2022
## 7551  y2022
## 7552  y2022
## 7553  y2022
## 7554  y2022
## 7555  y2022
## 7556  y2022
## 7557  y2022
## 7558  y2022
## 7559  y2022
## 7560  y2022
## 7561  y2022
## 7562  y2022
## 7563  y2022
## 7564  y2022
## 7565  y2022
## 7566  y2022
## 7567  y2022
## 7568  y2022
## 7569  y2022
## 7570  y2022
## 7571  y2022
## 7572  y2022
## 7573  y2022
## 7574  y2022
## 7575  y2022
## 7576  y2022
## 7577  y2022
## 7578  y2022
## 7579  y2022
## 7580  y2022
## 7581  y2022
## 7582  y2022
## 7583  y2022
## 7584  y2022
## 7585  y2022
## 7586  y2022
## 7587  y2022
## 7588  y2022
## 7589  y2022
## 7590  y2022
## 7591  y2022
## 7592  y2022
## 7593  y2022
## 7594  y2022
## 7595  y2022
## 7596  y2022
## 7597  y2022
## 7598  y2022
## 7599  y2022
## 7600  y2022
## 7601  y2022
## 7602  y2022
## 7603  y2022
## 7604  y2022
## 7605  y2022
## 7606  y2022
## 7607  y2022
## 7608  y2022
## 7609  y2022
## 7610  y2022
## 7611  y2022
## 7612  y2022
## 7613  y2022
## 7614  y2022
## 7615  y2022
## 7616  y2022
## 7617  y2022
## 7618  y2022
## 7619  y2022
## 7620  y2022
## 7621  y2022
## 7622  y2022
## 7623  y2022
## 7624  y2022
## 7625  y2022
## 7626  y2022
## 7627  y2022
## 7628  y2022
## 7629  y2022
## 7630  y2022
## 7631  y2022
## 7632  y2022
## 7633  y2022
## 7634  y2022
## 7635  y2022
## 7636  y2022
## 7637  y2022
## 7638  y2022
## 7639  y2022
## 7640  y2022
## 7641  y2022
## 7642  y2022
## 7643  y2022
## 7644  y2022
## 7645  y2022
## 7646  y2022
## 7647  y2022
## 7648  y2022
## 7649  y2022
## 7650  y2022
## 7651  y2022
## 7652  y2022
## 7653  y2022
## 7654  y2022
## 7655  y2022
## 7656  y2022
## 7657  y2022
## 7658  y2022
## 7659  y2022
## 7660  y2022
## 7661  y2022
## 7662  y2022
## 7663  y2022
## 7664  y2022
## 7665  y2022
## 7666  y2022
## 7667  y2022
## 7668  y2022
## 7669  y2022
## 7670  y2022
## 7671  y2022
## 7672  y2022
## 7673  y2022
## 7674  y2022
## 7675  y2022
## 7676  y2022
## 7677  y2022
## 7678  y2022
## 7679  y2022
## 7680  y2022
## 7681  y2022
## 7682  y2022
## 7683  y2022
## 7684  y2022
## 7685  y2022
## 7686  y2022
## 7687  y2022
## 7688  y2022
## 7689  y2022
## 7690  y2022
## 7691  y2022
## 7692  y2022
## 7693  y2022
## 7694  y2022
## 7695  y2022
## 7696  y2022
## 7697  y2022
## 7698  y2022
## 7699  y2022
## 7700  y2022
## 7701  y2022
## 7702  y2022
## 7703  y2022
## 7704  y2022
## 7705  y2022
## 7706  y2022
## 7707  y2022
## 7708  y2022
## 7709  y2022
## 7710  y2022
## 7711  y2022
## 7712  y2022
## 7713  y2022
## 7714  y2022
## 7715  y2022
## 7716  y2022
## 7717  y2022
## 7718  y2022
## 7719  y2022
## 7720  y2022
## 7721  y2022
## 7722  y2022
## 7723  y2022
## 7724  y2022
## 7725  y2022
## 7726  y2022
## 7727  y2022
## 7728  y2022
## 7729  y2022
## 7730  y2022
## 7731  y2022
## 7732  y2022
## 7733  y2022
## 7734  y2022
## 7735  y2022
## 7736  y2022
## 7737  y2022
## 7738  y2022
## 7739  y2022
## 7740  y2022
## 7741  y2022
## 7742  y2022
## 7743  y2022
## 7744  y2022
## 7745  y2022
## 7746  y2022
## 7747  y2022
## 7748  y2022
## 7749  y2022
## 7750  y2022
## 7751  y2022
## 7752  y2022
## 7753  y2022
## 7754  y2022
## 7755  y2022
## 7756  y2022
## 7757  y2022
## 7758  y2022
## 7759  y2022
## 7760  y2022
## 7761  y2022
## 7762  y2022
## 7763  y2022
## 7764  y2022
## 7765  y2022
## 7766  y2022
## 7767  y2022
## 7768  y2022
## 7769  y2022
## 7770  y2022
## 7771  y2022
## 7772  y2022
## 7773  y2022
## 7774  y2022
## 7775  y2022
## 7776  y2022
## 7777  y2022
## 7778  y2022
## 7779  y2022
## 7780  y2022
## 7781  y2022
## 7782  y2022
## 7783  y2022
## 7784  y2022
## 7785  y2022
## 7786  y2022
## 7787  y2022
## 7788  y2022
## 7789  y2022
## 7790  y2022
## 7791  y2022
## 7792  y2022
## 7793  y2022
## 7794  y2022
## 7795  y2022
## 7796  y2022
## 7797  y2022
## 7798  y2022
## 7799  y2022
## 7800  y2022
## 7801  y2022
## 7802  y2022
## 7803  y2022
## 7804  y2022
## 7805  y2022
## 7806  y2022
## 7807  y2022
## 7808  y2022
## 7809  y2022
## 7810  y2022
## 7811  y2022
## 7812  y2022
## 7813  y2022
## 7814  y2022
## 7815  y2022
## 7816  y2022
## 7817  y2022
## 7818  y2022
## 7819  y2022
## 7820  y2022
## 7821  y2022
## 7822  y2022
## 7823  y2022
## 7824  y2022
## 7825  y2022
## 7826  y2022
## 7827  y2022
## 7828  y2022
## 7829  y2022
## 7830  y2022
## 7831  y2022
## 7832  y2022
## 7833  y2022
## 7834  y2022
## 7835  y2022
## 7836  y2022
## 7837  y2022
## 7838  y2022
## 7839  y2022
## 7840  y2022
## 7841  y2022
## 7842  y2022
## 7843  y2022
## 7844  y2022
## 7845  y2022
## 7846  y2022
## 7847  y2022
## 7848  y2022
## 7849  y2022
## 7850  y2022
## 7851  y2022
## 7852  y2022
## 7853  y2022
## 7854  y2022
## 7855  y2022
## 7856  y2022
## 7857  y2022
## 7858  y2022
## 7859  y2022
## 7860  y2022
## 7861  y2022
## 7862  y2022
## 7863  y2022
## 7864  y2022
## 7865  y2022
## 7866  y2022
## 7867  y2022
## 7868  y2022
## 7869  y2022
## 7870  y2022
## 7871  y2022
## 7872  y2022
## 7873  y2022
## 7874  y2022
## 7875  y2022
## 7876  y2022
## 7877  y2022
## 7878  y2022
## 7879  y2022
## 7880  y2022
## 7881  y2022
## 7882  y2022
## 7883  y2022
## 7884  y2022
## 7885  y2022
## 7886  y2022
## 7887  y2022
## 7888  y2022
## 7889  y2022
## 7890  y2022
## 7891  y2022
## 7892  y2022
## 7893  y2022
## 7894  y2022
## 7895  y2022
## 7896  y2022
## 7897  y2022
## 7898  y2022
## 7899  y2022
## 7900  y2022
## 7901  y2022
## 7902  y2022
## 7903  y2022
## 7904  y2022
## 7905  y2022
## 7906  y2022
## 7907  y2022
## 7908  y2022
## 7909  y2022
## 7910  y2022
## 7911  y2022
## 7912  y2022
## 7913  y2022
## 7914  y2022
## 7915  y2022
## 7916  y2022
## 7917  y2022
## 7918  y2022
## 7919  y2022
## 7920  y2022
## 7921  y2022
## 7922  y2022
## 7923  y2022
## 7924  y2022
## 7925  y2022
## 7926  y2022
## 7927  y2022
## 7928  y2022
## 7929  y2022
## 7930  y2022
## 7931  y2022
## 7932  y2022
## 7933  y2020
## 7934  y2020
## 7935  y2020
## 7936  y2020
## 7937  y2020
## 7938  y2020
## 7939  y2020
## 7940  y2020
## 7941  y2020
## 7942  y2020
## 7943  y2020
## 7944  y2020
## 7945  y2020
## 7946  y2020
## 7947  y2020
## 7948  y2020
## 7949  y2020
## 7950  y2020
## 7951  y2020
## 7952  y2020
## 7953  y2020
## 7954  y2020
## 7955  y2020
## 7956  y2020
## 7957  y2020
## 7958  y2020
## 7959  y2020
## 7960  y2020
## 7961  y2020
## 7962  y2020
## 7963  y2020
## 7964  y2020
## 7965  y2020
## 7966  y2020
## 7967  y2020
## 7968  y2020
## 7969  y2020
## 7970  y2020
## 7971  y2020
## 7972  y2020
## 7973  y2020
## 7974  y2020
## 7975  y2020
## 7976  y2020
## 7977  y2020
## 7978  y2020
## 7979  y2020
## 7980  y2020
## 7981  y2020
## 7982  y2020
## 7983  y2020
## 7984  y2020
## 7985  y2020
## 7986  y2020
## 7987  y2020
## 7988  y2020
## 7989  y2020
## 7990  y2020
## 7991  y2020
## 7992  y2020
## 7993  y2020
## 7994  y2020
## 7995  y2020
## 7996  y2020
## 7997  y2020
## 7998  y2020
## 7999  y2020
## 8000  y2020
## 8001  y2020
## 8002  y2020
## 8003  y2020
## 8004  y2020
## 8005  y2020
## 8006  y2020
## 8007  y2020
## 8008  y2020
## 8009  y2020
## 8010  y2020
## 8011  y2020
## 8012  y2020
## 8013  y2020
## 8014  y2020
## 8015  y2020
## 8016  y2020
## 8017  y2020
## 8018  y2020
## 8019  y2020
## 8020  y2020
## 8021  y2020
## 8022  y2020
## 8023  y2020
## 8024  y2020
## 8025  y2020
## 8026  y2020
## 8027  y2020
## 8028  y2020
## 8029  y2020
## 8030  y2020
## 8031  y2020
## 8032  y2020
## 8033  y2020
## 8034  y2020
## 8035  y2020
## 8036  y2020
## 8037  y2020
## 8038  y2020
## 8039  y2020
## 8040  y2020
## 8041  y2020
## 8042  y2020
## 8043  y2020
## 8044  y2020
## 8045  y2020
## 8046  y2020
## 8047  y2020
## 8048  y2020
## 8049  y2020
## 8050  y2020
## 8051  y2020
## 8052  y2020
## 8053  y2020
## 8054  y2020
## 8055  y2020
## 8056  y2020
## 8057  y2020
## 8058  y2020
## 8059  y2020
## 8060  y2020
## 8061  y2020
## 8062  y2020
## 8063  y2020
## 8064  y2020
## 8065  y2020
## 8066  y2020
## 8067  y2020
## 8068  y2020
## 8069  y2020
## 8070  y2020
## 8071  y2020
## 8072  y2020
## 8073  y2020
## 8074  y2020
## 8075  y2020
## 8076  y2020
## 8077  y2020
## 8078  y2020
## 8079  y2020
## 8080  y2020
## 8081  y2020
## 8082  y2020
## 8083  y2020
## 8084  y2020
## 8085  y2020
## 8086  y2020
## 8087  y2020
## 8088  y2020
## 8089  y2020
## 8090  y2020
## 8091  y2020
## 8092  y2020
## 8093  y2020
## 8094  y2020
## 8095  y2020
## 8096  y2020
## 8097  y2020
## 8098  y2020
## 8099  y2020
## 8100  y2020
## 8101  y2020
## 8102  y2020
## 8103  y2020
## 8104  y2020
## 8105  y2020
## 8106  y2020
## 8107  y2020
## 8108  y2020
## 8109  y2020
## 8110  y2020
## 8111  y2020
## 8112  y2020
## 8113  y2020
## 8114  y2020
## 8115  y2020
## 8116  y2020
## 8117  y2020
## 8118  y2020
## 8119  y2020
## 8120  y2020
## 8121  y2020
## 8122  y2020
## 8123  y2020
## 8124  y2020
## 8125  y2020
## 8126  y2020
## 8127  y2020
## 8128  y2020
## 8129  y2020
## 8130  y2020
## 8131  y2020
## 8132  y2020
## 8133  y2020
## 8134  y2020
## 8135  y2020
## 8136  y2020
## 8137  y2020
## 8138  y2020
## 8139  y2020
## 8140  y2020
## 8141  y2020
## 8142  y2020
## 8143  y2020
## 8144  y2020
## 8145  y2020
## 8146  y2020
## 8147  y2020
## 8148  y2020
## 8149  y2020
## 8150  y2020
## 8151  y2020
## 8152  y2020
## 8153  y2020
## 8154  y2020
## 8155  y2020
## 8156  y2020
## 8157  y2020
## 8158  y2020
## 8159  y2020
## 8160  y2020
## 8161  y2020
## 8162  y2020
## 8163  y2020
## 8164  y2020
## 8165  y2020
## 8166  y2020
## 8167  y2020
## 8168  y2020
## 8169  y2020
## 8170  y2020
## 8171  y2020
## 8172  y2020
## 8173  y2020
## 8174  y2020
## 8175  y2020
## 8176  y2020
## 8177  y2020
## 8178  y2020
## 8179  y2020
## 8180  y2020
## 8181  y2020
## 8182  y2020
## 8183  y2020
## 8184  y2020
## 8185  y2020
## 8186  y2020
## 8187  y2020
## 8188  y2020
## 8189  y2020
## 8190  y2020
## 8191  y2020
## 8192  y2020
## 8193  y2020
## 8194  y2020
## 8195  y2020
## 8196  y2020
## 8197  y2020
## 8198  y2020
## 8199  y2020
## 8200  y2020
## 8201  y2020
## 8202  y2020
## 8203  y2020
## 8204  y2020
## 8205  y2020
## 8206  y2020
## 8207  y2020
## 8208  y2020
## 8209  y2020
## 8210  y2020
## 8211  y2020
## 8212  y2020
## 8213  y2020
## 8214  y2020
## 8215  y2020
## 8216  y2020
## 8217  y2020
## 8218  y2020
## 8219  y2020
## 8220  y2020
## 8221  y2020
## 8222  y2020
## 8223  y2020
## 8224  y2020
## 8225  y2020
## 8226  y2020
## 8227  y2020
## 8228  y2020
## 8229  y2020
## 8230  y2020
## 8231  y2020
## 8232  y2020
## 8233  y2020
## 8234  y2020
## 8235  y2020
## 8236  y2020
## 8237  y2020
## 8238  y2020
## 8239  y2020
## 8240  y2020
## 8241  y2020
## 8242  y2020
## 8243  y2020
## 8244  y2020
## 8245  y2020
## 8246  y2020
## 8247  y2020
## 8248  y2020
## 8249  y2020
## 8250  y2020
## 8251  y2020
## 8252  y2020
## 8253  y2020
## 8254  y2020
## 8255  y2020
## 8256  y2020
## 8257  y2020
## 8258  y2020
## 8259  y2020
## 8260  y2020
## 8261  y2020
## 8262  y2020
## 8263  y2020
## 8264  y2020
## 8265  y2020
## 8266  y2020
## 8267  y2020
## 8268  y2020
## 8269  y2020
## 8270  y2020
## 8271  y2020
## 8272  y2020
## 8273  y2020
## 8274  y2020
## 8275  y2020
## 8276  y2020
## 8277  y2020
## 8278  y2020
## 8279  y2020
## 8280  y2020
## 8281  y2020
## 8282  y2020
## 8283  y2020
## 8284  y2020
## 8285  y2020
## 8286  y2020
## 8287  y2020
## 8288  y2020
## 8289  y2020
## 8290  y2020
## 8291  y2020
## 8292  y2020
## 8293  y2020
## 8294  y2020
## 8295  y2020
## 8296  y2020
## 8297  y2020
## 8298  y2020
## 8299  y2020
## 8300  y2020
## 8301  y2020
## 8302  y2020
## 8303  y2020
## 8304  y2020
## 8305  y2020
## 8306  y2020
## 8307  y2020
## 8308  y2020
## 8309  y2020
## 8310  y2020
## 8311  y2020
## 8312  y2020
## 8313  y2020
## 8314  y2020
## 8315  y2020
## 8316  y2020
## 8317  y2020
## 8318  y2020
## 8319  y2020
## 8320  y2020
## 8321  y2020
## 8322  y2020
## 8323  y2020
## 8324  y2020
## 8325  y2020
## 8326  y2020
## 8327  y2020
## 8328  y2020
## 8329  y2020
## 8330  y2020
## 8331  y2020
## 8332  y2020
## 8333  y2020
## 8334  y2020
## 8335  y2020
## 8336  y2020
## 8337  y2020
## 8338  y2020
## 8339  y2020
## 8340  y2020
## 8341  y2020
## 8342  y2020
## 8343  y2020
## 8344  y2020
## 8345  y2020
## 8346  y2020
## 8347  y2020
## 8348  y2020
## 8349  y2020
## 8350  y2020
## 8351  y2020
## 8352  y2020
## 8353  y2020
## 8354  y2020
## 8355  y2020
## 8356  y2020
## 8357  y2020
## 8358  y2020
## 8359  y2020
## 8360  y2020
## 8361  y2020
## 8362  y2020
## 8363  y2020
## 8364  y2020
## 8365  y2020
## 8366  y2020
## 8367  y2020
## 8368  y2020
## 8369  y2020
## 8370  y2020
## 8371  y2020
## 8372  y2020
## 8373  y2020
## 8374  y2020
## 8375  y2020
## 8376  y2020
## 8377  y2020
## 8378  y2020
## 8379  y2020
## 8380  y2020
## 8381  y2020
## 8382  y2020
## 8383  y2020
## 8384  y2020
## 8385  y2020
## 8386  y2020
## 8387  y2020
## 8388  y2020
## 8389  y2020
## 8390  y2020
## 8391  y2020
## 8392  y2020
## 8393  y2020
## 8394  y2020
## 8395  y2020
## 8396  y2020
## 8397  y2020
## 8398  y2020
## 8399  y2020
## 8400  y2020
## 8401  y2020
## 8402  y2020
## 8403  y2020
## 8404  y2020
## 8405  y2020
## 8406  y2020
## 8407  y2020
## 8408  y2020
## 8409  y2020
## 8410  y2020
## 8411  y2020
## 8412  y2020
## 8413  y2020
## 8414  y2020
## 8415  y2020
## 8416  y2020
## 8417  y2020
## 8418  y2020
## 8419  y2020
## 8420  y2020
## 8421  y2020
## 8422  y2020
## 8423  y2020
## 8424  y2020
## 8425  y2020
## 8426  y2020
## 8427  y2020
## 8428  y2020
## 8429  y2020
## 8430  y2020
## 8431  y2020
## 8432  y2020
## 8433  y2020
## 8434  y2020
## 8435  y2020
## 8436  y2020
## 8437  y2020
## 8438  y2020
## 8439  y2020
## 8440  y2020
## 8441  y2020
## 8442  y2020
## 8443  y2020
## 8444  y2020
## 8445  y2020
## 8446  y2020
## 8447  y2020
## 8448  y2020
## 8449  y2020
## 8450  y2020
## 8451  y2020
## 8452  y2020
## 8453  y2020
## 8454  y2020
## 8455  y2020
## 8456  y2020
## 8457  y2020
## 8458  y2020
## 8459  y2020
## 8460  y2020
## 8461  y2020
## 8462  y2020
## 8463  y2020
## 8464  y2020
## 8465  y2020
## 8466  y2020
## 8467  y2020
## 8468  y2020
## 8469  y2020
## 8470  y2020
## 8471  y2020
## 8472  y2020
## 8473  y2020
## 8474  y2020
## 8475  y2020
## 8476  y2020
## 8477  y2020
## 8478  y2020
## 8479  y2020
## 8480  y2020
## 8481  y2020
## 8482  y2020
## 8483  y2020
## 8484  y2020
## 8485  y2020
## 8486  y2020
## 8487  y2020
## 8488  y2020
## 8489  y2020
## 8490  y2020
## 8491  y2020
## 8492  y2020
## 8493  y2020
## 8494  y2020
## 8495  y2020
## 8496  y2020
## 8497  y2020
## 8498  y2020
## 8499  y2020
## 8500  y2020
## 8501  y2020
## 8502  y2020
## 8503  y2020
## 8504  y2020
## 8505  y2020
## 8506  y2020
## 8507  y2020
## 8508  y2020
## 8509  y2020
## 8510  y2020
## 8511  y2020
## 8512  y2020
## 8513  y2020
## 8514  y2020
## 8515  y2020
## 8516  y2020
## 8517  y2020
## 8518  y2020
## 8519  y2020
## 8520  y2020
## 8521  y2020
## 8522  y2020
## 8523  y2020
## 8524  y2020
## 8525  y2020
## 8526  y2020
## 8527  y2020
## 8528  y2020
## 8529  y2020
## 8530  y2020
## 8531  y2020
## 8532  y2020
## 8533  y2020
## 8534  y2020
## 8535  y2020
## 8536  y2020
## 8537  y2020
## 8538  y2020
## 8539  y2020
## 8540  y2020
## 8541  y2020
## 8542  y2020
## 8543  y2020
## 8544  y2020
## 8545  y2020
## 8546  y2020
## 8547  y2020
## 8548  y2020
## 8549  y2020
## 8550  y2020
## 8551  y2020
## 8552  y2020
## 8553  y2020
## 8554  y2020
## 8555  y2020
## 8556  y2020
## 8557  y2020
## 8558  y2020
## 8559  y2020
## 8560  y2020
## 8561  y2020
## 8562  y2020
## 8563  y2020
## 8564  y2020
## 8565  y2020
## 8566  y2020
## 8567  y2020
## 8568  y2020
## 8569  y2020
## 8570  y2020
## 8571  y2020
## 8572  y2020
## 8573  y2020
## 8574  y2020
## 8575  y2020
## 8576  y2020
## 8577  y2020
## 8578  y2020
## 8579  y2020
## 8580  y2020
## 8581  y2020
## 8582  y2020
## 8583  y2020
## 8584  y2020
## 8585  y2020
## 8586  y2020
## 8587  y2020
## 8588  y2020
## 8589  y2020
## 8590  y2020
## 8591  y2020
## 8592  y2020
## 8593  y2020
## 8594  y2020
## 8595  y2020
## 8596  y2020
## 8597  y2020
## 8598  y2020
## 8599  y2020
## 8600  y2020
## 8601  y2020
## 8602  y2020
## 8603  y2020
## 8604  y2020
## 8605  y2020
## 8606  y2020
## 8607  y2020
## 8608  y2020
## 8609  y2020
## 8610  y2020
## 8611  y2020
## 8612  y2020
## 8613  y2020
## 8614  y2020
## 8615  y2020
## 8616  y2020
## 8617  y2020
## 8618  y2020
## 8619  y2020
## 8620  y2020
## 8621  y2020
## 8622  y2020
## 8623  y2020
## 8624  y2020
## 8625  y2020
## 8626  y2020
## 8627  y2020
## 8628  y2020
## 8629  y2020
## 8630  y2020
## 8631  y2020
## 8632  y2020
## 8633  y2020
## 8634  y2020
## 8635  y2020
## 8636  y2020
## 8637  y2020
## 8638  y2020
## 8639  y2020
## 8640  y2020
## 8641  y2020
## 8642  y2020
## 8643  y2020
## 8644  y2020
## 8645  y2020
## 8646  y2020
## 8647  y2020
## 8648  y2020
## 8649  y2020
## 8650  y2020
## 8651  y2020
## 8652  y2020
## 8653  y2020
## 8654  y2020
## 8655  y2020
## 8656  y2020
## 8657  y2020
## 8658  y2020
## 8659  y2020
## 8660  y2020
## 8661  y2020
## 8662  y2020
## 8663  y2020
## 8664  y2020
## 8665  y2020
## 8666  y2020
## 8667  y2020
## 8668  y2020
## 8669  y2020
## 8670  y2020
## 8671  y2020
## 8672  y2020
## 8673  y2020
## 8674  y2020
## 8675  y2020
## 8676  y2020
## 8677  y2020
## 8678  y2020
## 8679  y2020
## 8680  y2020
## 8681  y2020
## 8682  y2020
## 8683  y2020
## 8684  y2020
## 8685  y2020
## 8686  y2020
## 8687  y2020
## 8688  y2020
## 8689  y2020
## 8690  y2020
## 8691  y2020
## 8692  y2020
## 8693  y2020
## 8694  y2020
## 8695  y2020
## 8696  y2020
## 8697  y2020
## 8698  y2020
## 8699  y2020
## 8700  y2020
## 8701  y2020
## 8702  y2020
## 8703  y2020
## 8704  y2020
## 8705  y2020
## 8706  y2020
## 8707  y2020
## 8708  y2020
## 8709  y2020
## 8710  y2020
## 8711  y2020
## 8712  y2020
## 8713  y2020
## 8714  y2020
## 8715  y2020
## 8716  y2020
## 8717  y2020
## 8718  y2020
## 8719  y2020
## 8720  y2020
## 8721  y2020
## 8722  y2020
## 8723  y2020
## 8724  y2020
## 8725  y2020
## 8726  y2020
## 8727  y2020
## 8728  y2020
## 8729  y2020
## 8730  y2020
## 8731  y2020
## 8732  y2020
## 8733  y2020
## 8734  y2020
## 8735  y2020
## 8736  y2020
## 8737  y2020
## 8738  y2020
## 8739  y2020
## 8740  y2020
## 8741  y2020
## 8742  y2020
## 8743  y2020
## 8744  y2020
## 8745  y2020
## 8746  y2020
## 8747  y2020
## 8748  y2020
## 8749  y2020
## 8750  y2020
## 8751  y2020
## 8752  y2020
## 8753  y2020
## 8754  y2020
## 8755  y2020
## 8756  y2020
## 8757  y2020
## 8758  y2020
## 8759  y2020
## 8760  y2020
## 8761  y2020
## 8762  y2020
## 8763  y2020
## 8764  y2020
## 8765  y2020
## 8766  y2020
## 8767  y2020
## 8768  y2020
## 8769  y2020
## 8770  y2020
## 8771  y2020
## 8772  y2020
## 8773  y2020
## 8774  y2020
## 8775  y2020
## 8776  y2020
## 8777  y2020
## 8778  y2020
## 8779  y2020
## 8780  y2020
## 8781  y2020
## 8782  y2020
## 8783  y2020
## 8784  y2020
## 8785  y2020
## 8786  y2020
## 8787  y2020
## 8788  y2020
## 8789  y2020
## 8790  y2020
## 8791  y2020
## 8792  y2020
## 8793  y2020
## 8794  y2020
## 8795  y2020
## 8796  y2020
## 8797  y2020
## 8798  y2020
## 8799  y2020
## 8800  y2020
## 8801  y2020
## 8802  y2020
## 8803  y2020
## 8804  y2020
## 8805  y2020
## 8806  y2020
## 8807  y2020
## 8808  y2020
## 8809  y2020
## 8810  y2020
## 8811  y2020
## 8812  y2020
## 8813  y2020
## 8814  y2020
## 8815  y2020
## 8816  y2020
## 8817  y2020
## 8818  y2020
## 8819  y2020
## 8820  y2020
## 8821  y2020
## 8822  y2020
## 8823  y2020
## 8824  y2020
## 8825  y2020
## 8826  y2020
## 8827  y2020
## 8828  y2020
## 8829  y2020
## 8830  y2020
## 8831  y2020
## 8832  y2020
## 8833  y2020
## 8834  y2020
## 8835  y2020
## 8836  y2020
## 8837  y2020
## 8838  y2020
## 8839  y2020
## 8840  y2020
## 8841  y2020
## 8842  y2020
## 8843  y2020
## 8844  y2020
## 8845  y2020
## 8846  y2020
## 8847  y2020
## 8848  y2020
## 8849  y2020
## 8850  y2020
## 8851  y2020
## 8852  y2020
## 8853  y2020
## 8854  y2020
## 8855  y2020
## 8856  y2020
## 8857  y2020
## 8858  y2020
## 8859  y2020
## 8860  y2020
## 8861  y2020
## 8862  y2020
## 8863  y2020
## 8864  y2020
## 8865  y2020
## 8866  y2020
## 8867  y2020
## 8868  y2020
## 8869  y2020
## 8870  y2020
## 8871  y2020
## 8872  y2020
## 8873  y2020
## 8874  y2020
## 8875  y2020
## 8876  y2020
## 8877  y2020
## 8878  y2020
## 8879  y2020
## 8880  y2020
## 8881  y2020
## 8882  y2020
## 8883  y2020
## 8884  y2020
## 8885  y2020
## 8886  y2020
## 8887  y2020
## 8888  y2020
## 8889  y2020
## 8890  y2020
## 8891  y2020
## 8892  y2020
## 8893  y2020
## 8894  y2020
## 8895  y2020
## 8896  y2020
## 8897  y2020
## 8898  y2020
## 8899  y2020
## 8900  y2020
## 8901  y2020
## 8902  y2020
## 8903  y2020
## 8904  y2020
## 8905  y2020
## 8906  y2020
## 8907  y2020
## 8908  y2020
## 8909  y2020
## 8910  y2020
## 8911  y2020
## 8912  y2020
## 8913  y2020
## 8914  y2020
## 8915  y2020
## 8916  y2020
## 8917  y2020
## 8918  y2020
## 8919  y2020
## 8920  y2020
## 8921  y2020
## 8922  y2020
## 8923  y2020
## 8924  y2020
## 8925  y2020
## 8926  y2020
## 8927  y2020
## 8928  y2020
## 8929  y2020
## 8930  y2020
## 8931  y2020
## 8932  y2020
## 8933  y2020
## 8934  y2020
## 8935  y2020
## 8936  y2020
## 8937  y2020
## 8938  y2020
## 8939  y2020
## 8940  y2020
## 8941  y2020
## 8942  y2020
## 8943  y2020
## 8944  y2020
## 8945  y2020
## 8946  y2020
## 8947  y2020
## 8948  y2020
## 8949  y2020
## 8950  y2020
## 8951  y2020
## 8952  y2020
## 8953  y2020
## 8954  y2020
## 8955  y2020
## 8956  y2020
## 8957  y2020
## 8958  y2020
## 8959  y2020
## 8960  y2020
## 8961  y2020
## 8962  y2020
## 8963  y2020
## 8964  y2020
## 8965  y2021
## 8966  y2021
## 8967  y2021
## 8968  y2021
## 8969  y2021
## 8970  y2021
## 8971  y2021
## 8972  y2021
## 8973  y2021
## 8974  y2021
## 8975  y2021
## 8976  y2021
## 8977  y2021
## 8978  y2021
## 8979  y2021
## 8980  y2021
## 8981  y2021
## 8982  y2021
## 8983  y2021
## 8984  y2021
## 8985  y2021
## 8986  y2021
## 8987  y2021
## 8988  y2021
## 8989  y2021
## 8990  y2021
## 8991  y2021
## 8992  y2021
## 8993  y2021
## 8994  y2021
## 8995  y2021
## 8996  y2021
## 8997  y2021
## 8998  y2021
## 8999  y2021
## 9000  y2021
## 9001  y2021
## 9002  y2021
## 9003  y2021
## 9004  y2021
## 9005  y2021
## 9006  y2021
## 9007  y2021
## 9008  y2021
## 9009  y2021
## 9010  y2021
## 9011  y2021
## 9012  y2021
## 9013  y2021
## 9014  y2021
## 9015  y2021
## 9016  y2021
## 9017  y2021
## 9018  y2021
## 9019  y2021
## 9020  y2021
## 9021  y2021
## 9022  y2021
## 9023  y2021
## 9024  y2021
## 9025  y2021
## 9026  y2021
## 9027  y2021
## 9028  y2021
## 9029  y2021
## 9030  y2021
## 9031  y2021
## 9032  y2021
## 9033  y2021
## 9034  y2021
## 9035  y2021
## 9036  y2021
## 9037  y2021
## 9038  y2021
## 9039  y2021
## 9040  y2021
## 9041  y2021
## 9042  y2021
## 9043  y2021
## 9044  y2021
## 9045  y2021
## 9046  y2021
## 9047  y2021
## 9048  y2021
## 9049  y2021
## 9050  y2021
## 9051  y2021
## 9052  y2021
## 9053  y2021
## 9054  y2021
## 9055  y2021
## 9056  y2021
## 9057  y2021
## 9058  y2021
## 9059  y2021
## 9060  y2021
## 9061  y2021
## 9062  y2021
## 9063  y2021
## 9064  y2021
## 9065  y2021
## 9066  y2021
## 9067  y2021
## 9068  y2021
## 9069  y2021
## 9070  y2021
## 9071  y2021
## 9072  y2021
## 9073  y2021
## 9074  y2021
## 9075  y2021
## 9076  y2021
## 9077  y2021
## 9078  y2021
## 9079  y2021
## 9080  y2021
## 9081  y2021
## 9082  y2021
## 9083  y2021
## 9084  y2021
## 9085  y2021
## 9086  y2021
## 9087  y2021
## 9088  y2021
## 9089  y2021
## 9090  y2021
## 9091  y2021
## 9092  y2021
## 9093  y2021
## 9094  y2021
## 9095  y2021
## 9096  y2021
## 9097  y2021
## 9098  y2021
## 9099  y2021
## 9100  y2021
## 9101  y2021
## 9102  y2021
## 9103  y2021
## 9104  y2021
## 9105  y2021
## 9106  y2021
## 9107  y2021
## 9108  y2021
## 9109  y2021
## 9110  y2021
## 9111  y2021
## 9112  y2021
## 9113  y2021
## 9114  y2021
## 9115  y2021
## 9116  y2021
## 9117  y2021
## 9118  y2021
## 9119  y2021
## 9120  y2021
## 9121  y2021
## 9122  y2021
## 9123  y2021
## 9124  y2021
## 9125  y2021
## 9126  y2021
## 9127  y2021
## 9128  y2021
## 9129  y2021
## 9130  y2021
## 9131  y2021
## 9132  y2021
## 9133  y2021
## 9134  y2021
## 9135  y2021
## 9136  y2021
## 9137  y2021
## 9138  y2021
## 9139  y2021
## 9140  y2021
## 9141  y2021
## 9142  y2021
## 9143  y2021
## 9144  y2021
## 9145  y2021
## 9146  y2021
## 9147  y2021
## 9148  y2021
## 9149  y2021
## 9150  y2021
## 9151  y2021
## 9152  y2021
## 9153  y2021
## 9154  y2021
## 9155  y2021
## 9156  y2021
## 9157  y2021
## 9158  y2021
## 9159  y2021
## 9160  y2021
## 9161  y2021
## 9162  y2021
## 9163  y2021
## 9164  y2021
## 9165  y2021
## 9166  y2021
## 9167  y2021
## 9168  y2021
## 9169  y2021
## 9170  y2021
## 9171  y2021
## 9172  y2021
## 9173  y2021
## 9174  y2021
## 9175  y2021
## 9176  y2021
## 9177  y2021
## 9178  y2021
## 9179  y2021
## 9180  y2021
## 9181  y2021
## 9182  y2021
## 9183  y2021
## 9184  y2021
## 9185  y2021
## 9186  y2021
## 9187  y2021
## 9188  y2021
## 9189  y2021
## 9190  y2021
## 9191  y2021
## 9192  y2021
## 9193  y2021
## 9194  y2021
## 9195  y2021
## 9196  y2021
## 9197  y2021
## 9198  y2021
## 9199  y2021
## 9200  y2021
## 9201  y2021
## 9202  y2021
## 9203  y2021
## 9204  y2021
## 9205  y2021
## 9206  y2021
## 9207  y2021
## 9208  y2021
## 9209  y2021
## 9210  y2021
## 9211  y2021
## 9212  y2021
## 9213  y2021
## 9214  y2021
## 9215  y2021
## 9216  y2021
## 9217  y2021
## 9218  y2021
## 9219  y2021
## 9220  y2021
## 9221  y2021
## 9222  y2021
## 9223  y2021
## 9224  y2021
## 9225  y2021
## 9226  y2021
## 9227  y2021
## 9228  y2021
## 9229  y2021
## 9230  y2021
## 9231  y2021
## 9232  y2021
## 9233  y2021
## 9234  y2021
## 9235  y2021
## 9236  y2021
## 9237  y2021
## 9238  y2021
## 9239  y2021
## 9240  y2021
## 9241  y2021
## 9242  y2021
## 9243  y2021
## 9244  y2021
## 9245  y2021
## 9246  y2021
## 9247  y2021
## 9248  y2021
## 9249  y2021
## 9250  y2021
## 9251  y2021
## 9252  y2021
## 9253  y2021
## 9254  y2021
## 9255  y2021
## 9256  y2021
## 9257  y2021
## 9258  y2021
## 9259  y2021
## 9260  y2021
## 9261  y2021
## 9262  y2021
## 9263  y2021
## 9264  y2021
## 9265  y2021
## 9266  y2021
## 9267  y2021
## 9268  y2021
## 9269  y2021
## 9270  y2021
## 9271  y2021
## 9272  y2021
## 9273  y2021
## 9274  y2021
## 9275  y2021
## 9276  y2021
## 9277  y2021
## 9278  y2021
## 9279  y2021
## 9280  y2021
## 9281  y2021
## 9282  y2021
## 9283  y2021
## 9284  y2021
## 9285  y2021
## 9286  y2021
## 9287  y2021
## 9288  y2021
## 9289  y2021
## 9290  y2021
## 9291  y2021
## 9292  y2021
## 9293  y2021
## 9294  y2021
## 9295  y2021
## 9296  y2021
## 9297  y2021
## 9298  y2021
## 9299  y2021
## 9300  y2021
## 9301  y2021
## 9302  y2021
## 9303  y2021
## 9304  y2021
## 9305  y2021
## 9306  y2021
## 9307  y2021
## 9308  y2021
## 9309  y2021
## 9310  y2021
## 9311  y2021
## 9312  y2021
## 9313  y2021
## 9314  y2021
## 9315  y2021
## 9316  y2021
## 9317  y2021
## 9318  y2021
## 9319  y2021
## 9320  y2021
## 9321  y2021
## 9322  y2021
## 9323  y2021
## 9324  y2021
## 9325  y2021
## 9326  y2021
## 9327  y2021
## 9328  y2021
## 9329  y2021
## 9330  y2021
## 9331  y2021
## 9332  y2021
## 9333  y2021
## 9334  y2021
## 9335  y2021
## 9336  y2021
## 9337  y2021
## 9338  y2021
## 9339  y2021
## 9340  y2021
## 9341  y2021
## 9342  y2021
## 9343  y2021
## 9344  y2021
## 9345  y2021
## 9346  y2021
## 9347  y2021
## 9348  y2021
## 9349  y2021
## 9350  y2021
## 9351  y2021
## 9352  y2021
## 9353  y2021
## 9354  y2021
## 9355  y2021
## 9356  y2021
## 9357  y2021
## 9358  y2021
## 9359  y2021
## 9360  y2021
## 9361  y2021
## 9362  y2021
## 9363  y2021
## 9364  y2021
## 9365  y2021
## 9366  y2021
## 9367  y2021
## 9368  y2021
## 9369  y2021
## 9370  y2021
## 9371  y2021
## 9372  y2021
## 9373  y2021
## 9374  y2021
## 9375  y2021
## 9376  y2021
## 9377  y2021
## 9378  y2021
## 9379  y2021
## 9380  y2021
## 9381  y2021
## 9382  y2021
## 9383  y2021
## 9384  y2021
## 9385  y2021
## 9386  y2021
## 9387  y2021
## 9388  y2021
## 9389  y2021
## 9390  y2021
## 9391  y2021
## 9392  y2021
## 9393  y2021
## 9394  y2021
## 9395  y2021
## 9396  y2021
## 9397  y2021
## 9398  y2021
## 9399  y2021
## 9400  y2021
## 9401  y2021
## 9402  y2021
## 9403  y2021
## 9404  y2021
## 9405  y2021
## 9406  y2021
## 9407  y2021
## 9408  y2021
## 9409  y2021
## 9410  y2021
## 9411  y2021
## 9412  y2021
## 9413  y2021
## 9414  y2021
## 9415  y2021
## 9416  y2021
## 9417  y2021
## 9418  y2021
## 9419  y2021
## 9420  y2021
## 9421  y2021
## 9422  y2021
## 9423  y2021
## 9424  y2021
## 9425  y2021
## 9426  y2021
## 9427  y2021
## 9428  y2021
## 9429  y2021
## 9430  y2021
## 9431  y2021
## 9432  y2021
## 9433  y2021
## 9434  y2021
## 9435  y2021
## 9436  y2021
## 9437  y2021
## 9438  y2021
## 9439  y2021
## 9440  y2021
## 9441  y2021
## 9442  y2021
## 9443  y2021
## 9444  y2021
## 9445  y2021
## 9446  y2021
## 9447  y2021
## 9448  y2021
## 9449  y2021
## 9450  y2021
## 9451  y2021
## 9452  y2021
## 9453  y2021
## 9454  y2021
## 9455  y2021
## 9456  y2021
## 9457  y2021
## 9458  y2021
## 9459  y2021
## 9460  y2021
## 9461  y2021
## 9462  y2021
## 9463  y2021
## 9464  y2021
## 9465  y2021
## 9466  y2021
## 9467  y2021
## 9468  y2021
## 9469  y2021
## 9470  y2021
## 9471  y2021
## 9472  y2021
## 9473  y2021
## 9474  y2021
## 9475  y2021
## 9476  y2021
## 9477  y2021
## 9478  y2021
## 9479  y2021
## 9480  y2021
## 9481  y2021
## 9482  y2021
## 9483  y2021
## 9484  y2021
## 9485  y2021
## 9486  y2021
## 9487  y2021
## 9488  y2021
## 9489  y2021
## 9490  y2021
## 9491  y2021
## 9492  y2021
## 9493  y2021
## 9494  y2021
## 9495  y2021
## 9496  y2021
## 9497  y2021
## 9498  y2021
## 9499  y2021
## 9500  y2021
## 9501  y2021
## 9502  y2021
## 9503  y2021
## 9504  y2021
## 9505  y2021
## 9506  y2021
## 9507  y2021
## 9508  y2021
## 9509  y2021
## 9510  y2021
## 9511  y2021
## 9512  y2021
## 9513  y2021
## 9514  y2021
## 9515  y2021
## 9516  y2021
## 9517  y2021
## 9518  y2021
## 9519  y2021
## 9520  y2021
## 9521  y2021
## 9522  y2021
## 9523  y2021
## 9524  y2021
## 9525  y2021
## 9526  y2021
## 9527  y2021
## 9528  y2021
## 9529  y2021
## 9530  y2021
## 9531  y2021
## 9532  y2021
## 9533  y2021
## 9534  y2021
## 9535  y2021
## 9536  y2021
## 9537  y2021
## 9538  y2021
## 9539  y2021
## 9540  y2021
## 9541  y2021
## 9542  y2021
## 9543  y2021
## 9544  y2021
## 9545  y2021
## 9546  y2021
## 9547  y2021
## 9548  y2021
## 9549  y2021
## 9550  y2021
## 9551  y2021
## 9552  y2021
## 9553  y2021
## 9554  y2021
## 9555  y2021
## 9556  y2021
## 9557  y2021
## 9558  y2021
## 9559  y2021
## 9560  y2021
## 9561  y2021
## 9562  y2021
## 9563  y2021
## 9564  y2021
## 9565  y2021
## 9566  y2021
## 9567  y2021
## 9568  y2021
## 9569  y2021
## 9570  y2021
## 9571  y2021
## 9572  y2021
## 9573  y2021
## 9574  y2021
## 9575  y2021
## 9576  y2021
## 9577  y2021
## 9578  y2021
## 9579  y2021
## 9580  y2021
## 9581  y2021
## 9582  y2021
## 9583  y2021
## 9584  y2021
## 9585  y2021
## 9586  y2021
## 9587  y2021
## 9588  y2021
## 9589  y2021
## 9590  y2021
## 9591  y2021
## 9592  y2021
## 9593  y2021
## 9594  y2021
## 9595  y2021
## 9596  y2021
## 9597  y2021
## 9598  y2021
## 9599  y2021
## 9600  y2021
## 9601  y2021
## 9602  y2021
## 9603  y2021
## 9604  y2021
## 9605  y2021
## 9606  y2021
## 9607  y2021
## 9608  y2021
## 9609  y2021
## 9610  y2021
## 9611  y2021
## 9612  y2021
## 9613  y2021
## 9614  y2021
## 9615  y2021
## 9616  y2021
## 9617  y2021
## 9618  y2021
## 9619  y2021
## 9620  y2021
## 9621  y2021
## 9622  y2021
## 9623  y2021
## 9624  y2021
## 9625  y2021
## 9626  y2021
## 9627  y2021
## 9628  y2021
## 9629  y2021
## 9630  y2021
## 9631  y2021
## 9632  y2021
## 9633  y2021
## 9634  y2021
## 9635  y2021
## 9636  y2021
## 9637  y2021
## 9638  y2021
## 9639  y2021
## 9640  y2021
## 9641  y2021
## 9642  y2021
## 9643  y2021
## 9644  y2021
## 9645  y2021
## 9646  y2021
## 9647  y2021
## 9648  y2021
## 9649  y2021
## 9650  y2021
## 9651  y2021
## 9652  y2021
## 9653  y2021
## 9654  y2021
## 9655  y2021
## 9656  y2021
## 9657  y2021
## 9658  y2021
## 9659  y2021
## 9660  y2021
## 9661  y2021
## 9662  y2021
## 9663  y2021
## 9664  y2021
## 9665  y2021
## 9666  y2021
## 9667  y2021
## 9668  y2021
## 9669  y2021
## 9670  y2021
## 9671  y2021
## 9672  y2021
## 9673  y2021
## 9674  y2021
## 9675  y2021
## 9676  y2021
## 9677  y2021
## 9678  y2021
## 9679  y2021
## 9680  y2021
## 9681  y2021
## 9682  y2021
## 9683  y2021
## 9684  y2021
## 9685  y2021
## 9686  y2021
## 9687  y2021
## 9688  y2021
## 9689  y2021
## 9690  y2021
## 9691  y2021
## 9692  y2021
## 9693  y2021
## 9694  y2021
## 9695  y2021
## 9696  y2021
## 9697  y2021
## 9698  y2021
## 9699  y2021
## 9700  y2021
## 9701  y2021
## 9702  y2021
## 9703  y2021
## 9704  y2021
## 9705  y2021
## 9706  y2021
## 9707  y2021
## 9708  y2021
## 9709  y2021
## 9710  y2021
## 9711  y2021
## 9712  y2021
## 9713  y2021
## 9714  y2021
## 9715  y2021
## 9716  y2021
## 9717  y2021
## 9718  y2021
## 9719  y2021
## 9720  y2021
## 9721  y2021
## 9722  y2021
## 9723  y2021
## 9724  y2021
## 9725  y2021
## 9726  y2021
## 9727  y2021
## 9728  y2021
## 9729  y2021
## 9730  y2021
## 9731  y2021
## 9732  y2021
## 9733  y2021
## 9734  y2021
## 9735  y2021
## 9736  y2021
## 9737  y2021
## 9738  y2021
## 9739  y2021
## 9740  y2021
## 9741  y2021
## 9742  y2021
## 9743  y2021
## 9744  y2021
## 9745  y2021
## 9746  y2021
## 9747  y2021
## 9748  y2021
## 9749  y2021
## 9750  y2021
## 9751  y2021
## 9752  y2021
## 9753  y2021
## 9754  y2021
## 9755  y2021
## 9756  y2021
## 9757  y2021
## 9758  y2021
## 9759  y2021
## 9760  y2021
## 9761  y2021
## 9762  y2021
## 9763  y2021
## 9764  y2021
## 9765  y2021
## 9766  y2021
## 9767  y2021
## 9768  y2021
## 9769  y2021
## 9770  y2021
## 9771  y2021
## 9772  y2021
## 9773  y2021
## 9774  y2021
## 9775  y2021
## 9776  y2021
## 9777  y2021
## 9778  y2021
## 9779  y2021
## 9780  y2021
## 9781  y2021
## 9782  y2021
## 9783  y2021
## 9784  y2021
## 9785  y2021
## 9786  y2021
## 9787  y2021
## 9788  y2021
## 9789  y2021
## 9790  y2021
## 9791  y2021
## 9792  y2021
## 9793  y2021
## 9794  y2021
## 9795  y2021
## 9796  y2021
## 9797  y2021
## 9798  y2021
## 9799  y2021
## 9800  y2021
## 9801  y2021
## 9802  y2021
## 9803  y2021
## 9804  y2021
## 9805  y2021
## 9806  y2021
## 9807  y2021
## 9808  y2021
## 9809  y2021
## 9810  y2021
## 9811  y2021
## 9812  y2021
## 9813  y2021
## 9814  y2021
## 9815  y2021
## 9816  y2021
## 9817  y2021
## 9818  y2021
## 9819  y2021
## 9820  y2021
## 9821  y2021
## 9822  y2021
## 9823  y2021
## 9824  y2021
## 9825  y2021
## 9826  y2021
## 9827  y2021
## 9828  y2021
## 9829  y2021
## 9830  y2021
## 9831  y2021
## 9832  y2021
## 9833  y2021
## 9834  y2021
## 9835  y2021
## 9836  y2021
## 9837  y2021
## 9838  y2021
## 9839  y2021
## 9840  y2021
## 9841  y2021
## 9842  y2021
## 9843  y2021
## 9844  y2021
## 9845  y2021
## 9846  y2021
## 9847  y2021
## 9848  y2021
## 9849  y2021
## 9850  y2021
## 9851  y2021
## 9852  y2021
## 9853  y2021
## 9854  y2021
## 9855  y2021
## 9856  y2021
## 9857  y2021
## 9858  y2021
## 9859  y2021
## 9860  y2021
## 9861  y2021
## 9862  y2021
## 9863  y2021
## 9864  y2021
## 9865  y2021
## 9866  y2021
## 9867  y2021
## 9868  y2021
## 9869  y2021
## 9870  y2021
## 9871  y2021
## 9872  y2021
## 9873  y2021
## 9874  y2021
## 9875  y2021
## 9876  y2021
## 9877  y2021
## 9878  y2021
## 9879  y2021
## 9880  y2021
## 9881  y2021
## 9882  y2021
## 9883  y2021
## 9884  y2021
## 9885  y2021
## 9886  y2021
## 9887  y2021
## 9888  y2021
## 9889  y2021
## 9890  y2021
## 9891  y2021
## 9892  y2021
## 9893  y2021
## 9894  y2021
## 9895  y2021
## 9896  y2021
## 9897  y2021
## 9898  y2021
## 9899  y2021
## 9900  y2021
## 9901  y2021
## 9902  y2021
## 9903  y2021
## 9904  y2021
## 9905  y2021
## 9906  y2021
## 9907  y2021
## 9908  y2021
## 9909  y2021
## 9910  y2021
## 9911  y2021
## 9912  y2021
## 9913  y2021
## 9914  y2021
## 9915  y2021
## 9916  y2021
## 9917  y2021
## 9918  y2021
## 9919  y2021
## 9920  y2021
## 9921  y2021
## 9922  y2021
## 9923  y2021
## 9924  y2021
## 9925  y2021
## 9926  y2021
## 9927  y2021
## 9928  y2021
## 9929  y2021
## 9930  y2021
## 9931  y2021
## 9932  y2021
## 9933  y2021
## 9934  y2021
## 9935  y2021
## 9936  y2021
## 9937  y2021
## 9938  y2021
## 9939  y2021
## 9940  y2021
## 9941  y2021
## 9942  y2021
## 9943  y2021
## 9944  y2021
## 9945  y2021
## 9946  y2021
## 9947  y2021
## 9948  y2021
## 9949  y2021
## 9950  y2021
## 9951  y2021
## 9952  y2021
## 9953  y2021
## 9954  y2021
## 9955  y2021
## 9956  y2021
## 9957  y2021
## 9958  y2021
## 9959  y2021
## 9960  y2021
## 9961  y2021
## 9962  y2021
## 9963  y2021
## 9964  y2021
## 9965  y2021
## 9966  y2021
## 9967  y2021
## 9968  y2021
## 9969  y2021
## 9970  y2021
## 9971  y2021
## 9972  y2021
## 9973  y2021
## 9974  y2021
## 9975  y2021
## 9976  y2021
## 9977  y2021
## 9978  y2021
## 9979  y2021
## 9980  y2021
## 9981  y2021
## 9982  y2021
## 9983  y2021
## 9984  y2021
## 9985  y2021
## 9986  y2022
## 9987  y2022
## 9988  y2022
## 9989  y2022
## 9990  y2022
## 9991  y2022
## 9992  y2022
## 9993  y2022
## 9994  y2022
## 9995  y2022
## 9996  y2022
## 9997  y2022
## 9998  y2022
## 9999  y2022
## 10000 y2022
## 10001 y2022
## 10002 y2022
## 10003 y2022
## 10004 y2022
## 10005 y2022
## 10006 y2022
## 10007 y2022
## 10008 y2022
## 10009 y2022
## 10010 y2022
## 10011 y2022
## 10012 y2022
## 10013 y2022
## 10014 y2022
## 10015 y2022
## 10016 y2022
## 10017 y2022
## 10018 y2022
## 10019 y2022
## 10020 y2022
## 10021 y2022
## 10022 y2022
## 10023 y2022
## 10024 y2022
## 10025 y2022
## 10026 y2022
## 10027 y2022
## 10028 y2022
## 10029 y2022
## 10030 y2022
## 10031 y2022
## 10032 y2022
## 10033 y2022
## 10034 y2022
## 10035 y2022
## 10036 y2022
## 10037 y2022
## 10038 y2022
## 10039 y2022
## 10040 y2022
## 10041 y2022
## 10042 y2022
## 10043 y2022
## 10044 y2022
## 10045 y2022
## 10046 y2022
## 10047 y2022
## 10048 y2022
## 10049 y2022
## 10050 y2022
## 10051 y2022
## 10052 y2022
## 10053 y2022
## 10054 y2022
## 10055 y2022
## 10056 y2022
## 10057 y2022
## 10058 y2022
## 10059 y2022
## 10060 y2022
## 10061 y2022
## 10062 y2022
## 10063 y2022
## 10064 y2022
## 10065 y2022
## 10066 y2022
## 10067 y2022
## 10068 y2022
## 10069 y2022
## 10070 y2022
## 10071 y2022
## 10072 y2022
## 10073 y2022
## 10074 y2022
## 10075 y2022
## 10076 y2022
## 10077 y2022
## 10078 y2022
## 10079 y2022
## 10080 y2022
## 10081 y2022
## 10082 y2022
## 10083 y2022
## 10084 y2022
## 10085 y2022
## 10086 y2022
## 10087 y2022
## 10088 y2022
## 10089 y2022
## 10090 y2022
## 10091 y2022
## 10092 y2022
## 10093 y2022
## 10094 y2022
## 10095 y2022
## 10096 y2022
## 10097 y2022
## 10098 y2022
## 10099 y2022
## 10100 y2022
## 10101 y2022
## 10102 y2022
## 10103 y2022
## 10104 y2022
## 10105 y2022
## 10106 y2022
## 10107 y2022
## 10108 y2022
## 10109 y2022
## 10110 y2022
## 10111 y2022
## 10112 y2022
## 10113 y2022
## 10114 y2022
## 10115 y2022
## 10116 y2022
## 10117 y2022
## 10118 y2022
## 10119 y2022
## 10120 y2022
## 10121 y2022
## 10122 y2022
## 10123 y2022
## 10124 y2022
## 10125 y2022
## 10126 y2022
## 10127 y2022
## 10128 y2022
## 10129 y2022
## 10130 y2022
## 10131 y2022
## 10132 y2022
## 10133 y2022
## 10134 y2022
## 10135 y2022
## 10136 y2022
## 10137 y2022
## 10138 y2022
## 10139 y2022
## 10140 y2022
## 10141 y2022
## 10142 y2022
## 10143 y2022
## 10144 y2022
## 10145 y2022
## 10146 y2022
## 10147 y2022
## 10148 y2022
## 10149 y2022
## 10150 y2022
## 10151 y2022
## 10152 y2022
## 10153 y2022
## 10154 y2022
## 10155 y2022
## 10156 y2022
## 10157 y2022
## 10158 y2022
## 10159 y2022
## 10160 y2022
## 10161 y2022
## 10162 y2022
## 10163 y2022
## 10164 y2022
## 10165 y2022
## 10166 y2022
## 10167 y2022
## 10168 y2022
## 10169 y2022
## 10170 y2022
## 10171 y2022
## 10172 y2022
## 10173 y2022
## 10174 y2022
## 10175 y2022
## 10176 y2022
## 10177 y2022
## 10178 y2022
## 10179 y2022
## 10180 y2022
## 10181 y2022
## 10182 y2022
## 10183 y2022
## 10184 y2022
## 10185 y2022
## 10186 y2022
## 10187 y2022
## 10188 y2022
## 10189 y2022
## 10190 y2022
## 10191 y2022
## 10192 y2022
## 10193 y2022
## 10194 y2022
## 10195 y2022
## 10196 y2022
## 10197 y2022
## 10198 y2022
## 10199 y2022
## 10200 y2022
## 10201 y2022
## 10202 y2022
## 10203 y2022
## 10204 y2022
## 10205 y2022
## 10206 y2022
## 10207 y2022
## 10208 y2022
## 10209 y2022
## 10210 y2022
## 10211 y2022
## 10212 y2022
## 10213 y2022
## 10214 y2022
## 10215 y2022
## 10216 y2022
## 10217 y2022
## 10218 y2022
## 10219 y2022
## 10220 y2022
## 10221 y2022
## 10222 y2022
## 10223 y2022
## 10224 y2022
## 10225 y2022
## 10226 y2022
## 10227 y2022
## 10228 y2022
## 10229 y2022
## 10230 y2022
## 10231 y2022
## 10232 y2022
## 10233 y2022
## 10234 y2022
## 10235 y2022
## 10236 y2022
## 10237 y2022
## 10238 y2022
## 10239 y2022
## 10240 y2022
## 10241 y2022
## 10242 y2022
## 10243 y2022
## 10244 y2022
## 10245 y2022
## 10246 y2022
## 10247 y2022
## 10248 y2022
## 10249 y2022
## 10250 y2022
## 10251 y2022
## 10252 y2022
## 10253 y2022
## 10254 y2022
## 10255 y2022
## 10256 y2022
## 10257 y2022
## 10258 y2022
## 10259 y2022
## 10260 y2022
## 10261 y2022
## 10262 y2022
## 10263 y2022
## 10264 y2022
## 10265 y2022
## 10266 y2022
## 10267 y2022
## 10268 y2022
## 10269 y2022
## 10270 y2022
## 10271 y2022
## 10272 y2022
## 10273 y2022
## 10274 y2022
## 10275 y2022
## 10276 y2022
## 10277 y2022
## 10278 y2022
## 10279 y2022
## 10280 y2022
## 10281 y2022
## 10282 y2022
## 10283 y2022
## 10284 y2022
## 10285 y2022
## 10286 y2022
## 10287 y2022
## 10288 y2022
## 10289 y2022
## 10290 y2022
## 10291 y2022
## 10292 y2022
## 10293 y2022
## 10294 y2022
## 10295 y2022
## 10296 y2022
## 10297 y2022
## 10298 y2022
## 10299 y2022
## 10300 y2022
## 10301 y2022
## 10302 y2022
## 10303 y2022
## 10304 y2022
## 10305 y2022
## 10306 y2022
## 10307 y2022
## 10308 y2022
## 10309 y2022
## 10310 y2022
## 10311 y2022
## 10312 y2022
## 10313 y2022
## 10314 y2022
## 10315 y2022
## 10316 y2022
## 10317 y2022
## 10318 y2022
## 10319 y2022
## 10320 y2022
## 10321 y2022
## 10322 y2022
## 10323 y2022
## 10324 y2022
## 10325 y2022
## 10326 y2022
## 10327 y2022
## 10328 y2022
## 10329 y2022
## 10330 y2022
## 10331 y2022
## 10332 y2022
## 10333 y2022
## 10334 y2022
## 10335 y2022
## 10336 y2022
## 10337 y2022
## 10338 y2022
## 10339 y2022
## 10340 y2022
## 10341 y2022
## 10342 y2022
## 10343 y2022
## 10344 y2022
## 10345 y2022
## 10346 y2022
## 10347 y2022
## 10348 y2022
## 10349 y2022
## 10350 y2022
## 10351 y2022
## 10352 y2022
## 10353 y2022
## 10354 y2022
## 10355 y2022
## 10356 y2022
## 10357 y2022
## 10358 y2022
## 10359 y2022
## 10360 y2022
## 10361 y2022
## 10362 y2022
## 10363 y2022
## 10364 y2022
## 10365 y2022
## 10366 y2022
## 10367 y2022
## 10368 y2022
## 10369 y2022
## 10370 y2022
## 10371 y2022
## 10372 y2022
## 10373 y2022
## 10374 y2022
## 10375 y2022
## 10376 y2022
## 10377 y2022
## 10378 y2022
## 10379 y2022
## 10380 y2022
## 10381 y2022
## 10382 y2022
## 10383 y2022
## 10384 y2022
## 10385 y2022
## 10386 y2022
## 10387 y2022
## 10388 y2022
## 10389 y2022
## 10390 y2022
## 10391 y2022
## 10392 y2022
## 10393 y2022
## 10394 y2022
## 10395 y2022
## 10396 y2022
## 10397 y2022
## 10398 y2022
## 10399 y2022
## 10400 y2022
## 10401 y2022
## 10402 y2022
## 10403 y2022
## 10404 y2022
## 10405 y2022
## 10406 y2022
## 10407 y2022
## 10408 y2022
## 10409 y2022
## 10410 y2022
## 10411 y2022
## 10412 y2022
## 10413 y2022
## 10414 y2022
## 10415 y2022
## 10416 y2022
## 10417 y2022
## 10418 y2022
## 10419 y2022
## 10420 y2022
## 10421 y2022
## 10422 y2022
## 10423 y2022
## 10424 y2022
## 10425 y2022
## 10426 y2022
## 10427 y2022
## 10428 y2022
## 10429 y2022
## 10430 y2022
## 10431 y2022
## 10432 y2022
## 10433 y2022
## 10434 y2022
## 10435 y2022
## 10436 y2022
## 10437 y2022
## 10438 y2022
## 10439 y2022
## 10440 y2022
## 10441 y2022
## 10442 y2022
## 10443 y2022
## 10444 y2022
## 10445 y2022
## 10446 y2022
## 10447 y2022
## 10448 y2022
## 10449 y2022
## 10450 y2022
## 10451 y2022
## 10452 y2022
## 10453 y2022
## 10454 y2022
## 10455 y2022
## 10456 y2022
## 10457 y2022
## 10458 y2022
## 10459 y2022
## 10460 y2022
## 10461 y2022
## 10462 y2022
## 10463 y2022
## 10464 y2022
## 10465 y2022
## 10466 y2022
## 10467 y2022
## 10468 y2022
## 10469 y2022
## 10470 y2022
## 10471 y2022
## 10472 y2022
## 10473 y2022
## 10474 y2022
## 10475 y2022
## 10476 y2022
## 10477 y2022
## 10478 y2022
## 10479 y2022
## 10480 y2022
## 10481 y2022
## 10482 y2022
## 10483 y2022
## 10484 y2022
## 10485 y2022
## 10486 y2022
## 10487 y2022
## 10488 y2022
## 10489 y2022
## 10490 y2022
## 10491 y2022
## 10492 y2022
## 10493 y2022
## 10494 y2022
## 10495 y2022
## 10496 y2022
## 10497 y2022
## 10498 y2022
## 10499 y2022
## 10500 y2022
## 10501 y2022
## 10502 y2022
## 10503 y2022
## 10504 y2022
## 10505 y2022
## 10506 y2022
## 10507 y2022
## 10508 y2022
## 10509 y2022
## 10510 y2022
## 10511 y2022
## 10512 y2022
## 10513 y2022
## 10514 y2022
## 10515 y2022
## 10516 y2022
## 10517 y2022
## 10518 y2022
## 10519 y2022
## 10520 y2022
## 10521 y2022
## 10522 y2022
## 10523 y2022
## 10524 y2022
## 10525 y2022
## 10526 y2022
## 10527 y2022
## 10528 y2022
## 10529 y2022
## 10530 y2022
## 10531 y2022
## 10532 y2022
## 10533 y2022
## 10534 y2022
## 10535 y2022
## 10536 y2022
## 10537 y2022
## 10538 y2022
## 10539 y2022
## 10540 y2022
## 10541 y2022
## 10542 y2022
## 10543 y2022
## 10544 y2022
## 10545 y2022
## 10546 y2022
## 10547 y2022
## 10548 y2022
## 10549 y2022
## 10550 y2022
## 10551 y2022
## 10552 y2022
## 10553 y2022
## 10554 y2022
## 10555 y2022
## 10556 y2022
## 10557 y2022
## 10558 y2022
## 10559 y2022
## 10560 y2022
## 10561 y2022
## 10562 y2022
## 10563 y2022
## 10564 y2022
## 10565 y2022
## 10566 y2022
## 10567 y2022
## 10568 y2022
## 10569 y2022
## 10570 y2022
## 10571 y2022
## 10572 y2022
## 10573 y2022
## 10574 y2022
## 10575 y2022
## 10576 y2022
## 10577 y2022
## 10578 y2022
## 10579 y2022
## 10580 y2022
## 10581 y2022
## 10582 y2022
## 10583 y2022
## 10584 y2022
## 10585 y2022
## 10586 y2022
## 10587 y2022
## 10588 y2022
## 10589 y2022
## 10590 y2022
## 10591 y2022
## 10592 y2022
## 10593 y2022
## 10594 y2022
## 10595 y2022
## 10596 y2022
## 10597 y2022
## 10598 y2022
## 10599 y2022
## 10600 y2022
## 10601 y2022
## 10602 y2022
## 10603 y2022
## 10604 y2022
## 10605 y2022
## 10606 y2022
## 10607 y2022
## 10608 y2022
## 10609 y2022
## 10610 y2022
## 10611 y2022
## 10612 y2022
## 10613 y2022
## 10614 y2022
## 10615 y2022
## 10616 y2022
## 10617 y2022
## 10618 y2022
## 10619 y2022
## 10620 y2022
## 10621 y2022
## 10622 y2022
## 10623 y2022
## 10624 y2022
## 10625 y2022
## 10626 y2022
## 10627 y2022
## 10628 y2022
## 10629 y2022
## 10630 y2022
## 10631 y2022
## 10632 y2022
## 10633 y2022
## 10634 y2022
## 10635 y2022
## 10636 y2022
## 10637 y2022
## 10638 y2022
## 10639 y2022
## 10640 y2022
## 10641 y2022
## 10642 y2022
## 10643 y2022
## 10644 y2022
## 10645 y2022
## 10646 y2022
## 10647 y2022
## 10648 y2022
## 10649 y2022
## 10650 y2022
## 10651 y2022
## 10652 y2022
## 10653 y2022
## 10654 y2022
## 10655 y2022
## 10656 y2022
## 10657 y2022
## 10658 y2022
## 10659 y2022
## 10660 y2022
## 10661 y2022
## 10662 y2022
## 10663 y2022
## 10664 y2022
## 10665 y2022
## 10666 y2022
## 10667 y2022
## 10668 y2022
## 10669 y2022
## 10670 y2022
## 10671 y2022
## 10672 y2022
## 10673 y2022
## 10674 y2022
## 10675 y2022
## 10676 y2022
## 10677 y2022
## 10678 y2022
## 10679 y2022
## 10680 y2022
## 10681 y2022
## 10682 y2022
## 10683 y2022
## 10684 y2022
## 10685 y2022
## 10686 y2022
## 10687 y2022
## 10688 y2022
## 10689 y2022
## 10690 y2022
## 10691 y2022
## 10692 y2022
## 10693 y2022
## 10694 y2022
## 10695 y2022
## 10696 y2022
## 10697 y2022
## 10698 y2022
## 10699 y2022
## 10700 y2022
## 10701 y2022
## 10702 y2022
## 10703 y2022
## 10704 y2022
## 10705 y2022
## 10706 y2022
## 10707 y2022
## 10708 y2022
## 10709 y2022
## 10710 y2022
## 10711 y2022
## 10712 y2022
## 10713 y2022
## 10714 y2022
## 10715 y2022
## 10716 y2022
## 10717 y2022
## 10718 y2022
## 10719 y2022
## 10720 y2022
## 10721 y2022
## 10722 y2022
## 10723 y2022
## 10724 y2022
## 10725 y2022
## 10726 y2022
## 10727 y2022
## 10728 y2022
## 10729 y2022
## 10730 y2022
## 10731 y2022
## 10732 y2022
## 10733 y2022
## 10734 y2022
## 10735 y2022
## 10736 y2022
## 10737 y2022
## 10738 y2022
## 10739 y2022
## 10740 y2022
## 10741 y2022
## 10742 y2022
## 10743 y2022
## 10744 y2022
## 10745 y2022
## 10746 y2022
## 10747 y2022
## 10748 y2022
## 10749 y2022
## 10750 y2022
## 10751 y2022
## 10752 y2022
## 10753 y2022
## 10754 y2022
## 10755 y2022
## 10756 y2022
## 10757 y2022
## 10758 y2022
## 10759 y2022
## 10760 y2022
## 10761 y2022
## 10762 y2022
## 10763 y2022
## 10764 y2022
## 10765 y2022
## 10766 y2022
## 10767 y2022
## 10768 y2022
## 10769 y2022
## 10770 y2022
## 10771 y2022
## 10772 y2022
## 10773 y2022
## 10774 y2022
## 10775 y2022
## 10776 y2022
## 10777 y2022
## 10778 y2022
## 10779 y2022
## 10780 y2022
## 10781 y2022
## 10782 y2022
## 10783 y2022
## 10784 y2022
## 10785 y2022
## 10786 y2022
## 10787 y2022
## 10788 y2022
## 10789 y2022
## 10790 y2022
## 10791 y2022
## 10792 y2022
## 10793 y2022
## 10794 y2022
## 10795 y2022
## 10796 y2022
## 10797 y2022
## 10798 y2022
## 10799 y2022
## 10800 y2022
## 10801 y2022
## 10802 y2022
## 10803 y2022
## 10804 y2022
## 10805 y2022
## 10806 y2022
## 10807 y2022
## 10808 y2022
## 10809 y2022
## 10810 y2022
## 10811 y2022
## 10812 y2022
## 10813 y2022
## 10814 y2022
## 10815 y2022
## 10816 y2022
## 10817 y2022
## 10818 y2022
## 10819 y2022
## 10820 y2022
## 10821 y2022
## 10822 y2022
## 10823 y2022
## 10824 y2022
## 10825 y2022
## 10826 y2022
## 10827 y2022
## 10828 y2022
## 10829 y2022
## 10830 y2022
## 10831 y2022
## 10832 y2022
## 10833 y2022
## 10834 y2022
## 10835 y2022
## 10836 y2022
## 10837 y2022
## 10838 y2022
## 10839 y2022
## 10840 y2022
## 10841 y2022
## 10842 y2022
## 10843 y2022
## 10844 y2022
## 10845 y2022
## 10846 y2022
## 10847 y2022
## 10848 y2022
## 10849 y2022
## 10850 y2022
## 10851 y2022
## 10852 y2022
## 10853 y2022
## 10854 y2022
## 10855 y2022
## 10856 y2022
## 10857 y2022
## 10858 y2022
## 10859 y2022
## 10860 y2022
## 10861 y2022
## 10862 y2022
## 10863 y2022
## 10864 y2022
## 10865 y2022
## 10866 y2022
## 10867 y2022
## 10868 y2022
## 10869 y2022
## 10870 y2022
## 10871 y2022
## 10872 y2022
## 10873 y2022
## 10874 y2022
## 10875 y2022
## 10876 y2022
## 10877 y2022
## 10878 y2022
## 10879 y2022
## 10880 y2022
## 10881 y2022
## 10882 y2022
## 10883 y2022
## 10884 y2022
## 10885 y2022
## 10886 y2022
## 10887 y2022
## 10888 y2022
## 10889 y2022
## 10890 y2022
## 10891 y2022
## 10892 y2022
## 10893 y2022
## 10894 y2022
## 10895 y2022
## 10896 y2022
## 10897 y2022
## 10898 y2022
## 10899 y2022
## 10900 y2022
## 10901 y2020
## 10902 y2020
## 10903 y2020
## 10904 y2020
## 10905 y2020
## 10906 y2020
## 10907 y2020
## 10908 y2020
## 10909 y2020
## 10910 y2020
## 10911 y2020
## 10912 y2020
## 10913 y2020
## 10914 y2020
## 10915 y2020
## 10916 y2020
## 10917 y2020
## 10918 y2020
## 10919 y2020
## 10920 y2020
## 10921 y2020
## 10922 y2020
## 10923 y2020
## 10924 y2020
## 10925 y2020
## 10926 y2020
## 10927 y2020
## 10928 y2020
## 10929 y2020
## 10930 y2020
## 10931 y2020
## 10932 y2020
## 10933 y2020
## 10934 y2020
## 10935 y2020
## 10936 y2020
## 10937 y2020
## 10938 y2020
## 10939 y2020
## 10940 y2020
## 10941 y2020
## 10942 y2020
## 10943 y2020
## 10944 y2020
## 10945 y2020
## 10946 y2020
## 10947 y2020
## 10948 y2020
## 10949 y2020
## 10950 y2020
## 10951 y2020
## 10952 y2020
## 10953 y2020
## 10954 y2020
## 10955 y2020
## 10956 y2020
## 10957 y2020
## 10958 y2020
## 10959 y2020
## 10960 y2020
## 10961 y2020
## 10962 y2020
## 10963 y2020
## 10964 y2020
## 10965 y2020
## 10966 y2020
## 10967 y2020
## 10968 y2020
## 10969 y2020
## 10970 y2020
## 10971 y2020
## 10972 y2020
## 10973 y2020
## 10974 y2020
## 10975 y2020
## 10976 y2020
## 10977 y2020
## 10978 y2020
## 10979 y2020
## 10980 y2020
## 10981 y2020
## 10982 y2020
## 10983 y2020
## 10984 y2020
## 10985 y2020
## 10986 y2020
## 10987 y2020
## 10988 y2020
## 10989 y2020
## 10990 y2020
## 10991 y2020
## 10992 y2020
## 10993 y2020
## 10994 y2020
## 10995 y2020
## 10996 y2020
## 10997 y2020
## 10998 y2020
## 10999 y2020
## 11000 y2020
## 11001 y2020
## 11002 y2020
## 11003 y2020
## 11004 y2020
## 11005 y2020
## 11006 y2020
## 11007 y2020
## 11008 y2020
## 11009 y2020
## 11010 y2020
## 11011 y2020
## 11012 y2020
## 11013 y2020
## 11014 y2020
## 11015 y2020
## 11016 y2020
## 11017 y2020
## 11018 y2020
## 11019 y2020
## 11020 y2020
## 11021 y2020
## 11022 y2020
## 11023 y2020
## 11024 y2020
## 11025 y2020
## 11026 y2020
## 11027 y2020
## 11028 y2020
## 11029 y2020
## 11030 y2020
## 11031 y2020
## 11032 y2020
## 11033 y2020
## 11034 y2020
## 11035 y2020
## 11036 y2020
## 11037 y2020
## 11038 y2020
## 11039 y2020
## 11040 y2020
## 11041 y2020
## 11042 y2020
## 11043 y2020
## 11044 y2020
## 11045 y2020
## 11046 y2020
## 11047 y2020
## 11048 y2020
## 11049 y2020
## 11050 y2020
## 11051 y2020
## 11052 y2020
## 11053 y2020
## 11054 y2020
## 11055 y2020
## 11056 y2020
## 11057 y2020
## 11058 y2020
## 11059 y2020
## 11060 y2020
## 11061 y2020
## 11062 y2020
## 11063 y2020
## 11064 y2020
## 11065 y2020
## 11066 y2020
## 11067 y2020
## 11068 y2020
## 11069 y2020
## 11070 y2020
## 11071 y2020
## 11072 y2020
## 11073 y2020
## 11074 y2020
## 11075 y2020
## 11076 y2020
## 11077 y2020
## 11078 y2020
## 11079 y2020
## 11080 y2020
## 11081 y2020
## 11082 y2020
## 11083 y2020
## 11084 y2020
## 11085 y2020
## 11086 y2020
## 11087 y2020
## 11088 y2020
## 11089 y2020
## 11090 y2020
## 11091 y2020
## 11092 y2020
## 11093 y2020
## 11094 y2020
## 11095 y2020
## 11096 y2020
## 11097 y2020
## 11098 y2020
## 11099 y2020
## 11100 y2020
## 11101 y2020
## 11102 y2020
## 11103 y2020
## 11104 y2020
## 11105 y2020
## 11106 y2020
## 11107 y2020
## 11108 y2020
## 11109 y2020
## 11110 y2020
## 11111 y2020
## 11112 y2020
## 11113 y2020
## 11114 y2020
## 11115 y2020
## 11116 y2020
## 11117 y2020
## 11118 y2020
## 11119 y2020
## 11120 y2020
## 11121 y2020
## 11122 y2020
## 11123 y2020
## 11124 y2020
## 11125 y2020
## 11126 y2020
## 11127 y2020
## 11128 y2020
## 11129 y2020
## 11130 y2020
## 11131 y2020
## 11132 y2020
## 11133 y2020
## 11134 y2020
## 11135 y2020
## 11136 y2020
## 11137 y2020
## 11138 y2020
## 11139 y2020
## 11140 y2020
## 11141 y2020
## 11142 y2020
## 11143 y2020
## 11144 y2020
## 11145 y2020
## 11146 y2020
## 11147 y2020
## 11148 y2020
## 11149 y2020
## 11150 y2020
## 11151 y2020
## 11152 y2020
## 11153 y2020
## 11154 y2020
## 11155 y2020
## 11156 y2020
## 11157 y2020
## 11158 y2020
## 11159 y2020
## 11160 y2020
## 11161 y2020
## 11162 y2020
## 11163 y2020
## 11164 y2020
## 11165 y2020
## 11166 y2020
## 11167 y2020
## 11168 y2020
## 11169 y2020
## 11170 y2020
## 11171 y2020
## 11172 y2020
## 11173 y2020
## 11174 y2020
## 11175 y2020
## 11176 y2020
## 11177 y2020
## 11178 y2020
## 11179 y2020
## 11180 y2020
## 11181 y2020
## 11182 y2020
## 11183 y2020
## 11184 y2020
## 11185 y2020
## 11186 y2020
## 11187 y2020
## 11188 y2020
## 11189 y2020
## 11190 y2020
## 11191 y2020
## 11192 y2020
## 11193 y2020
## 11194 y2020
## 11195 y2020
## 11196 y2020
## 11197 y2020
## 11198 y2020
## 11199 y2020
## 11200 y2020
## 11201 y2020
## 11202 y2020
## 11203 y2020
## 11204 y2020
## 11205 y2020
## 11206 y2020
## 11207 y2020
## 11208 y2020
## 11209 y2020
## 11210 y2020
## 11211 y2020
## 11212 y2020
## 11213 y2020
## 11214 y2020
## 11215 y2020
## 11216 y2020
## 11217 y2020
## 11218 y2020
## 11219 y2020
## 11220 y2020
## 11221 y2020
## 11222 y2020
## 11223 y2020
## 11224 y2020
## 11225 y2020
## 11226 y2020
## 11227 y2020
## 11228 y2020
## 11229 y2020
## 11230 y2020
## 11231 y2020
## 11232 y2020
## 11233 y2020
## 11234 y2020
## 11235 y2020
## 11236 y2020
## 11237 y2020
## 11238 y2020
## 11239 y2020
## 11240 y2020
## 11241 y2020
## 11242 y2020
## 11243 y2020
## 11244 y2020
## 11245 y2020
## 11246 y2020
## 11247 y2020
## 11248 y2020
## 11249 y2020
## 11250 y2020
## 11251 y2020
## 11252 y2020
## 11253 y2020
## 11254 y2020
## 11255 y2020
## 11256 y2020
## 11257 y2020
## 11258 y2020
## 11259 y2020
## 11260 y2020
## 11261 y2020
## 11262 y2020
## 11263 y2020
## 11264 y2020
## 11265 y2020
## 11266 y2020
## 11267 y2020
## 11268 y2020
## 11269 y2020
## 11270 y2020
## 11271 y2020
## 11272 y2020
## 11273 y2020
## 11274 y2020
## 11275 y2020
## 11276 y2020
## 11277 y2020
## 11278 y2020
## 11279 y2020
## 11280 y2020
## 11281 y2020
## 11282 y2020
## 11283 y2020
## 11284 y2020
## 11285 y2020
## 11286 y2020
## 11287 y2020
## 11288 y2020
## 11289 y2020
## 11290 y2020
## 11291 y2020
## 11292 y2020
## 11293 y2020
## 11294 y2020
## 11295 y2020
## 11296 y2020
## 11297 y2020
## 11298 y2020
## 11299 y2020
## 11300 y2020
## 11301 y2020
## 11302 y2020
## 11303 y2020
## 11304 y2020
## 11305 y2020
## 11306 y2020
## 11307 y2020
## 11308 y2020
## 11309 y2020
## 11310 y2020
## 11311 y2020
## 11312 y2020
## 11313 y2020
## 11314 y2020
## 11315 y2020
## 11316 y2020
## 11317 y2020
## 11318 y2020
## 11319 y2020
## 11320 y2020
## 11321 y2020
## 11322 y2020
## 11323 y2020
## 11324 y2020
## 11325 y2020
## 11326 y2020
## 11327 y2020
## 11328 y2020
## 11329 y2020
## 11330 y2020
## 11331 y2020
## 11332 y2020
## 11333 y2020
## 11334 y2020
## 11335 y2020
## 11336 y2020
## 11337 y2020
## 11338 y2020
## 11339 y2020
## 11340 y2020
## 11341 y2020
## 11342 y2020
## 11343 y2020
## 11344 y2020
## 11345 y2020
## 11346 y2020
## 11347 y2020
## 11348 y2020
## 11349 y2020
## 11350 y2020
## 11351 y2020
## 11352 y2020
## 11353 y2020
## 11354 y2020
## 11355 y2020
## 11356 y2020
## 11357 y2020
## 11358 y2020
## 11359 y2020
## 11360 y2020
## 11361 y2020
## 11362 y2020
## 11363 y2020
## 11364 y2020
## 11365 y2020
## 11366 y2020
## 11367 y2020
## 11368 y2020
## 11369 y2020
## 11370 y2020
## 11371 y2020
## 11372 y2020
## 11373 y2020
## 11374 y2020
## 11375 y2020
## 11376 y2020
## 11377 y2020
## 11378 y2020
## 11379 y2020
## 11380 y2020
## 11381 y2020
## 11382 y2020
## 11383 y2020
## 11384 y2020
## 11385 y2020
## 11386 y2020
## 11387 y2020
## 11388 y2020
## 11389 y2020
## 11390 y2020
## 11391 y2020
## 11392 y2020
## 11393 y2020
## 11394 y2020
## 11395 y2020
## 11396 y2020
## 11397 y2020
## 11398 y2020
## 11399 y2020
## 11400 y2020
## 11401 y2020
## 11402 y2020
## 11403 y2020
## 11404 y2020
## 11405 y2020
## 11406 y2020
## 11407 y2020
## 11408 y2020
## 11409 y2020
## 11410 y2020
## 11411 y2020
## 11412 y2020
## 11413 y2020
## 11414 y2020
## 11415 y2020
## 11416 y2020
## 11417 y2020
## 11418 y2020
## 11419 y2020
## 11420 y2020
## 11421 y2020
## 11422 y2020
## 11423 y2020
## 11424 y2020
## 11425 y2020
## 11426 y2020
## 11427 y2020
## 11428 y2020
## 11429 y2020
## 11430 y2020
## 11431 y2020
## 11432 y2020
## 11433 y2020
## 11434 y2020
## 11435 y2020
## 11436 y2020
## 11437 y2020
## 11438 y2020
## 11439 y2020
## 11440 y2020
## 11441 y2020
## 11442 y2020
## 11443 y2020
## 11444 y2020
## 11445 y2020
## 11446 y2020
## 11447 y2020
## 11448 y2020
## 11449 y2020
## 11450 y2020
## 11451 y2020
## 11452 y2020
## 11453 y2020
## 11454 y2020
## 11455 y2020
## 11456 y2020
## 11457 y2020
## 11458 y2020
## 11459 y2020
## 11460 y2020
## 11461 y2020
## 11462 y2020
## 11463 y2020
## 11464 y2020
## 11465 y2020
## 11466 y2020
## 11467 y2020
## 11468 y2020
## 11469 y2020
## 11470 y2020
## 11471 y2020
## 11472 y2020
## 11473 y2020
## 11474 y2020
## 11475 y2020
## 11476 y2020
## 11477 y2020
## 11478 y2020
## 11479 y2020
## 11480 y2020
## 11481 y2020
## 11482 y2020
## 11483 y2020
## 11484 y2020
## 11485 y2020
## 11486 y2020
## 11487 y2020
## 11488 y2020
## 11489 y2020
## 11490 y2020
## 11491 y2020
## 11492 y2020
## 11493 y2020
## 11494 y2020
## 11495 y2020
## 11496 y2020
## 11497 y2020
## 11498 y2020
## 11499 y2020
## 11500 y2020
## 11501 y2020
## 11502 y2020
## 11503 y2020
## 11504 y2020
## 11505 y2020
## 11506 y2020
## 11507 y2020
## 11508 y2020
## 11509 y2020
## 11510 y2020
## 11511 y2020
## 11512 y2020
## 11513 y2020
## 11514 y2020
## 11515 y2020
## 11516 y2020
## 11517 y2020
## 11518 y2020
## 11519 y2020
## 11520 y2020
## 11521 y2020
## 11522 y2020
## 11523 y2020
## 11524 y2020
## 11525 y2020
## 11526 y2020
## 11527 y2020
## 11528 y2020
## 11529 y2020
## 11530 y2020
## 11531 y2020
## 11532 y2020
## 11533 y2020
## 11534 y2020
## 11535 y2020
## 11536 y2020
## 11537 y2020
## 11538 y2020
## 11539 y2020
## 11540 y2020
## 11541 y2020
## 11542 y2020
## 11543 y2020
## 11544 y2020
## 11545 y2020
## 11546 y2020
## 11547 y2020
## 11548 y2020
## 11549 y2020
## 11550 y2020
## 11551 y2020
## 11552 y2020
## 11553 y2020
## 11554 y2020
## 11555 y2020
## 11556 y2020
## 11557 y2020
## 11558 y2020
## 11559 y2020
## 11560 y2020
## 11561 y2020
## 11562 y2020
## 11563 y2020
## 11564 y2020
## 11565 y2020
## 11566 y2020
## 11567 y2020
## 11568 y2020
## 11569 y2020
## 11570 y2020
## 11571 y2020
## 11572 y2020
## 11573 y2020
## 11574 y2020
## 11575 y2020
## 11576 y2020
## 11577 y2020
## 11578 y2020
## 11579 y2020
## 11580 y2020
## 11581 y2020
## 11582 y2020
## 11583 y2020
## 11584 y2020
## 11585 y2020
## 11586 y2020
## 11587 y2020
## 11588 y2020
## 11589 y2020
## 11590 y2020
## 11591 y2020
## 11592 y2020
## 11593 y2020
## 11594 y2020
## 11595 y2020
## 11596 y2020
## 11597 y2020
## 11598 y2020
## 11599 y2020
## 11600 y2020
## 11601 y2020
## 11602 y2020
## 11603 y2020
## 11604 y2020
## 11605 y2020
## 11606 y2020
## 11607 y2020
## 11608 y2020
## 11609 y2020
## 11610 y2020
## 11611 y2020
## 11612 y2020
## 11613 y2020
## 11614 y2020
## 11615 y2020
## 11616 y2020
## 11617 y2020
## 11618 y2020
## 11619 y2020
## 11620 y2020
## 11621 y2020
## 11622 y2020
## 11623 y2020
## 11624 y2020
## 11625 y2020
## 11626 y2020
## 11627 y2020
## 11628 y2020
## 11629 y2020
## 11630 y2020
## 11631 y2020
## 11632 y2020
## 11633 y2020
## 11634 y2020
## 11635 y2020
## 11636 y2020
## 11637 y2020
## 11638 y2020
## 11639 y2020
## 11640 y2020
## 11641 y2020
## 11642 y2020
## 11643 y2020
## 11644 y2020
## 11645 y2020
## 11646 y2020
## 11647 y2020
## 11648 y2020
## 11649 y2020
## 11650 y2020
## 11651 y2020
## 11652 y2020
## 11653 y2020
## 11654 y2020
## 11655 y2020
## 11656 y2020
## 11657 y2020
## 11658 y2020
## 11659 y2020
## 11660 y2020
## 11661 y2020
## 11662 y2020
## 11663 y2020
## 11664 y2020
## 11665 y2020
## 11666 y2020
## 11667 y2020
## 11668 y2020
## 11669 y2020
## 11670 y2020
## 11671 y2020
## 11672 y2020
## 11673 y2020
## 11674 y2020
## 11675 y2020
## 11676 y2020
## 11677 y2020
## 11678 y2020
## 11679 y2020
## 11680 y2020
## 11681 y2020
## 11682 y2020
## 11683 y2020
## 11684 y2020
## 11685 y2020
## 11686 y2020
## 11687 y2020
## 11688 y2020
## 11689 y2020
## 11690 y2020
## 11691 y2020
## 11692 y2020
## 11693 y2020
## 11694 y2020
## 11695 y2020
## 11696 y2020
## 11697 y2020
## 11698 y2020
## 11699 y2020
## 11700 y2020
## 11701 y2020
## 11702 y2020
## 11703 y2020
## 11704 y2020
## 11705 y2020
## 11706 y2020
## 11707 y2020
## 11708 y2020
## 11709 y2020
## 11710 y2020
## 11711 y2020
## 11712 y2020
## 11713 y2020
## 11714 y2020
## 11715 y2020
## 11716 y2020
## 11717 y2020
## 11718 y2020
## 11719 y2020
## 11720 y2020
## 11721 y2020
## 11722 y2020
## 11723 y2020
## 11724 y2020
## 11725 y2020
## 11726 y2020
## 11727 y2020
## 11728 y2020
## 11729 y2020
## 11730 y2020
## 11731 y2020
## 11732 y2020
## 11733 y2020
## 11734 y2020
## 11735 y2020
## 11736 y2020
## 11737 y2020
## 11738 y2020
## 11739 y2020
## 11740 y2020
## 11741 y2020
## 11742 y2020
## 11743 y2020
## 11744 y2020
## 11745 y2020
## 11746 y2020
## 11747 y2020
## 11748 y2020
## 11749 y2020
## 11750 y2020
## 11751 y2020
## 11752 y2020
## 11753 y2020
## 11754 y2020
## 11755 y2020
## 11756 y2020
## 11757 y2020
## 11758 y2020
## 11759 y2020
## 11760 y2020
## 11761 y2020
## 11762 y2020
## 11763 y2020
## 11764 y2020
## 11765 y2020
## 11766 y2020
## 11767 y2020
## 11768 y2020
## 11769 y2020
## 11770 y2020
## 11771 y2020
## 11772 y2020
## 11773 y2020
## 11774 y2020
## 11775 y2020
## 11776 y2020
## 11777 y2020
## 11778 y2020
## 11779 y2020
## 11780 y2020
## 11781 y2020
## 11782 y2020
## 11783 y2020
## 11784 y2020
## 11785 y2020
## 11786 y2020
## 11787 y2020
## 11788 y2020
## 11789 y2020
## 11790 y2020
## 11791 y2020
## 11792 y2020
## 11793 y2020
## 11794 y2020
## 11795 y2020
## 11796 y2020
## 11797 y2020
## 11798 y2020
## 11799 y2020
## 11800 y2020
## 11801 y2020
## 11802 y2020
## 11803 y2020
## 11804 y2020
## 11805 y2020
## 11806 y2020
## 11807 y2020
## 11808 y2020
## 11809 y2020
## 11810 y2020
## 11811 y2020
## 11812 y2020
## 11813 y2020
## 11814 y2020
## 11815 y2020
## 11816 y2020
## 11817 y2020
## 11818 y2020
## 11819 y2020
## 11820 y2020
## 11821 y2020
## 11822 y2020
## 11823 y2020
## 11824 y2020
## 11825 y2020
## 11826 y2020
## 11827 y2020
## 11828 y2020
## 11829 y2020
## 11830 y2020
## 11831 y2020
## 11832 y2020
## 11833 y2020
## 11834 y2020
## 11835 y2020
## 11836 y2020
## 11837 y2020
## 11838 y2020
## 11839 y2020
## 11840 y2020
## 11841 y2020
## 11842 y2020
## 11843 y2020
## 11844 y2020
## 11845 y2020
## 11846 y2020
## 11847 y2020
## 11848 y2020
## 11849 y2020
## 11850 y2020
## 11851 y2020
## 11852 y2020
## 11853 y2020
## 11854 y2020
## 11855 y2020
## 11856 y2020
## 11857 y2020
## 11858 y2020
## 11859 y2020
## 11860 y2020
## 11861 y2020
## 11862 y2020
## 11863 y2020
## 11864 y2020
## 11865 y2020
## 11866 y2020
## 11867 y2020
## 11868 y2020
## 11869 y2020
## 11870 y2020
## 11871 y2020
## 11872 y2020
## 11873 y2020
## 11874 y2020
## 11875 y2020
## 11876 y2020
## 11877 y2020
## 11878 y2020
## 11879 y2020
## 11880 y2020
## 11881 y2020
## 11882 y2020
## 11883 y2020
## 11884 y2020
## 11885 y2020
## 11886 y2020
## 11887 y2020
## 11888 y2020
## 11889 y2020
## 11890 y2020
## 11891 y2020
## 11892 y2020
## 11893 y2020
## 11894 y2020
## 11895 y2020
## 11896 y2020
## 11897 y2020
## 11898 y2020
## 11899 y2020
## 11900 y2020
## 11901 y2020
## 11902 y2020
## 11903 y2020
## 11904 y2020
## 11905 y2020
## 11906 y2020
## 11907 y2020
## 11908 y2020
## 11909 y2020
## 11910 y2020
## 11911 y2020
## 11912 y2020
## 11913 y2020
## 11914 y2020
## 11915 y2020
## 11916 y2020
## 11917 y2020
## 11918 y2020
## 11919 y2020
## 11920 y2020
## 11921 y2020
## 11922 y2020
## 11923 y2020
## 11924 y2020
## 11925 y2020
## 11926 y2020
## 11927 y2020
## 11928 y2020
## 11929 y2020
## 11930 y2020
## 11931 y2020
## 11932 y2020
## 11933 y2020
## 11934 y2020
## 11935 y2020
## 11936 y2020
## 11937 y2020
## 11938 y2020
## 11939 y2020
## 11940 y2020
## 11941 y2020
## 11942 y2020
## 11943 y2020
## 11944 y2020
## 11945 y2020
## 11946 y2020
## 11947 y2020
## 11948 y2020
## 11949 y2020
## 11950 y2020
## 11951 y2020
## 11952 y2020
## 11953 y2020
## 11954 y2020
## 11955 y2020
## 11956 y2020
## 11957 y2020
## 11958 y2020
## 11959 y2020
## 11960 y2020
## 11961 y2020
## 11962 y2020
## 11963 y2020
## 11964 y2020
## 11965 y2020
## 11966 y2020
## 11967 y2020
## 11968 y2020
## 11969 y2020
## 11970 y2020
## 11971 y2020
## 11972 y2020
## 11973 y2020
## 11974 y2020
## 11975 y2020
## 11976 y2020
## 11977 y2020
## 11978 y2020
## 11979 y2020
## 11980 y2020
## 11981 y2020
## 11982 y2020
## 11983 y2020
## 11984 y2020
## 11985 y2020
## 11986 y2020
## 11987 y2020
## 11988 y2020
## 11989 y2020
## 11990 y2020
## 11991 y2020
## 11992 y2020
## 11993 y2020
## 11994 y2020
## 11995 y2020
## 11996 y2020
## 11997 y2020
## 11998 y2020
## 11999 y2020
## 12000 y2020
## 12001 y2020
## 12002 y2020
## 12003 y2020
## 12004 y2020
## 12005 y2020
## 12006 y2020
## 12007 y2020
## 12008 y2020
## 12009 y2020
## 12010 y2020
## 12011 y2020
## 12012 y2020
## 12013 y2020
## 12014 y2020
## 12015 y2020
## 12016 y2020
## 12017 y2020
## 12018 y2020
## 12019 y2020
## 12020 y2020
## 12021 y2020
## 12022 y2020
## 12023 y2020
## 12024 y2020
## 12025 y2020
## 12026 y2020
## 12027 y2020
## 12028 y2020
## 12029 y2020
## 12030 y2020
## 12031 y2020
## 12032 y2020
## 12033 y2020
## 12034 y2020
## 12035 y2020
## 12036 y2020
## 12037 y2020
## 12038 y2020
## 12039 y2020
## 12040 y2020
## 12041 y2020
## 12042 y2020
## 12043 y2020
## 12044 y2020
## 12045 y2020
## 12046 y2020
## 12047 y2020
## 12048 y2020
## 12049 y2020
## 12050 y2020
## 12051 y2020
## 12052 y2020
## 12053 y2020
## 12054 y2020
## 12055 y2020
## 12056 y2020
## 12057 y2020
## 12058 y2020
## 12059 y2020
## 12060 y2020
## 12061 y2020
## 12062 y2020
## 12063 y2020
## 12064 y2020
## 12065 y2020
## 12066 y2020
## 12067 y2020
## 12068 y2020
## 12069 y2020
## 12070 y2020
## 12071 y2020
## 12072 y2020
## 12073 y2020
## 12074 y2020
## 12075 y2020
## 12076 y2020
## 12077 y2020
## 12078 y2020
## 12079 y2020
## 12080 y2020
## 12081 y2020
## 12082 y2020
## 12083 y2020
## 12084 y2020
## 12085 y2020
## 12086 y2020
## 12087 y2020
## 12088 y2020
## 12089 y2020
## 12090 y2020
## 12091 y2020
## 12092 y2020
## 12093 y2020
## 12094 y2020
## 12095 y2020
## 12096 y2020
## 12097 y2020
## 12098 y2020
## 12099 y2020
## 12100 y2020
## 12101 y2020
## 12102 y2020
## 12103 y2020
## 12104 y2020
## 12105 y2020
## 12106 y2020
## 12107 y2020
## 12108 y2020
## 12109 y2020
## 12110 y2020
## 12111 y2020
## 12112 y2020
## 12113 y2020
## 12114 y2020
## 12115 y2020
## 12116 y2020
## 12117 y2020
## 12118 y2020
## 12119 y2020
## 12120 y2020
## 12121 y2020
## 12122 y2020
## 12123 y2020
## 12124 y2020
## 12125 y2020
## 12126 y2020
## 12127 y2020
## 12128 y2020
## 12129 y2020
## 12130 y2020
## 12131 y2020
## 12132 y2020
## 12133 y2020
## 12134 y2020
## 12135 y2020
## 12136 y2020
## 12137 y2020
## 12138 y2020
## 12139 y2020
## 12140 y2020
## 12141 y2020
## 12142 y2020
## 12143 y2020
## 12144 y2020
## 12145 y2020
## 12146 y2020
## 12147 y2020
## 12148 y2020
## 12149 y2020
## 12150 y2020
## 12151 y2020
## 12152 y2020
## 12153 y2020
## 12154 y2020
## 12155 y2020
## 12156 y2020
## 12157 y2020
## 12158 y2020
## 12159 y2020
## 12160 y2020
## 12161 y2020
## 12162 y2020
## 12163 y2020
## 12164 y2020
## 12165 y2020
## 12166 y2020
## 12167 y2020
## 12168 y2020
## 12169 y2020
## 12170 y2020
## 12171 y2020
## 12172 y2020
## 12173 y2020
## 12174 y2020
## 12175 y2020
## 12176 y2020
## 12177 y2020
## 12178 y2020
## 12179 y2020
## 12180 y2020
## 12181 y2020
## 12182 y2020
## 12183 y2020
## 12184 y2020
## 12185 y2020
## 12186 y2020
## 12187 y2020
## 12188 y2020
## 12189 y2020
## 12190 y2020
## 12191 y2020
## 12192 y2020
## 12193 y2020
## 12194 y2020
## 12195 y2020
## 12196 y2020
## 12197 y2020
## 12198 y2020
## 12199 y2020
## 12200 y2020
## 12201 y2020
## 12202 y2020
## 12203 y2020
## 12204 y2020
## 12205 y2020
## 12206 y2020
## 12207 y2020
## 12208 y2020
## 12209 y2020
## 12210 y2020
## 12211 y2020
## 12212 y2020
## 12213 y2020
## 12214 y2020
## 12215 y2020
## 12216 y2020
## 12217 y2020
## 12218 y2020
## 12219 y2020
## 12220 y2020
## 12221 y2020
## 12222 y2020
## 12223 y2020
## 12224 y2020
## 12225 y2020
## 12226 y2020
## 12227 y2020
## 12228 y2020
## 12229 y2020
## 12230 y2020
## 12231 y2020
## 12232 y2020
## 12233 y2020
## 12234 y2020
## 12235 y2020
## 12236 y2020
## 12237 y2020
## 12238 y2020
## 12239 y2020
## 12240 y2020
## 12241 y2020
## 12242 y2020
## 12243 y2020
## 12244 y2020
## 12245 y2020
## 12246 y2020
## 12247 y2020
## 12248 y2020
## 12249 y2020
## 12250 y2020
## 12251 y2020
## 12252 y2020
## 12253 y2020
## 12254 y2020
## 12255 y2020
## 12256 y2020
## 12257 y2020
## 12258 y2020
## 12259 y2020
## 12260 y2020
## 12261 y2020
## 12262 y2020
## 12263 y2020
## 12264 y2020
## 12265 y2020
## 12266 y2020
## 12267 y2020
## 12268 y2020
## 12269 y2020
## 12270 y2020
## 12271 y2020
## 12272 y2020
## 12273 y2020
## 12274 y2020
## 12275 y2020
## 12276 y2020
## 12277 y2020
## 12278 y2020
## 12279 y2020
## 12280 y2020
## 12281 y2020
## 12282 y2020
## 12283 y2020
## 12284 y2020
## 12285 y2020
## 12286 y2020
## 12287 y2020
## 12288 y2020
## 12289 y2020
## 12290 y2020
## 12291 y2020
## 12292 y2020
## 12293 y2020
## 12294 y2020
## 12295 y2020
## 12296 y2020
## 12297 y2020
## 12298 y2020
## 12299 y2020
## 12300 y2020
## 12301 y2020
## 12302 y2020
## 12303 y2020
## 12304 y2020
## 12305 y2020
## 12306 y2020
## 12307 y2020
## 12308 y2020
## 12309 y2020
## 12310 y2020
## 12311 y2020
## 12312 y2020
## 12313 y2020
## 12314 y2020
## 12315 y2020
## 12316 y2020
## 12317 y2020
## 12318 y2020
## 12319 y2020
## 12320 y2020
## 12321 y2020
## 12322 y2020
## 12323 y2020
## 12324 y2020
## 12325 y2020
## 12326 y2020
## 12327 y2020
## 12328 y2020
## 12329 y2020
## 12330 y2020
## 12331 y2020
## 12332 y2020
## 12333 y2020
## 12334 y2020
## 12335 y2020
## 12336 y2020
## 12337 y2020
## 12338 y2020
## 12339 y2020
## 12340 y2020
## 12341 y2020
## 12342 y2020
## 12343 y2020
## 12344 y2020
## 12345 y2020
## 12346 y2020
## 12347 y2020
## 12348 y2020
## 12349 y2020
## 12350 y2020
## 12351 y2020
## 12352 y2020
## 12353 y2020
## 12354 y2020
## 12355 y2020
## 12356 y2020
## 12357 y2020
## 12358 y2020
## 12359 y2020
## 12360 y2020
## 12361 y2020
## 12362 y2020
## 12363 y2020
## 12364 y2020
## 12365 y2020
## 12366 y2020
## 12367 y2020
## 12368 y2020
## 12369 y2020
## 12370 y2020
## 12371 y2020
## 12372 y2020
## 12373 y2020
## 12374 y2020
## 12375 y2020
## 12376 y2020
## 12377 y2020
## 12378 y2020
## 12379 y2020
## 12380 y2020
## 12381 y2020
## 12382 y2020
## 12383 y2020
## 12384 y2020
## 12385 y2020
## 12386 y2020
## 12387 y2020
## 12388 y2020
## 12389 y2020
## 12390 y2020
## 12391 y2020
## 12392 y2020
## 12393 y2020
## 12394 y2020
## 12395 y2020
## 12396 y2020
## 12397 y2020
## 12398 y2020
## 12399 y2020
## 12400 y2020
## 12401 y2020
## 12402 y2020
## 12403 y2020
## 12404 y2020
## 12405 y2020
## 12406 y2020
## 12407 y2020
## 12408 y2020
## 12409 y2020
## 12410 y2020
## 12411 y2020
## 12412 y2020
## 12413 y2020
## 12414 y2020
## 12415 y2020
## 12416 y2020
## 12417 y2020
## 12418 y2020
## 12419 y2020
## 12420 y2020
## 12421 y2020
## 12422 y2020
## 12423 y2020
## 12424 y2020
## 12425 y2020
## 12426 y2020
## 12427 y2020
## 12428 y2020
## 12429 y2020
## 12430 y2020
## 12431 y2020
## 12432 y2020
## 12433 y2020
## 12434 y2020
## 12435 y2020
## 12436 y2020
## 12437 y2020
## 12438 y2020
## 12439 y2020
## 12440 y2020
## 12441 y2020
## 12442 y2020
## 12443 y2020
## 12444 y2020
## 12445 y2020
## 12446 y2020
## 12447 y2020
## 12448 y2020
## 12449 y2020
## 12450 y2020
## 12451 y2020
## 12452 y2020
## 12453 y2020
## 12454 y2020
## 12455 y2020
## 12456 y2020
## 12457 y2020
## 12458 y2020
## 12459 y2020
## 12460 y2020
## 12461 y2020
## 12462 y2020
## 12463 y2020
## 12464 y2020
## 12465 y2020
## 12466 y2020
## 12467 y2020
## 12468 y2020
## 12469 y2020
## 12470 y2020
## 12471 y2020
## 12472 y2020
## 12473 y2020
## 12474 y2020
## 12475 y2020
## 12476 y2020
## 12477 y2020
## 12478 y2020
## 12479 y2020
## 12480 y2020
## 12481 y2020
## 12482 y2020
## 12483 y2020
## 12484 y2020
## 12485 y2020
## 12486 y2020
## 12487 y2020
## 12488 y2020
## 12489 y2020
## 12490 y2020
## 12491 y2020
## 12492 y2020
## 12493 y2020
## 12494 y2020
## 12495 y2020
## 12496 y2020
## 12497 y2020
## 12498 y2020
## 12499 y2020
## 12500 y2020
## 12501 y2020
## 12502 y2020
## 12503 y2020
## 12504 y2020
## 12505 y2020
## 12506 y2020
## 12507 y2020
## 12508 y2020
## 12509 y2020
## 12510 y2020
## 12511 y2020
## 12512 y2020
## 12513 y2020
## 12514 y2020
## 12515 y2020
## 12516 y2020
## 12517 y2020
## 12518 y2020
## 12519 y2020
## 12520 y2020
## 12521 y2020
## 12522 y2020
## 12523 y2020
## 12524 y2020
## 12525 y2020
## 12526 y2020
## 12527 y2020
## 12528 y2020
## 12529 y2020
## 12530 y2020
## 12531 y2020
## 12532 y2020
## 12533 y2020
## 12534 y2020
## 12535 y2020
## 12536 y2020
## 12537 y2020
## 12538 y2020
## 12539 y2020
## 12540 y2020
## 12541 y2020
## 12542 y2020
## 12543 y2020
## 12544 y2020
## 12545 y2020
## 12546 y2020
## 12547 y2020
## 12548 y2020
## 12549 y2020
## 12550 y2020
## 12551 y2020
## 12552 y2020
## 12553 y2020
## 12554 y2020
## 12555 y2020
## 12556 y2020
## 12557 y2020
## 12558 y2020
## 12559 y2020
## 12560 y2020
## 12561 y2020
## 12562 y2020
## 12563 y2020
## 12564 y2020
## 12565 y2020
## 12566 y2020
## 12567 y2020
## 12568 y2020
## 12569 y2020
## 12570 y2020
## 12571 y2020
## 12572 y2020
## 12573 y2020
## 12574 y2020
## 12575 y2020
## 12576 y2020
## 12577 y2020
## 12578 y2020
## 12579 y2020
## 12580 y2020
## 12581 y2020
## 12582 y2020
## 12583 y2020
## 12584 y2020
## 12585 y2020
## 12586 y2020
## 12587 y2020
## 12588 y2020
## 12589 y2020
## 12590 y2020
## 12591 y2020
## 12592 y2020
## 12593 y2020
## 12594 y2020
## 12595 y2020
## 12596 y2020
## 12597 y2020
## 12598 y2020
## 12599 y2020
## 12600 y2020
## 12601 y2020
## 12602 y2020
## 12603 y2020
## 12604 y2020
## 12605 y2020
## 12606 y2020
## 12607 y2020
## 12608 y2020
## 12609 y2020
## 12610 y2020
## 12611 y2020
## 12612 y2020
## 12613 y2020
## 12614 y2020
## 12615 y2020
## 12616 y2020
## 12617 y2020
## 12618 y2020
## 12619 y2020
## 12620 y2020
## 12621 y2020
## 12622 y2020
## 12623 y2020
## 12624 y2020
## 12625 y2020
## 12626 y2020
## 12627 y2020
## 12628 y2020
## 12629 y2020
## 12630 y2020
## 12631 y2020
## 12632 y2020
## 12633 y2020
## 12634 y2020
## 12635 y2020
## 12636 y2020
## 12637 y2020
## 12638 y2020
## 12639 y2020
## 12640 y2020
## 12641 y2020
## 12642 y2020
## 12643 y2020
## 12644 y2020
## 12645 y2020
## 12646 y2020
## 12647 y2020
## 12648 y2020
## 12649 y2020
## 12650 y2020
## 12651 y2020
## 12652 y2020
## 12653 y2020
## 12654 y2020
## 12655 y2020
## 12656 y2020
## 12657 y2020
## 12658 y2020
## 12659 y2020
## 12660 y2020
## 12661 y2020
## 12662 y2020
## 12663 y2020
## 12664 y2020
## 12665 y2020
## 12666 y2020
## 12667 y2020
## 12668 y2020
## 12669 y2020
## 12670 y2020
## 12671 y2020
## 12672 y2020
## 12673 y2020
## 12674 y2020
## 12675 y2020
## 12676 y2020
## 12677 y2020
## 12678 y2020
## 12679 y2020
## 12680 y2020
## 12681 y2020
## 12682 y2020
## 12683 y2020
## 12684 y2020
## 12685 y2020
## 12686 y2020
## 12687 y2020
## 12688 y2020
## 12689 y2020
## 12690 y2020
## 12691 y2020
## 12692 y2020
## 12693 y2020
## 12694 y2020
## 12695 y2020
## 12696 y2020
## 12697 y2020
## 12698 y2020
## 12699 y2020
## 12700 y2020
## 12701 y2020
## 12702 y2020
## 12703 y2020
## 12704 y2020
## 12705 y2020
## 12706 y2020
## 12707 y2020
## 12708 y2020
## 12709 y2020
## 12710 y2020
## 12711 y2020
## 12712 y2020
## 12713 y2020
## 12714 y2020
## 12715 y2020
## 12716 y2020
## 12717 y2020
## 12718 y2020
## 12719 y2020
## 12720 y2020
## 12721 y2020
## 12722 y2020
## 12723 y2020
## 12724 y2020
## 12725 y2020
## 12726 y2020
## 12727 y2020
## 12728 y2020
## 12729 y2020
## 12730 y2020
## 12731 y2020
## 12732 y2020
## 12733 y2020
## 12734 y2020
## 12735 y2020
## 12736 y2020
## 12737 y2020
## 12738 y2020
## 12739 y2020
## 12740 y2020
## 12741 y2020
## 12742 y2020
## 12743 y2020
## 12744 y2020
## 12745 y2020
## 12746 y2020
## 12747 y2020
## 12748 y2020
## 12749 y2020
## 12750 y2020
## 12751 y2020
## 12752 y2020
## 12753 y2020
## 12754 y2020
## 12755 y2020
## 12756 y2020
## 12757 y2020
## 12758 y2020
## 12759 y2020
## 12760 y2020
## 12761 y2020
## 12762 y2020
## 12763 y2020
## 12764 y2020
## 12765 y2020
## 12766 y2020
## 12767 y2020
## 12768 y2020
## 12769 y2020
## 12770 y2020
## 12771 y2020
## 12772 y2020
## 12773 y2020
## 12774 y2020
## 12775 y2020
## 12776 y2020
## 12777 y2020
## 12778 y2020
## 12779 y2020
## 12780 y2020
## 12781 y2020
## 12782 y2020
## 12783 y2020
## 12784 y2020
## 12785 y2020
## 12786 y2020
## 12787 y2020
## 12788 y2020
## 12789 y2020
## 12790 y2020
## 12791 y2020
## 12792 y2020
## 12793 y2020
## 12794 y2020
## 12795 y2020
## 12796 y2020
## 12797 y2020
## 12798 y2020
## 12799 y2020
## 12800 y2020
## 12801 y2020
## 12802 y2020
## 12803 y2020
## 12804 y2020
## 12805 y2020
## 12806 y2020
## 12807 y2020
## 12808 y2020
## 12809 y2020
## 12810 y2020
## 12811 y2020
## 12812 y2020
## 12813 y2020
## 12814 y2020
## 12815 y2020
## 12816 y2020
## 12817 y2020
## 12818 y2020
## 12819 y2020
## 12820 y2020
## 12821 y2020
## 12822 y2020
## 12823 y2020
## 12824 y2020
## 12825 y2020
## 12826 y2020
## 12827 y2020
## 12828 y2020
## 12829 y2020
## 12830 y2020
## 12831 y2020
## 12832 y2020
## 12833 y2020
## 12834 y2020
## 12835 y2020
## 12836 y2020
## 12837 y2020
## 12838 y2020
## 12839 y2020
## 12840 y2020
## 12841 y2020
## 12842 y2020
## 12843 y2020
## 12844 y2020
## 12845 y2020
## 12846 y2020
## 12847 y2020
## 12848 y2020
## 12849 y2020
## 12850 y2020
## 12851 y2020
## 12852 y2020
## 12853 y2020
## 12854 y2020
## 12855 y2020
## 12856 y2020
## 12857 y2020
## 12858 y2020
## 12859 y2020
## 12860 y2020
## 12861 y2020
## 12862 y2020
## 12863 y2020
## 12864 y2020
## 12865 y2020
## 12866 y2020
## 12867 y2020
## 12868 y2020
## 12869 y2020
## 12870 y2020
## 12871 y2020
## 12872 y2020
## 12873 y2020
## 12874 y2020
## 12875 y2020
## 12876 y2020
## 12877 y2020
## 12878 y2020
## 12879 y2020
## 12880 y2020
## 12881 y2020
## 12882 y2020
## 12883 y2020
## 12884 y2020
## 12885 y2020
## 12886 y2020
## 12887 y2020
## 12888 y2020
## 12889 y2020
## 12890 y2020
## 12891 y2020
## 12892 y2020
## 12893 y2020
## 12894 y2020
## 12895 y2020
## 12896 y2020
## 12897 y2020
## 12898 y2020
## 12899 y2020
## 12900 y2020
## 12901 y2020
## 12902 y2020
## 12903 y2020
## 12904 y2020
## 12905 y2020
## 12906 y2020
## 12907 y2020
## 12908 y2020
## 12909 y2020
## 12910 y2020
## 12911 y2020
## 12912 y2020
## 12913 y2020
## 12914 y2020
## 12915 y2020
## 12916 y2020
## 12917 y2020
## 12918 y2020
## 12919 y2020
## 12920 y2020
## 12921 y2020
## 12922 y2020
## 12923 y2020
## 12924 y2020
## 12925 y2020
## 12926 y2020
## 12927 y2020
## 12928 y2020
## 12929 y2020
## 12930 y2020
## 12931 y2020
## 12932 y2020
## 12933 y2020
## 12934 y2020
## 12935 y2020
## 12936 y2020
## 12937 y2020
## 12938 y2020
## 12939 y2020
## 12940 y2020
## 12941 y2020
## 12942 y2020
## 12943 y2020
## 12944 y2020
## 12945 y2020
## 12946 y2020
## 12947 y2020
## 12948 y2020
## 12949 y2020
## 12950 y2020
## 12951 y2020
## 12952 y2020
## 12953 y2020
## 12954 y2020
## 12955 y2020
## 12956 y2020
## 12957 y2020
## 12958 y2020
## 12959 y2020
## 12960 y2020
## 12961 y2020
## 12962 y2020
## 12963 y2020
## 12964 y2020
## 12965 y2020
## 12966 y2020
## 12967 y2020
## 12968 y2020
## 12969 y2020
## 12970 y2020
## 12971 y2020
## 12972 y2020
## 12973 y2020
## 12974 y2020
## 12975 y2020
## 12976 y2020
## 12977 y2020
## 12978 y2020
## 12979 y2020
## 12980 y2020
## 12981 y2020
## 12982 y2020
## 12983 y2020
## 12984 y2020
## 12985 y2020
## 12986 y2020
## 12987 y2020
## 12988 y2020
## 12989 y2020
## 12990 y2020
## 12991 y2020
## 12992 y2020
## 12993 y2020
## 12994 y2020
## 12995 y2020
## 12996 y2020
## 12997 y2020
## 12998 y2020
## 12999 y2020
## 13000 y2020
## 13001 y2020
## 13002 y2020
## 13003 y2020
## 13004 y2020
## 13005 y2020
## 13006 y2020
## 13007 y2020
## 13008 y2020
## 13009 y2020
## 13010 y2020
## 13011 y2020
## 13012 y2020
## 13013 y2020
## 13014 y2020
## 13015 y2020
## 13016 y2020
## 13017 y2020
## 13018 y2020
## 13019 y2020
## 13020 y2020
## 13021 y2020
## 13022 y2020
## 13023 y2020
## 13024 y2020
## 13025 y2020
## 13026 y2020
## 13027 y2020
## 13028 y2020
## 13029 y2020
## 13030 y2020
## 13031 y2020
## 13032 y2020
## 13033 y2020
## 13034 y2020
## 13035 y2020
## 13036 y2020
## 13037 y2020
## 13038 y2020
## 13039 y2020
## 13040 y2020
## 13041 y2020
## 13042 y2020
## 13043 y2020
## 13044 y2020
## 13045 y2020
## 13046 y2020
## 13047 y2020
## 13048 y2020
## 13049 y2020
## 13050 y2020
## 13051 y2020
## 13052 y2020
## 13053 y2020
## 13054 y2020
## 13055 y2020
## 13056 y2020
## 13057 y2020
## 13058 y2020
## 13059 y2020
## 13060 y2020
## 13061 y2020
## 13062 y2020
## 13063 y2020
## 13064 y2020
## 13065 y2020
## 13066 y2020
## 13067 y2020
## 13068 y2020
## 13069 y2020
## 13070 y2020
## 13071 y2020
## 13072 y2020
## 13073 y2020
## 13074 y2020
## 13075 y2020
## 13076 y2020
## 13077 y2020
## 13078 y2020
## 13079 y2020
## 13080 y2020
## 13081 y2020
## 13082 y2020
## 13083 y2020
## 13084 y2020
## 13085 y2020
## 13086 y2020
## 13087 y2020
## 13088 y2020
## 13089 y2020
## 13090 y2020
## 13091 y2020
## 13092 y2020
## 13093 y2020
## 13094 y2020
## 13095 y2020
## 13096 y2020
## 13097 y2020
## 13098 y2020
## 13099 y2020
## 13100 y2020
## 13101 y2020
## 13102 y2020
## 13103 y2020
## 13104 y2020
## 13105 y2020
## 13106 y2020
## 13107 y2020
## 13108 y2020
## 13109 y2020
## 13110 y2020
## 13111 y2020
## 13112 y2020
## 13113 y2020
## 13114 y2020
## 13115 y2020
## 13116 y2020
## 13117 y2020
## 13118 y2020
## 13119 y2020
## 13120 y2020
## 13121 y2020
## 13122 y2020
## 13123 y2020
## 13124 y2020
## 13125 y2020
## 13126 y2020
## 13127 y2020
## 13128 y2020
## 13129 y2020
## 13130 y2020
## 13131 y2020
## 13132 y2020
## 13133 y2020
## 13134 y2020
## 13135 y2020
## 13136 y2020
## 13137 y2020
## 13138 y2020
## 13139 y2020
## 13140 y2020
## 13141 y2020
## 13142 y2020
## 13143 y2020
## 13144 y2020
## 13145 y2020
## 13146 y2020
## 13147 y2020
## 13148 y2020
## 13149 y2020
## 13150 y2020
## 13151 y2020
## 13152 y2020
## 13153 y2020
## 13154 y2020
## 13155 y2020
## 13156 y2020
## 13157 y2020
## 13158 y2020
## 13159 y2020
## 13160 y2020
## 13161 y2020
## 13162 y2020
## 13163 y2020
## 13164 y2020
## 13165 y2020
## 13166 y2020
## 13167 y2020
## 13168 y2020
## 13169 y2020
## 13170 y2020
## 13171 y2020
## 13172 y2020
## 13173 y2020
## 13174 y2020
## 13175 y2020
## 13176 y2020
## 13177 y2020
## 13178 y2020
## 13179 y2020
## 13180 y2020
## 13181 y2020
## 13182 y2020
## 13183 y2020
## 13184 y2020
## 13185 y2020
## 13186 y2020
## 13187 y2020
## 13188 y2020
## 13189 y2020
## 13190 y2020
## 13191 y2020
## 13192 y2020
## 13193 y2020
## 13194 y2020
## 13195 y2020
## 13196 y2020
## 13197 y2020
## 13198 y2020
## 13199 y2020
## 13200 y2020
## 13201 y2020
## 13202 y2020
## 13203 y2020
## 13204 y2020
## 13205 y2020
## 13206 y2020
## 13207 y2020
## 13208 y2020
## 13209 y2020
## 13210 y2020
## 13211 y2020
## 13212 y2020
## 13213 y2020
## 13214 y2020
## 13215 y2020
## 13216 y2020
## 13217 y2020
## 13218 y2020
## 13219 y2020
## 13220 y2020
## 13221 y2020
## 13222 y2020
## 13223 y2020
## 13224 y2020
## 13225 y2020
## 13226 y2020
## 13227 y2020
## 13228 y2020
## 13229 y2020
## 13230 y2020
## 13231 y2020
## 13232 y2020
## 13233 y2020
## 13234 y2020
## 13235 y2020
## 13236 y2020
## 13237 y2020
## 13238 y2020
## 13239 y2020
## 13240 y2020
## 13241 y2020
## 13242 y2020
## 13243 y2020
## 13244 y2020
## 13245 y2020
## 13246 y2020
## 13247 y2020
## 13248 y2020
## 13249 y2020
## 13250 y2020
## 13251 y2020
## 13252 y2020
## 13253 y2020
## 13254 y2020
## 13255 y2020
## 13256 y2020
## 13257 y2020
## 13258 y2020
## 13259 y2020
## 13260 y2020
## 13261 y2020
## 13262 y2020
## 13263 y2020
## 13264 y2020
## 13265 y2020
## 13266 y2020
## 13267 y2020
## 13268 y2020
## 13269 y2020
## 13270 y2020
## 13271 y2020
## 13272 y2020
## 13273 y2020
## 13274 y2020
## 13275 y2020
## 13276 y2020
## 13277 y2020
## 13278 y2020
## 13279 y2020
## 13280 y2020
## 13281 y2020
## 13282 y2020
## 13283 y2020
## 13284 y2020
## 13285 y2020
## 13286 y2020
## 13287 y2020
## 13288 y2020
## 13289 y2020
## 13290 y2020
## 13291 y2020
## 13292 y2020
## 13293 y2020
## 13294 y2020
## 13295 y2020
## 13296 y2020
## 13297 y2020
## 13298 y2020
## 13299 y2020
## 13300 y2020
## 13301 y2020
## 13302 y2020
## 13303 y2020
## 13304 y2020
## 13305 y2020
## 13306 y2020
## 13307 y2020
## 13308 y2020
## 13309 y2020
## 13310 y2020
## 13311 y2020
## 13312 y2020
## 13313 y2020
## 13314 y2020
## 13315 y2020
## 13316 y2020
## 13317 y2020
## 13318 y2020
## 13319 y2020
## 13320 y2020
## 13321 y2020
## 13322 y2020
## 13323 y2020
## 13324 y2020
## 13325 y2020
## 13326 y2020
## 13327 y2020
## 13328 y2020
## 13329 y2020
## 13330 y2020
## 13331 y2020
## 13332 y2020
## 13333 y2021
## 13334 y2021
## 13335 y2021
## 13336 y2021
## 13337 y2021
## 13338 y2021
## 13339 y2021
## 13340 y2021
## 13341 y2021
## 13342 y2021
## 13343 y2021
## 13344 y2021
## 13345 y2021
## 13346 y2021
## 13347 y2021
## 13348 y2021
## 13349 y2021
## 13350 y2021
## 13351 y2021
## 13352 y2021
## 13353 y2021
## 13354 y2021
## 13355 y2021
## 13356 y2021
## 13357 y2021
## 13358 y2021
## 13359 y2021
## 13360 y2021
## 13361 y2021
## 13362 y2021
## 13363 y2021
## 13364 y2021
## 13365 y2021
## 13366 y2021
## 13367 y2021
## 13368 y2021
## 13369 y2021
## 13370 y2021
## 13371 y2021
## 13372 y2021
## 13373 y2021
## 13374 y2021
## 13375 y2021
## 13376 y2021
## 13377 y2021
## 13378 y2021
## 13379 y2021
## 13380 y2021
## 13381 y2021
## 13382 y2021
## 13383 y2021
## 13384 y2021
## 13385 y2021
## 13386 y2021
## 13387 y2021
## 13388 y2021
## 13389 y2021
## 13390 y2021
## 13391 y2021
## 13392 y2021
## 13393 y2021
## 13394 y2021
## 13395 y2021
## 13396 y2021
## 13397 y2021
## 13398 y2021
## 13399 y2021
## 13400 y2021
## 13401 y2021
## 13402 y2021
## 13403 y2021
## 13404 y2021
## 13405 y2021
## 13406 y2021
## 13407 y2021
## 13408 y2021
## 13409 y2021
## 13410 y2021
## 13411 y2021
## 13412 y2021
## 13413 y2021
## 13414 y2021
## 13415 y2021
## 13416 y2021
## 13417 y2021
## 13418 y2021
## 13419 y2021
## 13420 y2021
## 13421 y2021
## 13422 y2021
## 13423 y2021
## 13424 y2021
## 13425 y2021
## 13426 y2021
## 13427 y2021
## 13428 y2021
## 13429 y2021
## 13430 y2021
## 13431 y2021
## 13432 y2021
## 13433 y2021
## 13434 y2021
## 13435 y2021
## 13436 y2021
## 13437 y2021
## 13438 y2021
## 13439 y2021
## 13440 y2021
## 13441 y2021
## 13442 y2021
## 13443 y2021
## 13444 y2021
## 13445 y2021
## 13446 y2021
## 13447 y2021
## 13448 y2021
## 13449 y2021
## 13450 y2021
## 13451 y2021
## 13452 y2021
## 13453 y2021
## 13454 y2021
## 13455 y2021
## 13456 y2021
## 13457 y2021
## 13458 y2021
## 13459 y2021
## 13460 y2021
## 13461 y2021
## 13462 y2021
## 13463 y2021
## 13464 y2021
## 13465 y2021
## 13466 y2021
## 13467 y2021
## 13468 y2021
## 13469 y2021
## 13470 y2021
## 13471 y2021
## 13472 y2021
## 13473 y2021
## 13474 y2021
## 13475 y2021
## 13476 y2021
## 13477 y2021
## 13478 y2021
## 13479 y2021
## 13480 y2021
## 13481 y2021
## 13482 y2021
## 13483 y2021
## 13484 y2021
## 13485 y2021
## 13486 y2021
## 13487 y2021
## 13488 y2021
## 13489 y2021
## 13490 y2021
## 13491 y2021
## 13492 y2021
## 13493 y2021
## 13494 y2021
## 13495 y2021
## 13496 y2021
## 13497 y2021
## 13498 y2021
## 13499 y2021
## 13500 y2021
## 13501 y2021
## 13502 y2021
## 13503 y2021
## 13504 y2021
## 13505 y2021
## 13506 y2021
## 13507 y2021
## 13508 y2021
## 13509 y2021
## 13510 y2021
## 13511 y2021
## 13512 y2021
## 13513 y2021
## 13514 y2021
## 13515 y2021
## 13516 y2021
## 13517 y2021
## 13518 y2021
## 13519 y2021
## 13520 y2021
## 13521 y2021
## 13522 y2021
## 13523 y2021
## 13524 y2021
## 13525 y2021
## 13526 y2021
## 13527 y2021
## 13528 y2021
## 13529 y2021
## 13530 y2021
## 13531 y2021
## 13532 y2021
## 13533 y2021
## 13534 y2021
## 13535 y2021
## 13536 y2021
## 13537 y2021
## 13538 y2021
## 13539 y2021
## 13540 y2021
## 13541 y2021
## 13542 y2021
## 13543 y2021
## 13544 y2021
## 13545 y2021
## 13546 y2021
## 13547 y2021
## 13548 y2021
## 13549 y2021
## 13550 y2021
## 13551 y2021
## 13552 y2021
## 13553 y2021
## 13554 y2021
## 13555 y2021
## 13556 y2021
## 13557 y2021
## 13558 y2021
## 13559 y2021
## 13560 y2021
## 13561 y2021
## 13562 y2021
## 13563 y2021
## 13564 y2021
## 13565 y2021
## 13566 y2021
## 13567 y2021
## 13568 y2021
## 13569 y2021
## 13570 y2021
## 13571 y2021
## 13572 y2021
## 13573 y2021
## 13574 y2021
## 13575 y2021
## 13576 y2021
## 13577 y2021
## 13578 y2021
## 13579 y2021
## 13580 y2021
## 13581 y2021
## 13582 y2021
## 13583 y2021
## 13584 y2021
## 13585 y2021
## 13586 y2021
## 13587 y2021
## 13588 y2021
## 13589 y2021
## 13590 y2021
## 13591 y2021
## 13592 y2021
## 13593 y2021
## 13594 y2021
## 13595 y2021
## 13596 y2021
## 13597 y2021
## 13598 y2021
## 13599 y2021
## 13600 y2021
## 13601 y2021
## 13602 y2021
## 13603 y2021
## 13604 y2021
## 13605 y2021
## 13606 y2021
## 13607 y2021
## 13608 y2021
## 13609 y2021
## 13610 y2021
## 13611 y2021
## 13612 y2021
## 13613 y2021
## 13614 y2021
## 13615 y2021
## 13616 y2021
## 13617 y2021
## 13618 y2021
## 13619 y2021
## 13620 y2021
## 13621 y2021
## 13622 y2021
## 13623 y2021
## 13624 y2021
## 13625 y2021
## 13626 y2021
## 13627 y2021
## 13628 y2021
## 13629 y2021
## 13630 y2021
## 13631 y2021
## 13632 y2021
## 13633 y2021
## 13634 y2021
## 13635 y2021
## 13636 y2021
## 13637 y2021
## 13638 y2021
## 13639 y2021
## 13640 y2021
## 13641 y2021
## 13642 y2021
## 13643 y2021
## 13644 y2021
## 13645 y2021
## 13646 y2021
## 13647 y2021
## 13648 y2021
## 13649 y2021
## 13650 y2021
## 13651 y2021
## 13652 y2021
## 13653 y2021
## 13654 y2021
## 13655 y2021
## 13656 y2021
## 13657 y2021
## 13658 y2021
## 13659 y2021
## 13660 y2021
## 13661 y2021
## 13662 y2021
## 13663 y2021
## 13664 y2021
## 13665 y2021
## 13666 y2021
## 13667 y2021
## 13668 y2021
## 13669 y2021
## 13670 y2021
## 13671 y2021
## 13672 y2021
## 13673 y2021
## 13674 y2021
## 13675 y2021
## 13676 y2021
## 13677 y2021
## 13678 y2021
## 13679 y2021
## 13680 y2021
## 13681 y2021
## 13682 y2021
## 13683 y2021
## 13684 y2021
## 13685 y2021
## 13686 y2021
## 13687 y2021
## 13688 y2021
## 13689 y2021
## 13690 y2021
## 13691 y2021
## 13692 y2021
## 13693 y2021
## 13694 y2021
## 13695 y2021
## 13696 y2021
## 13697 y2021
## 13698 y2021
## 13699 y2021
## 13700 y2021
## 13701 y2021
## 13702 y2021
## 13703 y2021
## 13704 y2021
## 13705 y2021
## 13706 y2021
## 13707 y2021
## 13708 y2021
## 13709 y2021
## 13710 y2021
## 13711 y2021
## 13712 y2021
## 13713 y2021
## 13714 y2021
## 13715 y2021
## 13716 y2021
## 13717 y2021
## 13718 y2021
## 13719 y2021
## 13720 y2021
## 13721 y2021
## 13722 y2021
## 13723 y2021
## 13724 y2021
## 13725 y2021
## 13726 y2021
## 13727 y2021
## 13728 y2021
## 13729 y2021
## 13730 y2021
## 13731 y2021
## 13732 y2021
## 13733 y2021
## 13734 y2021
## 13735 y2021
## 13736 y2021
## 13737 y2021
## 13738 y2021
## 13739 y2021
## 13740 y2021
## 13741 y2021
## 13742 y2021
## 13743 y2021
## 13744 y2021
## 13745 y2021
## 13746 y2021
## 13747 y2021
## 13748 y2021
## 13749 y2021
## 13750 y2021
## 13751 y2021
## 13752 y2021
## 13753 y2021
## 13754 y2021
## 13755 y2021
## 13756 y2021
## 13757 y2021
## 13758 y2021
## 13759 y2021
## 13760 y2021
## 13761 y2021
## 13762 y2021
## 13763 y2021
## 13764 y2021
## 13765 y2021
## 13766 y2021
## 13767 y2021
## 13768 y2021
## 13769 y2021
## 13770 y2021
## 13771 y2021
## 13772 y2021
## 13773 y2021
## 13774 y2021
## 13775 y2021
## 13776 y2021
## 13777 y2021
## 13778 y2021
## 13779 y2021
## 13780 y2021
## 13781 y2021
## 13782 y2021
## 13783 y2021
## 13784 y2021
## 13785 y2021
## 13786 y2021
## 13787 y2021
## 13788 y2021
## 13789 y2021
## 13790 y2021
## 13791 y2021
## 13792 y2021
## 13793 y2021
## 13794 y2021
## 13795 y2021
## 13796 y2021
## 13797 y2021
## 13798 y2021
## 13799 y2021
## 13800 y2021
## 13801 y2021
## 13802 y2021
## 13803 y2021
## 13804 y2021
## 13805 y2021
## 13806 y2021
## 13807 y2021
## 13808 y2021
## 13809 y2021
## 13810 y2021
## 13811 y2021
## 13812 y2021
## 13813 y2021
## 13814 y2021
## 13815 y2021
## 13816 y2021
## 13817 y2021
## 13818 y2021
## 13819 y2021
## 13820 y2021
## 13821 y2021
## 13822 y2021
## 13823 y2021
## 13824 y2021
## 13825 y2021
## 13826 y2021
## 13827 y2021
## 13828 y2021
## 13829 y2021
## 13830 y2021
## 13831 y2021
## 13832 y2021
## 13833 y2021
## 13834 y2021
## 13835 y2021
## 13836 y2021
## 13837 y2021
## 13838 y2021
## 13839 y2021
## 13840 y2021
## 13841 y2021
## 13842 y2021
## 13843 y2021
## 13844 y2021
## 13845 y2021
## 13846 y2021
## 13847 y2021
## 13848 y2021
## 13849 y2021
## 13850 y2021
## 13851 y2021
## 13852 y2021
## 13853 y2021
## 13854 y2021
## 13855 y2021
## 13856 y2021
## 13857 y2021
## 13858 y2021
## 13859 y2021
## 13860 y2021
## 13861 y2021
## 13862 y2021
## 13863 y2021
## 13864 y2021
## 13865 y2021
## 13866 y2021
## 13867 y2021
## 13868 y2021
## 13869 y2021
## 13870 y2021
## 13871 y2021
## 13872 y2021
## 13873 y2021
## 13874 y2021
## 13875 y2021
## 13876 y2021
## 13877 y2021
## 13878 y2021
## 13879 y2021
## 13880 y2021
## 13881 y2021
## 13882 y2021
## 13883 y2021
## 13884 y2021
## 13885 y2021
## 13886 y2021
## 13887 y2021
## 13888 y2021
## 13889 y2021
## 13890 y2021
## 13891 y2021
## 13892 y2021
## 13893 y2021
## 13894 y2021
## 13895 y2021
## 13896 y2021
## 13897 y2021
## 13898 y2021
## 13899 y2021
## 13900 y2021
## 13901 y2021
## 13902 y2021
## 13903 y2021
## 13904 y2021
## 13905 y2021
## 13906 y2021
## 13907 y2021
## 13908 y2021
## 13909 y2021
## 13910 y2021
## 13911 y2021
## 13912 y2021
## 13913 y2021
## 13914 y2021
## 13915 y2021
## 13916 y2021
## 13917 y2021
## 13918 y2021
## 13919 y2021
## 13920 y2021
## 13921 y2021
## 13922 y2021
## 13923 y2021
## 13924 y2021
## 13925 y2021
## 13926 y2021
## 13927 y2021
## 13928 y2021
## 13929 y2021
## 13930 y2021
## 13931 y2021
## 13932 y2021
## 13933 y2021
## 13934 y2021
## 13935 y2021
## 13936 y2021
## 13937 y2021
## 13938 y2021
## 13939 y2021
## 13940 y2021
## 13941 y2021
## 13942 y2021
## 13943 y2021
## 13944 y2021
## 13945 y2021
## 13946 y2021
## 13947 y2021
## 13948 y2021
## 13949 y2021
## 13950 y2021
## 13951 y2021
## 13952 y2021
## 13953 y2021
## 13954 y2021
## 13955 y2021
## 13956 y2021
## 13957 y2021
## 13958 y2021
## 13959 y2021
## 13960 y2021
## 13961 y2021
## 13962 y2021
## 13963 y2021
## 13964 y2021
## 13965 y2021
## 13966 y2021
## 13967 y2021
## 13968 y2021
## 13969 y2021
## 13970 y2021
## 13971 y2021
## 13972 y2021
## 13973 y2021
## 13974 y2021
## 13975 y2021
## 13976 y2021
## 13977 y2021
## 13978 y2021
## 13979 y2021
## 13980 y2021
## 13981 y2021
## 13982 y2021
## 13983 y2021
## 13984 y2021
## 13985 y2021
## 13986 y2021
## 13987 y2021
## 13988 y2021
## 13989 y2021
## 13990 y2021
## 13991 y2021
## 13992 y2021
## 13993 y2021
## 13994 y2021
## 13995 y2021
## 13996 y2021
## 13997 y2021
## 13998 y2021
## 13999 y2021
## 14000 y2021
## 14001 y2021
## 14002 y2021
## 14003 y2021
## 14004 y2021
## 14005 y2021
## 14006 y2021
## 14007 y2021
## 14008 y2021
## 14009 y2021
## 14010 y2021
## 14011 y2021
## 14012 y2021
## 14013 y2021
## 14014 y2021
## 14015 y2021
## 14016 y2021
## 14017 y2021
## 14018 y2021
## 14019 y2021
## 14020 y2021
## 14021 y2021
## 14022 y2021
## 14023 y2021
## 14024 y2021
## 14025 y2021
## 14026 y2021
## 14027 y2021
## 14028 y2021
## 14029 y2021
## 14030 y2021
## 14031 y2021
## 14032 y2021
## 14033 y2021
## 14034 y2021
## 14035 y2021
## 14036 y2021
## 14037 y2021
## 14038 y2021
## 14039 y2021
## 14040 y2021
## 14041 y2021
## 14042 y2021
## 14043 y2021
## 14044 y2021
## 14045 y2021
## 14046 y2021
## 14047 y2021
## 14048 y2021
## 14049 y2021
## 14050 y2021
## 14051 y2021
## 14052 y2021
## 14053 y2021
## 14054 y2021
## 14055 y2021
## 14056 y2021
## 14057 y2021
## 14058 y2021
## 14059 y2021
## 14060 y2021
## 14061 y2021
## 14062 y2021
## 14063 y2021
## 14064 y2021
## 14065 y2021
## 14066 y2021
## 14067 y2021
## 14068 y2021
## 14069 y2021
## 14070 y2021
## 14071 y2021
## 14072 y2021
## 14073 y2021
## 14074 y2021
## 14075 y2021
## 14076 y2021
## 14077 y2021
## 14078 y2021
## 14079 y2021
## 14080 y2021
## 14081 y2021
## 14082 y2021
## 14083 y2021
## 14084 y2021
## 14085 y2021
## 14086 y2021
## 14087 y2021
## 14088 y2021
## 14089 y2021
## 14090 y2021
## 14091 y2021
## 14092 y2021
## 14093 y2021
## 14094 y2021
## 14095 y2021
## 14096 y2021
## 14097 y2021
## 14098 y2021
## 14099 y2021
## 14100 y2021
## 14101 y2021
## 14102 y2021
## 14103 y2021
## 14104 y2021
## 14105 y2021
## 14106 y2021
## 14107 y2021
## 14108 y2021
## 14109 y2021
## 14110 y2021
## 14111 y2021
## 14112 y2021
## 14113 y2021
## 14114 y2021
## 14115 y2021
## 14116 y2021
## 14117 y2021
## 14118 y2021
## 14119 y2021
## 14120 y2021
## 14121 y2021
## 14122 y2021
## 14123 y2021
## 14124 y2021
## 14125 y2021
## 14126 y2021
## 14127 y2021
## 14128 y2021
## 14129 y2021
## 14130 y2021
## 14131 y2021
## 14132 y2021
## 14133 y2021
## 14134 y2021
## 14135 y2021
## 14136 y2021
## 14137 y2021
## 14138 y2021
## 14139 y2021
## 14140 y2021
## 14141 y2021
## 14142 y2021
## 14143 y2021
## 14144 y2021
## 14145 y2021
## 14146 y2021
## 14147 y2021
## 14148 y2021
## 14149 y2021
## 14150 y2021
## 14151 y2021
## 14152 y2021
## 14153 y2021
## 14154 y2021
## 14155 y2021
## 14156 y2021
## 14157 y2021
## 14158 y2021
## 14159 y2021
## 14160 y2021
## 14161 y2021
## 14162 y2021
## 14163 y2021
## 14164 y2021
## 14165 y2021
## 14166 y2021
## 14167 y2021
## 14168 y2021
## 14169 y2021
## 14170 y2021
## 14171 y2021
## 14172 y2021
## 14173 y2021
## 14174 y2021
## 14175 y2021
## 14176 y2021
## 14177 y2021
## 14178 y2021
## 14179 y2021
## 14180 y2021
## 14181 y2021
## 14182 y2021
## 14183 y2021
## 14184 y2021
## 14185 y2021
## 14186 y2021
## 14187 y2021
## 14188 y2021
## 14189 y2021
## 14190 y2021
## 14191 y2021
## 14192 y2021
## 14193 y2021
## 14194 y2021
## 14195 y2021
## 14196 y2021
## 14197 y2021
## 14198 y2021
## 14199 y2021
## 14200 y2021
## 14201 y2021
## 14202 y2021
## 14203 y2021
## 14204 y2021
## 14205 y2021
## 14206 y2021
## 14207 y2021
## 14208 y2021
## 14209 y2021
## 14210 y2021
## 14211 y2021
## 14212 y2021
## 14213 y2021
## 14214 y2021
## 14215 y2021
## 14216 y2021
## 14217 y2021
## 14218 y2021
## 14219 y2021
## 14220 y2021
## 14221 y2021
## 14222 y2021
## 14223 y2021
## 14224 y2021
## 14225 y2021
## 14226 y2021
## 14227 y2021
## 14228 y2021
## 14229 y2021
## 14230 y2021
## 14231 y2021
## 14232 y2021
## 14233 y2021
## 14234 y2021
## 14235 y2021
## 14236 y2021
## 14237 y2021
## 14238 y2021
## 14239 y2021
## 14240 y2021
## 14241 y2021
## 14242 y2021
## 14243 y2021
## 14244 y2021
## 14245 y2021
## 14246 y2021
## 14247 y2021
## 14248 y2021
## 14249 y2021
## 14250 y2021
## 14251 y2021
## 14252 y2021
## 14253 y2021
## 14254 y2021
## 14255 y2021
## 14256 y2021
## 14257 y2021
## 14258 y2021
## 14259 y2021
## 14260 y2021
## 14261 y2021
## 14262 y2021
## 14263 y2021
## 14264 y2021
## 14265 y2021
## 14266 y2021
## 14267 y2021
## 14268 y2021
## 14269 y2021
## 14270 y2021
## 14271 y2021
## 14272 y2021
## 14273 y2021
## 14274 y2021
## 14275 y2021
## 14276 y2021
## 14277 y2021
## 14278 y2021
## 14279 y2021
## 14280 y2021
## 14281 y2021
## 14282 y2021
## 14283 y2021
## 14284 y2021
## 14285 y2021
## 14286 y2021
## 14287 y2021
## 14288 y2021
## 14289 y2021
## 14290 y2021
## 14291 y2021
## 14292 y2021
## 14293 y2021
## 14294 y2021
## 14295 y2021
## 14296 y2021
## 14297 y2021
## 14298 y2021
## 14299 y2021
## 14300 y2021
## 14301 y2021
## 14302 y2021
## 14303 y2021
## 14304 y2021
## 14305 y2021
## 14306 y2021
## 14307 y2021
## 14308 y2021
## 14309 y2021
## 14310 y2021
## 14311 y2021
## 14312 y2021
## 14313 y2021
## 14314 y2021
## 14315 y2021
## 14316 y2021
## 14317 y2021
## 14318 y2021
## 14319 y2021
## 14320 y2021
## 14321 y2021
## 14322 y2021
## 14323 y2021
## 14324 y2021
## 14325 y2021
## 14326 y2021
## 14327 y2021
## 14328 y2021
## 14329 y2021
## 14330 y2021
## 14331 y2021
## 14332 y2021
## 14333 y2021
## 14334 y2021
## 14335 y2021
## 14336 y2021
## 14337 y2021
## 14338 y2021
## 14339 y2021
## 14340 y2021
## 14341 y2021
## 14342 y2021
## 14343 y2021
## 14344 y2021
## 14345 y2021
## 14346 y2021
## 14347 y2021
## 14348 y2021
## 14349 y2021
## 14350 y2021
## 14351 y2021
## 14352 y2021
## 14353 y2021
## 14354 y2021
## 14355 y2021
## 14356 y2021
## 14357 y2021
## 14358 y2021
## 14359 y2021
## 14360 y2021
## 14361 y2021
## 14362 y2021
## 14363 y2021
## 14364 y2021
## 14365 y2021
## 14366 y2021
## 14367 y2021
## 14368 y2021
## 14369 y2021
## 14370 y2021
## 14371 y2021
## 14372 y2021
## 14373 y2021
## 14374 y2021
## 14375 y2021
## 14376 y2021
## 14377 y2021
## 14378 y2021
## 14379 y2021
## 14380 y2021
## 14381 y2021
## 14382 y2021
## 14383 y2021
## 14384 y2021
## 14385 y2021
## 14386 y2021
## 14387 y2021
## 14388 y2021
## 14389 y2021
## 14390 y2021
## 14391 y2021
## 14392 y2021
## 14393 y2021
## 14394 y2021
## 14395 y2021
## 14396 y2021
## 14397 y2021
## 14398 y2021
## 14399 y2021
## 14400 y2021
## 14401 y2021
## 14402 y2021
## 14403 y2021
## 14404 y2021
## 14405 y2021
## 14406 y2021
## 14407 y2021
## 14408 y2021
## 14409 y2021
## 14410 y2021
## 14411 y2021
## 14412 y2021
## 14413 y2021
## 14414 y2021
## 14415 y2021
## 14416 y2021
## 14417 y2021
## 14418 y2021
## 14419 y2021
## 14420 y2021
## 14421 y2021
## 14422 y2021
## 14423 y2021
## 14424 y2021
## 14425 y2021
## 14426 y2021
## 14427 y2021
## 14428 y2021
## 14429 y2021
## 14430 y2021
## 14431 y2021
## 14432 y2021
## 14433 y2021
## 14434 y2021
## 14435 y2021
## 14436 y2021
## 14437 y2021
## 14438 y2021
## 14439 y2021
## 14440 y2021
## 14441 y2021
## 14442 y2021
## 14443 y2021
## 14444 y2021
## 14445 y2021
## 14446 y2021
## 14447 y2021
## 14448 y2021
## 14449 y2021
## 14450 y2021
## 14451 y2021
## 14452 y2021
## 14453 y2021
## 14454 y2021
## 14455 y2021
## 14456 y2021
## 14457 y2021
## 14458 y2021
## 14459 y2021
## 14460 y2021
## 14461 y2021
## 14462 y2021
## 14463 y2021
## 14464 y2021
## 14465 y2021
## 14466 y2021
## 14467 y2021
## 14468 y2021
## 14469 y2021
## 14470 y2021
## 14471 y2021
## 14472 y2021
## 14473 y2021
## 14474 y2021
## 14475 y2021
## 14476 y2021
## 14477 y2021
## 14478 y2021
## 14479 y2021
## 14480 y2021
## 14481 y2021
## 14482 y2021
## 14483 y2021
## 14484 y2021
## 14485 y2021
## 14486 y2021
## 14487 y2021
## 14488 y2021
## 14489 y2021
## 14490 y2021
## 14491 y2021
## 14492 y2021
## 14493 y2021
## 14494 y2021
## 14495 y2021
## 14496 y2021
## 14497 y2021
## 14498 y2021
## 14499 y2021
## 14500 y2021
## 14501 y2021
## 14502 y2021
## 14503 y2021
## 14504 y2021
## 14505 y2021
## 14506 y2021
## 14507 y2021
## 14508 y2021
## 14509 y2021
## 14510 y2021
## 14511 y2021
## 14512 y2021
## 14513 y2021
## 14514 y2021
## 14515 y2021
## 14516 y2021
## 14517 y2021
## 14518 y2021
## 14519 y2021
## 14520 y2021
## 14521 y2021
## 14522 y2021
## 14523 y2021
## 14524 y2021
## 14525 y2021
## 14526 y2021
## 14527 y2021
## 14528 y2021
## 14529 y2021
## 14530 y2021
## 14531 y2021
## 14532 y2021
## 14533 y2021
## 14534 y2021
## 14535 y2021
## 14536 y2021
## 14537 y2021
## 14538 y2021
## 14539 y2021
## 14540 y2021
## 14541 y2021
## 14542 y2021
## 14543 y2021
## 14544 y2021
## 14545 y2021
## 14546 y2021
## 14547 y2021
## 14548 y2021
## 14549 y2021
## 14550 y2021
## 14551 y2021
## 14552 y2021
## 14553 y2021
## 14554 y2021
## 14555 y2021
## 14556 y2021
## 14557 y2021
## 14558 y2021
## 14559 y2021
## 14560 y2021
## 14561 y2021
## 14562 y2021
## 14563 y2021
## 14564 y2021
## 14565 y2021
## 14566 y2021
## 14567 y2021
## 14568 y2021
## 14569 y2021
## 14570 y2021
## 14571 y2021
## 14572 y2021
## 14573 y2021
## 14574 y2021
## 14575 y2021
## 14576 y2021
## 14577 y2021
## 14578 y2021
## 14579 y2021
## 14580 y2021
## 14581 y2021
## 14582 y2021
## 14583 y2021
## 14584 y2021
## 14585 y2021
## 14586 y2021
## 14587 y2021
## 14588 y2021
## 14589 y2021
## 14590 y2021
## 14591 y2021
## 14592 y2021
## 14593 y2021
## 14594 y2021
## 14595 y2021
## 14596 y2021
## 14597 y2021
## 14598 y2021
## 14599 y2021
## 14600 y2021
## 14601 y2021
## 14602 y2021
## 14603 y2021
## 14604 y2021
## 14605 y2021
## 14606 y2021
## 14607 y2021
## 14608 y2021
## 14609 y2021
## 14610 y2021
## 14611 y2021
## 14612 y2021
## 14613 y2021
## 14614 y2021
## 14615 y2021
## 14616 y2021
## 14617 y2021
## 14618 y2021
## 14619 y2021
## 14620 y2021
## 14621 y2021
## 14622 y2021
## 14623 y2021
## 14624 y2021
## 14625 y2021
## 14626 y2021
## 14627 y2021
## 14628 y2021
## 14629 y2021
## 14630 y2021
## 14631 y2021
## 14632 y2021
## 14633 y2021
## 14634 y2021
## 14635 y2021
## 14636 y2021
## 14637 y2021
## 14638 y2021
## 14639 y2021
## 14640 y2021
## 14641 y2021
## 14642 y2021
## 14643 y2021
## 14644 y2021
## 14645 y2021
## 14646 y2021
## 14647 y2021
## 14648 y2021
## 14649 y2021
## 14650 y2021
## 14651 y2021
## 14652 y2021
## 14653 y2021
## 14654 y2021
## 14655 y2021
## 14656 y2021
## 14657 y2021
## 14658 y2021
## 14659 y2021
## 14660 y2021
## 14661 y2021
## 14662 y2021
## 14663 y2021
## 14664 y2021
## 14665 y2021
## 14666 y2021
## 14667 y2021
## 14668 y2021
## 14669 y2021
## 14670 y2021
## 14671 y2021
## 14672 y2021
## 14673 y2021
## 14674 y2021
## 14675 y2021
## 14676 y2021
## 14677 y2021
## 14678 y2021
## 14679 y2021
## 14680 y2021
## 14681 y2021
## 14682 y2021
## 14683 y2021
## 14684 y2021
## 14685 y2021
## 14686 y2021
## 14687 y2021
## 14688 y2021
## 14689 y2021
## 14690 y2021
## 14691 y2021
## 14692 y2021
## 14693 y2021
## 14694 y2021
## 14695 y2021
## 14696 y2021
## 14697 y2021
## 14698 y2021
## 14699 y2021
## 14700 y2021
## 14701 y2021
## 14702 y2021
## 14703 y2021
## 14704 y2021
## 14705 y2021
## 14706 y2021
## 14707 y2021
## 14708 y2021
## 14709 y2021
## 14710 y2021
## 14711 y2021
## 14712 y2021
## 14713 y2021
## 14714 y2021
## 14715 y2021
## 14716 y2021
## 14717 y2021
## 14718 y2021
## 14719 y2021
## 14720 y2021
## 14721 y2021
## 14722 y2021
## 14723 y2021
## 14724 y2021
## 14725 y2021
## 14726 y2021
## 14727 y2021
## 14728 y2021
## 14729 y2021
## 14730 y2021
## 14731 y2021
## 14732 y2021
## 14733 y2021
## 14734 y2021
## 14735 y2021
## 14736 y2021
## 14737 y2021
## 14738 y2021
## 14739 y2021
## 14740 y2021
## 14741 y2021
## 14742 y2021
## 14743 y2021
## 14744 y2021
## 14745 y2021
## 14746 y2021
## 14747 y2021
## 14748 y2021
## 14749 y2021
## 14750 y2021
## 14751 y2021
## 14752 y2021
## 14753 y2021
## 14754 y2021
## 14755 y2021
## 14756 y2021
## 14757 y2021
## 14758 y2021
## 14759 y2021
## 14760 y2021
## 14761 y2021
## 14762 y2021
## 14763 y2021
## 14764 y2021
## 14765 y2021
## 14766 y2021
## 14767 y2021
## 14768 y2021
## 14769 y2021
## 14770 y2021
## 14771 y2021
## 14772 y2021
## 14773 y2021
## 14774 y2021
## 14775 y2021
## 14776 y2021
## 14777 y2021
## 14778 y2021
## 14779 y2021
## 14780 y2021
## 14781 y2021
## 14782 y2021
## 14783 y2021
## 14784 y2021
## 14785 y2021
## 14786 y2021
## 14787 y2021
## 14788 y2021
## 14789 y2021
## 14790 y2021
## 14791 y2021
## 14792 y2021
## 14793 y2021
## 14794 y2021
## 14795 y2021
## 14796 y2021
## 14797 y2021
## 14798 y2021
## 14799 y2021
## 14800 y2021
## 14801 y2021
## 14802 y2021
## 14803 y2021
## 14804 y2021
## 14805 y2021
## 14806 y2021
## 14807 y2021
## 14808 y2021
## 14809 y2021
## 14810 y2021
## 14811 y2021
## 14812 y2021
## 14813 y2021
## 14814 y2021
## 14815 y2021
## 14816 y2021
## 14817 y2021
## 14818 y2021
## 14819 y2021
## 14820 y2021
## 14821 y2021
## 14822 y2021
## 14823 y2021
## 14824 y2021
## 14825 y2021
## 14826 y2021
## 14827 y2021
## 14828 y2021
## 14829 y2021
## 14830 y2021
## 14831 y2021
## 14832 y2021
## 14833 y2021
## 14834 y2021
## 14835 y2021
## 14836 y2021
## 14837 y2021
## 14838 y2021
## 14839 y2021
## 14840 y2021
## 14841 y2021
## 14842 y2021
## 14843 y2021
## 14844 y2021
## 14845 y2021
## 14846 y2021
## 14847 y2021
## 14848 y2021
## 14849 y2021
## 14850 y2021
## 14851 y2021
## 14852 y2021
## 14853 y2021
## 14854 y2021
## 14855 y2021
## 14856 y2021
## 14857 y2021
## 14858 y2021
## 14859 y2021
## 14860 y2021
## 14861 y2021
## 14862 y2021
## 14863 y2021
## 14864 y2021
## 14865 y2021
## 14866 y2021
## 14867 y2021
## 14868 y2021
## 14869 y2021
## 14870 y2021
## 14871 y2021
## 14872 y2021
## 14873 y2021
## 14874 y2021
## 14875 y2021
## 14876 y2021
## 14877 y2021
## 14878 y2021
## 14879 y2021
## 14880 y2021
## 14881 y2021
## 14882 y2021
## 14883 y2021
## 14884 y2021
## 14885 y2021
## 14886 y2021
## 14887 y2021
## 14888 y2021
## 14889 y2021
## 14890 y2021
## 14891 y2021
## 14892 y2021
## 14893 y2021
## 14894 y2021
## 14895 y2021
## 14896 y2021
## 14897 y2021
## 14898 y2021
## 14899 y2021
## 14900 y2021
## 14901 y2021
## 14902 y2021
## 14903 y2021
## 14904 y2021
## 14905 y2021
## 14906 y2021
## 14907 y2021
## 14908 y2021
## 14909 y2021
## 14910 y2021
## 14911 y2021
## 14912 y2021
## 14913 y2021
## 14914 y2021
## 14915 y2021
## 14916 y2021
## 14917 y2021
## 14918 y2021
## 14919 y2021
## 14920 y2021
## 14921 y2021
## 14922 y2021
## 14923 y2021
## 14924 y2021
## 14925 y2021
## 14926 y2021
## 14927 y2021
## 14928 y2021
## 14929 y2021
## 14930 y2021
## 14931 y2021
## 14932 y2021
## 14933 y2021
## 14934 y2021
## 14935 y2021
## 14936 y2021
## 14937 y2021
## 14938 y2021
## 14939 y2021
## 14940 y2021
## 14941 y2021
## 14942 y2021
## 14943 y2021
## 14944 y2021
## 14945 y2021
## 14946 y2021
## 14947 y2021
## 14948 y2021
## 14949 y2021
## 14950 y2021
## 14951 y2021
## 14952 y2021
## 14953 y2021
## 14954 y2021
## 14955 y2021
## 14956 y2021
## 14957 y2021
## 14958 y2021
## 14959 y2021
## 14960 y2021
## 14961 y2021
## 14962 y2021
## 14963 y2021
## 14964 y2021
## 14965 y2021
## 14966 y2021
## 14967 y2021
## 14968 y2021
## 14969 y2021
## 14970 y2021
## 14971 y2021
## 14972 y2021
## 14973 y2021
## 14974 y2021
## 14975 y2021
## 14976 y2021
## 14977 y2021
## 14978 y2021
## 14979 y2021
## 14980 y2021
## 14981 y2021
## 14982 y2021
## 14983 y2021
## 14984 y2021
## 14985 y2021
## 14986 y2021
## 14987 y2021
## 14988 y2021
## 14989 y2021
## 14990 y2021
## 14991 y2021
## 14992 y2021
## 14993 y2021
## 14994 y2021
## 14995 y2021
## 14996 y2021
## 14997 y2021
## 14998 y2021
## 14999 y2021
## 15000 y2021
## 15001 y2021
## 15002 y2021
## 15003 y2021
## 15004 y2021
## 15005 y2021
## 15006 y2021
## 15007 y2021
## 15008 y2021
## 15009 y2021
## 15010 y2021
## 15011 y2021
## 15012 y2021
## 15013 y2021
## 15014 y2021
## 15015 y2021
## 15016 y2021
## 15017 y2021
## 15018 y2021
## 15019 y2021
## 15020 y2021
## 15021 y2021
## 15022 y2021
## 15023 y2021
## 15024 y2021
## 15025 y2021
## 15026 y2021
## 15027 y2021
## 15028 y2021
## 15029 y2021
## 15030 y2021
## 15031 y2021
## 15032 y2021
## 15033 y2021
## 15034 y2021
## 15035 y2021
## 15036 y2021
## 15037 y2021
## 15038 y2021
## 15039 y2021
## 15040 y2021
## 15041 y2021
## 15042 y2021
## 15043 y2021
## 15044 y2021
## 15045 y2021
## 15046 y2021
## 15047 y2021
## 15048 y2021
## 15049 y2021
## 15050 y2021
## 15051 y2021
## 15052 y2021
## 15053 y2021
## 15054 y2021
## 15055 y2021
## 15056 y2021
## 15057 y2021
## 15058 y2021
## 15059 y2021
## 15060 y2021
## 15061 y2021
## 15062 y2021
## 15063 y2021
## 15064 y2021
## 15065 y2021
## 15066 y2021
## 15067 y2021
## 15068 y2021
## 15069 y2021
## 15070 y2021
## 15071 y2021
## 15072 y2021
## 15073 y2021
## 15074 y2021
## 15075 y2021
## 15076 y2021
## 15077 y2021
## 15078 y2021
## 15079 y2021
## 15080 y2021
## 15081 y2021
## 15082 y2021
## 15083 y2021
## 15084 y2021
## 15085 y2021
## 15086 y2021
## 15087 y2021
## 15088 y2021
## 15089 y2021
## 15090 y2021
## 15091 y2021
## 15092 y2021
## 15093 y2021
## 15094 y2021
## 15095 y2021
## 15096 y2021
## 15097 y2021
## 15098 y2021
## 15099 y2021
## 15100 y2021
## 15101 y2021
## 15102 y2021
## 15103 y2021
## 15104 y2021
## 15105 y2021
## 15106 y2021
## 15107 y2021
## 15108 y2021
## 15109 y2021
## 15110 y2021
## 15111 y2021
## 15112 y2021
## 15113 y2021
## 15114 y2021
## 15115 y2021
## 15116 y2021
## 15117 y2021
## 15118 y2021
## 15119 y2021
## 15120 y2021
## 15121 y2021
## 15122 y2021
## 15123 y2021
## 15124 y2021
## 15125 y2021
## 15126 y2021
## 15127 y2021
## 15128 y2021
## 15129 y2021
## 15130 y2021
## 15131 y2021
## 15132 y2021
## 15133 y2021
## 15134 y2021
## 15135 y2021
## 15136 y2021
## 15137 y2021
## 15138 y2021
## 15139 y2021
## 15140 y2021
## 15141 y2021
## 15142 y2021
## 15143 y2021
## 15144 y2021
## 15145 y2021
## 15146 y2021
## 15147 y2021
## 15148 y2021
## 15149 y2021
## 15150 y2021
## 15151 y2021
## 15152 y2021
## 15153 y2021
## 15154 y2021
## 15155 y2021
## 15156 y2021
## 15157 y2021
## 15158 y2021
## 15159 y2021
## 15160 y2021
## 15161 y2021
## 15162 y2021
## 15163 y2021
## 15164 y2021
## 15165 y2021
## 15166 y2021
## 15167 y2021
## 15168 y2021
## 15169 y2021
## 15170 y2021
## 15171 y2021
## 15172 y2021
## 15173 y2021
## 15174 y2021
## 15175 y2021
## 15176 y2021
## 15177 y2021
## 15178 y2021
## 15179 y2021
## 15180 y2021
## 15181 y2021
## 15182 y2021
## 15183 y2021
## 15184 y2021
## 15185 y2021
## 15186 y2021
## 15187 y2021
## 15188 y2021
## 15189 y2021
## 15190 y2021
## 15191 y2021
## 15192 y2021
## 15193 y2021
## 15194 y2021
## 15195 y2021
## 15196 y2021
## 15197 y2021
## 15198 y2021
## 15199 y2021
## 15200 y2021
## 15201 y2021
## 15202 y2021
## 15203 y2021
## 15204 y2021
## 15205 y2021
## 15206 y2021
## 15207 y2021
## 15208 y2021
## 15209 y2021
## 15210 y2021
## 15211 y2021
## 15212 y2021
## 15213 y2021
## 15214 y2021
## 15215 y2021
## 15216 y2021
## 15217 y2021
## 15218 y2021
## 15219 y2021
## 15220 y2021
## 15221 y2021
## 15222 y2021
## 15223 y2021
## 15224 y2021
## 15225 y2021
## 15226 y2021
## 15227 y2021
## 15228 y2021
## 15229 y2021
## 15230 y2021
## 15231 y2021
## 15232 y2021
## 15233 y2021
## 15234 y2021
## 15235 y2021
## 15236 y2021
## 15237 y2021
## 15238 y2021
## 15239 y2021
## 15240 y2021
## 15241 y2021
## 15242 y2021
## 15243 y2021
## 15244 y2021
## 15245 y2021
## 15246 y2021
## 15247 y2021
## 15248 y2021
## 15249 y2021
## 15250 y2021
## 15251 y2021
## 15252 y2021
## 15253 y2021
## 15254 y2021
## 15255 y2021
## 15256 y2021
## 15257 y2021
## 15258 y2021
## 15259 y2021
## 15260 y2021
## 15261 y2021
## 15262 y2021
## 15263 y2021
## 15264 y2021
## 15265 y2021
## 15266 y2021
## 15267 y2021
## 15268 y2021
## 15269 y2021
## 15270 y2021
## 15271 y2021
## 15272 y2021
## 15273 y2021
## 15274 y2021
## 15275 y2021
## 15276 y2021
## 15277 y2021
## 15278 y2021
## 15279 y2021
## 15280 y2021
## 15281 y2021
## 15282 y2021
## 15283 y2021
## 15284 y2021
## 15285 y2021
## 15286 y2021
## 15287 y2021
## 15288 y2021
## 15289 y2021
## 15290 y2021
## 15291 y2021
## 15292 y2021
## 15293 y2021
## 15294 y2021
## 15295 y2021
## 15296 y2021
## 15297 y2021
## 15298 y2021
## 15299 y2021
## 15300 y2021
## 15301 y2021
## 15302 y2021
## 15303 y2021
## 15304 y2021
## 15305 y2021
## 15306 y2021
## 15307 y2021
## 15308 y2021
## 15309 y2021
## 15310 y2021
## 15311 y2021
## 15312 y2021
## 15313 y2021
## 15314 y2021
## 15315 y2021
## 15316 y2021
## 15317 y2021
## 15318 y2021
## 15319 y2021
## 15320 y2021
## 15321 y2021
## 15322 y2021
## 15323 y2021
## 15324 y2021
## 15325 y2021
## 15326 y2021
## 15327 y2021
## 15328 y2021
## 15329 y2021
## 15330 y2021
## 15331 y2021
## 15332 y2021
## 15333 y2021
## 15334 y2021
## 15335 y2021
## 15336 y2021
## 15337 y2021
## 15338 y2021
## 15339 y2021
## 15340 y2021
## 15341 y2021
## 15342 y2021
## 15343 y2021
## 15344 y2021
## 15345 y2021
## 15346 y2021
## 15347 y2021
## 15348 y2021
## 15349 y2021
## 15350 y2021
## 15351 y2021
## 15352 y2021
## 15353 y2021
## 15354 y2021
## 15355 y2021
## 15356 y2021
## 15357 y2021
## 15358 y2021
## 15359 y2021
## 15360 y2021
## 15361 y2021
## 15362 y2021
## 15363 y2021
## 15364 y2021
## 15365 y2021
## 15366 y2021
## 15367 y2021
## 15368 y2021
## 15369 y2021
## 15370 y2021
## 15371 y2021
## 15372 y2021
## 15373 y2021
## 15374 y2021
## 15375 y2021
## 15376 y2021
## 15377 y2021
## 15378 y2021
## 15379 y2021
## 15380 y2021
## 15381 y2021
## 15382 y2021
## 15383 y2021
## 15384 y2021
## 15385 y2021
## 15386 y2021
## 15387 y2021
## 15388 y2021
## 15389 y2021
## 15390 y2021
## 15391 y2021
## 15392 y2021
## 15393 y2021
## 15394 y2021
## 15395 y2021
## 15396 y2021
## 15397 y2021
## 15398 y2021
## 15399 y2021
## 15400 y2021
## 15401 y2021
## 15402 y2021
## 15403 y2021
## 15404 y2021
## 15405 y2021
## 15406 y2021
## 15407 y2021
## 15408 y2021
## 15409 y2021
## 15410 y2021
## 15411 y2021
## 15412 y2021
## 15413 y2021
## 15414 y2021
## 15415 y2021
## 15416 y2021
## 15417 y2021
## 15418 y2021
## 15419 y2021
## 15420 y2021
## 15421 y2021
## 15422 y2021
## 15423 y2021
## 15424 y2021
## 15425 y2021
## 15426 y2021
## 15427 y2021
## 15428 y2021
## 15429 y2021
## 15430 y2021
## 15431 y2021
## 15432 y2021
## 15433 y2021
## 15434 y2021
## 15435 y2021
## 15436 y2021
## 15437 y2021
## 15438 y2021
## 15439 y2021
## 15440 y2021
## 15441 y2021
## 15442 y2021
## 15443 y2021
## 15444 y2021
## 15445 y2021
## 15446 y2021
## 15447 y2021
## 15448 y2021
## 15449 y2021
## 15450 y2021
## 15451 y2021
## 15452 y2021
## 15453 y2021
## 15454 y2021
## 15455 y2021
## 15456 y2021
## 15457 y2021
## 15458 y2021
## 15459 y2021
## 15460 y2021
## 15461 y2021
## 15462 y2021
## 15463 y2021
## 15464 y2021
## 15465 y2021
## 15466 y2021
## 15467 y2021
## 15468 y2021
## 15469 y2021
## 15470 y2021
## 15471 y2021
## 15472 y2021
## 15473 y2021
## 15474 y2021
## 15475 y2021
## 15476 y2021
## 15477 y2021
## 15478 y2021
## 15479 y2021
## 15480 y2021
## 15481 y2021
## 15482 y2021
## 15483 y2021
## 15484 y2021
## 15485 y2021
## 15486 y2021
## 15487 y2021
## 15488 y2021
## 15489 y2021
## 15490 y2021
## 15491 y2021
## 15492 y2021
## 15493 y2021
## 15494 y2021
## 15495 y2021
## 15496 y2021
## 15497 y2021
## 15498 y2021
## 15499 y2021
## 15500 y2021
## 15501 y2021
## 15502 y2021
## 15503 y2021
## 15504 y2021
## 15505 y2021
## 15506 y2021
## 15507 y2021
## 15508 y2021
## 15509 y2021
## 15510 y2021
## 15511 y2021
## 15512 y2021
## 15513 y2021
## 15514 y2021
## 15515 y2021
## 15516 y2021
## 15517 y2021
## 15518 y2021
## 15519 y2021
## 15520 y2021
## 15521 y2021
## 15522 y2021
## 15523 y2021
## 15524 y2021
## 15525 y2021
## 15526 y2021
## 15527 y2021
## 15528 y2021
## 15529 y2021
## 15530 y2021
## 15531 y2021
## 15532 y2021
## 15533 y2021
## 15534 y2021
## 15535 y2021
## 15536 y2021
## 15537 y2021
## 15538 y2021
## 15539 y2021
## 15540 y2021
## 15541 y2021
## 15542 y2021
## 15543 y2021
## 15544 y2021
## 15545 y2021
## 15546 y2021
## 15547 y2021
## 15548 y2021
## 15549 y2021
## 15550 y2021
## 15551 y2021
## 15552 y2021
## 15553 y2021
## 15554 y2021
## 15555 y2021
## 15556 y2021
## 15557 y2021
## 15558 y2021
## 15559 y2021
## 15560 y2021
## 15561 y2021
## 15562 y2021
## 15563 y2021
## 15564 y2021
## 15565 y2021
## 15566 y2021
## 15567 y2021
## 15568 y2021
## 15569 y2021
## 15570 y2021
## 15571 y2021
## 15572 y2021
## 15573 y2021
## 15574 y2021
## 15575 y2021
## 15576 y2021
## 15577 y2021
## 15578 y2021
## 15579 y2021
## 15580 y2021
## 15581 y2021
## 15582 y2021
## 15583 y2021
## 15584 y2021
## 15585 y2021
## 15586 y2021
## 15587 y2021
## 15588 y2021
## 15589 y2021
## 15590 y2021
## 15591 y2021
## 15592 y2021
## 15593 y2021
## 15594 y2021
## 15595 y2021
## 15596 y2021
## 15597 y2021
## 15598 y2021
## 15599 y2021
## 15600 y2021
## 15601 y2021
## 15602 y2021
## 15603 y2021
## 15604 y2021
## 15605 y2021
## 15606 y2021
## 15607 y2021
## 15608 y2021
## 15609 y2021
## 15610 y2021
## 15611 y2021
## 15612 y2021
## 15613 y2021
## 15614 y2021
## 15615 y2021
## 15616 y2021
## 15617 y2021
## 15618 y2021
## 15619 y2021
## 15620 y2021
## 15621 y2021
## 15622 y2021
## 15623 y2021
## 15624 y2021
## 15625 y2021
## 15626 y2021
## 15627 y2021
## 15628 y2021
## 15629 y2021
## 15630 y2021
## 15631 y2021
## 15632 y2021
## 15633 y2021
## 15634 y2021
## 15635 y2021
## 15636 y2021
## 15637 y2021
## 15638 y2021
## 15639 y2021
## 15640 y2021
## 15641 y2021
## 15642 y2021
## 15643 y2021
## 15644 y2021
## 15645 y2021
## 15646 y2021
## 15647 y2021
## 15648 y2021
## 15649 y2021
## 15650 y2021
## 15651 y2021
## 15652 y2021
## 15653 y2021
## 15654 y2021
## 15655 y2021
## 15656 y2021
## 15657 y2021
## 15658 y2021
## 15659 y2021
## 15660 y2021
## 15661 y2021
## 15662 y2021
## 15663 y2021
## 15664 y2021
## 15665 y2021
## 15666 y2021
## 15667 y2021
## 15668 y2021
## 15669 y2021
## 15670 y2021
## 15671 y2021
## 15672 y2021
## 15673 y2021
## 15674 y2021
## 15675 y2021
## 15676 y2021
## 15677 y2021
## 15678 y2021
## 15679 y2021
## 15680 y2021
## 15681 y2021
## 15682 y2021
## 15683 y2021
## 15684 y2021
## 15685 y2021
## 15686 y2021
## 15687 y2021
## 15688 y2021
## 15689 y2021
## 15690 y2021
## 15691 y2021
## 15692 y2021
## 15693 y2021
## 15694 y2021
## 15695 y2021
## 15696 y2021
## 15697 y2021
## 15698 y2021
## 15699 y2021
## 15700 y2021
## 15701 y2021
## 15702 y2021
## 15703 y2021
## 15704 y2021
## 15705 y2021
## 15706 y2021
## 15707 y2021
## 15708 y2021
## 15709 y2021
## 15710 y2021
## 15711 y2021
## 15712 y2021
## 15713 y2021
## 15714 y2021
## 15715 y2021
## 15716 y2021
## 15717 y2021
## 15718 y2021
## 15719 y2021
## 15720 y2021
## 15721 y2021
## 15722 y2021
## 15723 y2021
## 15724 y2021
## 15725 y2021
## 15726 y2021
## 15727 y2021
## 15728 y2021
## 15729 y2021
## 15730 y2021
## 15731 y2021
## 15732 y2021
## 15733 y2021
## 15734 y2021
## 15735 y2022
## 15736 y2022
## 15737 y2022
## 15738 y2022
## 15739 y2022
## 15740 y2022
## 15741 y2022
## 15742 y2022
## 15743 y2022
## 15744 y2022
## 15745 y2022
## 15746 y2022
## 15747 y2022
## 15748 y2022
## 15749 y2022
## 15750 y2022
## 15751 y2022
## 15752 y2022
## 15753 y2022
## 15754 y2022
## 15755 y2022
## 15756 y2022
## 15757 y2022
## 15758 y2022
## 15759 y2022
## 15760 y2022
## 15761 y2022
## 15762 y2022
## 15763 y2022
## 15764 y2022
## 15765 y2022
## 15766 y2022
## 15767 y2022
## 15768 y2022
## 15769 y2022
## 15770 y2022
## 15771 y2022
## 15772 y2022
## 15773 y2022
## 15774 y2022
## 15775 y2022
## 15776 y2022
## 15777 y2022
## 15778 y2022
## 15779 y2022
## 15780 y2022
## 15781 y2022
## 15782 y2022
## 15783 y2022
## 15784 y2022
## 15785 y2022
## 15786 y2022
## 15787 y2022
## 15788 y2022
## 15789 y2022
## 15790 y2022
## 15791 y2022
## 15792 y2022
## 15793 y2022
## 15794 y2022
## 15795 y2022
## 15796 y2022
## 15797 y2022
## 15798 y2022
## 15799 y2022
## 15800 y2022
## 15801 y2022
## 15802 y2022
## 15803 y2022
## 15804 y2022
## 15805 y2022
## 15806 y2022
## 15807 y2022
## 15808 y2022
## 15809 y2022
## 15810 y2022
## 15811 y2022
## 15812 y2022
## 15813 y2022
## 15814 y2022
## 15815 y2022
## 15816 y2022
## 15817 y2022
## 15818 y2022
## 15819 y2022
## 15820 y2022
## 15821 y2022
## 15822 y2022
## 15823 y2022
## 15824 y2022
## 15825 y2022
## 15826 y2022
## 15827 y2022
## 15828 y2022
## 15829 y2022
## 15830 y2022
## 15831 y2022
## 15832 y2022
## 15833 y2022
## 15834 y2022
## 15835 y2022
## 15836 y2022
## 15837 y2022
## 15838 y2022
## 15839 y2022
## 15840 y2022
## 15841 y2022
## 15842 y2022
## 15843 y2022
## 15844 y2022
## 15845 y2022
## 15846 y2022
## 15847 y2022
## 15848 y2022
## 15849 y2022
## 15850 y2022
## 15851 y2022
## 15852 y2022
## 15853 y2022
## 15854 y2022
## 15855 y2022
## 15856 y2022
## 15857 y2022
## 15858 y2022
## 15859 y2022
## 15860 y2022
## 15861 y2022
## 15862 y2022
## 15863 y2022
## 15864 y2022
## 15865 y2022
## 15866 y2022
## 15867 y2022
## 15868 y2022
## 15869 y2022
## 15870 y2022
## 15871 y2022
## 15872 y2022
## 15873 y2022
## 15874 y2022
## 15875 y2022
## 15876 y2022
## 15877 y2022
## 15878 y2022
## 15879 y2022
## 15880 y2022
## 15881 y2022
## 15882 y2022
## 15883 y2022
## 15884 y2022
## 15885 y2022
## 15886 y2022
## 15887 y2022
## 15888 y2022
## 15889 y2022
## 15890 y2022
## 15891 y2022
## 15892 y2022
## 15893 y2022
## 15894 y2022
## 15895 y2022
## 15896 y2022
## 15897 y2022
## 15898 y2022
## 15899 y2022
## 15900 y2022
## 15901 y2022
## 15902 y2022
## 15903 y2022
## 15904 y2022
## 15905 y2022
## 15906 y2022
## 15907 y2022
## 15908 y2022
## 15909 y2022
## 15910 y2022
## 15911 y2022
## 15912 y2022
## 15913 y2022
## 15914 y2022
## 15915 y2022
## 15916 y2022
## 15917 y2022
## 15918 y2022
## 15919 y2022
## 15920 y2022
## 15921 y2022
## 15922 y2022
## 15923 y2022
## 15924 y2022
## 15925 y2022
## 15926 y2022
## 15927 y2022
## 15928 y2022
## 15929 y2022
## 15930 y2022
## 15931 y2022
## 15932 y2022
## 15933 y2022
## 15934 y2022
## 15935 y2022
## 15936 y2022
## 15937 y2022
## 15938 y2022
## 15939 y2022
## 15940 y2022
## 15941 y2022
## 15942 y2022
## 15943 y2022
## 15944 y2022
## 15945 y2022
## 15946 y2022
## 15947 y2022
## 15948 y2022
## 15949 y2022
## 15950 y2022
## 15951 y2022
## 15952 y2022
## 15953 y2022
## 15954 y2022
## 15955 y2022
## 15956 y2022
## 15957 y2022
## 15958 y2022
## 15959 y2022
## 15960 y2022
## 15961 y2022
## 15962 y2022
## 15963 y2022
## 15964 y2022
## 15965 y2022
## 15966 y2022
## 15967 y2022
## 15968 y2022
## 15969 y2022
## 15970 y2022
## 15971 y2022
## 15972 y2022
## 15973 y2022
## 15974 y2022
## 15975 y2022
## 15976 y2022
## 15977 y2022
## 15978 y2022
## 15979 y2022
## 15980 y2022
## 15981 y2022
## 15982 y2022
## 15983 y2022
## 15984 y2022
## 15985 y2022
## 15986 y2022
## 15987 y2022
## 15988 y2022
## 15989 y2022
## 15990 y2022
## 15991 y2022
## 15992 y2022
## 15993 y2022
## 15994 y2022
## 15995 y2022
## 15996 y2022
## 15997 y2022
## 15998 y2022
## 15999 y2022
## 16000 y2022
## 16001 y2022
## 16002 y2022
## 16003 y2022
## 16004 y2022
## 16005 y2022
## 16006 y2022
## 16007 y2022
## 16008 y2022
## 16009 y2022
## 16010 y2022
## 16011 y2022
## 16012 y2022
## 16013 y2022
## 16014 y2022
## 16015 y2022
## 16016 y2022
## 16017 y2022
## 16018 y2022
## 16019 y2022
## 16020 y2022
## 16021 y2022
## 16022 y2022
## 16023 y2022
## 16024 y2022
## 16025 y2022
## 16026 y2022
## 16027 y2022
## 16028 y2022
## 16029 y2022
## 16030 y2022
## 16031 y2022
## 16032 y2022
## 16033 y2022
## 16034 y2022
## 16035 y2022
## 16036 y2022
## 16037 y2022
## 16038 y2022
## 16039 y2022
## 16040 y2022
## 16041 y2022
## 16042 y2022
## 16043 y2022
## 16044 y2022
## 16045 y2022
## 16046 y2022
## 16047 y2022
## 16048 y2022
## 16049 y2022
## 16050 y2022
## 16051 y2022
## 16052 y2022
## 16053 y2022
## 16054 y2022
## 16055 y2022
## 16056 y2022
## 16057 y2022
## 16058 y2022
## 16059 y2022
## 16060 y2022
## 16061 y2022
## 16062 y2022
## 16063 y2022
## 16064 y2022
## 16065 y2022
## 16066 y2022
## 16067 y2022
## 16068 y2022
## 16069 y2022
## 16070 y2022
## 16071 y2022
## 16072 y2022
## 16073 y2022
## 16074 y2022
## 16075 y2022
## 16076 y2022
## 16077 y2022
## 16078 y2022
## 16079 y2022
## 16080 y2022
## 16081 y2022
## 16082 y2022
## 16083 y2022
## 16084 y2022
## 16085 y2022
## 16086 y2022
## 16087 y2022
## 16088 y2022
## 16089 y2022
## 16090 y2022
## 16091 y2022
## 16092 y2022
## 16093 y2022
## 16094 y2022
## 16095 y2022
## 16096 y2022
## 16097 y2022
## 16098 y2022
## 16099 y2022
## 16100 y2022
## 16101 y2022
## 16102 y2022
## 16103 y2022
## 16104 y2022
## 16105 y2022
## 16106 y2022
## 16107 y2022
## 16108 y2022
## 16109 y2022
## 16110 y2022
## 16111 y2022
## 16112 y2022
## 16113 y2022
## 16114 y2022
## 16115 y2022
## 16116 y2022
## 16117 y2022
## 16118 y2022
## 16119 y2022
## 16120 y2022
## 16121 y2022
## 16122 y2022
## 16123 y2022
## 16124 y2022
## 16125 y2022
## 16126 y2022
## 16127 y2022
## 16128 y2022
## 16129 y2022
## 16130 y2022
## 16131 y2022
## 16132 y2022
## 16133 y2022
## 16134 y2022
## 16135 y2022
## 16136 y2022
## 16137 y2022
## 16138 y2022
## 16139 y2022
## 16140 y2022
## 16141 y2022
## 16142 y2022
## 16143 y2022
## 16144 y2022
## 16145 y2022
## 16146 y2022
## 16147 y2022
## 16148 y2022
## 16149 y2022
## 16150 y2022
## 16151 y2022
## 16152 y2022
## 16153 y2022
## 16154 y2022
## 16155 y2022
## 16156 y2022
## 16157 y2022
## 16158 y2022
## 16159 y2022
## 16160 y2022
## 16161 y2022
## 16162 y2022
## 16163 y2022
## 16164 y2022
## 16165 y2022
## 16166 y2022
## 16167 y2022
## 16168 y2022
## 16169 y2022
## 16170 y2022
## 16171 y2022
## 16172 y2022
## 16173 y2022
## 16174 y2022
## 16175 y2022
## 16176 y2022
## 16177 y2022
## 16178 y2022
## 16179 y2022
## 16180 y2022
## 16181 y2022
## 16182 y2022
## 16183 y2022
## 16184 y2022
## 16185 y2022
## 16186 y2022
## 16187 y2022
## 16188 y2022
## 16189 y2022
## 16190 y2022
## 16191 y2022
## 16192 y2022
## 16193 y2022
## 16194 y2022
## 16195 y2022
## 16196 y2022
## 16197 y2022
## 16198 y2022
## 16199 y2022
## 16200 y2022
## 16201 y2022
## 16202 y2022
## 16203 y2022
## 16204 y2022
## 16205 y2022
## 16206 y2022
## 16207 y2022
## 16208 y2022
## 16209 y2022
## 16210 y2022
## 16211 y2022
## 16212 y2022
## 16213 y2022
## 16214 y2022
## 16215 y2022
## 16216 y2022
## 16217 y2022
## 16218 y2022
## 16219 y2022
## 16220 y2022
## 16221 y2022
## 16222 y2022
## 16223 y2022
## 16224 y2022
## 16225 y2022
## 16226 y2022
## 16227 y2022
## 16228 y2022
## 16229 y2022
## 16230 y2022
## 16231 y2022
## 16232 y2022
## 16233 y2022
## 16234 y2022
## 16235 y2022
## 16236 y2022
## 16237 y2022
## 16238 y2022
## 16239 y2022
## 16240 y2022
## 16241 y2022
## 16242 y2022
## 16243 y2022
## 16244 y2022
## 16245 y2022
## 16246 y2022
## 16247 y2022
## 16248 y2022
## 16249 y2022
## 16250 y2022
## 16251 y2022
## 16252 y2022
## 16253 y2022
## 16254 y2022
## 16255 y2022
## 16256 y2022
## 16257 y2022
## 16258 y2022
## 16259 y2022
## 16260 y2022
## 16261 y2022
## 16262 y2022
## 16263 y2022
## 16264 y2022
## 16265 y2022
## 16266 y2022
## 16267 y2022
## 16268 y2022
## 16269 y2022
## 16270 y2022
## 16271 y2022
## 16272 y2022
## 16273 y2022
## 16274 y2022
## 16275 y2022
## 16276 y2022
## 16277 y2022
## 16278 y2022
## 16279 y2022
## 16280 y2022
## 16281 y2022
## 16282 y2022
## 16283 y2022
## 16284 y2022
## 16285 y2022
## 16286 y2022
## 16287 y2022
## 16288 y2022
## 16289 y2022
## 16290 y2022
## 16291 y2022
## 16292 y2022
## 16293 y2022
## 16294 y2022
## 16295 y2022
## 16296 y2022
## 16297 y2022
## 16298 y2022
## 16299 y2022
## 16300 y2022
## 16301 y2022
## 16302 y2022
## 16303 y2022
## 16304 y2022
## 16305 y2022
## 16306 y2022
## 16307 y2022
## 16308 y2022
## 16309 y2022
## 16310 y2022
## 16311 y2022
## 16312 y2022
## 16313 y2022
## 16314 y2022
## 16315 y2022
## 16316 y2022
## 16317 y2022
## 16318 y2022
## 16319 y2022
## 16320 y2022
## 16321 y2022
## 16322 y2022
## 16323 y2022
## 16324 y2022
## 16325 y2022
## 16326 y2022
## 16327 y2022
## 16328 y2022
## 16329 y2022
## 16330 y2022
## 16331 y2022
## 16332 y2022
## 16333 y2022
## 16334 y2022
## 16335 y2022
## 16336 y2022
## 16337 y2022
## 16338 y2022
## 16339 y2022
## 16340 y2022
## 16341 y2022
## 16342 y2022
## 16343 y2022
## 16344 y2022
## 16345 y2022
## 16346 y2022
## 16347 y2022
## 16348 y2022
## 16349 y2022
## 16350 y2022
## 16351 y2022
## 16352 y2022
## 16353 y2022
## 16354 y2022
## 16355 y2022
## 16356 y2022
## 16357 y2022
## 16358 y2022
## 16359 y2022
## 16360 y2022
## 16361 y2022
## 16362 y2022
## 16363 y2022
## 16364 y2022
## 16365 y2022
## 16366 y2022
## 16367 y2022
## 16368 y2022
## 16369 y2022
## 16370 y2022
## 16371 y2022
## 16372 y2022
## 16373 y2022
## 16374 y2022
## 16375 y2022
## 16376 y2022
## 16377 y2022
## 16378 y2022
## 16379 y2022
## 16380 y2022
## 16381 y2022
## 16382 y2022
## 16383 y2022
## 16384 y2022
## 16385 y2022
## 16386 y2022
## 16387 y2022
## 16388 y2022
## 16389 y2022
## 16390 y2022
## 16391 y2022
## 16392 y2022
## 16393 y2022
## 16394 y2022
## 16395 y2022
## 16396 y2022
## 16397 y2022
## 16398 y2022
## 16399 y2022
## 16400 y2022
## 16401 y2022
## 16402 y2022
## 16403 y2022
## 16404 y2022
## 16405 y2022
## 16406 y2022
## 16407 y2022
## 16408 y2022
## 16409 y2022
## 16410 y2022
## 16411 y2022
## 16412 y2022
## 16413 y2022
## 16414 y2022
## 16415 y2022
## 16416 y2022
## 16417 y2022
## 16418 y2022
## 16419 y2022
## 16420 y2022
## 16421 y2022
## 16422 y2022
## 16423 y2022
## 16424 y2022
## 16425 y2022
## 16426 y2022
## 16427 y2022
## 16428 y2022
## 16429 y2022
## 16430 y2022
## 16431 y2022
## 16432 y2022
## 16433 y2022
## 16434 y2022
## 16435 y2022
## 16436 y2022
## 16437 y2022
## 16438 y2022
## 16439 y2022
## 16440 y2022
## 16441 y2022
## 16442 y2022
## 16443 y2022
## 16444 y2022
## 16445 y2022
## 16446 y2022
## 16447 y2022
## 16448 y2022
## 16449 y2022
## 16450 y2022
## 16451 y2022
## 16452 y2022
## 16453 y2022
## 16454 y2022
## 16455 y2022
## 16456 y2022
## 16457 y2022
## 16458 y2022
## 16459 y2022
## 16460 y2022
## 16461 y2022
## 16462 y2022
## 16463 y2022
## 16464 y2022
## 16465 y2022
## 16466 y2022
## 16467 y2022
## 16468 y2022
## 16469 y2022
## 16470 y2022
## 16471 y2022
## 16472 y2022
## 16473 y2022
## 16474 y2022
## 16475 y2022
## 16476 y2022
## 16477 y2022
## 16478 y2022
## 16479 y2022
## 16480 y2022
## 16481 y2022
## 16482 y2022
## 16483 y2022
## 16484 y2022
## 16485 y2022
## 16486 y2022
## 16487 y2022
## 16488 y2022
## 16489 y2022
## 16490 y2022
## 16491 y2022
## 16492 y2022
## 16493 y2022
## 16494 y2022
## 16495 y2022
## 16496 y2022
## 16497 y2022
## 16498 y2022
## 16499 y2022
## 16500 y2022
## 16501 y2022
## 16502 y2022
## 16503 y2022
## 16504 y2022
## 16505 y2022
## 16506 y2022
## 16507 y2022
## 16508 y2022
## 16509 y2022
## 16510 y2022
## 16511 y2022
## 16512 y2022
## 16513 y2022
## 16514 y2022
## 16515 y2022
## 16516 y2022
## 16517 y2022
## 16518 y2022
## 16519 y2022
## 16520 y2022
## 16521 y2022
## 16522 y2022
## 16523 y2022
## 16524 y2022
## 16525 y2022
## 16526 y2022
## 16527 y2022
## 16528 y2022
## 16529 y2022
## 16530 y2022
## 16531 y2022
## 16532 y2022
## 16533 y2022
## 16534 y2022
## 16535 y2022
## 16536 y2022
## 16537 y2022
## 16538 y2022
## 16539 y2022
## 16540 y2022
## 16541 y2022
## 16542 y2022
## 16543 y2022
## 16544 y2022
## 16545 y2022
## 16546 y2022
## 16547 y2022
## 16548 y2022
## 16549 y2022
## 16550 y2022
## 16551 y2022
## 16552 y2022
## 16553 y2022
## 16554 y2022
## 16555 y2022
## 16556 y2022
## 16557 y2022
## 16558 y2022
## 16559 y2022
## 16560 y2022
## 16561 y2022
## 16562 y2022
## 16563 y2022
## 16564 y2022
## 16565 y2022
## 16566 y2022
## 16567 y2022
## 16568 y2022
## 16569 y2022
## 16570 y2022
## 16571 y2022
## 16572 y2022
## 16573 y2022
## 16574 y2022
## 16575 y2022
## 16576 y2022
## 16577 y2022
## 16578 y2022
## 16579 y2022
## 16580 y2022
## 16581 y2022
## 16582 y2022
## 16583 y2022
## 16584 y2022
## 16585 y2022
## 16586 y2022
## 16587 y2022
## 16588 y2022
## 16589 y2022
## 16590 y2022
## 16591 y2022
## 16592 y2022
## 16593 y2022
## 16594 y2022
## 16595 y2022
## 16596 y2022
## 16597 y2022
## 16598 y2022
## 16599 y2022
## 16600 y2022
## 16601 y2022
## 16602 y2022
## 16603 y2022
## 16604 y2022
## 16605 y2022
## 16606 y2022
## 16607 y2022
## 16608 y2022
## 16609 y2022
## 16610 y2022
## 16611 y2022
## 16612 y2022
## 16613 y2022
## 16614 y2022
## 16615 y2022
## 16616 y2022
## 16617 y2022
## 16618 y2022
## 16619 y2022
## 16620 y2022
## 16621 y2022
## 16622 y2022
## 16623 y2022
## 16624 y2022
## 16625 y2022
## 16626 y2022
## 16627 y2022
## 16628 y2022
## 16629 y2022
## 16630 y2022
## 16631 y2022
## 16632 y2022
## 16633 y2022
## 16634 y2022
## 16635 y2022
## 16636 y2022
## 16637 y2022
## 16638 y2022
## 16639 y2022
## 16640 y2022
## 16641 y2022
## 16642 y2022
## 16643 y2022
## 16644 y2022
## 16645 y2022
## 16646 y2022
## 16647 y2022
## 16648 y2022
## 16649 y2022
## 16650 y2022
## 16651 y2022
## 16652 y2022
## 16653 y2022
## 16654 y2022
## 16655 y2022
## 16656 y2022
## 16657 y2022
## 16658 y2022
## 16659 y2022
## 16660 y2022
## 16661 y2022
## 16662 y2022
## 16663 y2022
## 16664 y2022
## 16665 y2022
## 16666 y2022
## 16667 y2022
## 16668 y2022
## 16669 y2022
## 16670 y2022
## 16671 y2022
## 16672 y2022
## 16673 y2022
## 16674 y2022
## 16675 y2022
## 16676 y2022
## 16677 y2022
## 16678 y2022
## 16679 y2022
## 16680 y2022
## 16681 y2022
## 16682 y2022
## 16683 y2022
## 16684 y2022
## 16685 y2022
## 16686 y2022
## 16687 y2022
## 16688 y2022
## 16689 y2022
## 16690 y2022
## 16691 y2022
## 16692 y2022
## 16693 y2022
## 16694 y2022
## 16695 y2022
## 16696 y2022
## 16697 y2022
## 16698 y2022
## 16699 y2022
## 16700 y2022
## 16701 y2022
## 16702 y2022
## 16703 y2022
## 16704 y2022
## 16705 y2022
## 16706 y2022
## 16707 y2022
## 16708 y2022
## 16709 y2022
## 16710 y2022
## 16711 y2022
## 16712 y2022
## 16713 y2022
## 16714 y2022
## 16715 y2022
## 16716 y2022
## 16717 y2022
## 16718 y2022
## 16719 y2022
## 16720 y2022
## 16721 y2022
## 16722 y2022
## 16723 y2022
## 16724 y2022
## 16725 y2022
## 16726 y2022
## 16727 y2022
## 16728 y2022
## 16729 y2022
## 16730 y2022
## 16731 y2022
## 16732 y2022
## 16733 y2022
## 16734 y2022
## 16735 y2022
## 16736 y2022
## 16737 y2022
## 16738 y2022
## 16739 y2022
## 16740 y2022
## 16741 y2022
## 16742 y2022
## 16743 y2022
## 16744 y2022
## 16745 y2022
## 16746 y2022
## 16747 y2022
## 16748 y2022
## 16749 y2022
## 16750 y2022
## 16751 y2022
## 16752 y2022
## 16753 y2022
## 16754 y2022
## 16755 y2022
## 16756 y2022
## 16757 y2022
## 16758 y2022
## 16759 y2022
## 16760 y2022
## 16761 y2022
## 16762 y2022
## 16763 y2022
## 16764 y2022
## 16765 y2022
## 16766 y2022
## 16767 y2022
## 16768 y2022
## 16769 y2022
## 16770 y2022
## 16771 y2022
## 16772 y2022
## 16773 y2022
## 16774 y2022
## 16775 y2022
## 16776 y2022
## 16777 y2022
## 16778 y2022
## 16779 y2022
## 16780 y2022
## 16781 y2022
## 16782 y2022
## 16783 y2022
## 16784 y2022
## 16785 y2022
## 16786 y2022
## 16787 y2022
## 16788 y2022
## 16789 y2022
## 16790 y2022
## 16791 y2022
## 16792 y2022
## 16793 y2022
## 16794 y2022
## 16795 y2022
## 16796 y2022
## 16797 y2022
## 16798 y2022
## 16799 y2022
## 16800 y2022
## 16801 y2022
## 16802 y2022
## 16803 y2022
## 16804 y2022
## 16805 y2022
## 16806 y2022
## 16807 y2022
## 16808 y2022
## 16809 y2022
## 16810 y2022
## 16811 y2022
## 16812 y2022
## 16813 y2022
## 16814 y2022
## 16815 y2022
## 16816 y2022
## 16817 y2022
## 16818 y2022
## 16819 y2022
## 16820 y2022
## 16821 y2022
## 16822 y2022
## 16823 y2022
## 16824 y2022
## 16825 y2022
## 16826 y2022
## 16827 y2022
## 16828 y2022
## 16829 y2022
## 16830 y2022
## 16831 y2022
## 16832 y2022
## 16833 y2022
## 16834 y2022
## 16835 y2022
## 16836 y2022
## 16837 y2022
## 16838 y2022
## 16839 y2022
## 16840 y2022
## 16841 y2022
## 16842 y2022
## 16843 y2022
## 16844 y2022
## 16845 y2022
## 16846 y2022
## 16847 y2022
## 16848 y2022
## 16849 y2022
## 16850 y2022
## 16851 y2022
## 16852 y2022
## 16853 y2022
## 16854 y2022
## 16855 y2022
## 16856 y2022
## 16857 y2022
## 16858 y2022
## 16859 y2022
## 16860 y2022
## 16861 y2022
## 16862 y2022
## 16863 y2022
## 16864 y2022
## 16865 y2022
## 16866 y2022
## 16867 y2022
## 16868 y2022
## 16869 y2022
## 16870 y2022
## 16871 y2022
## 16872 y2022
## 16873 y2022
## 16874 y2022
## 16875 y2022
## 16876 y2022
## 16877 y2022
## 16878 y2022
## 16879 y2022
## 16880 y2022
## 16881 y2022
## 16882 y2022
## 16883 y2022
## 16884 y2022
## 16885 y2022
## 16886 y2022
## 16887 y2022
## 16888 y2022
## 16889 y2022
## 16890 y2022
## 16891 y2022
## 16892 y2022
## 16893 y2022
## 16894 y2022
## 16895 y2022
## 16896 y2022
## 16897 y2022
## 16898 y2022
## 16899 y2022
## 16900 y2022
## 16901 y2022
## 16902 y2022
## 16903 y2022
## 16904 y2022
## 16905 y2022
## 16906 y2022
## 16907 y2022
## 16908 y2022
## 16909 y2022
## 16910 y2022
## 16911 y2022
## 16912 y2022
## 16913 y2022
## 16914 y2022
## 16915 y2022
## 16916 y2022
## 16917 y2022
## 16918 y2022
## 16919 y2022
## 16920 y2022
## 16921 y2022
## 16922 y2022
## 16923 y2022
## 16924 y2022
## 16925 y2022
## 16926 y2022
## 16927 y2022
## 16928 y2022
## 16929 y2022
## 16930 y2022
## 16931 y2022
## 16932 y2022
## 16933 y2022
## 16934 y2022
## 16935 y2022
## 16936 y2022
## 16937 y2022
## 16938 y2022
## 16939 y2022
## 16940 y2022
## 16941 y2022
## 16942 y2022
## 16943 y2022
## 16944 y2022
## 16945 y2022
## 16946 y2022
## 16947 y2022
## 16948 y2022
## 16949 y2022
## 16950 y2022
## 16951 y2022
## 16952 y2022
## 16953 y2022
## 16954 y2022
## 16955 y2022
## 16956 y2022
## 16957 y2022
## 16958 y2022
## 16959 y2022
## 16960 y2022
## 16961 y2022
## 16962 y2022
## 16963 y2022
## 16964 y2022
## 16965 y2022
## 16966 y2022
## 16967 y2022
## 16968 y2022
## 16969 y2022
## 16970 y2022
## 16971 y2022
## 16972 y2022
## 16973 y2022
## 16974 y2022
## 16975 y2022
## 16976 y2022
## 16977 y2022
## 16978 y2022
## 16979 y2022
## 16980 y2022
## 16981 y2022
## 16982 y2022
## 16983 y2022
## 16984 y2022
## 16985 y2022
## 16986 y2022
## 16987 y2022
## 16988 y2022
## 16989 y2022
## 16990 y2022
## 16991 y2022
## 16992 y2022
## 16993 y2022
## 16994 y2022
## 16995 y2022
## 16996 y2022
## 16997 y2022
## 16998 y2022
## 16999 y2022
## 17000 y2022
## 17001 y2022
## 17002 y2022
## 17003 y2022
## 17004 y2022
## 17005 y2022
## 17006 y2022
## 17007 y2022
## 17008 y2022
## 17009 y2022
## 17010 y2022
## 17011 y2022
## 17012 y2022
## 17013 y2022
## 17014 y2022
## 17015 y2022
## 17016 y2022
## 17017 y2022
## 17018 y2022
## 17019 y2022
## 17020 y2022
## 17021 y2022
## 17022 y2022
## 17023 y2022
## 17024 y2022
## 17025 y2022
## 17026 y2022
## 17027 y2022
## 17028 y2022
## 17029 y2022
## 17030 y2022
## 17031 y2022
## 17032 y2022
## 17033 y2022
## 17034 y2022
## 17035 y2022
## 17036 y2022
## 17037 y2022
## 17038 y2022
## 17039 y2022
## 17040 y2022
## 17041 y2022
## 17042 y2022
## 17043 y2022
## 17044 y2022
## 17045 y2022
## 17046 y2022
## 17047 y2022
## 17048 y2022
## 17049 y2022
## 17050 y2022
## 17051 y2022
## 17052 y2022
## 17053 y2022
## 17054 y2022
## 17055 y2022
## 17056 y2022
## 17057 y2022
## 17058 y2022
## 17059 y2022
## 17060 y2022
## 17061 y2022
## 17062 y2022
## 17063 y2022
## 17064 y2022
## 17065 y2022
## 17066 y2022
## 17067 y2022
## 17068 y2022
## 17069 y2022
## 17070 y2022
## 17071 y2022
## 17072 y2022
## 17073 y2022
## 17074 y2022
## 17075 y2022
## 17076 y2022
## 17077 y2022
## 17078 y2022
## 17079 y2022
## 17080 y2022
## 17081 y2022
## 17082 y2022
## 17083 y2022
## 17084 y2022
## 17085 y2022
## 17086 y2022
## 17087 y2022
## 17088 y2022
## 17089 y2022
## 17090 y2022
## 17091 y2022
## 17092 y2022
## 17093 y2022
## 17094 y2022
## 17095 y2022
## 17096 y2022
## 17097 y2022
## 17098 y2022
## 17099 y2022
## 17100 y2022
## 17101 y2022
## 17102 y2022
## 17103 y2022
## 17104 y2022
## 17105 y2022
## 17106 y2022
## 17107 y2022
## 17108 y2022
## 17109 y2022
## 17110 y2022
## 17111 y2022
## 17112 y2022
## 17113 y2022
## 17114 y2022
## 17115 y2022
## 17116 y2022
## 17117 y2022
## 17118 y2022
## 17119 y2022
## 17120 y2022
## 17121 y2022
## 17122 y2022
## 17123 y2022
## 17124 y2022
## 17125 y2022
## 17126 y2022
## 17127 y2022
## 17128 y2022
## 17129 y2022
## 17130 y2022
## 17131 y2022
## 17132 y2022
## 17133 y2022
## 17134 y2022
## 17135 y2022
## 17136 y2022
## 17137 y2022
## 17138 y2022
## 17139 y2022
## 17140 y2022
## 17141 y2022
## 17142 y2022
## 17143 y2022
## 17144 y2022
## 17145 y2022
## 17146 y2022
## 17147 y2022
## 17148 y2022
## 17149 y2022
## 17150 y2022
## 17151 y2022
## 17152 y2022
## 17153 y2022
## 17154 y2022
## 17155 y2022
## 17156 y2022
## 17157 y2022
## 17158 y2022
## 17159 y2022
## 17160 y2022
## 17161 y2022
## 17162 y2022
## 17163 y2022
## 17164 y2022
## 17165 y2022
## 17166 y2022
## 17167 y2022
## 17168 y2022
## 17169 y2022
## 17170 y2022
## 17171 y2022
## 17172 y2022
## 17173 y2022
## 17174 y2022
## 17175 y2022
## 17176 y2022
## 17177 y2022
## 17178 y2022
## 17179 y2022
## 17180 y2022
## 17181 y2022
## 17182 y2022
## 17183 y2022
## 17184 y2022
## 17185 y2022
## 17186 y2022
## 17187 y2022
## 17188 y2022
## 17189 y2022
## 17190 y2022
## 17191 y2022
## 17192 y2022
## 17193 y2022
## 17194 y2022
## 17195 y2022
## 17196 y2022
## 17197 y2022
## 17198 y2022
## 17199 y2022
## 17200 y2022
## 17201 y2022
## 17202 y2022
## 17203 y2022
## 17204 y2022
## 17205 y2022
## 17206 y2022
## 17207 y2022
## 17208 y2022
## 17209 y2022
## 17210 y2022
## 17211 y2022
## 17212 y2022
## 17213 y2022
## 17214 y2022
## 17215 y2022
## 17216 y2022
## 17217 y2022
## 17218 y2022
## 17219 y2022
## 17220 y2022
## 17221 y2022
## 17222 y2022
## 17223 y2022
## 17224 y2022
## 17225 y2022
## 17226 y2022
## 17227 y2022
## 17228 y2022
## 17229 y2022
## 17230 y2022
## 17231 y2022
## 17232 y2022
## 17233 y2022
## 17234 y2022
## 17235 y2022
## 17236 y2022
## 17237 y2022
## 17238 y2022
## 17239 y2022
## 17240 y2022
## 17241 y2022
## 17242 y2022
## 17243 y2022
## 17244 y2022
## 17245 y2022
## 17246 y2022
## 17247 y2022
## 17248 y2022
## 17249 y2022
## 17250 y2022
## 17251 y2022
## 17252 y2022
## 17253 y2022
## 17254 y2022
## 17255 y2022
## 17256 y2022
## 17257 y2022
## 17258 y2022
## 17259 y2022
## 17260 y2022
## 17261 y2022
## 17262 y2022
## 17263 y2022
## 17264 y2022
## 17265 y2022
## 17266 y2022
## 17267 y2022
## 17268 y2022
## 17269 y2022
## 17270 y2022
## 17271 y2022
## 17272 y2022
## 17273 y2022
## 17274 y2022
## 17275 y2022
## 17276 y2022
## 17277 y2022
## 17278 y2022
## 17279 y2022
## 17280 y2022
## 17281 y2022
## 17282 y2022
## 17283 y2022
## 17284 y2022
## 17285 y2022
## 17286 y2022
## 17287 y2022
## 17288 y2022
## 17289 y2022
## 17290 y2022
## 17291 y2022
## 17292 y2022
## 17293 y2022
## 17294 y2022
## 17295 y2022
## 17296 y2022
## 17297 y2022
## 17298 y2022
## 17299 y2022
## 17300 y2022
## 17301 y2022
## 17302 y2022
## 17303 y2022
## 17304 y2022
## 17305 y2022
## 17306 y2022
## 17307 y2022
## 17308 y2022
## 17309 y2022
## 17310 y2022
## 17311 y2022
## 17312 y2022
## 17313 y2022
## 17314 y2022
## 17315 y2022
## 17316 y2022
## 17317 y2022
## 17318 y2022
## 17319 y2022
## 17320 y2022
## 17321 y2022
## 17322 y2022
## 17323 y2022
## 17324 y2022
## 17325 y2022
## 17326 y2022
## 17327 y2022
## 17328 y2022
## 17329 y2022
## 17330 y2022
## 17331 y2022
## 17332 y2022
## 17333 y2022
## 17334 y2022
## 17335 y2022
## 17336 y2022
## 17337 y2022
## 17338 y2022
## 17339 y2022
## 17340 y2022
## 17341 y2022
## 17342 y2022
## 17343 y2022
## 17344 y2022
## 17345 y2022
## 17346 y2022
## 17347 y2022
## 17348 y2022
## 17349 y2022
## 17350 y2022
## 17351 y2022
## 17352 y2022
## 17353 y2022
## 17354 y2022
## 17355 y2022
## 17356 y2022
## 17357 y2022
## 17358 y2022
## 17359 y2022
## 17360 y2022
## 17361 y2022
## 17362 y2022
## 17363 y2022
## 17364 y2022
## 17365 y2022
## 17366 y2022
## 17367 y2022
## 17368 y2022
## 17369 y2022
## 17370 y2022
## 17371 y2022
## 17372 y2022
## 17373 y2022
## 17374 y2022
## 17375 y2022
## 17376 y2022
## 17377 y2022
## 17378 y2022
## 17379 y2022
## 17380 y2022
## 17381 y2022
## 17382 y2022
## 17383 y2022
## 17384 y2022
## 17385 y2022
## 17386 y2022
## 17387 y2022
## 17388 y2022
## 17389 y2022
## 17390 y2022
## 17391 y2022
## 17392 y2022
## 17393 y2022
## 17394 y2022
## 17395 y2022
## 17396 y2022
## 17397 y2022
## 17398 y2022
## 17399 y2022
## 17400 y2022
## 17401 y2022
## 17402 y2022
## 17403 y2022
## 17404 y2022
## 17405 y2022
## 17406 y2022
## 17407 y2022
## 17408 y2022
## 17409 y2022
## 17410 y2022
## 17411 y2022
## 17412 y2022
## 17413 y2022
## 17414 y2022
## 17415 y2022
## 17416 y2022
## 17417 y2022
## 17418 y2022
## 17419 y2022
## 17420 y2022
## 17421 y2022
## 17422 y2022
## 17423 y2022
## 17424 y2022
## 17425 y2022
## 17426 y2022
## 17427 y2022
## 17428 y2022
## 17429 y2022
## 17430 y2022
## 17431 y2022
## 17432 y2022
## 17433 y2022
## 17434 y2022
## 17435 y2022
## 17436 y2022
## 17437 y2022
## 17438 y2022
## 17439 y2022
## 17440 y2022
## 17441 y2022
## 17442 y2022
## 17443 y2022
## 17444 y2022
## 17445 y2022
## 17446 y2022
## 17447 y2022
## 17448 y2022
## 17449 y2022
## 17450 y2022
## 17451 y2022
## 17452 y2022
## 17453 y2022
## 17454 y2022
## 17455 y2022
## 17456 y2022
## 17457 y2022
## 17458 y2022
## 17459 y2022
## 17460 y2022
## 17461 y2022
## 17462 y2022
## 17463 y2022
## 17464 y2022
## 17465 y2022
## 17466 y2022
## 17467 y2022
## 17468 y2022
## 17469 y2022
## 17470 y2022
## 17471 y2022
## 17472 y2022
## 17473 y2022
## 17474 y2022
## 17475 y2022
## 17476 y2022
## 17477 y2022
## 17478 y2022
## 17479 y2022
## 17480 y2022
## 17481 y2022
## 17482 y2022
## 17483 y2022
## 17484 y2022
## 17485 y2022
## 17486 y2022
## 17487 y2022
## 17488 y2022
## 17489 y2022
## 17490 y2022
## 17491 y2022
## 17492 y2022
## 17493 y2022
## 17494 y2022
## 17495 y2022
## 17496 y2022
## 17497 y2022
## 17498 y2022
## 17499 y2022
## 17500 y2022
## 17501 y2022
## 17502 y2022
## 17503 y2022
## 17504 y2022
## 17505 y2022
## 17506 y2022
## 17507 y2022
## 17508 y2022
## 17509 y2022
## 17510 y2022
## 17511 y2022
## 17512 y2022
## 17513 y2022
## 17514 y2022
## 17515 y2022
## 17516 y2022
## 17517 y2022
## 17518 y2022
## 17519 y2022
## 17520 y2022
## 17521 y2022
## 17522 y2022
## 17523 y2022
## 17524 y2022
## 17525 y2022
## 17526 y2022
## 17527 y2022
## 17528 y2022
## 17529 y2022
## 17530 y2022
## 17531 y2022
## 17532 y2022
## 17533 y2022
## 17534 y2022
## 17535 y2022
## 17536 y2022
## 17537 y2022
## 17538 y2022
## 17539 y2022
## 17540 y2022
## 17541 y2022
## 17542 y2022
## 17543 y2022
## 17544 y2022
## 17545 y2022
## 17546 y2022
## 17547 y2022
## 17548 y2022
## 17549 y2022
## 17550 y2022
## 17551 y2022
## 17552 y2022
## 17553 y2022
## 17554 y2022
## 17555 y2022
## 17556 y2022
## 17557 y2022
## 17558 y2022
## 17559 y2022
## 17560 y2022
## 17561 y2022
## 17562 y2022
## 17563 y2022
## 17564 y2022
## 17565 y2022
## 17566 y2022
## 17567 y2022
## 17568 y2022
## 17569 y2022
## 17570 y2022
## 17571 y2022
## 17572 y2022
## 17573 y2022
## 17574 y2022
## 17575 y2022
## 17576 y2022
## 17577 y2022
## 17578 y2022
## 17579 y2022
## 17580 y2022
## 17581 y2022
## 17582 y2022
## 17583 y2022
## 17584 y2022
## 17585 y2022
## 17586 y2022
## 17587 y2022
## 17588 y2022
## 17589 y2022
## 17590 y2022
## 17591 y2022
## 17592 y2022
## 17593 y2022
## 17594 y2022
## 17595 y2022
## 17596 y2022
## 17597 y2022
## 17598 y2022
## 17599 y2022
## 17600 y2022
## 17601 y2022
## 17602 y2022
## 17603 y2022
## 17604 y2022
## 17605 y2022
## 17606 y2022
## 17607 y2022
## 17608 y2022
## 17609 y2022
## 17610 y2022
## 17611 y2022
## 17612 y2022
## 17613 y2022
## 17614 y2022
## 17615 y2022
## 17616 y2022
## 17617 y2022
## 17618 y2022
## 17619 y2022
## 17620 y2022
## 17621 y2022
## 17622 y2022
## 17623 y2022
## 17624 y2022
## 17625 y2022
## 17626 y2022
## 17627 y2022
## 17628 y2022
## 17629 y2022
## 17630 y2022
## 17631 y2022
## 17632 y2022
## 17633 y2022
## 17634 y2022
## 17635 y2022
## 17636 y2022
## 17637 y2022
## 17638 y2022
## 17639 y2022
## 17640 y2022
## 17641 y2022
## 17642 y2022
## 17643 y2022
## 17644 y2022
## 17645 y2022
## 17646 y2022
## 17647 y2022
## 17648 y2022
## 17649 y2022
## 17650 y2022
## 17651 y2022
## 17652 y2022
## 17653 y2022
## 17654 y2022
## 17655 y2022
## 17656 y2022
## 17657 y2022
## 17658 y2022
## 17659 y2022
## 17660 y2022
## 17661 y2022
## 17662 y2022
## 17663 y2022
## 17664 y2022
## 17665 y2022
## 17666 y2022
## 17667 y2022
## 17668 y2022
## 17669 y2022
## 17670 y2022
## 17671 y2022
## 17672 y2022
## 17673 y2022
## 17674 y2022
## 17675 y2022
## 17676 y2022
## 17677 y2022
## 17678 y2022
## 17679 y2022
## 17680 y2022
## 17681 y2022
## 17682 y2022
## 17683 y2022
## 17684 y2022
## 17685 y2022
## 17686 y2022
## 17687 y2022
## 17688 y2022
## 17689 y2022
## 17690 y2022
## 17691 y2022
## 17692 y2022
## 17693 y2022
## 17694 y2022
## 17695 y2022
## 17696 y2022
## 17697 y2022
## 17698 y2022
## 17699 y2022
## 17700 y2022
## 17701 y2022
## 17702 y2022
## 17703 y2022
## 17704 y2022
## 17705 y2022
## 17706 y2022
## 17707 y2022
## 17708 y2022
## 17709 y2022
## 17710 y2022
## 17711 y2022
## 17712 y2022
## 17713 y2022
## 17714 y2022
## 17715 y2022
## 17716 y2022
## 17717 y2022
## 17718 y2022
## 17719 y2022
## 17720 y2022
## 17721 y2022
## 17722 y2022
## 17723 y2022
## 17724 y2022
## 17725 y2022
## 17726 y2022
## 17727 y2022
## 17728 y2022
## 17729 y2022
## 17730 y2022
## 17731 y2022
## 17732 y2022
## 17733 y2022
## 17734 y2022
## 17735 y2022
## 17736 y2022
## 17737 y2022
## 17738 y2022
## 17739 y2022
## 17740 y2022
## 17741 y2022
## 17742 y2022
## 17743 y2022
## 17744 y2022
## 17745 y2022
## 17746 y2022
## 17747 y2022
## 17748 y2022
## 17749 y2022
## 17750 y2022
## 17751 y2022
## 17752 y2022
## 17753 y2022
## 17754 y2022
## 17755 y2022
## 17756 y2022
## 17757 y2022
## 17758 y2022
## 17759 y2022
## 17760 y2022
## 17761 y2022
## 17762 y2022
## 17763 y2022
## 17764 y2022
## 17765 y2022
## 17766 y2022
## 17767 y2022
## 17768 y2022
## 17769 y2022
## 17770 y2022
## 17771 y2022
## 17772 y2022
## 17773 y2022
## 17774 y2022
## 17775 y2022
## 17776 y2022
## 17777 y2022
## 17778 y2022
## 17779 y2022
## 17780 y2022
## 17781 y2022
## 17782 y2022
## 17783 y2022
## 17784 y2022
## 17785 y2022
## 17786 y2022
## 17787 y2022
## 17788 y2022
## 17789 y2022
## 17790 y2022
## 17791 y2022
## 17792 y2022
## 17793 y2022
## 17794 y2022
## 17795 y2022
## 17796 y2022
## 17797 y2022
## 17798 y2022
## 17799 y2022
## 17800 y2022
## 17801 y2022
## 17802 y2022
## 17803 y2022
## 17804 y2022
## 17805 y2022
## 17806 y2022
## 17807 y2022
## 17808 y2022
## 17809 y2022
## 17810 y2022
## 17811 y2022
## 17812 y2022
## 17813 y2022
## 17814 y2022
## 17815 y2022
## 17816 y2022
## 17817 y2022
## 17818 y2022
## 17819 y2022
## 17820 y2022
## 17821 y2022
## 17822 y2022
## 17823 y2022
## 17824 y2022
## 17825 y2022
## 17826 y2022
## 17827 y2022
## 17828 y2022
## 17829 y2022
## 17830 y2022
## 17831 y2022
## 17832 y2022
## 17833 y2022
## 17834 y2022
## 17835 y2022
## 17836 y2022
## 17837 y2022
## 17838 y2022
## 17839 y2022
## 17840 y2022
## 17841 y2022
## 17842 y2022
## 17843 y2022
## 17844 y2022
## 17845 y2022
## 17846 y2022
## 17847 y2022
## 17848 y2022
## 17849 y2022
## 17850 y2022
## 17851 y2022
## 17852 y2022
## 17853 y2022
## 17854 y2022
## 17855 y2022
## 17856 y2022
## 17857 y2022
## 17858 y2022
## 17859 y2022
## 17860 y2022
## 17861 y2022
## 17862 y2022
## 17863 y2022
## 17864 y2022
## 17865 y2022
## 17866 y2022
## 17867 y2022
## 17868 y2022
## 17869 y2022
## 17870 y2022
## 17871 y2022
## 17872 y2022
## 17873 y2022
## 17874 y2022
## 17875 y2022
## 17876 y2022
## 17877 y2022
## 17878 y2022
## 17879 y2022
## 17880 y2022
## 17881 y2022
## 17882 y2022
## 17883 y2022
## 17884 y2022
## 17885 y2022
## 17886 y2022
## 17887 y2022
## 17888 y2022
## 17889 y2022
## 17890 y2022
## 17891 y2022
## 17892 y2022
## 17893 y2022
## 17894 y2022
## 17895 y2022
## 17896 y2022
## 17897 y2022
## 17898 y2022
## 17899 y2022
## 17900 y2022
## 17901 y2022
## 17902 y2022
## 17903 y2020
## 17904 y2020
## 17905 y2020
## 17906 y2020
## 17907 y2020
## 17908 y2020
## 17909 y2020
## 17910 y2020
## 17911 y2020
## 17912 y2020
## 17913 y2020
## 17914 y2020
## 17915 y2020
## 17916 y2020
## 17917 y2020
## 17918 y2020
## 17919 y2020
## 17920 y2020
## 17921 y2020
## 17922 y2020
## 17923 y2020
## 17924 y2020
## 17925 y2020
## 17926 y2020
## 17927 y2020
## 17928 y2020
## 17929 y2020
## 17930 y2020
## 17931 y2020
## 17932 y2020
## 17933 y2020
## 17934 y2020
## 17935 y2020
## 17936 y2020
## 17937 y2020
## 17938 y2020
## 17939 y2020
## 17940 y2020
## 17941 y2020
## 17942 y2020
## 17943 y2020
## 17944 y2020
## 17945 y2020
## 17946 y2020
## 17947 y2020
## 17948 y2020
## 17949 y2020
## 17950 y2020
## 17951 y2020
## 17952 y2020
## 17953 y2020
## 17954 y2020
## 17955 y2020
## 17956 y2020
## 17957 y2020
## 17958 y2020
## 17959 y2020
## 17960 y2020
## 17961 y2020
## 17962 y2020
## 17963 y2020
## 17964 y2020
## 17965 y2020
## 17966 y2020
## 17967 y2020
## 17968 y2020
## 17969 y2020
## 17970 y2020
## 17971 y2020
## 17972 y2020
## 17973 y2020
## 17974 y2020
## 17975 y2020
## 17976 y2020
## 17977 y2020
## 17978 y2020
## 17979 y2020
## 17980 y2020
## 17981 y2020
## 17982 y2020
## 17983 y2020
## 17984 y2020
## 17985 y2020
## 17986 y2020
## 17987 y2020
## 17988 y2020
## 17989 y2020
## 17990 y2020
## 17991 y2020
## 17992 y2020
## 17993 y2020
## 17994 y2020
## 17995 y2020
## 17996 y2020
## 17997 y2020
## 17998 y2020
## 17999 y2020
## 18000 y2020
## 18001 y2020
## 18002 y2020
## 18003 y2020
## 18004 y2020
## 18005 y2020
## 18006 y2020
## 18007 y2020
## 18008 y2020
## 18009 y2020
## 18010 y2020
## 18011 y2020
## 18012 y2020
## 18013 y2020
## 18014 y2020
## 18015 y2020
## 18016 y2020
## 18017 y2020
## 18018 y2020
## 18019 y2020
## 18020 y2020
## 18021 y2020
## 18022 y2020
## 18023 y2020
## 18024 y2020
## 18025 y2020
## 18026 y2020
## 18027 y2020
## 18028 y2020
## 18029 y2020
## 18030 y2020
## 18031 y2020
## 18032 y2020
## 18033 y2020
## 18034 y2020
## 18035 y2020
## 18036 y2020
## 18037 y2020
## 18038 y2020
## 18039 y2020
## 18040 y2020
## 18041 y2020
## 18042 y2020
## 18043 y2020
## 18044 y2020
## 18045 y2020
## 18046 y2020
## 18047 y2020
## 18048 y2020
## 18049 y2020
## 18050 y2020
## 18051 y2020
## 18052 y2020
## 18053 y2020
## 18054 y2020
## 18055 y2020
## 18056 y2020
## 18057 y2020
## 18058 y2020
## 18059 y2020
## 18060 y2020
## 18061 y2020
## 18062 y2020
## 18063 y2020
## 18064 y2020
## 18065 y2020
## 18066 y2020
## 18067 y2020
## 18068 y2020
## 18069 y2020
## 18070 y2020
## 18071 y2020
## 18072 y2020
## 18073 y2020
## 18074 y2020
## 18075 y2020
## 18076 y2020
## 18077 y2020
## 18078 y2020
## 18079 y2020
## 18080 y2020
## 18081 y2020
## 18082 y2020
## 18083 y2020
## 18084 y2020
## 18085 y2020
## 18086 y2020
## 18087 y2020
## 18088 y2020
## 18089 y2020
## 18090 y2020
## 18091 y2020
## 18092 y2020
## 18093 y2020
## 18094 y2020
## 18095 y2020
## 18096 y2020
## 18097 y2020
## 18098 y2020
## 18099 y2020
## 18100 y2020
## 18101 y2020
## 18102 y2020
## 18103 y2020
## 18104 y2020
## 18105 y2020
## 18106 y2020
## 18107 y2020
## 18108 y2020
## 18109 y2020
## 18110 y2020
## 18111 y2020
## 18112 y2020
## 18113 y2020
## 18114 y2020
## 18115 y2020
## 18116 y2020
## 18117 y2020
## 18118 y2020
## 18119 y2020
## 18120 y2020
## 18121 y2020
## 18122 y2020
## 18123 y2020
## 18124 y2020
## 18125 y2020
## 18126 y2020
## 18127 y2020
## 18128 y2020
## 18129 y2020
## 18130 y2020
## 18131 y2020
## 18132 y2020
## 18133 y2020
## 18134 y2020
## 18135 y2020
## 18136 y2020
## 18137 y2020
## 18138 y2020
## 18139 y2020
## 18140 y2020
## 18141 y2020
## 18142 y2020
## 18143 y2020
## 18144 y2020
## 18145 y2020
## 18146 y2020
## 18147 y2020
## 18148 y2020
## 18149 y2020
## 18150 y2020
## 18151 y2020
## 18152 y2020
## 18153 y2020
## 18154 y2020
## 18155 y2020
## 18156 y2020
## 18157 y2020
## 18158 y2020
## 18159 y2020
## 18160 y2020
## 18161 y2020
## 18162 y2020
## 18163 y2020
## 18164 y2020
## 18165 y2020
## 18166 y2020
## 18167 y2020
## 18168 y2020
## 18169 y2020
## 18170 y2020
## 18171 y2020
## 18172 y2020
## 18173 y2020
## 18174 y2020
## 18175 y2020
## 18176 y2020
## 18177 y2020
## 18178 y2020
## 18179 y2020
## 18180 y2020
## 18181 y2020
## 18182 y2020
## 18183 y2020
## 18184 y2020
## 18185 y2020
## 18186 y2020
## 18187 y2020
## 18188 y2020
## 18189 y2020
## 18190 y2020
## 18191 y2020
## 18192 y2020
## 18193 y2020
## 18194 y2020
## 18195 y2020
## 18196 y2020
## 18197 y2020
## 18198 y2020
## 18199 y2020
## 18200 y2020
## 18201 y2020
## 18202 y2020
## 18203 y2020
## 18204 y2020
## 18205 y2020
## 18206 y2020
## 18207 y2020
## 18208 y2020
## 18209 y2020
## 18210 y2020
## 18211 y2020
## 18212 y2020
## 18213 y2020
## 18214 y2020
## 18215 y2020
## 18216 y2020
## 18217 y2020
## 18218 y2020
## 18219 y2020
## 18220 y2020
## 18221 y2020
## 18222 y2020
## 18223 y2020
## 18224 y2020
## 18225 y2020
## 18226 y2020
## 18227 y2020
## 18228 y2020
## 18229 y2020
## 18230 y2020
## 18231 y2020
## 18232 y2020
## 18233 y2020
## 18234 y2020
## 18235 y2020
## 18236 y2020
## 18237 y2020
## 18238 y2020
## 18239 y2020
## 18240 y2020
## 18241 y2020
## 18242 y2020
## 18243 y2020
## 18244 y2020
## 18245 y2020
## 18246 y2020
## 18247 y2020
## 18248 y2020
## 18249 y2020
## 18250 y2020
## 18251 y2020
## 18252 y2020
## 18253 y2020
## 18254 y2020
## 18255 y2020
## 18256 y2020
## 18257 y2020
## 18258 y2020
## 18259 y2020
## 18260 y2020
## 18261 y2020
## 18262 y2020
## 18263 y2020
## 18264 y2020
## 18265 y2020
## 18266 y2020
## 18267 y2020
## 18268 y2020
## 18269 y2020
## 18270 y2020
## 18271 y2020
## 18272 y2020
## 18273 y2020
## 18274 y2020
## 18275 y2020
## 18276 y2020
## 18277 y2020
## 18278 y2020
## 18279 y2020
## 18280 y2020
## 18281 y2020
## 18282 y2020
## 18283 y2020
## 18284 y2020
## 18285 y2020
## 18286 y2020
## 18287 y2020
## 18288 y2020
## 18289 y2020
## 18290 y2020
## 18291 y2020
## 18292 y2020
## 18293 y2020
## 18294 y2020
## 18295 y2020
## 18296 y2020
## 18297 y2020
## 18298 y2020
## 18299 y2020
## 18300 y2020
## 18301 y2020
## 18302 y2020
## 18303 y2020
## 18304 y2020
## 18305 y2020
## 18306 y2020
## 18307 y2020
## 18308 y2020
## 18309 y2020
## 18310 y2020
## 18311 y2020
## 18312 y2020
## 18313 y2020
## 18314 y2020
## 18315 y2020
## 18316 y2020
## 18317 y2020
## 18318 y2020
## 18319 y2020
## 18320 y2020
## 18321 y2020
## 18322 y2020
## 18323 y2020
## 18324 y2020
## 18325 y2020
## 18326 y2020
## 18327 y2020
## 18328 y2020
## 18329 y2020
## 18330 y2020
## 18331 y2020
## 18332 y2020
## 18333 y2020
## 18334 y2020
## 18335 y2020
## 18336 y2020
## 18337 y2020
## 18338 y2020
## 18339 y2020
## 18340 y2020
## 18341 y2020
## 18342 y2020
## 18343 y2020
## 18344 y2020
## 18345 y2020
## 18346 y2020
## 18347 y2020
## 18348 y2020
## 18349 y2020
## 18350 y2020
## 18351 y2020
## 18352 y2020
## 18353 y2020
## 18354 y2020
## 18355 y2020
## 18356 y2020
## 18357 y2020
## 18358 y2020
## 18359 y2020
## 18360 y2020
## 18361 y2020
## 18362 y2020
## 18363 y2020
## 18364 y2020
## 18365 y2020
## 18366 y2020
## 18367 y2020
## 18368 y2020
## 18369 y2020
## 18370 y2020
## 18371 y2020
## 18372 y2020
## 18373 y2020
## 18374 y2020
## 18375 y2020
## 18376 y2020
## 18377 y2020
## 18378 y2020
## 18379 y2020
## 18380 y2020
## 18381 y2020
## 18382 y2020
## 18383 y2020
## 18384 y2020
## 18385 y2020
## 18386 y2020
## 18387 y2020
## 18388 y2020
## 18389 y2020
## 18390 y2020
## 18391 y2020
## 18392 y2020
## 18393 y2020
## 18394 y2020
## 18395 y2020
## 18396 y2020
## 18397 y2020
## 18398 y2020
## 18399 y2020
## 18400 y2020
## 18401 y2020
## 18402 y2020
## 18403 y2020
## 18404 y2020
## 18405 y2020
## 18406 y2020
## 18407 y2020
## 18408 y2020
## 18409 y2020
## 18410 y2020
## 18411 y2020
## 18412 y2020
## 18413 y2020
## 18414 y2020
## 18415 y2020
## 18416 y2020
## 18417 y2020
## 18418 y2020
## 18419 y2020
## 18420 y2020
## 18421 y2020
## 18422 y2020
## 18423 y2020
## 18424 y2020
## 18425 y2020
## 18426 y2020
## 18427 y2020
## 18428 y2020
## 18429 y2020
## 18430 y2020
## 18431 y2020
## 18432 y2020
## 18433 y2020
## 18434 y2020
## 18435 y2020
## 18436 y2020
## 18437 y2020
## 18438 y2020
## 18439 y2020
## 18440 y2020
## 18441 y2020
## 18442 y2020
## 18443 y2020
## 18444 y2020
## 18445 y2020
## 18446 y2020
## 18447 y2020
## 18448 y2020
## 18449 y2020
## 18450 y2020
## 18451 y2020
## 18452 y2020
## 18453 y2020
## 18454 y2020
## 18455 y2020
## 18456 y2020
## 18457 y2020
## 18458 y2020
## 18459 y2020
## 18460 y2020
## 18461 y2020
## 18462 y2020
## 18463 y2020
## 18464 y2020
## 18465 y2020
## 18466 y2020
## 18467 y2020
## 18468 y2020
## 18469 y2020
## 18470 y2020
## 18471 y2020
## 18472 y2020
## 18473 y2020
## 18474 y2020
## 18475 y2020
## 18476 y2020
## 18477 y2020
## 18478 y2020
## 18479 y2020
## 18480 y2020
## 18481 y2020
## 18482 y2020
## 18483 y2020
## 18484 y2020
## 18485 y2020
## 18486 y2020
## 18487 y2020
## 18488 y2020
## 18489 y2020
## 18490 y2020
## 18491 y2020
## 18492 y2020
## 18493 y2020
## 18494 y2020
## 18495 y2020
## 18496 y2020
## 18497 y2020
## 18498 y2020
## 18499 y2020
## 18500 y2020
## 18501 y2020
## 18502 y2020
## 18503 y2020
## 18504 y2020
## 18505 y2020
## 18506 y2020
## 18507 y2020
## 18508 y2020
## 18509 y2020
## 18510 y2020
## 18511 y2020
## 18512 y2020
## 18513 y2020
## 18514 y2020
## 18515 y2020
## 18516 y2020
## 18517 y2020
## 18518 y2020
## 18519 y2020
## 18520 y2020
## 18521 y2020
## 18522 y2020
## 18523 y2020
## 18524 y2020
## 18525 y2020
## 18526 y2020
## 18527 y2020
## 18528 y2020
## 18529 y2020
## 18530 y2020
## 18531 y2020
## 18532 y2020
## 18533 y2020
## 18534 y2020
## 18535 y2020
## 18536 y2020
## 18537 y2020
## 18538 y2020
## 18539 y2020
## 18540 y2020
## 18541 y2020
## 18542 y2020
## 18543 y2020
## 18544 y2020
## 18545 y2020
## 18546 y2020
## 18547 y2020
## 18548 y2020
## 18549 y2020
## 18550 y2020
## 18551 y2020
## 18552 y2020
## 18553 y2020
## 18554 y2020
## 18555 y2020
## 18556 y2020
## 18557 y2020
## 18558 y2020
## 18559 y2020
## 18560 y2020
## 18561 y2020
## 18562 y2020
## 18563 y2020
## 18564 y2020
## 18565 y2020
## 18566 y2020
## 18567 y2020
## 18568 y2020
## 18569 y2020
## 18570 y2020
## 18571 y2020
## 18572 y2020
## 18573 y2020
## 18574 y2020
## 18575 y2020
## 18576 y2020
## 18577 y2020
## 18578 y2020
## 18579 y2020
## 18580 y2020
## 18581 y2020
## 18582 y2020
## 18583 y2020
## 18584 y2020
## 18585 y2020
## 18586 y2020
## 18587 y2020
## 18588 y2020
## 18589 y2020
## 18590 y2020
## 18591 y2020
## 18592 y2020
## 18593 y2020
## 18594 y2020
## 18595 y2020
## 18596 y2020
## 18597 y2020
## 18598 y2020
## 18599 y2020
## 18600 y2020
## 18601 y2020
## 18602 y2020
## 18603 y2020
## 18604 y2020
## 18605 y2020
## 18606 y2020
## 18607 y2020
## 18608 y2020
## 18609 y2020
## 18610 y2020
## 18611 y2020
## 18612 y2020
## 18613 y2020
## 18614 y2020
## 18615 y2020
## 18616 y2020
## 18617 y2020
## 18618 y2020
## 18619 y2020
## 18620 y2020
## 18621 y2020
## 18622 y2020
## 18623 y2020
## 18624 y2020
## 18625 y2020
## 18626 y2020
## 18627 y2020
## 18628 y2020
## 18629 y2020
## 18630 y2020
## 18631 y2020
## 18632 y2020
## 18633 y2020
## 18634 y2020
## 18635 y2020
## 18636 y2020
## 18637 y2020
## 18638 y2020
## 18639 y2020
## 18640 y2020
## 18641 y2020
## 18642 y2020
## 18643 y2020
## 18644 y2020
## 18645 y2020
## 18646 y2020
## 18647 y2020
## 18648 y2020
## 18649 y2020
## 18650 y2020
## 18651 y2020
## 18652 y2020
## 18653 y2020
## 18654 y2020
## 18655 y2020
## 18656 y2020
## 18657 y2020
## 18658 y2020
## 18659 y2020
## 18660 y2020
## 18661 y2020
## 18662 y2020
## 18663 y2020
## 18664 y2020
## 18665 y2020
## 18666 y2020
## 18667 y2020
## 18668 y2020
## 18669 y2020
## 18670 y2020
## 18671 y2020
## 18672 y2020
## 18673 y2020
## 18674 y2020
## 18675 y2020
## 18676 y2020
## 18677 y2020
## 18678 y2020
## 18679 y2020
## 18680 y2020
## 18681 y2020
## 18682 y2020
## 18683 y2020
## 18684 y2020
## 18685 y2020
## 18686 y2020
## 18687 y2020
## 18688 y2020
## 18689 y2020
## 18690 y2020
## 18691 y2020
## 18692 y2020
## 18693 y2020
## 18694 y2020
## 18695 y2020
## 18696 y2020
## 18697 y2020
## 18698 y2020
## 18699 y2020
## 18700 y2020
## 18701 y2020
## 18702 y2020
## 18703 y2020
## 18704 y2020
## 18705 y2020
## 18706 y2020
## 18707 y2020
## 18708 y2020
## 18709 y2020
## 18710 y2020
## 18711 y2020
## 18712 y2020
## 18713 y2020
## 18714 y2020
## 18715 y2020
## 18716 y2020
## 18717 y2020
## 18718 y2020
## 18719 y2020
## 18720 y2020
## 18721 y2020
## 18722 y2020
## 18723 y2020
## 18724 y2020
## 18725 y2020
## 18726 y2020
## 18727 y2020
## 18728 y2020
## 18729 y2020
## 18730 y2020
## 18731 y2020
## 18732 y2020
## 18733 y2020
## 18734 y2020
## 18735 y2020
## 18736 y2020
## 18737 y2020
## 18738 y2020
## 18739 y2020
## 18740 y2020
## 18741 y2020
## 18742 y2020
## 18743 y2020
## 18744 y2020
## 18745 y2020
## 18746 y2020
## 18747 y2020
## 18748 y2020
## 18749 y2020
## 18750 y2020
## 18751 y2020
## 18752 y2020
## 18753 y2020
## 18754 y2020
## 18755 y2020
## 18756 y2020
## 18757 y2020
## 18758 y2020
## 18759 y2020
## 18760 y2020
## 18761 y2020
## 18762 y2020
## 18763 y2020
## 18764 y2020
## 18765 y2020
## 18766 y2020
## 18767 y2020
## 18768 y2020
## 18769 y2020
## 18770 y2020
## 18771 y2020
## 18772 y2020
## 18773 y2020
## 18774 y2020
## 18775 y2020
## 18776 y2020
## 18777 y2020
## 18778 y2020
## 18779 y2020
## 18780 y2020
## 18781 y2020
## 18782 y2020
## 18783 y2020
## 18784 y2020
## 18785 y2020
## 18786 y2020
## 18787 y2020
## 18788 y2020
## 18789 y2020
## 18790 y2020
## 18791 y2020
## 18792 y2020
## 18793 y2020
## 18794 y2020
## 18795 y2020
## 18796 y2020
## 18797 y2020
## 18798 y2020
## 18799 y2020
## 18800 y2020
## 18801 y2020
## 18802 y2020
## 18803 y2020
## 18804 y2020
## 18805 y2020
## 18806 y2020
## 18807 y2020
## 18808 y2020
## 18809 y2020
## 18810 y2020
## 18811 y2020
## 18812 y2020
## 18813 y2020
## 18814 y2020
## 18815 y2020
## 18816 y2020
## 18817 y2020
## 18818 y2020
## 18819 y2020
## 18820 y2020
## 18821 y2020
## 18822 y2020
## 18823 y2020
## 18824 y2020
## 18825 y2020
## 18826 y2020
## 18827 y2020
## 18828 y2020
## 18829 y2020
## 18830 y2020
## 18831 y2020
## 18832 y2020
## 18833 y2020
## 18834 y2020
## 18835 y2020
## 18836 y2020
## 18837 y2020
## 18838 y2020
## 18839 y2020
## 18840 y2020
## 18841 y2020
## 18842 y2020
## 18843 y2020
## 18844 y2020
## 18845 y2020
## 18846 y2020
## 18847 y2020
## 18848 y2020
## 18849 y2020
## 18850 y2020
## 18851 y2020
## 18852 y2020
## 18853 y2020
## 18854 y2020
## 18855 y2020
## 18856 y2020
## 18857 y2020
## 18858 y2020
## 18859 y2020
## 18860 y2020
## 18861 y2020
## 18862 y2020
## 18863 y2020
## 18864 y2020
## 18865 y2020
## 18866 y2020
## 18867 y2020
## 18868 y2020
## 18869 y2020
## 18870 y2020
## 18871 y2020
## 18872 y2020
## 18873 y2020
## 18874 y2020
## 18875 y2020
## 18876 y2020
## 18877 y2020
## 18878 y2020
## 18879 y2020
## 18880 y2020
## 18881 y2020
## 18882 y2020
## 18883 y2020
## 18884 y2020
## 18885 y2020
## 18886 y2020
## 18887 y2020
## 18888 y2020
## 18889 y2020
## 18890 y2020
## 18891 y2020
## 18892 y2020
## 18893 y2020
## 18894 y2020
## 18895 y2020
## 18896 y2020
## 18897 y2020
## 18898 y2020
## 18899 y2020
## 18900 y2020
## 18901 y2020
## 18902 y2020
## 18903 y2020
## 18904 y2020
## 18905 y2020
## 18906 y2020
## 18907 y2020
## 18908 y2020
## 18909 y2020
## 18910 y2020
## 18911 y2020
## 18912 y2020
## 18913 y2020
## 18914 y2020
## 18915 y2020
## 18916 y2020
## 18917 y2020
## 18918 y2020
## 18919 y2020
## 18920 y2020
## 18921 y2020
## 18922 y2020
## 18923 y2020
## 18924 y2020
## 18925 y2020
## 18926 y2020
## 18927 y2020
## 18928 y2020
## 18929 y2020
## 18930 y2020
## 18931 y2020
## 18932 y2020
## 18933 y2020
## 18934 y2020
## 18935 y2020
## 18936 y2020
## 18937 y2020
## 18938 y2020
## 18939 y2020
## 18940 y2020
## 18941 y2020
## 18942 y2020
## 18943 y2020
## 18944 y2020
## 18945 y2020
## 18946 y2020
## 18947 y2020
## 18948 y2020
## 18949 y2020
## 18950 y2020
## 18951 y2020
## 18952 y2020
## 18953 y2020
## 18954 y2020
## 18955 y2020
## 18956 y2020
## 18957 y2020
## 18958 y2020
## 18959 y2020
## 18960 y2020
## 18961 y2020
## 18962 y2020
## 18963 y2020
## 18964 y2020
## 18965 y2020
## 18966 y2020
## 18967 y2020
## 18968 y2020
## 18969 y2020
## 18970 y2020
## 18971 y2020
## 18972 y2020
## 18973 y2020
## 18974 y2020
## 18975 y2020
## 18976 y2020
## 18977 y2020
## 18978 y2020
## 18979 y2020
## 18980 y2020
## 18981 y2020
## 18982 y2020
## 18983 y2020
## 18984 y2020
## 18985 y2020
## 18986 y2020
## 18987 y2020
## 18988 y2020
## 18989 y2020
## 18990 y2020
## 18991 y2020
## 18992 y2020
## 18993 y2020
## 18994 y2020
## 18995 y2020
## 18996 y2020
## 18997 y2020
## 18998 y2020
## 18999 y2020
## 19000 y2020
## 19001 y2020
## 19002 y2020
## 19003 y2020
## 19004 y2020
## 19005 y2020
## 19006 y2020
## 19007 y2020
## 19008 y2020
## 19009 y2020
## 19010 y2020
## 19011 y2020
## 19012 y2020
## 19013 y2020
## 19014 y2020
## 19015 y2020
## 19016 y2020
## 19017 y2020
## 19018 y2020
## 19019 y2020
## 19020 y2020
## 19021 y2020
## 19022 y2020
## 19023 y2020
## 19024 y2020
## 19025 y2020
## 19026 y2020
## 19027 y2020
## 19028 y2020
## 19029 y2020
## 19030 y2020
## 19031 y2020
## 19032 y2020
## 19033 y2020
## 19034 y2020
## 19035 y2020
## 19036 y2020
## 19037 y2020
## 19038 y2020
## 19039 y2020
## 19040 y2020
## 19041 y2020
## 19042 y2020
## 19043 y2020
## 19044 y2020
## 19045 y2020
## 19046 y2020
## 19047 y2020
## 19048 y2020
## 19049 y2020
## 19050 y2020
## 19051 y2020
## 19052 y2020
## 19053 y2020
## 19054 y2020
## 19055 y2020
## 19056 y2020
## 19057 y2020
## 19058 y2020
## 19059 y2020
## 19060 y2020
## 19061 y2020
## 19062 y2020
## 19063 y2020
## 19064 y2020
## 19065 y2020
## 19066 y2020
## 19067 y2020
## 19068 y2020
## 19069 y2020
## 19070 y2020
## 19071 y2020
## 19072 y2020
## 19073 y2020
## 19074 y2020
## 19075 y2020
## 19076 y2020
## 19077 y2020
## 19078 y2020
## 19079 y2020
## 19080 y2020
## 19081 y2020
## 19082 y2020
## 19083 y2020
## 19084 y2020
## 19085 y2020
## 19086 y2020
## 19087 y2020
## 19088 y2020
## 19089 y2020
## 19090 y2020
## 19091 y2020
## 19092 y2020
## 19093 y2020
## 19094 y2020
## 19095 y2020
## 19096 y2020
## 19097 y2020
## 19098 y2020
## 19099 y2020
## 19100 y2020
## 19101 y2020
## 19102 y2020
## 19103 y2020
## 19104 y2020
## 19105 y2020
## 19106 y2020
## 19107 y2020
## 19108 y2020
## 19109 y2020
## 19110 y2020
## 19111 y2020
## 19112 y2020
## 19113 y2020
## 19114 y2020
## 19115 y2020
## 19116 y2020
## 19117 y2020
## 19118 y2020
## 19119 y2020
## 19120 y2020
## 19121 y2020
## 19122 y2020
## 19123 y2020
## 19124 y2020
## 19125 y2020
## 19126 y2020
## 19127 y2020
## 19128 y2020
## 19129 y2020
## 19130 y2020
## 19131 y2020
## 19132 y2020
## 19133 y2020
## 19134 y2020
## 19135 y2020
## 19136 y2020
## 19137 y2020
## 19138 y2020
## 19139 y2020
## 19140 y2020
## 19141 y2020
## 19142 y2020
## 19143 y2020
## 19144 y2020
## 19145 y2020
## 19146 y2020
## 19147 y2020
## 19148 y2020
## 19149 y2020
## 19150 y2020
## 19151 y2020
## 19152 y2020
## 19153 y2020
## 19154 y2020
## 19155 y2020
## 19156 y2020
## 19157 y2020
## 19158 y2020
## 19159 y2020
## 19160 y2020
## 19161 y2020
## 19162 y2020
## 19163 y2020
## 19164 y2020
## 19165 y2020
## 19166 y2020
## 19167 y2020
## 19168 y2020
## 19169 y2020
## 19170 y2020
## 19171 y2020
## 19172 y2020
## 19173 y2020
## 19174 y2020
## 19175 y2020
## 19176 y2020
## 19177 y2020
## 19178 y2020
## 19179 y2020
## 19180 y2020
## 19181 y2020
## 19182 y2020
## 19183 y2020
## 19184 y2020
## 19185 y2020
## 19186 y2020
## 19187 y2020
## 19188 y2020
## 19189 y2020
## 19190 y2020
## 19191 y2020
## 19192 y2020
## 19193 y2020
## 19194 y2020
## 19195 y2020
## 19196 y2020
## 19197 y2020
## 19198 y2020
## 19199 y2020
## 19200 y2020
## 19201 y2020
## 19202 y2020
## 19203 y2020
## 19204 y2020
## 19205 y2020
## 19206 y2020
## 19207 y2020
## 19208 y2020
## 19209 y2020
## 19210 y2020
## 19211 y2020
## 19212 y2020
## 19213 y2020
## 19214 y2020
## 19215 y2020
## 19216 y2020
## 19217 y2020
## 19218 y2020
## 19219 y2020
## 19220 y2020
## 19221 y2020
## 19222 y2020
## 19223 y2020
## 19224 y2020
## 19225 y2020
## 19226 y2020
## 19227 y2020
## 19228 y2020
## 19229 y2020
## 19230 y2020
## 19231 y2020
## 19232 y2020
## 19233 y2020
## 19234 y2020
## 19235 y2020
## 19236 y2020
## 19237 y2020
## 19238 y2020
## 19239 y2020
## 19240 y2020
## 19241 y2020
## 19242 y2020
## 19243 y2020
## 19244 y2020
## 19245 y2020
## 19246 y2020
## 19247 y2020
## 19248 y2020
## 19249 y2020
## 19250 y2020
## 19251 y2020
## 19252 y2020
## 19253 y2020
## 19254 y2020
## 19255 y2020
## 19256 y2020
## 19257 y2020
## 19258 y2020
## 19259 y2020
## 19260 y2020
## 19261 y2020
## 19262 y2020
## 19263 y2020
## 19264 y2020
## 19265 y2020
## 19266 y2020
## 19267 y2020
## 19268 y2020
## 19269 y2020
## 19270 y2020
## 19271 y2020
## 19272 y2020
## 19273 y2020
## 19274 y2020
## 19275 y2020
## 19276 y2020
## 19277 y2020
## 19278 y2020
## 19279 y2020
## 19280 y2020
## 19281 y2020
## 19282 y2020
## 19283 y2020
## 19284 y2020
## 19285 y2020
## 19286 y2020
## 19287 y2020
## 19288 y2020
## 19289 y2020
## 19290 y2020
## 19291 y2020
## 19292 y2020
## 19293 y2020
## 19294 y2020
## 19295 y2020
## 19296 y2020
## 19297 y2020
## 19298 y2020
## 19299 y2020
## 19300 y2020
## 19301 y2020
## 19302 y2020
## 19303 y2020
## 19304 y2020
## 19305 y2020
## 19306 y2020
## 19307 y2020
## 19308 y2020
## 19309 y2020
## 19310 y2020
## 19311 y2020
## 19312 y2020
## 19313 y2020
## 19314 y2020
## 19315 y2020
## 19316 y2020
## 19317 y2020
## 19318 y2020
## 19319 y2020
## 19320 y2020
## 19321 y2020
## 19322 y2020
## 19323 y2020
## 19324 y2020
## 19325 y2020
## 19326 y2020
## 19327 y2020
## 19328 y2020
## 19329 y2020
## 19330 y2020
## 19331 y2020
## 19332 y2020
## 19333 y2020
## 19334 y2020
## 19335 y2020
## 19336 y2020
## 19337 y2020
## 19338 y2020
## 19339 y2020
## 19340 y2020
## 19341 y2020
## 19342 y2020
## 19343 y2020
## 19344 y2020
## 19345 y2020
## 19346 y2020
## 19347 y2020
## 19348 y2020
## 19349 y2020
## 19350 y2020
## 19351 y2020
## 19352 y2020
## 19353 y2020
## 19354 y2020
## 19355 y2020
## 19356 y2020
## 19357 y2020
## 19358 y2020
## 19359 y2020
## 19360 y2020
## 19361 y2020
## 19362 y2020
## 19363 y2020
## 19364 y2020
## 19365 y2020
## 19366 y2020
## 19367 y2020
## 19368 y2020
## 19369 y2020
## 19370 y2020
## 19371 y2020
## 19372 y2020
## 19373 y2020
## 19374 y2020
## 19375 y2020
## 19376 y2020
## 19377 y2020
## 19378 y2020
## 19379 y2020
## 19380 y2020
## 19381 y2020
## 19382 y2020
## 19383 y2020
## 19384 y2020
## 19385 y2020
## 19386 y2020
## 19387 y2020
## 19388 y2020
## 19389 y2020
## 19390 y2020
## 19391 y2020
## 19392 y2020
## 19393 y2020
## 19394 y2020
## 19395 y2020
## 19396 y2020
## 19397 y2020
## 19398 y2020
## 19399 y2020
## 19400 y2020
## 19401 y2020
## 19402 y2020
## 19403 y2020
## 19404 y2020
## 19405 y2020
## 19406 y2020
## 19407 y2020
## 19408 y2020
## 19409 y2020
## 19410 y2020
## 19411 y2020
## 19412 y2020
## 19413 y2020
## 19414 y2020
## 19415 y2020
## 19416 y2020
## 19417 y2020
## 19418 y2020
## 19419 y2020
## 19420 y2020
## 19421 y2020
## 19422 y2020
## 19423 y2020
## 19424 y2020
## 19425 y2020
## 19426 y2020
## 19427 y2020
## 19428 y2020
## 19429 y2020
## 19430 y2020
## 19431 y2020
## 19432 y2020
## 19433 y2020
## 19434 y2020
## 19435 y2020
## 19436 y2020
## 19437 y2020
## 19438 y2020
## 19439 y2020
## 19440 y2020
## 19441 y2020
## 19442 y2020
## 19443 y2020
## 19444 y2020
## 19445 y2020
## 19446 y2020
## 19447 y2020
## 19448 y2020
## 19449 y2020
## 19450 y2020
## 19451 y2020
## 19452 y2020
## 19453 y2020
## 19454 y2020
## 19455 y2020
## 19456 y2020
## 19457 y2020
## 19458 y2020
## 19459 y2020
## 19460 y2020
## 19461 y2020
## 19462 y2020
## 19463 y2020
## 19464 y2020
## 19465 y2020
## 19466 y2020
## 19467 y2020
## 19468 y2020
## 19469 y2020
## 19470 y2020
## 19471 y2020
## 19472 y2020
## 19473 y2020
## 19474 y2020
## 19475 y2020
## 19476 y2020
## 19477 y2020
## 19478 y2020
## 19479 y2020
## 19480 y2020
## 19481 y2020
## 19482 y2020
## 19483 y2020
## 19484 y2020
## 19485 y2020
## 19486 y2020
## 19487 y2020
## 19488 y2020
## 19489 y2020
## 19490 y2020
## 19491 y2020
## 19492 y2020
## 19493 y2020
## 19494 y2020
## 19495 y2020
## 19496 y2020
## 19497 y2020
## 19498 y2020
## 19499 y2020
## 19500 y2020
## 19501 y2020
## 19502 y2020
## 19503 y2020
## 19504 y2020
## 19505 y2020
## 19506 y2020
## 19507 y2020
## 19508 y2020
## 19509 y2020
## 19510 y2020
## 19511 y2020
## 19512 y2020
## 19513 y2020
## 19514 y2020
## 19515 y2020
## 19516 y2020
## 19517 y2020
## 19518 y2020
## 19519 y2020
## 19520 y2020
## 19521 y2020
## 19522 y2020
## 19523 y2020
## 19524 y2020
## 19525 y2020
## 19526 y2020
## 19527 y2020
## 19528 y2020
## 19529 y2020
## 19530 y2020
## 19531 y2020
## 19532 y2020
## 19533 y2020
## 19534 y2020
## 19535 y2020
## 19536 y2020
## 19537 y2020
## 19538 y2020
## 19539 y2020
## 19540 y2020
## 19541 y2020
## 19542 y2020
## 19543 y2020
## 19544 y2020
## 19545 y2020
## 19546 y2020
## 19547 y2020
## 19548 y2020
## 19549 y2020
## 19550 y2020
## 19551 y2020
## 19552 y2020
## 19553 y2020
## 19554 y2020
## 19555 y2020
## 19556 y2020
## 19557 y2020
## 19558 y2020
## 19559 y2020
## 19560 y2020
## 19561 y2020
## 19562 y2020
## 19563 y2020
## 19564 y2020
## 19565 y2020
## 19566 y2020
## 19567 y2020
## 19568 y2020
## 19569 y2020
## 19570 y2020
## 19571 y2020
## 19572 y2020
## 19573 y2020
## 19574 y2020
## 19575 y2020
## 19576 y2020
## 19577 y2020
## 19578 y2020
## 19579 y2020
## 19580 y2020
## 19581 y2020
## 19582 y2020
## 19583 y2020
## 19584 y2020
## 19585 y2020
## 19586 y2020
## 19587 y2020
## 19588 y2020
## 19589 y2020
## 19590 y2020
## 19591 y2020
## 19592 y2020
## 19593 y2020
## 19594 y2020
## 19595 y2020
## 19596 y2020
## 19597 y2020
## 19598 y2020
## 19599 y2020
## 19600 y2020
## 19601 y2020
## 19602 y2020
## 19603 y2020
## 19604 y2020
## 19605 y2020
## 19606 y2020
## 19607 y2020
## 19608 y2020
## 19609 y2020
## 19610 y2020
## 19611 y2020
## 19612 y2020
## 19613 y2020
## 19614 y2020
## 19615 y2020
## 19616 y2020
## 19617 y2020
## 19618 y2020
## 19619 y2020
## 19620 y2020
## 19621 y2020
## 19622 y2020
## 19623 y2020
## 19624 y2020
## 19625 y2020
## 19626 y2020
## 19627 y2020
## 19628 y2020
## 19629 y2020
## 19630 y2020
## 19631 y2020
## 19632 y2020
## 19633 y2020
## 19634 y2020
## 19635 y2020
## 19636 y2020
## 19637 y2020
## 19638 y2020
## 19639 y2020
## 19640 y2020
## 19641 y2020
## 19642 y2020
## 19643 y2020
## 19644 y2020
## 19645 y2020
## 19646 y2020
## 19647 y2020
## 19648 y2020
## 19649 y2020
## 19650 y2020
## 19651 y2020
## 19652 y2020
## 19653 y2020
## 19654 y2020
## 19655 y2020
## 19656 y2020
## 19657 y2020
## 19658 y2020
## 19659 y2020
## 19660 y2020
## 19661 y2020
## 19662 y2020
## 19663 y2020
## 19664 y2020
## 19665 y2020
## 19666 y2020
## 19667 y2020
## 19668 y2020
## 19669 y2020
## 19670 y2020
## 19671 y2020
## 19672 y2020
## 19673 y2020
## 19674 y2020
## 19675 y2020
## 19676 y2020
## 19677 y2020
## 19678 y2020
## 19679 y2020
## 19680 y2020
## 19681 y2020
## 19682 y2020
## 19683 y2020
## 19684 y2020
## 19685 y2020
## 19686 y2020
## 19687 y2020
## 19688 y2020
## 19689 y2020
## 19690 y2020
## 19691 y2020
## 19692 y2020
## 19693 y2020
## 19694 y2020
## 19695 y2020
## 19696 y2020
## 19697 y2020
## 19698 y2020
## 19699 y2020
## 19700 y2020
## 19701 y2020
## 19702 y2020
## 19703 y2020
## 19704 y2020
## 19705 y2020
## 19706 y2020
## 19707 y2020
## 19708 y2020
## 19709 y2020
## 19710 y2020
## 19711 y2020
## 19712 y2020
## 19713 y2020
## 19714 y2020
## 19715 y2020
## 19716 y2020
## 19717 y2020
## 19718 y2020
## 19719 y2020
## 19720 y2020
## 19721 y2020
## 19722 y2020
## 19723 y2020
## 19724 y2020
## 19725 y2020
## 19726 y2020
## 19727 y2020
## 19728 y2020
## 19729 y2020
## 19730 y2020
## 19731 y2020
## 19732 y2020
## 19733 y2020
## 19734 y2020
## 19735 y2020
## 19736 y2020
## 19737 y2020
## 19738 y2020
## 19739 y2020
## 19740 y2020
## 19741 y2020
## 19742 y2020
## 19743 y2020
## 19744 y2020
## 19745 y2020
## 19746 y2020
## 19747 y2020
## 19748 y2020
## 19749 y2020
## 19750 y2020
## 19751 y2020
## 19752 y2020
## 19753 y2020
## 19754 y2020
## 19755 y2020
## 19756 y2020
## 19757 y2020
## 19758 y2020
## 19759 y2020
## 19760 y2020
## 19761 y2020
## 19762 y2020
## 19763 y2020
## 19764 y2020
## 19765 y2020
## 19766 y2020
## 19767 y2020
## 19768 y2020
## 19769 y2020
## 19770 y2020
## 19771 y2020
## 19772 y2020
## 19773 y2020
## 19774 y2020
## 19775 y2020
## 19776 y2020
## 19777 y2020
## 19778 y2020
## 19779 y2020
## 19780 y2020
## 19781 y2020
## 19782 y2020
## 19783 y2020
## 19784 y2020
## 19785 y2020
## 19786 y2020
## 19787 y2020
## 19788 y2020
## 19789 y2020
## 19790 y2020
## 19791 y2020
## 19792 y2020
## 19793 y2020
## 19794 y2020
## 19795 y2020
## 19796 y2020
## 19797 y2020
## 19798 y2020
## 19799 y2020
## 19800 y2020
## 19801 y2020
## 19802 y2020
## 19803 y2020
## 19804 y2020
## 19805 y2020
## 19806 y2020
## 19807 y2020
## 19808 y2020
## 19809 y2020
## 19810 y2020
## 19811 y2020
## 19812 y2020
## 19813 y2020
## 19814 y2020
## 19815 y2020
## 19816 y2020
## 19817 y2020
## 19818 y2020
## 19819 y2020
## 19820 y2020
## 19821 y2020
## 19822 y2020
## 19823 y2020
## 19824 y2020
## 19825 y2020
## 19826 y2020
## 19827 y2020
## 19828 y2020
## 19829 y2020
## 19830 y2020
## 19831 y2020
## 19832 y2020
## 19833 y2020
## 19834 y2020
## 19835 y2020
## 19836 y2020
## 19837 y2020
## 19838 y2020
## 19839 y2020
## 19840 y2020
## 19841 y2020
## 19842 y2020
## 19843 y2020
## 19844 y2020
## 19845 y2020
## 19846 y2020
## 19847 y2020
## 19848 y2020
## 19849 y2020
## 19850 y2020
## 19851 y2020
## 19852 y2020
## 19853 y2020
## 19854 y2020
## 19855 y2020
## 19856 y2020
## 19857 y2020
## 19858 y2020
## 19859 y2020
## 19860 y2020
## 19861 y2020
## 19862 y2020
## 19863 y2020
## 19864 y2020
## 19865 y2020
## 19866 y2020
## 19867 y2020
## 19868 y2020
## 19869 y2020
## 19870 y2020
## 19871 y2020
## 19872 y2020
## 19873 y2020
## 19874 y2020
## 19875 y2020
## 19876 y2020
## 19877 y2020
## 19878 y2020
## 19879 y2020
## 19880 y2020
## 19881 y2020
## 19882 y2020
## 19883 y2020
## 19884 y2020
## 19885 y2020
## 19886 y2020
## 19887 y2020
## 19888 y2020
## 19889 y2020
## 19890 y2020
## 19891 y2020
## 19892 y2020
## 19893 y2020
## 19894 y2020
## 19895 y2020
## 19896 y2020
## 19897 y2020
## 19898 y2020
## 19899 y2020
## 19900 y2020
## 19901 y2020
## 19902 y2020
## 19903 y2020
## 19904 y2020
## 19905 y2020
## 19906 y2020
## 19907 y2020
## 19908 y2020
## 19909 y2020
## 19910 y2020
## 19911 y2020
## 19912 y2020
## 19913 y2020
## 19914 y2020
## 19915 y2020
## 19916 y2020
## 19917 y2020
## 19918 y2020
## 19919 y2020
## 19920 y2020
## 19921 y2020
## 19922 y2020
## 19923 y2020
## 19924 y2020
## 19925 y2020
## 19926 y2020
## 19927 y2020
## 19928 y2020
## 19929 y2020
## 19930 y2020
## 19931 y2020
## 19932 y2020
## 19933 y2020
## 19934 y2020
## 19935 y2020
## 19936 y2020
## 19937 y2020
## 19938 y2020
## 19939 y2020
## 19940 y2020
## 19941 y2020
## 19942 y2020
## 19943 y2020
## 19944 y2020
## 19945 y2020
## 19946 y2020
## 19947 y2020
## 19948 y2020
## 19949 y2020
## 19950 y2020
## 19951 y2020
## 19952 y2020
## 19953 y2020
## 19954 y2020
## 19955 y2020
## 19956 y2020
## 19957 y2020
## 19958 y2020
## 19959 y2020
## 19960 y2020
## 19961 y2020
## 19962 y2020
## 19963 y2020
## 19964 y2020
## 19965 y2020
## 19966 y2020
## 19967 y2020
## 19968 y2020
## 19969 y2020
## 19970 y2020
## 19971 y2020
## 19972 y2020
## 19973 y2020
## 19974 y2020
## 19975 y2020
## 19976 y2020
## 19977 y2020
## 19978 y2020
## 19979 y2020
## 19980 y2020
## 19981 y2020
## 19982 y2020
## 19983 y2020
## 19984 y2020
## 19985 y2020
## 19986 y2020
## 19987 y2020
## 19988 y2020
## 19989 y2020
## 19990 y2020
## 19991 y2020
## 19992 y2020
## 19993 y2020
## 19994 y2020
## 19995 y2020
## 19996 y2020
## 19997 y2020
## 19998 y2020
## 19999 y2020
##                                                                                                                                                           word
## 1                                                                                                                                                      covid19
## 2                                                                                                                                                      covid19
## 3                                                                                                                                                      covid19
## 4                                                                                                                                                     #covid19
## 5                                                                                                                                                      vaccine
## 6                                                                                                                                                        covid
## 7                                                                                                                                                        covid
## 8                                                                                                                                                        covid
## 9                                                                                                                                                       people
## 10                                                                                                                                                      people
## 11                                                                                                                                                    #covid19
## 12                                                                                                                                                    #covid19
## 13                                                                                                                                                     testing
## 14                                                                                                                                                      people
## 15                                                                                                                                                          de
## 16                                                                                                                                                    pandemic
## 17                                                                                                                                                        test
## 18                                                                                                                                                          de
## 19                                                                                                                                                      deaths
## 20                                                                                                                                                         due
## 21                                                                                                                                                    positive
## 22                                                                                                                                                     vaccine
## 23                                                                                                                                                          de
## 24                                                                                                                                                    positive
## 25                                                                                                                                                       virus
## 26                                                                                                                                                        time
## 27                                                                                                                                                      health
## 28                                                                                                                                            @realdonaldtrump
## 29                                                                                                                                                       trump
## 30                                                                                                                                                      health
## 31                                                                                                                                                     omicron
## 32                                                                                                                                                         due
## 33                                                                                                                                                       trump
## 34                                                                                                                                                      county
## 35                                                                                                                                                        time
## 36                                                                                                                                                  vaccinated
## 37                                                                                                                                                          la
## 38                                                                                                                                                        it�s
## 39                                                                                                                                                         due
## 40                                                                                                                                                      tested
## 41                                                                                                                                                    pandemic
## 42                                                                                                                                                         day
## 43                                                                                                                                                    vaccines
## 44                                                                                                                                                       tests
## 45                                                                                                                                                    protests
## 46                                                                                                                                                      health
## 47                                                                                                                                                         day
## 48                                                                                                                                                          la
## 49                                                                                                                                                      deaths
## 50                                                                                                                                                    positive
## 51                                                                                                                                                       black
## 52                                                                                                                                                          la
## 53                                                                                                                                                       floyd
## 54                                                                                                                                                      tested
## 55                                                                                                                                                    pandemic
## 56                                                                                                                                                          en
## 57                                                                                                                                                          el
## 58                                                                                                                                                      tested
## 59                                                                                                                                                        care
## 60                                                                                                                                                      county
## 61                                                                                                                                                        time
## 62                                                                                                                                                        news
## 63                                                                                                                                                      school
## 64                                                                                                                                                        news
## 65                                                                                                                                                        it�s
## 66                                                                                                                                                        test
## 67                                                                                                                                                      police
## 68                                                                                                                                                     testing
## 69                                                                                                                                                 vaccination
## 70                                                                                                                                                       don�t
## 71                                                                                                                                                        home
## 72                                                                                                                                                        died
## 73                                                                                                                                                    vaccines
## 74                                                                                                                                                      george
## 75                                                                                                                                                          el
## 76                                                                                                                                                          en
## 77                                                                                                                                                       death
## 78                                                                                                                                                        home
## 79                                                                                                                                                         i�m
## 80                                                                                                                                            @realdonaldtrump
## 81                                                                                                                                                         day
## 82                                                                                                                                                        news
## 83                                                                                                                                                         i�m
## 84                                                                                                                                                     variant
## 85                                                                                                                                                    hospital
## 86                                                                                                                                                        mask
## 87                                                                                                                                                       death
## 88                                                                                                                                                      update
## 89                                                                                                                                                        it�s
## 90                                                                                                                                                        mask
## 91                                                                                                                                                 coronavirus
## 92                                                                                                                                                     protest
## 93                                                                                                                                                       don�t
## 94                                                                                                                                                      county
## 95                                                                                                                                                      social
## 96                                                                                                                                                        home
## 97                                                                                                                                                        week
## 98                                                                                                                                                          el
## 99                                                                                                                                                        june
## 100                                                                                                                                                     family
## 101                                                                                                                                                      virus
## 102                                                                                                                                                    january
## 103                                                                                                                                                        los
## 104                                                                                                                                                        i�m
## 105                                                                                                                                                        por
## 106                                                                                                                                                       week
## 107                                                                                                                                                      world
## 108                                                                                                                                                       test
## 109                                                                                                                                                    january
## 110                                                                                                                                                       week
## 111                                                                                                                                                   election
## 112                                                                                                                                                    testing
## 113                                                                                                                                                    booster
## 114                                                                                                                                                    million
## 115                                                                                                                                                   patients
## 116                                                                                                                                                   #omicron
## 117                                                                                                                                                       died
## 118                                                                                                                                                     update
## 119                                                                                                                                               constitution
## 120                                                                                                                                                       read
## 121                                                                                                                                                      lives
## 122                                                                                                                                                       days
## 123                                                                                                                                                      virus
## 124                                                                                                                                                       stay
## 125                                                                                                                                                       safe
## 126                                                                                                                                                       safe
## 127                                                                                                                                                   students
## 128                                                                                                                                                    country
## 129                                                                                                                                                      china
## 130                                                                                                                                                       dose
## 131                                                                                                                                                       lost
## 132                                                                                                                                               #coronavirus
## 133                                                                                                                                                    schools
## 134                                                                                                                                                     public
## 135                                                                                                                                                      masks
## 136                                                                                                                                                       free
## 137                                                                                                                                                     spread
## 138                                                                                                                                                      tweet
## 139                                                                                                                                                     public
## 140                                                                                                                                                   symptoms
## 141                                                                                                                                                     racism
## 142                                                                                                                                                       stay
## 143                                                                                                                                                  americans
## 144                                                                                                                                                         en
## 145                                                                                                                                                       free
## 146                                                                                                                                                        los
## 147                                                                                                                                                     public
## 148                                                                                                                                                       care
## 149                                                                                                                                                        los
## 150                                                                                                                                                     spread
## 151                                                                                                                                                      surge
## 152                                                                                                                                                       city
## 153                                                                                                                                                      masks
## 154                                                                                                                                                       wear
## 155                                                                                                                                                 vaccinated
## 156                                                                                                                                                      don�t
## 157                                                                                                                                                  community
## 158                                                                                                                                                     family
## 159                                                                                                                                                       days
## 160                                                                                                                                                     pinned
## 161                                                                                                                                                       died
## 162                                                                                                                                                    million
## 163                                                                                                                                                       mask
## 164                                                                                                                                                       york
## 165                                                                                                                                                 protesting
## 166                                                                                                                                                        del
## 167                                                                                                                                                      weeks
## 168                                                                                                                                                       read
## 169                                                                                                                                                       days
## 170                                                                                                                                                       link
## 171                                                                                                                                                    workers
## 172                                                                                                                                                    america
## 173                                                                                                                                                      can�t
## 174                                                                                                                                                   patients
## 175                                                                                                                                                    support
## 176                                                                                                                                                       game
## 177                                                                                                                                                 protesters
## 178                                                                                                                                                     change
## 179                                                                                                                                                      rapid
## 180                                                                                                                                                vaccination
## 181                                                                                                                                                   response
## 182                                                                                                                                                  community
## 183                                                                                                                                                      masks
## 184                                                                                                                                                      study
## 185                                                                                                                                                    florida
## 186                                                                                                                                                       hope
## 187                                                                                                                                                      rules
## 188                                                                                                                                                    twitter
## 189                                                                                                                                                        die
## 190                                                                                                                                                   received
## 191                                                                                                                                                      world
## 192                                                                                                                                                      found
## 193                                                                                                                                                       game
## 194                                                                                                                                                      doses
## 195                                                                                                                                                  americans
## 196                                                                                                                                                       call
## 197                                                                                                                                                 distancing
## 198                                                                                                                                                  community
## 199                                                                                                                                                     deaths
## 200                                                                                                                                                        app
## 201                                                                                                                                                       care
## 202                                                                                                                                                        por
## 203                                                                                                                                                       sick
## 204                                                                                                                                                     spread
## 205                                                                                                                                               unvaccinated
## 206                                                                                                                                                     months
## 207                                                                                                                                                       call
## 208                                                                                                                                                       life
## 209                                                                                                                                               pennsylvania
## 210                                                                                                                                                     crisis
## 211                                                                                                                                                       lost
## 212                                                                                                                                                    workers
## 213                                                                                                                                               vaccinations
## 214                                                                                                                                                      biden
## 215                                                                                                                                                 businesses
## 216                                                                                                                                                      white
## 217                                                                                                                                                     family
## 218                                                                                                                                                        job
## 219                                                                                                                                                       life
## 220                                                                                                                                                      money
## 221                                                                                                                                                coronavirus
## 222                                                                                                                                                       stop
## 223                                                                                                                                                       live
## 224                                                                                                                                                  president
## 225                                                                                                                                                       real
## 226                                                                                                                                                     report
## 227                                                                                                                                                    country
## 228                                                                                                                                                     school
## 229                                                                                                                                                     #covid
## 230                                                                                                                                                        flu
## 231                                                                                                                                                       list
## 232                                                                                                                                                   business
## 233                                                                                                                                                       data
## 234                                                                                                                                                  reopening
## 235                                                                                                                                                      riots
## 236                                                                                                                                                       stop
## 237                                                                                                                                                        act
## 238                                                                                                                                                 california
## 239                                                                                                                                                       risk
## 240                                                                                                                                                  yesterday
## 241                                                                                                                                             misinformation
## 242                                                                                                                                                   breaking
## 243                                                                                                                                                       city
## 244                                                                                                                                               hospitalized
## 245                                                                                                                                                       rate
## 246                                                                                                                                                      staff
## 247                                                                                                                                                       stay
## 248                                                                                                                                               unemployment
## 249                                                                                                                                                        cdc
## 250                                                                                                                                                      death
## 251                                                                                                                                                         dr
## 252                                                                                                                                                   hospital
## 253                                                                                                                                                       para
## 254                                                                                                                                                       live
## 255                                                                                                                                                      total
## 256                                                                                                                                                       city
## 257                                                                                                                                                       site
## 258                                                                                                                                                        bad
## 259                                                                                                                                                   continue
## 260                                                                                                                                                       hope
## 261                                                                                                                                                    medical
## 262                                                                                                                                                  president
## 263                                                                                                                                                      weeks
## 264                                                                                                                                                      local
## 265                                                                                                                                                    medical
## 266                                                                                                                                                     season
## 267                                                                                                                                                       york
## 268                                                                                                                                                       free
## 269                                                                                                                                                      lives
## 270                                                                                                                                                     social
## 271                                                                                                                                                       team
## 272                                                                                                                                                   patients
## 273                                                                                                                                                       safe
## 274                                                                                                                                                       shot
## 275                                                                                                                                                    workers
## 276                                                                                                                                                   <u+2b50>
## 277                                                                                                                                                       shit
## 278                                                                                                                                                    america
## 279                                                                                                                                                 healthcare
## 280                                                                                                                                                  hospitals
## 281                                                                                                                                                     months
## 282                                                                                                                                                       real
## 283                                                                                                                                                    variant
## 284                                                                                                                                                   negative
## 285                                                                                                                                                     record
## 286                                                                                                                                                        ago
## 287                                                                                                                                                   reported
## 288                                                                                                                                                     safety
## 289                                                                                                                                                 government
## 290                                                                                                                                                        jan
## 291                                                                                                                                                      staff
## 292                                                                                                                                                   children
## 293                                                                                                                                                      happy
## 294                                                                                                                                                     impact
## 295                                                                                                                                                        las
## 296                                                                                                                                                        lot
## 297                                                                                                                                                    protect
## 298                                                                                                                                                       risk
## 299                                                                                                                                                      daily
## 300                                                                                                                                                      hours
## 301                                                                                                                                                     person
## 302                                                                                                                                                      tests
## 303                                                                                                                                                       told
## 304                                                                                                                                                       kids
## 305                                                                                                                                                       stop
## 306                                                                                                                                                     didn�t
## 307                                                                                                                                                  financial
## 308                                                                                                                                                     record
## 309                                                                                                                                                         se
## 310                                                                                                                                                      sites
## 311                                                                                                                                                   american
## 312                                                                                                                                                    angeles
## 313                                                                                                                                                         dr
## 314                                                                                                                                                    georgia
## 315                                                                                                                                                      larry
## 316                                                                                                                                                         uk
## 317                                                                                                                                                        die
## 318                                                                                                                                                        las
## 319                                                                                                                                                       dead
## 320                                                                                                                                                       food
## 321                                                                                                                                                      local
## 322                                                                                                                                                       read
## 323                                                                                                                                                     that�s
## 324                                                                                                                                                communities
## 325                                                                                                                                                    morning
## 326                                                                                                                                                   reported
## 327                                                                                                                                                   symptoms
## 328                                                                                                                                                      start
## 329                                                                                                                                                     update
## 330                                                                                                                                          #blacklivesmatter
## 331                                                                                                                                                      check
## 332                                                                                                                                                       join
## 333                                                                                                                                                    million
## 334                                                                                                                                                    receive
## 335                                                                                                                                           hospitalizations
## 336                                                                                                                                                        jan
## 337                                                                                                                                                         dr
## 338                                                                                                                                                    economy
## 339                                                                                                                                                     matter
## 340                                                                                                                                                       rate
## 341                                                                                                                                                     school
## 342                                                                                                                                                      tests
## 343                                                                                                                                                        bad
## 344                                                                                                                                                       data
## 345                                                                                                                                                     excuse
## 346                                                                                                                                                 impossible
## 347                                                                                                                                                information
## 348                                                                                                                                                       sick
## 349                                                                                                                                                      start
## 350                                                                                                                                                     taking
## 351                                                                                                                                                   tomorrow
## 352                                                                                                                                                        usa
## 353                                                                                                                                                     change
## 354                                                                                                                                                      month
## 355                                                                                                                                                      start
## 356                                                                                                                                                    control
## 357                                                                                                                                                       dead
## 358                                                                                                                                               distribution
## 359                                                                                                                                                    foreign
## 360                                                                                                                                                        job
## 361                                                                                                                                                       king
## 362                                                                                                                                                  postponed
## 363                                                                                                                                                      shift
## 364                                                                                                                                                      texas
## 365                                                                                                                                                   @youtube
## 366                                                                                                                                                       cold
## 367                                                                                                                                                       data
## 368                                                                                                                                                       life
## 369                                                                                                                                                    protect
## 370                                                                                                                                                     coming
## 371                                                                                                                                                        die
## 372                                                                                                                                                   symptoms
## 373                                                                                                                                                      total
## 374                                                                                                                                                       wait
## 375                                                                                                                                                      amend
## 376                                                                                                                                                      can�t
## 377                                                                                                                                                      check
## 378                                                                                                                                                    friends
## 379                                                                                                                                                      house
## 380                                                                                                                                                       line
## 381                                                                                                                                                        lot
## 382                                                                                                                                               requirements
## 383                                                                                                                                                       shot
## 384                                                                                                                                                   violated
## 385                                                                                                                                                      hours
## 386                                                                                                                                                    medical
## 387                                                                                                                                                     months
## 388                                                                                                                                                   tomorrow
## 389                                                                                                                                                       wear
## 390                                                                                                                                                    doesn�t
## 391                                                                                                                                                      fight
## 392                                                                                                                                                       jobs
## 393                                                                                                                                                      march
## 394                                                                                                                                                     relief
## 395                                                                                                                                                      visit
## 396                                                                                                                                                     #covid
## 397                                                                                                                                                     issues
## 398                                                                                                                                                  officials
## 399                                                                                                                                                        por
## 400                                                                                                                                                     relief
## 401                                                                                                                                                         se
## 402                                                                                                                                                      shame
## 403                                                                                                                                                coronavirus
## 404                                                                                                                                                      world
## 405                                                                                                                                                  confirmed
## 406                                                                                                                                                       love
## 407                                                                                                                                                      phase
## 408                                                                                                                                                      games
## 409                                                                                                                                                    project
## 410                                                                                                                                                     season
## 411                                                                                                                                                       call
## 412                                                                                                                                                       feel
## 413                                                                                                                                                       mild
## 414                                                                                                                                                  spreading
## 415                                                                                                                                                      trump
## 416                                                                                                                                                        god
## 417                                                                                                                                                     person
## 418                                                                                                                                                         se
## 419                                                                                                                                                       sick
## 420                                                                                                                                                     taking
## 421                                                                                                                                                     united
## 422                                                                                                                                       #foreigninterference
## 423                                                                                                                                                        flu
## 424                                                                                                                                                    protect
## 425                                                                                                                                                  residents
## 426                                                                                                                                                   response
## 427                                                                                                                                                      rural
## 428                                                                                                                                                      surge
## 429                                                                                                                                                        con
## 430                                                                                                                                                 healthcare
## 431                                                                                                                                                       real
## 432                                                                                                                                                  brutality
## 433                                                                                                                                                      china
## 434                                                                                                                                                   families
## 435                                                                                                                                                       fuck
## 436                                                                                                                                                       i�ve
## 437                                                                                                                                               #coronavirus
## 438                                                                                                                                             accountability
## 439                                                                                                                                                   continue
## 440                                                                                                                                                   infected
## 441                                                                                                                                                   students
## 442                                                                                                                                                     clinic
## 443                                                                                                                                                       kits
## 444                                                                                                                                                    morning
## 445                                                                                                                                                  protocols
## 446                                                                                                                                                       team
## 447                                                                                                                                                   governor
## 448                                                                                                                                                      guess
## 449                                                                                                                                                       he�s
## 450                                                                                                                                                      media
## 451                                                                                                                                                      spike
## 452                                                                                                                                                   students
## 453                                                                                                                                                    wearing
## 454                                                                                                                                                     you�re
## 455                                                                                                                                                     active
## 456                                                                                                                                                   business
## 457                                                                                                                                                        del
## 458                                                                                                                                                      march
## 459                                                                                                                                                  narrative
## 460                                                                                                                                                       plan
## 461                                                                                                                                                     that�s
## 462                                                                                                                                                     center
## 463                                                                                                                                                        pcr
## 464                                                                                                                                                         pm
## 465                                                                                                                                                     safety
## 466                                                                                                                                                      south
## 467                                                                                                                                                      weeks
## 468                                                                                                                                                     closed
## 469                                                                                                                                                    current
## 470                                                                                                                                                   fighting
## 471                                                                                                                                                 healthcare
## 472                                                                                                                                                        hit
## 473                                                                                                                                                      house
## 474                                                                                                                                                       past
## 475                                                                                                                                                   remember
## 476                                                                                                                                                       wear
## 477                                                                                                                                            #riggedelection
## 478                                                                                                                                                  appealing
## 479                                                                                                                                                    condone
## 480                                                                                                                                                  financing
## 481                                                                                                                                                        god
## 482                                                                                                                                                      happy
## 483                                                                                                                                                       love
## 484                                                                                                                                                  lowincome
## 485                                                                                                                                                    science
## 486                                                                                                                                                        set
## 487                                                                                                                                                    support
## 488                                                                                                                                                    account
## 489                                                                                                                                                    boosted
## 490                                                                                                                                                        del
## 491                                                                                                                                                    disease
## 492                                                                                                                                                information
## 493                                                                                                                                                       line
## 494                                                                                                                                                   mandates
## 495                                                                                                                                                   marjorie
## 496                                                                                                                                                  postponed
## 497                                                                                                                                                   reported
## 498                                                                                                                                                     return
## 499                                                                                                                                                        con
## 500                                                                                                                                                      dying
## 501                                                                                                                                                 government
## 502                                                                                                                                                       link
## 503                                                                                                                                                     coming
## 504                                                                                                                                                       hard
## 505                                                                                                                                                       list
## 506                                                                                                                                                      local
## 507                                                                                                                                                   national
## 508                                                                                                                                                     report
## 509                                                                                                                                                      times
## 510                                                                                                                                                     travel
## 511                                                                                                                                                     change
## 512                                                                                                                                                      close
## 513                                                                                                                                                    florida
## 514                                                                                                                                                  infection
## 515                                                                                                                                                    results
## 516                                                                                                                                                       risk
## 517                                                                                                                                                      texas
## 518                                                                                                                                                   american
## 519                                                                                                                                                communities
## 520                                                                                                                                                       feel
## 521                                                                                                                                                     summer
## 522                                                                                                                                                     system
## 523                                                                                                                                                      todos
## 524                                                                                                                                                    updates
## 525                                                                                                                                                       vote
## 526                                                                                                                                                      worse
## 527                                                                                                                             <u+0001f449>httpstcob6beokoik3
## 528                                                                                                                                                appointment
## 529                                                                                                                                                      dying
## 530                                                                                                                                                         es
## 531                                                                                                                                                      found
## 532                                                                                                                                                     safety
## 533                                                                                                                                                   continue
## 534                                                                                                                                                     issues
## 535                                                                                                                                                       rate
## 536                                                                                                                                                     taylor
## 537                                                                                                                                                    disease
## 538                                                                                                                                                     friday
## 539                                                                                                                                                    friends
## 540                                                                                                                                                       hard
## 541                                                                                                                                                   increase
## 542                                                                                                                                                      makes
## 543                                                                                                                                                        nyc
## 544                                                                                                                                                  officials
## 545                                                                                                                                                     racial
## 546                                                                                                                                                    started
## 547                                                                                                                                                      texas
## 548                                                                                                                                                  thousands
## 549                                                                                                                                                   tomorrow
## 550                                                                                                                                                    @cdcgov
## 551                                                                                                                                                      @ifad
## 552                                                                                                                                                      party
## 553                                                                                                                                                       past
## 554                                                                                                                                                    schools
## 555                                                                                                                                                      we�re
## 556                                                                                                                                                   breaking
## 557                                                                                                                                                      check
## 558                                                                                                                                                  hospitals
## 559                                                                                                                                                       plan
## 560                                                                                                                                                      front
## 561                                                                                                                                                       kids
## 562                                                                                                                                                     killed
## 563                                                                                                                                                       left
## 564                                                                                                                                                     nation
## 565                                                                                                                                                     normal
## 566                                                                                                                                                       para
## 567                                                                                                                                                   saturday
## 568                                                                                                                                                      share
## 569                                                                                                                                                       team
## 570                                                                                                                                                 unemployed
## 571                                                                                                                                                      watch
## 572                                                                                                                                                      we�re
## 573                                                                                                                                                       amid
## 574                                                                                                                                                  confirmed
## 575                                                                                                                                                   distance
## 576                                                                                                                                                       feel
## 577                                                                                                                                                   increase
## 578                                                                                                                                                     pfizer
## 579                                                                                                                                                    results
## 580                                                                                                                                                    wearing
## 581                                                                                                                                                      daily
## 582                                                                                                                                                    friends
## 583                                                                                                                                                    healthy
## 584                                                                                                                                                       live
## 585                                                                                                                                                permanently
## 586                                                                                                                                                     social
## 587                                                                                                                                                    started
## 588                                                                                                                                                   variants
## 589                                                                                                                                                      folks
## 590                                                                                                                                                 guidelines
## 591                                                                                                                                                      learn
## 592                                                                                                                                                   outbreak
## 593                                                                                                                                                      staff
## 594                                                                                                                                                    arizona
## 595                                                                                                                                                      close
## 596                                                                                                                                                       dies
## 597                                                                                                                                                       fake
## 598                                                                                                                                                       i�ve
## 599                                                                                                                                                     sunday
## 600                                                                                                                                                  thousands
## 601                                                                                                                                                       toll
## 602                                                                                                                                                        bad
## 603                                                                                                                                                      can�t
## 604                                                                                                                                                    federal
## 605                                                                                                                                                 government
## 606                                                                                                                                                        lot
## 607                                                                                                                                                  yesterday
## 608                                                                                                                                                       fund
## 609                                                                                                                                                   lockdown
## 610                                                                                                                                                       post
## 611                                                                                                                                                    service
## 612                                                                                                                                                    they�re
## 613                                                                                                                                                      times
## 614                                                                                                                                                    vaccine
## 615                                                                                                                                                       wave
## 616                                                                                                                                                      coach
## 617                                                                                                                                                   families
## 618                                                                                                                                                     follow
## 619                                                                                                                                                       fuck
## 620                                                                                                                                                    program
## 621                                                                                                                                                       site
## 622                                                                                                                                                      story
## 623                                                                                                                                                     system
## 624                                                                                                                                                 understand
## 625                                                                                                                                                      watch
## 626                                                                                                                                                       lost
## 627                                                                                                                                                     monday
## 628                                                                                                                                                      times
## 629                                                                                                                                                     reopen
## 630                                                                                                                                                        top
## 631                                                                                                                                                  yesterday
## 632                                                                                                                                                   @youtube
## 633                                                                                                                                                      black
## 634                                                                                                                                                       body
## 635                                                                                                                                                        con
## 636                                                                                                                                                   december
## 637                                                                                                                                                  including
## 638                                                                                                                                                  infection
## 639                                                                                                                                                     monday
## 640                                                                                                                                                       wait
## 641                                                                                                                                                      white
## 642                                                                                                                                                   evidence
## 643                                                                                                                                                       hope
## 644                                                                                                                                               hospitalized
## 645                                                                                                                                                  newsbreak
## 646                                                                                                                                                        son
## 647                                                                                                                                                    updates
## 648                                                                                                                                                       york
## 649                                                                                                                                           #covid<u+30fc>19
## 650                                                                                                                                                         es
## 651                                                                                                                                                      gonna
## 652                                                                                                                                                       huge
## 653                                                                                                                                                  including
## 654                                                                                                                                                      isn�t
## 655                                                                                                                                                       line
## 656                                                                                                                                                     reason
## 657                                                                                                                                                       talk
## 658                                                                                                                                                       true
## 659                                                                                                                                                      biden
## 660                                                                                                                                                    contact
## 661                                                                                                                                                 department
## 662                                                                                                                                                    disease
## 663                                                                                                                                                      fight
## 664                                                                                                                                                       food
## 665                                                                                                                                                      let�s
## 666                                                                                                                                                       post
## 667                                                                                                                                                  receiving
## 668                                                                                                                                                    waiting
## 669                                                                                                                                                       wife
## 670                                                                                                                                                     @potus
## 671                                                                                                                                                  americans
## 672                                                                                                                                                       amid
## 673                                                                                                                                                    finally
## 674                                                                                                                                                   increase
## 675                                                                                                                                                 quarantine
## 676                                                                                                                                                      bring
## 677                                                                                                                                                     center
## 678                                                                                                                                                    control
## 679                                                                                                                                                  emergency
## 680                                                                                                                                                      happy
## 681                                                                                                                                                       hear
## 682                                                                                                                                                       hoax
## 683                                                                                                                                                  infection
## 684                                                                                                                                                information
## 685                                                                                                                                                      night
## 686                                                                                                                                                       plan
## 687                                                                                                                                                    players
## 688                                                                                                                                                    prevent
## 689                                                                                                                                               restrictions
## 690                                                                                                                                                    website
## 691                                                                                                                                                    @nypost
## 692                                                                                                                                                   #vaccine
## 693                                                                                                                                                    capitol
## 694                                                                                                                                                     center
## 695                                                                                                                                                  emergency
## 696                                                                                                                                                   governor
## 697                                                                                                                                                      money
## 698                                                                                                                                                   multiple
## 699                                                                                                                                                       para
## 700                                                                                                                                                     reason
## 701                                                                                                                                                     return
## 702                                                                                                                                                       talk
## 703                                                                                                                                                     you�re
## 704                                                                                                                                                     athome
## 705                                                                                                                                                   awwrrite
## 706                                                                                                                                                     called
## 707                                                                                                                                                        god
## 708                                                                                                                                                       link
## 709                                                                                                                                                    parents
## 710                                                                                                                                                   response
## 711                                                                                                                                                     severe
## 712                                                                                                                                                        una
## 713                                                                                                                                                       wait
## 714                                                                                                                                                    waiting
## 715                                                                                                                                                     curfew
## 716                                                                                                                                                   happened
## 717                                                                                                                                                   hospital
## 718                                                                                                                                                     market
## 719                                                                                                                                                      plans
## 720                                                                                                                                                 quarantine
## 721                                                                                                                                                      stand
## 722                                                                                                                                                      story
## 723                                                                                                                                                 #wearamask
## 724                                                                                                                                                     didn�t
## 725                                                                                                                                                      media
## 726                                                                                                                                                    moderna
## 727                                                                                                                                                   negative
## 728                                                                                                                                                      north
## 729                                                                                                                                                   register
## 730                                                                                                                                                    reports
## 731                                                                                                                                                 republican
## 732                                                                                                                                                       sign
## 733                                                                                                                                                        ago
## 734                                                                                                                                                    country
## 735                                                                                                                                                   district
## 736                                                                                                                                                     france
## 737                                                                                                                                                 infections
## 738                                                                                                                                                   learning
## 739                                                                                                                                                    mandate
## 740                                                                                                                                                      month
## 741                                                                                                                                                     pfizer
## 742                                                                                                                                                    program
## 743                                                                                                                                                   starting
## 744                                                                                                                                                   teachers
## 745                                                                                                                                                  treatment
## 746                                                                                                                                                @whitehouse
## 747                                                                                                                                                    autopsy
## 748                                                                                                                                                      blood
## 749                                                                                                                                                   breaking
## 750                                                                                                                                                       cops
## 751                                                                                                                                                      daily
## 752                                                                                                                                                       date
## 753                                                                                                                                                        flu
## 754                                                                                                                                         hydroxychloroquine
## 755                                                                                                                                                        law
## 756                                                                                                                                                      mayor
## 757                                                                                                                                                    morning
## 758                                                                                                                                                   question
## 759                                                                                                                                                       sign
## 760                                                                                                                                                      y�all
## 761                                                                                                                                                        1st
## 762                                                                                                                                                         al
## 763                                                                                                                                              complications
## 764                                                                                                                                                    doctors
## 765                                                                                                                                                  employees
## 766                                                                                                                                                      event
## 767                                                                                                                                                    exposed
## 768                                                                                                                                                     here�s
## 769                                                                                                                                                        hey
## 770                                                                                                                                                      month
## 771                                                                                                                                                       ohio
## 772                                                                                                                                                     passed
## 773                                                                                                                                               restrictions
## 774                                                                                                                                                     strain
## 775                                                                                                                                                      study
## 776                                                                                                                                                      super
## 777                                                                                                                                                    tonight
## 778                                                                                                                                                     common
## 779                                                                                                                                                     friday
## 780                                                                                                                                                      media
## 781                                                                                                                                                      shots
## 782                                                                                                                                                     system
## 783                                                                                                                                                        vax
## 784                                                                                                                                                      visit
## 785                                                                                                                                                        act
## 786                                                                                                                                                   affected
## 787                                                                                                                                                    article
## 788                                                                                                                                                      blame
## 789                                                                                                                                                      close
## 790                                                                                                                                                   covid19�
## 791                                                                                                                                                    doctors
## 792                                                                                                                                                   economic
## 793                                                                                                                                                      found
## 794                                                                                                                                                        hey
## 795                                                                                                                                                      hours
## 796                                                                                                                                                   infected
## 797                                                                                                                                                       kill
## 798                                                                                                                                                     murder
## 799                                                                                                                                                        m�s
## 800                                                                                                                                                   negative
## 801                                                                                                                                                   peaceful
## 802                                                                                                                                                         pm
## 803                                                                                                                                                    reports
## 804                                                                                                                                                       tear
## 805                                                                                                                                                       toll
## 806                                                                                                                                                   training
## 807                                                                                                                                                      vegas
## 808                                                                                                                                                     wasn�t
## 809                                                                                                                                                      we�ve
## 810                                                                                                                                                      wrong
## 811                                                                                                                                                  announced
## 812                                                                                                                                                      bring
## 813                                                                                                                                                     called
## 814                                                                                                                                                      heart
## 815                                                                                                                                                       info
## 816                                                                                                                                                       kids
## 817                                                                                                                                                       kill
## 818                                                                                                                                                     killed
## 819                                                                                                                                                        las
## 820                                                                                                                                                      phase
## 821                                                                                                                                                 quarantine
## 822                                                                                                                                                   remember
## 823                                                                                                                                                  scheduled
## 824                                                                                                                                                  spreading
## 825                                                                                                                                                         al
## 826                                                                                                                                                 california
## 827                                                                                                                                                   infected
## 828                                                                                                                                                        nyc
## 829                                                                                                                                                  officials
## 830                                                                                                                                                       past
## 831                                                                                                                                                        san
## 832                                                                                                                                               #georgefloyd
## 833                                                                                                                                                    allowed
## 834                                                                                                                                                    florida
## 835                                                                                                                                                   football
## 836                                                                                                                                                        gas
## 837                                                                                                                                                      issue
## 838                                                                                                                                                        pay
## 839                                                                                                                                                  resources
## 840                                                                                                                                                     result
## 841                                                                                                                                                     return
## 842                                                                                                                                                       rise
## 843                                                                                                                                                 understand
## 844                                                                                                                                              #covidvaccine
## 845                                                                                                                                                      begin
## 846                                                                                                                                                         dc
## 847                                                                                                                                                        gov
## 848                                                                                                                                                    healthy
## 849                                                                                                                                                    killing
## 850                                                                                                                                                       shit
## 851                                                                                                                                                     single
## 852                                                                                                                                               <u+0001f637>
## 853                                                                                                                                                appointment
## 854                                                                                                                                                      break
## 855                                                                                                                                                      casos
## 856                                                                                                                                                     coming
## 857                                                                                                                                                    control
## 858                                                                                                                                                     didn�t
## 859                                                                                                                                                   download
## 860                                                                                                                                                      dying
## 861                                                                                                                                                   personal
## 862                                                                                                                                                   protocol
## 863                                                                                                                                                    pruebas
## 864                                                                                                                                                    reports
## 865                                                                                                                                                       rise
## 866                                                                                                                                                      story
## 867                                                                                                                                                         ya
## 868                                                                                                                                                    amazing
## 869                                                                                                                                                        blm
## 870                                                                                                                                                     called
## 871                                                                                                                                                     church
## 872                                                                                                                                                     deadly
## 873                                                                                                                                                      heart
## 874                                                                                                                                                       info
## 875                                                                                                                                                    justice
## 876                                                                                                                                                 leadership
## 877                                                                                                                                                      level
## 878                                                                                                                                                     online
## 879                                                                                                                                                  political
## 880                                                                                                                                                   recovery
## 881                                                                                                                                                    related
## 882                                                                                                                                                   services
## 883                                                                                                                                                        son
## 884                                                                                                                                                   starting
## 885                                                                                                                                                  treatment
## 886                                                                                                                                                     unrest
## 887                                                                                                                                                     what�s
## 888                                                                                                                                                  @joebiden
## 889                                                                                                                                                        2nd
## 890                                                                                                                                                    article
## 891                                                                                                                                                     browns
## 892                                                                                                                                                        cdc
## 893                                                                                                                                                     deadly
## 894                                                                                                                                                       he�s
## 895                                                                                                                                                      india
## 896                                                                                                                                                       join
## 897                                                                                                                                                        nyc
## 898                                                                                                                                                        sad
## 899                                                                                                                                                    started
## 900                                                                                                                                                      worse
## 901                                                                                                                                                @elnuevodia
## 902                                                                                                                                               #coronavirus
## 903                                                                                                                                                   desantis
## 904                                                                                                                                                         es
## 905                                                                                                                                                 guidelines
## 906                                                                                                                                                   immunity
## 907                                                                                                                                                       i�ve
## 908                                                                                                                                                      lines
## 909                                                                                                                                                        m�s
## 910                                                                                                                                                     office
## 911                                                                                                                                                     person
## 912                                                                                                                                                       play
## 913                                                                                                                                                    prevent
## 914                                                                                                                                                   received
## 915                                                                                                                                                     remote
## 916                                                                                                                                                      sense
## 917                                                                                                                                                        set
## 918                                                                                                                                                    tonight
## 919                                                                                                                                                         al
## 920                                                                                                                                                      april
## 921                                                                                                                                                      based
## 922                                                                                                                                                       cure
## 923                                                                                                                                                    donated
## 924                                                                                                                                                  essential
## 925                                                                                                                                                      event
## 926                                                                                                                                                       fall
## 927                                                                                                                                                     forget
## 928                                                                                                                                                    forward
## 929                                                                                                                                                     friend
## 930                                                                                                                                                      heard
## 931                                                                                                                                                     issues
## 932                                                                                                                                                      let�s
## 933                                                                                                                                                     office
## 934                                                                                                                                                   officers
## 935                                                                                                                                                  situation
## 936                                                                                                                                                    streets
## 937                                                                                                                                                       told
## 938                                                                                                                                                      video
## 939                                                                                                                                                    virtual
## 940                                                                                                                                                       bill
## 941                                                                                                                                                    current
## 942                                                                                                                                                    doesn�t
## 943                                                                                                                                                    fucking
## 944                                                                                                                                                 guidelines
## 945                                                                                                                                                        hit
## 946                                                                                                                                           hospitalizations
## 947                                                                                                                                                       hour
## 948                                                                                                                                                   learning
## 949                                                                                                                                                      loved
## 950                                                                                                                                                    process
## 951                                                                                                                                                  protocols
## 952                                                                                                                                                      ready
## 953                                                                                                                                                      share
## 954                                                                                                                                                   virginia
## 955                                                                                                                                              #covidtesting
## 956                                                                                                                                                    african
## 957                                                                                                                                                       dies
## 958                                                                                                                                                   families
## 959                                                                                                                                                       food
## 960                                                                                                                                                        gov
## 961                                                                                                                                                        hit
## 962                                                                                                                                                    illness
## 963                                                                                                                                                  including
## 964                                                                                                                                                        joe
## 965                                                                                                                                             reservecovid19
## 966                                                                                                                                                      study
## 967                                                                                                                                                      tells
## 968                                                                                                                                                    tuesday
## 969                                                                                                                                                     #covid
## 970                                                                                                                                                    changed
## 971                                                                                                                                                      class
## 972                                                                                                                                                    company
## 973                                                                                                                                                       damn
## 974                                                                                                                                                    exposed
## 975                                                                                                                                                       hate
## 976                                                                                                                                                   measures
## 977                                                                                                                                                    nursing
## 978                                                                                                                                                     policy
## 979                                                                                                                                                     rising
## 980                                                                                                                                                     sunday
## 981                                                                                                                                                        usa
## 982                                                                                                                                                 basketball
## 983                                                                                                                                                      break
## 984                                                                                                                                                   carolina
## 985                                                                                                                                                     caused
## 986                                                                                                                                                     closed
## 987                                                                                                                                                   congress
## 988                                                                                                                                                       date
## 989                                                                                                                                                    effects
## 990                                                                                                                                                       fear
## 991                                                                                                                                                     friend
## 992                                                                                                                                                     global
## 993                                                                                                                                                      hands
## 994                                                                                                                                                  happening
## 995                                                                                                                                                       hear
## 996                                                                                                                                                    holiday
## 997                                                                                                                                                      human
## 998                                                                                                                                                      makes
## 999                                                                                                                                                      offer
## 1000                                                                                                                                                    office
## 1001                                                                                                                                                    online
## 1002                                                                                                                                                  practice
## 1003                                                                                                                                                   related
## 1004                                                                                                                                                   service
## 1005                                                                                                                                                     south
## 1006                                                                                                                                                   updates
## 1007                                                                                                                                                      vote
## 1008                                                                                                                                                     delta
## 1009                                                                                                                                                 emergence
## 1010                                                                                                                                                    greene
## 1011                                                                                                                                                     lives
## 1012                                                                                                                                                     night
## 1013                                                                                                                                                  proposed
## 1014                                                                                                                                                  required
## 1015                                                                                                                                                   science
## 1016                                                                                                                                                      shit
## 1017                                                                                                                                                      sign
## 1018                                                                                                                                                   support
## 1019                                                                                                                                                  suspends
## 1020                                                                                                                                                california
## 1021                                                                                                                                                   created
## 1022                                                                                                                                                     feels
## 1023                                                                                                                                                    follow
## 1024                                                                                                                                                       gop
## 1025                                                                                                                                                   killing
## 1026                                                                                                                                                protestors
## 1027                                                                                                                                                      race
## 1028                                                                                                                                                     ready
## 1029                                                                                                                                                 recovered
## 1030                                                                                                                                                  reminder
## 1031                                                                                                                                                 residents
## 1032                                                                                                                                                   results
## 1033                                                                                                                                                    single
## 1034                                                                                                                                                        st
## 1035                                                                                                                                                  thinking
## 1036                                                                                                                                                vulnerable
## 1037                                                                                                                                                      yeah
## 1038                                                                                                                                              administered
## 1039                                                                                                                                                   allowed
## 1040                                                                                                                                                    aren�t
## 1041                                                                                                                                                     blood
## 1042                                                                                                                                                    contra
## 1043                                                                                                                                                      damn
## 1044                                                                                                                                                distancing
## 1045                                                                                                                                                  evidence
## 1046                                                                                                                                                    giving
## 1047                                                                                                                                                  grateful
## 1048                                                                                                                                                   haven�t
## 1049                                                                                                                                                      hoax
## 1050                                                                                                                                                       icu
## 1051                                                                                                                                                  lockdown
## 1052                                                                                                                                                      miss
## 1053                                                                                                                                                     night
## 1054                                                                                                                                                   parents
## 1055                                                                                                                                                       pay
## 1056                                                                                                                                                      play
## 1057                                                                                                                                                   players
## 1058                                                                                                                                                   prayers
## 1059                                                                                                                                                   rollout
## 1060                                                                                                                                                     visit
## 1061                                                                                                                                                 wednesday
## 1062                                                                                                                                                 @nycmayor
## 1063                                                                                                                                              <u+0001f489>
## 1064                                                                                                                                                 announced
## 1065                                                                                                                                                  business
## 1066                                                                                                                                                  canceled
## 1067                                                                                                                                                department
## 1068                                                                                                                                                 employees
## 1069                                                                                                                                                     games
## 1070                                                                                                                                                    global
## 1071                                                                                                                                                    here�s
## 1072                                                                                                                                                      love
## 1073                                                                                                                                                      mass
## 1074                                                                                                                                                        mi
## 1075                                                                                                                                                   parking
## 1076                                                                                                                                                     proof
## 1077                                                                                                                                                    prueba
## 1078                                                                                                                                                    recent
## 1079                                                                                                                                                    result
## 1080                                                                                                                                                     share
## 1081                                                                                                                                                        te
## 1082                                                                                                                                                  thursday
## 1083                                                                                                                                              vaccinations
## 1084                                                                                                                                                    vaxxed
## 1085                                                                                                                                                    winter
## 1086                                                                                                                                                     worse
## 1087                                                                                                                                              asymptomatic
## 1088                                                                                                                                                    couple
## 1089                                                                                                                                                  covering
## 1090                                                                                                                                                department
## 1091                                                                                                                                                   details
## 1092                                                                                                                                                  distance
## 1093                                                                                                                                                   federal
## 1094                                                                                                                                                 forgotten
## 1095                                                                                                                                                     funds
## 1096                                                                                                                                                   funeral
## 1097                                                                                                                                                    living
## 1098                                                                                                                                                     major
## 1099                                                                                                                                                  memorial
## 1100                                                                                                                                                      move
## 1101                                                                                                                                                        ny
## 1102                                                                                                                                                    passed
## 1103                                                                                                                                                       ppl
## 1104                                                                                                                                                    recent
## 1105                                                                                                                                                  released
## 1106                                                                                                                                                   talking
## 1107                                                                                                                                                        ya
## 1108                                                                                                                                              <u+0001f637>
## 1109                                                                                                                                                 christmas
## 1110                                                                                                                                                    doctor
## 1111                                                                                                                                                   feeling
## 1112                                                                                                                                                      half
## 1113                                                                                                                                                     learn
## 1114                                                                                                                                                    living
## 1115                                                                                                                                                        lo
## 1116                                                                                                                                                      lose
## 1117                                                                                                                                                  michigan
## 1118                                                                                                                                                    nation
## 1119                                                                                                                                                   nursing
## 1120                                                                                                                                                pharmacist
## 1121                                                                                                                                                        pm
## 1122                                                                                                                                                    police
## 1123                                                                                                                                                     proud
## 1124                                                                                                                                                responders
## 1125                                                                                                                                                     sites
## 1126                                                                                                                                                  starting
## 1127                                                                                                                                                        su
## 1128                                                                                                                                                       war
## 1129                                                                                                                                                washington
## 1130                                                                                                                                                     wrong
## 1131                                                                                                                                           @govrondesantis
## 1132                                                                                                                                                   classes
## 1133                                                                                                                                                    closed
## 1134                                                                                                                                                       fda
## 1135                                                                                                                                                    follow
## 1136                                                                                                                                                  governor
## 1137                                                                                                                                                  guidance
## 1138                                                                                                                                   https://t.co/yeok64lq0r
## 1139                                                                                                                                                       ihu
## 1140                                                                                                                                                    impede
## 1141                                                                                                                                                infectious
## 1142                                                                                                                                                     let�s
## 1143                                                                                                                                                    listen
## 1144                                                                                                                                                     makes
## 1145                                                                                                                                                     money
## 1146                                                                                                                                                multipoint
## 1147                                                                                                                                                    norway
## 1148                                                                                                                                                  omircron
## 1149                                                                                                                                                    policy
## 1150                                                                                                                                                  remember
## 1151                                                                                                                                                    report
## 1152                                                                                                                                                     we�re
## 1153                                                                                                                                                    you�re
## 1154                                                                                                                                                   anymore
## 1155                                                                                                                                                 challenge
## 1156                                                                                                                                                    chance
## 1157                                                                                                                                                      como
## 1158                                                                                                                                                 concerned
## 1159                                                                                                                                                   contact
## 1160                                                                                                                                                 employees
## 1161                                                                                                                                                     force
## 1162                                                                                                                                                       guy
## 1163                                                                                                                                                      head
## 1164                                                                                                                                                     human
## 1165                                                                                                                                                      july
## 1166                                                                                                                                                        lo
## 1167                                                                                                                                                     means
## 1168                                                                                                                                                  millions
## 1169                                                                                                                                                     party
## 1170                                                                                                                                                     proud
## 1171                                                                                                                                                 questions
## 1172                                                                                                                                                    racist
## 1173                                                                                                                                                    record
## 1174                                                                                                                                                  register
## 1175                                                                                                                                               restaurants
## 1176                                                                                                                                                    rights
## 1177                                                                                                                                                   running
## 1178                                                                                                                                                   schools
## 1179                                                                                                                                                       set
## 1180                                                                                                                                                     south
## 1181                                                                                                                                                   there�s
## 1182                                                                                                                                                     tired
## 1183                                                                                                                                                     tweet
## 1184                                                                                                                                                    chance
## 1185                                                                                                                                                  children
## 1186                                                                                                                                                    entire
## 1187                                                                                                                                                  expected
## 1188                                                                                                                                                leadership
## 1189                                                                                                                                                      left
## 1190                                                                                                                                                   meeting
## 1191                                                                                                                                                    mother
## 1192                                                                                                                                                 political
## 1193                                                                                                                                                 questions
## 1194                                                                                                                                                      roll
## 1195                                                                                                                                                     round
## 1196                                                                                                                                                      slow
## 1197                                                                                                                                                       tap
## 1198                                                                                                                                                   they�re
## 1199                                                                                                                                                   today�s
## 1200                                                                                                                                                       top
## 1201                                                                                                                                                 treatment
## 1202                                                                                                                                                   twitter
## 1203                                                                                                                                                       web
## 1204                                                                                                                                                     worst
## 1205                                                                                                                                                     y�all
## 1206                                                                                                                                             #covidvariant
## 1207                                                                                                                                                  #general
## 1208                                                                                                                                                  concerns
## 1209                                                                                                                                                      dead
## 1210                                                                                                                                                    doctor
## 1211                                                                                                                                                 effective
## 1212                                                                                                                                                     fight
## 1213                                                                                                                                                 happening
## 1214                                                                                                                                                     heart
## 1215                                                                                                                                                       hey
## 1216                                                                                                                                                    indoor
## 1217                                                                                                                                                        lo
## 1218                                                                                                                                                   provide
## 1219                                                                                                                                                  recovery
## 1220                                                                                                                                                   related
## 1221                                                                                                                                                        si
## 1222                                                                                                                                                     spike
## 1223                                                                                                                                                    taking
## 1224                                                                                                                                                      told
## 1225                                                                                                                                                university
## 1226                                                                                                                                                   wearing
## 1227                                                                                                                                                   @cdcgov
## 1228                                                                                                                                               @nygovcuomo
## 1229                                                                                                                                                  @youtube
## 1230                                                                                                                                                  #acabose
## 1231                                                                                                                                     #artdengroundmoviment
## 1232                                                                                                                                               #bcnlegends
## 1233                                                                                                                                                 #blegends
## 1234                                                                                                                                        #urbangraffitisbcn
## 1235                                                                                                                                                      amid
## 1236                                                                                                                                                      bill
## 1237                                                                                                                                                       cdc
## 1238                                                                                                                                                    claims
## 1239                                                                                                                                                        dc
## 1240                                                                                                                                                      drug
## 1241                                                                                                                                                       era
## 1242                                                                                                                                                   excited
## 1243                                                                                                                                                   failure
## 1244                                                                                                                                                      fake
## 1245                                                                                                                                                   feeling
## 1246                                                                                                                                                       gov
## 1247                                                                                                                                                  grateful
## 1248                                                                                                                                                      guys
## 1249                                                                                                                                                     hands
## 1250                                                                                                                                                    here�s
## 1251                                                                                                                                                     homes
## 1252                                                                                                                                                     leave
## 1253                                                                                                                                                    monday
## 1254                                                                                                                                                     movie
## 1255                                                                                                                                                     north
## 1256                                                                                                                                                     paper
## 1257                                                                                                                                                      park
## 1258                                                                                                                                                restaurant
## 1259                                                                                                                                                     sense
## 1260                                                                                                                                                      site
## 1261                                                                                                                                                    skonie
## 1262                                                                                                                                                     skoop
## 1263                                                                                                                                                     store
## 1264                                                                                                                                                    street
## 1265                                                                                                                                                struggling
## 1266                                                                                                                                                  thursday
## 1267                                                                                                                                                  watching
## 1268                                                                                                                                               @nygovcuomo
## 1269                                                                                                                                                    access
## 1270                                                                                                                                            administration
## 1271                                                                                                                                                  arrested
## 1272                                                                                                                                                     beach
## 1273                                                                                                                                                  citizens
## 1274                                                                                                                                                  concerns
## 1275                                                                                                                                                 countries
## 1276                                                                                                                                                    crisis
## 1277                                                                                                                                                 effective
## 1278                                                                                                                                                   excited
## 1279                                                                                                                                                    expect
## 1280                                                                                                                                                  exposure
## 1281                                                                                                                                                     front
## 1282                                                                                                                                                     heard
## 1283                                                                                                                                                  hundreds
## 1284                                                                                                                                                    inside
## 1285                                                                                                                                                       lab
## 1286                                                                                                                                                  millions
## 1287                                                                                                                                               opportunity
## 1288                                                                                                                                                population
## 1289                                                                                                                                                    pretty
## 1290                                                                                                                                                 providers
## 1291                                                                                                                                                    result
## 1292                                                                                                                                                  saturday
## 1293                                                                                                                                                      save
## 1294                                                                                                                                                    senate
## 1295                                                                                                                                                   senator
## 1296                                                                                                                                                     shots
## 1297                                                                                                                                                   special
## 1298                                                                                                                                                      true
## 1299                                                                                                                                                    united
## 1300                                                                                                                                                   website
## 1301                                                                                                                                              #vaccination
## 1302                                                                                                                                                  boosters
## 1303                                                                                                                                                     coach
## 1304                                                                                                                                                    contra
## 1305                                                                                                                                                   current
## 1306                                                                                                                                                      dose
## 1307                                                                                                                                                     event
## 1308                                                                                                                                                   forward
## 1309                                                                                                                                                      hard
## 1310                                                                                                                                                 isolation
## 1311                                                                                                                                                      left
## 1312                                                                                                                                                    living
## 1313                                                                                                                                                    online
## 1314                                                                                                                                                   players
## 1315                                                                                                                                                positivity
## 1316                                                                                                                                                  practice
## 1317                                                                                                                                                protection
## 1318                                                                                                                                                    reason
## 1319                                                                                                                                                   receive
## 1320                                                                                                                                                 residents
## 1321                                                                                                                                                      rest
## 1322                                                                                                                                                     super
## 1323                                                                                                                                                       tap
## 1324                                                                                                                                                       web
## 1325                                                                                                                                                    action
## 1326                                                                                                                                                additional
## 1327                                                                                                                                                       ass
## 1328                                                                                                                                                  bullshit
## 1329                                                                                                                                                     color
## 1330                                                                                                                                                     crazy
## 1331                                                                                                                                                 customers
## 1332                                                                                                                                                   discuss
## 1333                                                                                                                                                    donate
## 1334                                                                                                                                                  expected
## 1335                                                                                                                                                    future
## 1336                                                                                                                                                      idea
## 1337                                                                                                                                                      mass
## 1338                                                                                                                                                   minutes
## 1339                                                                                                                                                    mother
## 1340                                                                                                                                                  national
## 1341                                                                                                                                                    prison
## 1342                                                                                                                                                   program
## 1343                                                                                                                                                  research
## 1344                                                                                                                                                   respect
## 1345                                                                                                                                               respiratory
## 1346                                                                                                                                                       san
## 1347                                                                                                                                                     takes
## 1348                                                                                                                                                    travel
## 1349                                                                                                                                                      type
## 1350                                                                                                                                                       una
## 1351                                                                                                                                                   viruses
## 1352                                                                                                                                                     won�t
## 1353                                                                                                                                                      word
## 1354                                                                                                                                                     worst
## 1355                                                                                                                                                      �the
## 1356                                                                                                                                              <u+0001f489>
## 1357                                                                                                                                              <u+0001f64f>
## 1358                                                                                                                                                        1a
## 1359                                                                                                                                                       age
## 1360                                                                                                                                              appointments
## 1361                                                                                                                                                       ass
## 1362                                                                                                                                                businesses
## 1363                                                                                                                                                   economy
## 1364                                                                                                                                                   federal
## 1365                                                                                                                                                    friday
## 1366                                                                                                                                                  happened
## 1367                                                                                                                                                      hold
## 1368                                                                                                                                                     issue
## 1369                                                                                                                                                    jersey
## 1370                                                                                                                                                     kevin
## 1371                                                                                                                                                     mayor
## 1372                                                                                                                                                        mi
## 1373                                                                                                                                                       mom
## 1374                                                                                                                                                      move
## 1375                                                                                                                                                     nurse
## 1376                                                                                                                                                  official
## 1377                                                                                                                                                     phone
## 1378                                                                                                                                                     power
## 1379                                                                                                                                                      pray
## 1380                                                                                                                                                 reporting
## 1381                                                                                                                                                      rest
## 1382                                                                                                                                                scientists
## 1383                                                                                                                                                    severe
## 1384                                                                                                                                                      shut
## 1385                                                                                                                                                 smartnews
## 1386                                                                                                                                                        st
## 1387                                                                                                                                                    stupid
## 1388                                                                                                                                                    trumps
## 1389                                                                                                                                                       una
## 1390                                                                                                                                              <u+0001f914>
## 1391                                                                                                                                                    access
## 1392                                                                                                                                                  american
## 1393                                                                                                                                                    austin
## 1394                                                                                                                                                 australia
## 1395                                                                                                                                                      date
## 1396                                                                                                                                                   doesn�t
## 1397                                                                                                                                                  exposure
## 1398                                                                                                                                                   feeling
## 1399                                                                                                                                                  fighting
## 1400                                                                                                                                                       gop
## 1401                                                                                                                                                   holiday
## 1402                                                                                                                                                    impact
## 1403                                                                                                                                                     means
## 1404                                                                                                                                                  multiple
## 1405                                                                                                                                                 president
## 1406                                                                                                                                                  question
## 1407                                                                                                                                                  schedule
## 1408                                                                                                                                                        su
## 1409                                                                                                                                                    sunday
## 1410                                                                                                                                                      talk
## 1411                                                                                                                                                      term
## 1412                                                                                                                                                    that�s
## 1413                                                                                                                                                 thousands
## 1414                                                                                                                                                   virtual
## 1415                                                                                                                                                   weekend
## 1416                                                                                                                                              <u+0001f9a0>
## 1417                                                                                                                                                    access
## 1418                                                                                                                                                  antibody
## 1419                                                                                                                                                    aren�t
## 1420                                                                                                                                                        bc
## 1421                                                                                                                                                 beautiful
## 1422                                                                                                                                                     begin
## 1423                                                                                                                                                      body
## 1424                                                                                                                                                      book
## 1425                                                                                                                                                    budget
## 1426                                                                                                                                                    cities
## 1427                                                                                                                                                  complete
## 1428                                                                                                                                                 education
## 1429                                                                                                                                                     empty
## 1430                                                                                                                                               enforcement
## 1431                                                                                                                                                  everyday
## 1432                                                                                                                                                     false
## 1433                                                                                                                                                   finally
## 1434                                                                                                                                                    global
## 1435                                                                                                                                                graduation
## 1436                                                                                                                                                      hand
## 1437                                                                                                                                                    happen
## 1438                                                                                                                                                   helping
## 1439                                                                                                                                                      hold
## 1440                                                                                                                                                 hospitals
## 1441                                                                                                                                                      late
## 1442                                                                                                                                                   limited
## 1443                                                                                                                                                      list
## 1444                                                                                                                                                       lol
## 1445                                                                                                                                                    moment
## 1446                                                                                                                                                      play
## 1447                                                                                                                                                      pray
## 1448                                                                                                                                                    pretty
## 1449                                                                                                                                                  recently
## 1450                                                                                                                                               responsible
## 1451                                                                                                                                                       run
## 1452                                                                                                                                                 spreading
## 1453                                                                                                                                                    stupid
## 1454                                                                                                                                                    threat
## 1455                                                                                                                                                     treat
## 1456                                                                                                                                                    trumps
## 1457                                                                                                                                                  violence
## 1458                                                                                                                                                    voting
## 1459                                                                                                                                                     we�ll
## 1460                                                                                                                                                   worried
## 1461                                                                                                                                               @googlenews
## 1462                                                                                                                                                  @nytimes
## 1463                                                                                                                                                      @who
## 1464                                                                                                                                                additional
## 1465                                                                                                                                                       ago
## 1466                                                                                                                                                    battle
## 1467                                                                                                                                                   chinese
## 1468                                                                                                                                                       dad
## 1469                                                                                                                                                 dangerous
## 1470                                                                                                                                                     drive
## 1471                                                                                                                                                     email
## 1472                                                                                                                                                   failure
## 1473                                                                                                                                                     focus
## 1474                                                                                                                                                     folks
## 1475                                                                                                                                                   forward
## 1476                                                                                                                                                      glad
## 1477                                                                                                                                                     gonna
## 1478                                                                                                                                                       gop
## 1479                                                                                                                                                      guys
## 1480                                                                                                                                                    happen
## 1481                                                                                                                                                      head
## 1482                                                                                                                                                    highly
## 1483                                                                                                                                                      host
## 1484                                                                                                                                                   houston
## 1485                                                                                                                                                    matter
## 1486                                                                                                                                                    mental
## 1487                                                                                                                                                       m�s
## 1488                                                                                                                                                    normal
## 1489                                                                                                                                                    nurses
## 1490                                                                                                                                                        ny
## 1491                                                                                                                                                  outbreak
## 1492                                                                                                                                               precautions
## 1493                                                                                                                                                   putting
## 1494                                                                                                                                                 recovered
## 1495                                                                                                                                                  reminder
## 1496                                                                                                                                                       rep
## 1497                                                                                                                                                  required
## 1498                                                                                                                                                  schedule
## 1499                                                                                                                                                      send
## 1500                                                                                                                                                       son
## 1501                                                                                                                                                  spreader
## 1502                                                                                                                                                     store
## 1503                                                                                                                                                     video
## 1504                                                                                                                                                    what�s
## 1505                                                                                                                                                   @cdcgov
## 1506                                                                                                                                                #getvaxxed
## 1507                                                                                                                                                   america
## 1508                                                                                                                                                   arizona
## 1509                                                                                                                                                   article
## 1510                                                                                                                                                      baby
## 1511                                                                                                                                                basketball
## 1512                                                                                                                                                 beginning
## 1513                                                                                                                                                businesses
## 1514                                                                                                                                               communities
## 1515                                                                                                                                                   contact
## 1516                                                                                                                                                 emergency
## 1517                                                                                                                                                      fine
## 1518                                                                                                                                   https://t.co/c7gpr6wwp2
## 1519                                                                                                                                                       icu
## 1520                                                                                                                                                  inperson
## 1521                                                                                                                                                       kit
## 1522                                                                                                                                                       lie
## 1523                                                                                                                                                    middle
## 1524                                                                                                                                                  national
## 1525                                                                                                                                                  petition
## 1526                                                                                                                                                    pretty
## 1527                                                                                                                                              restrictions
## 1528                                                                                                                                                     salud
## 1529                                                                                                                                                    season
## 1530                                                                                                                                                     short
## 1531                                                                                                                                                      shut
## 1532                                                                                                                                                   student
## 1533                                                                                                                                                       top
## 1534                                                                                                                                                    united
## 1535                                                                                                                                                   weather
## 1536                                                                                                                                                   website
## 1537                                                                                                                                                 wednesday
## 1538                                                                                                                                                     white
## 1539                                                                                                                                               @googlenews
## 1540                                                                                                                                                      #blm
## 1541                                                                                                                                               #cuarentena
## 1542                                                                                                                                              #desescalada
## 1543                                                                                                                                                    #fase1
## 1544                                                                                                                                              <u+0001f602>
## 1545                                                                                                                                                   address
## 1546                                                                                                                                                    amount
## 1547                                                                                                                                                     beach
## 1548                                                                                                                                                     cares
## 1549                                                                                                                                                  concerns
## 1550                                                                                                                                                conditions
## 1551                                                                                                                                                  couldn�t
## 1552                                                                                                                                                      deal
## 1553                                                                                                                                                   dealing
## 1554                                                                                                                                                  director
## 1555                                                                                                                                                    donald
## 1556                                                                                                                                                     drive
## 1557                                                                                                                                                     ellos
## 1558                                                                                                                                                  enfermos
## 1559                                                                                                                                                      este
## 1560                                                                                                                                                     extra
## 1561                                                                                                                                                  facebook
## 1562                                                                                                                                                    facing
## 1563                                                                                                                                                    failed
## 1564                                                                                                                                                     fauci
## 1565                                                                                                                                                      fire
## 1566                                                                                                                                                   fucking
## 1567                                                                                                                                                       fun
## 1568                                                                                                                                                       gym
## 1569                                                                                                                                                 happening
## 1570                                                                                                                                                      hero
## 1571                                                                                                                                                  impacted
## 1572                                                                                                                                               intenciones
## 1573                                                                                                                                                      lack
## 1574                                                                                                                                                       les
## 1575                                                                                                                                                     lines
## 1576                                                                                                                                                     loved
## 1577                                                                                                                                                     lying
## 1578                                                                                                                                                  military
## 1579                                                                                                                                                  offering
## 1580                                                                                                                                                   ongoing
## 1581                                                                                                                                               opportunity
## 1582                                                                                                                                                   oraci�n
## 1583                                                                                                                                                       sad
## 1584                                                                                                                                                   science
## 1585                                                                                                                                                  security
## 1586                                                                                                                                                   special
## 1587                                                                                                                                                     stuff
## 1588                                                                                                                                                 wednesday
## 1589                                                                                                                                                     women
## 1590                                                                                                                                                  wouldn�t
## 1591                                                                                                                                                    africa
## 1592                                                                                                                                                   amazing
## 1593                                                                                                                                                     blame
## 1594                                                                                                                                                  building
## 1595                                                                                                                                                  capacity
## 1596                                                                                                                                                       car
## 1597                                                                                                                                                contagious
## 1598                                                                                                                                                 continues
## 1599                                                                                                                                                     count
## 1600                                                                                                                                                  eligible
## 1601                                                                                                                                                experience
## 1602                                                                                                                                                facilities
## 1603                                                                                                                                                   finally
## 1604                                                                                                                                                      hate
## 1605                                                                                                                                                   imagine
## 1606                                                                                                                                                      late
## 1607                                                                                                                                                    leader
## 1608                                                                                                                                                       lol
## 1609                                                                                                                                                    losing
## 1610                                                                                                                                                      mass
## 1611                                                                                                                                                   minutes
## 1612                                                                                                                                                   reality
## 1613                                                                                                                                                    remain
## 1614                                                                                                                                                    rights
## 1615                                                                                                                                                    russia
## 1616                                                                                                                                                 situation
## 1617                                                                                                                                                  stimulus
## 1618                                                                                                                                                  straight
## 1619                                                                                                                                                supporters
## 1620                                                                                                                                                      term
## 1621                                                                                                                                                  thinking
## 1622                                                                                                                                                   tuesday
## 1623                                                                                                                                                   weekend
## 1624                                                                                                                                                     woman
## 1625                                                                                                                                                     words
## 1626                                                                                                                                               @googlenews
## 1627                                                                                                                                                 @joebiden
## 1628                                                                                                                                                  #florida
## 1629                                                                                                                                                 #pandemic
## 1630                                                                                                                                                     added
## 1631                                                                                                                                                  admitted
## 1632                                                                                                                                                       air
## 1633                                                                                                                                                       ave
## 1634                                                                                                                                                     bring
## 1635                                                                                                                                                    campus
## 1636                                                                                                                                                conference
## 1637                                                                                                                                                   details
## 1638                                                                                                                                                 districts
## 1639                                                                                                                                                  eligible
## 1640                                                                                                                                                    events
## 1641                                                                                                                                                 exemption
## 1642                                                                                                                                                    friend
## 1643                                                                                                                                                      hear
## 1644                                                                                                                                                   husband
## 1645                                                                                                                                                     leave
## 1646                                                                                                                                                    orange
## 1647                                                                                                                                                     party
## 1648                                                                                                                                                   prayers
## 1649                                                                                                                                                     rates
## 1650                                                                                                                                                       sad
## 1651                                                                                                                                                  saturday
## 1652                                                                                                                                                 suspended
## 1653                                                                                                                                                   there�s
## 1654                                                                                                                                                     woman
## 1655                                                                                                                                                     wrong
## 1656                                                                                                                                                      yeah
## 1657                                                                                                                                                      �the
## 1658                                                                                                                                                    @potus
## 1659                                                                                                                                              <u+0001f637>
## 1660                                                                                                                                              <u+0001f914>
## 1661                                                                                                                                                       1st
## 1662                                                                                                                                                   alabama
## 1663                                                                                                                                                   arizona
## 1664                                                                                                                                                assistance
## 1665                                                                                                                                                   atlanta
## 1666                                                                                                                                                     aware
## 1667                                                                                                                                                   biggest
## 1668                                                                                                                                                  birthday
## 1669                                                                                                                                                       bit
## 1670                                                                                                                                                    caught
## 1671                                                                                                                                                  children
## 1672                                                                                                                                                     civil
## 1673                                                                                                                                                   climate
## 1674                                                                                                                                                       cut
## 1675                                                                                                                                                 dangerous
## 1676                                                                                                                                                   efforts
## 1677                                                                                                                                                     email
## 1678                                                                                                                                                   experts
## 1679                                                                                                                                                  favorite
## 1680                                                                                                                                                        fe
## 1681                                                                                                                                                    forced
## 1682                                                                                                                                                   healthy
## 1683                                                                                                                                                   history
## 1684                                                                                                                                                 increased
## 1685                                                                                                                                                  involved
## 1686                                                                                                                                                    joined
## 1687                                                                                                                                                      lead
## 1688                                                                                                                                                   looting
## 1689                                                                                                                                                      miss
## 1690                                                                                                                                                    missed
## 1691                                                                                                                                                       mom
## 1692                                                                                                                                                population
## 1693                                                                                                                                                     power
## 1694                                                                                                                                                   provide
## 1695                                                                                                                                                     rates
## 1696                                                                                                                                                 reporting
## 1697                                                                                                                                                    review
## 1698                                                                                                                                                      riot
## 1699                                                                                                                                                      spot
## 1700                                                                                                                                                   staying
## 1701                                                                                                                                                     steps
## 1702                                                                                                                                                   survive
## 1703                                                                                                                                                   today�s
## 1704                                                                                                                                                     track
## 1705                                                                                                                                                   twitter
## 1706                                                                                                                                                    unidos
## 1707                                                                                                                                                   updated
## 1708                                                                                                                                                   ustedes
## 1709                                                                                                                                                       war
## 1710                                                                                                                                                      wife
## 1711                                                                                                                                              <u+0001f9a0>
## 1712                                                                                                                                                 arlington
## 1713                                                                                                                                                   calling
## 1714                                                                                                                                                    cancer
## 1715                                                                                                                                                     catch
## 1716                                                                                                                                                    charge
## 1717                                                                                                                                                  district
## 1718                                                                                                                                                   elderly
## 1719                                                                                                                                                 essential
## 1720                                                                                                                                                      est�
## 1721                                                                                                                                                  fighting
## 1722                                                                                                                                                      fire
## 1723                                                                                                                                                    forget
## 1724                                                                                                                                                gatherings
## 1725                                                                                                                                                      hits
## 1726                                                                                                                                   https://t.co/dcsqygqavd
## 1727                                                                                                                                                      huge
## 1728                                                                                                                                                  immunity
## 1729                                                                                                                                               individuals
## 1730                                                                                                                                                   leaders
## 1731                                                                                                                                                   limited
## 1732                                                                                                                                                      mind
## 1733                                                                                                                                                   picture
## 1734                                                                                                                                                positivity
## 1735                                                                                                                                                     rates
## 1736                                                                                                                                                  refusing
## 1737                                                                                                                                              registration
## 1738                                                                                                                                               regulations
## 1739                                                                                                                                               republicans
## 1740                                                                                                                                               responsible
## 1741                                                                                                                                               restaurants
## 1742                                                                                                                                                   running
## 1743                                                                                                                                                  services
## 1744                                                                                                                                                 stefanski
## 1745                                                                                                                                                   stories
## 1746                                                                                                                                                     takes
## 1747                                                                                                                                                   there�s
## 1748                                                                                                                                                     trust
## 1749                                                                                                                                                   virtual
## 1750                                                                                                                                                    wasn�t
## 1751                                                                                                                                                      yall
## 1752                                                                                                                                                   #espa�a
## 1753                                                                                                                                                   calling
## 1754                                                                                                                                                  capacity
## 1755                                                                                                                                                    chance
## 1756                                                                                                                                                   chicago
## 1757                                                                                                                                                     child
## 1758                                                                                                                                                     court
## 1759                                                                                                                                                   doctors
## 1760                                                                                                                                                    extend
## 1761                                                                                                                                                     folks
## 1762                                                                                                                                                     guess
## 1763                                                                                                                                                    highly
## 1764                                                                                                                                   https://t.co/rfwwhyk7ho
## 1765                                                                                                                                                      info
## 1766                                                                                                                                                     issue
## 1767                                                                                                                                                       job
## 1768                                                                                                                                                      join
## 1769                                                                                                                                                    killed
## 1770                                                                                                                                                     level
## 1771                                                                                                                                                     mayor
## 1772                                                                                                                                                 minnesota
## 1773                                                                                                                                                    police
## 1774                                                                                                                                                 political
## 1775                                                                                                                                                  positivo
## 1776                                                                                                                                                      post
## 1777                                                                                                                                                    puerto
## 1778                                                                                                                                                 returning
## 1779                                                                                                                                                      rico
## 1780                                                                                                                                                    rising
## 1781                                                                                                                                                       ron
## 1782                                                                                                                                                    status
## 1783                                                                                                                                                    strong
## 1784                                                                                                                                                    throat
## 1785                                                                                                                                                      wave
## 1786                                                                                                                                                       win
## 1787                                                                                                                                                      @cnn
## 1788                                                                                                                                                    #trump
## 1789                                                                                                                                                  <u+2800>
## 1790                                                                                                                                                      100k
## 1791                                                                                                                                                    active
## 1792                                                                                                                                                       age
## 1793                                                                                                                                                     avoid
## 1794                                                                                                                                                      beat
## 1795                                                                                                                                                   bottles
## 1796                                                                                                                                                    brazil
## 1797                                                                                                                                                   brought
## 1798                                                                                                                                                   calling
## 1799                                                                                                                                                  campaign
## 1800                                                                                                                                                   caridad
## 1801                                                                                                                                                     casos
## 1802                                                                                                                                                    caused
## 1803                                                                                                                                                  citizens
## 1804                                                                                                                                                    common
## 1805                                                                                                                                               contracting
## 1806                                                                                                                                              conversation
## 1807                                                                                                                                                 corazones
## 1808                                                                                                                                                     cover
## 1809                                                                                                                                                    cuidan
## 1810                                                                                                                                                     cuomo
## 1811                                                                                                                                                  decision
## 1812                                                                                                                                                   effects
## 1813                                                                                                                                                 esperanza
## 1814                                                                                                                                                      fear
## 1815                                                                                                                                                    gather
## 1816                                                                                                                                                   georgia
## 1817                                                                                                                                                      half
## 1818                                                                                                                                                   haven�t
## 1819                                                                                                                                                   houston
## 1820                                                                                                                                                      hurt
## 1821                                                                                                                                                   imagine
## 1822                                                                                                                                                increasing
## 1823                                                                                                                                                 injustice
## 1824                                                                                                                                                    inside
## 1825                                                                                                                                                      i�ll
## 1826                                                                                                                                                    kansas
## 1827                                                                                                                                                   learned
## 1828                                                                                                                                                     light
## 1829                                                                                                                                                 literally
## 1830                                                                                                                                                       low
## 1831                                                                                                                                                    mexico
## 1832                                                                                                                                                      mind
## 1833                                                                                                                                                  movement
## 1834                                                                                                                                                  multiple
## 1835                                                                                                                                                     nazca
## 1836                                                                                                                                                  november
## 1837                                                                                                                                                      pain
## 1838                                                                                                                                                 pandemics
## 1839                                                                                                                                                  personal
## 1840                                                                                                                                                  policies
## 1841                                                                                                                                               precautions
## 1842                                                                                                                                                 providing
## 1843                                                                                                                                                   quienes
## 1844                                                                                                                                                    series
## 1845                                                                                                                                                     short
## 1846                                                                                                                                                      shut
## 1847                                                                                                                                                     spent
## 1848                                                                                                                                                    spikes
## 1849                                                                                                                                                    sports
## 1850                                                                                                                                                        su
## 1851                                                                                                                                                  supposed
## 1852                                                                                                                                                  systemic
## 1853                                                                                                                                                    tengan
## 1854                                                                                                                                                  thisthey
## 1855                                                                                                                                                      tips
## 1856                                                                                                                                                      utah
## 1857                                                                                                                                                   weekend
## 1858                                                                                                                                                @dougducey
## 1859                                                                                                                                                      @gop
## 1860                                                                                                                                               @medstarwhc
## 1861                                                                                                                                                   #browns
## 1862                                                                                                                                                 #pandemic
## 1863                                                                                                                                                    action
## 1864                                                                                                                                                      baby
## 1865                                                                                                                                                     board
## 1866                                                                                                                                                      boys
## 1867                                                                                                                                                    church
## 1868                                                                                                                                                   college
## 1869                                                                                                                                                conspiracy
## 1870                                                                                                                                                   created
## 1871                                                                                                                                                 democrats
## 1872                                                                                                                                                  economic
## 1873                                                                                                                                                    father
## 1874                                                                                                                                                       fun
## 1875                                                                                                                                                   growing
## 1876                                                                                                                                                     guard
## 1877                                                                                                                                                      held
## 1878                                                                                                                                                   helping
## 1879                                                                                                                                                    hoping
## 1880                                                                                                                                                   indiana
## 1881                                                                                                                                                  inperson
## 1882                                                                                                                                                   keeping
## 1883                                                                                                                                                       key
## 1884                                                                                                                                                   leading
## 1885                                                                                                                                                      lies
## 1886                                                                                                                                                     lines
## 1887                                                                                                                                                     means
## 1888                                                                                                                                                 minnesota
## 1889                                                                                                                                                      mrna
## 1890                                                                                                                                                       nfl
## 1891                                                                                                                                                   patient
## 1892                                                                                                                                                      penn
## 1893                                                                                                                                                   playing
## 1894                                                                                                                                                 pneumonia
## 1895                                                                                                                                                   remains
## 1896                                                                                                                                                   state�s
## 1897                                                                                                                                                  teachers
## 1898                                                                                                                                                     teams
## 1899                                                                                                                                                  thursday
## 1900                                                                                                                                                     truth
## 1901                                                                                                                                                    valley
## 1902                                                                                                                                                  watching
## 1903                                                                                                                                                     won�t
## 1904                                                                                                                                                     worth
## 1905                                                                                                                                                       wow
## 1906                                                                                                                                                        ya
## 1907                                                                                                                                                      yeah
## 1908                                                                                                                                                      �the
## 1909                                                                                                                                                @harvard2h
## 1910                                                                                                                                              #newyear2022
## 1911                                                                                                                                                  #testing
## 1912                                                                                                                                                       3rd
## 1913                                                                                                                                                    adults
## 1914                                                                                                                                                   angeles
## 1915                                                                                                                                                  antibody
## 1916                                                                                                                                                   antigen
## 1917                                                                                                                                              appointments
## 1918                                                                                                                                                       bed
## 1919                                                                                                                                                     blame
## 1920                                                                                                                                                 cancelled
## 1921                                                                                                                                                 continues
## 1922                                                                                                                                                 dangerous
## 1923                                                                                                                                                difference
## 1924                                                                                                                                                   earlier
## 1925                                                                                                                                                     email
## 1926                                                                                                                                              experiencing
## 1927                                                                                                                                                     fauci
## 1928                                                                                                                                                     feels
## 1929                                                                                                                                                     gonna
## 1930                                                                                                                                                      head
## 1931                                                                                                                                                     heard
## 1932                                                                                                                                                   helping
## 1933                                                                                                                                                 increased
## 1934                                                                                                                                                      lack
## 1935                                                                                                                                                      late
## 1936                                                                                                                                                     learn
## 1937                                                                                                                                                 locations
## 1938                                                                                                                                                     loved
## 1939                                                                                                                                                  majority
## 1940                                                                                                                                                     march
## 1941                                                                                                                                                   massive
## 1942                                                                                                                                                    moving
## 1943                                                                                                                                                   muertes
## 1944                                                                                                                                                    nation
## 1945                                                                                                                                                    option
## 1946                                                                                                                                                      park
## 1947                                                                                                                                                       pay
## 1948                                                                                                                                                   quality
## 1949                                                                                                                                                     ready
## 1950                                                                                                                                                 reporting
## 1951                                                                                                                                                  research
## 1952                                                                                                                                                   sharing
## 1953                                                                                                                                               significant
## 1954                                                                                                                                                 smartnews
## 1955                                                                                                                                                        st
## 1956                                                                                                                                                   teacher
## 1957                                                                                                                                                     truth
## 1958                                                                                                                                                   #austin
## 1959                                                                                                                                                    affect
## 1960                                                                                                                                                   african
## 1961                                                                                                                                                     agree
## 1962                                                                                                                                                     ain�t
## 1963                                                                                                                                                     alive
## 1964                                                                                                                                               appointment
## 1965                                                                                                                                                    attend
## 1966                                                                                                                                                 beginning
## 1967                                                                                                                                                    brasil
## 1968                                                                                                                                                       car
## 1969                                                                                                                                                conference
## 1970                                                                                                                                                convention
## 1971                                                                                                                                                  counting
## 1972                                                                                                                                                  coverage
## 1973                                                                                                                                                    create
## 1974                                                                                                                                                  critical
## 1975                                                                                                                                                       dad
## 1976                                                                                                                                                    dallas
## 1977                                                                                                                                                    doctor
## 1978                                                                                                                                                       eat
## 1979                                                                                                                                              experiencing
## 1980                                                                                                                                                      form
## 1981                                                                                                                                               governments
## 1982                                                                                                                                                     helps
## 1983                                                                                                                                                      hour
## 1984                                                                                                                                               individuals
## 1985                                                                                                                                                   keeping
## 1986                                                                                                                                                       lie
## 1987                                                                                                                                                 lockdowns
## 1988                                                                                                                                                     meals
## 1989                                                                                                                                                   meeting
## 1990                                                                                                                                                   mention
## 1991                                                                                                                                                   message
## 1992                                                                                                                                                  murdered
## 1993                                                                                                                                                     offer
## 1994                                                                                                                                                  official
## 1995                                                                                                                                                   patient
## 1996                                                                                                                                                    pa�ses
## 1997                                                                                                                                                     piece
## 1998                                                                                                                                                   planned
## 1999                                                                                                                                                      poor
## 2000                                                                                                                                                   praying
## 2001                                                                                                                                                prevention
## 2002                                                                                                                                                   putting
## 2003                                                                                                                                                  reopened
## 2004                                                                                                                                                scientists
## 2005                                                                                                                                                   shields
## 2006                                                                                                                                                     shout
## 2007                                                                                                                                                     space
## 2008                                                                                                                                                      star
## 2009                                                                                                                                                      step
## 2010                                                                                                                                                     stock
## 2011                                                                                                                                                   student
## 2012                                                                                                                                                     super
## 2013                                                                                                                                                  terrible
## 2014                                                                                                                                                     trial
## 2015                                                                                                                                                      tune
## 2016                                                                                                                                                   waiting
## 2017                                                                                                                                                     worth
## 2018                                                                                                                                                      yall
## 2019                                                                                                                                                      @cnn
## 2020                                                                                                                                              @gavinnewsom
## 2021                                                                                                                                           @govrondesantis
## 2022                                                                                                                                          @inovaalexandria
## 2023                                                                                                                                          @inovaffxtrauma1
## 2024                                                                                                                                               @medstarguh
## 2025                                                                                                                                                      @nih
## 2026                                                                                                                                              @vhchospital
## 2027                                                                                                                                                  <u+2705>
## 2028                                                                                                                                                       add
## 2029                                                                                                                                                   african
## 2030                                                                                                                                                  alarming
## 2031                                                                                                                                                        bc
## 2032                                                                                                                                                      beat
## 2033                                                                                                                                                 beginning
## 2034                                                                                                                                                   brother
## 2035                                                                                                                                                    caught
## 2036                                                                                                                                                   changed
## 2037                                                                                                                                                     class
## 2038                                                                                                                                                     click
## 2039                                                                                                                                                    clinic
## 2040                                                                                                                                                       cnn
## 2041                                                                                                                                                      como
## 2042                                                                                                                                                       cut
## 2043                                                                                                                                                      easy
## 2044                                                                                                                                                  extended
## 2045                                                                                                                                                  facebook
## 2046                                                                                                                                                      fast
## 2047                                                                                                                                                 frontline
## 2048                                                                                                                                                    future
## 2049                                                                                                                                                     guess
## 2050                                                                                                                                                  horrible
## 2051                                                                                                                                                       hoy
## 2052                                                                                                                                                     isn�t
## 2053                                                                                                                                                      i�ll
## 2054                                                                                                                                                     leave
## 2055                                                                                                                                                      loss
## 2056                                                                                                                                                      meet
## 2057                                                                                                                                                    mexico
## 2058                                                                                                                                                      mike
## 2059                                                                                                                                                    moving
## 2060                                                                                                                                                        nc
## 2061                                                                                                                                                officially
## 2062                                                                                                                                                      pain
## 2063                                                                                                                                                      park
## 2064                                                                                                                                                    period
## 2065                                                                                                                                                      pero
## 2066                                                                                                                                                       ppl
## 2067                                                                                                                                                   provide
## 2068                                                                                                                                                  provided
## 2069                                                                                                                                                    recent
## 2070                                                                                                                                                  released
## 2071                                                                                                                                            reservecovid19
## 2072                                                                                                                                                  security
## 2073                                                                                                                                                     sense
## 2074                                                                                                                                                     speed
## 2075                                                                                                                                                     spent
## 2076                                                                                                                                                    sports
## 2077                                                                                                                                                    street
## 2078                                                                                                                                                  supposed
## 2079                                                                                                                                                    thread
## 2080                                                                                                                                                     uncle
## 2081                                                                                                                                                university
## 2082                                                                                                                                                    vacuna
## 2083                                                                                                                                                    voting
## 2084                                                                                                                                                 wisconsin
## 2085                                                                                                                                                      @gop
## 2086                                                                                                                                           #omicronvarient
## 2087                                                                                                                                                       1st
## 2088                                                                                                                                            administration
## 2089                                                                                                                                                       age
## 2090                                                                                                                                                      beat
## 2091                                                                                                                                                  building
## 2092                                                                                                                                                      como
## 2093                                                                                                                                                continuing
## 2094                                                                                                                                                  covid19�
## 2095                                                                                                                                                        da
## 2096                                                                                                                                                       dec
## 2097                                                                                                                                                  distance
## 2098                                                                                                                                                experience
## 2099                                                                                                                                                   exposed
## 2100                                                                                                                                                  february
## 2101                                                                                                                                                     house
## 2102                                                                                                                                                        ht
## 2103                                                                                                                                                    immune
## 2104                                                                                                                                                     isn�t
## 2105                                                                                                                                                   leaders
## 2106                                                                                                                                                     lying
## 2107                                                                                                                                                     major
## 2108                                                                                                                                                  measures
## 2109                                                                                                                                                   moderna
## 2110                                                                                                                                                       n95
## 2111                                                                                                                                                       nos
## 2112                                                                                                                                                    notice
## 2113                                                                                                                                                        ny
## 2114                                                                                                                                                   obesity
## 2115                                                                                                                                                  outbreak
## 2116                                                                                                                                                      pray
## 2117                                                                                                                                                  recently
## 2118                                                                                                                                                     rules
## 2119                                                                                                                                                   sending
## 2120                                                                                                                                                  services
## 2121                                                                                                                                                     squad
## 2122                                                                                                                                                  staffing
## 2123                                                                                                                                                     todos
## 2124                                                                                                                                              transmission
## 2125                                                                                                                                                    travel
## 2126                                                                                                                                                      true
## 2127                                                                                                                                                understand
## 2128                                                                                                                                                    vacuna
## 2129                                                                                                                                                   #all512
## 2130                                                                                                                                                      #atx
## 2131                                                                                                                                  #billionshieldschallenge
## 2132                                                                                                                                               #faceshield
## 2133                                                                                                                                       #hydroxychloroquine
## 2134                                                                                                                                                 #pandemic
## 2135                                                                                                                                             #savetheworld
## 2136                                                                                                                                                      #usa
## 2137                                                                                                                                          <u+2714><u+fe0f>
## 2138                                                                                                                                          <u+2764><u+2764>
## 2139                                                                                                                                                       add
## 2140                                                                                                                                                     added
## 2141                                                                                                                                                    amazon
## 2142                                                                                                                                                   answers
## 2143                                                                                                                                                   artists
## 2144                                                                                                                                                     asian
## 2145                                                                                                                                                      baby
## 2146                                                                                                                                                       bar
## 2147                                                                                                                                                      bars
## 2148                                                                                                                                                bcnlegendz
## 2149                                                                                                                                                  bringing
## 2150                                                                                                                                                    cancel
## 2151                                                                                                                                                  canceled
## 2152                                                                                                                                                    cancer
## 2153                                                                                                                                                  churches
## 2154                                                                                                                                                     click
## 2155                                                                                                                                                  clinical
## 2156                                                                                                                                                completely
## 2157                                                                                                                                                    corona
## 2158                                                                                                                                                     court
## 2159                                                                                                                                                      dept
## 2160                                                                                                                                                     donde
## 2161                                                                                                                                                   earlier
## 2162                                                                                                                                                    effect
## 2163                                                                                                                                                 effective
## 2164                                                                                                                                                    effort
## 2165                                                                                                                                                   elderly
## 2166                                                                                                                                                 elections
## 2167                                                                                                                                                     enjoy
## 2168                                                                                                                                                    events
## 2169                                                                                                                                                     exist
## 2170                                                                                                                                                experience
## 2171                                                                                                                                                facilities
## 2172                                                                                                                                                    frisco
## 2173                                                                                                                                                      game
## 2174                                                                                                                                                    giving
## 2175                                                                                                                                                  guidance
## 2176                                                                                                                                                      hair
## 2177                                                                                                                                   https://t.co/8cy7dvvg0g
## 2178                                                                                                                                   https://t.co/q1birbjdj8
## 2179                                                                                                                                                       ice
## 2180                                                                                                                                                   include
## 2181                                                                                                                                                    invito
## 2182                                                                                                                                                      iowa
## 2183                                                                                                                                                      lake
## 2184                                                                                                                                                   largest
## 2185                                                                                                                                                   leaders
## 2186                                                                                                                                                    listen
## 2187                                                                                                                                                   massive
## 2188                                                                                                                                                  medicine
## 2189                                                                                                                                                     moved
## 2190                                                                                                                                                    moving
## 2191                                                                                                                                                  navigate
## 2192                                                                                                                                                      nice
## 2193                                                                                                                                                     peace
## 2194                                                                                                                                                  planning
## 2195                                                                                                                                                    played
## 2196                                                                                                                                                       plz
## 2197                                                                                                                                                    posted
## 2198                                                                                                                                                  practice
## 2199                                                                                                                                                    prayer
## 2200                                                                                                                                                   process
## 2201                                                                                                                                                    queens
## 2202                                                                                                                                                   quickly
## 2203                                                                                                                                                     reach
## 2204                                                                                                                                                   receive
## 2205                                                                                                                                                  received
## 2206                                                                                                                                                   recycle
## 2207                                                                                                                                                    reduce
## 2208                                                                                                                                                  required
## 2209                                                                                                                                                   rioters
## 2210                                                                                                                                                     risks
## 2211                                                                                                                                                      shop
## 2212                                                                                                                                                      soda
## 2213                                                                                                                                                   stopped
## 2214                                                                                                                                                   studies
## 2215                                                                                                                                                   success
## 2216                                                                                                                                                    survey
## 2217                                                                                                                                                  survived
## 2218                                                                                                                                                      task
## 2219                                                                                                                                                   telling
## 2220                                                                                                                                                   tonight
## 2221                                                                                                                                                   tuesday
## 2222                                                                                                                                                   victims
## 2223                                                                                                                                                     water
## 2224                                                                                                                                                   webinar
## 2225                                                                                                                                                       wow
## 2226                                                                                                                                                        �i
## 2227                                                                                                                                                 @inovacph
## 2228                                                                                                                                             @kamalaharris
## 2229                                                                                                                                              @pasenategop
## 2230                                                                                                                                            #covidvacccine
## 2231                                                                                                                                                   #maskup
## 2232                                                                                                                                              <u+0001f351>
## 2233                                                                                                                                                   address
## 2234                                                                                                                                                        ah
## 2235                                                                                                                                                    answer
## 2236                                                                                                                                                   average
## 2237                                                                                                                                                  awwrrite
## 2238                                                                                                                                                     chaos
## 2239                                                                                                                                                   coaches
## 2240                                                                                                                                                colleagues
## 2241                                                                                                                                                conditions
## 2242                                                                                                                                                    credit
## 2243                                                                                                                                                    dallas
## 2244                                                                                                                                                      deal
## 2245                                                                                                                                                      dear
## 2246                                                                                                                                                  democrat
## 2247                                                                                                                                                   details
## 2248                                                                                                                                                 diagnosed
## 2249                                                                                                                                                        er
## 2250                                                                                                                                                       eve
## 2251                                                                                                                                                    events
## 2252                                                                                                                                                   experts
## 2253                                                                                                                                                   explain
## 2254                                                                                                                                                  facility
## 2255                                                                                                                                                     fauci
## 2256                                                                                                                                                 gathering
## 2257                                                                                                                                                   germany
## 2258                                                                                                                                                       guy
## 2259                                                                                                                                                  illinois
## 2260                                                                                                                                                    immune
## 2261                                                                                                                                                infections
## 2262                                                                                                                                                        le
## 2263                                                                                                                                                 locations
## 2264                                                                                                                                                       low
## 2265                                                                                                                                                     major
## 2266                                                                                                                                                  majority
## 2267                                                                                                                                                    market
## 2268                                                                                                                                                     men�s
## 2269                                                                                                                                                      paid
## 2270                                                                                                                                                  personal
## 2271                                                                                                                                                      poor
## 2272                                                                                                                                                     rally
## 2273                                                                                                                                                  recovery
## 2274                                                                                                                                                       red
## 2275                                                                                                                                                    reduce
## 2276                                                                                                                                                  research
## 2277                                                                                                                                                 resources
## 2278                                                                                                                                                restaurant
## 2279                                                                                                                                                      rise
## 2280                                                                                                                                                    rising
## 2281                                                                                                                                                       run
## 2282                                                                                                                                                     sadly
## 2283                                                                                                                                                       san
## 2284                                                                                                                                                     short
## 2285                                                                                                                                                        si
## 2286                                                                                                                                                     spike
## 2287                                                                                                                                                     squad
## 2288                                                                                                                                                   staying
## 2289                                                                                                                                                   student
## 2290                                                                                                                                                  survival
## 2291                                                                                                                                                  terrible
## 2292                                                                                                                                                   they�ve
## 2293                                                                                                                                                   tracing
## 2294                                                                                                                                                  training
## 2295                                                                                                                                                     treat
## 2296                                                                                                                                                     trial
## 2297                                                                                                                                                   trump�s
## 2298                                                                                                                                                        tv
## 2299                                                                                                                                                 vaccinate
## 2300                                                                                                                                                   victims
## 2301                                                                                                                                                  violence
## 2302                                                                                                                                                   vitamin
## 2303                                                                                                                                                     voted
## 2304                                                                                                                                                    weekly
## 2305                                                                                                                                                      west
## 2306                                                                                                                                                       win
## 2307                                                                                                                                                     worry
## 2308                                                                                                                                            @rondesantisfl
## 2309                                                                                                                                              <u+0001f64f>
## 2310                                                                                                                                                       2nd
## 2311                                                                                                                                                    abbott
## 2312                                                                                                                                                additional
## 2313                                                                                                                                                   atlanta
## 2314                                                                                                                                                      body
## 2315                                                                                                                                                    boston
## 2316                                                                                                                                              breakthrough
## 2317                                                                                                                                                      cars
## 2318                                                                                                                                             complications
## 2319                                                                                                                                                     count
## 2320                                                                                                                                                    couple
## 2321                                                                                                                                                      cult
## 2322                                                                                                                                                      damn
## 2323                                                                                                                                                  december
## 2324                                                                                                                                                   defense
## 2325                                                                                                                                                    delays
## 2326                                                                                                                                                       d�a
## 2327                                                                                                                                                      easy
## 2328                                                                                                                                                 education
## 2329                                                                                                                                                    entire
## 2330                                                                                                                                                      fans
## 2331                                                                                                                                                     germs
## 2332                                                                                                                                                    giving
## 2333                                                                                                                                                   greenes
## 2334                                                                                                                                                       hay
## 2335                                                                                                                                                      hour
## 2336                                                                                                                                                       hoy
## 2337                                                                                                                                                      huge
## 2338                                                                                                                                                      idea
## 2339                                                                                                                                                   include
## 2340                                                                                                                                               individuals
## 2341                                                                                                                                                 influenza
## 2342                                                                                                                                                      i�ll
## 2343                                                                                                                                                      kill
## 2344                                                                                                                                                       les
## 2345                                                                                                                                                      lies
## 2346                                                                                                                                                   limited
## 2347                                                                                                                                                    matter
## 2348                                                                                                                                                 neighbors
## 2349                                                                                                                                                     novak
## 2350                                                                                                                                                  offering
## 2351                                                                                                                                                  official
## 2352                                                                                                                                                   patient
## 2353                                                                                                                                                   percent
## 2354                                                                                                                                                    period
## 2355                                                                                                                                                    permit
## 2356                                                                                                                                                     phone
## 2357                                                                                                                                                      pick
## 2358                                                                                                                                                population
## 2359                                                                                                                                                     power
## 2360                                                                                                                                                 providing
## 2361                                                                                                                                                      push
## 2362                                                                                                                                                 recommend
## 2363                                                                                                                                              requirements
## 2364                                                                                                                                                       run
## 2365                                                                                                                                                      solo
## 2366                                                                                                                                                     spent
## 2367                                                                                                                                                   talking
## 2368                                                                                                                                                     teams
## 2369                                                                                                                                                     total
## 2370                                                                                                                                                treatments
## 2371                                                                                                                                                     trust
## 2372                                                                                                                                                   updated
## 2373                                                                                                                                                vulnerable
## 2374                                                                                                                                                    wasn�t
## 2375                                                                                                                                                     watch
## 2376                                                                                                                                              <u+0001f644>
## 2377                                                                                                                                         <u+253b><u+2533>|
## 2378                                                                                                                                                       2nd
## 2379                                                                                                                                                       3rd
## 2380                                                                                                                                                   actions
## 2381                                                                                                                                                 announced
## 2382                                                                                                                                                apparently
## 2383                                                                                                                                                     apply
## 2384                                                                                                                                                  athletes
## 2385                                                                                                                                                    ballot
## 2386                                                                                                                                                     biden
## 2387                                                                                                                                                     bless
## 2388                                                                                                                                                        bs
## 2389                                                                                                                                                    bunker
## 2390                                                                                                                                                   centers
## 2391                                                                                                                                                   central
## 2392                                                                                                                                                challenges
## 2393                                                                                                                                                     chief
## 2394                                                                                                                                                   closure
## 2395                                                                                                                                                 conscious
## 2396                                                                                                                                                 continued
## 2397                                                                                                                                                    contra
## 2398                                                                                                                                                     count
## 2399                                                                                                                                                    crowds
## 2400                                                                                                                                                   decided
## 2401                                                                                                                                                      deep
## 2402                                                                                                                                                 democrats
## 2403                                                                                                                                                 difficult
## 2404                                                                                                                                                   dollars
## 2405                                                                                                                                                     doors
## 2406                                                                                                                                                  download
## 2407                                                                                                                                                 estaremos
## 2408                                                                                                                                                 excellent
## 2409                                                                                                                                                 exclusive
## 2410                                                                                                                                                     field
## 2411                                                                                                                                                    figure
## 2412                                                                                                                                                      fine
## 2413                                                                                                                                                      glad
## 2414                                                                                                                                                  handling
## 2415                                                                                                                                                    hiding
## 2416                                                                                                                                                      hits
## 2417                                                                                                                                                   holding
## 2418                                                                                                                                          hospitalizations
## 2419                                                                                                                                                      host
## 2420                                                                                                                                                   illness
## 2421                                                                                                                                                  industry
## 2422                                                                                                                                                      john
## 2423                                                                                                                                                    lancet
## 2424                                                                                                                                                        le
## 2425                                                                                                                                                    leader
## 2426                                                                                                                                                  learning
## 2427                                                                                                                                                  location
## 2428                                                                                                                                                      loss
## 2429                                                                                                                                                      luck
## 2430                                                                                                                                                management
## 2431                                                                                                                                                  marching
## 2432                                                                                                                                                   matter�
## 2433                                                                                                                                                        md
## 2434                                                                                                                                                    middle
## 2435                                                                                                                                                   officer
## 2436                                                                                                                                                   opinion
## 2437                                                                                                                                                      peak
## 2438                                                                                                                                                     photo
## 2439                                                                                                                                                  physical
## 2440                                                                                                                                                     press
## 2441                                                                                                                                                protecting
## 2442                                                                                                                                                 published
## 2443                                                                                                                                                   reasons
## 2444                                                                                                                                               regulations
## 2445                                                                                                                                                      rest
## 2446                                                                                                                                                 returning
## 2447                                                                                                                                                   rosario
## 2448                                                                                                                                                      save
## 2449                                                                                                                                                       sea
## 2450                                                                                                                                                   session
## 2451                                                                                                                                                  shutdown
## 2452                                                                                                                                                        si
## 2453                                                                                                                                                   sitting
## 2454                                                                                                                                                  stimulus
## 2455                                                                                                                                                  strategy
## 2456                                                                                                                                                    strong
## 2457                                                                                                                                                supporting
## 2458                                                                                                                                                 surviving
## 2459                                                                                                                                                     swabs
## 2460                                                                                                                                                      town
## 2461                                                                                                                                                   tracing
## 2462                                                                                                                                              transmission
## 2463                                                                                                                                                        tu
## 2464                                                                                                                                                    unable
## 2465                                                                                                                                                    varios
## 2466                                                                                                                                                       win
## 2467                                                                                                                                                 wonderful
## 2468                                                                                                                                                     words
## 2469                                                                                                                                                    worker
## 2470                                                                                                                                                     worry
## 2471                                                                                                                                                     youth
## 2472                                                                                                                                                    �black
## 2473                                                                                                                                               @gwhospital
## 2474                                                                                                                                                 @nycmayor
## 2475                                                                                                                                                    @potus
## 2476                                                                                                                                            @speakerpelosi
## 2477                                                                                                                                              <u+0001f602>
## 2478                                                                                                                                              <u+0001f633>
## 2479                                                                                                                                                absolutely
## 2480                                                                                                                                                activities
## 2481                                                                                                                                                     agree
## 2482                                                                                                                                                 ambulance
## 2483                                                                                                                                                 announces
## 2484                                                                                                                                                 attention
## 2485                                                                                                                                                  battling
## 2486                                                                                                                                                       ben
## 2487                                                                                                                                                      book
## 2488                                                                                                                                                     calls
## 2489                                                                                                                                                   capital
## 2490                                                                                                                                                      card
## 2491                                                                                                                                                   charges
## 2492                                                                                                                                                    claims
## 2493                                                                                                                                                    closer
## 2494                                                                                                                                                   concern
## 2495                                                                                                                                                 concerned
## 2496                                                                                                                                                  coverage
## 2497                                                                                                                                                     crazy
## 2498                                                                                                                                                     davis
## 2499                                                                                                                                                   deaths�
## 2500                                                                                                                                                       dec
## 2501                                                                                                                                                 democracy
## 2502                                                                                                                                               distributed
## 2503                                                                                                                                                 education
## 2504                                                                                                                                                    ensure
## 2505                                                                                                                                                      evil
## 2506                                                                                                                                                    failed
## 2507                                                                                                                                                      fans
## 2508                                                                                                                                                  favorite
## 2509                                                                                                                                                       fda
## 2510                                                                                                                                                     field
## 2511                                                                                                                                                      fine
## 2512                                                                                                                                                     fraud
## 2513                                                                                                                                                      hand
## 2514                                                                                                                                                   hearing
## 2515                                                                                                                                                   history
## 2516                                                                                                                                                     homes
## 2517                                                                                                                                                      idea
## 2518                                                                                                                                                identified
## 2519                                                                                                                                               immediately
## 2520                                                                                                                                                    impact
## 2521                                                                                                                                                individual
## 2522                                                                                                                                                infectious
## 2523                                                                                                                                                   insider
## 2524                                                                                                                                             international
## 2525                                                                                                                                                  kentucky
## 2526                                                                                                                                                 lawmakers
## 2527                                                                                                                                                 literally
## 2528                                                                                                                                                      lots
## 2529                                                                                                                                                  maskless
## 2530                                                                                                                                                  measures
## 2531                                                                                                                                                   message
## 2532                                                                                                                                                    moment
## 2533                                                                                                                                                    oxygen
## 2534                                                                                                                                                        pa
## 2535                                                                                                                                                       pcr
## 2536                                                                                                                                                     peace
## 2537                                                                                                                                                    pelosi
## 2538                                                                                                                                                   perfect
## 2539                                                                                                                                                     plans
## 2540                                                                                                                                                    prayer
## 2541                                                                                                                                                  question
## 2542                                                                                                                                                    racism
## 2543                                                                                                                                                    reopen
## 2544                                                                                                                                                     santa
## 2545                                                                                                                                                  sarscov2
## 2546                                                                                                                                                     serve
## 2547                                                                                                                                                    source
## 2548                                                                                                                                                      step
## 2549                                                                                                                                                  strategy
## 2550                                                                                                                                                    strong
## 2551                                                                                                                                                   surgeon
## 2552                                                                                                                                                  thankful
## 2553                                                                                                                                              transmission
## 2554                                                                                                                                                     we�ve
## 2555                                                                                                                                                    winter
## 2556                                                                                                                                                     women
## 2557                                                                                                                                                 wonderful
## 2558                                                                                                                                                      word
## 2559                                                                                                                                                    worker
## 2560                                                                                                                                                        �i
## 2561                                                                                                                                                   @change
## 2562                                                                                                                                                  @walmart
## 2563                                                                                                                                                 #omnicron
## 2564                                                                                                                                                  #schools
## 2565                                                                                                                                               #vaccinated
## 2566                                                                                                                                                  #vaccine
## 2567                                                                                                                                                #wearamask
## 2568                                                                                                                                                  <u+261d>
## 2569                                                                                                                                                       add
## 2570                                                                                                                                                    afraid
## 2571                                                                                                                                                      ages
## 2572                                                                                                                                                     agree
## 2573                                                                                                                                                     ahead
## 2574                                                                                                                                                authorized
## 2575                                                                                                                                                        bc
## 2576                                                                                                                                                    cancer
## 2577                                                                                                                                                 candidate
## 2578                                                                                                                                                       car
## 2579                                                                                                                                                    caused
## 2580                                                                                                                                                     china
## 2581                                                                                                                                                     cloth
## 2582                                                                                                                                                 confirmed
## 2583                                                                                                                                                contracted
## 2584                                                                                                                                                     cough
## 2585                                                                                                                                                   created
## 2586                                                                                                                                                      deal
## 2587                                                                                                                                                    demand
## 2588                                                                                                                                                    denied
## 2589                                                                                                                                                    deputy
## 2590                                                                                                                                                 difficult
## 2591                                                                                                                                                      dios
## 2592                                                                                                                                                     drive
## 2593                                                                                                                                                 drivethru
## 2594                                                                                                                                                   effects
## 2595                                                                                                                                                     entry
## 2596                                                                                                                                                     ernby
## 2597                                                                                                                                                      est�
## 2598                                                                                                                                                   expired
## 2599                                                                                                                                                      fake
## 2600                                                                                                                                                      fuck
## 2601                                                                                                                                                    future
## 2602                                                                                                                                                      hana
## 2603                                                                                                                                                   history
## 2604                                                                                                                                           hospitalization
## 2605                                                                                                                                                    israel
## 2606                                                                                                                                                     jesus
## 2607                                                                                                                                                       lab
## 2608                                                                                                                                                        le
## 2609                                                                                                                                                   masking
## 2610                                                                                                                                                  medicine
## 2611                                                                                                                                                   message
## 2612                                                                                                                                                 mutations
## 2613                                                                                                                                                      peak
## 2614                                                                                                                                                  personas
## 2615                                                                                                                                                    posted
## 2616                                                                                                                                                     quick
## 2617                                                                                                                                                   reasons
## 2618                                                                                                                                                  released
## 2619                                                                                                                                                   require
## 2620                                                                                                                                               rescheduled
## 2621                                                                                                                                                   retweet
## 2622                                                                                                                                                scientists
## 2623                                                                                                                                                  semester
## 2624                                                                                                                                                   service
## 2625                                                                                                                                                    source
## 2626                                                                                                                                                    stupid
## 2627                                                                                                                                                    supply
## 2628                                                                                                                                                   symptom
## 2629                                                                                                                                                     takes
## 2630                                                                                                                                                   they�re
## 2631                                                                                                                                                  virginia
## 2632                                                                                                                                                     we�ve
## 2633                                                                                                                                                     won�t
## 2634                                                                                                                                              @mayorbowser
## 2635                                                                                                                                                   #health
## 2636                                                                                                                                         #socialdistancing
## 2637                                                                                                                                              <u+0001f6a8>
## 2638                                                                                                                                         <u+2533><u+253b>|
## 2639                                                                                                                                                      414m
## 2640                                                                                                                                                      530t
## 2641                                                                                                                                                    agenda
## 2642                                                                                                                                                       air
## 2643                                                                                                                                                    answer
## 2644                                                                                                                                                 attention
## 2645                                                                                                                                                        a�
## 2646                                                                                                                                                      beer
## 2647                                                                                                                                                  benefits
## 2648                                                                                                                                                      blue
## 2649                                                                                                                                                       buy
## 2650                                                                                                                                                     calls
## 2651                                                                                                                                                 cancelled
## 2652                                                                                                                                                   casinos
## 2653                                                                                                                                                     catch
## 2654                                                                                                                                                    charge
## 2655                                                                                                                                                   chicago
## 2656                                                                                                                                                   chinese
## 2657                                                                                                                                                   college
## 2658                                                                                                                                                   concern
## 2659                                                                                                                                                conspiracy
## 2660                                                                                                                                                 continues
## 2661                                                                                                                                                      cost
## 2662                                                                                                                                                      dear
## 2663                                                                                                                                                   deficit
## 2664                                                                                                                                                depression
## 2665                                                                                                                                                difference
## 2666                                                                                                                                                  donating
## 2667                                                                                                                                                  donation
## 2668                                                                                                                                                     doubt
## 2669                                                                                                                                                      easy
## 2670                                                                                                                                                  election
## 2671                                                                                                                                                    entire
## 2672                                                                                                                                                  evidence
## 2673                                                                                                                                                    expect
## 2674                                                                                                                                                  exposure
## 2675                                                                                                                                                 financial
## 2676                                                                                                                                                   fitness
## 2677                                                                                                                                                        fl
## 2678                                                                                                                                                    floyds
## 2679                                                                                                                                                       fox
## 2680                                                                                                                                                 frontline
## 2681                                                                                                                                                   growing
## 2682                                                                                                                                                    hasn�t
## 2683                                                                                                                                                       hay
## 2684                                                                                                                                                     honor
## 2685                                                                                                                                                    income
## 2686                                                                                                                                               incompetent
## 2687                                                                                                                                                incredible
## 2688                                                                                                                                                  interfer
## 2689                                                                                                                                                  isolated
## 2690                                                                                                                                                       i�d
## 2691                                                                                                                                                      knee
## 2692                                                                                                                                                   letting
## 2693                                                                                                                                                 locations
## 2694                                                                                                                                                   looters
## 2695                                                                                                                                                      meet
## 2696                                                                                                                                                      mess
## 2697                                                                                                                                                  michigan
## 2698                                                                                                                                                     midst
## 2699                                                                                                                                                    owners
## 2700                                                                                                                                                  partners
## 2701                                                                                                                                               partnership
## 2702                                                                                                                                                    period
## 2703                                                                                                                                                     phone
## 2704                                                                                                                                                   playing
## 2705                                                                                                                                                   posting
## 2706                                                                                                                                                       ppe
## 2707                                                                                                                                                     pride
## 2708                                                                                                                                                  provided
## 2709                                                                                                                                                    raised
## 2710                                                                                                                                                   reality
## 2711                                                                                                                                                   realize
## 2712                                                                                                                                                   recover
## 2713                                                                                                                                                       red
## 2714                                                                                                                                                      road
## 2715                                                                                                                                                     rules
## 2716                                                                                                                                                     salud
## 2717                                                                                                                                                   serving
## 2718                                                                                                                                                    severe
## 2719                                                                                                                                                     she�s
## 2720                                                                                                                                                     sites
## 2721                                                                                                                                                    starts
## 2722                                                                                                                                                 statement
## 2723                                                                                                                                                     storm
## 2724                                                                                                                                                       sun
## 2725                                                                                                                                                   systems
## 2726                                                                                                                                                       to�
## 2727                                                                                                                                                     trust
## 2728                                                                                                                                             unprecedented
## 2729                                                                                                                                                     usual
## 2730                                                                                                                                                      wake
## 2731                                                                                                                                                      walk
## 2732                                                                                                                                                      wash
## 2733                                                                                                                                                 wisconsin
## 2734                                                                                                                                                     woman
## 2735                                                                                                                                                 @usmayors
## 2736                                                                                                                                              <u+0001f644>
## 2737                                                                                                                                              <u+0001f914>
## 2738                                                                                                                                                        1b
## 2739                                                                                                                                                      1day
## 2740                                                                                                                                                  affected
## 2741                                                                                                                                                       air
## 2742                                                                                                                                                       aka
## 2743                                                                                                                                                  approval
## 2744                                                                                                                                                      appt
## 2745                                                                                                                                                 argentina
## 2746                                                                                                                                                      bags
## 2747                                                                                                                                                      bars
## 2748                                                                                                                                                 beautiful
## 2749                                                                                                                                                      bowl
## 2750                                                                                                                                                    brazil
## 2751                                                                                                                                                    campus
## 2752                                                                                                                                                challenges
## 2753                                                                                                                                                     chief
## 2754                                                                                                                                                   citizen
## 2755                                                                                                                                                  colombia
## 2756                                                                                                                                           congratulations
## 2757                                                                                                                                                contracted
## 2758                                                                                                                                               contracting
## 2759                                                                                                                                                  critical
## 2760                                                                                                                                                  daughter
## 2761                                                                                                                                                discovered
## 2762                                                                                                                                                    donald
## 2763                                                                                                                                                      drug
## 2764                                                                                                                                                        em
## 2765                                                                                                                                                 extremely
## 2766                                                                                                                                                      fall
## 2767                                                                                                                                                     final
## 2768                                                                                                                                                  football
## 2769                                                                                                                                                     force
## 2770                                                                                                                                                    france
## 2771                                                                                                                                                      hair
## 2772                                                                                                                                                     helps
## 2773                                                                                                                                                  holidays
## 2774                                                                                                                                                 insurance
## 2775                                                                                                                                                      iran
## 2776                                                                                                                                                 isolation
## 2777                                                                                                                                                     italy
## 2778                                                                                                                                                      joke
## 2779                                                                                                                                                     kinda
## 2780                                                                                                                                                      lack
## 2781                                                                                                                                                     level
## 2782                                                                                                                                                      lied
## 2783                                                                                                                                                    listen
## 2784                                                                                                                                                    missed
## 2785                                                                                                                                                    notice
## 2786                                                                                                                                               overwhelmed
## 2787                                                                                                                                                    played
## 2788                                                                                                                                                    policy
## 2789                                                                                                                                               politicians
## 2790                                                                                                                                               possibility
## 2791                                                                                                                                                prevention
## 2792                                                                                                                                                    proper
## 2793                                                                                                                                                 providing
## 2794                                                                                                                                                   pushing
## 2795                                                                                                                                                    racist
## 2796                                                                                                                                                  recently
## 2797                                                                                                                                                   recover
## 2798                                                                                                                                                    region
## 2799                                                                                                                                                 returning
## 2800                                                                                                                                                       rid
## 2801                                                                                                                                                   sending
## 2802                                                                                                                                                    simply
## 2803                                                                                                                                                   society
## 2804                                                                                                                                                  southern
## 2805                                                                                                                                                     stand
## 2806                                                                                                                                                    status
## 2807                                                                                                                                                     steps
## 2808                                                                                                                                                   talking
## 2809                                                                                                                                                   telling
## 2810                                                                                                                                                     tells
## 2811                                                                                                                                                      text
## 2812                                                                                                                                                      trip
## 2813                                                                                                                                                     usual
## 2814                                                                                                                                                      wash
## 2815                                                                                                                                                      wild
## 2816                                                                                                                                                   women�s
## 2817                                                                                                                                                        yo
## 2818                                                                                                                                                    you�ve
## 2819                                                                                                                                             @gregabbotttx
## 2820                                                                                                                                                 @joerogan
## 2821                                                                                                                                                  #flurona
## 2822                                                                                                                                            #getvaccinated
## 2823                                                                                                                                             #happynewyear
## 2824                                                                                                                                                      #usa
## 2825                                                                                                                                              <u+0001f602>
## 2826                                                                                                                                          <u+2b07><u+fe0f>
## 2827                                                                                                                                                absolutely
## 2828                                                                                                                                                 activated
## 2829                                                                                                                                                   allowed
## 2830                                                                                                                                                    amount
## 2831                                                                                                                                                    answer
## 2832                                                                                                                                                     avoid
## 2833                                                                                                                                                     based
## 2834                                                                                                                                                       bay
## 2835                                                                                                                                                     begin
## 2836                                                                                                                                                     black
## 2837                                                                                                                                                    bought
## 2838                                                                                                                                                     calls
## 2839                                                                                                                                                    cancel
## 2840                                                                                                                                                     catch
## 2841                                                                                                                                                    caught
## 2842                                                                                                                                                        cb
## 2843                                                                                                                                                   centers
## 2844                                                                                                                                                   changed
## 2845                                                                                                                                                     class
## 2846                                                                                                                                                     click
## 2847                                                                                                                                                   company
## 2848                                                                                                                                                  compared
## 2849                                                                                                                                                completely
## 2850                                                                                                                                                  contract
## 2851                                                                                                                                               contracting
## 2852                                                                                                                                                    crisis
## 2853                                                                                                                                                    cruise
## 2854                                                                                                                                                    dallas
## 2855                                                                                                                                                    deadly
## 2856                                                                                                                                                     delay
## 2857                                                                                                                                                  disaster
## 2858                                                                                                                                                distancing
## 2859                                                                                                                                                     doses
## 2860                                                                                                                                                    eating
## 2861                                                                                                                                                     empty
## 2862                                                                                                                                                   experts
## 2863                                                                                                                                                    father
## 2864                                                                                                                                                      fear
## 2865                                                                                                                                                       feb
## 2866                                                                                                                                                      fire
## 2867                                                                                                                                                   flurona
## 2868                                                                                                                                                 francisco
## 2869                                                                                                                                                  grateful
## 2870                                                                                                                                                        ha
## 2871                                                                                                                                                      hall
## 2872                                                                                                                                                     hands
## 2873                                                                                                                                                  happened
## 2874                                                                                                                                                      host
## 2875                                                                                                                                   https://t.co/bn1q5xd7do
## 2876                                                                                                                                   https://t.co/v1fv2pwbcd
## 2877                                                                                                                                                    humans
## 2878                                                                                                                                                increasing
## 2879                                                                                                                                                   johnson
## 2880                                                                                                                                                   keeping
## 2881                                                                                                                                                     kelly
## 2882                                                                                                                                                   killing
## 2883                                                                                                                                                       law
## 2884                                                                                                                                                        lb
## 2885                                                                                                                                                   learned
## 2886                                                                                                                                                       lol
## 2887                                                                                                                                                       low
## 2888                                                                                                                                                      luck
## 2889                                                                                                                                                      meet
## 2890                                                                                                                                                  military
## 2891                                                                                                                                                  november
## 2892                                                                                                                                                       pau
## 2893                                                                                                                                                      pero
## 2894                                                                                                                                                   playing
## 2895                                                                                                                                                  previous
## 2896                                                                                                                                                     reach
## 2897                                                                                                                                               recommended
## 2898                                                                                                                                                       red
## 2899                                                                                                                                                    relief
## 2900                                                                                                                                                  sarscov2
## 2901                                                                                                                                                 scheduled
## 2902                                                                                                                                                 scientist
## 2903                                                                                                                                                 shortages
## 2904                                                                                                                                                    single
## 2905                                                                                                                                                      slow
## 2906                                                                                                                                                     speak
## 2907                                                                                                                                                   spreads
## 2908                                                                                                                                                 statement
## 2909                                                                                                                                                     sucks
## 2910                                                                                                                                                 suffering
## 2911                                                                                                                                                     teens
## 2912                                                                                                                                                    thread
## 2913                                                                                                                                                    triple
## 2914                                                                                                                                                       usa
## 2915                                                                                                                                                     video
## 2916                                                                                                                                                   viruses
## 2917                                                                                                                                                washington
## 2918                                                                                                                                                    weekly
## 2919                                                                                                                                                    what�s
## 2920                                                                                                                                                      wife
## 2921                                                                                                                                                   worried
## 2922                                                                                                                                                     y�all
## 2923                                                                                                                                                      @gop
## 2924                                                                                                                                                 @joebiden
## 2925                                                                                                                                    #justiceforgeorgefloyd
## 2926                                                                                                                                                  <u+2705>
## 2927                                                                                                                                          <u+2764><u+fe0f>
## 2928                                                                                                                                                absolutely
## 2929                                                                                                                                                    actual
## 2930                                                                                                                                                    afraid
## 2931                                                                                                                                                  allowing
## 2932                                                                                                                                                      and�
## 2933                                                                                                                                                    annual
## 2934                                                                                                                                                   anxiety
## 2935                                                                                                                                                    arrest
## 2936                                                                                                                                                       bet
## 2937                                                                                                                                                     board
## 2938                                                                                                                                                     break
## 2939                                                                                                                                                    breath
## 2940                                                                                                                                                  briefing
## 2941                                                                                                                                                   brother
## 2942                                                                                                                                                      cash
## 2943                                                                                                                                                 celebrate
## 2944                                                                                                                                               celebration
## 2945                                                                                                                                                  ceremony
## 2946                                                                                                                                                     child
## 2947                                                                                                                                                   closing
## 2948                                                                                                                                                 companies
## 2949                                                                                                                                              consequences
## 2950                                                                                                                                                contracted
## 2951                                                                                                                                                       cop
## 2952                                                                                                                                                  creating
## 2953                                                                                                                                                   curfews
## 2954                                                                                                                                                  customer
## 2955                                                                                                                                                    damage
## 2956                                                                                                                                                  delivery
## 2957                                                                                                                                                   destroy
## 2958                                                                                                                                                      dies
## 2959                                                                                                                                                   digital
## 2960                                                                                                                                               disparities
## 2961                                                                                                                                               disruptions
## 2962                                                                                                                                                  district
## 2963                                                                                                                                                  downtown
## 2964                                                                                                                                                      drew
## 2965                                                                                                                                                      drop
## 2966                                                                                                                                                     drugs
## 2967                                                                                                                                                    estate
## 2968                                                                                                                                                      est�
## 2969                                                                                                                                                      eyes
## 2970                                                                                                                                                  facility
## 2971                                                                                                                                                   factory
## 2972                                                                                                                                                   funding
## 2973                                                                                                                                                gatherings
## 2974                                                                                                                                                      goal
## 2975                                                                                                                                                     gotta
## 2976                                                                                                                                                 governors
## 2977                                                                                                                                                 gristedes
## 2978                                                                                                                                                    handle
## 2979                                                                                                                                                       hcq
## 2980                                                                                                                                                    hoping
## 2981                                                                                                                                           hospitalization
## 2982                                                                                                                                                     hotel
## 2983                                                                                                                                                       hoy
## 2984                                                                                                                                                  ignoring
## 2985                                                                                                                                                infections
## 2986                                                                                                                                                  inperson
## 2987                                                                                                                                                      jail
## 2988                                                                                                                                                   january
## 2989                                                                                                                                                      jump
## 2990                                                                                                                                                       key
## 2991                                                                                                                                                     kills
## 2992                                                                                                                                                     legal
## 2993                                                                                                                                                      lies
## 2994                                                                                                                                                    looked
## 2995                                                                                                                                                      mail
## 2996                                                                                                                                                   matters
## 2997                                                                                                                                                      meal
## 2998                                                                                                                                                     meant
## 2999                                                                                                                                                     miami
## 3000                                                                                                                                                      neck
## 3001                                                                                                                                                 neighbors
## 3002                                                                                                                                                     nurse
## 3003                                                                                                                                                    nurses
## 3004                                                                                                                                                    orange
## 3005                                                                                                                                                      orgs
## 3006                                                                                                                                                   orleans
## 3007                                                                                                                                                  pandemia
## 3008                                                                                                                                                   passing
## 3009                                                                                                                                                    player
## 3010                                                                                                                                                       ppp
## 3011                                                                                                                                                    praise
## 3012                                                                                                                                                  prepared
## 3013                                                                                                                                                procedures
## 3014                                                                                                                                                protection
## 3015                                                                                                                                                   pruebas
## 3016                                                                                                                                                    pulled
## 3017                                                                                                                                                     raise
## 3018                                                                                                                                                republican
## 3019                                                                                                                                                      rich
## 3020                                                                                                                                                      role
## 3021                                                                                                                                                     scary
## 3022                                                                                                                                                  schedule
## 3023                                                                                                                                                      send
## 3024                                                                                                                                                   sharing
## 3025                                                                                                                                                   similar
## 3026                                                                                                                                                    simply
## 3027                                                                                                                                                       sit
## 3028                                                                                                                                                     sobre
## 3029                                                                                                                                                     sound
## 3030                                                                                                                                                    source
## 3031                                                                                                                                                     spend
## 3032                                                                                                                                                  standing
## 3033                                                                                                                                                   stories
## 3034                                                                                                                                              supermarkets
## 3035                                                                                                                                                   suspect
## 3036                                                                                                                                                    target
## 3037                                                                                                                                                    thread
## 3038                                                                                                                                                    todays
## 3039                                                                                                                                                      todo
## 3040                                                                                                                                                   totally
## 3041                                                                                                                                                     tough
## 3042                                                                                                                                                      tour
## 3043                                                                                                                                                  tracking
## 3044                                                                                                                                                    trials
## 3045                                                                                                                                                     wanna
## 3046                                                                                                                                                      weak
## 3047                                                                                                                                                      west
## 3048                                                                                                                                                        yo
## 3049                                                                                                                                                    you�ll
## 3050                                                                                                                                                      zoom
## 3051                                                                                                                                            @childrensnatl
## 3052                                                                                                                                                      @fda
## 3053                                                                                                                                                 @hawleymo
## 3054                                                                                                                                              @kenpaxtontx
## 3055                                                                                                                                            @natlgovsassoc
## 3056                                                                                                                                                      @nhs
## 3057                                                                                                                                                @ourmayors
## 3058                                                                                                                                               @pahousegop
## 3059                                                                                                                                                       @vp
## 3060                                                                                                                                                 #breaking
## 3061                                                                                                                                                    #trump
## 3062                                                                                                                                              #vaccination
## 3063                                                                                                                                                      ages
## 3064                                                                                                                                                     ahead
## 3065                                                                                                                                                  announce
## 3066                                                                                                                                                antibodies
## 3067                                                                                                                                                  approved
## 3068                                                                                                                                                    attack
## 3069                                                                                                                                                 attending
## 3070                                                                                                                                                     based
## 3071                                                                                                                                                    begins
## 3072                                                                                                                                                   billion
## 3073                                                                                                                                                     broke
## 3074                                                                                                                                                   brought
## 3075                                                                                                                                                  catching
## 3076                                                                                                                                                     cells
## 3077                                                                                                                                                    chafin
## 3078                                                                                                                                                   checked
## 3079                                                                                                                                                    checks
## 3080                                                                                                                                                      cold
## 3081                                                                                                                                                    common
## 3082                                                                                                                                                 companies
## 3083                                                                                                                                                   company
## 3084                                                                                                                                                conference
## 3085                                                                                                                                                   confirm
## 3086                                                                                                                                                      cost
## 3087                                                                                                                                                  couldn�t
## 3088                                                                                                                                                  customer
## 3089                                                                                                                                                 destroyed
## 3090                                                                                                                                                disgusting
## 3091                                                                                                                                                       dna
## 3092                                                                                                                                                  elevated
## 3093                                                                                                                                                      este
## 3094                                                                                                                                                 excellent
## 3095                                                                                                                                               experienced
## 3096                                                                                                                                                     extra
## 3097                                                                                                                                                     feels
## 3098                                                                                                                                                     floor
## 3099                                                                                                                                                    forced
## 3100                                                                                                                                                      form
## 3101                                                                                                                                                   funeral
## 3102                                                                                                                                                     funny
## 3103                                                                                                                                                     grant
## 3104                                                                                                                                                      grow
## 3105                                                                                                                                                       gym
## 3106                                                                                                                                                   husband
## 3107                                                                                                                                                   include
## 3108                                                                                                                                                increasing
## 3109                                                                                                                                                 indonesia
## 3110                                                                                                                                                ivermectin
## 3111                                                                                                                                                      jobs
## 3112                                                                                                                                                       joe
## 3113                                                                                                                                                   johnson
## 3114                                                                                                                                                       law
## 3115                                                                                                                                                   learned
## 3116                                                                                                                                                    legend
## 3117                                                                                                                                                      lock
## 3118                                                                                                                                                     lucky
## 3119                                                                                                                                                       mad
## 3120                                                                                                                                                   massive
## 3121                                                                                                                                                 mcconnell
## 3122                                                                                                                                                  medicine
## 3123                                                                                                                                                   missing
## 3124                                                                                                                                                     mitch
## 3125                                                                                                                                                     model
## 3126                                                                                                                                                 mortality
## 3127                                                                                                                                                  mutation
## 3128                                                                                                                                                     paper
## 3129                                                                                                                                                   parties
## 3130                                                                                                                                                      pass
## 3131                                                                                                                                                    paying
## 3132                                                                                                                                                   percent
## 3133                                                                                                                                                physicians
## 3134                                                                                                                                                  planning
## 3135                                                                                                                                                  policies
## 3136                                                                                                                                                    portal
## 3137                                                                                                                                                   prevent
## 3138                                                                                                                                                  priority
## 3139                                                                                                                                                       pro
## 3140                                                                                                                                                  protocol
## 3141                                                                                                                                                   rallies
## 3142                                                                                                                                                     rapid
## 3143                                                                                                                                                   reached
## 3144                                                                                                                                                   release
## 3145                                                                                                                                                      rent
## 3146                                                                                                                                                      role
## 3147                                                                                                                                                    saving
## 3148                                                                                                                                                    scared
## 3149                                                                                                                                                     scary
## 3150                                                                                                                                                    series
## 3151                                                                                                                                                   session
## 3152                                                                                                                                                   sharing
## 3153                                                                                                                                                    sister
## 3154                                                                                                                                                   sitting
## 3155                                                                                                                                                   speaker
## 3156                                                                                                                                                  speaking
## 3157                                                                                                                                                     spend
## 3158                                                                                                                                                 statement
## 3159                                                                                                                                                 struggles
## 3160                                                                                                                                                    summer
## 3161                                                                                                                                               symptomatic
## 3162                                                                                                                                                       tax
## 3163                                                                                                                                                       ten
## 3164                                                                                                                                                     todos
## 3165                                                                                                                                                     tough
## 3166                                                                                                                                                      town
## 3167                                                                                                                                                    trials
## 3168                                                                                                                                                      tune
## 3169                                                                                                                                                        uc
## 3170                                                                                                                                                    unique
## 3171                                                                                                                                                vulnerable
## 3172                                                                                                                                                      wake
## 3173                                                                                                                                                   watched
## 3174                                                                                                                                                  wouldn�t
## 3175                                                                                                                                                    year�s
## 3176                                                                                                                                                     youth
## 3177                                                                                                                                                      @aoc
## 3178                                                                                                                                          @nychealthsystem
## 3179                                                                                                                                                   @repmtg
## 3180                                                                                                                                           @susiesopinions
## 3181                                                                                                                                             #covidvaccine
## 3182                                                                                                                                               #nhpolitics
## 3183                                                                                                                                             #omicronvirus
## 3184                                                                                                                                                    #texas
## 3185                                                                                                                                                       3pm
## 3186                                                                                                                                                 afternoon
## 3187                                                                                                                                                  announce
## 3188                                                                                                                                               antivaxxers
## 3189                                                                                                                                                   anymore
## 3190                                                                                                                                                australian
## 3191                                                                                                                                                   blaming
## 3192                                                                                                                                                     board
## 3193                                                                                                                                                   brought
## 3194                                                                                                                                                        bs
## 3195                                                                                                                                                  campaign
## 3196                                                                                                                                                      card
## 3197                                                                                                                                                     chief
## 3198                                                                                                                                                    church
## 3199                                                                                                                                                  citizens
## 3200                                                                                                                                                   closing
## 3201                                                                                                                                                   college
## 3202                                                                                                                                                  complete
## 3203                                                                                                                                                conditions
## 3204                                                                                                                                                 covid19�s
## 3205                                                                                                                                                    create
## 3206                                                                                                                                                  daughter
## 3207                                                                                                                                                   decided
## 3208                                                                                                                                                   delayed
## 3209                                                                                                                                                 developed
## 3210                                                                                                                                                 diagnosis
## 3211                                                                                                                                               distributed
## 3212                                                                                                                                              distribution
## 3213                                                                                                                                                       dot
## 3214                                                                                                                                                       eat
## 3215                                                                                                                                                    effect
## 3216                                                                                                                                                   elected
## 3217                                                                                                                                                   emerged
## 3218                                                                                                                                                    ensure
## 3219                                                                                                                                                    expect
## 3220                                                                                                                                                    expert
## 3221                                                                                                                                                   explain
## 3222                                                                                                                                                 extremely
## 3223                                                                                                                                                  facebook
## 3224                                                                                                                                                     final
## 3225                                                                                                                                                    flight
## 3226                                                                                                                                                floridians
## 3227                                                                                                                                                   georgia
## 3228                                                                                                                                                      hand
## 3229                                                                                                                                                      hate
## 3230                                                                                                                                                    heerak
## 3231                                                                                                                                                  informed
## 3232                                                                                                                                                     judge
## 3233                                                                                                                                                   library
## 3234                                                                                                                                                 literally
## 3235                                                                                                                                                  location
## 3236                                                                                                                                                      loss
## 3237                                                                                                                                                   minutes
## 3238                                                                                                                                                       mom
## 3239                                                                                                                                                      move
## 3240                                                                                                                                                     moved
## 3241                                                                                                                                                      mrna
## 3242                                                                                                                                                     offer
## 3243                                                                                                                                                  officers
## 3244                                                                                                                                                    oregon
## 3245                                                                                                                                                      paid
## 3246                                                                                                                                                      pass
## 3247                                                                                                                                                 pediatric
## 3248                                                                                                                                               precautions
## 3249                                                                                                                                                     press
## 3250                                                                                                                                                     prior
## 3251                                                                                                                                                   process
## 3252                                                                                                                                                   realize
## 3253                                                                                                                                                    reduce
## 3254                                                                                                                                                   release
## 3255                                                                                                                                                       rep
## 3256                                                                                                                                                   reporta
## 3257                                                                                                                                                republican
## 3258                                                                                                                                               republicans
## 3259                                                                                                                                                 requiring
## 3260                                                                                                                                                 resources
## 3261                                                                                                                                                    robert
## 3262                                                                                                                                                sacramento
## 3263                                                                                                                                                      save
## 3264                                                                                                                                                 secretary
## 3265                                                                                                                                                     serve
## 3266                                                                                                                                                 situation
## 3267                                                                                                                                                      snow
## 3268                                                                                                                                                    speedy
## 3269                                                                                                                                                   stadium
## 3270                                                                                                                                                     stock
## 3271                                                                                                                                                    strain
## 3272                                                                                                                                                    stream
## 3273                                                                                                                                                    surges
## 3274                                                                                                                                                     tired
## 3275                                                                                                                                                   today�s
## 3276                                                                                                                                                        va
## 3277                                                                                                                                                 vacunados
## 3278                                                                                                                                                      walk
## 3279                                                                                                                                                  watching
## 3280                                                                                                                                                      west
## 3281                                                                                                                                                     worry
## 3282                                                                                                                                                     worst
## 3283                                                                                                                                                       wow
## 3284                                                                                                                                       #blacklivesmattters
## 3285                                                                                                                                                      #nyc
## 3286                                                                                                                                                addressing
## 3287                                                                                                                                                   advance
## 3288                                                                                                                                                       aid
## 3289                                                                                                                                                      arts
## 3290                                                                                                                                                    assume
## 3291                                                                                                                                                   average
## 3292                                                                                                                                                   awesome
## 3293                                                                                                                                                        az
## 3294                                                                                                                                                    barely
## 3295                                                                                                                                                  baseball
## 3296                                                                                                                                                    blacks
## 3297                                                                                                                                                    boston
## 3298                                                                                                                                                       boy
## 3299                                                                                                                                                     brees
## 3300                                                                                                                                                  brooklyn
## 3301                                                                                                                                                      busy
## 3302                                                                                                                                                    buying
## 3303                                                                                                                                                      camp
## 3304                                                                                                                                                    campus
## 3305                                                                                                                                                   careful
## 3306                                                                                                                                                  carolina
## 3307                                                                                                                                                     claim
## 3308                                                                                                                                                     clean
## 3309                                                                                                                                                   clients
## 3310                                                                                                                                                       cnn
## 3311                                                                                                                                                     coach
## 3312                                                                                                                                                  colorado
## 3313                                                                                                                                                    combat
## 3314                                                                                                                                                 committee
## 3315                                                                                                                                             complications
## 3316                                                                                                                                           congratulations
## 3317                                                                                                                                                controlled
## 3318                                                                                                                                                      cool
## 3319                                                                                                                                                 countries
## 3320                                                                                                                                                    credit
## 3321                                                                                                                                                     crime
## 3322                                                                                                                                                critically
## 3323                                                                                                                                                        da
## 3324                                                                                                                                                     david
## 3325                                                                                                                                                    demand
## 3326                                                                                                                                                    dining
## 3327                                                                                                                                                  disaster
## 3328                                                                                                                                          disproportionate
## 3329                                                                                                                                                 districts
## 3330                                                                                                                                                     doses
## 3331                                                                                                                                                      dumb
## 3332                                                                                                                                                    eating
## 3333                                                                                                                                                 encourage
## 3334                                                                                                                                                    energy
## 3335                                                                                                                                                    ensure
## 3336                                                                                                                                               environment
## 3337                                                                                                                                                   episode
## 3338                                                                                                                                                      esta
## 3339                                                                                                                                                   explain
## 3340                                                                                                                                                   failing
## 3341                                                                                                                                                      fair
## 3342                                                                                                                                                       fan
## 3343                                                                                                                                                      fans
## 3344                                                                                                                                                  feelings
## 3345                                                                                                                                                  finished
## 3346                                                                                                                                                     focus
## 3347                                                                                                                                                    forgot
## 3348                                                                                                                                                      girl
## 3349                                                                                                                                                  gofundme
## 3350                                                                                                                                                       gun
## 3351                                                                                                                                                      held
## 3352                                                                                                                                                     hides
## 3353                                                                                                                                              hospitalized
## 3354                                                                                                                                                       icu
## 3355                                                                                                                                                     idiot
## 3356                                                                                                                                                  illinois
## 3357                                                                                                                                                    immune
## 3358                                                                                                                                                  innocent
## 3359                                                                                                                                             international
## 3360                                                                                                                                                        jr
## 3361                                                                                                                                                      keys
## 3362                                                                                                                                                   leading
## 3363                                                                                                                                                    letter
## 3364                                                                                                                                                    levels
## 3365                                                                                                                                                  liberals
## 3366                                                                                                                                                      lose
## 3367                                                                                                                                                 louisiana
## 3368                                                                                                                                                       mas
## 3369                                                                                                                                                    mental
## 3370                                                                                                                                                        mi
## 3371                                                                                                                                                        mo
## 3372                                                                                                                                                       msm
## 3373                                                                                                                                                   muertes
## 3374                                                                                                                                                 nashville
## 3375                                                                                                                                                        nc
## 3376                                                                                                                                                  neighbor
## 3377                                                                                                                                              neighborhood
## 3378                                                                                                                                                      nypd
## 3379                                                                                                                                                     ocean
## 3380                                                                                                                                                officially
## 3381                                                                                                                                                        pa
## 3382                                                                                                                                                      page
## 3383                                                                                                                                                   partner
## 3384                                                                                                                                                passengers
## 3385                                                                                                                                                      paul
## 3386                                                                                                                                                   percent
## 3387                                                                                                                                                personally
## 3388                                                                                                                                                   persons
## 3389                                                                                                                                                physically
## 3390                                                                                                                                                    picked
## 3391                                                                                                                                                 potential
## 3392                                                                                                                                                        pr
## 3393                                                                                                                                                     price
## 3394                                                                                                                                                   prisons
## 3395                                                                                                                                                  proceeds
## 3396                                                                                                                                                  produced
## 3397                                                                                                                                                production
## 3398                                                                                                                                                    proper
## 3399                                                                                                                                                  property
## 3400                                                                                                                                                 protocols
## 3401                                                                                                                                                     prove
## 3402                                                                                                                                                  provider
## 3403                                                                                                                                                 purchased
## 3404                                                                                                                                                   reached
## 3405                                                                                                                                                   release
## 3406                                                                                                                                                    repair
## 3407                                                                                                                                               researchers
## 3408                                                                                                                                                 retracted
## 3409                                                                                                                                                     santa
## 3410                                                                                                                                                       sat
## 3411                                                                                                                                                    scared
## 3412                                                                                                                                                  severity
## 3413                                                                                                                                                      shot
## 3414                                                                                                                                                     smart
## 3415                                                                                                                                                   spiking
## 3416                                                                                                                                                statistics
## 3417                                                                                                                                                  straight
## 3418                                                                                                                                                    stress
## 3419                                                                                                                                                  struggle
## 3420                                                                                                                                                  suddenly
## 3421                                                                                                                                                      swab
## 3422                                                                                                                                                       tax
## 3423                                                                                                                                                 tennessee
## 3424                                                                                                                                                  thankful
## 3425                                                                                                                                                       tho
## 3426                                                                                                                                                     throw
## 3427                                                                                                                                                     trash
## 3428                                                                                                                                                      trip
## 3429                                                                                                                                             understanding
## 3430                                                                                                                                                university
## 3431                                                                                                                                                    videos
## 3432                                                                                                                                                   weather
## 3433                                                                                                                                               @govtimwalz
## 3434                                                                                                                                                   @iomusa
## 3435                                                                                                                                                @kloeffler
## 3436                                                                                                                                                  @latimes
## 3437                                                                                                                                              @mayorbowser
## 3438                                                                                                                                          @santos4congress
## 3439                                                                                                                                                 @usatoday
## 3440                                                                                                                                                  #florida
## 3441                                                                                                                                                 #stayhome
## 3442                                                                                                                                                    #widow
## 3443                                                                                                                                              <u+0001f440>
## 3444                                                                                                                                                    12news
## 3445                                                                                                                                                   account
## 3446                                                                                                                                             administering
## 3447                                                                                                                                                    afford
## 3448                                                                                                                                                   alabama
## 3449                                                                                                                                                 allegedly
## 3450                                                                                                                                                    amount
## 3451                                                                                                                                                   answers
## 3452                                                                                                                                                  antibody
## 3453                                                                                                                                                       app
## 3454                                                                                                                                                apparently
## 3455                                                                                                                                                   appears
## 3456                                                                                                                                                  athletic
## 3457                                                                                                                                                     avoid
## 3458                                                                                                                                                        az
## 3459                                                                                                                                                       bed
## 3460                                                                                                                                                  behavior
## 3461                                                                                                                                                   biggest
## 3462                                                                                                                                                   blocked
## 3463                                                                                                                                                     brain
## 3464                                                                                                                                                    breaks
## 3465                                                                                                                                                  briefing
## 3466                                                                                                                                                  bringing
## 3467                                                                                                                                                   causing
## 3468                                                                                                                                                   central
## 3469                                                                                                                                                     child
## 3470                                                                                                                                                    cities
## 3471                                                                                                                                                     civil
## 3472                                                                                                                                                      club
## 3473                                                                                                                                              constituents
## 3474                                                                                                                                                  counties
## 3475                                                                                                                                                  county�s
## 3476                                                                                                                                                  covid19�
## 3477                                                                                                                                                  criminal
## 3478                                                                                                                                                cumulative
## 3479                                                                                                                                                     cuomo
## 3480                                                                                                                                                      dark
## 3481                                                                                                                                                   dealing
## 3482                                                                                                                                                    demand
## 3483                                                                                                                                                 developed
## 3484                                                                                                                                                 difficult
## 3485                                                                                                                                                    dosing
## 3486                                                                                                                                                     doubt
## 3487                                                                                                                                                     earth
## 3488                                                                                                                                                      east
## 3489                                                                                                                                                    effect
## 3490                                                                                                                                                   efforts
## 3491                                                                                                                                                 encourage
## 3492                                                                                                                                                    energy
## 3493                                                                                                                                                      esta
## 3494                                                                                                                                                eventually
## 3495                                                                                                                                              experiencing
## 3496                                                                                                                                                      fair
## 3497                                                                                                                                                     favor
## 3498                                                                                                                                                      feed
## 3499                                                                                                                                                    fellow
## 3500                                                                                                                                                   forever
## 3501                                                                                                                                                      fort
## 3502                                                                                                                                                      fund
## 3503                                                                                                                                                      girl
## 3504                                                                                                                                                   grandma
## 3505                                                                                                                                                     green
## 3506                                                                                                                                                      hack
## 3507                                                                                                                                                   handled
## 3508                                                                                                                                                  handling
## 3509                                                                                                                                                     henry
## 3510                                                                                                                                                    heroes
## 3511                                                                                                                                                 holocaust
## 3512                                                                                                                                                       hot
## 3513                                                                                                                                                      hurt
## 3514                                                                                                                                                    infect
## 3515                                                                                                                                                 influenza
## 3516                                                                                                                                             investigation
## 3517                                                                                                                                                    israel
## 3518                                                                                                                                                      jail
## 3519                                                                                                                                                     johns
## 3520                                                                                                                                                   knowing
## 3521                                                                                                                                                    leaked
## 3522                                                                                                                                                    letter
## 3523                                                                                                                                                       lie
## 3524                                                                                                                                                 listening
## 3525                                                                                                                                                 lockdowns
## 3526                                                                                                                                                    losses
## 3527                                                                                                                                                      mail
## 3528                                                                                                                                                   mandate
## 3529                                                                                                                                                  maryland
## 3530                                                                                                                                                    middle
## 3531                                                                                                                                                  migrants
## 3532                                                                                                                                                  military
## 3533                                                                                                                                            misinformation
## 3534                                                                                                                                                   mutates
## 3535                                                                                                                                                    nights
## 3536                                                                                                                                                    orange
## 3537                                                                                                                                                      pace
## 3538                                                                                                                                                   passing
## 3539                                                                                                                                                   peoples
## 3540                                                                                                                                                  personas
## 3541                                                                                                                                                    phases
## 3542                                                                                                                                                  physical
## 3543                                                                                                                                                   playoff
## 3544                                                                                                                                                    posted
## 3545                                                                                                                                                     posts
## 3546                                                                                                                                                   praying
## 3547                                                                                                                                                     prior
## 3548                                                                                                                                                  protests
## 3549                                                                                                                                                     quick
## 3550                                                                                                                                                   quickly
## 3551                                                                                                                                                 relatives
## 3552                                                                                                                                                    roster
## 3553                                                                                                                                                        rt
## 3554                                                                                                                                                       sat
## 3555                                                                                                                                                   selfish
## 3556                                                                                                                                                      sell
## 3557                                                                                                                                                   seniors
## 3558                                                                                                                                               significant
## 3559                                                                                                                                                    simple
## 3560                                                                                                                                                    sounds
## 3561                                                                                                                                                     speak
## 3562                                                                                                                                                     spoke
## 3563                                                                                                                                                    spring
## 3564                                                                                                                                                   stadium
## 3565                                                                                                                                                    starts
## 3566                                                                                                                                                   strains
## 3567                                                                                                                                                struggling
## 3568                                                                                                                                                supporting
## 3569                                                                                                                                                   survive
## 3570                                                                                                                                                 tampering
## 3571                                                                                                                                                      tape
## 3572                                                                                                                                                        te
## 3573                                                                                                                                                   teacher
## 3574                                                                                                                                               temporarily
## 3575                                                                                                                                                 tennessee
## 3576                                                                                                                                                    threat
## 3577                                                                                                                                                 traveling
## 3578                                                                                                                                              unemployment
## 3579                                                                                                                                                   updated
## 3580                                                                                                                                                volunteers
## 3581                                                                                                                                                    voters
## 3582                                                                                                                                                     votes
## 3583                                                                                                                                                   weren�t
## 3584                                                                                                                                                       won
## 3585                                                                                                                                                  �covid19
## 3586                                                                                                                                                      @cnn
## 3587                                                                                                                                              @deseretnews
## 3588                                                                                                                                                  @foxnews
## 3589                                                                                                                                                @govabbott
## 3590                                                                                                                                                  @twitter
## 3591                                                                                                                                           #coronapositive
## 3592                                                                                                                                          #covidisairborne
## 3593                                                                                                                                                      #flu
## 3594                                                                                                                                         #getvaccinatednow
## 3595                                                                                                                                          <u+27a1><u+fe0f>
## 3596                                                                                                                                                       4pm
## 3597                                                                                                                                                   address
## 3598                                                                                                                                                   amazing
## 3599                                                                                                                                                     andor
## 3600                                                                                                                                                 announces
## 3601                                                                                                                                                    annual
## 3602                                                                                                                                                antibodies
## 3603                                                                                                                                                     apply
## 3604                                                                                                                                                  arrested
## 3605                                                                                                                                                       ass
## 3606                                                                                                                                                  assembly
## 3607                                                                                                                                              asymptomatic
## 3608                                                                                                                                               authorities
## 3609                                                                                                                                                      bill
## 3610                                                                                                                                                       bit
## 3611                                                                                                                                                       box
## 3612                                                                                                                                                    breaks
## 3613                                                                                                                                                   breathe
## 3614                                                                                                                                                   careful
## 3615                                                                                                                                              championship
## 3616                                                                                                                                                    choose
## 3617                                                                                                                                                   clinics
## 3618                                                                                                                                                       cnn
## 3619                                                                                                                                                 condition
## 3620                                                                                                                                                   consent
## 3621                                                                                                                                                 continued
## 3622                                                                                                                                                     crazy
## 3623                                                                                                                                                  decision
## 3624                                                                                                                                                 democrats
## 3625                                                                                                                                                   detects
## 3626                                                                                                                                                     diego
## 3627                                                                                                                                                  director
## 3628                                                                                                                                                  djokovic
## 3629                                                                                                                                                    double
## 3630                                                                                                                                                   efforts
## 3631                                                                                                                                                     enero
## 3632                                                                                                                                                facilities
## 3633                                                                                                                                                    failed
## 3634                                                                                                                                                     false
## 3635                                                                                                                                                      fast
## 3636                                                                                                                                                     fever
## 3637                                                                                                                                                    figure
## 3638                                                                                                                                                       fox
## 3639                                                                                                                                                       guy
## 3640                                                                                                                                                    happen
## 3641                                                                                                                                                   haven�t
## 3642                                                                                                                                                      he�s
## 3643                                                                                                                                                   houston
## 3644                                                                                                                                   https://t.co/x4o8qjiq6e
## 3645                                                                                                                                                     human
## 3646                                                                                                                                                  hundreds
## 3647                                                                                                                                                  illinois
## 3648                                                                                                                                         immunocompromised
## 3649                                                                                                                                                 insurance
## 3650                                                                                                                                                    island
## 3651                                                                                                                                                   isolate
## 3652                                                                                                                                                      john
## 3653                                                                                                                                                       key
## 3654                                                                                                                                                   knowing
## 3655                                                                                                                                                leadership
## 3656                                                                                                                                                      lied
## 3657                                                                                                                                                  longterm
## 3658                                                                                                                                                      lots
## 3659                                                                                                                                                     lower
## 3660                                                                                                                                                    malone
## 3661                                                                                                                                                 mandatory
## 3662                                                                                                                                                   meeting
## 3663                                                                                                                                                    mexico
## 3664                                                                                                                                                    missed
## 3665                                                                                                                                                    mobile
## 3666                                                                                                                                                monoclonal
## 3667                                                                                                                                                      moun
## 3668                                                                                                                                                    normal
## 3669                                                                                                                                                      note
## 3670                                                                                                                                                      ohio
## 3671                                                                                                                                                   opposed
## 3672                                                                                                                                                   planned
## 3673                                                                                                                                                    played
## 3674                                                                                                                                                    player
## 3675                                                                                                                                                preventing
## 3676                                                                                                                                                prevention
## 3677                                                                                                                                                   primary
## 3678                                                                                                                                                  provided
## 3679                                                                                                                                                    queens
## 3680                                                                                                                                                   reading
## 3681                                                                                                                                                 receiving
## 3682                                                                                                                                                    reigns
## 3683                                                                                                                                                     roman
## 3684                                                                                                                                                   running
## 3685                                                                                                                                                    scared
## 3686                                                                                                                                                scientific
## 3687                                                                                                                                                      send
## 3688                                                                                                                                                   setting
## 3689                                                                                                                                                    signed
## 3690                                                                                                                                                       sin
## 3691                                                                                                                                                   society
## 3692                                                                                                                                                   sources
## 3693                                                                                                                                                    spring
## 3694                                                                                                                                                     stand
## 3695                                                                                                                                                   stopped
## 3696                                                                                                                                                   supreme
## 3697                                                                                                                                                       sus
## 3698                                                                                                                                               symptomatic
## 3699                                                                                                                                                      tech
## 3700                                                                                                                                               temporarily
## 3701                                                                                                                                                      town
## 3702                                                                                                                                                      trip
## 3703                                                                                                                                                        tu
## 3704                                                                                                                                                     tweet
## 3705                                                                                                                                                    urgent
## 3706                                                                                                                                                      utah
## 3707                                                                                                                                                 vaccinate
## 3708                                                                                                                                                   vacunas
## 3709                                                                                                                                                 virtually
## 3710                                                                                                                                                      visa
## 3711                                                                                                                                                  visiting
## 3712                                                                                                                                                     women
## 3713                                                                                                                                                      word
## 3714                                                                                                                                                 workforce
## 3715                                                                                                                                                      yall
## 3716                                                                                                                                                    year�s
## 3717                                                                                                                                                        yo
## 3718                                                                                                                                                      @abc
## 3719                                                                                                                                                 @gofundme
## 3720                                                                                                                                                 @nycmayor
## 3721                                                                                                                                                @senategop
## 3722                                                                                                                                          @steveschmidtses
## 3723                                                                                                                                                    #biden
## 3724                                                                                                                                        #coronavirusupdate
## 3725                                                                                                                                                #covid19�s
## 3726                                                                                                                                                 #edequity
## 3727                                                                                                                                                #edleaders
## 3728                                                                                                                                               #quarantine
## 3729                                                                                                                                                #reopening
## 3730                                                                                                                                  <u+0001f44f><u+0001f3fc>
## 3731                                                                                                                                              <u+0001f62d>
## 3732                                                                                                                                                       9th
## 3733                                                                                                                                                    accept
## 3734                                                                                                                                                    acting
## 3735                                                                                                                                            administration
## 3736                                                                                                                                                 affecting
## 3737                                                                                                                                                    afford
## 3738                                                                                                                                                 afternoon
## 3739                                                                                                                                                 amendment
## 3740                                                                                                                                                     angry
## 3741                                                                                                                                                    antifa
## 3742                                                                                                                                                     apple
## 3743                                                                                                                                              appointments
## 3744                                                                                                                                                  approach
## 3745                                                                                                                                                    asians
## 3746                                                                                                                                                  attended
## 3747                                                                                                                                                    austin
## 3748                                                                                                                                                     award
## 3749                                                                                                                                                  awwrrite
## 3750                                                                                                                                                      bank
## 3751                                                                                                                                                 basically
## 3752                                                                                                                                                   beaches
## 3753                                                                                                                                                  behavior
## 3754                                                                                                                                                    bigger
## 3755                                                                                                                                                   billion
## 3756                                                                                                                                                     brown
## 3757                                                                                                                                                  building
## 3758                                                                                                                                                     cages
## 3759                                                                                                                                                      card
## 3760                                                                                                                                                     carry
## 3761                                                                                                                                                    casino
## 3762                                                                                                                                                       ceo
## 3763                                                                                                                                                    checks
## 3764                                                                                                                                                  closures
## 3765                                                                                                                                                      club
## 3766                                                                                                                                                colleagues
## 3767                                                                                                                                                 condition
## 3768                                                                                                                                                  congrats
## 3769                                                                                                                                              conservative
## 3770                                                                                                                                                contagious
## 3771                                                                                                                                                  contract
## 3772                                                                                                                                                 corporate
## 3773                                                                                                                                                    counts
## 3774                                                                                                                                                 covid19�s
## 3775                                                                                                                                                  criminal
## 3776                                                                                                                                                     crowd
## 3777                                                                                                                                                   defense
## 3778                                                                                                                                                   deliver
## 3779                                                                                                                                                democratic
## 3780                                                                                                                                            demonstrations
## 3781                                                                                                                                                    denied
## 3782                                                                                                                                                     desde
## 3783                                                                                                                                                    detect
## 3784                                                                                                                                                 detention
## 3785                                                                                                                                                   detroit
## 3786                                                                                                                                                    dinner
## 3787                                                                                                                                                    direct
## 3788                                                                                                                                        disproportionately
## 3789                                                                                                                                                 donations
## 3790                                                                                                                                                   driving
## 3791                                                                                                                                                       d�a
## 3792                                                                                                                                                  eligible
## 3793                                                                                                                                                        em
## 3794                                                                                                                                                employment
## 3795                                                                                                                                                  epidemic
## 3796                                                                                                                                                    excuse
## 3797                                                                                                                                               experienced
## 3798                                                                                                                                                 extremely
## 3799                                                                                                                                                    factor
## 3800                                                                                                                                                     fails
## 3801                                                                                                                                                     faith
## 3802                                                                                                                                                       fam
## 3803                                                                                                                                                       fda
## 3804                                                                                                                                                      file
## 3805                                                                                                                                                    filled
## 3806                                                                                                                                                     fires
## 3807                                                                                                                                                    flight
## 3808                                                                                                                                                   forever
## 3809                                                                                                                                                   freedom
## 3810                                                                                                                                                     funny
## 3811                                                                                                                                                     grant
## 3812                                                                                                                                                    ground
## 3813                                                                                                                                                    guards
## 3814                                                                                                                                                   haircut
## 3815                                                                                                                                                  headline
## 3816                                                                                                                                                      heat
## 3817                                                                                                                                                    helped
## 3818                                                                                                                                                    heroes
## 3819                                                                                                                                                  honestly
## 3820                                                                                                                                                       hot
## 3821                                                                                                                                                   housing
## 3822                                                                                                                                                  humanity
## 3823                                                                                                                                                  included
## 3824                                                                                                                                                  includes
## 3825                                                                                                                                                 increases
## 3826                                                                                                                                                   indiana
## 3827                                                                                                                                                  informed
## 3828                                                                                                                                                 insurance
## 3829                                                                                                                                                       joe
## 3830                                                                                                                                                   joining
## 3831                                                                                                                                                      joke
## 3832                                                                                                                                                   journal
## 3833                                                                                                                                                  journals
## 3834                                                                                                                                                    killer
## 3835                                                                                                                                                       lab
## 3836                                                                                                                                                       led
## 3837                                                                                                                                                   lincoln
## 3838                                                                                                                                                    locked
## 3839                                                                                                                                                      lots
## 3840                                                                                                                                                     lower
## 3841                                                                                                                                                   malaria
## 3842                                                                                                                                               manipulated
## 3843                                                                                                                                                   markets
## 3844                                                                                                                                                       met
## 3845                                                                                                                                                      mike
## 3846                                                                                                                                                     miles
## 3847                                                                                                                                                      mine
## 3848                                                                                                                                                    mobile
## 3849                                                                                                                                                montgomery
## 3850                                                                                                                                                  mortgage
## 3851                                                                                                                                                     mouth
## 3852                                                                                                                                                   nations
## 3853                                                                                                                                                    navajo
## 3854                                                                                                                                                       nba
## 3855                                                                                                                                                        nj
## 3856                                                                                                                                                 outbreaks
## 3857                                                                                                                                                  outcomes
## 3858                                                                                                                                                   outdoor
## 3859                                                                                                                                                     panel
## 3860                                                                                                                                                   parents
## 3861                                                                                                                                                      pass
## 3862                                                                                                                                                    passes
## 3863                                                                                                                                                     pause
## 3864                                                                                                                                                     pence
## 3865                                                                                                                                                   perfect
## 3866                                                                                                                                                      pero
## 3867                                                                                                                                                  petition
## 3868                                                                                                                                              philadelphia
## 3869                                                                                                                                                      piss
## 3870                                                                                                                                                    planet
## 3871                                                                                                                                                    plasma
## 3872                                                                                                                                                       poc
## 3873                                                                                                                                                  politics
## 3874                                                                                                                                                      pool
## 3875                                                                                                                                                  positivo
## 3876                                                                                                                                               postcovid19
## 3877                                                                                                                                                     potus
## 3878                                                                                                                                                 practices
## 3879                                                                                                                                                practicing
## 3880                                                                                                                                                   prepare
## 3881                                                                                                                                                     prior
## 3882                                                                                                                                                   private
## 3883                                                                                                                                                publishing
## 3884                                                                                                                                                   quality
## 3885                                                                                                                                                      recs
## 3886                                                                                                                                                  regional
## 3887                                                                                                                                               republicans
## 3888                                                                                                                                                   reserve
## 3889                                                                                                                                                    resign
## 3890                                                                                                                                                responders
## 3891                                                                                                                                                    resume
## 3892                                                                                                                                                  returned
## 3893                                                                                                                                                   rioting
## 3894                                                                                                                                                       rip
## 3895                                                                                                                                                    safely
## 3896                                                                                                                                                    saving
## 3897                                                                                                                                                        sc
## 3898                                                                                                                                                      seat
## 3899                                                                                                                                                      sell
## 3900                                                                                                                                                    senior
## 3901                                                                                                                                                   shelter
## 3902                                                                                                                                                 shouldn�t
## 3903                                                                                                                                                    signed
## 3904                                                                                                                                                    slowly
## 3905                                                                                                                                                      song
## 3906                                                                                                                                                     speak
## 3907                                                                                                                                                  speaking
## 3908                                                                                                                                                    spring
## 3909                                                                                                                                                     stage
## 3910                                                                                                                                                     stats
## 3911                                                                                                                                                    stores
## 3912                                                                                                                                                     style
## 3913                                                                                                                                                    supply
## 3914                                                                                                                                                   surgery
## 3915                                                                                                                                                    taylor
## 3916                                                                                                                                                  teachers
## 3917                                                                                                                                                     tells
## 3918                                                                                                                                                      the�
## 3919                                                                                                                                                  thousand
## 3920                                                                                                                                                      till
## 3921                                                                                                                                                      tiny
## 3922                                                                                                                                                     topic
## 3923                                                                                                                                                     trade
## 3924                                                                                                                                                   traffic
## 3925                                                                                                                                                   treated
## 3926                                                                                                                                                    trends
## 3927                                                                                                                                                     truth
## 3928                                                                                                                                                    truths
## 3929                                                                                                                                                     tuned
## 3930                                                                                                                                                    tweets
## 3931                                                                                                                                                        va
## 3932                                                                                                                                                     voter
## 3933                                                                                                                                                   walking
## 3934                                                                                                                                                   warning
## 3935                                                                                                                                                washington
## 3936                                                                                                                                                     waste
## 3937                                                                                                                                                    weekly
## 3938                                                                                                                                                      wide
## 3939                                                                                                                                                   writing
## 3940                                                                                                                                                      you�
## 3941                                                                                                                                                    you�ve
## 3942                                                                                                                                               @aacnursing
## 3943                                                                                                                                                @gopleader
## 3944                                                                                                                                               @mailonline
## 3945                                                                                                                                            @marklevinshow
## 3946                                                                                                                                                @mikepence
## 3947                                                                                                                                                     @nbc2
## 3948                                                                                                                                                  @nbcnews
## 3949                                                                                                                                               #california
## 3950                                                                                                                                                   #corona
## 3951                                                                                                                                                  #georgia
## 3952                                                                                                                                               #healthcare
## 3953                                                                                                                                                   #pfizer
## 3954                                                                                                                                         #socialdistancing
## 3955                                                                                                                                              <u+0001f3c0>
## 3956                                                                                                                                              <u+0001f518>
## 3957                                                                                                                                          <u+2764><u+fe0f>
## 3958                                                                                                                                                   ability
## 3959                                                                                                                                                  abortion
## 3960                                                                                                                                               accountable
## 3961                                                                                                                                                     added
## 3962                                                                                                                                                    afraid
## 3963                                                                                                                                                     alive
## 3964                                                                                                                                                     apply
## 3965                                                                                                                                                       arm
## 3966                                                                                                                                                  articles
## 3967                                                                                                                                              asymptomatic
## 3968                                                                                                                                                    attend
## 3969                                                                                                                                                   awesome
## 3970                                                                                                                                                       bar
## 3971                                                                                                                                                       bay
## 3972                                                                                                                                                      beds
## 3973                                                                                                                                                  benefits
## 3974                                                                                                                                                       bet
## 3975                                                                                                                                                    bharat
## 3976                                                                                                                                                birmingham
## 3977                                                                                                                                                   blessed
## 3978                                                                                                                                                 breathing
## 3979                                                                                                                                                     bronx
## 3980                                                                                                                                                   cartoon
## 3981                                                                                                                                                 challenge
## 3982                                                                                                                                                 cleveland
## 3983                                                                                                                                                   climate
## 3984                                                                                                                                                  compared
## 3985                                                                                                                                                  complete
## 3986                                                                                                                                                completely
## 3987                                                                                                                                                 continued
## 3988                                                                                                                                                   council
## 3989                                                                                                                                                     crews
## 3990                                                                                                                                                    crowds
## 3991                                                                                                                                                       cvs
## 3992                                                                                                                                                  deadline
## 3993                                                                                                                                                 decisions
## 3994                                                                                                                                                    degree
## 3995                                                                                                                                                     delay
## 3996                                                                                                                                                democratic
## 3997                                                                                                                                                  desantis
## 3998                                                                                                                                                 diagnosis
## 3999                                                                                                                                                difference
## 4000                                                                                                                                                  directly
## 4001                                                                                                                                              distributing
## 4002                                                                                                                                                  division
## 4003                                                                                                                                                  domestic
## 4004                                                                                                                                                      duty
## 4005                                                                                                                                                   earlier
## 4006                                                                                                                                                   edition
## 4007                                                                                                                                                 emotional
## 4008                                                                                                                                                   english
## 4009                                                                                                                                             entertainment
## 4010                                                                                                                                                       era
## 4011                                                                                                                                                 executive
## 4012                                                                                                                                                    facing
## 4013                                                                                                                                                    factor
## 4014                                                                                                                                                    faster
## 4015                                                                                                                                                       feb
## 4016                                                                                                                                                  february
## 4017                                                                                                                                                      fill
## 4018                                                                                                                                               financially
## 4019                                                                                                                                                   finding
## 4020                                                                                                                                                        fl
## 4021                                                                                                                                                    forgot
## 4022                                                                                                                                                    fought
## 4023                                                                                                                                                   freedom
## 4024                                                                                                                                                        ft
## 4025                                                                                                                                                   funding
## 4026                                                                                                                                                     funds
## 4027                                                                                                                                                    gather
## 4028                                                                                                                                                      golf
## 4029                                                                                                                                                   grammys
## 4030                                                                                                                                                    handle
## 4031                                                                                                                                                        hc
## 4032                                                                                                                                                     heads
## 4033                                                                                                                                                    helped
## 4034                                                                                                                                                      hill
## 4035                                                                                                                                                   holding
## 4036                                                                                                                                                     honor
## 4037                                                                                                                                                  impacted
## 4038                                                                                                                                                    income
## 4039                                                                                                                                                    indoor
## 4040                                                                                                                                                  industry
## 4041                                                                                                                                                 interview
## 4042                                                                                                                                                    issued
## 4043                                                                                                                                                      july
## 4044                                                                                                                                                      lead
## 4045                                                                                                                                                    league
## 4046                                                                                                                                                    levels
## 4047                                                                                                                                                     lower
## 4048                                                                                                                                                     lying
## 4049                                                                                                                                                      maga
## 4050                                                                                                                                                  maintain
## 4051                                                                                                                                                  maralago
## 4052                                                                                                                                                      mess
## 4053                                                                                                                                                     mouth
## 4054                                                                                                                                                     moved
## 4055                                                                                                                                                     music
## 4056                                                                                                                                                       nbc
## 4057                                                                                                                                                  nonsense
## 4058                                                                                                                                                      nope
## 4059                                                                                                                                                      note
## 4060                                                                                                                                                  obsolete
## 4061                                                                                                                                                   obvious
## 4062                                                                                                                                                  offering
## 4063                                                                                                                                                   officer
## 4064                                                                                                                                                    oregon
## 4065                                                                                                                                              organization
## 4066                                                                                                                                                     owner
## 4067                                                                                                                                                      page
## 4068                                                                                                                                                  pandemia
## 4069                                                                                                                                                      paso
## 4070                                                                                                                                                     pause
## 4071                                                                                                                                                    paused
## 4072                                                                                                                                                    perdue
## 4073                                                                                                                                                pharmacies
## 4074                                                                                                                                                    photos
## 4075                                                                                                                                                    poland
## 4076                                                                                                                                                  politics
## 4077                                                                                                                                                  powerful
## 4078                                                                                                                                                       ppe
## 4079                                                                                                                                                     press
## 4080                                                                                                                                                  probable
## 4081                                                                                                                                                production
## 4082                                                                                                                                                protecting
## 4083                                                                                                                                                    prueba
## 4084                                                                                                                                                 published
## 4085                                                                                                                                                    pushed
## 4086                                                                                                                                               quarantined
## 4087                                                                                                                                                   reading
## 4088                                                                                                                                                   records
## 4089                                                                                                                                                recovering
## 4090                                                                                                                                                    refuse
## 4091                                                                                                                                                   respect
## 4092                                                                                                                                            responsibility
## 4093                                                                                                                                                      rich
## 4094                                                                                                                                                ridiculous
## 4095                                                                                                                                                      seat
## 4096                                                                                                                                                   selling
## 4097                                                                                                                                                       sen
## 4098                                                                                                                                                    senior
## 4099                                                                                                                                                  severity
## 4100                                                                                                                                                  shutdown
## 4101                                                                                                                                                     smell
## 4102                                                                                                                                                      spot
## 4103                                                                                                                                                  stealing
## 4104                                                                                                                                                     stole
## 4105                                                                                                                                                   stopped
## 4106                                                                                                                                                   studies
## 4107                                                                                                                                                 suffering
## 4108                                                                                                                                            superintendent
## 4109                                                                                                                                                  syracuse
## 4110                                                                                                                                                     taste
## 4111                                                                                                                                                     train
## 4112                                                                                                                                                   treated
## 4113                                                                                                                                                  treating
## 4114                                                                                                                                                        tu
## 4115                                                                                                                                                      unit
## 4116                                                                                                                                             unprecedented
## 4117                                                                                                                                               vaccinating
## 4118                                                                                                                                                 virtually
## 4119                                                                                                                                                   viruses
## 4120                                                                                                                                                       v�a
## 4121                                                                                                                                                     water
## 4122                                                                                                                                                      wave
## 4123                                                                                                                                                   worried
## 4124                                                                                                                                                        wr
## 4125                                                                                                                                                     write
## 4126                                                                                                                                                     wrote
## 4127                                                                                                                                                   �ngeles
## 4128                                                                                                                                                       �we
## 4129                                                                                                                                              @magnoliaisd
## 4130                                                                                                                                               @nycschools
## 4131                                                                                                                                               @sentedcruz
## 4132                                                                                                                                                   @vdhgov
## 4133                                                                                                                                                       @vp
## 4134                                                                                                                                           @wweromanreigns
## 4135                                                                                                                                                 #breaking
## 4136                                                                                                                                                   #maskup
## 4137                                                                                                                                                      #nyc
## 4138                                                                                                                                             #vaccineswork
## 4139                                                                                                                                                  #wweday1
## 4140                                                                                                                                              <u+0001f610>
## 4141                                                                                                                                              <u+0001f92c>
## 4142                                                                                                                                              <u+0001f9a0>
## 4143                                                                                                                                                       4th
## 4144                                                                                                                                                  accounts
## 4145                                                                                                                                                  accurate
## 4146                                                                                                                                                       act
## 4147                                                                                                                                                    action
## 4148                                                                                                                                                    actual
## 4149                                                                                                                                                   alabama
## 4150                                                                                                                                                      anti
## 4151                                                                                                                                                apparently
## 4152                                                                                                                                                   appears
## 4153                                                                                                                                                  approval
## 4154                                                                                                                                                   arrived
## 4155                                                                                                                                                assistance
## 4156                                                                                                                                                   average
## 4157                                                                                                                                                       a�o
## 4158                                                                                                                                                    battle
## 4159                                                                                                                                                       bet
## 4160                                                                                                                                                     block
## 4161                                                                                                                                                      book
## 4162                                                                                                                                                  brothers
## 4163                                                                                                                                                       bye
## 4164                                                                                                                                                   central
## 4165                                                                                                                                                       ceo
## 4166                                                                                                                                                 christian
## 4167                                                                                                                                                 christmas
## 4168                                                                                                                                                    claims
## 4169                                                                                                                                                 classroom
## 4170                                                                                                                                                      code
## 4171                                                                                                                                                      coma
## 4172                                                                                                                                                conspiracy
## 4173                                                                                                                                                 contagios
## 4174                                                                                                                                                    corona
## 4175                                                                                                                                                      cost
## 4176                                                                                                                                                  creating
## 4177                                                                                                                                                        ct
## 4178                                                                                                                                                      cure
## 4179                                                                                                                                                       dan
## 4180                                                                                                                                                        dc
## 4181                                                                                                                                                      deer
## 4182                                                                                                                                                discovered
## 4183                                                                                                                                              distributing
## 4184                                                                                                                                                       dos
## 4185                                                                                                                                                   driving
## 4186                                                                                                                                                   economy
## 4187                                                                                                                                                    effort
## 4188                                                                                                                                                        er
## 4189                                                                                                                                                     est�n
## 4190                                                                                                                                                     extra
## 4191                                                                                                                                                   finding
## 4192                                                                                                                                                    forget
## 4193                                                                                                                                                   fucking
## 4194                                                                                                                                                     funny
## 4195                                                                                                                                                    f�tbol
## 4196                                                                                                                                                     guard
## 4197                                                                                                                                                      hair
## 4198                                                                                                                                                  headline
## 4199                                                                                                                                                identified
## 4200                                                                                                                                               immediately
## 4201                                                                                                                                                 increases
## 4202                                                                                                                                                    inform
## 4203                                                                                                                                                 injecting
## 4204                                                                                                                                                    inside
## 4205                                                                                                                                               instruction
## 4206                                                                                                                                                       i�d
## 4207                                                                                                                                                      lady
## 4208                                                                                                                                                   leading
## 4209                                                                                                                                                   leaving
## 4210                                                                                                                                                     lloyd
## 4211                                                                                                                                                  lockdown
## 4212                                                                                                                                                 lockdowns
## 4213                                                                                                                                                      mayo
## 4214                                                                                                                                                     men�s
## 4215                                                                                                                                                  michigan
## 4216                                                                                                                                                  millions
## 4217                                                                                                                                                      mind
## 4218                                                                                                                                                misleading
## 4219                                                                                                                                                      miss
## 4220                                                                                                                                                    murder
## 4221                                                                                                                                                       muy
## 4222                                                                                                                                                     nasal
## 4223                                                                                                                                                     north
## 4224                                                                                                                                                     nueva
## 4225                                                                                                                                                     nurse
## 4226                                                                                                                                                   ongoing
## 4227                                                                                                                                                  original
## 4228                                                                                                                                                      pack
## 4229                                                                                                                                                     peace
## 4230                                                                                                                                                   persons
## 4231                                                                                                                                                   picture
## 4232                                                                                                                                                      plot
## 4233                                                                                                                                                      poor
## 4234                                                                                                                                                    porque
## 4235                                                                                                                                                  possibly
## 4236                                                                                                                                               potentially
## 4237                                                                                                                                                  programs
## 4238                                                                                                                                                     prove
## 4239                                                                                                                                                 questions
## 4240                                                                                                                                                   quickly
## 4241                                                                                                                                                   rampant
## 4242                                                                                                                                                   reality
## 4243                                                                                                                                                    refuse
## 4244                                                                                                                                              registration
## 4245                                                                                                                                                  reminder
## 4246                                                                                                                                                  requires
## 4247                                                                                                                                               respiratory
## 4248                                                                                                                                               responsible
## 4249                                                                                                                                                    rights
## 4250                                                                                                                                                      rock
## 4251                                                                                                                                                    r�cord
## 4252                                                                                                                                                  shortage
## 4253                                                                                                                                                    simple
## 4254                                                                                                                                                 singleday
## 4255                                                                                                                                                      sore
## 4256                                                                                                                                                    stayed
## 4257                                                                                                                                                      step
## 4258                                                                                                                                                  stopping
## 4259                                                                                                                                                   stories
## 4260                                                                                                                                                  strange�
## 4261                                                                                                                                                    street
## 4262                                                                                                                                                   studies
## 4263                                                                                                                                                     stuff
## 4264                                                                                                                                            superintendent
## 4265                                                                                                                                                  supplies
## 4266                                                                                                                                                  supports
## 4267                                                                                                                                                  survived
## 4268                                                                                                                                                   telling
## 4269                                                                                                                                                     tengo
## 4270                                                                                                                                                      text
## 4271                                                                                                                                                  thankful
## 4272                                                                                                                                                     treat
## 4273                                                                                                                                                  treating
## 4274                                                                                                                                                  upcoming
## 4275                                                                                                                                                  vacation
## 4276                                                                                                                                                vacunaci�n
## 4277                                                                                                                                                  variante
## 4278                                                                                                                                                      vote
## 4279                                                                                                                                                   walkins
## 4280                                                                                                                                                     wanna
## 4281                                                                                                                                                       war
## 4282                                                                                                                                                     waste
## 4283                                                                                                                                                     water
## 4284                                                                                                                                                      woke
## 4285                                                                                                                                                   women�s
## 4286                                                                                                                                                      yolo
## 4287                                                                                                                                                     �very
## 4288                                                                                                                                                   @change
## 4289                                                                                                                                                     @cnbc
## 4290                                                                                                                                           @donaldjtrumpjr
## 4291                                                                                                                                                @dougducey
## 4292                                                                                                                                               @elnuevodia
## 4293                                                                                                                                           @feedingamerica
## 4294                                                                                                                                                  @foxnews
## 4295                                                                                                                                              @ivankatrump
## 4296                                                                                                                                                @jimcramer
## 4297                                                                                                                                                    @msnbc
## 4298                                                                                                                                               @ncgovernor
## 4299                                                                                                                                              @newdayfornj
## 4300                                                                                                                                            @sassywinemama
## 4301                                                                                                                                             @thomaskaine5
## 4302                                                                                                                                                @yahoonews
## 4303                                                                                                                                                  #america
## 4304                                                                                                                                                 #breaking
## 4305                                                                                                                                                 #covid19�
## 4306                                                                                                                                                #howwefeel
## 4307                                                                                                                                                  #justice
## 4308                                                                                                                                           #shelterinplace
## 4309                                                                                                                                                 #staysafe
## 4310                                                                                                                                  <u+0001f1fa><u+0001f1f8>
## 4311                                                                                                                                                       5pm
## 4312                                                                                                                                                       5th
## 4313                                                                                                                                                       6th
## 4314                                                                                                                                                       8th
## 4315                                                                                                                                                     abuse
## 4316                                                                                                                                                     ahead
## 4317                                                                                                                                                   airport
## 4318                                                                                                                                                       aka
## 4319                                                                                                                                                    andrew
## 4320                                                                                                                                                  announce
## 4321                                                                                                                                                      aqu�
## 4322                                                                                                                                                  arrested
## 4323                                                                                                                                                 arresting
## 4324                                                                                                                                                    artist
## 4325                                                                                                                                                    attack
## 4326                                                                                                                                                 awareness
## 4327                                                                                                                                                      ayer
## 4328                                                                                                                                                    babies
## 4329                                                                                                                                                      barr
## 4330                                                                                                                                                    battle
## 4331                                                                                                                                                  battling
## 4332                                                                                                                                                     bible
## 4333                                                                                                                                                    border
## 4334                                                                                                                                                   buffalo
## 4335                                                                                                                                                     build
## 4336                                                                                                                                                     built
## 4337                                                                                                                                                     bully
## 4338                                                                                                                                                  capacity
## 4339                                                                                                                                                  catching
## 4340                                                                                                                                                     chair
## 4341                                                                                                                                                children�s
## 4342                                                                                                                                                    choose
## 4343                                                                                                                                                     coast
## 4344                                                                                                                                                   comment
## 4345                                                                                                                                                  compared
## 4346                                                                                                                                                 completed
## 4347                                                                                                                                                conducting
## 4348                                                                                                                                                  confused
## 4349                                                                                                                                                  congress
## 4350                                                                                                                                                   connect
## 4351                                                                                                                                                considered
## 4352                                                                                                                                                continuing
## 4353                                                                                                                                                   correct
## 4354                                                                                                                                                     costs
## 4355                                                                                                                                                     cough
## 4356                                                                                                                                                  coughing
## 4357                                                                                                                                                    cousin
## 4358                                                                                                                                                    cruise
## 4359                                                                                                                                                      cuts
## 4360                                                                                                                                                      dark
## 4361                                                                                                                                                  daughter
## 4362                                                                                                                                                      debt
## 4363                                                                                                                                                 decisions
## 4364                                                                                                                                                     delay
## 4365                                                                                                                                                   delayed
## 4366                                                                                                                                                       dem
## 4367                                                                                                                                                  democrat
## 4368                                                                                                                                                   deserve
## 4369                                                                                                                                                 destroyed
## 4370                                                                                                                                                 diagnosed
## 4371                                                                                                                                                     diego
## 4372                                                                                                                                                 disappear
## 4373                                                                                                                                               disappeared
## 4374                                                                                                                                                discussing
## 4375                                                                                                                                                     donor
## 4376                                                                                                                                                      door
## 4377                                                                                                                                                  drinking
## 4378                                                                                                                                                    easier
## 4379                                                                                                                                                  effected
## 4380                                                                                                                                                   empathy
## 4381                                                                                                                                                  employee
## 4382                                                                                                                                                    equity
## 4383                                                                                                                                                        er
## 4384                                                                                                                                                        eu
## 4385                                                                                                                                                  eviction
## 4386                                                                                                                                                 executive
## 4387                                                                                                                                                   express
## 4388                                                                                                                                                     final
## 4389                                                                                                                                               financially
## 4390                                                                                                                                                       fix
## 4391                                                                                                                                                  friendly
## 4392                                                                                                                                                    fucked
## 4393                                                                                                                                                  function
## 4394                                                                                                                                                     games
## 4395                                                                                                                                                    garden
## 4396                                                                                                                                                     gates
## 4397                                                                                                                                                      gear
## 4398                                                                                                                                                       han
## 4399                                                                                                                                                   healing
## 4400                                                                                                                                                   hearing
## 4401                                                                                                                                                historical
## 4402                                                                                                                                                  homeless
## 4403                                                                                                                                                   hundred
## 4404                                                                                                                                                  hundreds
## 4405                                                                                                                                                 hurricane
## 4406                                                                                                                                                       hwf
## 4407                                                                                                                                                    idiots
## 4408                                                                                                                                                  immunity
## 4409                                                                                                                                              incompetence
## 4410                                                                                                                                                inequality
## 4411                                                                                                                                                 interview
## 4412                                                                                                                                                 isolation
## 4413                                                                                                                                                       jag
## 4414                                                                                                                                                    jaguar
## 4415                                                                                                                                                     james
## 4416                                                                                                                                                       joy
## 4417                                                                                                                                                     judge
## 4418                                                                                                                                                   knowing
## 4419                                                                                                                                                 knowledge
## 4420                                                                                                                                                     labor
## 4421                                                                                                                                                      land
## 4422                                                                                                                                                      laws
## 4423                                                                                                                                                   liberal
## 4424                                                                                                                                                  lifetime
## 4425                                                                                                                                                    lifted
## 4426                                                                                                                                                     lived
## 4427                                                                                                                                                     loses
## 4428                                                                                                                                                      main
## 4429                                                                                                                                                   manager
## 4430                                                                                                                                                 mandatory
## 4431                                                                                                                                                    minute
## 4432                                                                                                                                                     moron
## 4433                                                                                                                                                 mortality
## 4434                                                                                                                                                        ms
## 4435                                                                                                                                                 narrative
## 4436                                                                                                                                                nationwide
## 4437                                                                                                                                                   natural
## 4438                                                                                                                                                    notice
## 4439                                                                                                                                                   noticed
## 4440                                                                                                                                                    nuevos
## 4441                                                                                                                                                     obama
## 4442                                                                                                                                                   obesity
## 4443                                                                                                                                                      odds
## 4444                                                                                                                                                      ohio
## 4445                                                                                                                                                  oklahoma
## 4446                                                                                                                                                        op
## 4447                                                                                                                                             organizations
## 4448                                                                                                                                                    ozarks
## 4449                                                                                                                                                   parking
## 4450                                                                                                                                                    paying
## 4451                                                                                                                                                  personas
## 4452                                                                                                                                                    photos
## 4453                                                                                                                                                 pneumonia
## 4454                                                                                                                                                  possibly
## 4455                                                                                                                                                 predicted
## 4456                                                                                                                                                previously
## 4457                                                                                                                                                   primary
## 4458                                                                                                                                                  priority
## 4459                                                                                                                                             professionals
## 4460                                                                                                                                                  progress
## 4461                                                                                                                                                     proof
## 4462                                                                                                                                                      push
## 4463                                                                                                                                               quarantined
## 4464                                                                                                                                                     quick
## 4465                                                                                                                                                    raffle
## 4466                                                                                                                                                recoveries
## 4467                                                                                                                                                    remain
## 4468                                                                                                                                                    remind
## 4469                                                                                                                                                    remote
## 4470                                                                                                                                                      rent
## 4471                                                                                                                                                 represent
## 4472                                                                                                                                                   request
## 4473                                                                                                                                                   require
## 4474                                                                                                                                              reservations
## 4475                                                                                                                                                   retired
## 4476                                                                                                                                                       rid
## 4477                                                                                                                                                ridiculous
## 4478                                                                                                                                                     round
## 4479                                                                                                                                                      rule
## 4480                                                                                                                                                     rural
## 4481                                                                                                                                                     sales
## 4482                                                                                                                                                 sanitizer
## 4483                                                                                                                                                 scheduled
## 4484                                                                                                                                                 secretary
## 4485                                                                                                                                                   sellers
## 4486                                                                                                                                                   senator
## 4487                                                                                                                                                     shown
## 4488                                                                                                                                               significant
## 4489                                                                                                                                                       sir
## 4490                                                                                                                                                    sister
## 4491                                                                                                                                                      slow
## 4492                                                                                                                                                   society
## 4493                                                                                                                                                  solution
## 4494                                                                                                                                                   sources
## 4495                                                                                                                                                   speaker
## 4496                                                                                                                                                    spirit
## 4497                                                                                                                                                    square
## 4498                                                                                                                                                starvation
## 4499                                                                                                                                                   station
## 4500                                                                                                                                                    status
## 4501                                                                                                                                                     stops
## 4502                                                                                                                                                    strain
## 4503                                                                                                                                                strategies
## 4504                                                                                                                                                    stream
## 4505                                                                                                                                                  supports
## 4506                                                                                                                                                     surge
## 4507                                                                                                                                            susceptibility
## 4508                                                                                                                                                     table
## 4509                                                                                                                                                     talks
## 4510                                                                                                                                                       tan
## 4511                                                                                                                                                  teaching
## 4512                                                                                                                                                       ten
## 4513                                                                                                                                                      term
## 4514                                                                                                                                                   theatre
## 4515                                                                                                                                                     touch
## 4516                                                                                                                                                    touted
## 4517                                                                                                                                               traditional
## 4518                                                                                                                                                     trend
## 4519                                                                                                                                                        tv
## 4520                                                                                                                                                     uncle
## 4521                                                                                                                                               unnecessary
## 4522                                                                                                                                                unreported
## 4523                                                                                                                                                  upcoming
## 4524                                                                                                                                                     urban
## 4525                                                                                                                                                      user
## 4526                                                                                                                                                  vehicles
## 4527                                                                                                                                                       ver
## 4528                                                                                                                                                      view
## 4529                                                                                                                                                     viral
## 4530                                                                                                                                                     vital
## 4531                                                                                                                                                     voice
## 4532                                                                                                                                                    voters
## 4533                                                                                                                                                     votes
## 4534                                                                                                                                                   watched
## 4535                                                                                                                                                     weird
## 4536                                                                                                                                                      wing
## 4537                                                                                                                                                 wondering
## 4538                                                                                                                                                 workplace
## 4539                                                                                                                                                    worlds
## 4540                                                                                                                                                     wrote
## 4541                                                                                                                                                       wtf
## 4542                                                                                                                                                       �we
## 4543                                                                                                                                          @amermedicalassn
## 4544                                                                                                                                           @hispaniccaucus
## 4545                                                                                                                                                @modernatx
## 4546                                                                                                                                                      @nln
## 4547                                                                                                                                             @suburbanhosp
## 4548                                                                                                                                                  @tedcruz
## 4549                                                                                                                                                  @thehill
## 4550                                                                                                                                          #covid<u+30fc>19
## 4551                                                                                                                                                 #lockdown
## 4552                                                                                                                                               #losangeles
## 4553                                                                                                                                                  #moderna
## 4554                                                                                                                                                      #nfl
## 4555                                                                                                                                             #publichealth
## 4556                                                                                                                                            #thisisourshot
## 4557                                                                                                                                  <u+0001f64f><u+0001f3fd>
## 4558                                                                                                                                          <u+2714><u+fe0f>
## 4559                                                                                                                                                       4th
## 4560                                                                                                                                                        5g
## 4561                                                                                                                                                       6th
## 4562                                                                                                                                                       8th
## 4563                                                                                                                                                   absence
## 4564                                                                                                                                                   actions
## 4565                                                                                                                                                    adding
## 4566                                                                                                                                                  addition
## 4567                                                                                                                                                 addressed
## 4568                                                                                                                                                     adult
## 4569                                                                                                                                                    adults
## 4570                                                                                                                                              aggressively
## 4571                                                                                                                                                       aid
## 4572                                                                                                                                                   airport
## 4573                                                                                                                                                     andor
## 4574                                                                                                                                                   anymore
## 4575                                                                                                                                                      aqu�
## 4576                                                                                                                                                      arms
## 4577                                                                                                                                                   asshole
## 4578                                                                                                                                                assistance
## 4579                                                                                                                                                   atlanta
## 4580                                                                                                                                                   attacks
## 4581                                                                                                                                                authorized
## 4582                                                                                                                                                    awards
## 4583                                                                                                                                                   baptist
## 4584                                                                                                                                                 basically
## 4585                                                                                                                                                    baylor
## 4586                                                                                                                                                     bills
## 4587                                                                                                                                                  birthday
## 4588                                                                                                                                                       bit
## 4589                                                                                                                                                     block
## 4590                                                                                                                                                      blog
## 4591                                                                                                                                                    border
## 4592                                                                                                                                                    boston
## 4593                                                                                                                                                    branch
## 4594                                                                                                                                                        ca
## 4595                                                                                                                                                  canceled
## 4596                                                                                                                                                caregivers
## 4597                                                                                                                                                     cares
## 4598                                                                                                                                                     casos
## 4599                                                                                                                                                    caucus
## 4600                                                                                                                                                   centers
## 4601                                                                                                                                                     cheer
## 4602                                                                                                                                                    choice
## 4603                                                                                                                                                   closing
## 4604                                                                                                                                                    coffee
## 4605                                                                                                                                                   comfort
## 4606                                                                                                                                                   compare
## 4607                                                                                                                                                 confusion
## 4608                                                                                                                                                    corona
## 4609                                                                                                                                                   costume
## 4610                                                                                                                                                  coughing
## 4611                                                                                                                                                      coup
## 4612                                                                                                                                                    couple
## 4613                                                                                                                                                     court
## 4614                                                                                                                                                     cover
## 4615                                                                                                                                                   covered
## 4616                                                                                                                                                      cruz
## 4617                                                                                                                                                      cure
## 4618                                                                                                                                                        da
## 4619                                                                                                                                                    damage
## 4620                                                                                                                                                   decided
## 4621                                                                                                                                                  decision
## 4622                                                                                                                                                  delivery
## 4623                                                                                                                                                   denying
## 4624                                                                                                                                                      dept
## 4625                                                                                                                                                     desde
## 4626                                                                                                                                                   deserve
## 4627                                                                                                                                                   destroy
## 4628                                                                                                                                                  director
## 4629                                                                                                                                                   discuss
## 4630                                                                                                                                                discussion
## 4631                                                                                                                                                   dollars
## 4632                                                                                                                                                    donate
## 4633                                                                                                                                                      doug
## 4634                                                                                                                                                    durant
## 4635                                                                                                                                                    easier
## 4636                                                                                                                                                        ed
## 4637                                                                                                                                                 editorial
## 4638                                                                                                                                                   elected
## 4639                                                                                                                                                  employee
## 4640                                                                                                                                                   england
## 4641                                                                                                                                                  enjoying
## 4642                                                                                                                                                  epidemic
## 4643                                                                                                                                                     error
## 4644                                                                                                                                                  eviction
## 4645                                                                                                                                                       eye
## 4646                                                                                                                                                      fail
## 4647                                                                                                                                                     false
## 4648                                                                                                                                                   familia
## 4649                                                                                                                                                       fan
## 4650                                                                                                                                                     fault
## 4651                                                                                                                                                     fears
## 4652                                                                                                                                                    filled
## 4653                                                                                                                                              firefighters
## 4654                                                                                                                                                      flag
## 4655                                                                                                                                                       fue
## 4656                                                                                                                                                   gallery
## 4657                                                                                                                                                     gotta
## 4658                                                                                                                                               governments
## 4659                                                                                                                                                   gracias
## 4660                                                                                                                                                       han
## 4661                                                                                                                                                    hasn�t
## 4662                                                                                                                                             healthtowsorg
## 4663                                                                                                                                                      hero
## 4664                                                                                                                                                      holy
## 4665                                                                                                                                                  homeless
## 4666                                                                                                                                                   hopkins
## 4667                                                                                                                                                   hosting
## 4668                                                                                                                                                 household
## 4669                                                                                                                                                  humanity
## 4670                                                                                                                                                    humans
## 4671                                                                                                                                                  ignoring
## 4672                                                                                                                                              incompetence
## 4673                                                                                                                                                 increased
## 4674                                                                                                                                               independent
## 4675                                                                                                                                                 institute
## 4676                                                                                                                                              insurrection
## 4677                                                                                                                                                        je
## 4678                                                                                                                                                    joined
## 4679                                                                                                                                                     joint
## 4680                                                                                                                                                      jose
## 4681                                                                                                                                                     kills
## 4682                                                                                                                                                       kit
## 4683                                                                                                                                                   largest
## 4684                                                                                                                                                      laws
## 4685                                                                                                                                                    lenoir
## 4686                                                                                                                                                       les
## 4687                                                                                                                                                 liability
## 4688                                                                                                                                                     light
## 4689                                                                                                                                                    lights
## 4690                                                                                                                                                     limit
## 4691                                                                                                                                                    looked
## 4692                                                                                                                                                      lord
## 4693                                                                                                                                                     lungs
## 4694                                                                                                                                             massachusetts
## 4695                                                                                                                                                       med
## 4696                                                                                                                                                      meds
## 4697                                                                                                                                                   mention
## 4698                                                                                                                                                      mild
## 4699                                                                                                                                               mishandling
## 4700                                                                                                                                             mismanagement
## 4701                                                                                                                                                mitigation
## 4702                                                                                                                                                   monster
## 4703                                                                                                                                                    mutant
## 4704                                                                                                                                                       muy
## 4705                                                                                                                                                  northern
## 4706                                                                                                                                                      nose
## 4707                                                                                                                                                  november
## 4708                                                                                                                                                       nye
## 4709                                                                                                                                                    offers
## 4710                                                                                                                                                       omg
## 4711                                                                                                                                                operations
## 4712                                                                                                                                                  outcomes
## 4713                                                                                                                                                      peak
## 4714                                                                                                                                                percentage
## 4715                                                                                                                                                 personnel
## 4716                                                                                                                                               perspective
## 4717                                                                                                                                                    player
## 4718                                                                                                                                                     plays
## 4719                                                                                                                                                       pop
## 4720                                                                                                                                                  possibly
## 4721                                                                                                                                                 potential
## 4722                                                                                                                                                presidency
## 4723                                                                                                                                                  previous
## 4724                                                                                                                                                   private
## 4725                                                                                                                                                  programs
## 4726                                                                                                                                                   protest
## 4727                                                                                                                                                    pulled
## 4728                                                                                                                                                   purpose
## 4729                                                                                                                                                    raging
## 4730                                                                                                                                                     reach
## 4731                                                                                                                                                  reaching
## 4732                                                                                                                                                   reduced
## 4733                                                                                                                                                   request
## 4734                                                                                                                                                  requests
## 4735                                                                                                                                                   require
## 4736                                                                                                                                                 requiring
## 4737                                                                                                                                                resolution
## 4738                                                                                                                                                   respond
## 4739                                                                                                                                                      riot
## 4740                                                                                                                                                        rn
## 4741                                                                                                                                                      road
## 4742                                                                                                                                                       row
## 4743                                                                                                                                                   rutgers
## 4744                                                                                                                                                     salud
## 4745                                                                                                                                                 schedules
## 4746                                                                                                                                                  senators
## 4747                                                                                                                                                     seres
## 4748                                                                                                                                                    served
## 4749                                                                                                                                                     she�s
## 4750                                                                                                                                                      shop
## 4751                                                                                                                                                       smh
## 4752                                                                                                                                                     space
## 4753                                                                                                                                                     spain
## 4754                                                                                                                                                  spending
## 4755                                                                                                                                                 standards
## 4756                                                                                                                                                  standing
## 4757                                                                                                                                                     stick
## 4758                                                                                                                                                     stock
## 4759                                                                                                                                                  survived
## 4760                                                                                                                                                  survivor
## 4761                                                                                                                                                     sworn
## 4762                                                                                                                                                   tarrant
## 4763                                                                                                                                                      tech
## 4764                                                                                                                                                     throw
## 4765                                                                                                                                                    todays
## 4766                                                                                                                                                     track
## 4767                                                                                                                                                  tracking
## 4768                                                                                                                                                 transport
## 4769                                                                                                                                                   trigger
## 4770                                                                                                                                                     tuned
## 4771                                                                                                                                                     union
## 4772                                                                                                                                                  upcoming
## 4773                                                                                                                                                        ur
## 4774                                                                                                                                                   vacunas
## 4775                                                                                                                                                    victim
## 4776                                                                                                                                                     viral
## 4777                                                                                                                                                   walking
## 4778                                                                                                                                                   warning
## 4779                                                                                                                                                   warnock
## 4780                                                                                                                                                   weather
## 4781                                                                                                                                                   webpage
## 4782                                                                                                                                                  whooping
## 4783                                                                                                                                                     who�s
## 4784                                                                                                                                                      wide
## 4785                                                                                                                                                      woke
## 4786                                                                                                                                                      xmas
## 4787                                                                                                                                                    you�ll
## 4788                                                                                                                                           @capublichealth
## 4789                                                                                                                                              @cdcdirector
## 4790                                                                                                                                                @ctulocal1
## 4791                                                                                                                                               @marcorubio
## 4792                                                                                                                                               @prsecsalud
## 4793                                                                                                                                             @redwinggrips
## 4794                                                                                                                                              @seanhannity
## 4795                                                                                                                                                  @thehill
## 4796                                                                                                                                                      @wsj
## 4797                                                                                                                                                  #ausopen
## 4798                                                                                                                                             #backtoschool
## 4799                                                                                                                                                  #boosted
## 4800                                                                                                                                                  #booster
## 4801                                                                                                                                             #camuyessalud
## 4802                                                                                                                                                   #corona
## 4803                                                                                                                                             #coronaupdate
## 4804                                                                                                                                                #covidiots
## 4805                                                                                                                                                      #cps
## 4806                                                                                                                                              #deathsantis
## 4807                                                                                                                                                 #desantis
## 4808                                                                                                                                         #happynewyear2022
## 4809                                                                                                                                                    #icymi
## 4810                                                                                                                                                 #lockdown
## 4811                                                                                                                                          #nomorelockdowns
## 4812                                                                                                                                           #omicronvariant
## 4813                                                                                                                                                 #positive
## 4814                                                                                                                                                 #staysafe
## 4815                                                                                                                                                   #tiktok
## 4816                                                                                                                                                   #travel
## 4817                                                                                                                                                 #trending
## 4818                                                                                                                                              <u+0001f440>
## 4819                                                                                                                      <u+0001f4d6><u+0001f482><u+0001f30d>
## 4820                                                                      <u+0001f637><u+0001f9a0><u+0001f6ab><u+0001f6b6><u+0001f3fd><u+0001f699><u+0001f3e1>
## 4821                                                                                                                                              <u+0001f642>
## 4822                                                                                                                                       <u+0001f64c>matthew
## 4823                                                                                                                                              <u+0001f923>
## 4824                                                                                                                                               2022newyear
## 4825                                                                                                                                                       5th
## 4826                                                                                                                                                       6th
## 4827                                                                                                                                                  accepted
## 4828                                                                                                                                                  advisers
## 4829                                                                                                                                                     ahora
## 4830                                                                                                                                                  airborne
## 4831                                                                                                                                                     alert
## 4832                                                                                                                                                 allegedly
## 4833                                                                                                                                                   alltime
## 4834                                                                                                                                                    amazon
## 4835                                                                                                                                                      amen
## 4836                                                                                                                                                  approved
## 4837                                                                                                                                                     april
## 4838                                                                                                                                                      aqu�
## 4839                                                                                                                                                   attempt
## 4840                                                                                                                                                   awesome
## 4841                                                                                                                                                      a�os
## 4842                                                                                                                                                    banned
## 4843                                                                                                                                                      beer
## 4844                                                                                                                                                   billion
## 4845                                                                                                                                                     bless
## 4846                                                                                                                                                    bodies
## 4847                                                                                                                                                     brain
## 4848                                                                                                                                                    caring
## 4849                                                                                                                                                    charge
## 4850                                                                                                                                                   charged
## 4851                                                                                                                                                    citing
## 4852                                                                                                                                                   claimed
## 4853                                                                                                                                                      club
## 4854                                                                                                                                                  colleges
## 4855                                                                                                                                                    combat
## 4856                                                                                                                                                   complex
## 4857                                                                                                                                                  confused
## 4858                                                                                                                                                  congress
## 4859                                                                                                                                                contagious
## 4860                                                                                                                                                    counts
## 4861                                                                                                                                                   cowboys
## 4862                                                                                                                                                       dad
## 4863                                                                                                                                                    danger
## 4864                                                                                                                                                      dave
## 4865                                                                                                                                                   dealing
## 4866                                                                                                                                                  declared
## 4867                                                                                                                                                 delivered
## 4868                                                                                                                                                     demic
## 4869                                                                                                                                                   despu�s
## 4870                                                                                                                                                  detectar
## 4871                                                                                                                                                  detected
## 4872                                                                                                                                               development
## 4873                                                                                                                                                 diagnosed
## 4874                                                                                                                                              disappointed
## 4875                                                                                                                                                    disney
## 4876                                                                                                                                                  domestic
## 4877                                                                                                                                                    donald
## 4878                                                                                                                                                     dosis
## 4879                                                                                                                                                      drug
## 4880                                                                                                                                               dysfunction
## 4881                                                                                                                                                      east
## 4882                                                                                                                                                  election
## 4883                                                                                                                                                elementary
## 4884                                                                                                                                                 empleados
## 4885                                                                                                                                                encouraged
## 4886                                                                                                                                                     entre
## 4887                                                                                                                                                    equity
## 4888                                                                                                                                                       eso
## 4889                                                                                                                                                 essential
## 4890                                                                                                                                                       eua
## 4891                                                                                                                                                       eve
## 4892                                                                                                                                                      evil
## 4893                                                                                                                                                    excuse
## 4894                                                                                                                                                  expected
## 4895                                                                                                                                                    expire
## 4896                                                                                                                                                   failure
## 4897                                                                                                                                                      fall
## 4898                                                                                                                                                        fl
## 4899                                                                                                                                                     focus
## 4900                                                                                                                                                    forced
## 4901                                                                                                                                                    forgot
## 4902                                                                                                                                                 formation
## 4903                                                                                                                                                     front
## 4904                                                                                                                                                 frontline
## 4905                                                                                                                                                    google
## 4906                                                                                                                                               governments
## 4907                                                                                                                                                      greg
## 4908                                                                                                                                                      guys
## 4909                                                                                                                                                      half
## 4910                                                                                                                                                     hasta
## 4911                                                                                                                                                    helped
## 4912                                                                                                                                                      hold
## 4913                                                                                                                                                  holidays
## 4914                                                                                                                                                 household
## 4915                                                                                                                                   https://t.co/bn1q5xuivm
## 4916                                                                                                                                   https://t.co/vefqrxtcmw
## 4917                                                                                                                                   https://t.co/xjqrggznig
## 4918                                                                                                                                                     icymi
## 4919                                                                                                                                                importance
## 4920                                                                                                                                                  included
## 4921                                                                                                                                                  includes
## 4922                                                                                                                                                   indiana
## 4923                                                                                                                                                 institute
## 4924                                                                                                                                                ivermectin
## 4925                                                                                                                                                      june
## 4926                                                                                                                                                     kills
## 4927                                                                                                                                                       kim
## 4928                                                                                                                                                      kn95
## 4929                                                                                                                                                     labor
## 4930                                                                                                                                                      laws
## 4931                                                                                                                                                      lead
## 4932                                                                                                                                                    leader
## 4933                                                                                                                                                    letter
## 4934                                                                                                                                                   letting
## 4935                                                                                                                                                    levels
## 4936                                                                                                                                                    losing
## 4937                                                                                                                                                    lowest
## 4938                                                                                                                                                     madre
## 4939                                                                                                                                                      main
## 4940                                                                                                                                                  maryland
## 4941                                                                                                                                                     match
## 4942                                                                                                                                                  meetings
## 4943                                                                                                                                                    mental
## 4944                                                                                                                                                 metabolic
## 4945                                                                                                                                                     metro
## 4946                                                                                                                                                    milder
## 4947                                                                                                                                                     mismo
## 4948                                                                                                                                                mitigation
## 4949                                                                                                                                                    mother
## 4950                                                                                                                                                       mtg
## 4951                                                                                                                                                     music
## 4952                                                                                                                                                     named
## 4953                                                                                                                                                   natural
## 4954                                                                                                                                                      navy
## 4955                                                                                                                                                       nfl
## 4956                                                                                                                                                    nurses
## 4957                                                                                                                                                   operate
## 4958                                                                                                                                                   opinion
## 4959                                                                                                                                                      oral
## 4960                                                                                                                                              organization
## 4961                                                                                                                                                  pandemia
## 4962                                                                                                                                                     paper
## 4963                                                                                                                                                   parsons
## 4964                                                                                                                                                    partir
## 4965                                                                                                                                                    passed
## 4966                                                                                                                                                   payment
## 4967                                                                                                                                                      pa�s
## 4968                                                                                                                                                     photo
## 4969                                                                                                                                                      pill
## 4970                                                                                                                                                  policies
## 4971                                                                                                                                               politicians
## 4972                                                                                                                                                  politics
## 4973                                                                                                                                                       ppl
## 4974                                                                                                                                                propaganda
## 4975                                                                                                                                                    proper
## 4976                                                                                                                                                    proven
## 4977                                                                                                                                                   pushing
## 4978                                                                                                                                                        qb
## 4979                                                                                                                                                   qualify
## 4980                                                                                                                                                       qu�
## 4981                                                                                                                                                    racist
## 4982                                                                                                                                                  recorded
## 4983                                                                                                                                                 recovered
## 4984                                                                                                                                                   refused
## 4985                                                                                                                                                repeatedly
## 4986                                                                                                                                                   request
## 4987                                                                                                                                               restaurants
## 4988                                                                                                                                                   reuters
## 4989                                                                                                                                                       rev
## 4990                                                                                                                                                     rogan
## 4991                                                                                                                                                    saliva
## 4992                                                                                                                                                     saved
## 4993                                                                                                                                                       sec
## 4994                                                                                                                                                   segment
## 4995                                                                                                                                                 september
## 4996                                                                                                                                                      shop
## 4997                                                                                                                                                 shouldn�t
## 4998                                                                                                                                                   siempre
## 4999                                                                                                                                                     speed
## 5000                                                                                                                                                     spend
## 5001                                                                                                                                                  spreader
## 5002                                                                                                                                                     stage
## 5003                                                                                                                                                      star
## 5004                                                                                                                                                  stimulus
## 5005                                                                                                                                                     store
## 5006                                                                                                                                                  strategy
## 5007                                                                                                                                                  suffered
## 5008                                                                                                                                                   suggest
## 5009                                                                                                                                                    summer
## 5010                                                                                                                                                   surgeon
## 5011                                                                                                                                                 surgeries
## 5012                                                                                                                                                       tag
## 5013                                                                                                                                                     taste
## 5014                                                                                                                                                    threat
## 5015                                                                                                                                                    tiempo
## 5016                                                                                                                                                     tiene
## 5017                                                                                                                                                    todays
## 5018                                                                                                                                                     touch
## 5019                                                                                                                                                     track
## 5020                                                                                                                                                    unable
## 5021                                                                                                                                                underlying
## 5022                                                                                                                                             understanding
## 5023                                                                                                                                            unincorporated
## 5024                                                                                                                                                     union
## 5025                                                                                                                                               unnecessary
## 5026                                                                                                                                                  unvaxxed
## 5027                                                                                                                                                      urge
## 5028                                                                                                                                                    urging
## 5029                                                                                                                                                     vaxed
## 5030                                                                                                                                                      view
## 5031                                                                                                                                                     viral
## 5032                                                                                                                                                       v�a
## 5033                                                                                                                                                    waited
## 5034                                                                                                                                                   walmart
## 5035                                                                                                                                                 warehouse
## 5036                                                                                                                                                    weight
## 5037                                                                                                                                                      wild
## 5038                                                                                                                                                  williams
## 5039                                                                                                                                                  woodland
## 5040                                                                                                                                                  wouldn�t
## 5041                                                                                                                                                       wwe
## 5042                                                                                                                                                   yorkers
## 5043                                                                                                                                                        �i
## 5044                                                                                                                                             @arashmarkazi
## 5045                                                                                                                                                @drewbrees
## 5046                                                                                                                                              @gavinnewsom
## 5047                                                                                                                                            @gopchairwoman
## 5048                                                                                                                                            @ingrahamangle
## 5049                                                                                                                                                   @maddow
## 5050                                                                                                                                                 @presssec
## 5051                                                                                                                                              @seanhannity
## 5052                                                                                                                                                @thelancet
## 5053                                                                                                                                         #blacklifematters
## 5054                                                                                                                                                 #business
## 5055                                                                                                                                             #icantbreathe
## 5056                                                                                                                                                  #protest
## 5057                                                                                                                                             #protests2020
## 5058                                                                                                                                                   #racism
## 5059                                                                                                                                                 #stayhome
## 5060                                                                                                                                              <u+0001f389>
## 5061                                                                                                                                              <u+0001f440>
## 5062                                                                                                                                              <u+0001f4f8>
## 5063                                                                                                                                              <u+0001f60e>
## 5064                                                                                                                                              <u+0001f64c>
## 5065                                                                                                                                                  <u+062f>
## 5066                                                                                                                                          <u+27a1><u+fe0f>
## 5067                                                                                                <u+2b50><u+2b50><u+2b50><u+2b50><u+2b50><u+2b50>bcnlegendz
## 5068                                                                                                                                                      10am
## 5069                                                                                                                                                       4th
## 5070                                                                                                                                                       6pm
## 5071                                                                                                                                                       7th
## 5072                                                                                                                                                       8pm
## 5073                                                                                                                                                  absentee
## 5074                                                                                                                                                   account
## 5075                                                                                                                                                  accurate
## 5076                                                                                                                                                     adapt
## 5077                                                                                                                                                  addition
## 5078                                                                                                                                                      adds
## 5079                                                                                                                                                    admits
## 5080                                                                                                                                                    adults
## 5081                                                                                                                                                 advantage
## 5082                                                                                                                                                    advice
## 5083                                                                                                                                                    agents
## 5084                                                                                                                                                        ah
## 5085                                                                                                                                                      alto
## 5086                                                                                                                                                    amidst
## 5087                                                                                                                                                       ana
## 5088                                                                                                                                                     andor
## 5089                                                                                                                                                   animals
## 5090                                                                                                                                                      anti
## 5091                                                                                                                                                   appears
## 5092                                                                                                                                               application
## 5093                                                                                                                                                 architect
## 5094                                                                                                                                                       art
## 5095                                                                                                                                                    assist
## 5096                                                                                                                                                  assuming
## 5097                                                                                                                                                   athlete
## 5098                                                                                                                                                   attacks
## 5099                                                                                                                                                   attempt
## 5100                                                                                                                                                 attending
## 5101                                                                                                                                                   authors
## 5102                                                                                                                                                    avenue
## 5103                                                                                                                                                     baker
## 5104                                                                                                                                                      ball
## 5105                                                                                                                                                       ban
## 5106                                                                                                                                                     banks
## 5107                                                                                                                                                     basic
## 5108                                                                                                                                                basketball
## 5109                                                                                                                                                   beating
## 5110                                                                                                                                                   benefit
## 5111                                                                                                                                                      bike
## 5112                                                                                                                                                     bills
## 5113                                                                                                                                                     bitch
## 5114                                                                                                                                                    blamed
## 5115                                                                                                                                                      boss
## 5116                                                                                                                                                      bout
## 5117                                                                                                                                                       box
## 5118                                                                                                                                                   breonna
## 5119                                                                                                                                                  brothers
## 5120                                                                                                                                                    bullet
## 5121                                                                                                                                                      burn
## 5122                                                                                                                                                   burning
## 5123                                                                                                                                                     camps
## 5124                                                                                                                                                   capital
## 5125                                                                                                                                                  carriers
## 5126                                                                                                                                                      cars
## 5127                                                                                                                                                      casa
## 5128                                                                                                                                                  cautious
## 5129                                                                                                                                                      chat
## 5130                                                                                                                                                  claiming
## 5131                                                                                                                                                  cleaning
## 5132                                                                                                                                                     clots
## 5133                                                                                                                                                      cold
## 5134                                                                                                                                                    column
## 5135                                                                                                                                                  comeback
## 5136                                                                                                                                                  comments
## 5137                                                                                                                                                   confirm
## 5138                                                                                                                                                 connected
## 5139                                                                                                                                            constitutional
## 5140                                                                                                                                              construction
## 5141                                                                                                                                                   context
## 5142                                                                                                                                              contribution
## 5143                                                                                                                                                   council
## 5144                                                                                                                                                    courts
## 5145                                                                                                                                                     crash
## 5146                                                                                                                                                   creates
## 5147                                                                                                                                                      crew
## 5148                                                                                                                                                       cuz
## 5149                                                                                                                                                    damned
## 5150                                                                                                                                                     dance
## 5151                                                                                                                                                    danger
## 5152                                                                                                                                                 delivered
## 5153                                                                                                                                                   demands
## 5154                                                                                                                                                    design
## 5155                                                                                                                                                  designed
## 5156                                                                                                                                                 determine
## 5157                                                                                                                                                   develop
## 5158                                                                                                                                                 diagnosis
## 5159                                                                                                                                                       dio
## 5160                                                                                                                                                  directly
## 5161                                                                                                                                                 discussed
## 5162                                                                                                                                                  diseases
## 5163                                                                                                                                                distribute
## 5164                                                                                                                                              distribution
## 5165                                                                                                                                                       don
## 5166                                                                                                                                                    double
## 5167                                                                                                                                                     drama
## 5168                                                                                                                                                     dream
## 5169                                                                                                                                                     earth
## 5170                                                                                                                                                    easily
## 5171                                                                                                                                                      east
## 5172                                                                                                                                                    editor
## 5173                                                                                                                                                   educate
## 5174                                                                                                                                                 epicenter
## 5175                                                                                                                                                  equality
## 5176                                                                                                                                                 equipment
## 5177                                                                                                                                                  estimate
## 5178                                                                                                                                                    exempt
## 5179                                                                                                                                                    expert
## 5180                                                                                                                                                  extended
## 5181                                                                                                                                                       eye
## 5182                                                                                                                                                      fast
## 5183                                                                                                                                                    father
## 5184                                                                                                                                                     fault
## 5185                                                                                                                                                        fb
## 5186                                                                                                                                                   feature
## 5187                                                                                                                                                  february
## 5188                                                                                                                                                      feed
## 5189                                                                                                                                                      feet
## 5190                                                                                                                                                    fellow
## 5191                                                                                                                                                    finish
## 5192                                                                                                                                                     floor
## 5193                                                                                                                                                    flying
## 5194                                                                                                                                               foreclosure
## 5195                                                                                                                                                    fought
## 5196                                                                                                                                                 francisco
## 5197                                                                                                                                                  freaking
## 5198                                                                                                                                               frustration
## 5199                                                                                                                                                        ft
## 5200                                                                                                                                                       fue
## 5201                                                                                                                                                     gains
## 5202                                                                                                                                                       gap
## 5203                                                                                                                                                    gassed
## 5204                                                                                                                                                  generous
## 5205                                                                                                                                                     genes
## 5206                                                                                                                                                     gente
## 5207                                                                                                                                                  gobierno
## 5208                                                                                                                                                   goodbye
## 5209                                                                                                                                                   grandma
## 5210                                                                                                                                                     hacia
## 5211                                                                                                                                                      hall
## 5212                                                                                                                                                   hanging
## 5213                                                                                                                                                    harder
## 5214                                                                                                                                                     hasta
## 5215                                                                                                                                                    hearts
## 5216                                                                                                                                                   helpful
## 5217                                                                                                                                                   hitting
## 5218                                                                                                                                                      holy
## 5219                                                                                                                                                homeowners
## 5220                                                                                                                                               hospitality
## 5221                                                                                                                                                    humans
## 5222                                                                                                                                                   hurting
## 5223                                                                                                                                                     hurts
## 5224                                                                                                                                                   husband
## 5225                                                                                                                                                 hypocrisy
## 5226                                                                                                                                                       idk
## 5227                                                                                                                                                 ignorance
## 5228                                                                                                                                                    ignore
## 5229                                                                                                                                               immediately
## 5230                                                                                                                                                imperative
## 5231                                                                                                                                                   improve
## 5232                                                                                                                                                     india
## 5233                                                                                                                                                inequities
## 5234                                                                                                                                                infectious
## 5235                                                                                                                                                initiative
## 5236                                                                                                                                                    invest
## 5237                                                                                                                                                    iowans
## 5238                                                                                                                                                     italy
## 5239                                                                                                                                                   jaguar�
## 5240                                                                                                                                                     jails
## 5241                                                                                                                                                     kinda
## 5242                                                                                                                                                    latino
## 5243                                                                                                                                                  laughing
## 5244                                                                                                                                                    launch
## 5245                                                                                                                                                   layoffs
## 5246                                                                                                                                                    league
## 5247                                                                                                                                               legislation
## 5248                                                                                                                                               legislative
## 5249                                                                                                                                                   lessons
## 5250                                                                                                                                                      liar
## 5251                                                                                                                                                    linked
## 5252                                                                                                                                                 listening
## 5253                                                                                                                                                      loan
## 5254                                                                                                                                                  longterm
## 5255                                                                                                                                                      loot
## 5256                                                                                                                                                    losing
## 5257                                                                                                                                                    lowest
## 5258                                                                                                                                                       mad
## 5259                                                                                                                                                 magically
## 5260                                                                                                                                                    manage
## 5261                                                                                                                                                  mandates
## 5262                                                                                                                                                    mayors
## 5263                                                                                                                                                     metro
## 5264                                                                                                                                                 minnesota
## 5265                                                                                                                                                   miracle
## 5266                                                                                                                                               mishandling
## 5267                                                                                                                                                   missing
## 5268                                                                                                                                                   moments
## 5269                                                                                                                                                    motogp
## 5270                                                                                                                                                    muscle
## 5271                                                                                                                                                     myers
## 5272                                                                                                                                                     names
## 5273                                                                                                                                              narcissistic
## 5274                                                                                                                                                    nature
## 5275                                                                                                                                                   nervous
## 5276                                                                                                                                                   newsome
## 5277                                                                                                                                                      nose
## 5278                                                                                                                                                    n�mero
## 5279                                                                                                                                                       n�o
## 5280                                                                                                                                                       omg
## 5281                                                                                                                                                    oneawa
## 5282                                                                                                                                                operations
## 5283                                                                                                                                                    oregon
## 5284                                                                                                                                                  outdoors
## 5285                                                                                                                                                   outrage
## 5286                                                                                                                                                      pack
## 5287                                                                                                                                                      paid
## 5288                                                                                                                                                      paso
## 5289                                                                                                                                                   payment
## 5290                                                                                                                                                   pending
## 5291                                                                                                                                                   people�
## 5292                                                                                                                                                    pepper
## 5293                                                                                                                                                percentage
## 5294                                                                                                                                                   persona
## 5295                                                                                                                                                   picture
## 5296                                                                                                                                                   podcast
## 5297                                                                                                                                                       pop
## 5298                                                                                                                                               possibility
## 5299                                                                                                                                               potentially
## 5300                                                                                                                                                    pounds
## 5301                                                                                                                                                precaution
## 5302                                                                                                                                               preparation
## 5303                                                                                                                                                   pretend
## 5304                                                                                                                                                  previous
## 5305                                                                                                                                                   primera
## 5306                                                                                                                                                   project
## 5307                                                                                                                                               protections
## 5308                                                                                                                                                    proven
## 5309                                                                                                                                                   proving
## 5310                                                                                                                                                    pueblo
## 5311                                                                                                                                                   radical
## 5312                                                                                                                                                   raising
## 5313                                                                                                                                                     rally
## 5314                                                                                                                                                   reading
## 5315                                                                                                                                                 recession
## 5316                                                                                                                                                 recognize
## 5317                                                                                                                                                recovering
## 5318                                                                                                                                                registered
## 5319                                                                                                                                              registration
## 5320                                                                                                                                                    rental
## 5321                                                                                                                                                  reporter
## 5322                                                                                                                                                 reporters
## 5323                                                                                                                                                   resumed
## 5324                                                                                                                                                   revenue
## 5325                                                                                                                                                      ring
## 5326                                                                                                                                                   risking
## 5327                                                                                                                                                      rock
## 5328                                                                                                                                                       ron
## 5329                                                                                                                                                      rose
## 5330                                                                                                                                                      rsvp
## 5331                                                                                                                                                    ruined
## 5332                                                                                                                                                      runs
## 5333                                                                                                                                                     safer
## 5334                                                                                                                                                    salons
## 5335                                                                                                                                                     scott
## 5336                                                                                                                                                   seating
## 5337                                                                                                                                                   seattle
## 5338                                                                                                                                                   segment
## 5339                                                                                                                                                   selling
## 5340                                                                                                                                                    senate
## 5341                                                                                                                                                   seniors
## 5342                                                                                                                                                       ser
## 5343                                                                                                                                                     shame
## 5344                                                                                                                                                  shipping
## 5345                                                                                                                                                     shoot
## 5346                                                                                                                                                     shops
## 5347                                                                                                                                                     signs
## 5348                                                                                                                                                    silent
## 5349                                                                                                                                                    silver
## 5350                                                                                                                                                    slight
## 5351                                                                                                                                                     smith
## 5352                                                                                                                                                  socially
## 5353                                                                                                                                                      sold
## 5354                                                                                                                                                solidarity
## 5355                                                                                                                                                     solve
## 5356                                                                                                                                                    sounds
## 5357                                                                                                                                                  southern
## 5358                                                                                                                                                    speech
## 5359                                                                                                                                                   stadium
## 5360                                                                                                                                                    stands
## 5361                                                                                                                                                   state�s
## 5362                                                                                                                                                   stephen
## 5363                                                                                                                                                  stopping
## 5364                                                                                                                                                  strength
## 5365                                                                                                                                                     strip
## 5366                                                                                                                                                 struggles
## 5367                                                                                                                                                    submit
## 5368                                                                                                                                                     sucks
## 5369                                                                                                                                                   suggest
## 5370                                                                                                                                                   summary
## 5371                                                                                                                                                  supplies
## 5372                                                                                                                                                 supremacy
## 5373                                                                                                                                               surgisphere
## 5374                                                                                                                                                 surprised
## 5375                                                                                                                                                       sus
## 5376                                                                                                                                               susceptible
## 5377                                                                                                                                                    taught
## 5378                                                                                                                                                        te
## 5379                                                                                                                                                   teacher
## 5380                                                                                                                                                      tech
## 5381                                                                                                                                                        tf
## 5382                                                                                                                                                     that�
## 5383                                                                                                                                                   they�ll
## 5384                                                                                                                                                 threatens
## 5385                                                                                                                                                  thriving
## 5386                                                                                                                                                   tickets
## 5387                                                                                                                                                     tiene
## 5388                                                                                                                                                  township
## 5389                                                                                                                                                   trabajo
## 5390                                                                                                                                                  trillion
## 5391                                                                                                                                               tripledigit
## 5392                                                                                                                                                  tropical
## 5393                                                                                                                                                     tryna
## 5394                                                                                                                                                        tx
## 5395                                                                                                                                                 uncertain
## 5396                                                                                                                                                underlying
## 5397                                                                                                                                                      urge
## 5398                                                                                                                                                  vacation
## 5399                                                                                                                                                  vaccines
## 5400                                                                                                                                                       van
## 5401                                                                                                                                                  veterans
## 5402                                                                                                                                           villagescovid19
## 5403                                                                                                                                                  violated
## 5404                                                                                                                                                   violent
## 5405                                                                                                                                                  virginia
## 5406                                                                                                                                                 virtually
## 5407                                                                                                                                                  visitors
## 5408                                                                                                                                                    visits
## 5409                                                                                                                                                   vitamin
## 5410                                                                                                                                                     voted
## 5411                                                                                                                                                    wealth
## 5412                                                                                                                                                      wore
## 5413                                                                                                                                                      wrap
## 5414                                                                                                                                                   yorkers
## 5415                                                                                                                                                     you�d
## 5416                                                                                                                                                      zinc
## 5417                                                                                                                                                  �covid19
## 5418                                                                                                                                                      �its
## 5419                                                                                                                                                      @abc
## 5420                                                                                                                                              @arlingtonva
## 5421                                                                                                                                              @barackobama
## 5422                                                                                                                                                @billgates
## 5423                                                                                                                                           @dwuhlfelderlaw
## 5424                                                                                                                                            @fairfaxcounty
## 5425                                                                                                                                           @fallschurchgov
## 5426                                                                                                                                                  @foxnews
## 5427                                                                                                                                              @galeabrewer
## 5428                                                                                                                                               @governorva
## 5429                                                                                                                                               @gtconway3d
## 5430                                                                                                                                                   @hhsgov
## 5431                                                                                                                                           @theblackcaucus
## 5432                                                                                                                                            @thedailybeast
## 5433                                                                                                                                                    @usfda
## 5434                                                                                                                                                     @wlox
## 5435                                                                                                                                                    #abc11
## 5436                                                                                                                                                  #america
## 5437                                                                                                                                          #capitolbuilding
## 5438                                                                                                                                                 #congress
## 5439                                                                                                                                                #covidiots
## 5440                                                                                                                                                     #love
## 5441                                                                                                                                                     #maga
## 5442                                                                                                                                                    #masks
## 5443                                                                                                                                                 #staysafe
## 5444                                                                                                                                         #trumpisacriminal
## 5445                                                                                                                                                      #usa
## 5446                                                                                                                                               #vaccinated
## 5447                                                                                                                                              <u+0001f447>
## 5448                                                                                                                                              <u+0001f44f>
## 5449                                                                                                                                  <u+0001f602><u+0001f602>
## 5450                                                                                                                                              <u+0001f61e>
## 5451                                                                                                                                              <u+0001f62d>
## 5452                                                                                                                                  <u+0001f64f><u+0001f3fc>
## 5453                                                                                                                                              <u+0001f97a>
## 5454                                                                                                                                                  <u+2728>
## 5455                                                                                                                                          <u+2b07><u+fe0f>
## 5456                                                                                                                                                 18yearold
## 5457                                                                                                                                                 1daytotal
## 5458                                                                                                                                                       3rd
## 5459                                                                                                                                                       5th
## 5460                                                                                                                                                    accept
## 5461                                                                                                                                                 activated
## 5462                                                                                                                                                administer
## 5463                                                                                                                                                     admit
## 5464                                                                                                                                                   advance
## 5465                                                                                                                                                        af
## 5466                                                                                                                                                    affect
## 5467                                                                                                                                                affordable
## 5468                                                                                                                                                 afternoon
## 5469                                                                                                                                                    agenda
## 5470                                                                                                                                                    agreed
## 5471                                                                                                                                                     alert
## 5472                                                                                                                                                allocation
## 5473                                                                                                                                                 amendment
## 5474                                                                                                                                                     angry
## 5475                                                                                                                                                    annual
## 5476                                                                                                                                                      ante
## 5477                                                                                                                                                   antonio
## 5478                                                                                                                                                  approach
## 5479                                                                                                                                                      asap
## 5480                                                                                                                                                    assist
## 5481                                                                                                                                                    assume
## 5482                                                                                                                                                  atlantic
## 5483                                                                                                                                                attributed
## 5484                                                                                                                                              availability
## 5485                                                                                                                                                  awaiting
## 5486                                                                                                                                                     aware
## 5487                                                                                                                                                       a�o
## 5488                                                                                                                                                       ban
## 5489                                                                                                                                                      base
## 5490                                                                                                                                                  believed
## 5491                                                                                                                                                    bigger
## 5492                                                                                                                                                       bin
## 5493                                                                                                                                                       bio
## 5494                                                                                                                                                 biotech�s
## 5495                                                                                                                                                     bitch
## 5496                                                                                                                                                     bless
## 5497                                                                                                                                                       blm
## 5498                                                                                                                                                      boss
## 5499                                                                                                                                                    bought
## 5500                                                                                                                                                   bowling
## 5501                                                                                                                                                    breath
## 5502                                                                                                                                                  brothers
## 5503                                                                                                                                                        bs
## 5504                                                                                                                                                  bullshit
## 5505                                                                                                                                                     bunch
## 5506                                                                                                                                                      busy
## 5507                                                                                                                                                       buy
## 5508                                                                                                                                              californians
## 5509                                                                                                                                               californias
## 5510                                                                                                                                                      camp
## 5511                                                                                                                                                  campaign
## 5512                                                                                                                                                    canada
## 5513                                                                                                                                                   captain
## 5514                                                                                                                                                    career
## 5515                                                                                                                                                   careful
## 5516                                                                                                                                                      cass
## 5517                                                                                                                                                        cb
## 5518                                                                                                                                                  ceremony
## 5519                                                                                                                                                     cheap
## 5520                                                                                                                                                   chicken
## 5521                                                                                                                                                   choices
## 5522                                                                                                                                                  choosing
## 5523                                                                                                                                                     chose
## 5524                                                                                                                                                 christian
## 5525                                                                                                                                                cincinnati
## 5526                                                                                                                                                     claim
## 5527                                                                                                                                                   classes
## 5528                                                                                                                                                     clean
## 5529                                                                                                                                                  climbing
## 5530                                                                                                                                                  clinical
## 5531                                                                                                                                                     clots
## 5532                                                                                                                                                  collapse
## 5533                                                                                                                                                  colorado
## 5534                                                                                                                                                  columbus
## 5535                                                                                                                                                commitment
## 5536                                                                                                                                                 communist
## 5537                                                                                                                                                 completed
## 5538                                                                                                                                               congressman
## 5539                                                                                                                                                 countless
## 5540                                                                                                                                                   covid20
## 5541                                                                                                                                                  credible
## 5542                                                                                                                                                     crime
## 5543                                                                                                                                                  criteria
## 5544                                                                                                                                                 customers
## 5545                                                                                                                                                       cuz
## 5546                                                                                                                                                    danger
## 5547                                                                                                                                                 dashboard
## 5548                                                                                                                                                   dauphin
## 5549                                                                                                                                                  davidson
## 5550                                                                                                                                                     deals
## 5551                                                                                                                                                      debt
## 5552                                                                                                                                                 declining
## 5553                                                                                                                                                    defeat
## 5554                                                                                                                                                    defend
## 5555                                                                                                                                                   defense
## 5556                                                                                                                                                deficiency
## 5557                                                                                                                                             deliberations
## 5558                                                                                                                                                  dentists
## 5559                                                                                                                                                depression
## 5560                                                                                                                                                   despu�s
## 5561                                                                                                                                                     devil
## 5562                                                                                                                                                 diciembre
## 5563                                                                                                                                                  diseases
## 5564                                                                                                                                                distribute
## 5565                                                                                                                                                    double
## 5566                                                                                                                                                     drink
## 5567                                                                                                                                                       eat
## 5568                                                                                                                                                 educators
## 5569                                                                                                                                                  efficacy
## 5570                                                                                                                                                    effort
## 5571                                                                                                                                                    elders
## 5572                                                                                                                                                     ellos
## 5573                                                                                                                                                       ems
## 5574                                                                                                                                                encouraged
## 5575                                                                                                                                                     enemy
## 5576                                                                                                                                                     enero
## 5577                                                                                                                                                     enter
## 5578                                                                                                                                                     entre
## 5579                                                                                                                                                 epicenter
## 5580                                                                                                                                                 equitable
## 5581                                                                                                                                                   evening
## 5582                                                                                                                                               exaggerated
## 5583                                                                                                                                                  exciting
## 5584                                                                                                                                                     exist
## 5585                                                                                                                                                  explains
## 5586                                                                                                                                               explanation
## 5587                                                                                                                                                   extreme
## 5588                                                                                                                                                      eyes
## 5589                                                                                                                                                     faith
## 5590                                                                                                                                                     fewer
## 5591                                                                                                                                                    figure
## 5592                                                                                                                                                   fingers
## 5593                                                                                                                                                     fired
## 5594                                                                                                                                                   fitness
## 5595                                                                                                                                                    flight
## 5596                                                                                                                                                 florida�s
## 5597                                                                                                                                                   focused
## 5598                                                                                                                                                     fools
## 5599                                                                                                                                                     fresh
## 5600                                                                                                                                                     gates
## 5601                                                                                                                                                     gente
## 5602                                                                                                                                                    george
## 5603                                                                                                                                                      gift
## 5604                                                                                                                                                    gloves
## 5605                                                                                                                                                     goals
## 5606                                                                                                                                                  goodness
## 5607                                                                                                                                                     grand
## 5608                                                                                                                                               grandparent
## 5609                                                                                                                                                   grocery
## 5610                                                                                                                                                        ha
## 5611                                                                                                                                                      hang
## 5612                                                                                                                                                       hay
## 5613                                                                                                                                                    heerak
## 5614                                                                                                                                                      herd
## 5615                                                                                                                                                    hidden
## 5616                                                                                                                                                     holds
## 5617                                                                                                                                           hospitalization
## 5618                                                                                                                                                     hotel
## 5619                                                                                                                                                   housing
## 5620                                                                                                                                                       hrs
## 5621                                                                                                                                                       hug
## 5622                                                                                                                                                       huh
## 5623                                                                                                                                                     icymi
## 5624                                                                                                                                                    ignore
## 5625                                                                                                                                               improvement
## 5626                                                                                                                                              inauguration
## 5627                                                                                                                                                    inches
## 5628                                                                                                                                                   incited
## 5629                                                                                                                                                  includes
## 5630                                                                                                                                               inexcusable
## 5631                                                                                                                                                inflatable
## 5632                                                                                                                                                    inform
## 5633                                                                                                                                                  informed
## 5634                                                                                                                                                   initial
## 5635                                                                                                                                                  injuries
## 5636                                                                                                                                                    insane
## 5637                                                                                                                                                  invested
## 5638                                                                                                                                                      iowa
## 5639                                                                                                                                             irresponsible
## 5640                                                                                                                                                    island
## 5641                                                                                                                                                       i�d
## 5642                                                                                                                                                     jesus
## 5643                                                                                                                                                       jim
## 5644                                                                                                                                                      john
## 5645                                                                                                                                                    john�s
## 5646                                                                                                                                                       joy
## 5647                                                                                                                                                     judge
## 5648                                                                                                                                                      june
## 5649                                                                                                                                                    jurors
## 5650                                                                                                                                                    kaiser
## 5651                                                                                                                                                    kamara
## 5652                                                                                                                                                    killer
## 5653                                                                                                                                                 knowledge
## 5654                                                                                                                                                     laden
## 5655                                                                                                                                                  lawmaker
## 5656                                                                                                                                                      liar
## 5657                                                                                                                                                     lined
## 5658                                                                                                                                                    listed
## 5659                                                                                                                                                 logistics
## 5660                                                                                                                                                  longterm
## 5661                                                                                                                                                     loser
## 5662                                                                                                                                                      luck
## 5663                                                                                                                                                      lung
## 5664                                                                                                                                                  machines
## 5665                                                                                                                                                     maine
## 5666                                                                                                                                                 manhattan
## 5667                                                                                                                                                 marijuana
## 5668                                                                                                                                                      mark
## 5669                                                                                                                                                  marshall
## 5670                                                                                                                                                       mas
## 5671                                                                                                                                                       mbb
## 5672                                                                                                                                                    memory
## 5673                                                                                                                                                       mes
## 5674                                                                                                                                                     metal
## 5675                                                                                                                                              metropolitan
## 5676                                                                                                                                                     miami
## 5677                                                                                                                                                     miles
## 5678                                                                                                                                                      mine
## 5679                                                                                                                                                   minimum
## 5680                                                                                                                                                montgomery
## 5681                                                                                                                                                     mucho
## 5682                                                                                                                                                     muere
## 5683                                                                                                                                                   muertes
## 5684                                                                                                                                                   mutants
## 5685                                                                                                                                                 mutations
## 5686                                                                                                                                                    m�dico
## 5687                                                                                                                                                   nations
## 5688                                                                                                                                                   natural
## 5689                                                                                                                                                    nature
## 5690                                                                                                                                                      ncaa
## 5691                                                                                                                                                     newly
## 5692                                                                                                                                                      nice
## 5693                                                                                                                                                       odd
## 5694                                                                                                                                                  officers
## 5695                                                                                                                                                  oklahoma
## 5696                                                                                                                                                   ongoing
## 5697                                                                                                                                                      oped
## 5698                                                                                                                                             opportunities
## 5699                                                                                                                                                    option
## 5700                                                                                                                                                originally
## 5701                                                                                                                                                 outbreaks
## 5702                                                                                                                                                   parking
## 5703                                                                                                                                                partnering
## 5704                                                                                                                                                  partners
## 5705                                                                                                                                                personally
## 5706                                                                                                                                                   persons
## 5707                                                                                                                                                      peru
## 5708                                                                                                                                                     photo
## 5709                                                                                                                                                      pick
## 5710                                                                                                                                                    picked
## 5711                                                                                                                                                 poblaci�n
## 5712                                                                                                                                                  positivo
## 5713                                                                                                                                                   posting
## 5714                                                                                                                                               potentially
## 5715                                                                                                                                                      pour
## 5716                                                                                                                                                 practices
## 5717                                                                                                                                                preventing
## 5718                                                                                                                                                     prime
## 5719                                                                                                                                                    prince
## 5720                                                                                                                                                priorities
## 5721                                                                                                                                                    prison
## 5722                                                                                                                                                procedures
## 5723                                                                                                                                              professional
## 5724                                                                                                                                             professionals
## 5725                                                                                                                                                  properly
## 5726                                                                                                                                                protection
## 5727                                                                                                                                                     prove
## 5728                                                                                                                                                        qb
## 5729                                                                                                                                                   qualify
## 5730                                                                                                                                                   quality
## 5731                                                                                                                                                    queens
## 5732                                                                                                                                                  queridos
## 5733                                                                                                                                                   quicker
## 5734                                                                                                                                                     radio
## 5735                                                                                                                                                     raise
## 5736                                                                                                                                                   raising
## 5737                                                                                                                                                    random
## 5738                                                                                                                                                   realize
## 5739                                                                                                                                                  receives
## 5740                                                                                                                                                  recorded
## 5741                                                                                                                                                    remote
## 5742                                                                                                                                                    remove
## 5743                                                                                                                                                   removed
## 5744                                                                                                                                                  replaced
## 5745                                                                                                                                                  requires
## 5746                                                                                                                                                   reserve
## 5747                                                                                                                                                      ride
## 5748                                                                                                                                                     riots
## 5749                                                                                                                                                       rip
## 5750                                                                                                                                                     rocks
## 5751                                                                                                                                                    romney
## 5752                                                                                                                                                      rule
## 5753                                                                                                                                                    r�cord
## 5754                                                                                                                                                    safely
## 5755                                                                                                                                                   samples
## 5756                                                                                                                                                        sc
## 5757                                                                                                                                                  schwartz
## 5758                                                                                                                                                scientific
## 5759                                                                                                                                                 sclerosis
## 5760                                                                                                                                                     score
## 5761                                                                                                                                                 screening
## 5762                                                                                                                                                    secret
## 5763                                                                                                                                                    secure
## 5764                                                                                                                                                   similar
## 5765                                                                                                                                                       sir
## 5766                                                                                                                                                   sisters
## 5767                                                                                                                                                     smart
## 5768                                                                                                                                                     sobre
## 5769                                                                                                                                                    square
## 5770                                                                                                                                                  standard
## 5771                                                                                                                                                      star
## 5772                                                                                                                                                statistics
## 5773                                                                                                                                                  steelers
## 5774                                                                                                                                                    stores
## 5775                                                                                                                                                strategies
## 5776                                                                                                                                                     stuff
## 5777                                                                                                                                                     sucks
## 5778                                                                                                                                                  suddenly
## 5779                                                                                                                                                    suffer
## 5780                                                                                                                                                  supplies
## 5781                                                                                                                                                    supply
## 5782                                                                                                                                                   supreme
## 5783                                                                                                                                                 surpassed
## 5784                                                                                                                                                 surpasses
## 5785                                                                                                                                                 surprised
## 5786                                                                                                                                                       sus
## 5787                                                                                                                                                 suspended
## 5788                                                                                                                                                        s�
## 5789                                                                                                                                                     table
## 5790                                                                                                                                                      task
## 5791                                                                                                                                                     tengo
## 5792                                                                                                                                                     terms
## 5793                                                                                                                                                 terrorism
## 5794                                                                                                                                                   therapy
## 5795                                                                                                                                                  thousand
## 5796                                                                                                                                                        tn
## 5797                                                                                                                                                      todo
## 5798                                                                                                                                                 tonight�s
## 5799                                                                                                                                              trabajadores
## 5800                                                                                                                                                     trade
## 5801                                                                                                                                                    tragic
## 5802                                                                                                                                                   treason
## 5803                                                                                                                                                    turkey
## 5804                                                                                                                                                  tweeting
## 5805                                                                                                                                                    unable
## 5806                                                                                                                                             understanding
## 5807                                                                                                                                                  underway
## 5808                                                                                                                                              undocumented
## 5809                                                                                                                                                   unknown
## 5810                                                                                                                                                        va
## 5811                                                                                                                                                  vaccine�
## 5812                                                                                                                                                    vector
## 5813                                                                                                                                                   vending
## 5814                                                                                                                                                  vigilant
## 5815                                                                                                                                                    virus�
## 5816                                                                                                                                                     voter
## 5817                                                                                                                                                      walk
## 5818                                                                                                                                                     warns
## 5819                                                                                                                                                   washing
## 5820                                                                                                                                                     weird
## 5821                                                                                                                                                     we�ll
## 5822                                                                                                                                                      worn
## 5823                                                                                                                                                       wtf
## 5824                                                                                                                                                        yr
## 5825                                                                                                                                                      zoom
## 5826                                                                                                                                                     @6abc
## 5827                                                                                                                                            @chipubschools
## 5828                                                                                                                                                @desaludpr
## 5829                                                                                                                                                      @dnc
## 5830                                                                                                                                              @gavinnewsom
## 5831                                                                                                                                                @genmeddoc
## 5832                                                                                                                                             @govnedlamont
## 5833                                                                                                                                                     @khou
## 5834                                                                                                                                                    @msnbc
## 5835                                                                                                                                           @nbcconnecticut
## 5836                                                                                                                                                  @nbcnews
## 5837                                                                                                                                                      @nih
## 5838                                                                                                                                             @ohhiitsdolly
## 5839                                                                                                                                               @rpsschools
## 5840                                                                                                                                                      #art
## 5841                                                                                                                                                #billerica
## 5842                                                                                                                                             #breakingnews
## 5843                                                                                                                                                      #cdc
## 5844                                                                                                                                                  #foxnews
## 5845                                                                                                                                                    #gapol
## 5846                                                                                                                                               #healthcare
## 5847                                                                                                                                               #ihuvariant
## 5848                                                                                                                                                #longcovid
## 5849                                                                                                                                                     #mask
## 5850                                                                                                                                                    #masks
## 5851                                                                                                                                          #omnicronvariant
## 5852                                                                                                                                              <u+0001f30e>
## 5853                                                                                                                                         <u+0001f518>davis
## 5854                                                                                                                                              <u+0001f644>
## 5855                                                                                                                                              <u+0001f6a8>
## 5856                                                                                                                                              <u+0001f927>
## 5857                                                                                                                                          <u+2935><u+fe0f>
## 5858                                                                                                                                                      10am
## 5859                                                                                                                                                     49ers
## 5860                                                                                                                                                       8th
## 5861                                                                                                                                                       abc
## 5862                                                                                                                                                  absences
## 5863                                                                                                                                                    acting
## 5864                                                                                                                                                   actions
## 5865                                                                                                                                                     admit
## 5866                                                                                                                                                    affect
## 5867                                                                                                                                                  affected
## 5868                                                                                                                                                    africa
## 5869                                                                                                                                                    agents
## 5870                                                                                                                                                  alarming
## 5871                                                                                                                                                      alex
## 5872                                                                                                                                                     alive
## 5873                                                                                                                                                  americas
## 5874                                                                                                                                                     antes
## 5875                                                                                                                                                   antivax
## 5876                                                                                                                                                 antiviral
## 5877                                                                                                                                                   anxiety
## 5878                                                                                                                                                        ap
## 5879                                                                                                                                                    aren�t
## 5880                                                                                                                                                       art
## 5881                                                                                                                                                 assistant
## 5882                                                                                                                                                       asu
## 5883                                                                                                                                                 attacking
## 5884                                                                                                                                                 attending
## 5885                                                                                                                                                 attention
## 5886                                                                                                                                                    august
## 5887                                                                                                                                                 authority
## 5888                                                                                                                                                background
## 5889                                                                                                                                                    barber
## 5890                                                                                                                                                 basically
## 5891                                                                                                                                                  battling
## 5892                                                                                                                                                    begins
## 5893                                                                                                                                                  believes
## 5894                                                                                                                                                  benefits
## 5895                                                                                                                                                     betty
## 5896                                                                                                                                                      bien
## 5897                                                                                                                                                   biggest
## 5898                                                                                                                                                     bills
## 5899                                                                                                                                                       bio
## 5900                                                                                                                                                    blames
## 5901                                                                                                                                                     blood
## 5902                                                                                                                                                      blue
## 5903                                                                                                                                                      blvd
## 5904                                                                                                                                                     broad
## 5905                                                                                                                                                     brock
## 5906                                                                                                                                                 buildings
## 5907                                                                                                                                                       buy
## 5908                                                                                                                                                      casi
## 5909                                                                                                                                                   causing
## 5910                                                                                                                                                   caution
## 5911                                                                                                                                                       cbs
## 5912                                                                                                                                                        cc
## 5913                                                                                                                                                  checking
## 5914                                                                                                                                                    choice
## 5915                                                                                                                                                    city�s
## 5916                                                                                                                                                ciudadanos
## 5917                                                                                                                                                   climate
## 5918                                                                                                                                                  colorado
## 5919                                                                                                                                              commissioner
## 5920                                                                                                                                                 concerned
## 5921                                                                                                                                                congestion
## 5922                                                                                                                                                considered
## 5923                                                                                                                                                 countries
## 5924                                                                                                                                                  covering
## 5925                                                                                                                                                 coworkers
## 5926                                                                                                                                                       cps
## 5927                                                                                                                                                  criminal
## 5928                                                                                                                                                 criticism
## 5929                                                                                                                                                    cuando
## 5930                                                                                                                                                 dashboard
## 5931                                                                                                                                                  democrat
## 5932                                                                                                                                                 detecci�n
## 5933                                                                                                                                                  diabetes
## 5934                                                                                                                                                    dieron
## 5935                                                                                                                                                       dio
## 5936                                                                                                                                                    direct
## 5937                                                                                                                                                  directly
## 5938                                                                                                                                                distribute
## 5939                                                                                                                                                   dollars
## 5940                                                                                                                                                    donate
## 5941                                                                                                                                                     donde
## 5942                                                                                                                                                     doors
## 5943                                                                                                                                                      drop
## 5944                                                                                                                                                     earth
## 5945                                                                                                                                                      ecmo
## 5946                                                                                                                                                 educators
## 5947                                                                                                                                                      eeuu
## 5948                                                                                                                                                  elevated
## 5949                                                                                                                                                        em
## 5950                                                                                                                                                   endemic
## 5951                                                                                                                                                   episode
## 5952                                                                                                                                                       era
## 5953                                                                                                                                                  escuelas
## 5954                                                                                                                                                      esta
## 5955                                                                                                                                                      este
## 5956                                                                                                                                                      esto
## 5957                                                                                                                                                     estoy
## 5958                                                                                                                                                  examples
## 5959                                                                                                                                                  extended
## 5960                                                                                                                                                   extends
## 5961                                                                                                                                                     fatal
## 5962                                                                                                                                                      feds
## 5963                                                                                                                                                      feet
## 5964                                                                                                                                                    fellow
## 5965                                                                                                                                                     field
## 5966                                                                                                                                                 financial
## 5967                                                                                                                                                  floridas
## 5968                                                                                                                                                    fourth
## 5969                                                                                                                                                framingham
## 5970                                                                                                                                                     fraud
## 5971                                                                                                                                                    french
## 5972                                                                                                                                               frustrating
## 5973                                                                                                                                                     fuera
## 5974                                                                                                                                                      fund
## 5975                                                                                                                                                   gracias
## 5976                                                                                                                                                   greatly
## 5977                                                                                                                                                  greene�s
## 5978                                                                                                                                                   growing
## 5979                                                                                                                                                       gym
## 5980                                                                                                                                                     hacer
## 5981                                                                                                                                                    handle
## 5982                                                                                                                                                    harris
## 5983                                                                                                                                                        hc
## 5984                                                                                                                                                     heads
## 5985                                                                                                                                                      held
## 5986                                                                                                                                                 henderson
## 5987                                                                                                                                                      hill
## 5988                                                                                                                                                      hoax
## 5989                                                                                                                                                   holding
## 5990                                                                                                                                                hospitales
## 5991                                                                                                                                            hospitalizados
## 5992                                                                                                                                                     hotel
## 5993                                                                                                                                   https://t.co/6r7zllznpg
## 5994                                                                                                                                                 hypocrisy
## 5995                                                                                                                                                     idiot
## 5996                                                                                                                                                    idiots
## 5997                                                                                                                                                  impacted
## 5998                                                                                                                                                importante
## 5999                                                                                                                                              incompetence
## 6000                                                                                                                                               ineffective
## 6001                                                                                                                                               informative
## 6002                                                                                                                                                  injuries
## 6003                                                                                                                                                 isolating
## 6004                                                                                                                                                    issued
## 6005                                                                                                                                                     japan
## 6006                                                                                                                                                    jersey
## 6007                                                                                                                                                      joke
## 6008                                                                                                                                                     jones
## 6009                                                                                                                                                      july
## 6010                                                                                                                                                      kirk
## 6011                                                                                                                                                   largest
## 6012                                                                                                                                                 lifestyle
## 6013                                                                                                                                                     light
## 6014                                                                                                                                                   located
## 6015                                                                                                                                                      lord
## 6016                                                                                                                                                     louis
## 6017                                                                                                                                                      lung
## 6018                                                                                                                                                   machine
## 6019                                                                                                                                                   managed
## 6020                                                                                                                                                       map
## 6021                                                                                                                                                    martin
## 6022                                                                                                                                                    masked
## 6023                                                                                                                                                      math
## 6024                                                                                                                                                        md
## 6025                                                                                                                                                       mel
## 6026                                                                                                                                                     miami
## 6027                                                                                                                                                     micah
## 6028                                                                                                                                                      mine
## 6029                                                                                                                                                     minor
## 6030                                                                                                                                                   moments
## 6031                                                                                                                                                    morons
## 6032                                                                                                                                                 mortality
## 6033                                                                                                                                                     moves
## 6034                                                                                                                                                  mutation
## 6035                                                                                                                                                  negativo
## 6036                                                                                                                                                      nice
## 6037                                                                                                                                                      nose
## 6038                                                                                                                                              notification
## 6039                                                                                                                                                    nuevas
## 6040                                                                                                                                                    nuevos
## 6041                                                                                                                                                   options
## 6042                                                                                                                                                     owner
## 6043                                                                                                                                                        pa
## 6044                                                                                                                                                      pain
## 6045                                                                                                                                                  physical
## 6046                                                                                                                                                     piece
## 6047                                                                                                                                                    plague
## 6048                                                                                                                                                    planet
## 6049                                                                                                                                                     plans
## 6050                                                                                                                                                      pool
## 6051                                                                                                                                                       pop
## 6052                                                                                                                                               positividad
## 6053                                                                                                                                                 potential
## 6054                                                                                                                                                   praying
## 6055                                                                                                                                                  pressure
## 6056                                                                                                                                                previously
## 6057                                                                                                                                                   private
## 6058                                                                                                                                                procedures
## 6059                                                                                                                                                protecting
## 6060                                                                                                                                                     proud
## 6061                                                                                                                                                 psychosis
## 6062                                                                                                                                                   purpose
## 6063                                                                                                                                                      quit
## 6064                                                                                                                                                    raging
## 6065                                                                                                                                                recovering
## 6066                                                                                                                                                  refuerzo
## 6067                                                                                                                                                  register
## 6068                                                                                                                                                reinfected
## 6069                                                                                                                                                  remotely
## 6070                                                                                                                                                resolution
## 6071                                                                                                                                                responding
## 6072                                                                                                                                                  responds
## 6073                                                                                                                                                    resume
## 6074                                                                                                                                                     reyes
## 6075                                                                                                                                                     risks
## 6076                                                                                                                                                    roster
## 6077                                                                                                                                                     round
## 6078                                                                                                                                                      ryan
## 6079                                                                                                                                                    safely
## 6080                                                                                                                                                      scam
## 6081                                                                                                                                                    seguir
## 6082                                                                                                                                                   selfish
## 6083                                                                                                                                                   senator
## 6084                                                                                                                                                    series
## 6085                                                                                                                                                      seth
## 6086                                                                                                                                                    shared
## 6087                                                                                                                                                     she�s
## 6088                                                                                                                                                     signs
## 6089                                                                                                                                                    simply
## 6090                                                                                                                                                     sleep
## 6091                                                                                                                                                      soar
## 6092                                                                                                                                                  solution
## 6093                                                                                                                                                      sort
## 6094                                                                                                                                                  southern
## 6095                                                                                                                                                    speech
## 6096                                                                                                                                                  spending
## 6097                                                                                                                                                    spikes
## 6098                                                                                                                                              spokesperson
## 6099                                                                                                                                                    sports
## 6100                                                                                                                                                  standing
## 6101                                                                                                                                                    stands
## 6102                                                                                                                                                    starts
## 6103                                                                                                                                                  straight
## 6104                                                                                                                                                struggling
## 6105                                                                                                                                                   success
## 6106                                                                                                                                                    suffer
## 6107                                                                                                                                                 surpasses
## 6108                                                                                                                                                   survive
## 6109                                                                                                                                                   tarrant
## 6110                                                                                                                                                       tax
## 6111                                                                                                                                                   they�ve
## 6112                                                                                                                                                  thinking
## 6113                                                                                                                                                      todd
## 6114                                                                                                                                                      toll
## 6115                                                                                                                                                     topic
## 6116                                                                                                                                                    travis
## 6117                                                                                                                                                     trend
## 6118                                                                                                                                                      tune
## 6119                                                                                                                                                        uk
## 6120                                                                                                                                                     uncle
## 6121                                                                                                                                              unemployment
## 6122                                                                                                                                                   unified
## 6123                                                                                                                                                   unknown
## 6124                                                                                                                                                  unmasked
## 6125                                                                                                                                                   vehicle
## 6126                                                                                                                                                   village
## 6127                                                                                                                                                  visitors
## 6128                                                                                                                                                volunteers
## 6129                                                                                                                                                     voted
## 6130                                                                                                                                                       voy
## 6131                                                                                                                                                   walking
## 6132                                                                                                                                                      warn
## 6133                                                                                                                                                    wealth
## 6134                                                                                                                                                 wisconsin
## 6135                                                                                                                                                    womens
## 6136                                                                                                                                                 wonderful
## 6137                                                                                                                                                     words
## 6138                                                                                                                                                   writing
## 6139                                                                                                                                                     youth
## 6140                                                                                                                                                  �covid19
## 6141                                                                                                                                                       �if
## 6142                                                                                                                                                       �we
## 6143                                                                                                                                                @azcentral
## 6144                                                                                                                                                 @beechsad
## 6145                                                                                                                                                  @cbsnews
## 6146                                                                                                                                              @dailysignal
## 6147                                                                                                                                               @finallevel
## 6148                                                                                                                                            @gatewaypundit
## 6149                                                                                                                                           @govandybeshear
## 6150                                                                                                                                               @govwhitmer
## 6151                                                                                                                                                 @hrenee80
## 6152                                                                                                                                            @islanderpride
## 6153                                                                                                                                               @mmpadellan
## 6154                                                                                                                                                  @nbcnews
## 6155                                                                                                                                                      @npr
## 6156                                                                                                                                                   @nypost
## 6157                                                                                                                                                  @nytimes
## 6158                                                                                                                                             @palmerreport
## 6159                                                                                                                                                 @politico
## 6160                                                                                                                                               @realtimers
## 6161                                                                                                                                               @senschumer
## 6162                                                                                                                                                 @statnews
## 6163                                                                                                                                               @teapainusa
## 6164                                                                                                                                              @tindallsara
## 6165                                                                                                                                                       @vp
## 6166                                                                                                                                                    @wsbtv
## 6167                                                                                                                                           #alllivesmatter
## 6168                                                                                                                                             #americanflag
## 6169                                                                                                                                                  #atlanta
## 6170                                                                                                                                                #biden2020
## 6171                                                                                                                                          #bluelivesmatter
## 6172                                                                                                                                              #bunkerbitch
## 6173                                                                                                                                                 #cheflife
## 6174                                                                                                                                                #covid2020
## 6175                                                                                                                                                   #crisis
## 6176                                                                                                                                         #disabilityrights
## 6177                                                                                                                                      #georgefloydprotests
## 6178                                                                                                                                                    #human
## 6179                                                                                                                                                  #ialegis
## 6180                                                                                                                                               #leadership
## 6181                                                                                                                                                #occovid19
## 6182                                                                                                                                                 #protests
## 6183                                                                                                                                           #quarantinelife
## 6184                                                                                                                                                 #research
## 6185                                                                                                                                                 #santaana
## 6186                                                                                                                                               #upsidedown
## 6187                                                                                                                              #usa<u+0001f1fa><u+0001f1f8>
## 6188                                                                                                                                                    #vegas
## 6189                                                                                                                                              <u+0001f4cc>
## 6190                                                                                                                                              <u+0001f5a4>
## 6191                                                                                                                                              <u+0001f923>
## 6192                                                                                                          <u+0001f926><u+0001f3fb><u+200d><u+2642><u+fe0f>
## 6193                                                                                                                                              <u+0001f97a>
## 6194                                                                                                                          <u+0627><u+0644><u+0644><u+0647>
## 6195                                                                                                                                                      11th
## 6196                                                                                                                                                      12th
## 6197                                                                                                                                                    24hour
## 6198                                                                                                                                                       abc
## 6199                                                                                                                                                       abt
## 6200                                                                                                                                                   academy
## 6201                                                                                                                                                   accused
## 6202                                                                                                                                                activities
## 6203                                                                                                                                                     actor
## 6204                                                                                                                                                        ad
## 6205                                                                                                                                                    adding
## 6206                                                                                                                                                    adhere
## 6207                                                                                                                                                     adult
## 6208                                                                                                                                                  advocacy
## 6209                                                                                                                                                    africa
## 6210                                                                                                                                                     ahora
## 6211                                                                                                                                                     album
## 6212                                                                                                                                                      alex
## 6213                                                                                                                                                       amp
## 6214                                                                                                                                                  analysis
## 6215                                                                                                                                                   angeles
## 6216                                                                                                                                                 announces
## 6217                                                                                                                                                     antes
## 6218                                                                                                                                                antibodies
## 6219                                                                                                                                                antiracist
## 6220                                                                                                                                                 apartment
## 6221                                                                                                                                                       app
## 6222                                                                                                                                                  arkansas
## 6223                                                                                                                                              asphixiation
## 6224                                                                                                                                                   assault
## 6225                                                                                                                                                  assembly
## 6226                                                                                                                                                    asthma
## 6227                                                                                                                                                    atrisk
## 6228                                                                                                                                                       aug
## 6229                                                                                                                                                  autopsia
## 6230                                                                                                                                                      bail
## 6231                                                                                                                                                      bday
## 6232                                                                                                                                                       bed
## 6233                                                                                                                                                    begins
## 6234                                                                                                                                                    behalf
## 6235                                                                                                                                                  believes
## 6236                                                                                                                                                  berenson
## 6237                                                                                                                                                       bio
## 6238                                                                                                                                                biological
## 6239                                                                                                                                                     birth
## 6240                                                                                                                                                   blaming
## 6241                                                                                                                                                    bleach
## 6242                                                                                                                                                   blessed
## 6243                                                                                                                                                     block
## 6244                                                                                                                                                     blown
## 6245                                                                                                                                                      born
## 6246                                                                                                                                                    bottom
## 6247                                                                                                                                                    bought
## 6248                                                                                                                                                      boys
## 6249                                                                                                                                                     brain
## 6250                                                                                                                                                    breaks
## 6251                                                                                                                                                   breathe
## 6252                                                                                                                                                    bright
## 6253                                                                                                                                                    brings
## 6254                                                                                                                                                     brits
## 6255                                                                                                                                                       bro
## 6256                                                                                                                                                    burden
## 6257                                                                                                                                                       bus
## 6258                                                                                                                                                        ca
## 6259                                                                                                                                                   camping
## 6260                                                                                                                                                   cancels
## 6261                                                                                                                                                   capitol
## 6262                                                                                                                                                     cared
## 6263                                                                                                                                                   carrier
## 6264                                                                                                                                                   causing
## 6265                                                                                                                                                celebrated
## 6266                                                                                                                                               celebrating
## 6267                                                                                                                                                   celulas
## 6268                                                                                                                                                   charged
## 6269                                                                                                                                                   charity
## 6270                                                                                                                                                   charlie
## 6271                                                                                                                                                  chatting
## 6272                                                                                                                                                     cheap
## 6273                                                                                                                                                  checking
## 6274                                                                                                                                                     chill
## 6275                                                                                                                                                    choice
## 6276                                                                                                                                                   choices
## 6277                                                                                                                                                     chris
## 6278                                                                                                                                                 christian
## 6279                                                                                                                                             circumstances
## 6280                                                                                                                                                   citizen
## 6281                                                                                                                                                    client
## 6282                                                                                                                                                    clinic
## 6283                                                                                                                                                    closer
## 6284                                                                                                                                                   clothes
## 6285                                                                                                                                                   coaches
## 6286                                                                                                                                                      code
## 6287                                                                                                                                             collaborative
## 6288                                                                                                                                                  combined
## 6289                                                                                                                                               comfortable
## 6290                                                                                                                                                commercial
## 6291                                                                                                                                                commission
## 6292                                                                                                                                                 committed
## 6293                                                                                                                                                   complex
## 6294                                                                                                                                              constituents
## 6295                                                                                                                                                   content
## 6296                                                                                                                                                contribute
## 6297                                                                                                                                              conveniently
## 6298                                                                                                                                                   cooking
## 6299                                                                                                                                               cornerstone
## 6300                                                                                                                                                   corrupt
## 6301                                                                                                                                                  could�ve
## 6302                                                                                                                                                  county�s
## 6303                                                                                                                                                  courtesy
## 6304                                                                                                                                                   covered
## 6305                                                                                                                                                  covid�19
## 6306                                                                                                                                                       cpr
## 6307                                                                                                                                                    crises
## 6308                                                                                                                                                  criteria
## 6309                                                                                                                                                cuarentena
## 6310                                                                                                                                                   culture
## 6311                                                                                                                                                  curbside
## 6312                                                                                                                                                   curious
## 6313                                                                                                                                                       cvs
## 6314                                                                                                                                                      c�mo
## 6315                                                                                                                                                     daddy
## 6316                                                                                                                                                       dan
## 6317                                                                                                                                                      dare
## 6318                                                                                                                                                  deceased
## 6319                                                                                                                                                    decide
## 6320                                                                                                                                                   decline
## 6321                                                                                                                                                    deeper
## 6322                                                                                                                                                 delicious
## 6323                                                                                                                                                 demanding
## 6324                                                                                                                                             demonstrators
## 6325                                                                                                                                                    denial
## 6326                                                                                                                                                      deny
## 6327                                                                                                                                                   despu�s
## 6328                                                                                                                                               destruction
## 6329                                                                                                                                                      dhec
## 6330                                                                                                                                                        di
## 6331                                                                                                                                                 disasters
## 6332                                                                                                                                                discarding
## 6333                                                                                                                                                discussion
## 6334                                                                                                                                               discussions
## 6335                                                                                                                                                  disgrace
## 6336                                                                                                                                                disgusting
## 6337                                                                                                                                             disinfectants
## 6338                                                                                                                                                  division
## 6339                                                                                                                                                      dock
## 6340                                                                                                                                                   douglas
## 6341                                                                                                                                                     drink
## 6342                                                                                                                                                   drivers
## 6343                                                                                                                                                 drivethru
## 6344                                                                                                                                                  driveway
## 6345                                                                                                                                                  droplets
## 6346                                                                                                                                                     drove
## 6347                                                                                                                                                      dude
## 6348                                                                                                                                                     dudes
## 6349                                                                                                                                                      dump
## 6350                                                                                                                                                    earned
## 6351                                                                                                                                               earthquakes
## 6352                                                                                                                                                   edition
## 6353                                                                                                                                                 educators
## 6354                                                                                                                                                        eh
## 6355                                                                                                                                                   elected
## 6356                                                                                                                                                       emt
## 6357                                                                                                                                                   england
## 6358                                                                                                                                                  ensuring
## 6359                                                                                                                                                   entered
## 6360                                                                                                                                                     entre
## 6361                                                                                                                                                        eo
## 6362                                                                                                                                                     equal
## 6363                                                                                                                                                    equipo
## 6364                                                                                                                                                equivalent
## 6365                                                                                                                                                       esa
## 6366                                                                                                                                                    escape
## 6367                                                                                                                                                       ese
## 6368                                                                                                                                                       eso
## 6369                                                                                                                                                      esos
## 6370                                                                                                                                                   estamos
## 6371                                                                                                                                                     estar
## 6372                                                                                                                                                 estimates
## 6373                                                                                                                                                      esto
## 6374                                                                                                                                                eventually
## 6375                                                                                                                                                everyone�s
## 6376                                                                                                                                                  existing
## 6377                                                                                                                                                  expanded
## 6378                                                                                                                                                   expired
## 6379                                                                                                                                                   explore
## 6380                                                                                                                                                  explores
## 6381                                                                                                                                                    expose
## 6382                                                                                                                                                 fantastic
## 6383                                                                                                                                                   fashion
## 6384                                                                                                                                                    faster
## 6385                                                                                                                                                     favor
## 6386                                                                                                                                                  featured
## 6387                                                                                                                                                      fees
## 6388                                                                                                                                                  fentanyl
## 6389                                                                                                                                                   figured
## 6390                                                                                                                                                   figures
## 6391                                                                                                                                                     filed
## 6392                                                                                                                                                      fill
## 6393                                                                                                                                                       fit
## 6394                                                                                                                                                     fixed
## 6395                                                                                                                                                      flag
## 6396                                                                                                                                               flexibility
## 6397                                                                                                                                                   focused
## 6398                                                                                                                                                     foods
## 6399                                                                                                                                                foundation
## 6400                                                                                                                                                     frame
## 6401                                                                                                                                                       fri
## 6402                                                                                                                                                frontlines
## 6403                                                                                                                                                        ga
## 6404                                                                                                                                                      gain
## 6405                                                                                                                                                 gathering
## 6406                                                                                                                                                     globe
## 6407                                                                                                                                                      golf
## 6408                                                                                                                                                      govt
## 6409                                                                                                                                                     grace
## 6410                                                                                                                                                   gracias
## 6411                                                                                                                                                  graduate
## 6412                                                                                                                                                 graduates
## 6413                                                                                                                                                     grand
## 6414                                                                                                                                               grandfather
## 6415                                                                                                                                               grandmother
## 6416                                                                                                                                                    grants
## 6417                                                                                                                                                     green
## 6418                                                                                                                                                   grocery
## 6419                                                                                                                                                     guard
## 6420                                                                                                                                                    guests
## 6421                                                                                                                                                     guide
## 6422                                                                                                                                                  guilford
## 6423                                                                                                                                                        ha
## 6424                                                                                                                                                    haikus
## 6425                                                                                                                                                    halted
## 6426                                                                                                                                                   hammond
## 6427                                                                                                                                                   handful
## 6428                                                                                                                                                   handled
## 6429                                                                                                                                                   hardest
## 6430                                                                                                                                                    hatred
## 6431                                                                                                                                                      heal
## 6432                                                                                                                                                  hermanos
## 6433                                                                                                                                                      hide
## 6434                                                                                                                                                  historic
## 6435                                                                                                                                                     holds
## 6436                                                                                                                                                 hollywood
## 6437                                                                                                                                                   honored
## 6438                                                                                                                                                  honoring
## 6439                                                                                                                                                     hopes
## 6440                                                                                                                                                   hornets
## 6441                                                                                                                                                  horrible
## 6442                                                                                                                                                    hotels
## 6443                                                                                                                                   https://t.co/5tf26hoijh
## 6444                                                                                                                                   https://t.co/ehhaxnxucc
## 6445                                                                                                                                   https://t.co/pwbfpei4cj
## 6446                                                                                                                                                       huh
## 6447                                                                                                                                                    hunger
## 6448                                                                                                                                                    hungry
## 6449                                                                                                                                                   hygiene
## 6450                                                                                                                                                    iconic
## 6451                                                                                                                                                   illegal
## 6452                                                                                                                                                 immigrant
## 6453                                                                                                                                                   impacts
## 6454                                                                                                                                               implemented
## 6455                                                                                                                                                 impressed
## 6456                                                                                                                                                incredibly
## 6457                                                                                                                                                incubation
## 6458                                                                                                                                                individual
## 6459                                                                                                                                                    infect
## 6460                                                                                                                                                 initially
## 6461                                                                                                                                                    insane
## 6462                                                                                                                                              intersection
## 6463                                                                                                                                             irresponsible
## 6464                                                                                                                                                    jersey
## 6465                                                                                                                                                     jesus
## 6466                                                                                                                                                    jumped
## 6467                                                                                                                                                  kentucky
## 6468                                                                                                                                                      kick
## 6469                                                                                                                                                      kits
## 6470                                                                                                                                                  language
## 6471                                                                                                                                                    larger
## 6472                                                                                                                                                     laugh
## 6473                                                                                                                                                       lbs
## 6474                                                                                                                                                   leaving
## 6475                                                                                                                                                     limit
## 6476                                                                                                                                                   literal
## 6477                                                                                                                                                      lmao
## 6478                                                                                                                                                     loans
## 6479                                                                                                                                                      lord
## 6480                                                                                                                                                      loud
## 6481                                                                                                                                                     louis
## 6482                                                                                                                                                    loving
## 6483                                                                                                                                                     lunch
## 6484                                                                                                                                                     maine
## 6485                                                                                                                                                  majority
## 6486                                                                                                                                                       mal
## 6487                                                                                                                                                   managed
## 6488                                                                                                                                                  managing
## 6489                                                                                                                                                   marches
## 6490                                                                                                                                                  marriott
## 6491                                                                                                                                                     match
## 6492                                                                                                                                                      math
## 6493                                                                                                                                                   meaning
## 6494                                                                                                                                                     medio
## 6495                                                                                                                                                     meses
## 6496                                                                                                                                                   michael
## 6497                                                                                                                                                   mikaela
## 6498                                                                                                                                                       mil
## 6499                                                                                                                                                     minds
## 6500                                                                                                                                               minneapolis
## 6501                                                                                                                                                minorities
## 6502                                                                                                                                            misinformation
## 6503                                                                                                                                                misleading
## 6504                                                                                                                                                  missouri
## 6505                                                                                                                                                  mitigate
## 6506                                                                                                                                                     mixed
## 6507                                                                                                                                                     model
## 6508                                                                                                                                                      moms
## 6509                                                                                                                                                       mon
## 6510                                                                                                                                                     moore
## 6511                                                                                                                                                     moral
## 6512                                                                                                                                                  mourning
## 6513                                                                                                                                                       mpd
## 6514                                                                                                                                                    museum
## 6515                                                                                                                                                     music
## 6516                                                                                                                                                      myth
## 6517                                                                                                                                                        na
## 6518                                                                                                                                                       nah
## 6519                                                                                                                                                     named
## 6520                                                                                                                                                     nasal
## 6521                                                                                                                                                        ne
## 6522                                                                                                                                                  nebraska
## 6523                                                                                                                                                      nejm
## 6524                                                                                                                                                     newly
## 6525                                                                                                                                                       nfl
## 6526                                                                                                                                                      nola
## 6527                                                                                                                                                      noon
## 6528                                                                                                                                                      nope
## 6529                                                                                                                                                 northside
## 6530                                                                                                                                                       nos
## 6531                                                                                                                                                      note
## 6532                                                                                                                                                     nuevo
## 6533                                                                                                                                                      odio
## 6534                                                                                                                                                   offered
## 6535                                                                                                                                             opportunities
## 6536                                                                                                                                                oppression
## 6537                                                                                                                                                organizers
## 6538                                                                                                                                                originally
## 6539                                                                                                                                                   orlando
## 6540                                                                                                                                                      otra
## 6541                                                                                                                                                      otro
## 6542                                                                                                                                                  overseas
## 6543                                                                                                                                               overwhelmed
## 6544                                                                                                                                              overwhelming
## 6545                                                                                                                                                     owned
## 6546                                                                                                                                                     owner
## 6547                                                                                                                                                    oxford
## 6548                                                                                                                                                     padre
## 6549                                                                                                                                                   painful
## 6550                                                                                                                                                 pandemic�
## 6551                                                                                                                                                    parish
## 6552                                                                                                                                                     parks
## 6553                                                                                                                                               participate
## 6554                                                                                                                                              participated
## 6555                                                                                                                                             participation
## 6556                                                                                                                                                   parties
## 6557                                                                                                                                                     pasta
## 6558                                                                                                                                                      path
## 6559                                                                                                                                                  pathetic
## 6560                                                                                                                                                    pelosi
## 6561                                                                                                                                              pennsylvania
## 6562                                                                                                                                                    philly
## 6563                                                                                                                                                      pick
## 6564                                                                                                                                                     plane
## 6565                                                                                                                                                   pleased
## 6566                                                                                                                                                       pls
## 6567                                                                                                                                                 pointless
## 6568                                                                                                                                               politicians
## 6569                                                                                                                                                   popular
## 6570                                                                                                                                               populations
## 6571                                                                                                                                                    porque
## 6572                                                                                                                                                       pos
## 6573                                                                                                                                                  positiva
## 6574                                                                                                                                                postmortem
## 6575                                                                                                                                                     posts
## 6576                                                                                                                                                  powerful
## 6577                                                                                                                                                       pre
## 6578                                                                                                                                                 preparing
## 6579                                                                                                                                              presentation
## 6580                                                                                                                                                  pressure
## 6581                                                                                                                                                    prices
## 6582                                                                                                                                                 privilege
## 6583                                                                                                                                                   produce
## 6584                                                                                                                                                      prof
## 6585                                                                                                                                                 professor
## 6586                                                                                                                                                  programs
## 6587                                                                                                                                                   promise
## 6588                                                                                                                                                 promising
## 6589                                                                                                                                                 protested
## 6590                                                                                                                                                  protocol
## 6591                                                                                                                                                    proved
## 6592                                                                                                                                               provisional
## 6593                                                                                                                                                    prueba
## 6594                                                                                                                                                      pull
## 6595                                                                                                                                                  purchase
## 6596                                                                                                                                                   purpose
## 6597                                                                                                                                                   pushing
## 6598                                                                                                                                                   qualify
## 6599                                                                                                                                                     quiet
## 6600                                                                                                                                                     races
## 6601                                                                                                                                                    racing
## 6602                                                                                                                                                      rage
## 6603                                                                                                                                                   rallies
## 6604                                                                                                                                                     rapid
## 6605                                                                                                                                                     react
## 6606                                                                                                                                                 realizing
## 6607                                                                                                                                                 recommend
## 6608                                                                                                                                           recommendations
## 6609                                                                                                                                                reelection
## 6610                                                                                                                                                   reflect
## 6611                                                                                                                                                    reform
## 6612                                                                                                                                                   regular
## 6613                                                                                                                                                 relations
## 6614                                                                                                                                                  releases
## 6615                                                                                                                                                   remains
## 6616                                                                                                                                                    remove
## 6617                                                                                                                                                   renters
## 6618                                                                                                                                                    repeat
## 6619                                                                                                                                                  resident
## 6620                                                                                                                                            responsibility
## 6621                                                                                                                                                   restart
## 6622                                                                                                                                                  retracts
## 6623                                                                                                                                                    riding
## 6624                                                                                                                                                     riley
## 6625                                                                                                                                                     river
## 6626                                                                                                                                                        rn
## 6627                                                                                                                                                   routine
## 6628                                                                                                                                                       row
## 6629                                                                                                                                                      rush
## 6630                                                                                                                                                    russia
## 6631                                                                                                                                                     sadly
## 6632                                                                                                                                                     saint
## 6633                                                                                                                                                      sale
## 6634                                                                                                                                                     salon
## 6635                                                                                                                                                sanitation
## 6636                                                                                                                                                      scam
## 6637                                                                                                                                                 scientist
## 6638                                                                                                                                                   screwed
## 6639                                                                                                                                                    seizes
## 6640                                                                                                                                                    select
## 6641                                                                                                                                                     serve
## 6642                                                                                                                                                    served
## 6643                                                                                                                                                      sets
## 6644                                                                                                                                                   setting
## 6645                                                                                                                                                    sexual
## 6646                                                                                                                                                    shared
## 6647                                                                                                                                                     shift
## 6648                                                                                                                                                     shirt
## 6649                                                                                                                                                 shortterm
## 6650                                                                                                                                                 shuttered
## 6651                                                                                                                                             significantly
## 6652                                                                                                                                                        sj
## 6653                                                                                                                                                 skyrocket
## 6654                                                                                                                                                       smh
## 6655                                                                                                                                                    soccer
## 6656                                                                                                                                                  soldiers
## 6657                                                                                                                                                 solutions
## 6658                                                                                                                                                    sooner
## 6659                                                                                                                                                  soreness
## 6660                                                                                                                                                      soul
## 6661                                                                                                                                                    spaces
## 6662                                                                                                                                                    speaks
## 6663                                                                                                                                                  specific
## 6664                                                                                                                                              specifically
## 6665                                                                                                                                                      spin
## 6666                                                                                                                                                     spite
## 6667                                                                                                                                                     spoke
## 6668                                                                                                                                                     spray
## 6669                                                                                                                                                   spreads
## 6670                                                                                                                                                 standing�
## 6671                                                                                                                                                 statewide
## 6672                                                                                                                                                stayathome
## 6673                                                                                                                                                    stayed
## 6674                                                                                                                                                     stood
## 6675                                                                                                                                                   strange
## 6676                                                                                                                                                 streaming
## 6677                                                                                                                                                    stroke
## 6678                                                                                                                                                     stuck
## 6679                                                                                                                                                    subway
## 6680                                                                                                                                                successful
## 6681                                                                                                                                                 suffering
## 6682                                                                                                                                                  suggests
## 6683                                                                                                                                                   supreme
## 6684                                                                                                                                                    surely
## 6685                                                                                                                                                 surpassed
## 6686                                                                                                                                                  surprise
## 6687                                                                                                                                                surprising
## 6688                                                                                                                                               surrounding
## 6689                                                                                                                                                   swedens
## 6690                                                                                                                                                   symptom
## 6691                                                                                                                                                     teams
## 6692                                                                                                                                                technology
## 6693                                                                                                                                                       tee
## 6694                                                                                                                                                 temporary
## 6695                                                                                                                                                  terrific
## 6696                                                                                                                                                   therapy
## 6697                                                                                                                                                    ticket
## 6698                                                                                                                                                 tidelands
## 6699                                                                                                                                                      tied
## 6700                                                                                                                                                     tight
## 6701                                                                                                                                                  timeline
## 6702                                                                                                                                                       tip
## 6703                                                                                                                                                    tissue
## 6704                                                                                                                                                        tn
## 6705                                                                                                                                                       toe
## 6706                                                                                                                                                      tool
## 6707                                                                                                                                                     tools
## 6708                                                                                                                                                      tops
## 6709                                                                                                                                                  transfer
## 6710                                                                                                                                                   trump�s
## 6711                                                                                                                                                    tshirt
## 6712                                                                                                                                                        uh
## 6713                                                                                                                                              unacceptable
## 6714                                                                                                                                             uncomfortable
## 6715                                                                                                                                                    unique
## 6716                                                                                                                                                    unjust
## 6717                                                                                                                                                  unmasked
## 6718                                                                                                                                                  updating
## 6719                                                                                                                                                        uv
## 6720                                                                                                                                              vaccinations
## 6721                                                                                                                                                ventilator
## 6722                                                                                                                                                   version
## 6723                                                                                                                                                     views
## 6724                                                                                                                                                  visiting
## 6725                                                                                                                                                    voices
## 6726                                                                                                                                                       v�a
## 6727                                                                                                                                                    waited
## 6728                                                                                                                                                      wall
## 6729                                                                                                                                                      warm
## 6730                                                                                                                                                      warn
## 6731                                                                                                                                                     warns
## 6732                                                                                                                                                  webinars
## 6733                                                                                                                                                   wedding
## 6734                                                                                                                                                   weren�t
## 6735                                                                                                                                                       wet
## 6736                                                                                                                                                        wi
## 6737                                                                                                                                                    willie
## 6738                                                                                                                                                    window
## 6739                                                                                                                                                        wo
## 6740                                                                                                                                                 worldwide
## 6741                                                                                                                                                     write
## 6742                                                                                                                                                    writer
## 6743                                                                                                                                                   yelling
## 6744                                                                                                                                                       yep
## 6745                                                                                                                                                yubasutter
## 6746                                                                                                                                                  �however
## 6747                                                                                                                                                       �in
## 6748                                                                                                                                                       �it
## 6749                                                                                                                                                      �you
## 6750                                                                                                                                                    @1pckt
## 6751                                                                                                                                                  @acpsk12
## 6752                                                                                                                                             @adamnedsmith
## 6753                                                                                                                                          @allison23829042
## 6754                                                                                                                                           @allisonpearson
## 6755                                                                                                                                                 @amcotton
## 6756                                                                                                                                          @ananursingworld
## 6757                                                                                                                                           @andrewrchapman
## 6758                                                                                                                                          @annavic88472217
## 6759                                                                                                                                              @apsvirginia
## 6760                                                                                                                                             @arlingtondhs
## 6761                                                                                                                                           @atheistbigfoot
## 6762                                                                                                                                                 @avicwins
## 6763                                                                                                                                                    @azgop
## 6764                                                                                                                                               @babetruth2
## 6765                                                                                                                                                @betaxsoul
## 6766                                                                                                                                             @candysmith74
## 6767                                                                                                                                             @cleisthenes5
## 6768                                                                                                                                                @cubesteve
## 6769                                                                                                                                            @dementedhuman
## 6770                                                                                                                                                  @demgovs
## 6771                                                                                                                                                @demmayors
## 6772                                                                                                                                                @demwitted
## 6773                                                                                                                                                  @docsnoe
## 6774                                                                                                                                               @drericding
## 6775                                                                                                                                            @drsanjaygupta
## 6776                                                                                                                                              @edwardwongy
## 6777                                                                                                                                                 @emilyfri
## 6778                                                                                                                                                  @enby896
## 6779                                                                                                                                                 @fcpsnews
## 6780                                                                                                                                               @fearingaid
## 6781                                                                                                                                              @fixedintime
## 6782                                                                                                                                                     @fox4
## 6783                                                                                                                                              @fullmetalja
## 6784                                                                                                                                               @galcondude
## 6785                                                                                                                                                      @gma
## 6786                                                                                                                                                 @govstitt
## 6787                                                                                                                                             @gregabbotttx
## 6788                                                                                                                                            @hackensackumc
## 6789                                                                                                                                           @hesanaughtyboy
## 6790                                                                                                                                                 @housegop
## 6791                                                                                                                                                @jeffcapel
## 6792                                                                                                                                               @johnkrahn2
## 6793                                                                                                                                                  @joshgad
## 6794                                                                                                                                          @jpmommawilliams
## 6795                                                                                                                                             @kesterlowers
## 6796                                                                                                                                             @kylenabecker
## 6797                                                                                                                                            @linahidalgotx
## 6798                                                                                                                                              @lincolngrox
## 6799                                                                                                                                                    @maloj
## 6800                                                                                                                                                @megavolt1
## 6801                                                                                                                                             @meghanmccain
## 6802                                                                                                                                            @mollyjongfast
## 6803                                                                                                                                                @mtgreenee
## 6804                                                                                                                                           @mysterysolvent
## 6805                                                                                                                                           @nyccomptroller
## 6806                                                                                                                                           @nychealthcommr
## 6807                                                                                                                                           @nycspeakercojo
## 6808                                                                                                                                                  @omeagoz
## 6809                                                                                                                                                   @ossoff
## 6810                                                                                                                                             @pattonoswalt
## 6811                                                                                                                                             @pghsportsnow
## 6812                                                                                                                                           @projectlincoln
## 6813                                                                                                                                             @quiptography
## 6814                                                                                                                                           @randallwoodfin
## 6815                                                                                                                                              @realliously
## 6816                                                                                                                                          @reverendwarnock
## 6817                                                                                                                                               @rossgilroy
## 6818                                                                                                                                                     @s8mb
## 6819                                                                                                                                          @sariellaeternal
## 6820                                                                                                                                              @sbuddie1877
## 6821                                                                                                                                                @sdarkmore
## 6822                                                                                                                                             @senatemajldr
## 6823                                                                                                                                               @senschumer
## 6824                                                                                                                                              @sibleyheart
## 6825                                                                                                                                               @simonb1958
## 6826                                                                                                                                                 @smug2bme
## 6827                                                                                                                                           @snowleopards12
## 6828                                                                                                                                            @splintersimba
## 6829                                                                                                                                              @tcunderdahl
## 6830                                                                                                                                            @telemundonews
## 6831                                                                                                                                               @th1rt3entm
## 6832                                                                                                                                              @theleagueam
## 6833                                                                                                                                             @tkthekitsune
## 6834                                                                                                                                                   @vdhgov
## 6835                                                                                                                                                  @wiguy45
## 6836                                                                                                                                               @wilkyway71
## 6837                                                                                                                                           @willsworldview
## 6838                                                                                                                                                  @wmmanry
## 6839                                                                                                                                               @wolfpak561
## 6840                                                                                                                                           @yourmomspants1
## 6841                                                                                                                                              @zalphaprime
## 6842                                                                                                                                              #arresttrump
## 6843                                                                                                                                      #coronaviruspandemic
## 6844                                                                                                                                       #coronavirussicilia
## 6845                                                                                                                                                   #eagles
## 6846                                                                                                                                            #getvaccinated
## 6847                                                                                                                                                   #health
## 6848                                                                                                                                              #igottheshot
## 6849                                                                                                                                           #modernavaccine
## 6850                                                                                                                                                #newsfirst
## 6851                                                                                                                                                       #no
## 6852                                                                                                                                                  #pncguam
## 6853                                                                                                                                                  #podcast
## 6854                                                                                                                                               #quarantine
## 6855                                                                                                                                                   #saints
## 6856                                                                                                                                                  #science
## 6857                                                                                                                                                 #steelers
## 6858                                                                                                                                                    #texas
## 6859                                                                                                                                                      #tla
## 6860                                                                                                                                               #trumptapes
## 6861                                                                                                                                                 #vaccines
## 6862                                                                                                                                        #vaccinessavelives
## 6863                                                                                                                                             #vaccineswork
## 6864                                                                                                                                                    #vegas
## 6865                                                                                                                                                #washhands
## 6866                                                                                                                                            #wearadamnmask
## 6867                                                                                                                                  <u+0001f1e8><u+0001f1e6>
## 6868                                                                                                                                  <u+0001f1fa><u+0001f1f8>
## 6869                                                                                                                      <u+0001f3c8><u+0001f3c8><u+0001f3c8>
## 6870                                  <u+0001f44d><u+0001f3fb><u+0001f603><u+0001f64c><u+0001f3fc><u+0001f4b5><u+0001f919><u+0001f3fc><u+0001f637><u+0001f9fb>
## 6871                                                                                                                                              <u+0001f4f8>
## 6872                                                                                                                                              <u+0001f525>
## 6873                                                                                                                                              <u+0001f609>
## 6874                                                                                                                                              <u+0001f612>
## 6875                                                                                                                                              <u+0001f621>
## 6876                                                                                                                                              <u+0001f629>
## 6877                                                                                                                                              <u+0001f631>
## 6878                                                                      <u+0001f637><u+0001f9a0><u+0001f6ab><u+0001f6b6><u+0001f3fd><u+0001f699><u+0001f3e1>
## 6879                                                                                                                                              <u+0001f6a8>
## 6880                                                                                                                                              <u+0001f928>
## 6881                                                                                                                                              <u+0001f92f>
## 6882                                                                                                                                          <u+2665><u+fe0f>
## 6883                                                                                                                                          <u+26aa><u+fe0f>
## 6884                                                                                                                                          <u+27a1><u+fe0f>
## 6885                                                                                                                                                     01jan
## 6886                                                                                                                                                     02jan
## 6887                                                                                                                                                     03jan
## 6888                                                                                                                                                     04jan
## 6889                                                                                                                                                      100k
## 6890                                                                                                                                                      11pm
## 6891                                                                                                                                                      20th
## 6892                                                                                                                                                      30th
## 6893                                                                                                                                                      350k
## 6894                                                                                                                                                       5pm
## 6895                                                                                                                                                     815am
## 6896                                                                                                                                                accurately
## 6897                                                                                                                                                  adequate
## 6898                                                                                                                                                  admitted
## 6899                                                                                                                                                 advantage
## 6900                                                                                                                                                   affects
## 6901                                                                                                                                                    agency
## 6902                                                                                                                                                     ahora
## 6903                                                                                                                                                     ain�t
## 6904                                                                                                                                                  allowing
## 6905                                                                                                                                                ambulances
## 6906                                                                                                                                                 america�s
## 6907                                                                                                                                                  analysis
## 6908                                                                                                                                                      andy
## 6909                                                                                                                                                 aneurysms
## 6910                                                                                                                                                     antes
## 6911                                                                                                                                                      anti
## 6912                                                                                                                                                    antifa
## 6913                                                                                                                                               application
## 6914                                                                                                                                                     arena
## 6915                                                                                                                                                      army
## 6916                                                                                                                                                    arrest
## 6917                                                                                                                                                   arrival
## 6918                                                                                                                                                       art
## 6919                                                                                                                                                   ashamed
## 6920                                                                                                                                                     asses
## 6921                                                                                                                                                 assistant
## 6922                                                                                                                                               astrazeneca
## 6923                                                                                                                                                       as�
## 6924                                                                                                                                                  athletes
## 6925                                                                                                                                                 athletics
## 6926                                                                                                                                                   attempt
## 6927                                                                                                                                                attendance
## 6928                                                                                                                                                     audio
## 6929                                                                                                                                                    august
## 6930                                                                                                                                                    austin
## 6931                                                                                                                                               authorities
## 6932                                                                                                                                                 awareness
## 6933                                                                                                                                                     awful
## 6934                                                                                                                                                      a�os
## 6935                                                                                                                                                   balance
## 6936                                                                                                                                                    ballot
## 6937                                                                                                                                                      bank
## 6938                                                                                                                                                    barely
## 6939                                                                                                                                              basketball�s
## 6940                                                                                                                                                     begun
## 6941                                                                                                                                                   beshear
## 6942                                                                                                                                                    blasio
## 6943                                                                                                                                                    bodies
## 6944                                                                                                                                                    booked
## 6945                                                                                                                                                      bout
## 6946                                                                                                                                                       box
## 6947                                                                                                                                                       boy
## 6948                                                                                                                                                     brady
## 6949                                                                                                                                                   breathe
## 6950                                                                                                                                                    bright
## 6951                                                                                                                                                  brighter
## 6952                                                                                                                                                    brings
## 6953                                                                                                                                                 broadcast
## 6954                                                                                                                                                       btw
## 6955                                                                                                                                                  buckeyes
## 6956                                                                                                                                                     build
## 6957                                                                                                                                                      burn
## 6958                                                                                                                                                       bye
## 6959                                                                                                                                                      cada
## 6960                                                                                                                                                     cages
## 6961                                                                                                                                                    camera
## 6962                                                                                                                                                 cancelled
## 6963                                                                                                                                                capitalism
## 6964                                                                                                                                                    caring
## 6965                                                                                                                                                      cars
## 6966                                                                                                                                                   cerebro
## 6967                                                                                                                                               challenging
## 6968                                                                                                                                                   charged
## 6969                                                                                                                                                 charlotte
## 6970                                                                                                                                                   chicago
## 6971                                                                                                                                                  cleaning
## 6972                                                                                                                                                      code
## 6973                                                                                                                                               comfortably
## 6974                                                                                                                                              commissioner
## 6975                                                                                                                                                   compete
## 6976                                                                                                                                                 complicit
## 6977                                                                                                                                                  computer
## 6978                                                                                                                                                   condado
## 6979                                                                                                                                                 condition
## 6980                                                                                                                                                confidence
## 6981                                                                                                                                                  congrats
## 6982                                                                                                                                                 connected
## 6983                                                                                                                                               connecticut
## 6984                                                                                                                                                connection
## 6985                                                                                                                                                continuing
## 6986                                                                                                                                                  contract
## 6987                                                                                                                                               contradicts
## 6988                                                                                                                                              conversation
## 6989                                                                                                                                                   convert
## 6990                                                                                                                                                    cooper
## 6991                                                                                                                                                      core
## 6992                                                                                                                                                    corner
## 6993                                                                                                                                                corruption
## 6994                                                                                                                                                   counted
## 6995                                                                                                                                                  counting
## 6996                                                                                                                                                  covering
## 6997                                                                                                                                                   cowboys
## 6998                                                                                                                                                 coworkers
## 6999                                                                                                                                                  creative
## 7000                                                                                                                                                    crimes
## 7001                                                                                                                                                     crowd
## 7002                                                                                                                                                   crowded
## 7003                                                                                                                                                        ct
## 7004                                                                                                                                                    cuando
## 7005                                                                                                                                                      cuts
## 7006                                                                                                                                                   daniels
## 7007                                                                                                                                                      dare
## 7008                                                                                                                                                     dates
## 7009                                                                                                                                                      dave
## 7010                                                                                                                                                     days�
## 7011                                                                                                                                                      day�
## 7012                                                                                                                                                 deadliest
## 7013                                                                                                                                                   decades
## 7014                                                                                                                                                    decide
## 7015                                                                                                                                                   decline
## 7016                                                                                                                                                  declined
## 7017                                                                                                                                                  decrease
## 7018                                                                                                                                                    deeply
## 7019                                                                                                                                                   delayed
## 7020                                                                                                                                                    delays
## 7021                                                                                                                                                   deliver
## 7022                                                                                                                                                 delivered
## 7023                                                                                                                                                    denial
## 7024                                                                                                                                                   depends
## 7025                                                                                                                                                  detected
## 7026                                                                                                                                               devastating
## 7027                                                                                                                                                   develop
## 7028                                                                                                                                               development
## 7029                                                                                                                                                  diabetes
## 7030                                                                                                                                                      dick
## 7031                                                                                                                                                    dining
## 7032                                                                                                                                                    dinner
## 7033                                                                                                                                                  disaster
## 7034                                                                                                                                                discharged
## 7035                                                                                                                                        disproportionately
## 7036                                                                                                                                                        dm
## 7037                                                                                                                                                  drinking
## 7038                                                                                                                                                    driven
## 7039                                                                                                                                                      drop
## 7040                                                                                                                                                  dropping
## 7041                                                                                                                                                     drugs
## 7042                                                                                                                                                        dt
## 7043                                                                                                                                                      dumb
## 7044                                                                                                                                                   dumbass
## 7045                                                                                                                                                      d�as
## 7046                                                                                                                                                    eagles
## 7047                                                                                                                                                    eating
## 7048                                                                                                                                               effectively
## 7049                                                                                                                                                 efficient
## 7050                                                                                                                                                 elections
## 7051                                                                                                                                                elementary
## 7052                                                                                                                                                      ella
## 7053                                                                                                                                                   embrace
## 7054                                                                                                                                                 employers
## 7055                                                                                                                                                       emt
## 7056                                                                                                                                               environment
## 7057                                                                                                                                            epidemiologist
## 7058                                                                                                                                                  epiphany
## 7059                                                                                                                                               essentially
## 7060                                                                                                                                                    estaba
## 7061                                                                                                                                                   estados
## 7062                                                                                                                                                    exempt
## 7063                                                                                                                                                 expanding
## 7064                                                                                                                                                    expire
## 7065                                                                                                                                                   faculty
## 7066                                                                                                                                                       fat
## 7067                                                                                                                                                   fatigue
## 7068                                                                                                                                                   feature
## 7069                                                                                                                                                    female
## 7070                                                                                                                                                      file
## 7071                                                                                                                                                   filming
## 7072                                                                                                                                                  flouting
## 7073                                                                                                                                                    fooled
## 7074                                                                                                                                                    forces
## 7075                                                                                                                                                      ford
## 7076                                                                                                                                                frequently
## 7077                                                                                                                                                 froteriza
## 7078                                                                                                                                                    fumble
## 7079                                                                                                                                                  function
## 7080                                                                                                                                                        ga
## 7081                                                                                                                                                      gain
## 7082                                                                                                                                                 galveston
## 7083                                                                                                                                                   garbage
## 7084                                                                                                                                                       gas
## 7085                                                                                                                                                     girls
## 7086                                                                                                                                                      goal
## 7087                                                                                                                                                   goodbye
## 7088                                                                                                                                                      govt
## 7089                                                                                                                                                    grammy
## 7090                                                                                                                                                    grande
## 7091                                                                                                                                               grandfather
## 7092                                                                                                                                                   granted
## 7093                                                                                                                                                    gratis
## 7094                                                                                                                                                       grc
## 7095                                                                                                                                                      grip
## 7096                                                                                                                                                    guilty
## 7097                                                                                                                                                     hacer
## 7098                                                                                                                                                      hana
## 7099                                                                                                                                                      harm
## 7100                                                                                                                                                    harris
## 7101                                                                                                                                                     hasta
## 7102                                                                                                                                                    hawaii
## 7103                                                                                                                                                   hidalgo
## 7104                                                                                                                                                      hide
## 7105                                                                                                                                                    hockey
## 7106                                                                                                                                                    honest
## 7107                                                                                                                                                   honored
## 7108                                                                                                                                                  honoring
## 7109                                                                                                                                                     hopes
## 7110                                                                                                                                   https://t.co/nyhnf9dgyh
## 7111                                                                                                                                   https://t.co/v1fv2pwbcd
## 7112                                                                                                                                                    hungry
## 7113                                                                                                                                                       idk
## 7114                                                                                                                                                        il
## 7115                                                                                                                                                   illness
## 7116                                                                                                                                              immunization
## 7117                                                                                                                                                 impeached
## 7118                                                                                                                                                   improve
## 7119                                                                                                                                                 inability
## 7120                                                                                                                                                 inbetween
## 7121                                                                                                                                                 infecting
## 7122                                                                                                                                                   injured
## 7123                                                                                                                                                     jason
## 7124                                                                                                                                                      joel
## 7125                                                                                                                                                   joining
## 7126                                                                                                                                                 jonestown
## 7127                                                                                                                                                    joseph
## 7128                                                                                                                                                      josh
## 7129                                                                                                                                                       jps
## 7130                                                                                                                                                      jump
## 7131                                                                                                                                                   justice
## 7132                                                                                                                                                     kelly
## 7133                                                                                                                                                       kim
## 7134                                                                                                                                                    latino
## 7135                                                                                                                                              legalization
## 7136                                                                                                                                               legislature
## 7137                                                                                                                                                    lethal
## 7138                                                                                                                                                     lifes
## 7139                                                                                                                                                     links
## 7140                                                                                                                                                   located
## 7141                                                                                                                                                  location
## 7142                                                                                                                                                    locked
## 7143                                                                                                                                                    loving
## 7144                                                                                                                                                    mailin
## 7145                                                                                                                                                      main
## 7146                                                                                                                                                      mall
## 7147                                                                                                                                                    manage
## 7148                                                                                                                                                  mandates
## 7149                                                                                                                                                 mandatory
## 7150                                                                                                                                                       map
## 7151                                                                                                                                                      mary
## 7152                                                                                                                                                    masked
## 7153                                                                                                                                                   measure
## 7154                                                                                                                                                      meat
## 7155                                                                                                                                                 mentioned
## 7156                                                                                                                                                       met
## 7157                                                                                                                                                 milestone
## 7158                                                                                                                                                  ministry
## 7159                                                                                                                                               minnesotans
## 7160                                                                                                                                                    minute
## 7161                                                                                                                                                  missouri
## 7162                                                                                                                                                    mobile
## 7163                                                                                                                                                  modeling
## 7164                                                                                                                                                     moron
## 7165                                                                                                                                                     movie
## 7166                                                                                                                                                    movies
## 7167                                                                                                                                                    mulkey
## 7168                                                                                                                                                    murder
## 7169                                                                                                                                                     names
## 7170                                                                                                                                                 nashville
## 7171                                                                                                                                                     nasty
## 7172                                                                                                                                                    navajo
## 7173                                                                                                                                                       nba
## 7174                                                                                                                                                  nebraska
## 7175                                                                                                                                                   needles
## 7176                                                                                                                                                negligence
## 7177                                                                                                                                             neighborhoods
## 7178                                                                                                                                                    newsom
## 7179                                                                                                                                                   nigeria
## 7180                                                                                                                                                 nightmare
## 7181                                                                                                                                                      noon
## 7182                                                                                                                                                     noted
## 7183                                                                                                                                                   noticed
## 7184                                                                                                                                                  nuestros
## 7185                                                                                                                                                       nyt
## 7186                                                                                                                                                     obama
## 7187                                                                                                                                                   offered
## 7188                                                                                                                                                oklahomans
## 7189                                                                                                                                                   operate
## 7190                                                                                                                                                  opposite
## 7191                                                                                                                                                optimistic
## 7192                                                                                                                                             organizations
## 7193                                                                                                                                                  original
## 7194                                                                                                                                                   orleans
## 7195                                                                                                                                                    ossoff
## 7196                                                                                                                                                     otras
## 7197                                                                                                                                                  overcome
## 7198                                                                                                                                              overwhelming
## 7199                                                                                                                                                      palm
## 7200                                                                                                                                                     panic
## 7201                                                                                                                                                    parece
## 7202                                                                                                                                               participate
## 7203                                                                                                                                                   partner
## 7204                                                                                                                                                  partying
## 7205                                                                                                                                                    pastor
## 7206                                                                                                                                                       pau
## 7207                                                                                                                                                      paul
## 7208                                                                                                                                                  payments
## 7209                                                                                                                                                      pa�s
## 7210                                                                                                                                                   pending
## 7211                                                                                                                                               personality
## 7212                                                                                                                                                  petition
## 7213                                                                                                                                               pharmacists
## 7214                                                                                                                                                  pharmacy
## 7215                                                                                                                                                  pictures
## 7216                                                                                                                                                       pig
## 7217                                                                                                                                                      pitt
## 7218                                                                                                                                                pittsburgh
## 7219                                                                                                                                                    plague
## 7220                                                                                                                                                    plants
## 7221                                                                                                                                                    plasma
## 7222                                                                                                                                                  playoffs
## 7223                                                                                                                                                  position
## 7224                                                                                                                                             postponements
## 7225                                                                                                                                                     potus
## 7226                                                                                                                                              presidential
## 7227                                                                                                                                                presidents
## 7228                                                                                                                                                  pressure
## 7229                                                                                                                                                    prices
## 7230                                                                                                                                                   primary
## 7231                                                                                                                                               prioritized
## 7232                                                                                                                                                 privilege
## 7233                                                                                                                                                   profile
## 7234                                                                                                                                                  progress
## 7235                                                                                                                                                   prolife
## 7236                                                                                                                                                  property
## 7237                                                                                                                                               protections
## 7238                                                                                                                                                    proven
## 7239                                                                                                                                                  provider
## 7240                                                                                                                                                    publix
## 7241                                                                                                                                                      pull
## 7242                                                                                                                                                      push
## 7243                                                                                                                                                     putin
## 7244                                                                                                                                                       pvi
## 7245                                                                                                                                                   quarter
## 7246                                                                                                                                                     quest
## 7247                                                                                                                                                      rage
## 7248                                                                                                                                                   rampant
## 7249                                                                                                                                                      rand
## 7250                                                                                                                                                      rare
## 7251                                                                                                                                                  reaction
## 7252                                                                                                                                                 recognize
## 7253                                                                                                                                                 recording
## 7254                                                                                                                                                  reducing
## 7255                                                                                                                                                 reelected
## 7256                                                                                                                                                   refused
## 7257                                                                                                                                                   regular
## 7258                                                                                                                                               replacement
## 7259                                                                                                                                                reportedly
## 7260                                                                                                                                                  reporter
## 7261                                                                                                                                                  resident
## 7262                                                                                                                                               resolutions
## 7263                                                                                                                                                responding
## 7264                                                                                                                                                   reveals
## 7265                                                                                                                                                   risking
## 7266                                                                                                                                                    robust
## 7267                                                                                                                                                      rock
## 7268                                                                                                                                                      rose
## 7269                                                                                                                                                      sabe
## 7270                                                                                                                                                sacramento
## 7271                                                                                                                                                     safer
## 7272                                                                                                                                                saturday�s
## 7273                                                                                                                                                 scientist
## 7274                                                                                                                                                     scott
## 7275                                                                                                                                                  seasonal
## 7276                                                                                                                                                   seattle
## 7277                                                                                                                                               selfishness
## 7278                                                                                                                                                       ser
## 7279                                                                                                                                               seriousness
## 7280                                                                                                                                                     serum
## 7281                                                                                                                                                   serving
## 7282                                                                                                                                                  sessions
## 7283                                                                                                                                                  sevenday
## 7284                                                                                                                                                    shared
## 7285                                                                                                                                                    shifts
## 7286                                                                                                                                                   shocked
## 7287                                                                                                                                                     shoot
## 7288                                                                                                                                                   shortly
## 7289                                                                                                                                                     shout
## 7290                                                                                                                                                     sight
## 7291                                                                                                                                                       sin
## 7292                                                                                                                                                   slammed
## 7293                                                                                                                                                     smith
## 7294                                                                                                                                                     smoke
## 7295                                                                                                                                                  sneezing
## 7296                                                                                                                                                  socially
## 7297                                                                                                                                                      sold
## 7298                                                                                                                                                  solution
## 7299                                                                                                                                                      song
## 7300                                                                                                                                                      sore
## 7301                                                                                                                                                      soul
## 7302                                                                                                                                                     souls
## 7303                                                                                                                                              specifically
## 7304                                                                                                                                                  spoiling
## 7305                                                                                                                                                  staffers
## 7306                                                                                                                                                     stage
## 7307                                                                                                                                                    stayed
## 7308                                                                                                                                                    stocks
## 7309                                                                                                                                                    stream
## 7310                                                                                                                                                   streets
## 7311                                                                                                                                                  stricken
## 7312                                                                                                                                                  stronger
## 7313                                                                                                                                                  struggle
## 7314                                                                                                                                                     stuck
## 7315                                                                                                                                                  suffered
## 7316                                                                                                                                                   suicide
## 7317                                                                                                                                                       sun
## 7318                                                                                                                                              supermarkets
## 7319                                                                                                                                             superspreader
## 7320                                                                                                                                                 supported
## 7321                                                                                                                                                  surprise
## 7322                                                                                                                                                 survivors
## 7323                                                                                                                                                   suspect
## 7324                                                                                                                                                 suspected
## 7325                                                                                                                                                   swedish
## 7326                                                                                                                                                  sympathy
## 7327                                                                                                                                                   systems
## 7328                                                                                                                                                  s�ntomas
## 7329                                                                                                                                                    talked
## 7330                                                                                                                                                   tambi�n
## 7331                                                                                                                                                  tampered
## 7332                                                                                                                                                  targeted
## 7333                                                                                                                                                     taxes
## 7334                                                                                                                                                    taylor
## 7335                                                                                                                                               technicians
## 7336                                                                                                                                                     teeth
## 7337                                                                                                                                                        tf
## 7338                                                                                                                                              thanksgiving
## 7339                                                                                                                                                  theories
## 7340                                                                                                                                                       tho
## 7341                                                                                                                                                thursday�s
## 7342                                                                                                                                                   tickets
## 7343                                                                                                                                                    tienen
## 7344                                                                                                                                                      till
## 7345                                                                                                                                                  timeline
## 7346                                                                                                                                                       tip
## 7347                                                                                                                                                      tips
## 7348                                                                                                                                                     tired
## 7349                                                                                                                                                     tommy
## 7350                                                                                                                                                       ton
## 7351                                                                                                                                                      tone
## 7352                                                                                                                                                      tool
## 7353                                                                                                                                                   totally
## 7354                                                                                                                                                     touch
## 7355                                                                                                                                                tournament
## 7356                                                                                                                                                     trace
## 7357                                                                                                                                                    traits
## 7358                                                                                                                                                     trash
## 7359                                                                                                                                                treasonous
## 7360                                                                                                                                                      tree
## 7361                                                                                                                                                   tribute
## 7362                                                                                                                                                    triple
## 7363                                                                                                                                                     trips
## 7364                                                                                                                                                      tues
## 7365                                                                                                                                                      type
## 7366                                                                                                                                                   ukraine
## 7367                                                                                                                                            unincorporated
## 7368                                                                                                                                                       ups
## 7369                                                                                                                                                     upset
## 7370                                                                                                                                                vacunaci�n
## 7371                                                                                                                                                 vacunarse
## 7372                                                                                                                                                    values
## 7373                                                                                                                                                  variants
## 7374                                                                                                                                                      vast
## 7375                                                                                                                                                       ver
## 7376                                                                                                                                                    verdad
## 7377                                                                                                                                                     vibes
## 7378                                                                                                                                                      vile
## 7379                                                                                                                                                violations
## 7380                                                                                                                                                  vomiting
## 7381                                                                                                                                                 walgreens
## 7382                                                                                                                                                     wanna
## 7383                                                                                                                                                      ward
## 7384                                                                                                                                                      warm
## 7385                                                                                                                                                      weed
## 7386                                                                                                                                               westchester
## 7387                                                                                                                                                      we�d
## 7388                                                                                                                                                      wine
## 7389                                                                                                                                                   winslow
## 7390                                                                                                                                                 wondering
## 7391                                                                                                                                                   woodfin
## 7392                                                                                                                                                     woods
## 7393                                                                                                                                                      wthe
## 7394                                                                                                                                                        wv
## 7395                                                                                                                                                    yellow
## 7396                                                                                                                                                      yolo
## 7397                                                                                                                                                      �all
## 7398                                                                                                                                                       �if
## 7399                                                                                                                                                       �in
## 7400                                                                                                                                                     �it�s
## 7401                                                                                                                                                      �you
## 7402                                                                                                                                                   @12news
## 7403                                                                                                                                                      @abc
## 7404                                                                                                                                               @benshapiro
## 7405                                                                                                                                                 @cadepted
## 7406                                                                                                                                               @djokernole
## 7407                                                                                                                                                @dougducey
## 7408                                                                                                                                             @froglover777
## 7409                                                                                                                                            @gatewaypundit
## 7410                                                                                                                                           @govkathyhochul
## 7411                                                                                                                                            @govlarryhogan
## 7412                                                                                                                                                   @hhsgov
## 7413                                                                                                                                              @huffpostpol
## 7414                                                                                                                                              @jenmyersphd
## 7415                                                                                                                                                @jimjordan
## 7416                                                                                                                                          @joncoopertweets
## 7417                                                                                                                                                     @kvue
## 7418                                                                                                                                            @laurenboebert
## 7419                                                                                                                                                  @mercola
## 7420                                                                                                                                                @mtgreenee
## 7421                                                                                                                                                      @nfl
## 7422                                                                                                                                               @nikkifried
## 7423                                                                                                                                                  @notiuno
## 7424                                                                                                                                          @nycmayorsoffice
## 7425                                                                                                                                                 @nypmetro
## 7426                                                                                                                                           @pentecostjesse
## 7427                                                                                                                                           @ponylifehourly
## 7428                                                                                                                                            @seapubschools
## 7429                                                                                                                                               @senschumer
## 7430                                                                                                                                                  @tedcruz
## 7431                                                                                                                                            @thedailybeast
## 7432                                                                                                                                             @thedemocrats
## 7433                                                                                                                                            @tuckercarlson
## 7434                                                                                                                                                     @wrtv
## 7435                                                                                                                                        #abbottfailedtexas
## 7436                                                                                                                                                  #chicago
## 7437                                                                                                                                       #coronavirusupdates
## 7438                                                                                                                                                #covid19ab
## 7439                                                                                                                                          #covidfreequeens
## 7440                                                                                                                                                #covidtest
## 7441                                                                                                                                    #desantisfailedflorida
## 7442                                                                                                                                                   #eagles
## 7443                                                                                                                                                   #family
## 7444                                                                                                                                                      #fjb
## 7445                                                                                                                                                      #god
## 7446                                                                                                                                               #gregabbott
## 7447                                                                                                                                                   #illini
## 7448                                                                                                                                                #influenza
## 7449                                                                                                                                              #jesuschrist
## 7450                                                                                                                                               #jesussaves
## 7451                                                                                                                                            #letsgobrandon
## 7452                                                                                                                                                     #love
## 7453                                                                                                                                                  #moderna
## 7454                                                                                                                                                  #newyear
## 7455                                                                                                                                                  #newyork
## 7456                                                                                                                                                #noplanjoe
## 7457                                                                                                                                                    #onted
## 7458                                                                                                                                                   #pfizer
## 7459                                                                                                                                             #publichealth
## 7460                                                                                                                                               #quarantine
## 7461                                                                                                                                                   #queens
## 7462                                                                                                                                               #rapidtests
## 7463                                                                                                                                                      #rps
## 7464                                                                                                                                                      #rva
## 7465                                                                                                                                                 #snowfall
## 7466                                                                                                                                            #thursdayvibes
## 7467                                                                                                                                           #tuesdayfeeling
## 7468                                                                                                                                           #vaccinemandate
## 7469                                                                                                                                         #vaccinepassports
## 7470                                                                                                                                       #vaccinesideeffects
## 7471                                                                                                                                         #writingcommunity
## 7472                                                                                                                                   <u+0001f3f5>pestilences
## 7473                                                                                                                                              <u+0001f44d>
## 7474                                                                                                                                              <u+0001f499>
## 7475                                                                                                                                              <u+0001f4af>
## 7476                                                                                                                                              <u+0001f60a>
## 7477                                                                                                                                              <u+0001f62c>
## 7478                                                                                                          <u+0001f937><u+0001f3fb><u+200d><u+2640><u+fe0f>
## 7479                                                                                                                                     <u+25b6><u+fe0f>there
## 7480                                                                                                                                                  <u+2705>
## 7481                                                                                                                                                      13th
## 7482                                                                                                                                                      15th
## 7483                                                                                                                                                       6pm
## 7484                                                                                                                                                       7th
## 7485                                                                                                                                                     900am
## 7486                                                                                                                                                    absurd
## 7487                                                                                                                                                     aches
## 7488                                                                                                                                                    active
## 7489                                                                                                                                                  activist
## 7490                                                                                                                                                     acute
## 7491                                                                                                                                                     adams
## 7492                                                                                                                                                  addition
## 7493                                                                                                                                                     admin
## 7494                                                                                                                                                     adult
## 7495                                                                                                                                               afghanistan
## 7496                                                                                                                                                    agency
## 7497                                                                                                                                                        ah
## 7498                                                                                                                                                     ain�t
## 7499                                                                                                                                                   airport
## 7500                                                                                                                                                    albany
## 7501                                                                                                                                                      ante
## 7502                                                                                                                                               antisemitic
## 7503                                                                                                                                               antivaccine
## 7504                                                                                                                                                   antonio
## 7505                                                                                                                                                  ant�geno
## 7506                                                                                                                                                 apologize
## 7507                                                                                                                                               application
## 7508                                                                                                                                               appreciated
## 7509                                                                                                                                                  approach
## 7510                                                                                                                                             approximately
## 7511                                                                                                                                                attenuated
## 7512                                                                                                                                              availability
## 7513                                                                                                                                                  avoiding
## 7514                                                                                                                                                     awful
## 7515                                                                                                                                                 baltimore
## 7516                                                                                                                                                       ban
## 7517                                                                                                                                                       bar
## 7518                                                                                                                                                   bateman
## 7519                                                                                                                                                       ben
## 7520                                                                                                                                                   benefit
## 7521                                                                                                                                                    bidens
## 7522                                                                                                                                                    bigger
## 7523                                                                                                                                                      bowl
## 7524                                                                                                                                                      brad
## 7525                                                                                                                                                   brandon
## 7526                                                                                                                                                 breathing
## 7527                                                                                                                                                       bro
## 7528                                                                                                                                                    broken
## 7529                                                                                                                                                     bronx
## 7530                                                                                                                                                   brother
## 7531                                                                                                                                                     brown
## 7532                                                                                                                                                      busy
## 7533                                                                                                                                                    butler
## 7534                                                                                                                                                        ca
## 7535                                                                                                                                                 canceling
## 7536                                                                                                                                             cancellations
## 7537                                                                                                                                                      caso
## 7538                                                                                                                                                  catching
## 7539                                                                                                                                                 celebrate
## 7540                                                                                                                                              celebrations
## 7541                                                                                                                                                 challenge
## 7542                                                                                                                                                challenges
## 7543                                                                                                                                                     chart
## 7544                                                                                                                                                 childrens
## 7545                                                                                                                                                   choices
## 7546                                                                                                                                                    circle
## 7547                                                                                                                                                     clean
## 7548                                                                                                                                                colleagues
## 7549                                                                                                                                                collection
## 7550                                                                                                                                                 comienzan
## 7551                                                                                                                                                 companies
## 7552                                                                                                                                                   compare
## 7553                                                                                                                                                  complied
## 7554                                                                                                                                                    comply
## 7555                                                                                                                                                   concern
## 7556                                                                                                                                                confidence
## 7557                                                                                                                                                   contest
## 7558                                                                                                                                                 contreras
## 7559                                                                                                                                                      cool
## 7560                                                                                                                                                  couldn�t
## 7561                                                                                                                                                   council
## 7562                                                                                                                                                  countrys
## 7563                                                                                                                                                   cousins
## 7564                                                                                                                                                covid19�as
## 7565                                                                                                                                                      crew
## 7566                                                                                                                                                     crime
## 7567                                                                                                                                                    crowds
## 7568                                                                                                                                                     cuomo
## 7569                                                                                                                                                     curve
## 7570                                                                                                                                                       cut
## 7571                                                                                                                                                       cvs
## 7572                                                                                                                                                    dakota
## 7573                                                                                                                                                    damage
## 7574                                                                                                                                                       dat
## 7575                                                                                                                                                      dear
## 7576                                                                                                                                                    decide
## 7577                                                                                                                                                  decrease
## 7578                                                                                                                                                      deep
## 7579                                                                                                                                                    defend
## 7580                                                                                                                                                      defy
## 7581                                                                                                                                                    denver
## 7582                                                                                                                                               departments
## 7583                                                                                                                                                     desde
## 7584                                                                                                                                                   detroit
## 7585                                                                                                                                                developing
## 7586                                                                                                                                                       dia
## 7587                                                                                                                                                      dire
## 7588                                                                                                                                                   discuss
## 7589                                                                                                                                            disinformation
## 7590                                                                                                                                                disturbing
## 7591                                                                                                                                                 djokovics
## 7592                                                                                                                                                    dozens
## 7593                                                                                                                                                  dropping
## 7594                                                                                                                                                      dumb
## 7595                                                                                                                                                      d�as
## 7596                                                                                                                                                  economic
## 7597                                                                                                                                                   educate
## 7598                                                                                                                                             effectiveness
## 7599                                                                                                                                                 encourage
## 7600                                                                                                                                                     enter
## 7601                                                                                                                                                   entered
## 7602                                                                                                                                             entertainment
## 7603                                                                                                                                                   entrata
## 7604                                                                                                                                                    espera
## 7605                                                                                                                                                    estado
## 7606                                                                                                                                                   estados
## 7607                                                                                                                                                     est�o
## 7608                                                                                                                                                 excellent
## 7609                                                                                                                                                exhibiting
## 7610                                                                                                                                                    expand
## 7611                                                                                                                                                   expands
## 7612                                                                                                                                                 extending
## 7613                                                                                                                                                       eye
## 7614                                                                                                                                                    facing
## 7615                                                                                                                                                    factor
## 7616                                                                                                                                                   faculty
## 7617                                                                                                                                                      fail
## 7618                                                                                                                                                   falsely
## 7619                                                                                                                                                       fam
## 7620                                                                                                                                                   familia
## 7621                                                                                                                                                       fan
## 7622                                                                                                                                                   fatigue
## 7623                                                                                                                                                   figures
## 7624                                                                                                                                                       fit
## 7625                                                                                                                                                   fitness
## 7626                                                                                                                                                     fixed
## 7627                                                                                                                                                      flip
## 7628                                                                                                                                                      flop
## 7629                                                                                                                                                     force
## 7630                                                                                                                                                      form
## 7631                                                                                                                                                   founder
## 7632                                                                                                                                                   freedom
## 7633                                                                                                                                                    fresno
## 7634                                                                                                                                                       fun
## 7635                                                                                                                                                       fyi
## 7636                                                                                                                                                       gap
## 7637                                                                                                                                                   garbage
## 7638                                                                                                                                                     genes
## 7639                                                                                                                                                    german
## 7640                                                                                                                                                     girls
## 7641                                                                                                                                                   goodbye
## 7642                                                                                                                                                      govt
## 7643                                                                                                                                                   grandma
## 7644                                                                                                                                                     gripe
## 7645                                                                                                                                                   grocery
## 7646                                                                                                                                                    growth
## 7647                                                                                                                                                     guest
## 7648                                                                                                                                                      hace
## 7649                                                                                                                                                     havoc
## 7650                                                                                                                                                    hawaii
## 7651                                                                                                                                                 headaches
## 7652                                                                                                                                                    headed
## 7653                                                                                                                                                   healing
## 7654                                                                                                                                                      heat
## 7655                                                                                                                                                      heck
## 7656                                                                                                                                                     helps
## 7657                                                                                                                                                      herd
## 7658                                                                                                                                                       hid
## 7659                                                                                                                                                    hiding
## 7660                                                                                                                                                     highs
## 7661                                                                                                                                                     home�
## 7662                                                                                                                                                    hoping
## 7663                                                                                                                                                   hopkins
## 7664                                                                                                                                                   hosting
## 7665                                                                                                                                   https://t.co/ekfjndr1se
## 7666                                                                                                                                  https://t.co/rfwwhyk7ho.
## 7667                                                                                                                                                  humanity
## 7668                                                                                                                                                 ignorance
## 7669                                                                                                                                                  ignorant
## 7670                                                                                                                                          immunocompromise
## 7671                                                                                                                                         immunosuppression
## 7672                                                                                                                                                impossible
## 7673                                                                                                                                                inaccurate
## 7674                                                                                                                                                 initially
## 7675                                                                                                                                                   insists
## 7676                                                                                                                                              instructions
## 7677                                                                                                                                                 interview
## 7678                                                                                                                                                  involved
## 7679                                                                                                                                                   jackson
## 7680                                                                                                                                                    jacoby
## 7681                                                                                                                                                      jail
## 7682                                                                                                                                                        je
## 7683                                                                                                                                                        jj
## 7684                                                                                                                                                      jobs
## 7685                                                                                                                                                    joined
## 7686                                                                                                                                                   justify
## 7687                                                                                                                                                     kevin
## 7688                                                                                                                                                    killer
## 7689                                                                                                                                                     kinda
## 7690                                                                                                                                                      king
## 7691                                                                                                                                                     lasts
## 7692                                                                                                                                                     leads
## 7693                                                                                                                                                    lesnar
## 7694                                                                                                                                                lifesaving
## 7695                                                                                                                                                     lined
## 7696                                                                                                                                                    listed
## 7697                                                                                                                                                 listening
## 7698                                                                                                                                                louisville
## 7699                                                                                                                                                     lucky
## 7700                                                                                                                                                     lunch
## 7701                                                                                                                                                    madeup
## 7702                                                                                                                                                 mandating
## 7703                                                                                                                                                    market
## 7704                                                                                                                                                       mas
## 7705                                                                                                                                                   matters
## 7706                                                                                                                                                   mayores
## 7707                                                                                                                                               medications
## 7708                                                                                                                                                 menstrual
## 7709                                                                                                                                                     mercy
## 7710                                                                                                                                                   microns
## 7711                                                                                                                                                       mid
## 7712                                                                                                                                                    miguel
## 7713                                                                                                                                                  millones
## 7714                                                                                                                                                  minister
## 7715                                                                                                                                                   miracle
## 7716                                                                                                                                                    mismas
## 7717                                                                                                                                                   missing
## 7718                                                                                                                                                  missouri
## 7719                                                                                                                                                  mitigate
## 7720                                                                                                                                                    moment
## 7721                                                                                                                                                    monfri
## 7722                                                                                                                                                    muchos
## 7723                                                                                                                                                 municipal
## 7724                                                                                                                                               myocarditis
## 7725                                                                                                                                                    m�dico
## 7726                                                                                                                                                    m�xico
## 7727                                                                                                                                                    nassau
## 7728                                                                                                                                                  needless
## 7729                                                                                                                                                        ni
## 7730                                                                                                                                                 nicknamed
## 7731                                                                                                                                                     ni�os
## 7732                                                                                                                                                 nonlethal
## 7733                                                                                                                                                      noon
## 7734                                                                                                                                                  nuestros
## 7735                                                                                                                                                     nuevo
## 7736                                                                                                                                                  numerous
## 7737                                                                                                                                                       n�o
## 7738                                                                                                                                                   obvious
## 7739                                                                                                                                                     ocean
## 7740                                                                                                                                                   october
## 7741                                                                                                                                                       odd
## 7742                                                                                                                                                      odds
## 7743                                                                                                                                                   officer
## 7744                                                                                                                                                  olympics
## 7745                                                                                                                                             opportunities
## 7746                                                                                                                                                   orlando
## 7747                                                                                                                                                       otc
## 7748                                                                                                                                                      otro
## 7749                                                                                                                                                        ou
## 7750                                                                                                                                                 outbreaks
## 7751                                                                                                                                                 overdoses
## 7752                                                                                                                                                 overnight
## 7753                                                                                                                                               overwhelmed
## 7754                                                                                                                                              overwhelming
## 7755                                                                                                                                                      page
## 7756                                                                                                                                                   partner
## 7757                                                                                                                                                  passport
## 7758                                                                                                                                                      path
## 7759                                                                                                                                                   patrick
## 7760                                                                                                                                                     pause
## 7761                                                                                                                                                  paycheck
## 7762                                                                                                                                              pennsylvania
## 7763                                                                                                                                                   people�
## 7764                                                                                                                                                   permits
## 7765                                                                                                                                                      per�
## 7766                                                                                                                                                    pharma
## 7767                                                                                                                                                  pharmacy
## 7768                                                                                                                                                 physician
## 7769                                                                                                                                                     pills
## 7770                                                                                                                                                      plis
## 7771                                                                                                                                                   podcast
## 7772                                                                                                                                                  portland
## 7773                                                                                                                                                       pos
## 7774                                                                                                                                              postponement
## 7775                                                                                                                                                       pre
## 7776                                                                                                                                                 preparing
## 7777                                                                                                                                                  prevents
## 7778                                                                                                                                                     price
## 7779                                                                                                                                                privileged
## 7780                                                                                                                                                production
## 7781                                                                                                                                              professional
## 7782                                                                                                                                             professionals
## 7783                                                                                                                                                  properly
## 7784                                                                                                                                                 protected
## 7785                                                                                                                                                  protects
## 7786                                                                                                                                                    pushed
## 7787                                                                                                                                                   putting
## 7788                                                                                                                                               quarantined
## 7789                                                                                                                                                      race
## 7790                                                                                                                                                    racial
## 7791                                                                                                                                                   raleigh
## 7792                                                                                                                                                   rapidly
## 7793                                                                                                                                                  reaction
## 7794                                                                                                                                                 realities
## 7795                                                                                                                                                     recap
## 7796                                                                                                                                           recommendations
## 7797                                                                                                                                                recommends
## 7798                                                                                                                                                   records
## 7799                                                                                                                                                   recover
## 7800                                                                                                                                                    reeves
## 7801                                                                                                                                                 referring
## 7802                                                                                                                                                   refuses
## 7803                                                                                                                                                  refusing
## 7804                                                                                                                                                    region
## 7805                                                                                                                                                   relying
## 7806                                                                                                                                                    remain
## 7807                                                                                                                                                 reopening
## 7808                                                                                                                                                  requests
## 7809                                                                                                                                               requirement
## 7810                                                                                                                                                reschedule
## 7811                                                                                                                                                   reserve
## 7812                                                                                                                                                restaurant
## 7813                                                                                                                                                       rid
## 7814                                                                                                                                                ridiculous
## 7815                                                                                                                                                       rip
## 7816                                                                                                                                                      role
## 7817                                                                                                                                                   rolling
## 7818                                                                                                                                                       row
## 7819                                                                                                                                                     sadly
## 7820                                                                                                                                                     sali�
## 7821                                                                                                                                                   samples
## 7822                                                                                                                                                 sanitizer
## 7823                                                                                                                                                     scary
## 7824                                                                                                                                                     seals
## 7825                                                                                                                                                    search
## 7826                                                                                                                                                      sell
## 7827                                                                                                                                                    semana
## 7828                                                                                                                                                       sen
## 7829                                                                                                                                                       ser
## 7830                                                                                                                                                  shipping
## 7831                                                                                                                                                   shortly
## 7832                                                                                                                                                       sit
## 7833                                                                                                                                                     smart
## 7834                                                                                                                                                     smell
## 7835                                                                                                                                                     sobre
## 7836                                                                                                                                                     sound
## 7837                                                                                                                                                    sounds
## 7838                                                                                                                                                     space
## 7839                                                                                                                                                  speaking
## 7840                                                                                                                                                   special
## 7841                                                                                                                                                spectators
## 7842                                                                                                                                                    spells
## 7843                                                                                                                                                   staffed
## 7844                                                                                                                                                    stated
## 7845                                                                                                                                                   state�s
## 7846                                                                                                                                                statistics
## 7847                                                                                                                                                  stephens
## 7848                                                                                                                                                   stevens
## 7849                                                                                                                                                    stores
## 7850                                                                                                                                                   streets
## 7851                                                                                                                                                  strongly
## 7852                                                                                                                                                  struggle
## 7853                                                                                                                                                     stuck
## 7854                                                                                                                                                   suicide
## 7855                                                                                                                                               suministrar
## 7856                                                                                                                                                  sunday�s
## 7857                                                                                                                                              supplemental
## 7858                                                                                                                                                supporters
## 7859                                                                                                                                                   surgery
## 7860                                                                                                                                                  surgical
## 7861                                                                                                                                              surveillance
## 7862                                                                                                                                                  survival
## 7863                                                                                                                                                suspension
## 7864                                                                                                                                               sustainable
## 7865                                                                                                                                                      swab
## 7866                                                                                                                                                    sweats
## 7867                                                                                                                                                   systems
## 7868                                                                                                                                                   tambi�n
## 7869                                                                                                                                                    target
## 7870                                                                                                                                                      tasa
## 7871                                                                                                                                                       tea
## 7872                                                                                                                                                     tener
## 7873                                                                                                                                                 tennessee
## 7874                                                                                                                                                thankfully
## 7875                                                                                                                                                   the�end
## 7876                                                                                                                                                     threw
## 7877                                                                                                                                                    ticket
## 7878                                                                                                                                                     title
## 7879                                                                                                                                                     todas
## 7880                                                                                                                                                      todo
## 7881                                                                                                                                                tomorrow�s
## 7882                                                                                                                                                 tonight�s
## 7883                                                                                                                                                      tool
## 7884                                                                                                                                                  transmit
## 7885                                                                                                                                                      tras
## 7886                                                                                                                                                        tv
## 7887                                                                                                                                                     twins
## 7888                                                                                                                                                      type
## 7889                                                                                                                                                       umd
## 7890                                                                                                                                                 underwood
## 7891                                                                                                                                                    unidos
## 7892                                                                                                                                                       usd
## 7893                                                                                                                                                  varicela
## 7894                                                                                                                                                       vez
## 7895                                                                                                                                                   victims
## 7896                                                                                                                                                      vida
## 7897                                                                                                                                                 violating
## 7898                                                                                                                                                    virus�
## 7899                                                                                                                                                   vitamin
## 7900                                                                                                                                                     voice
## 7901                                                                                                                                                    voting
## 7902                                                                                                                                                      wake
## 7903                                                                                                                                                  walensky
## 7904                                                                                                                                                    walkin
## 7905                                                                                                                                                wastewater
## 7906                                                                                                                                                      weak
## 7907                                                                                                                                                    weapon
## 7908                                                                                                                                                weaponized
## 7909                                                                                                                                                     weird
## 7910                                                                                                                                                     we�ll
## 7911                                                                                                                                                     who�s
## 7912                                                                                                                                                   william
## 7913                                                                                                                                                      wing
## 7914                                                                                                                                                   winning
## 7915                                                                                                                                                   winters
## 7916                                                                                                                                                    wishes
## 7917                                                                                                                                                   wishing
## 7918                                                                                                                                                 wondering
## 7919                                                                                                                                                    worker
## 7920                                                                                                                                                    worlds
## 7921                                                                                                                                                    woulda
## 7922                                                                                                                                                     write
## 7923                                                                                                                                                     wrote
## 7924                                                                                                                                                       wtf
## 7925                                                                                                                                                   wyoming
## 7926                                                                                                                                                   youtube
## 7927                                                                                                                                                 �flurona�
## 7928                                                                                                                                                �lowvalue�
## 7929                                                                                                                                                   �micron
## 7930                                                                                                                                                       �no
## 7931                                                                                                                                                  �places�
## 7932                                                                                                                                                      �por
## 7933                                                                                                                                             @abc13houston
## 7934                                                                                                                                               @amysiskind
## 7935                                                                                                                                                       @ap
## 7936                                                                                                                                          @ariadneboudicca
## 7937                                                                                                                                                    @azdhs
## 7938                                                                                                                                           @bleacherreport
## 7939                                                                                                                                                @capehartj
## 7940                                                                                                                                           @cathygraphics1
## 7941                                                                                                                                            @charliekirk11
## 7942                                                                                                                                           @chestnutdaniel
## 7943                                                                                                                                              @cjisnowblue
## 7944                                                                                                                                                 @cmmerlin
## 7945                                                                                                                                              @corybookers
## 7946                                                                                                                                                 @dbongino
## 7947                                                                                                                                               @deanlarosa
## 7948                                                                                                                                          @gabrielsterling
## 7949                                                                                                                                              @georgetakei
## 7950                                                                                                                                                  @glargeg
## 7951                                                                                                                                                      @gma
## 7952                                                                                                                                          @healthyoklahoma
## 7953                                                                                                                                            @henrymcmaster
## 7954                                                                                                                                          @hillbeverlyhill
## 7955                                                                                                                                                @holachola
## 7956                                                                                                                                                @ivrnholly
## 7957                                                                                                                                                   @jbarro
## 7958                                                                                                                                          @jeffreyguterman
## 7959                                                                                                                                              @joemomma833
## 7960                                                                                                                                             @johncardillo
## 7961                                                                                                                                          @johncooper4nash
## 7962                                                                                                                                              @karenamyatt
## 7963                                                                                                                                          @karibowiehertel
## 7964                                                                                                                                            @keishabottoms
## 7965                                                                                                                                                 @kxannews
## 7966                                                                                                                                                 @lilsun83
## 7967                                                                                                                                             @louisianagov
## 7968                                                                                                                                             @lovethelabel
## 7969                                                                                                                                            @lynnmaryellen
## 7970                                                                                                                                              @markbreeden
## 7971                                                                                                                                            @marklevinshow
## 7972                                                                                                                                                @mayorofla
## 7973                                                                                                                                                @mikepence
## 7974                                                                                                                                           @mirmakofficial
## 7975                                                                                                                                                 @mnhealth
## 7976                                                                                                                                           @mterryscrnwrtr
## 7977                                                                                                                                           @mysterysolvent
## 7978                                                                                                                                                   @ncdhhs
## 7979                                                                                                                                                 @neoviral
## 7980                                                                                                                                                      @nfl
## 7981                                                                                                                                                @nitemists
## 7982                                                                                                                                                @queensedc
## 7983                                                                                                                                            @reviewjournal
## 7984                                                                                                                                               @schristy16
## 7985                                                                                                                                             @scottpresler
## 7986                                                                                                                                            @secretaryross
## 7987                                                                                                                                            @sengillibrand
## 7988                                                                                                                                             @senjohnthune
## 7989                                                                                                                                                   @sltrib
## 7990                                                                                                                                                @snoopneil
## 7991                                                                                                                                            @speakerpelosi
## 7992                                                                                                                                           @spencethetrain
## 7993                                                                                                                                          @sylvesterturner
## 7994                                                                                                                                               @thejtlewis
## 7995                                                                                                                                           @therealwombat1
## 7996                                                                                                                                               @therecount
## 7997                                                                                                                                               @timjdillon
## 7998                                                                                                                                                      @tmz
## 7999                                                                                                                                             @tspillaneusa
## 8000                                                                                                                                            @tuckercarlson
## 8001                                                                                                                                                  @ucdavis
## 8002                                                                                                                                                      @uhc
## 8003                                                                                                                                           @washingtonpost
## 8004                                                                                                                                               @wholefoods
## 8005                                                                                                                                                     @wkrn
## 8006                                                                                                                                             @wolflayla420
## 8007                                                                                                                                                @worldbank
## 8008                                                                                                                                                     @wrtv
## 8009                                                                                                                                                    @wusa9
## 8010                                                                                                                                                  @xfinity
## 8011                                                                                                                                           #arlingtonsalon
## 8012                                                                                                                                            #ballmetalpack
## 8013                                                                                                                                                #beautiful
## 8014                                                                                                                                                #blackchef
## 8015                                                                                                                                       #blacklivesmatterdc
## 8016                                                                                                                                                #bunkerboy
## 8017                                                                                                                                               #chefdayoff
## 8018                                                                                                                                                   #corona
## 8019                                                                                                                                             #coronavir�s�
## 8020                                                                                                                                              #cuarentena�
## 8021                                                                                                                                                  #digital
## 8022                                                                                                                                             #drdaveoncall
## 8023                                                                                                                                             #findflanagan
## 8024                                                                                                                                       #fitforthefrontline
## 8025                                                                                                                                                     #flip
## 8026                                                                                                                                                  #florida
## 8027                                                                                                                                           #fortworthsalon
## 8028                                                                                                                                              #freethemall
## 8029                                                                                                                                       #gopbetrayedamerica
## 8030                                                                                                                                            #igotthedishes
## 8031                                                                                                                                        #justiceforahmaud�
## 8032                                                                                                                                                  #laddakh
## 8033                                                                                                                                                   #lalege
## 8034                                                                                                                                      #lipstickcurlsstudio
## 8035                                                                                                                                               #medtwitter
## 8036                                                                                                                                             #mentalhealth
## 8037                                                                                                                                              #nevergiveup
## 8038                                                                                                                                           #presidentdeath
## 8039                                                                                                                                                    #pride
## 8040                                                                                                                                             #proofreading
## 8041                                                                                                                                             #publichealth
## 8042                                                                                                                                                      #red
## 8043                                                                                                                                                   #repost
## 8044                                                                                                                                               #republican
## 8045                                                                                                                                                   #salute
## 8046                                                                                                                                                 #sarscov2
## 8047                                                                                                                                                   #senate
## 8048                                                                                                                                            #smallbusiness
## 8049                                                                                                                                           #summarywriting
## 8050                                                                                                                                        #trumpdictatorship
## 8051                                                                                                                                           #trumphasnoplan
## 8052                                                                                                                                             #trumpout2020
## 8053                                                                                                                                      #trumpownseverydeath
## 8054                                                                                                                                           #trumpresignnow
## 8055                                                                                                                                                    #unity
## 8056                                                                                                                                                #wearamask
## 8057                                                                                                                                            #wewillsurvive
## 8058                                                                                                                                                   #wisdom
## 8059                                                                                                                                         #yourpersonalchef
## 8060                                                                                                                                                     #zinc
## 8061                                                                                                                                  <u+0001f1eb><u+0001f1f7>
## 8062                                                                                                                                              <u+0001f447>
## 8063                                                                                                                                              <u+0001f449>
## 8064                                                                                                                                              <u+0001f44d>
## 8065                                  <u+0001f44d><u+0001f3fb><u+0001f603><u+0001f64c><u+0001f3fc><u+0001f4b5><u+0001f919><u+0001f3fc><u+0001f637><u+0001f9fb>
## 8066                                                                                                                                  <u+0001f456><u+0001f457>
## 8067                                                                                                                                              <u+0001f490>
## 8068                                                                                                                                              <u+0001f494>
## 8069                                                                                                                                              <u+0001f495>
## 8070                                                                                                                                              <u+0001f499>
## 8071                                                                                                                                              <u+0001f49b>
## 8072                                                                                                                                          <u+0001f4cc>vote
## 8073                                                                                                                      <u+0001f525><u+0001f525><u+0001f525>
## 8074                                                                                                                                              <u+0001f5e3>
## 8075                                                                                                                                              <u+0001f60a>
## 8076                                                                                                                                              <u+0001f622>
## 8077                                                                      <u+0001f637><u+0001f9a0><u+0001f6ab><u+0001f6b6><u+0001f3fd><u+0001f699><u+0001f3e1>
## 8078                                                                                                                                              <u+0001f642>
## 8079                                                                                                          <u+0001f926><u+0001f3fd><u+200d><u+2642><u+fe0f>
## 8080                                                                                                          <u+0001f937><u+0001f3fb><u+200d><u+2642><u+fe0f>
## 8081                                                                                                          <u+0001f937><u+0001f3fe><u+200d><u+2642><u+fe0f>
## 8082                                                                                                                                              <u+0001f970>
## 8083                                                                                                                                              <u+0001f974>
## 8084                                                                                                                                  <u+0001f9a0><u+0001f637>
## 8085                                                                                                                                          <u+067e><u+0647>
## 8086                                                                                                                                          <u+06a9><u+06d0>
## 8087                                                                                                                                          <u+203c><u+fe0f>
## 8088                                                                                                                                          <u+2611><u+fe0f>
## 8089                                                                                                                                          <u+2b07><u+fe0f>
## 8090                                                                                                                                                      10th
## 8091                                                                                                                                                      13th
## 8092                                                                                                                                               1844nyc4nyc
## 8093                                                                                                                                                      27th
## 8094                                                                                                                                                      31st
## 8095                                                                                                                                                       3pm
## 8096                                                                                                                                                        5g
## 8097                                                                                                                                                        aa
## 8098                                                                                                                                                    abbott
## 8099                                                                                                                                                  absolute
## 8100                                                                                                                                                        ac
## 8101                                                                                                                                              accelerating
## 8102                                                                                                                                               accountable
## 8103                                                                                                                                               acknowledge
## 8104                                                                                                                                                 addressed
## 8105                                                                                                                                                 addresses
## 8106                                                                                                                                                  advanced
## 8107                                                                                                                                                        af
## 8108                                                                                                                                                   affects
## 8109                                                                                                                                           africanamerican
## 8110                                                                                                                                                    agency
## 8111                                                                                                                                                    agreed
## 8112                                                                                                                                                    ahmaud
## 8113                                                                                                                                                        ai
## 8114                                                                                                                                                  airborne
## 8115                                                                                                                                                   airline
## 8116                                                                                                                                                  airlines
## 8117                                                                                                                                                    alarms
## 8118                                                                                                                                                   alcohol
## 8119                                                                                                                                                     alert
## 8120                                                                                                                                                    aliens
## 8121                                                                                                                                                     alike
## 8122                                                                                                                                                      alot
## 8123                                                                                                                                                       amc
## 8124                                                                                                                                                     amigo
## 8125                                                                                                                                               anniversary
## 8126                                                                                                                                                   anytime
## 8127                                                                                                                                                  appeared
## 8128                                                                                                                                                   applaud
## 8129                                                                                                                                                   applies
## 8130                                                                                                                                              appreciation
## 8131                                                                                                                                                  approved
## 8132                                                                                                                                                        ar
## 8133                                                                                                                                                   arrived
## 8134                                                                                                                                             arterynervous
## 8135                                                                                                                                                  articles
## 8136                                                                                                                                                      asia
## 8137                                                                                                                                                    aspect
## 8138                                                                                                                                                 assistant
## 8139                                                                                                                                               association
## 8140                                                                                                                                                       as�
## 8141                                                                                                                                                       ate
## 8142                                                                                                                                                  athletic
## 8143                                                                                                                                                 athletics
## 8144                                                                                                                                                 attendees
## 8145                                                                                                                                                  attitude
## 8146                                                                                                                                                       at�
## 8147                                                                                                                                                 australia
## 8148                                                                                                                                                 automatic
## 8149                                                                                                                                                   avoided
## 8150                                                                                                                                                    ayudar
## 8151                                                                                                                                                        b4
## 8152                                                                                                                                                     badly
## 8153                                                                                                                                                bankruptcy
## 8154                                                                                                                                               barbershops
## 8155                                                                                                                                                  barriers
## 8156                                                                                                                                                      bear
## 8157                                                                                                                                                    beauty
## 8158                                                                                                                                                      beds
## 8159                                                                                                                                                   begging
## 8160                                                                                                                                                   beshear
## 8161                                                                                                                                                blackowned
## 8162                                                                                                                                                  blessing
## 8163                                                                                                                                                     blind
## 8164                                                                                                                                                      blmm
## 8165                                                                                                                                                bloomfield
## 8166                                                                                                                                                       bob
## 8167                                                                                                                                                     bonus
## 8168                                                                                                                                                   booking
## 8169                                                                                                                                                     books
## 8170                                                                                                                                                     bored
## 8171                                                                                                                                                    borrow
## 8172                                                                                                                                                    boxing
## 8173                                                                                                                                                     brave
## 8174                                                                                                                                                 brazilian
## 8175                                                                                                                                                      brew
## 8176                                                                                                                                                     broke
## 8177                                                                                                                                                    brutal
## 8178                                                                                                                                                       btw
## 8179                                                                                                                                                   budgets
## 8180                                                                                                                                                   buffoon
## 8181                                                                                                                                                   bullets
## 8182                                                                                                                                                   bullsht
## 8183                                                                                                                                                     bunch
## 8184                                                                                                                                                      cafe
## 8185                                                                                                                                                  calendar
## 8186                                                                                                                                              californians
## 8187                                                                                                                                                  callahan
## 8188                                                                                                                                                      calm
## 8189                                                                                                                                                    camera
## 8190                                                                                                                                               campaigning
## 8191                                                                                                                                             cancellations
## 8192                                                                                                                                                       cap
## 8193                                                                                                                                                  captured
## 8194                                                                                                                                           cardiopulmonary
## 8195                                                                                                                                                    career
## 8196                                                                                                                                                   carried
## 8197                                                                                                                                                 cathedral
## 8198                                                                                                                                                     causa
## 8199                                                                                                                                                   century
## 8200                                                                                                                                              certificates
## 8201                                                                                                                                                     chain
## 8202                                                                                                                                               challenging
## 8203                                                                                                                                                   chances
## 8204                                                                                                                                                     chaos
## 8205                                                                                                                                                   chauvin
## 8206                                                                                                                                                   checked
## 8207                                                                                                                                                 checklist
## 8208                                                                                                                                                  chemical
## 8209                                                                                                                                                   chicken
## 8210                                                                                                                                                 childhood
## 8211                                                                                                                                                   chooses
## 8212                                                                                                                                                     chose
## 8213                                                                                                                                                    christ
## 8214                                                                                                                                                    citing
## 8215                                                                                                                                                     civic
## 8216                                                                                                                                                   classes
## 8217                                                                                                                                                     clubs
## 8218                                                                                                                                                      clue
## 8219                                                                                                                                                 cocktails
## 8220                                                                                                                                                     coded
## 8221                                                                                                                                                    coffee
## 8222                                                                                                                                                 colleague
## 8223                                                                                                                                                  colombia
## 8224                                                                                                                                                  columbus
## 8225                                                                                                                                                     combo
## 8226                                                                                                                                                   comfort
## 8227                                                                                                                                              commencement
## 8228                                                                                                                                             communication
## 8229                                                                                                                                                 communist
## 8230                                                                                                                                                      comp
## 8231                                                                                                                                              compensation
## 8232                                                                                                                                                  complain
## 8233                                                                                                                                                 complicit
## 8234                                                                                                                                                 complying
## 8235                                                                                                                                                  comrades
## 8236                                                                                                                                                   concert
## 8237                                                                                                                                                  concerts
## 8238                                                                                                                                              conditioning
## 8239                                                                                                                                                 conducted
## 8240                                                                                                                                                  confirms
## 8241                                                                                                                                                conscience
## 8242                                                                                                                                               consecutive
## 8243                                                                                                                                              consistently
## 8244                                                                                                                                                consortium
## 8245                                                                                                                                                constantly
## 8246                                                                                                                                              constitution
## 8247                                                                                                                                                contacting
## 8248                                                                                                                                                  contacts
## 8249                                                                                                                                               contributed
## 8250                                                                                                                                              contributing
## 8251                                                                                                                                              convalescent
## 8252                                                                                                                                                    convey
## 8253                                                                                                                                                  convince
## 8254                                                                                                                                                      cook
## 8255                                                                                                                                                   corners
## 8256                                                                                                                                                   coronel
## 8257                                                                                                                                              corporations
## 8258                                                                                                                                                  counties
## 8259                                                                                                                                                  covid19s
## 8260                                                                                                                                                   covid20
## 8261                                                                                                                                                    coward
## 8262                                                                                                                                                      crap
## 8263                                                                                                                                                    crappy
## 8264                                                                                                                                                 craziness
## 8265                                                                                                                                                  creative
## 8266                                                                                                                                                     cried
## 8267                                                                                                                                                    crimes
## 8268                                                                                                                                                 criminals
## 8269                                                                                                                                                 cristobal
## 8270                                                                                                                                               criticizing
## 8271                                                                                                                                                   crowded
## 8272                                                                                                                                                        ct
## 8273                                                                                                                                                    cuando
## 8274                                                                                                                                                    cuomos
## 8275                                                                                                                                                      curb
## 8276                                                                                                                                                     cures
## 8277                                                                                                                                                     curve
## 8278                                                                                                                                                      cv19
## 8279                                                                                                                                                     cycle
## 8280                                                                                                                                                     dairy
## 8281                                                                                                                                                      dday
## 8282                                                                                                                                                    debate
## 8283                                                                                                                                                      debe
## 8284                                                                                                                                                  decrease
## 8285                                                                                                                                                 decreased
## 8286                                                                                                                                                 dedicated
## 8287                                                                                                                                                dedication
## 8288                                                                                                                                                    deeply
## 8289                                                                                                                                                  defacing
## 8290                                                                                                                                                definition
## 8291                                                                                                                                                    defund
## 8292                                                                                                                                                    degree
## 8293                                                                                                                                                  delaware
## 8294                                                                                                                                                delusional
## 8295                                                                                                                                                 democracy
## 8296                                                                                                                                             demonstration
## 8297                                                                                                                                                    denton
## 8298                                                                                                                                                   denying
## 8299                                                                                                                                                  deployed
## 8300                                                                                                                                                  desantis
## 8301                                                                                                                                                  deserved
## 8302                                                                                                                                                designated
## 8303                                                                                                                                               desperately
## 8304                                                                                                                                                destroying
## 8305                                                                                                                                               destructive
## 8306                                                                                                                                                determined
## 8307                                                                                                                                               devastating
## 8308                                                                                                                                                 developed
## 8309                                                                                                                                                  diabetes
## 8310                                                                                                                                                  dialogue
## 8311                                                                                                                                                  dictator
## 8312                                                                                                                                                    digits
## 8313                                                                                                                                                      dijo
## 8314                                                                                                                                              disappointed
## 8315                                                                                                                                                disastrous
## 8316                                                                                                                                                    disney
## 8317                                                                                                                                               distributed
## 8318                                                                                                                                              distributing
## 8319                                                                                                                                                district�s
## 8320                                                                                                                                                 diversity
## 8321                                                                                                                                                        dm
## 8322                                                                                                                                                documented
## 8323                                                                                                                                                    dollar
## 8324                                                                                                                                                    donors
## 8325                                                                                                                                                       dos
## 8326                                                                                                                                                   doubled
## 8327                                                                                                                                                     dozen
## 8328                                                                                                                                                    dozens
## 8329                                                                                                                                              dramatically
## 8330                                                                                                                                                    dreams
## 8331                                                                                                                                                    driven
## 8332                                                                                                                                                   dropped
## 8333                                                                                                                                                   durante
## 8334                                                                                                                                                      d�as
## 8335                                                                                                                                                     d�nde
## 8336                                                                                                                                                      ease
## 8337                                                                                                                                                   easiest
## 8338                                                                                                                                                    easter
## 8339                                                                                                                                                     ebola
## 8340                                                                                                                                                        ed
## 8341                                                                                                                                               educational
## 8342                                                                                                                                                     efren
## 8343                                                                                                                                                    elders
## 8344                                                                                                                                                       ele
## 8345                                                                                                                                                 eliminate
## 8346                                                                                                                                                      elon
## 8347                                                                                                                                              embarrassing
## 8348                                                                                                                                                   emerged
## 8349                                                                                                                                                     emily
## 8350                                                                                                                                                  employed
## 8351                                                                                                                                                  employer
## 8352                                                                                                                                                encouraged
## 8353                                                                                                                                                encourages
## 8354                                                                                                                                               encouraging
## 8355                                                                                                                                                   endless
## 8356                                                                                                                                                engagement
## 8357                                                                                                                                                     enter
## 8358                                                                                                                                                     entry
## 8359                                                                                                                                            epidemiologist
## 8360                                                                                                                                                     error
## 8361                                                                                                                                                essentials
## 8362                                                                                                                                                 estimated
## 8363                                                                                                                                                     estos
## 8364                                                                                                                                                     estoy
## 8365                                                                                                                                                   estudio
## 8366                                                                                                                                                     est�n
## 8367                                                                                                                                                    europe
## 8368                                                                                                                                                  evaluate
## 8369                                                                                                                                                   evening
## 8370                                                                                                                                                 evictions
## 8371                                                                                                                                                      evil
## 8372                                                                                                                                                  exercise
## 8373                                                                                                                                                    exists
## 8374                                                                                                                                                    extend
## 8375                                                                                                                                                     faced
## 8376                                                                                                                                                    facial
## 8377                                                                                                                                                   factual
## 8378                                                                                                                                                  failures
## 8379                                                                                                                                                   falling
## 8380                                                                                                                                                   fallout
## 8381                                                                                                                                                   familia
## 8382                                                                                                                                                   farmers
## 8383                                                                                                                                                fatalities
## 8384                                                                                                                                                       fee
## 8385                                                                                                                                                      fell
## 8386                                                                                                                                                  festival
## 8387                                                                                                                                                    fights
## 8388                                                                                                                                                   finding
## 8389                                                                                                                                                 fireworks
## 8390                                                                                                                                                    fitbit
## 8391                                                                                                                                                        fk
## 8392                                                                                                                                                  flanagan
## 8393                                                                                                                                                  focusing
## 8394                                                                                                                                                      folk
## 8395                                                                                                                                                      foot
## 8396                                                                                                                                                    forces
## 8397                                                                                                                                                    format
## 8398                                                                                                                                                    formed
## 8399                                                                                                                                                     forms
## 8400                                                                                                                                                   founded
## 8401                                                                                                                                                    france
## 8402                                                                                                                                                    freely
## 8403                                                                                                                                                    french
## 8404                                                                                                                                                     fresh
## 8405                                                                                                                                               frustrating
## 8406                                                                                                                                                      fuel
## 8407                                                                                                                                                    fuerza
## 8408                                                                                                                                                fundraiser
## 8409                                                                                                                                                  funerals
## 8410                                                                                                                                                  furlough
## 8411                                                                                                                                                       fyi
## 8412                                                                                                                                                      gaps
## 8413                                                                                                                                                   gardens
## 8414                                                                                                                                                   gargled
## 8415                                                                                                                                                       gay
## 8416                                                                                                                                                  george�s
## 8417                                                                                                                                                     germs
## 8418                                                                                                                                                       gig
## 8419                                                                                                                                                     glass
## 8420                                                                                                                                                    gloves
## 8421                                                                                                                                                  godspeed
## 8422                                                                                                                                                      gold
## 8423                                                                                                                                                graduating
## 8424                                                                                                                                                      grim
## 8425                                                                                                                                                     grind
## 8426                                                                                                                                                   grounds
## 8427                                                                                                                                                      grow
## 8428                                                                                                                                                    growth
## 8429                                                                                                                                                     guest
## 8430                                                                                                                                                      gyms
## 8431                                                                                                                                                      haha
## 8432                                                                                                                                                      hana
## 8433                                                                                                                                                handcuffed
## 8434                                                                                                                                                      hang
## 8435                                                                                                                                                  hardship
## 8436                                                                                                                                                      harm
## 8437                                                                                                                                                    harris
## 8438                                                                                                                                                      hawk
## 8439                                                                                                                                               heartbroken
## 8440                                                                                                                                          heartcirculatory
## 8441                                                                                                                                                 heartfelt
## 8442                                                                                                                                                    height
## 8443                                                                                                                                                   heights
## 8444                                                                                                                                                     henry
## 8445                                                                                                                                                      herd
## 8446                                                                                                                                         hidroxicloroquina
## 8447                                                                                                                                              highlighting
## 8448                                                                                                                                                    highly
## 8449                                                                                                                                                   holders
## 8450                                                                                                                                                      hole
## 8451                                                                                                                                                  hometown
## 8452                                                                                                                                                     home�
## 8453                                                                                                                                                      hong
## 8454                                                                                                                                                      hood
## 8455                                                                                                                                                     hoped
## 8456                                                                                                                                                   hopkins
## 8457                                                                                                                                                     hoppy
## 8458                                                                                                                                                  horrific
## 8459                                                                                                                                                    horror
## 8460                                                                                                                                                    hosted
## 8461                                                                                                                                                   hotspot
## 8462                                                                                                                                                 household
## 8463                                                                                                                                   https://t.co/1jy6qqkdxc
## 8464                                                                                                                                   https://t.co/d2lktbrbwu
## 8465                                                                                                                                   https://t.co/dbmahjbsvm
## 8466                                                                                                                                   https://t.co/fxgmk1plcp
## 8467                                                                                                                                   https://t.co/g9fnylht5y
## 8468                                                                                                                                   https://t.co/jmosofxxc8
## 8469                                                                                                                                   https://t.co/mdojv0jxsg
## 8470                                                                                                                                   https://t.co/mwf5gnxh7x
## 8471                                                                                                                                   https://t.co/novj1yqnfw
## 8472                                                                                                                                                       hub
## 8473                                                                                                                                                        ia
## 8474                                                                                                                                                     ideal
## 8475                                                                                                                                                  identity
## 8476                                                                                                                                                  ignorant
## 8477                                                                                                                                                        il
## 8478                                                                                                                                                     image
## 8479                                                                                                                                                  imagined
## 8480                                                                                                                                                 impacting
## 8481                                                                                                                                               impeachment
## 8482                                                                                                                                              implications
## 8483                                                                                                                                                impossible
## 8484                                                                                                                                              incarcerated
## 8485                                                                                                                                                    indian
## 8486                                                                                                                                                    indica
## 8487                                                                                                                                                   indoors
## 8488                                                                                                                                                industries
## 8489                                                                                                                                                      indy
## 8490                                                                                                                                                  inequity
## 8491                                                                                                                                                inevitable
## 8492                                                                                                                                                 influence
## 8493                                                                                                                                               informaci�n
## 8494                                                                                                                                                  insights
## 8495                                                                                                                                               institution
## 8496                                                                                                                                             institutional
## 8497                                                                                                                                             intentionally
## 8498                                                                                                                                             investigation
## 8499                                                                                                                                                 investing
## 8500                                                                                                                                                 invisible
## 8501                                                                                                                                                     iowas
## 8502                                                                                                                                                    island
## 8503                                                                                                                                                   isolate
## 8504                                                                                                                                                      isso
## 8505                                                                                                                                                     items
## 8506                                                                                                                                                  jeopardy
## 8507                                                                                                                                                      jets
## 8508                                                                                                                                                       jim
## 8509                                                                                                                                                     joins
## 8510                                                                                                                                                     jokes
## 8511                                                                                                                                                     junio
## 8512                                                                                                                                                    junior
## 8513                                                                                                                                                  justices
## 8514                                                                                                                                                   justify
## 8515                                                                                                                                                     kenny
## 8516                                                                                                                                                   keynote
## 8517                                                                                                                                                   kidding
## 8518                                                                                                                                                     kings
## 8519                                                                                                                                                  kneeling
## 8520                                                                                                                                                      kong
## 8521                                                                                                                                                      lady
## 8522                                                                                                                                                    lamont
## 8523                                                                                                                                                   lasting
## 8524                                                                                                                                                   latinos
## 8525                                                                                                                                                    latinx
## 8526                                                                                                                                                 launching
## 8527                                                                                                                                                  lawsuits
## 8528                                                                                                                                                       lay
## 8529                                                                                                                                                     leads
## 8530                                                                                                                                                      lift
## 8531                                                                                                                                                       lil
## 8532                                                                                                                                                  limiting
## 8533                                                                                                                                                 limitless
## 8534                                                                                                                                                    listed
## 8535                                                                                                                                                     liver
## 8536                                                                                                                                                     logic
## 8537                                                                                                                                                     loose
## 8538                                                                                                                                                    losses
## 8539                                                                                                                                                louisville
## 8540                                                                                                                                                   loyalty
## 8541                                                                                                                                                        lp
## 8542                                                                                                                                                     luego
## 8543                                                                                                                                                      lung
## 8544                                                                                                                                                     lungs
## 8545                                                                                                                                          lungsrespiratory
## 8546                                                                                                                                                  maintain
## 8547                                                                                                                                               maintaining
## 8548                                                                                                                                                 manhattan
## 8549                                                                                                                                                      marc
## 8550                                                                                                                                                      mark
## 8551                                                                                                                                                   marquis
## 8552                                                                                                                                                  maryland
## 8553                                                                                                                                                     mayer
## 8554                                                                                                                                                   measure
## 8555                                                                                                                                               medications
## 8556                                                                                                                                                    memory
## 8557                                                                                                                                                   memphis
## 8558                                                                                                                                                  mentally
## 8559                                                                                                                                                 mentioned
## 8560                                                                                                                                                     mesmo
## 8561                                                                                                                                                  messages
## 8562                                                                                                                                                   midtown
## 8563                                                                                                                                                      mild
## 8564                                                                                                                                                      mile
## 8565                                                                                                                                                 milestone
## 8566                                                                                                                                                   milh�es
## 8567                                                                                                                                                       min
## 8568                                                                                                                                                   mission
## 8569                                                                                                                                                       mix
## 8570                                                                                                                                                        mn
## 8571                                                                                                                                                monitoring
## 8572                                                                                                                                                   monthly
## 8573                                                                                                                                                     morir
## 8574                                                                                                                                                 mosquitos
## 8575                                                                                                                                                 motivated
## 8576                                                                                                                                                motorcycle
## 8577                                                                                                                                                     mucho
## 8578                                                                                                                                                     mundo
## 8579                                                                                                                                                 municipal
## 8580                                                                                                                                                      musk
## 8581                                                                                                                                                      mute
## 8582                                                                                                                                                       n95
## 8583                                                                                                                                                     nadie
## 8584                                                                                                                                                      nail
## 8585                                                                                                                                                     nasty
## 8586                                                                                                                                                nationally
## 8587                                                                                                                                                navigating
## 8588                                                                                                                                                      nazi
## 8589                                                                                                                                                   nearing
## 8590                                                                                                                                                   nigeria
## 8591                                                                                                                                                 nightmare
## 8592                                                                                                                                                    night�
## 8593                                                                                                                                                       nom
## 8594                                                                                                                                                  nonsense
## 8595                                                                                                                                                  northern
## 8596                                                                                                                                                       nub
## 8597                                                                                                                                                   nuestra
## 8598                                                                                                                                                     nueva
## 8599                                                                                                                                                       nys
## 8600                                                                                                                                                       nyt
## 8601                                                                                                                                                   n�meros
## 8602                                                                                                                                                  occurred
## 8603                                                                                                                                                       odd
## 8604                                                                                                                                                    offers
## 8605                                                                                                                                                  olympics
## 8606                                                                                                                                                     onset
## 8607                                                                                                                                                      oops
## 8608                                                                                                                                                   operate
## 8609                                                                                                                                                    option
## 8610                                                                                                                                                   options
## 8611                                                                                                                                                     orden
## 8612                                                                                                                                              organization
## 8613                                                                                                                                                  organize
## 8614                                                                                                                                                        os
## 8615                                                                                                                                                     otero
## 8616                                                                                                                                                 oversight
## 8617                                                                                                                                                      owns
## 8618                                                                                                                                                   package
## 8619                                                                                                                                                 packaging
## 8620                                                                                                                                                    packed
## 8621                                                                                                                                                      pais
## 8622                                                                                                                                                  pakistan
## 8623                                                                                                                                                    parade
## 8624                                                                                                                                                  parallel
## 8625                                                                                                                                              participants
## 8626                                                                                                                                                partnering
## 8627                                                                                                                                                  partying
## 8628                                                                                                                                                 pathogens
## 8629                                                                                                                                                       pau
## 8630                                                                                                                                                      paws
## 8631                                                                                                                                                  payments
## 8632                                                                                                                                                      peep
## 8633                                                                                                                                                      peer
## 8634                                                                                                                                                   peoples
## 8635                                                                                                                                                  people�s
## 8636                                                                                                                                                      peor
## 8637                                                                                                                                                 performed
## 8638                                                                                                                                               permanently
## 8639                                                                                                                                                   pessoas
## 8640                                                                                                                                                        pg
## 8641                                                                                                                                                    pharma
## 8642                                                                                                                                                  pharmacy
## 8643                                                                                                                                                      phil
## 8644                                                                                                                                                   phoenix
## 8645                                                                                                                                                       pic
## 8646                                                                                                                                                    pieces
## 8647                                                                                                                                                       pig
## 8648                                                                                                                                                     pitch
## 8649                                                                                                                                                pittsburgh
## 8650                                                                                                                                                    plague
## 8651                                                                                                                                                    plants
## 8652                                                                                                                                                     plan�
## 8653                                                                                                                                                   plastic
## 8654                                                                                                                                                  platform
## 8655                                                                                                                                                  pleasure
## 8656                                                                                                                                                      plot
## 8657                                                                                                                                                      ploy
## 8658                                                                                                                                                   police�
## 8659                                                                                                                                                  policing
## 8660                                                                                                                                                   polling
## 8661                                                                                                                                                  position
## 8662                                                                                                                                                 positions
## 8663                                                                                                                                                    postal
## 8664                                                                                                                                                 postponed
## 8665                                                                                                                                                   poverty
## 8666                                                                                                                                             precautionary
## 8667                                                                                                                                                   predict
## 8668                                                                                                                                                prediction
## 8669                                                                                                                                                  prepares
## 8670                                                                                                                                                  prepping
## 8671                                                                                                                                                  presence
## 8672                                                                                                                                                  present�
## 8673                                                                                                                                                pretending
## 8674                                                                                                                                                   pretzel
## 8675                                                                                                                                                 prevented
## 8676                                                                                                                                                   preview
## 8677                                                                                                                                                     prime
## 8678                                                                                                                                                    prince
## 8679                                                                                                                                                 principal
## 8680                                                                                                                                                priorities
## 8681                                                                                                                                                prioritize
## 8682                                                                                                                                                 prisoners
## 8683                                                                                                                                                 producing
## 8684                                                                                                                                              professional
## 8685                                                                                                                                             professional�
## 8686                                                                                                                                                 projected
## 8687                                                                                                                                                   promote
## 8688                                                                                                                                               proofreader
## 8689                                                                                                                                                  properly
## 8690                                                                                                                                                 protestas
## 8691                                                                                                                                                 protester
## 8692                                                                                                                                                 providers
## 8693                                                                                                                                                  proyecto
## 8694                                                                                                                                                        ps
## 8695                                                                                                                                                       psa
## 8696                                                                                                                                                    pueden
## 8697                                                                                                                                                     pulse
## 8698                                                                                                                                                    pushed
## 8699                                                                                                                                                        qa
## 8700                                                                                                                                               quarantines
## 8701                                                                                                                                                     quase
## 8702                                                                                                                                                     queen
## 8703                                                                                                                                                     quien
## 8704                                                                                                                                                      quit
## 8705                                                                                                                                                       qu�
## 8706                                                                                                                                                   racists
## 8707                                                                                                                                                     radio
## 8708                                                                                                                                                    raging
## 8709                                                                                                                                                   raiders
## 8710                                                                                                                                                   raleigh
## 8711                                                                                                                                                   rampant
## 8712                                                                                                                                                      rand
## 8713                                                                                                                                                   rapidly
## 8714                                                                                                                                                  reaching
## 8715                                                                                                                                                recognized
## 8716                                                                                                                                                recommends
## 8717                                                                                                                                                   records
## 8718                                                                                                                                                   reduced
## 8719                                                                                                                                                 reduction
## 8720                                                                                                                                                 reference
## 8721                                                                                                                                                reflecting
## 8722                                                                                                                                                    refund
## 8723                                                                                                                                                    regard
## 8724                                                                                                                                                    region
## 8725                                                                                                                                             reimbursement
## 8726                                                                                                                                                  relation
## 8727                                                                                                                                                 relatives
## 8728                                                                                                                                                   relaxer
## 8729                                                                                                                                                  religion
## 8730                                                                                                                                                 reminding
## 8731                                                                                                                                                 repeating
## 8732                                                                                                                                                   reporta
## 8733                                                                                                                                            representative
## 8734                                                                                                                                              representing
## 8735                                                                                                                                                      reps
## 8736                                                                                                                                                  requires
## 8737                                                                                                                                                  resource
## 8738                                                                                                                                                respecting
## 8739                                                                                                                                                   respond
## 8740                                                                                                                                                responding
## 8741                                                                                                                                                 responses
## 8742                                                                                                                                                resurgence
## 8743                                                                                                                                                retirement
## 8744                                                                                                                                                   retract
## 8745                                                                                                                                                   reveals
## 8746                                                                                                                                                   revenge
## 8747                                                                                                                                                  rhetoric
## 8748                                                                                                                                                    richer
## 8749                                                                                                                                                      ride
## 8750                                                                                                                                                      root
## 8751                                                                                                                                                        rs
## 8752                                                                                                                                                        rt
## 8753                                                                                                                                                    rubber
## 8754                                                                                                                                                      sabe
## 8755                                                                                                                                                 sacrifice
## 8756                                                                                                                                                      sars
## 8757                                                                                                                                                  sarscov2
## 8758                                                                                                                                              sciencebased
## 8759                                                                                                                                                scientific
## 8760                                                                                                                                                     score
## 8761                                                                                                                                                 screaming
## 8762                                                                                                                                                    screen
## 8763                                                                                                                                                 screening
## 8764                                                                                                                                                   screens
## 8765                                                                                                                                                   seafood
## 8766                                                                                                                                                     seats
## 8767                                                                                                                                                    secure
## 8768                                                                                                                                                     seg�n
## 8769                                                                                                                                                   selfish
## 8770                                                                                                                                                    semana
## 8771                                                                                                                                                   sending
## 8772                                                                                                                                                  sentence
## 8773                                                                                                                                                 separated
## 8774                                                                                                                                                      sept
## 8775                                                                                                                                                      ser�
## 8776                                                                                                                                                     shake
## 8777                                                                                                                                                     sheet
## 8778                                                                                                                                                   shipped
## 8779                                                                                                                                                  shooting
## 8780                                                                                                                                                 shortages
## 8781                                                                                                                                                shortfalls
## 8782                                                                                                                                                     sight
## 8783                                                                                                                                                   silence
## 8784                                                                                                                                                    simple
## 8785                                                                                                                                                       sin
## 8786                                                                                                                                                   sisters
## 8787                                                                                                                                                      size
## 8788                                                                                                                                                     sizes
## 8789                                                                                                                                                   skilled
## 8790                                                                                                                                                      slam
## 8791                                                                                                                                                   slavery
## 8792                                                                                                                                                   slowing
## 8793                                                                                                                                                   smarter
## 8794                                                                                                                                              smartwatches
## 8795                                                                                                                                                   smiling
## 8796                                                                                                                                                    smooth
## 8797                                                                                                                                                   soaring
## 8798                                                                                                                                                  socalled
## 8799                                                                                                                                             socioeconomic
## 8800                                                                                                                                                     solid
## 8801                                                                                                                                                      sons
## 8802                                                                                                                                                     soros
## 8803                                                                                                                                                      sort
## 8804                                                                                                                                                     souls
## 8805                                                                                                                                                       spa
## 8806                                                                                                                                                   spanish
## 8807                                                                                                                                                  spending
## 8808                                                                                                                                                 standards
## 8809                                                                                                                                                     stars
## 8810                                                                                                                                                   stating
## 8811                                                                                                                                                  stepping
## 8812                                                                                                                                                strengthen
## 8813                                                                                                                                                  stronger
## 8814                                                                                                                                                    studio
## 8815                                                                                                                                                   subject
## 8816                                                                                                                                                    sucked
## 8817                                                                                                                                                    sudden
## 8818                                                                                                                                                       sue
## 8819                                                                                                                                                  suffered
## 8820                                                                                                                                                     sugar
## 8821                                                                                                                                                 suggested
## 8822                                                                                                                                                suggesting
## 8823                                                                                                                                                supporters
## 8824                                                                                                                                                supposedly
## 8825                                                                                                                                                 survivors
## 8826                                                                                                                                                     swear
## 8827                                                                                                                                                    sweden
## 8828                                                                                                                                                  sweden�s
## 8829                                                                                                                                                     sweet
## 8830                                                                                                                                                      swim
## 8831                                                                                                                                               symptomatic
## 8832                                                                                                                                                  syphilis
## 8833                                                                                                                                                        s�
## 8834                                                                                                                                                   tactics
## 8835                                                                                                                                                       tag
## 8836                                                                                                                                                   takeout
## 8837                                                                                                                                                       tal
## 8838                                                                                                                                                    talked
## 8839                                                                                                                                              technologies
## 8840                                                                                                                                                     teens
## 8841                                                                                                                                               temporarily
## 8842                                                                                                                                                     terms
## 8843                                                                                                                                                      text
## 8844                                                                                                                                                    texted
## 8845                                                                                                                                                    theory
## 8846                                                                                                                                                   they�ve
## 8847                                                                                                                                                     this�
## 8848                                                                                                                                                    thomas
## 8849                                                                                                                                                threatened
## 8850                                                                                                                                                  thrilled
## 8851                                                                                                                                                     thugs
## 8852                                                                                                                                                     thurs
## 8853                                                                                                                                                       thx
## 8854                                                                                                                                                       tim
## 8855                                                                                                                                                    timely
## 8856                                                                                                                                                   tomando
## 8857                                                                                                                                                      tone
## 8858                                                                                                                                                      tony
## 8859                                                                                                                                                     tooth
## 8860                                                                                                                                                    topics
## 8861                                                                                                                                                  touching
## 8862                                                                                                                                                   tourism
## 8863                                                                                                                                                  tourists
## 8864                                                                                                                                                  trackers
## 8865                                                                                                                                                   tragedy
## 8866                                                                                                                                                    trails
## 8867                                                                                                                                                     train
## 8868                                                                                                                                                transition
## 8869                                                                                                                                                 treasures
## 8870                                                                                                                                                    tricia
## 8871                                                                                                                                                 trillions
## 8872                                                                                                                                                    triple
## 8873                                                                                                                                                    troops
## 8874                                                                                                                                                   tryouts
## 8875                                                                                                                                                   turnout
## 8876                                                                                                                                                      twin
## 8877                                                                                                                                                    twists
## 8878                                                                                                                                                   twoyear
## 8879                                                                                                                                                        ty
## 8880                                                                                                                                                     types
## 8881                                                                                                                                                       uae
## 8882                                                                                                                                                      ugly
## 8883                                                                                                                                                   ukraine
## 8884                                                                                                                                                     ultra
## 8885                                                                                                                                                        um
## 8886                                                                                                                                                      ummm
## 8887                                                                                                                                                   unarmed
## 8888                                                                                                                                               uncertainty
## 8889                                                                                                                                                unexpected
## 8890                                                                                                                                                  uniforms
## 8891                                                                                                                                                     union
## 8892                                                                                                                                                      unit
## 8893                                                                                                                                                     unity
## 8894                                                                                                                                                 universal
## 8895                                                                                                                                                  universe
## 8896                                                                                                                                                    unlike
## 8897                                                                                                                                                      unos
## 8898                                                                                                                                                     upset
## 8899                                                                                                                                                    upside
## 8900                                                                                                                                                    uptick
## 8901                                                                                                                                                       up�
## 8902                                                                                                                                                    urgent
## 8903                                                                                                                                                     utter
## 8904                                                                                                                                                    vacuna
## 8905                                                                                                                                                    values
## 8906                                                                                                                                               ventilators
## 8907                                                                                                                                                   ventura
## 8908                                                                                                                                                     venue
## 8909                                                                                                                                                  verified
## 8910                                                                                                                                                   veteran
## 8911                                                                                                                                                       vez
## 8912                                                                                                                                                    victim
## 8913                                                                                                                                                     vigil
## 8914                                                                                                                                                    vision
## 8915                                                                                                                                                 visionary
## 8916                                                                                                                                                   visitor
## 8917                                                                                                                                                   visuals
## 8918                                                                                                                                                 volunteer
## 8919                                                                                                                                                        vp
## 8920                                                                                                                                                    waiver
## 8921                                                                                                                                                      ward
## 8922                                                                                                                                                    wasted
## 8923                                                                                                                                                    weaken
## 8924                                                                                                                                                   weakens
## 8925                                                                                                                                                    weapon
## 8926                                                                                                                                                   weapons
## 8927                                                                                                                                                  wearable
## 8928                                                                                                                                                       web
## 8929                                                                                                                                                  weekends
## 8930                                                                                                                                                    week�s
## 8931                                                                                                                                                    weight
## 8932                                                                                                                                                  whatsapp
## 8933                                                                                                                                                     who�s
## 8934                                                                                                                                                widespread
## 8935                                                                                                                                                      wild
## 8936                                                                                                                                                     wills
## 8937                                                                                                                                                     will�
## 8938                                                                                                                                                      wind
## 8939                                                                                                                                                   winning
## 8940                                                                                                                                                       wks
## 8941                                                                                                                                                      woke
## 8942                                                                                                                                                  workouts
## 8943                                                                                                                                                   world�s
## 8944                                                                                                                                                    worthy
## 8945                                                                                                                                                  would�ve
## 8946                                                                                                                                                  writerif
## 8947                                                                                                                                                    wrongs
## 8948                                                                                                                                                       yah
## 8949                                                                                                                                                       yea
## 8950                                                                                                                                                       yrs
## 8951                                                                                                                                                       yub
## 8952                                                                                                                                                       yup
## 8953                                                                                                                                    zinchydroxychloroquine
## 8954                                                                                                                                                       zip
## 8955                                                                                                                                                        �a
## 8956                                                                                                                                                       �if
## 8957                                                                                                                                                       �my
## 8958                                                                                                                                                   �people
## 8959                                                                                                                                                      �por
## 8960                                                                                                                                                        �s
## 8961                                                                                                                                                   �social
## 8962                                                                                                                                            �unprecedented
## 8963                                                                                                                                                    �we�re
## 8964                                                                                                                                                �workplace
## 8965                                                                                                                                                  @570klif
## 8966                                                                                                                                                     @6abc
## 8967                                                                                                                                                   @aacnme
## 8968                                                                                                                                                  @abc3340
## 8969                                                                                                                                                     @abc7
## 8970                                                                                                                                            @actionnewsjax
## 8971                                                                                                                                            @admnminnesota
## 8972                                                                                                                                                 @aftunion
## 8973                                                                                                                                          @alexandriavagov
## 8974                                                                                                                                              @annoyedinmn
## 8975                                                                                                                                                   @awhonn
## 8976                                                                                                                                                @azcentral
## 8977                                                                                                                                                @beckershr
## 8978                                                                                                                                            @berniesanders
## 8979                                                                                                                                              @bostonglobe
## 8980                                                                                                                                              @breaking911
## 8981                                                                                                                                                  @cbsnews
## 8982                                                                                                                                            @chadmichaels1
## 8983                                                                                                                                                   @change
## 8984                                                                                                                                                @cleavonmd
## 8985                                                                                                                                                   @cnnbrk
## 8986                                                                                                                                           @donaldjtrumpjr
## 8987                                                                                                                                                 @drtedros
## 8988                                                                                                                                            @fairfaxhealth
## 8989                                                                                                                                                    @fccps
## 8990                                                                                                                                                     @fcnp
## 8991                                                                                                                                            @gephardtdaily
## 8992                                                                                                                                           @govandybeshear
## 8993                                                                                                                                                 @govevers
## 8994                                                                                                                                                @govmurphy
## 8995                                                                                                                                              @govpritzker
## 8996                                                                                                                                               @healthyfla
## 8997                                                                                                                                           @helenrosenthal
## 8998                                                                                                                                            @henrymcmaster
## 8999                                                                                                                                           @housedemocrats
## 9000                                                                                                                                            @houstonhealth
## 9001                                                                                                                                           @hungryproducer
## 9002                                                                                                                                              @ivankatrump
## 9003                                                                                                                                               @jaccooper1
## 9004                                                                                                                                            @jacksonhealth
## 9005                                                                                                                                               @jaketapper
## 9006                                                                                                                                          @jasonmillerindc
## 9007                                                                                                                                            @jeromeadamsmd
## 9008                                                                                                                                               @jfilipiano
## 9009                                                                                                                                                @jimjordan
## 9010                                                                                                                                            @johnfetterman
## 9011                                                                                                                                             @karebear0517
## 9012                                                                                                                                           @keironkeironmh
## 9013                                                                                                                                                    @kprc2
## 9014                                                                                                                                                     @ktla
## 9015                                                                                                                                            @loudouncogovt
## 9016                                                                                                                                           @loudounschools
## 9017                                                                                                                                              @margaretcho
## 9018                                                                                                                                             @mdhealthdept
## 9019                                                                                                                                               @merrimanmd
## 9020                                                                                                                                                @murraynyc
## 9021                                                                                                                                               @nbcbayarea
## 9022                                                                                                                                           @nbcconnecticut
## 9023                                                                                                                                                  @newsmax
## 9024                                                                                                                                             @newspolitics
## 9025                                                                                                                                                     @ninr
## 9026                                                                                                                                                  @novavax
## 9027                                                                                                                                          @nychealthsystem
## 9028                                                                                                                                              @nyphospital
## 9029                                                                                                                                                 @nypmetro
## 9030                                                                                                                                              @ohiostatefb
## 9031                                                                                                                                          @oneplanetsummit
## 9032                                                                                                                                             @perduesenate
## 9033                                                                                                                                                   @publix
## 9034                                                                                                                                                   @pwcgov
## 9035                                                                                                                                             @rachbarnhart
## 9036                                                                                                                                           @salalbanesenyc
## 9037                                                                                                                                               @sambraslow
## 9038                                                                                                                                          @scottgottliebmd
## 9039                                                                                                                                                @secpompeo
## 9040                                                                                                                                               @seiunurses
## 9041                                                                                                                                               @senatedems
## 9042                                                                                                                                                @senategop
## 9043                                                                                                                                          @senatortimscott
## 9044                                                                                                                                           @sendavidperdue
## 9045                                                                                                                                            @sidneypowell1
## 9046                                                                                                                                                    @spann
## 9047                                                                                                                                              @startribune
## 9048                                                                                                                                            @statehealthin
## 9049                                                                                                                                                 @statnews
## 9050                                                                                                                                          @stephmillershow
## 9051                                                                                                                                             @summercannot
## 9052                                                                                                                                          @sylvesterturner
## 9053                                                                                                                                                     @time
## 9054                                                                                                                                                  @vbmaier
## 9055                                                                                                                                               @vimadmusic
## 9056                                                                                                                                           @washingtonpost
## 9057                                                                                                                                              @wbap247news
## 9058                                                                                                                                                   @weartv
## 9059                                                                                                                                                    @wjxt4
## 9060                                                                                                                                                      @wsj
## 9061                                                                                                                                                    #biden
## 9062                                                                                                                                         #blacklivesmatter
## 9063                                                                                                                                           #chooselifein21
## 9064                                                                                                                                            #cleaningstaff
## 9065                                                                                                                                              #coupattempt
## 9066                                                                                                                                          #covid19colorado
## 9067                                                                                                                                           #covid19vaccine
## 9068                                                                                                                                             #essaycontest
## 9069                                                                                                                                                 #facemask
## 9070                                                                                                                                                    #gasen
## 9071                                                                                                                                                  #grammys
## 9072                                                                                                                                                  #houston
## 9073                                                                                                                                                 #lacounty
## 9074                                                                                                                                                #larryking
## 9075                                                                                                                                               #medtwitter
## 9076                                                                                                                                                    #music
## 9077                                                                                                                                                #nurselife
## 9078                                                                                                                                                      #nyc
## 9079                                                                                                                                                 #pharmacy
## 9080                                                                                                                                              #saferathome
## 9081                                                                                                                                                  #therona
## 9082                                                                                                                                                 #trending
## 9083                                                                                                                                               #trumprally
## 9084                                                                                                                                               #trumpvirus
## 9085                                                                                                                                                   #txlege
## 9086                                                                                                                                             #vaccinations
## 9087                                                                                                                                                     #wbir
## 9088                                                                                                                                  <u+0001f1e8><u+0001f1f3>
## 9089                                                                                                                                              <u+0001f3a5>
## 9090                                                                                                                                              <u+0001f44d>
## 9091                                                                                                                                  <u+0001f489><u+0001f9a0>
## 9092                                                                                                                                              <u+0001f499>
## 9093                                                                                                                                              <u+0001f4aa>
## 9094                                                                                                                                              <u+0001f4f2>
## 9095                                                                                                                      <u+0001f602><u+0001f602><u+0001f602>
## 9096                                                                                                                                              <u+0001f614>
## 9097                                                                                                                                              <u+0001f622>
## 9098                                                                                                                                              <u+0001f91e>
## 9099                                                                                                                                              <u+0001f923>
## 9100                                                                                                          <u+0001f926><u+0001f3fd><u+200d><u+2642><u+fe0f>
## 9101                                                                                                                                              <u+0001f92c>
## 9102                                                                                                                                              <u+0001f972>
## 9103                                                                                                                                              <u+0001f976>
## 9104                                                                                                                                              <u+0001f9d0>
## 9105                                                                                                                                          <u+043d><u+0430>
## 9106                                                                                                                                          <u+2600><u+fe0f>
## 9107                                                                                                                                          <u+2620><u+fe0f>
## 9108                                                                                                                                          <u+26a0><u+fe0f>
## 9109                                                                                                                                                     05jan
## 9110                                                                                                                                                      25th
## 9111                                                                                                                                             25thamendment
## 9112                                                                                                                                                      27th
## 9113                                                                                                                                                      300k
## 9114                                                                                                                                                      7day
## 9115                                                                                                                                                       7pm
## 9116                                                                                                                                                      8a5p
## 9117                                                                                                                                                       9am
## 9118                                                                                                                                                       abc
## 9119                                                                                                                                                  absolute
## 9120                                                                                                                                                  accident
## 9121                                                                                                                                              accomplished
## 9122                                                                                                                                                  accurate
## 9123                                                                                                                                                   accused
## 9124                                                                                                                                               acknowledge
## 9125                                                                                                                                             acknowledging
## 9126                                                                                                                                                    acting
## 9127                                                                                                                                                  activist
## 9128                                                                                                                                                 adversity
## 9129                                                                                                                                                  advocate
## 9130                                                                                                                                                      aged
## 9131                                                                                                                                                  airborne
## 9132                                                                                                                                                    alerts
## 9133                                                                                                                                                      alex
## 9134                                                                                                                                                    aliens
## 9135                                                                                                                                                   allergy
## 9136                                                                                                                                                     alvin
## 9137                                                                                                                                                ambassador
## 9138                                                                                                                                                 american�
## 9139                                                                                                                                                    andrea
## 9140                                                                                                                                                    andrew
## 9141                                                                                                                                                  aneurysm
## 9142                                                                                                                                                    animal
## 9143                                                                                                                                                   antigen
## 9144                                                                                                                                               antimaskers
## 9145                                                                                                                                                   anytime
## 9146                                                                                                                                                 apartment
## 9147                                                                                                                                                  appeared
## 9148                                                                                                                                               appreciated
## 9149                                                                                                                                                      apps
## 9150                                                                                                                                                     april
## 9151                                                                                                                                                      aqui
## 9152                                                                                                                                                  argument
## 9153                                                                                                                                                  arkansas
## 9154                                                                                                                                                   arrived
## 9155                                                                                                                                                  arrogant
## 9156                                                                                                                                                   ashanti
## 9157                                                                                                                                                  assembly
## 9158                                                                                                                                                       atl
## 9159                                                                                                                                                  attached
## 9160                                                                                                                                                 attempted
## 9161                                                                                                                                                  attended
## 9162                                                                                                                                                  attitude
## 9163                                                                                                                                                    auburn
## 9164                                                                                                                                                 authority
## 9165                                                                                                                                                 awakening
## 9166                                                                                                                                                     azdhs
## 9167                                                                                                                                                      ball
## 9168                                                                                                                                                   ballots
## 9169                                                                                                                                                      band
## 9170                                                                                                                                                  basement
## 9171                                                                                                                                                     basic
## 9172                                                                                                                                                   become1
## 9173                                                                                                                                                   begging
## 9174                                                                                                                                                 believers
## 9175                                                                                                                                                 believing
## 9176                                                                                                                                                   beloved
## 9177                                                                                                                                                      bend
## 9178                                                                                                                                                     beset
## 9179                                                                                                                                                      bien
## 9180                                                                                                                                                biological
## 9181                                                                                                                                                  biontech
## 9182                                                                                                                                                   bitonio
## 9183                                                                                                                                                    blames
## 9184                                                                                                                                                   blaming
## 9185                                                                                                                                                    blocks
## 9186                                                                                                                                                      bold
## 9187                                                                                                                                                     books
## 9188                                                                                                                                                    bother
## 9189                                                                                                                                                 breakdown
## 9190                                                                                                                                                   british
## 9191                                                                                                                                                       bro
## 9192                                                                                                                                                    broken
## 9193                                                                                                                                                 buildings
## 9194                                                                                                                                                     bully
## 9195                                                                                                                                                      bust
## 9196                                                                                                                                              california�s
## 9197                                                                                                                                                     camps
## 9198                                                                                                                                                  campuses
## 9199                                                                                                                                                       cap
## 9200                                                                                                                                                     capel
## 9201                                                                                                                                                 cardinals
## 9202                                                                                                                                                     cards
## 9203                                                                                                                                                     cared
## 9204                                                                                                                                                   carrier
## 9205                                                                                                                                                  carrying
## 9206                                                                                                                                                      cast
## 9207                                                                                                                                                       cat
## 9208                                                                                                                                                  cautious
## 9209                                                                                                                                                       cbs
## 9210                                                                                                                                                 celebrate
## 9211                                                                                                                                                      cell
## 9212                                                                                                                                                     chain
## 9213                                                                                                                                                     chair
## 9214                                                                                                                                                challenged
## 9215                                                                                                                                                   chamber
## 9216                                                                                                                                                  chambers
## 9217                                                                                                                                                  champion
## 9218                                                                                                                                              championship
## 9219                                                                                                                                                   chapter
## 9220                                                                                                                                                   charles
## 9221                                                                                                                                                    charts
## 9222                                                                                                                                                     chase
## 9223                                                                                                                                                  cherokee
## 9224                                                                                                                                                 childhood
## 9225                                                                                                                                                     chloe
## 9226                                                                                                                                                    christ
## 9227                                                                                                                                               circulating
## 9228                                                                                                                                             circumstances
## 9229                                                                                                                                                  claiming
## 9230                                                                                                                                                   classic
## 9231                                                                                                                                                classified
## 9232                                                                                                                                                     climb
## 9233                                                                                                                                                clinicians
## 9234                                                                                                                                                   clinics
## 9235                                                                                                                                                   closure
## 9236                                                                                                                                                  closures
## 9237                                                                                                                                                    clowns
## 9238                                                                                                                                                      clue
## 9239                                                                                                                                                      cole
## 9240                                                                                                                                             collaborative
## 9241                                                                                                                                                 colleague
## 9242                                                                                                                                                     color
## 9243                                                                                                                                                    combat
## 9244                                                                                                                                                   comment
## 9245                                                                                                                                                  comments
## 9246                                                                                                                                                commission
## 9247                                                                                                                                               compensated
## 9248                                                                                                                                                   complex
## 9249                                                                                                                                                compliance
## 9250                                                                                                                                               condolences
## 9251                                                                                                                                                  confused
## 9252                                                                                                                                               congressmen
## 9253                                                                                                                                                    conman
## 9254                                                                                                                                                   conquer
## 9255                                                                                                                                              consequences
## 9256                                                                                                                                                  constant
## 9257                                                                                                                                                  consular
## 9258                                                                                                                                                  consumer
## 9259                                                                                                                                                contagiado
## 9260                                                                                                                                                 contagios
## 9261                                                                                                                                                   contest
## 9262                                                                                                                                                   context
## 9263                                                                                                                                                contribute
## 9264                                                                                                                                                controlled
## 9265                                                                                                                                              convalescent
## 9266                                                                                                                                               convenience
## 9267                                                                                                                                                convention
## 9268                                                                                                                                             conversations
## 9269                                                                                                                                                   cooking
## 9270                                                                                                                                                      cool
## 9271                                                                                                                                                   correct
## 9272                                                                                                                                                   corrupt
## 9273                                                                                                                                                     cosas
## 9274                                                                                                                                                    costco
## 9275                                                                                                                                                   costing
## 9276                                                                                                                                                     costs
## 9277                                                                                                                                                   counter
## 9278                                                                                                                                                    cousin
## 9279                                                                                                                                                 covid19�s
## 9280                                                                                                                                                      crap
## 9281                                                                                                                                                      crew
## 9282                                                                                                                                                criminally
## 9283                                                                                                                                                 criminals
## 9284                                                                                                                                                   critics
## 9285                                                                                                                                                     cross
## 9286                                                                                                                                                   crossed
## 9287                                                                                                                                                   crucial
## 9288                                                                                                                                                   culture
## 9289                                                                                                                                                     curve
## 9290                                                                                                                                                  cu�dense
## 9291                                                                                                                                                      c�mo
## 9292                                                                                                                                                    danced
## 9293                                                                                                                                                        db
## 9294                                                                                                                                                    debate
## 9295                                                                                                                                                   deepest
## 9296                                                                                                                                                   defined
## 9297                                                                                                                                                delivering
## 9298                                                                                                                                                      demo
## 9299                                                                                                                                                     dem�s
## 9300                                                                                                                                                    denied
## 9301                                                                                                                                                    denier
## 9302                                                                                                                                                   deniers
## 9303                                                                                                                                                    dental
## 9304                                                                                                                                              departamento
## 9305                                                                                                                                                    depaul
## 9306                                                                                                                                                  detalles
## 9307                                                                                                                                             determination
## 9308                                                                                                                                                developing
## 9309                                                                                                                                                  diabetic
## 9310                                                                                                                                                     diego
## 9311                                                                                                                                               differences
## 9312                                                                                                                                                difficulty
## 9313                                                                                                                                                      dijo
## 9314                                                                                                                                                      dios
## 9315                                                                                                                                                    direct
## 9316                                                                                                                                                      dirt
## 9317                                                                                                                                                     dirty
## 9318                                                                                                                                                 discarded
## 9319                                                                                                                                               disgraceful
## 9320                                                                                                                                            disinformation
## 9321                                                                                                                                                   display
## 9322                                                                                                                                                   distant
## 9323                                                                                                                                                       doc
## 9324                                                                                                                                                      docs
## 9325                                                                                                                                                 documents
## 9326                                                                                                                                                  donating
## 9327                                                                                                                                                     donny
## 9328                                                                                                                                                      door
## 9329                                                                                                                                               downplaying
## 9330                                                                                                                                                  downtown
## 9331                                                                                                                                                    dozens
## 9332                                                                                                                                                    dragon
## 9333                                                                                                                                                    drinks
## 9334                                                                                                                                                    driver
## 9335                                                                                                                                                 drivethru
## 9336                                                                                                                                                   dropped
## 9337                                                                                                                                                       dry
## 9338                                                                                                                                                      duck
## 9339                                                                                                                                                      dude
## 9340                                                                                                                                                     duper
## 9341                                                                                                                                                       d�a
## 9342                                                                                                                                                      ease
## 9343                                                                                                                                                   educate
## 9344                                                                                                                                              edwardsville
## 9345                                                                                                                                                       ego
## 9346                                                                                                                                               embarrassed
## 9347                                                                                                                                                  employed
## 9348                                                                                                                                                     empty
## 9349                                                                                                                                                encourages
## 9350                                                                                                                                                   enforce
## 9351                                                                                                                                               enforcement
## 9352                                                                                                                                                  ensuring
## 9353                                                                                                                                                      epic
## 9354                                                                                                                                                   episode
## 9355                                                                                                                                                     equal
## 9356                                                                                                                                                 equipment
## 9357                                                                                                                                                    equity
## 9358                                                                                                                                                equivalent
## 9359                                                                                                                                                      eric
## 9360                                                                                                                                                       eso
## 9361                                                                                                                                               established
## 9362                                                                                                                                                     estar
## 9363                                                                                                                                                     est�n
## 9364                                                                                                                                                    europe
## 9365                                                                                                                                                 evictions
## 9366                                                                                                                                                    excess
## 9367                                                                                                                                                  exercise
## 9368                                                                                                                                                 exhausted
## 9369                                                                                                                                                    exists
## 9370                                                                                                                                                    expand
## 9371                                                                                                                                                explaining
## 9372                                                                                                                                              exploitation
## 9373                                                                                                                                                   explore
## 9374                                                                                                                                                    extend
## 9375                                                                                                                                                 extension
## 9376                                                                                                                                                     faced
## 9377                                                                                                                                                   factors
## 9378                                                                                                                                                     falls
## 9379                                                                                                                                                   fascism
## 9380                                                                                                                                                      fase
## 9381                                                                                                                                                        fb
## 9382                                                                                                                                                       fed
## 9383                                                                                                                                                 federally
## 9384                                                                                                                                                      feet
## 9385                                                                                                                                                     fever
## 9386                                                                                                                                                     fined
## 9387                                                                                                                                                  finished
## 9388                                                                                                                                                       fit
## 9389                                                                                                                                                      fits
## 9390                                                                                                                                                       fix
## 9391                                                                                                                                                     fixed
## 9392                                                                                                                                                floridians
## 9393                                                                                                                                                   flowing
## 9394                                                                                                                                                     floyd
## 9395                                                                                                                                                    flying
## 9396                                                                                                                                                  followup
## 9397                                                                                                                                                      foot
## 9398                                                                                                                                                 forecasts
## 9399                                                                                                                                                 fortunate
## 9400                                                                                                                                                     forty
## 9401                                                                                                                                                    fourth
## 9402                                                                                                                                                  freshman
## 9403                                                                                                                                                  friendly
## 9404                                                                                                                                                friendship
## 9405                                                                                                                                                    fucked
## 9406                                                                                                                                                    fuckin
## 9407                                                                                                                                                    gained
## 9408                                                                                                                                                     gancy
## 9409                                                                                                                                                    garcia
## 9410                                                                                                                                                    gatell
## 9411                                                                                                                                                  genocide
## 9412                                                                                                                                                   golfing
## 9413                                                                                                                                                       gon
## 9414                                                                                                                                                  grabbing
## 9415                                                                                                                                                     grace
## 9416                                                                                                                                               grandmother
## 9417                                                                                                                                                     greed
## 9418                                                                                                                                                      greg
## 9419                                                                                                                                                      grim
## 9420                                                                                                                                                 gristedes
## 9421                                                                                                                                                   grossly
## 9422                                                                                                                                                   grounds
## 9423                                                                                                                                                 guarantee
## 9424                                                                                                                                                guaranteed
## 9425                                                                                                                                                   guardia
## 9426                                                                                                                                                  guidance
## 9427                                                                                                                                                    guided
## 9428                                                                                                                                                       gun
## 9429                                                                                                                                                       gvt
## 9430                                                                                                                                                      h1n1
## 9431                                                                                                                                                      hace
## 9432                                                                                                                                                      halt
## 9433                                                                                                                                                 happiness
## 9434                                                                                                                                                     harsh
## 9435                                                                                                                                                    hating
## 9436                                                                                                                                                    hazard
## 9437                                                                                                                                                   heading
## 9438                                                                                                                                                   healing
## 9439                                                                                                                                                   health�
## 9440                                                                                                                                                  health�s
## 9441                                                                                                                                                     heavy
## 9442                                                                                                                                                    hiatus
## 9443                                                                                                                                                highlights
## 9444                                                                                                                                                     hmmmm
## 9445                                                                                                                                                     hodge
## 9446                                                                                                                                                 hollywood
## 9447                                                                                                                                                  honestly
## 9448                                                                                                                                                  hoosiers
## 9449                                                                                                                                                     horse
## 9450                                                                                                                                              housekeepers
## 9451                                                                                                                                   https://t.co/5hjj3a2wuy
## 9452                                                                                                                                   https://t.co/faqcw1dcs2
## 9453                                                                                                                                   https://t.co/hlewr9ufpp
## 9454                                                                                                                                   https://t.co/lkx95ourxt
## 9455                                                                                                                                   https://t.co/mbayk2s0fv
## 9456                                                                                                                                   https://t.co/s0vatqhqma
## 9457                                                                                                                                   https://t.co/sxzsrnlrwu
## 9458                                                                                                                                   https://t.co/ta3cd3hyqm
## 9459                                                                                                                                   https://t.co/y7kftcnrgl
## 9460                                                                                                                                   https://t.co/yemilg2nl0
## 9461                                                                                                                                                   hugging
## 9462                                                                                                                                                   humbled
## 9463                                                                                                                                                   hungary
## 9464                                                                                                                                                     hurts
## 9465                                                                                                                                                    hybrid
## 9466                                                                                                                                        hydroxychloroquine
## 9467                                                                                                                                                  identify
## 9468                                                                                                                                                     idiot
## 9469                                                                                                                                                   idiotic
## 9470                                                                                                                                                    idiots
## 9471                                                                                                                                                  ignorant
## 9472                                                                                                                                                      imho
## 9473                                                                                                                                                 immunized
## 9474                                                                                                                                                   impacts
## 9475                                                                                                                                                   impeach
## 9476                                                                                                                                                imperative
## 9477                                                                                                                                                 implement
## 9478                                                                                                                                               implemented
## 9479                                                                                                                                              implementing
## 9480                                                                                                                                                importance
## 9481                                                                                                                                                impressive
## 9482                                                                                                                                              improvements
## 9483                                                                                                                                               incompetent
## 9484                                                                                                                                                incredibly
## 9485                                                                                                                                                incubation
## 9486                                                                                                                                                indigenous
## 9487                                                                                                                                                   induced
## 9488                                                                                                                                                industries
## 9489                                                                                                                                               informative
## 9490                                                                                                                                            infrastructure
## 9491                                                                                                                                                 injection
## 9492                                                                                                                                                   inmates
## 9493                                                                                                                                               instruction
## 9494                                                                                                                                              instructions
## 9495                                                                                                                                               intelligent
## 9496                                                                                                                                                 intensely
## 9497                                                                                                                                              interference
## 9498                                                                                                                                                  internet
## 9499                                                                                                                                              intervention
## 9500                                                                                                                                              investigated
## 9501                                                                                                                                                    invite
## 9502                                                                                                                                                   invoked
## 9503                                                                                                                                                  involved
## 9504                                                                                                                                                    iowa�s
## 9505                                                                                                                                                    ironic
## 9506                                                                                                                                                irrelevant
## 9507                                                                                                                                                  isolated
## 9508                                                                                                                                                   jackets
## 9509                                                                                                                                                  japanese
## 9510                                                                                                                                                       jay
## 9511                                                                                                                                                      jeff
## 9512                                                                                                                                                        jh
## 9513                                                                                                                                                     jones
## 9514                                                                                                                                                      jos�
## 9515                                                                                                                                                   journal
## 9516                                                                                                                                                   journey
## 9517                                                                                                                                                        jr
## 9518                                                                                                                                                      jury
## 9519                                                                                                                                                        j�
## 9520                                                                                                                                                  khadarel
## 9521                                                                                                                                                      kick
## 9522                                                                                                                                                    kicked
## 9523                                                                                                                                                      kirk
## 9524                                                                                                                                                      kits
## 9525                                                                                                                                                     knock
## 9526                                                                                                                                                    kstate
## 9527                                                                                                                                                      kuda
## 9528                                                                                                                                                      la36
## 9529                                                                                                                                                      labs
## 9530                                                                                                                                                    ladies
## 9531                                                                                                                                                      lady
## 9532                                                                                                                                                      lake
## 9533                                                                                                                                                  landlord
## 9534                                                                                                                                                    lashes
## 9535                                                                                                                                                lauderdale
## 9536                                                                                                                                                 launching
## 9537                                                                                                                                                     laura
## 9538                                                                                                                                                    laurie
## 9539                                                                                                                                                  lawsuits
## 9540                                                                                                                                                    laying
## 9541                                                                                                                                                        lb
## 9542                                                                                                                                                     leads
## 9543                                                                                                                                                      leak
## 9544                                                                                                                                                    leaves
## 9545                                                                                                                                                       lee
## 9546                                                                                                                                                    legacy
## 9547                                                                                                                                                 legendary
## 9548                                                                                                                                                   lessons
## 9549                                                                                                                                                    letlow
## 9550                                                                                                                                                        li
## 9551                                                                                                                                                   liberal
## 9552                                                                                                                                                     likes
## 9553                                                                                                                                                    lineup
## 9554                                                                                                                                                     lists
## 9555                                                                                                                                                livestream
## 9556                                                                                                                                                     llama
## 9557                                                                                                                                                       llc
## 9558                                                                                                                                                  loeffler
## 9559                                                                                                                                                     logic
## 9560                                                                                                                                                  longtime
## 9561                                                                                                                                                   looming
## 9562                                                                                                                                                     loses
## 9563                                                                                                                                                    lowest
## 9564                                                                                                                                                      luke
## 9565                                                                                                                                                     lunch
## 9566                                                                                                                                                        ma
## 9567                                                                                                                                                   madness
## 9568                                                                                                                                                      male
## 9569                                                                                                                                               malfeasance
## 9570                                                                                                                                                    manera
## 9571                                                                                                                                                    manner
## 9572                                                                                                                                                     marry
## 9573                                                                                                                                                     mask�
## 9574                                                                                                                                                   matters
## 9575                                                                                                                                                    ma�ana
## 9576                                                                                                                                                        md
## 9577                                                                                                                                                    medics
## 9578                                                                                                                                                 melatonin
## 9579                                                                                                                                                   memphis
## 9580                                                                                                                                                      mens
## 9581                                                                                                                                                     mercy
## 9582                                                                                                                                                    messed
## 9583                                                                                                                                                 messenger
## 9584                                                                                                                                                       mfs
## 9585                                                                                                                                                     midst
## 9586                                                                                                                                                midwestern
## 9587                                                                                                                                                      mile
## 9588                                                                                                                                                  millones
## 9589                                                                                                                                                  minister
## 9590                                                                                                                                                  minority
## 9591                                                                                                                                                 miserable
## 9592                                                                                                                                               mississippi
## 9593                                                                                                                                                   mistake
## 9594                                                                                                                                                    modern
## 9595                                                                                                                                                  modernas
## 9596                                                                                                                                                 moderna�s
## 9597                                                                                                                                                   momento
## 9598                                                                                                                                                   mondays
## 9599                                                                                                                                                   monitor
## 9600                                                                                                                                                monitoring
## 9601                                                                                                                                                    monkey
## 9602                                                                                                                                                moratorium
## 9603                                                                                                                                                    morons
## 9604                                                                                                                                                       msg
## 9605                                                                                                                                                       msu
## 9606                                                                                                                                                    muerte
## 9607                                                                                                                                                   muertos
## 9608                                                                                                                                                   mundial
## 9609                                                                                                                                                  murderer
## 9610                                                                                                                                                 murderous
## 9611                                                                                                                                                      nada
## 9612                                                                                                                                                     named
## 9613                                                                                                                                                     nancy
## 9614                                                                                                                                              narcissistic
## 9615                                                                                                                                                     nasal
## 9616                                                                                                                                                    nassau
## 9617                                                                                                                                                    native
## 9618                                                                                                                                                navigating
## 9619                                                                                                                                                      navy
## 9620                                                                                                                                               necessarily
## 9621                                                                                                                                                      neck
## 9622                                                                                                                                                 neighbors
## 9623                                                                                                                                                   nervous
## 9624                                                                                                                                                       net
## 9625                                                                                                                                                      nets
## 9626                                                                                                                                                networking
## 9627                                                                                                                                                    niggas
## 9628                                                                                                                                                        nj
## 9629                                                                                                                                                 nonprofit
## 9630                                                                                                                                                  normalcy
## 9631                                                                                                                                                 northwest
## 9632                                                                                                                                                       nos
## 9633                                                                                                                                              notification
## 9634                                                                                                                                                      now�
## 9635                                                                                                                                                   nuestra
## 9636                                                                                                                                                     nuevo
## 9637                                                                                                                                                  numerous
## 9638                                                                                                                                                       nys
## 9639                                                                                                                                                  observed
## 9640                                                                                                                                                  occurred
## 9641                                                                                                                                                   october
## 9642                                                                                                                                                   offline
## 9643                                                                                                                                                     omaha
## 9644                                                                                                                                                     onset
## 9645                                                                                                                                                      oops
## 9646                                                                                                                                                 operating
## 9647                                                                                                                                                     opoid
## 9648                                                                                                                                                 organized
## 9649                                                                                                                                                     osama
## 9650                                                                                                                                                   osborne
## 9651                                                                                                                                                   outdoor
## 9652                                                                                                                                                  outlined
## 9653                                                                                                                                               outstanding
## 9654                                                                                                                                                overcoming
## 9655                                                                                                                                                  overturn
## 9656                                                                                                                                                       owe
## 9657                                                                                                                                                    oxford
## 9658                                                                                                                                                    packed
## 9659                                                                                                                                                  painless
## 9660                                                                                                                                              palestinians
## 9661                                                                                                                                                       pan
## 9662                                                                                                                                                 pandemic�
## 9663                                                                                                                                                    parade
## 9664                                                                                                                                                     paris
## 9665                                                                                                                                                     parks
## 9666                                                                                                                                                 partially
## 9667                                                                                                                                              participants
## 9668                                                                                                                                                  patriots
## 9669                                                                                                                                            pennsylvania�s
## 9670                                                                                                                                                performing
## 9671                                                                                                                                                permanente
## 9672                                                                                                                                                 permitted
## 9673                                                                                                                                            pfizerbiontech
## 9674                                                                                                                                              philadelphia
## 9675                                                                                                                                                   phoenix
## 9676                                                                                                                                               photography
## 9677                                                                                                                                                    pickup
## 9678                                                                                                                                                      pics
## 9679                                                                                                                                                     piece
## 9680                                                                                                                                                    pissed
## 9681                                                                                                                                                   placebo
## 9682                                                                                                                                                   placing
## 9683                                                                                                                                                    planes
## 9684                                                                                                                                                    planet
## 9685                                                                                                                                                   plastic
## 9686                                                                                                                                                     plead
## 9687                                                                                                                                                       pls
## 9688                                                                                                                                                     polio
## 9689                                                                                                                                                      pool
## 9690                                                                                                                                                    poorly
## 9691                                                                                                                                                   popular
## 9692                                                                                                                                                    porque
## 9693                                                                                                                                                       pos
## 9694                                                                                                                                                 positives
## 9695                                                                                                                                                  postpone
## 9696                                                                                                                                                   poverty
## 9697                                                                                                                                                       ppd
## 9698                                                                                                                                                precovid19
## 9699                                                                                                                                                  pregnant
## 9700                                                                                                                                                 premature
## 9701                                                                                                                                                  prepared
## 9702                                                                                                                                                  prevents
## 9703                                                                                                                                                     pride
## 9704                                                                                                                                                   priefer
## 9705                                                                                                                                                prioritize
## 9706                                                                                                                                                   prisons
## 9707                                                                                                                                                   produce
## 9708                                                                                                                                                 professor
## 9709                                                                                                                                               programming
## 9710                                                                                                                                                 projected
## 9711                                                                                                                                                  projects
## 9712                                                                                                                                                   promise
## 9713                                                                                                                                                 promising
## 9714                                                                                                                                                  promoted
## 9715                                                                                                                                                  proposes
## 9716                                                                                                                                                protesting
## 9717                                                                                                                                                   pruebas
## 9718                                                                                                                                                       psu
## 9719                                                                                                                                                 psychotic
## 9720                                                                                                                                                    pueden
## 9721                                                                                                                                                      pues
## 9722                                                                                                                                                 purposely
## 9723                                                                                                                                                    pursue
## 9724                                                                                                                                                     pussy
## 9725                                                                                                                                                      pvsd
## 9726                                                                                                                                                 qualified
## 9727                                                                                                                                              quarantining
## 9728                                                                                                                                             questionnaire
## 9729                                                                                                                                                   quitana
## 9730                                                                                                                                                      race
## 9731                                                                                                                                                     rages
## 9732                                                                                                                                                       ran
## 9733                                                                                                                                                   randall
## 9734                                                                                                                                                      rank
## 9735                                                                                                                                                    ration
## 9736                                                                                                                                                        rb
## 9737                                                                                                                                                 reactions
## 9738                                                                                                                                                reasonable
## 9739                                                                                                                                                recuperado
## 9740                                                                                                                                                     reese
## 9741                                                                                                                                                    reform
## 9742                                                                                                                                                registered
## 9743                                                                                                                                                  reinvent
## 9744                                                                                                                                             relationships
## 9745                                                                                                                                               relaunching
## 9746                                                                                                                                                   replace
## 9747                                                                                                                                                 reporters
## 9748                                                                                                                                                 represent
## 9749                                                                                                                                            representative
## 9750                                                                                                                                                requesting
## 9751                                                                                                                                               rescheduled
## 9752                                                                                                                                               resemblance
## 9753                                                                                                                                                 residency
## 9754                                                                                                                                                   resting
## 9755                                                                                                                                                    retail
## 9756                                                                                                                                                   retired
## 9757                                                                                                                                                     ridge
## 9758                                                                                                                                                    riesgo
## 9759                                                                                                                                                       rig
## 9760                                                                                                                                                       rio
## 9761                                                                                                                                                   rioters
## 9762                                                                                                                                                     river
## 9763                                                                                                                                                   rolling
## 9764                                                                                                                                                  rollouts
## 9765                                                                                                                                                    rookie
## 9766                                                                                                                                                     rough
## 9767                                                                                                                                                       roy
## 9768                                                                                                                                                    runoff
## 9769                                                                                                                                                      runs
## 9770                                                                                                                                                   russian
## 9771                                                                                                                                                  saddened
## 9772                                                                                                                                                      sake
## 9773                                                                                                                                                    salary
## 9774                                                                                                                                                      sars
## 9775                                                                                                                                                  savannah
## 9776                                                                                                                                                     saved
## 9777                                                                                                                                                    scenes
## 9778                                                                                                                                                scheduling
## 9779                                                                                                                                                    scream
## 9780                                                                                                                                                      scum
## 9781                                                                                                                                                       sea
## 9782                                                                                                                                                    search
## 9783                                                                                                                                                 secretary
## 9784                                                                                                                                                  sedition
## 9785                                                                                                                                                     seg�n
## 9786                                                                                                                                                    select
## 9787                                                                                                                                                    semana
## 9788                                                                                                                                                  semester
## 9789                                                                                                                                                  sentence
## 9790                                                                                                                                                  separate
## 9791                                                                                                                                                 september
## 9792                                                                                                                                                  sequence
## 9793                                                                                                                                                sequencing
## 9794                                                                                                                                                  servicio
## 9795                                                                                                                                                     setup
## 9796                                                                                                                                                    shelby
## 9797                                                                                                                                                 shipments
## 9798                                                                                                                                                  shiprock
## 9799                                                                                                                                                  shitless
## 9800                                                                                                                                                  shooting
## 9801                                                                                                                                                  shortage
## 9802                                                                                                                                                 shouldn�t
## 9803                                                                                                                                                    shower
## 9804                                                                                                                                                 shutdowns
## 9805                                                                                                                                                  shutting
## 9806                                                                                                                                                  sickness
## 9807                                                                                                                                                   siempre
## 9808                                                                                                                                                    signed
## 9809                                                                                                                                             significantly
## 9810                                                                                                                                                     signs
## 9811                                                                                                                                                     sinus
## 9812                                                                                                                                                    sitios
## 9813                                                                                                                                                 situaci�n
## 9814                                                                                                                                                 skeptical
## 9815                                                                                                                                                       sky
## 9816                                                                                                                                                     sleep
## 9817                                                                                                                                                    slowly
## 9818                                                                                                                                                  sluggish
## 9819                                                                                                                                                   smoking
## 9820                                                                                                                                                    smooth
## 9821                                                                                                                                               socorristas
## 9822                                                                                                                                                    solely
## 9823                                                                                                                                                      solo
## 9824                                                                                                                                                     solve
## 9825                                                                                                                                                    sooner
## 9826                                                                                                                                                     sound
## 9827                                                                                                                                                   sources
## 9828                                                                                                                                                       soy
## 9829                                                                                                                                                    spaces
## 9830                                                                                                                                                   spanish
## 9831                                                                                                                                                    spirit
## 9832                                                                                                                                                   spirits
## 9833                                                                                                                                                    stands
## 9834                                                                                                                                                starvation
## 9835                                                                                                                                                      stat
## 9836                                                                                                                                                    staten
## 9837                                                                                                                                                   stating
## 9838                                                                                                                                                   station
## 9839                                                                                                                                                 statistic
## 9840                                                                                                                                                stayathome
## 9841                                                                                                                                                     stays
## 9842                                                                                                                                                     steal
## 9843                                                                                                                                                     steve
## 9844                                                                                                                                                     storm
## 9845                                                                                                                                                    strand
## 9846                                                                                                                                                 strengths
## 9847                                                                                                                                                  stressed
## 9848                                                                                                                                                    strike
## 9849                                                                                                                                           studentathletes
## 9850                                                                                                                                                    studio
## 9851                                                                                                                                                  studying
## 9852                                                                                                                                                   subject
## 9853                                                                                                                                                 subscribe
## 9854                                                                                                                                                successful
## 9855                                                                                                                                                      suck
## 9856                                                                                                                                                      sued
## 9857                                                                                                                                                suggesting
## 9858                                                                                                                                                  superior
## 9859                                                                                                                                               suppression
## 9860                                                                                                                                               supremacist
## 9861                                                                                                                                                surprising
## 9862                                                                                                                                                    survey
## 9863                                                                                                                                                 surviving
## 9864                                                                                                                                               susquehanna
## 9865                                                                                                                                                    sweden
## 9866                                                                                                                                                     sweet
## 9867                                                                                                                                                  swelling
## 9868                                                                                                                                                     swing
## 9869                                                                                                                                                    tackle
## 9870                                                                                                                                                    taiwan
## 9871                                                                                                                                                     tampa
## 9872                                                                                                                                                    taught
## 9873                                                                                                                                                 taxpayers
## 9874                                                                                                                                                       tea
## 9875                                                                                                                                                technology
## 9876                                                                                                                                                       ted
## 9877                                                                                                                                                 temporary
## 9878                                                                                                                                                   tenants
## 9879                                                                                                                                                      tens
## 9880                                                                                                                                                   theatre
## 9881                                                                                                                                                   they�ll
## 9882                                                                                                                                                 threlkeld
## 9883                                                                                                                                                      tied
## 9884                                                                                                                                                      tier
## 9885                                                                                                                                                    timely
## 9886                                                                                                                                                     todas
## 9887                                                                                                                                                     tomar
## 9888                                                                                                                                                tomorrow�s
## 9889                                                                                                                                                    topped
## 9890                                                                                                                                                   touched
## 9891                                                                                                                                                   touches
## 9892                                                                                                                                                      tour
## 9893                                                                                                                                                  tourists
## 9894                                                                                                                                                  trabajan
## 9895                                                                                                                                                   traffic
## 9896                                                                                                                                                     trail
## 9897                                                                                                                                                transition
## 9898                                                                                                                                               transparent
## 9899                                                                                                                                                    trauma
## 9900                                                                                                                                                  travesty
## 9901                                                                                                                                           tritechnologies
## 9902                                                                                                                                                       tus
## 9903                                                                                                                                                        tx
## 9904                                                                                                                                                     tyler
## 9905                                                                                                                                                     types
## 9906                                                                                                                                                     uconn
## 9907                                                                                                                                                       ugh
## 9908                                                                                                                                                unemployed
## 9909                                                                                                                                                    unidos
## 9910                                                                                                                                                 uninsured
## 9911                                                                                                                                                     units
## 9912                                                                                                                                              universities
## 9913                                                                                                                                                    unlike
## 9914                                                                                                                                                    unrest
## 9915                                                                                                                                                 unwilling
## 9916                                                                                                                                                     upper
## 9917                                                                                                                                                      urge
## 9918                                                                                                                                                   urgency
## 9919                                                                                                                                                   useless
## 9920                                                                                                                                                      utah
## 9921                                                                                                                                                  vacation
## 9922                                                                                                                                               vaccinators
## 9923                                                                                                                                                     valid
## 9924                                                                                                                                                   vehicle
## 9925                                                                                                                                                  vehicles
## 9926                                                                                                                                                ventilator
## 9927                                                                                                                                               ventilators
## 9928                                                                                                                                                   version
## 9929                                                                                                                                                    versus
## 9930                                                                                                                                                       vet
## 9931                                                                                                                                                      vice
## 9932                                                                                                                                                    videos
## 9933                                                                                                                                                      view
## 9934                                                                                                                                                   viewers
## 9935                                                                                                                                                 violating
## 9936                                                                                                                                                 violation
## 9937                                                                                                                                                    vision
## 9938                                                                                                                                                   visited
## 9939                                                                                                                                                  visiting
## 9940                                                                                                                                                     vuelo
## 9941                                                                                                                                                        wa
## 9942                                                                                                                                                    waiver
## 9943                                                                                                                                                   walkups
## 9944                                                                                                                                                      wall
## 9945                                                                                                                                                   warfare
## 9946                                                                                                                                                      warn
## 9947                                                                                                                                                    warned
## 9948                                                                                                                                                  warnings
## 9949                                                                                                                                                      warp
## 9950                                                                                                                                                     waste
## 9951                                                                                                                                                weaknesses
## 9952                                                                                                                                                    wealth
## 9953                                                                                                                                                     wears
## 9954                                                                                                                                                 welcoming
## 9955                                                                                                                                                      welp
## 9956                                                                                                                                                        wh
## 9957                                                                                                                                                    window
## 9958                                                                                                                                                    winner
## 9959                                                                                                                                                   winning
## 9960                                                                                                                                                   winters
## 9961                                                                                                                                                       wit
## 9962                                                                                                                                                  woodland
## 9963                                                                                                                                                 worcester
## 9964                                                                                                                                                 workforce
## 9965                                                                                                                                                   workout
## 9966                                                                                                                                                 workplace
## 9967                                                                                                                                                 wrestling
## 9968                                                                                                                                                     wuhan
## 9969                                                                                                                                                       yea
## 9970                                                                                                                                                       yep
## 9971                                                                                                                                                     yikes
## 9972                                                                                                                                                   yorkers
## 9973                                                                                                                                                       yrs
## 9974                                                                                                                                                      zone
## 9975                                                                                                                                                        �a
## 9976                                                                                                                                                       �at
## 9977                                                                                                                                                 �everyone
## 9978                                                                                                                                                       �it
## 9979                                                                                                                                                     �mom�
## 9980                                                                                                                                                      �not
## 9981                                                                                                                                                        �s
## 9982                                                                                                                                               �shameless�
## 9983                                                                                                                                                      �she
## 9984                                                                                                                                                   �social
## 9985                                                                                                                                                     �you�
## 9986                                                                                                                                                    @7news
## 9987                                                                                                                                                @bgilman66
## 9988                                                                                                                                                  @bnodesk
## 9989                                                                                                                                          @businessinsider
## 9990                                                                                                                                            @chicagosmayor
## 9991                                                                                                                                             @consulmexmia
## 9992                                                                                                                                                 @curative
## 9993                                                                                                                                                @datkuntry
## 9994                                                                                                                                           @denisehollis16
## 9995                                                                                                                                               @disclosetv
## 9996                                                                                                                                           @donaldjtrumpjr
## 9997                                                                                                                                                  @dynamat
## 9998                                                                                                                                          @ericadamsfornyc
## 9999                                                                                                                                                @fox61news
## 10000                                                                                                                                                 @globeri
## 10001                                                                                                                                            @immunotoxphd
## 10002                                                                                                                                               @jimcramer
## 10003                                                                                                                                            @kamalaharris
## 10004                                                                                                                                            @kiro7seattle
## 10005                                                                                                                                           @lauriegarrett
## 10006                                                                                                                                           @lieutenant780
## 10007                                                                                                                                         @lisamarieboothe
## 10008                                                                                                                                             @martymakary
## 10009                                                                                                                                             @mayorbowser
## 10010                                                                                                                                                 @mcfunny
## 10011                                                                                                                                                  @mcuban
## 10012                                                                                                                                             @meidastouch
## 10013                                                                                                                                          @monstercoyliar
## 10014                                                                                                                                                   @nbc12
## 10015                                                                                                                                                 @newsmax
## 10016                                                                                                                                                     @ny1
## 10017                                                                                                                                                  @nycgov
## 10018                                                                                                                                              @peterhotez
## 10019                                                                                                                                                  @pfizer
## 10020                                                                                                                                           @pmcculloughmd
## 10021                                                                                                                                                 @rbreich
## 10022                                                                                                                                               @removeron
## 10023                                                                                                                                                  @secdef
## 10024                                                                                                                                           @sentarahealth
## 10025                                                                                                                                            @shannonbream
## 10026                                                                                                                                         @skepticalmutant
## 10027                                                                                                                                                   @snntv
## 10028                                                                                                                                                 @specape
## 10029                                                                                                                                                @texasgop
## 10030                                                                                                                                         @thebossoriginal
## 10031                                                                                                                                         @trantan39506305
## 10032                                                                                                                                         @tuftsmedicalctr
## 10033                                                                                                                                             @twoaforever
## 10034                                                                                                                                         @undergroundcou1
## 10035                                                                                                                                                   @usfda
## 10036                                                                                                                                               @vcuhealth
## 10037                                                                                                                                                   @vdsum
## 10038                                                                                                                                            @vprasadmdmph
## 10039                                                                                                                                               @walgreens
## 10040                                                                                                                                                @wavynews
## 10041                                                                                                                                                    @wgme
## 10042                                                                                                                                                     @who
## 10043                                                                                                                                                     @wjz
## 10044                                                                                                                                               #australia
## 10045                                                                                                                                          #australianopen
## 10046                                                                                                                                              #backtowork
## 10047                                                                                                                                               #bbfamosos
## 10048                                                                                                                                            #bestoftweets
## 10049                                                                                                                                                #bestself
## 10050                                                                                                                                                    #blog
## 10051                                                                                                                                             #boostershot
## 10052                                                                                                                                              #california
## 10053                                                                                                                                                 #ces2022
## 10054                                                                                                                                                   #china
## 10055                                                                                                                                                    #cold
## 10056                                                                                                                                            #collincounty
## 10057                                                                                                                                             #connecticut
## 10058                                                                                                                                             #covid19test
## 10059                                                                                                                                              #cpssickout
## 10060                                                                                                                                                  #crypto
## 10061                                                                                                                                           #dallascowboys
## 10062                                                                                                                                                  #denise
## 10063                                                                                                                                            #denisehollis
## 10064                                                                                                                                            #dentoncounty
## 10065                                                                                                                                                #diabetes
## 10066                                                                                                                                                  #drphil
## 10067                                                                                                                                                 #fashion
## 10068                                                                                                                                                    #fisd
## 10069                                                                                                                                              #frisconews
## 10070                                                                                                                                         #godblessamerica
## 10071                                                                                                                                         #highriskcovid19
## 10072                                                                                                                                                   #isles
## 10073                                                                                                                                               #isolation
## 10074                                                                                                                                                #january6
## 10075                                                                                                                                                   #jesus
## 10076                                                                                                                                             #jesusislord
## 10077                                                                                                                                           #jesuslovesyou
## 10078                                                                                                                                         #lordgodalmighty
## 10079                                                                                                                                              #losangeles
## 10080                                                                                                                                              #medtwitter
## 10081                                                                                                                                                   #msnbc
## 10082                                                                                                                                                     #nba
## 10083                                                                                                                                             #newyorkcity
## 10084                                                                                                                                                     #nfl
## 10085                                                                                                                                                     #nft
## 10086                                                                                                                                               #nhlbruins
## 10087                                                                                                                                             #nightcurfew
## 10088                                                                                                                                                      #ny
## 10089                                                                                                                                              #richmondva
## 10090                                                                                                                                             #rondesantis
## 10091                                                                                                                                             #safeschools
## 10092                                                                                                                                                #sarscov2
## 10093                                                                                                                                                  #scotus
## 10094                                                                                                                                           #smallbusiness
## 10095                                                                                                                                                 #snowday
## 10096                                                                                                                                     #staysafestayhealthy
## 10097                                                                                                                                             #steveharvey
## 10098                                                                                                                                                    #suns
## 10099                                                                                                                                             #tuesdayvibe
## 10100                                                                                                                                             #tweetlyours
## 10101                                                                                                                                           #vaccineequity
## 10102                                                                                                                                                 #variant
## 10103                                                                                                                                                #variants
## 10104                                                                                                                                                #virginia
## 10105                                                                                                                                            #vocescovid19
## 10106                                                                                                                                                #vote2022
## 10107                                                                                                                                              #weightloss
## 10108                                                                                                                                                     #who
## 10109                                                                                                                                                  #winter
## 10110                                                                                                                                             #winterstorm
## 10111                                                                                                                                 <u+0001f1eb><u+0001f1f7>
## 10112                                                                                                                                 <u+0001f1ee><u+0001f1f1>
## 10113                                                                                                                                 <u+0001f1fa><u+0001f1f8>
## 10114                                                                                                                                             <u+0001f3e5>
## 10115                                                                                                                                 <u+0001f447><u+0001f3fe>
## 10116                                                                                                                                             <u+0001f44e>
## 10117                                                                                                                                             <u+0001f48a>
## 10118                                                                                                                                             <u+0001f4b0>
## 10119                                                                                                                                             <u+0001f4c8>
## 10120                                                                                                                                             <u+0001f4f0>
## 10121                                                                                                                                             <u+0001f4fa>
## 10122                                                                                                                     <u+0001f602><u+0001f602><u+0001f602>
## 10123                                                                                                                                             <u+0001f605>
## 10124                                                                                                                                             <u+0001f611>
## 10125                                                                                                                                             <u+0001f613>
## 10126                                                                                                                                             <u+0001f615>
## 10127                                                                                                                                             <u+0001f61e>
## 10128                                                                                             <u+0001f621><u+0001f92c><u+0001f621><u+0001f92c><u+0001f621>
## 10129                                                                                                                                             <u+0001f622>
## 10130                                                                                                                                             <u+0001f629>
## 10131                                                                                                                                             <u+0001f62d>
## 10132                                                                                                                                             <u+0001f62f>
## 10133                                                                                                                                 <u+0001f64f><u+0001f3fb>
## 10134                                                                                                                                 <u+0001f64f><u+0001f3fc>
## 10135                                                                                                                                 <u+0001f64f><u+0001f3fd>
## 10136                                                                                                                                             <u+0001f921>
## 10137                                                                                                         <u+0001f937><u+0001f3fb><u+200d><u+2642><u+fe0f>
## 10138                                                                                                                                             <u+0001f972>
## 10139                                                                                                                                             <u+0001f974>
## 10140                                                                                                                                         <u+0641><u+064a>
## 10141                                                                                                                                                 <u+25cf>
## 10142                                                                                                                                         <u+2611><u+fe0f>
## 10143                                                                                                                                         <u+26a0><u+fe0f>
## 10144                                                                                                                                         <u+2764><u+fe0f>
## 10145                                                                                                                         <u+2b07><u+fe0f><u+2b07><u+fe0f>
## 10146                                                                                                                                                      2pm
## 10147                                                                                                                                                       2x
## 10148                                                                                                                                                    30day
## 10149                                                                                                                                                      5pm
## 10150                                                                                                                                                      7pm
## 10151                                                                                                                                                     800k
## 10152                                                                                                                                                      8am
## 10153                                                                                                                                                      9am
## 10154                                                                                                                                                  ability
## 10155                                                                                                                                                   absent
## 10156                                                                                                                                                      abt
## 10157                                                                                                                                                abundance
## 10158                                                                                                                                                accidents
## 10159                                                                                                                                           accountability
## 10160                                                                                                                                              accountable
## 10161                                                                                                                                              acknowledge
## 10162                                                                                                                                                   aclara
## 10163                                                                                                                                               activities
## 10164                                                                                                                                                     adds
## 10165                                                                                                                                                     adhs
## 10166                                                                                                                                             administered
## 10167                                                                                                                                           administrative
## 10168                                                                                                                                               admissions
## 10169                                                                                                                                                    adopt
## 10170                                                                                                                                                  advance
## 10171                                                                                                                                                  adverse
## 10172                                                                                                                                                    agent
## 10173                                                                                                                                                 airlines
## 10174                                                                                                                                                 altering
## 10175                                                                                                                                                     alza
## 10176                                                                                                                                                      amb
## 10177                                                                                                                                                  amounts
## 10178                                                                                                                                                 analysis
## 10179                                                                                                                                                    angry
## 10180                                                                                                                                                  animals
## 10181                                                                                                                                                 annoying
## 10182                                                                                                                                               antivaxxer
## 10183                                                                                                                                                  anytime
## 10184                                                                                                                                               apocalypse
## 10185                                                                                                                                                 argument
## 10186                                                                                                                                                arguments
## 10187                                                                                                                                                arizonans
## 10188                                                                                                                                                 articles
## 10189                                                                                                                                                  ashamed
## 10190                                                                                                                                              association
## 10191                                                                                                                                                athletics
## 10192                                                                                                                                                 attached
## 10193                                                                                                                                                   attack
## 10194                                                                                                                                                attempted
## 10195                                                                                                                                                   attend
## 10196                                                                                                                                                 attorney
## 10197                                                                                                                                                  aumento
## 10198                                                                                                                                             austintravis
## 10199                                                                                                                                              australians
## 10200                                                                                                                                              autoridades
## 10201                                                                                                                                                   avenue
## 10202                                                                                                                                                 awaiting
## 10203                                                                                                                                                awareness
## 10204                                                                                                                                                   ayudar
## 10205                                                                                                                                                       az
## 10206                                                                                                                                                     bare
## 10207                                                                                                                                                    basic
## 10208                                                                                                                                                      bat
## 10209                                                                                                                                                    beach
## 10210                                                                                                                                                  beating
## 10211                                                                                                                                                     beds
## 10212                                                                                                                                                  begging
## 10213                                                                                                                                                believing
## 10214                                                                                                                                                     bell
## 10215                                                                                                                                                  biden�s
## 10216                                                                                                                                                 binaxnow
## 10217                                                                                                                                               biological
## 10218                                                                                                                                                     blah
## 10219                                                                                                                                                   bleach
## 10220                                                                                                                                                  blessed
## 10221                                                                                                                                                    blown
## 10222                                                                                                                                                    blows
## 10223                                                                                                                                                bogdanoff
## 10224                                                                                                                                                   border
## 10225                                                                                                                                                  borders
## 10226                                                                                                                                                    brady
## 10227                                                                                                                                                 briefing
## 10228                                                                                                                                                  british
## 10229                                                                                                                                                  broncos
## 10230                                                                                                                                                   brutal
## 10231                                                                                                                                                 bullshit
## 10232                                                                                                                                                    bunch
## 10233                                                                                                                                                      bus
## 10234                                                                                                                                                      c19
## 10235                                                                                                                                                      cal
## 10236                                                                                                                                                  cameron
## 10237                                                                                                                                                 cancelan
## 10238                                                                                                                                                  cancels
## 10239                                                                                                                                                  capital
## 10240                                                                                                                                                 carolina
## 10241                                                                                                                                                  caseras
## 10242                                                                                                                                              celebrating
## 10243                                                                                                                                                    cells
## 10244                                                                                                                                                   centro
## 10245                                                                                                                                                      ces
## 10246                                                                                                                                                 champion
## 10247                                                                                                                                                  chances
## 10248                                                                                                                                                charlotte
## 10249                                                                                                                                                  checked
## 10250                                                                                                                                              checkpoints
## 10251                                                                                                                                                  child�s
## 10252                                                                                                                                                  chronic
## 10253                                                                                                                                                   cities
## 10254                                                                                                                                                    claim
## 10255                                                                                                                                                   clases
## 10256                                                                                                                                               classrooms
## 10257                                                                                                                                                  cleared
## 10258                                                                                                                                                  clothes
## 10259                                                                                                                                                    clown
## 10260                                                                                                                                                cognitive
## 10261                                                                                                                                              coincidence
## 10262                                                                                                                                                    color
## 10263                                                                                                                                                 comments
## 10264                                                                                                                                               commission
## 10265                                                                                                                                            commissioners
## 10266                                                                                                                                            communication
## 10267                                                                                                                                                communist
## 10268                                                                                                                                             compensation
## 10269                                                                                                                                                completed
## 10270                                                                                                                                              complicated
## 10271                                                                                                                                               conducting
## 10272                                                                                                                                             confirmation
## 10273                                                                                                                                                 confirms
## 10274                                                                                                                                               consistent
## 10275                                                                                                                                                  context
## 10276                                                                                                                                                     cops
## 10277                                                                                                                                                corporate
## 10278                                                                                                                                                  correct
## 10279                                                                                                                                               correction
## 10280                                                                                                                                              correlation
## 10281                                                                                                                                                 counties
## 10282                                                                                                                                                 county�s
## 10283                                                                                                                                                  courses
## 10284                                                                                                                                                   cousin
## 10285                                                                                                                                                    cov19
## 10286                                                                                                                                                    cover
## 10287                                                                                                                                                 coverage
## 10288                                                                                                                                                covid19��
## 10289                                                                                                                                                     crap
## 10290                                                                                                                                                   credit
## 10291                                                                                                                                                 critical
## 10292                                                                                                                                               critically
## 10293                                                                                                                                                  crowded
## 10294                                                                                                                                                  culture
## 10295                                                                                                                                               cumplea�os
## 10296                                                                                                                                               cumulative
## 10297                                                                                                                                                   cycles
## 10298                                                                                                                                                      dam
## 10299                                                                                                                                                      dar
## 10300                                                                                                                                                     dare
## 10301                                                                                                                                                     day�
## 10302                                                                                                                                                 deadline
## 10303                                                                                                                                              deathsantis
## 10304                                                                                                                                                   decent
## 10305                                                                                                                                                    decir
## 10306                                                                                                                                                decisions
## 10307                                                                                                                                                  decline
## 10308                                                                                                                                                dedicated
## 10309                                                                                                                                                 delaware
## 10310                                                                                                                                            delegitimized
## 10311                                                                                                                                                 delivery
## 10312                                                                                                                                                  deserve
## 10313                                                                                                                                                 detalles
## 10314                                                                                                                                               determined
## 10315                                                                                                                                               diagnosis�
## 10316                                                                                                                                                  digital
## 10317                                                                                                                                                   dining
## 10318                                                                                                                                                direction
## 10319                                                                                                                                               directions
## 10320                                                                                                                                                    dirty
## 10321                                                                                                                                                    dirt�
## 10322                                                                                                                                                 disagree
## 10323                                                                                                                                                disappear
## 10324                                                                                                                                                discussed
## 10325                                                                                                                                                 diseases
## 10326                                                                                                                                              disparities
## 10327                                                                                                                                                  divided
## 10328                                                                                                                                                       dj
## 10329                                                                                                                                                      dna
## 10330                                                                                                                                                      dog
## 10331                                                                                                                                                   driven
## 10332                                                                                                                                                    drugs
## 10333                                                                                                                                                  durante
## 10334                                                                                                                                                     dust
## 10335                                                                                                                                                     duty
## 10336                                                                                                                                                   eagles
## 10337                                                                                                                                                  edition
## 10338                                                                                                                                                 efficacy
## 10339                                                                                                                                                 elevator
## 10340                                                                                                                                              eligibility
## 10341                                                                                                                                                    ellos
## 10342                                                                                                                                                     elmo
## 10343                                                                                                                                                      els
## 10344                                                                                                                                              encouraging
## 10345                                                                                                                                                    enemy
## 10346                                                                                                                                                  enforce
## 10347                                                                                                                                                  england
## 10348                                                                                                                                                 enjoying
## 10349                                                                                                                                                 entering
## 10350                                                                                                                                                   enters
## 10351                                                                                                                                                  escuela
## 10352                                                                                                                                                      ese
## 10353                                                                                                                                                   espa�a
## 10354                                                                                                                                                     espn
## 10355                                                                                                                                              estudiantes
## 10356                                                                                                                                                  evening
## 10357                                                                                                                                                   examen
## 10358                                                                                                                                                  excused
## 10359                                                                                                                                                 existing
## 10360                                                                                                                                              experienced
## 10361                                                                                                                                                 explains
## 10362                                                                                                                                                  express
## 10363                                                                                                                                                   extent
## 10364                                                                                                                                                  extreme
## 10365                                                                                                                                                     eyes
## 10366                                                                                                                                                    faced
## 10367                                                                                                                                                     fair
## 10368                                                                                                                                                  fantasy
## 10369                                                                                                                                                     farm
## 10370                                                                                                                                                 farright
## 10371                                                                                                                                                   faster
## 10372                                                                                                                                                    fault
## 10373                                                                                                                                                    favor
## 10374                                                                                                                                                 feelings
## 10375                                                                                                                                                     fema
## 10376                                                                                                                                                   fights
## 10377                                                                                                                                                    filed
## 10378                                                                                                                                                     fill
## 10379                                                                                                                                                  filling
## 10380                                                                                                                                                    fired
## 10381                                                                                                                                                    fires
## 10382                                                                                                                                                 flexible
## 10383                                                                                                                                                  flights
## 10384                                                                                                                                                    flyer
## 10385                                                                                                                                                   flying
## 10386                                                                                                                                                      fog
## 10387                                                                                                                                                   forces
## 10388                                                                                                                                                     fort
## 10389                                                                                                                                                 frequent
## 10390                                                                                                                                                    fresh
## 10391                                                                                                                                                   fulton
## 10392                                                                                                                                                       ga
## 10393                                                                                                                                                gathering
## 10394                                                                                                                                               gatherings
## 10395                                                                                                                                                   genius
## 10396                                                                                                                                                    gente
## 10397                                                                                                                                                  germany
## 10398                                                                                                                                                     glad
## 10399                                                                                                                                                 goodness
## 10400                                                                                                                                                    gotta
## 10401                                                                                                                                                governors
## 10402                                                                                                                                                     grab
## 10403                                                                                                                                                    grade
## 10404                                                                                                                                                    green
## 10405                                                                                                                                               guaranteed
## 10406                                                                                                                                                      han
## 10407                                                                                                                                                  handful
## 10408                                                                                                                                                     hang
## 10409                                                                                                                                                   harbor
## 10410                                                                                                                                                   harder
## 10411                                                                                                                                                  hardest
## 10412                                                                                                                                                      hcw
## 10413                                                                                                                                                  heading
## 10414                                                                                                                                                headlines
## 10415                                                                                                                                                      het
## 10416                                                                                                                                                    hijos
## 10417                                                                                                                                                  hitting
## 10418                                                                                                                                                     hoda
## 10419                                                                                                                                                     holy
## 10420                                                                                                                                                homicides
## 10421                                                                                                                                                    honey
## 10422                                                                                                                                                     hong
## 10423                                                                                                                                                    hoops
## 10424                                                                                                                                                    hopes
## 10425                                                                                                                                                    hosts
## 10426                                                                                                                                                   howard
## 10427                                                                                                                                  https://t.co/4v9den0pkt
## 10428                                                                                                                                  https://t.co/64yhrqk49b
## 10429                                                                                                                                  https://t.co/ccrkkopvcy
## 10430                                                                                                                                  https://t.co/frfjcmlbrk
## 10431                                                                                                                                  https://t.co/pvhpbwvbp8
## 10432                                                                                                                                  https://t.co/sbxjcbpt3h
## 10433                                                                                                                                  https://t.co/z9fesn8lcx
## 10434                                                                                                                                                      hug
## 10435                                                                                                                                                     hurd
## 10436                                                                                                                                                     hurt
## 10437                                                                                                                                                  hurting
## 10438                                                                                                                                                       il
## 10439                                                                                                                                                    image
## 10440                                                                                                                                                  imagine
## 10441                                                                                                                                                impacting
## 10442                                                                                                                                                  impacts
## 10443                                                                                                                                              implemented
## 10444                                                                                                                                              improvement
## 10445                                                                                                                                                inclement
## 10446                                                                                                                                                   income
## 10447                                                                                                                                            inconvenience
## 10448                                                                                                                                                incorrect
## 10449                                                                                                                                               incredible
## 10450                                                                                                                                              independent
## 10451                                                                                                                                                    india
## 10452                                                                                                                                               indicators
## 10453                                                                                                                                                  indoors
## 10454                                                                                                                                                 industry
## 10455                                                                                                                                                   infect
## 10456                                                                                                                                                  infect�
## 10457                                                                                                                                                influence
## 10458                                                                                                                                                 infusion
## 10459                                                                                                                                                  initial
## 10460                                                                                                                                                   injury
## 10461                                                                                                                                                 innocent
## 10462                                                                                                                                                    input
## 10463                                                                                                                                                      ins
## 10464                                                                                                                                                   insane
## 10465                                                                                                                                                  insight
## 10466                                                                                                                                            international
## 10467                                                                                                                                               introduced
## 10468                                                                                                                                               intubation
## 10469                                                                                                                                                       ir
## 10470                                                                                                                                                     iron
## 10471                                                                                                                                                  israeli
## 10472                                                                                                                                                    it�ll
## 10473                                                                                                                                                      jab
## 10474                                                                                                                                                     jabs
## 10475                                                                                                                                                     jack
## 10476                                                                                                                                                    jason
## 10477                                                                                                                                                    johns
## 10478                                                                                                                                                    joint
## 10479                                                                                                                                                       jr
## 10480                                                                                                                                                   justin
## 10481                                                                                                                                                   kansas
## 10482                                                                                                                                                knowingly
## 10483                                                                                                                                                knowledge
## 10484                                                                                                                                                     kotb
## 10485                                                                                                                                                     kris
## 10486                                                                                                                                               laboratory
## 10487                                                                                                                                                  labores
## 10488                                                                                                                                                     labs
## 10489                                                                                                                                                lafayette
## 10490                                                                                                                                                     laid
## 10491                                                                                                                                                     land
## 10492                                                                                                                                                 laughing
## 10493                                                                                                                                                   lawyer
## 10494                                                                                                                                                      led
## 10495                                                                                                                                                   lenoir
## 10496                                                                                                                                                   lethal
## 10497                                                                                                                                                     liar
## 10498                                                                                                                                                libraries
## 10499                                                                                                                                               lieutenant
## 10500                                                                                                                                                lightfoot
## 10501                                                                                                                                                    limit
## 10502                                                                                                                                               linebacker
## 10503                                                                                                                                                   linked
## 10504                                                                                                                                                 listened
## 10505                                                                                                                                                    lived
## 10506                                                                                                                                                   lonely
## 10507                                                                                                                                                   looked
## 10508                                                                                                                                                     lori
## 10509                                                                                                                                                     lose
## 10510                                                                                                                                                     loud
## 10511                                                                                                                                                   loving
## 10512                                                                                                                                                    lucas
## 10513                                                                                                                                                    luego
## 10514                                                                                                                                                    lunes
## 10515                                                                                                                                                     maga
## 10516                                                                                                                                                    magic
## 10517                                                                                                                                                     mail
## 10518                                                                                                                                              malfeasance
## 10519                                                                                                                                                     mall
## 10520                                                                                                                                                  manager
## 10521                                                                                                                                                 mandated
## 10522                                                                                                                                                 marathon
## 10523                                                                                                                                                marijuana
## 10524                                                                                                                                                     mark
## 10525                                                                                                                                                   martes
## 10526                                                                                                                                                  matthew
## 10527                                                                                                                                               mccullough
## 10528                                                                                                                                                  mcdavid
## 10529                                                                                                                                                  measure
## 10530                                                                                                                                                 medicare
## 10531                                                                                                                                                     meds
## 10532                                                                                                                                                    meets
## 10533                                                                                                                                                  mention
## 10534                                                                                                                                                     mesa
## 10535                                                                                                                                                messaging
## 10536                                                                                                                                                    messi
## 10537                                                                                                                                                   meyers
## 10538                                                                                                                                                       mf
## 10539                                                                                                                                                  michael
## 10540                                                                                                                                              mishandling
## 10541                                                                                                                                                  mission
## 10542                                                                                                                                              mississippi
## 10543                                                                                                                                                    mixup
## 10544                                                                                                                                                       mo
## 10545                                                                                                                                                  monitor
## 10546                                                                                                                                                  monthly
## 10547                                                                                                                                                    moral
## 10548                                                                                                                                                morning�s
## 10549                                                                                                                                                    moron
## 10550                                                                                                                                                    mouth
## 10551                                                                                                                                                    movie
## 10552                                                                                                                                                      msu
## 10553                                                                                                                                                    muito
## 10554                                                                                                                                                    mundo
## 10555                                                                                                                                                   museum
## 10556                                                                                                                                                   mutate
## 10557                                                                                                                                                  mutated
## 10558                                                                                                                                               nationwide
## 10559                                                                                                                                                      nbc
## 10560                                                                                                                                                 negativa
## 10561                                                                                                                                               negligence
## 10562                                                                                                                                                  nervous
## 10563                                                                                                                                            news24vabeach
## 10564                                                                                                                                                     nick
## 10565                                                                                                                                                   nights
## 10566                                                                                                                                                nonprofit
## 10567                                                                                                                                                    noooo
## 10568                                                                                                                                                     nope
## 10569                                                                                                                                                northeast
## 10570                                                                                                                                                 northern
## 10571                                                                                                                                                  noticed
## 10572                                                                                                                                            notifications
## 10573                                                                                                                                                   notify
## 10574                                                                                                                                                     nova
## 10575                                                                                                                                                       nu
## 10576                                                                                                                                                    nunca
## 10577                                                                                                                                                  nursing
## 10578                                                                                                                                                    obese
## 10579                                                                                                                                                       oc
## 10580                                                                                                                                                   offers
## 10581                                                                                                                                               officially
## 10582                                                                                                                                                 omnicron
## 10583                                                                                                                                                  ontario
## 10584                                                                                                                                                operation
## 10585                                                                                                                                              opportunity
## 10586                                                                                                                                                   oppose
## 10587                                                                                                                                               opposition
## 10588                                                                                                                                                 optional
## 10589                                                                                                                                               organizers
## 10590                                                                                                                                                    otras
## 10591                                                                                                                                                 outcomes
## 10592                                                                                                                                                   outlet
## 10593                                                                                                                                                   panam�
## 10594                                                                                                                                                    pants
## 10595                                                                                                                                                   parade
## 10596                                                                                                                                                    parte
## 10597                                                                                                                                                particles
## 10598                                                                                                                                             partisanship
## 10599                                                                                                                                                 partners
## 10600                                                                                                                                                 partying
## 10601                                                                                                                                                  passing
## 10602                                                                                                                                                   paused
## 10603                                                                                                                                               perception
## 10604                                                                                                                                                  perfect
## 10605                                                                                                                                               performing
## 10606                                                                                                                                                permitted
## 10607                                                                                                                                               personally
## 10608                                                                                                                                                       ph
## 10609                                                                                                                                           pharmaceutical
## 10610                                                                                                                                                  phoenix
## 10611                                                                                                                                                   photos
## 10612                                                                                                                                                      phs
## 10613                                                                                                                                                      pic
## 10614                                                                                                                                                   picked
## 10615                                                                                                                                                   pickup
## 10616                                                                                                                                                     pide
## 10617                                                                                                                                                 planning
## 10618                                                                                                                                                    plant
## 10619                                                                                                                                                 platform
## 10620                                                                                                                                                   plenty
## 10621                                                                                                                                                pneumonia
## 10622                                                                                                                                                     port
## 10623                                                                                                                                              possibility
## 10624                                                                                                                                                  posting
## 10625                                                                                                                                                 postpone
## 10626                                                                                                                                               postponing
## 10627                                                                                                                                                     pour
## 10628                                                                                                                                                practices
## 10629                                                                                                                                                   prayer
## 10630                                                                                                                                               prediction
## 10631                                                                                                                                                 pregnant
## 10632                                                                                                                                                  premier
## 10633                                                                                                                                                  prepare
## 10634                                                                                                                                              preregister
## 10635                                                                                                                                              preventable
## 10636                                                                                                                                                   prices
## 10637                                                                                                                                                   primer
## 10638                                                                                                                                                principal
## 10639                                                                                                                                                    print
## 10640                                                                                                                                                   prison
## 10641                                                                                                                                                professor
## 10642                                                                                                                                                  profile
## 10643                                                                                                                                                 profiled
## 10644                                                                                                                                                promising
## 10645                                                                                                                                                  promote
## 10646                                                                                                                                                promoting
## 10647                                                                                                                                                   proves
## 10648                                                                                                                                               providence
## 10649                                                                                                                                                       ps
## 10650                                                                                                                                                      psa
## 10651                                                                                                                                                 publicly
## 10652                                                                                                                                                published
## 10653                                                                                                                                               publishing
## 10654                                                                                                                                                    puede
## 10655                                                                                                                                                 purposes
## 10656                                                                                                                                                  quantum
## 10657                                                                                                                                             quarantining
## 10658                                                                                                                                                  quarter
## 10659                                                                                                                                                   quiere
## 10660                                                                                                                                                    quiet
## 10661                                                                                                                                                    quote
## 10662                                                                                                                                                   racism
## 10663                                                                                                                                                    radio
## 10664                                                                                                                                                    rainy
## 10665                                                                                                                                                  raising
## 10666                                                                                                                                                    ramen
## 10667                                                                                                                                                  reached
## 10668                                                                                                                                                  reduced
## 10669                                                                                                                                                     reed
## 10670                                                                                                                                                reference
## 10671                                                                                                                                                 reflects
## 10672                                                                                                                                                   regret
## 10673                                                                                                                                                  regular
## 10674                                                                                                                                                   rehire
## 10675                                                                                                                                                reinstate
## 10676                                                                                                                                                rejecting
## 10677                                                                                                                                                 reliable
## 10678                                                                                                                                                 religion
## 10679                                                                                                                                                religious
## 10680                                                                                                                                                remaining
## 10681                                                                                                                                                  remains
## 10682                                                                                                                                                   remove
## 10683                                                                                                                                                  removed
## 10684                                                                                                                                                 repeated
## 10685                                                                                                                                              replacement
## 10686                                                                                                                                                  repunte
## 10687                                                                                                                                                requested
## 10688                                                                                                                                              researchers
## 10689                                                                                                                                                residence
## 10690                                                                                                                                              resolutions
## 10691                                                                                                                                                 resource
## 10692                                                                                                                                                responses
## 10693                                                                                                                                                  restart
## 10694                                                                                                                                                 retested
## 10695                                                                                                                                                  returns
## 10696                                                                                                                                                  reveals
## 10697                                                                                                                                                    rhode
## 10698                                                                                                                                                       ri
## 10699                                                                                                                                                 richmond
## 10700                                                                                                                                                rightwing
## 10701                                                                                                                                                    risen
## 10702                                                                                                                                                riskbased
## 10703                                                                                                                                                  risking
## 10704                                                                                                                                                     road
## 10705                                                                                                                                                 rochelle
## 10706                                                                                                                                                     roll
## 10707                                                                                                                                                   rolled
## 10708                                                                                                                                                    rough
## 10709                                                                                                                                                  routine
## 10710                                                                                                                                                     rule
## 10711                                                                                                                                                     sake
## 10712                                                                                                                                                    salle
## 10713                                                                                                                                                 salvador
## 10714                                                                                                                                                   sample
## 10715                                                                                                                                                     sars
## 10716                                                                                                                                                saturdays
## 10717                                                                                                                                                   screen
## 10718                                                                                                                                                     scsu
## 10719                                                                                                                                                  seaside
## 10720                                                                                                                                                   secure
## 10721                                                                                                                                                 security
## 10722                                                                                                                                                     seek
## 10723                                                                                                                                                  seeking
## 10724                                                                                                                                                    seg�n
## 10725                                                                                                                                                     seis
## 10726                                                                                                                                                 selftest
## 10727                                                                                                                                                 semestre
## 10728                                                                                                                                                  seniors
## 10729                                                                                                                                                 separate
## 10730                                                                                                                                                     sept
## 10731                                                                                                                                                  serving
## 10732                                                                                                                                                  session
## 10733                                                                                                                                                    shame
## 10734                                                                                                                                                 shedding
## 10735                                                                                                                                                  shelter
## 10736                                                                                                                                                     ship
## 10737                                                                                                                                                  shipped
## 10738                                                                                                                                                 shoutout
## 10739                                                                                                                                                    shown
## 10740                                                                                                                                                   siguen
## 10741                                                                                                                                                  similar
## 10742                                                                                                                                                     sino
## 10743                                                                                                                                                  sistema
## 10744                                                                                                                                                   sister
## 10745                                                                                                                                                situaci�n
## 10746                                                                                                                                                      sky
## 10747                                                                                                                                                skyrocket
## 10748                                                                                                                                                      smh
## 10749                                                                                                                                                    smith
## 10750                                                                                                                                                   soared
## 10751                                                                                                                                                     sold
## 10752                                                                                                                                               solidarity
## 10753                                                                                                                                                     song
## 10754                                                                                                                                                     sont
## 10755                                                                                                                                                   sooner
## 10756                                                                                                                                                  spanish
## 10757                                                                                                                                                    spoke
## 10758                                                                                                                                                 sporting
## 10759                                                                                                                                                spotlight
## 10760                                                                                                                                               staggering
## 10761                                                                                                                                                   starke
## 10762                                                                                                                                               statements
## 10763                                                                                                                                                  staying
## 10764                                                                                                                                                   steady
## 10765                                                                                                                                                    stood
## 10766                                                                                                                                                  strange
## 10767                                                                                                                                               strategies
## 10768                                                                                                                                                   stress
## 10769                                                                                                                                                   strict
## 10770                                                                                                                                                  strikes
## 10771                                                                                                                                                 stronger
## 10772                                                                                                                                                 studying
## 10773                                                                                                                                                  subject
## 10774                                                                                                                                                   submit
## 10775                                                                                                                                             subscription
## 10776                                                                                                                                                     suck
## 10777                                                                                                                                                suggested
## 10778                                                                                                                                                 supposed
## 10779                                                                                                                                                  surging
## 10780                                                                                                                                                 surprise
## 10781                                                                                                                                              surrounding
## 10782                                                                                                                                                surviving
## 10783                                                                                                                                                 survivor
## 10784                                                                                                                                                suspected
## 10785                                                                                                                                               suspending
## 10786                                                                                                                                               suspicious
## 10787                                                                                                                                                 s�ntomas
## 10788                                                                                                                                              tallahassee
## 10789                                                                                                                                                   taught
## 10790                                                                                                                                                    teach
## 10791                                                                                                                                                     teen
## 10792                                                                                                                                                teenagers
## 10793                                                                                                                                                      ten
## 10794                                                                                                                                               terrorists
## 10795                                                                                                                                              testing�and
## 10796                                                                                                                                             thanksgiving
## 10797                                                                                                                                                threatens
## 10798                                                                                                                                                  threats
## 10799                                                                                                                                                 thrilled
## 10800                                                                                                                                                  tickets
## 10801                                                                                                                                                   tienes
## 10802                                                                                                                                                    tiger
## 10803                                                                                                                                                     till
## 10804                                                                                                                                                   timely
## 10805                                                                                                                                                    time�
## 10806                                                                                                                                                      tom
## 10807                                                                                                                                                    tomar
## 10808                                                                                                                                                      ton
## 10809                                                                                                                                                    tough
## 10810                                                                                                                                                     tout
## 10811                                                                                                                                               trabajando
## 10812                                                                                                                                                  tracing
## 10813                                                                                                                                                  tracked
## 10814                                                                                                                                                 tracking
## 10815                                                                                                                                                  traffic
## 10816                                                                                                                                                 transfer
## 10817                                                                                                                                             transparency
## 10818                                                                                                                                                  treated
## 10819                                                                                                                                                  tribute
## 10820                                                                                                                                                    trips
## 10821                                                                                                                                                   troops
## 10822                                                                                                                                                  trouble
## 10823                                                                                                                                                  trump�s
## 10824                                                                                                                                                     twin
## 10825                                                                                                                                                       tx
## 10826                                                                                                                                                typically
## 10827                                                                                                                                                       um
## 10828                                                                                                                                                     unas
## 10829                                                                                                                                              unavailable
## 10830                                                                                                                                              uncertainty
## 10831                                                                                                                                                      und
## 10832                                                                                                                                                   unlike
## 10833                                                                                                                                              unmitigated
## 10834                                                                                                                                                      uno
## 10835                                                                                                                                            unvaccinated�
## 10836                                                                                                                                                      up�
## 10837                                                                                                                                              vaccinated�
## 10838                                                                                                                                              vaccinating
## 10839                                                                                                                                                 vaccined
## 10840                                                                                                                                                vacunarse
## 10841                                                                                                                                                    vaers
## 10842                                                                                                                                                    valid
## 10843                                                                                                                                                   valley
## 10844                                                                                                                                                 valuable
## 10845                                                                                                                                                      van
## 10846                                                                                                                                                    vegas
## 10847                                                                                                                                                  version
## 10848                                                                                                                                                   viagra
## 10849                                                                                                                                                   victim
## 10850                                                                                                                                                      vid
## 10851                                                                                                                                                  viernes
## 10852                                                                                                                                               violations
## 10853                                                                                                                                                   visual
## 10854                                                                                                                                                    vocal
## 10855                                                                                                                                                     wage
## 10856                                                                                                                                                   walked
## 10857                                                                                                                                                     wall
## 10858                                                                                                                                                     ward
## 10859                                                                                                                                                   warned
## 10860                                                                                                                                                  warning
## 10861                                                                                                                                                     wash
## 10862                                                                                                                                                waterbury
## 10863                                                                                                                                              wednesday�s
## 10864                                                                                                                                                     weed
## 10865                                                                                                                                                 weekends
## 10866                                                                                                                                                     welp
## 10867                                                                                                                                                  western
## 10868                                                                                                                                                    whove
## 10869                                                                                                                                                     wide
## 10870                                                                                                                                                   widely
## 10871                                                                                                                                                   window
## 10872                                                                                                                                                  witness
## 10873                                                                                                                                                   woman�
## 10874                                                                                                                                                workplace
## 10875                                                                                                                                                worldwide
## 10876                                                                                                                                                worsening
## 10877                                                                                                                                                  worship
## 10878                                                                                                                                                    worth
## 10879                                                                                                                                                 would�ve
## 10880                                                                                                                                                       wr
## 10881                                                                                                                                                      wsj
## 10882                                                                                                                                                    wuhan
## 10883                                                                                                                                                    yacht
## 10884                                                                                                                                                      yay
## 10885                                                                                                                                                    year�
## 10886                                                                                                                                               yesterdays
## 10887                                                                                                                                                      yrs
## 10888                                                                                                                                                 �because
## 10889                                                                                                                                                    �dish
## 10890                                                                                                                                                  �friend
## 10891                                                                                                                                                     �has
## 10892                                                                                                                                                    �ihu�
## 10893                                                                                                                                                �infected
## 10894                                                                                                                                                    �it�s
## 10895                                                                                                                                         �misinformation�
## 10896                                                                                                                                                     �our
## 10897                                                                                                                                                  �people
## 10898                                                                                                                                                     �qu�
## 10899                                                                                                                                                    �this
## 10900                                                                                                                                               �travesty�
## 10901                                                                                                                                                  @69news
## 10902                                                                                                                                                    @6abc
## 10903                                                                                                                                             @7sfernandes
## 10904                                                                                                                                               @971fmtalk
## 10905                                                                                                                                             @abdallahcnn
## 10906                                                                                                                                          @acgreyhoundsfb
## 10907                                                                                                                                                  @acosta
## 10908                                                                                                                                              @adamserwer
## 10909                                                                                                                                                @aftunion
## 10910                                                                                                                                               @aiims1742
## 10911                                                                                                                                                   @ajrod
## 10912                                                                                                                                            @amyhdeekenmd
## 10913                                                                                                                                                  @anchor
## 10914                                                                                                                                              @andrewyang
## 10915                                                                                                                                                 @andydrc
## 10916                                                                                                                                             @asmcarrillo
## 10917                                                                                                                                         @asmjessegabriel
## 10918                                                                                                                                         @asmrichardbloom
## 10919                                                                                                                                                 @associa
## 10920                                                                                                                                             @astrazeneca
## 10921                                                                                                                                          @asymmetricinfo
## 10922                                                                                                                                           @attorneycrump
## 10923                                                                                                                                                  @ausgov
## 10924                                                                                                                                                     @ava
## 10925                                                                                                                                           @azgilamonster
## 10926                                                                                                                                             @babyvampami
## 10927                                                                                                                                                 @bachnyc
## 10928                                                                                                                                             @ballotboxco
## 10929                                                                                                                                         @ballouxfrancois
## 10930                                                                                                                                             @banklesotho
## 10931                                                                                                                                             @barackobama
## 10932                                                                                                                                              @bauerkahan
## 10933                                                                                                                                               @bazecraze
## 10934                                                                                                                                               @beavallem
## 10935                                                                                                                                           @berniesanders
## 10936                                                                                                                                                @bheintzz
## 10937                                                                                                                                               @billmaher
## 10938                                                                                                                                             @billmaxwell
## 10939                                                                                                                                              @birxscarfs
## 10940                                                                                                                                             @bouofficial
## 10941                                                                                                                                           @breitbartnews
## 10942                                                                                                                                                 @brhodes
## 10943                                                                                                                                          @bridgetphetasy
## 10944                                                                                                                                              @bucksexton
## 10945                                                                                                                                           @bulwarkonline
## 10946                                                                                                                                                @cbkkenya
## 10947                                                                                                                                                    @cbs8
## 10948                                                                                                                                                     @cdc
## 10949                                                                                                                                               @cdcglobal
## 10950                                                                                                                                               @cdcncezid
## 10951                                                                                                                                               @cdctravel
## 10952                                                                                                                                           @centralbankrw
## 10953                                                                                                                                               @cernovich
## 10954                                                                                                                                                    @cher
## 10955                                                                                                                                              @chriscuomo
## 10956                                                                                                                                            @chuckwoolery
## 10957                                                                                                                                             @citibikenyc
## 10958                                                                                                                                           @cityofatlanta
## 10959                                                                                                                                         @cityofglenarden
## 10960                                                                                                                                               @cityofmgm
## 10961                                                                                                                                          @cityofnewarknj
## 10962                                                                                                                                          @cityoftulsagov
## 10963                                                                                                                                             @clueheywood
## 10964                                                                                                                                                @cmclymer
## 10965                                                                                                                                                  @cnnbrk
## 10966                                                                                                                                                   @cnnee
## 10967                                                                                                                                             @cnnpolitics
## 10968                                                                                                                                           @collettpsmall
## 10969                                                                                                                                            @columbiamsph
## 10970                                                                                                                                             @ctbergstrom
## 10971                                                                                                                                             @ctitusbrown
## 10972                                                                                                                                                    @cuny
## 10973                                                                                                                                           @dancrenshawtx
## 10974                                                                                                                                              @danscavino
## 10975                                                                                                                                             @dawnhosmer7
## 10976                                                                                                                                              @dcexaminer
## 10977                                                                                                                                             @debbielesko
## 10978                                                                                                                                                @dhenry52
## 10979                                                                                                                                                 @dianneg
## 10980                                                                                                                                             @diegoarisot
## 10981                                                                                                                                             @dmarshallmd
## 10982                                                                                                                                                @donlemon
## 10983                                                                                                                                              @donwinslow
## 10984                                                                                                                                                @dougship
## 10985                                                                                                                                              @draldehyde
## 10986                                                                                                                                               @drlrapalo
## 10987                                                                                                                                             @drmariolama
## 10988                                                                                                                                              @evanpgrant
## 10989                                                                                                                                                @facebook
## 10990                                                                                                                                             @favored3470
## 10991                                                                                                                                          @fireonwaterbar
## 10992                                                                                                                                             @floreslanza
## 10993                                                                                                                                         @formerrepublic7
## 10994                                                                                                                                                   @fox23
## 10995                                                                                                                                         @foxfriendsfirst
## 10996                                                                                                                                            @foxsports910
## 10997                                                                                                                                          @frankbigelowca
## 10998                                                                                                                                           @fsfconference
## 10999                                                                                                                                                  @funder
## 11000                                                                                                                                               @garchamed
## 11001                                                                                                                                         @gatesfoundation
## 11002                                                                                                                                           @gephardtdaily
## 11003                                                                                                                                          @gerridetweiler
## 11004                                                                                                                                               @goldbelly
## 11005                                                                                                                                               @gopleader
## 11006                                                                                                                                               @govabbott
## 11007                                                                                                                                              @govbilllee
## 11008                                                                                                                                         @governortomwolf
## 11009                                                                                                                                              @governorva
## 11010                                                                                                                                               @govmurphy
## 11011                                                                                                                                          @govrondesantis
## 11012                                                                                                                                                @govstitt
## 11013                                                                                                                                              @govtimwalz
## 11014                                                                                                                                            @gregabbotttx
## 11015                                                                                                                                             @greggutfeld
## 11016                                                                                                                                            @gretchemaben
## 11017                                                                                                                                            @gsfopentexas
## 11018                                                                                                                                                 @gtbynum
## 11019                                                                                                                                              @gtconway3d
## 11020                                                                                                                                                 @haylo64
## 11021                                                                                                                                             @healthgovau
## 11022                                                                                                                                            @hendrickenfb
## 11023                                                                                                                                                  @hhsgov
## 11024                                                                                                                                           @hhspopaffairs
## 11025                                                                                                                                           @hhsprevention
## 11026                                                                                                                                           @hkrassenstein
## 11027                                                                                                                                         @hopkinsmedicine
## 11028                                                                                                                                                 @ianad57
## 11029                                                                                                                                               @icday2020
## 11030                                                                                                                                            @imraycheljay
## 11031                                                                                                                                              @indiatoday
## 11032                                                                                                                                            @inevitableet
## 11033                                                                                                                                                  @ipfdoc
## 11034                                                                                                                                               @israelipm
## 11035                                                                                                                                            @jacksonfornc
## 11036                                                                                                                                              @jacquipatt
## 11037                                                                                                                                          @jameslindholm1
## 11038                                                                                                                                           @jennaellisesq
## 11039                                                                                                                                         @jessicabrunell1
## 11040                                                                                                                                         @jimconn04125141
## 11041                                                                                                                                                @jmspirit
## 11042                                                                                                                                          @joanie95270269
## 11043                                                                                                                                                @jodyemtp
## 11044                                                                                                                                                  @joenbc
## 11045                                                                                                                                            @joewellman16
## 11046                                                                                                                                              @johncusack
## 11047                                                                                                                                         @johngallagherjr
## 11048                                                                                                                                         @joncoopertweets
## 11049                                                                                                                                          @joshmankiewicz
## 11050                                                                                                                                                 @joshtpm
## 11051                                                                                                                                              @joyannreid
## 11052                                                                                                                                           @jrubinblogger
## 11053                                                                                                                                               @judgewren
## 11054                                                                                                                                              @juliaioffe
## 11055                                                                                                                                             @kaminskimed
## 11056                                                                                                                                            @keithsigelmd
## 11057                                                                                                                                              @khameneiir
## 11058                                                                                                                                                  @khnews
## 11059                                                                                                                                               @kthopkins
## 11060                                                                                                                                                    @ktla
## 11061                                                                                                                                          @lapublichealth
## 11062                                                                                                                                              @larryelder
## 11063                                                                                                                                         @lasvegaslocally
## 11064                                                                                                                                           @leticiakawano
## 11065                                                                                                                                         @lindseygrahamsc
## 11066                                                                                                                                           @lisamurkowski
## 11067                                                                                                                                         @lisaponyexpress
## 11068                                                                                                                                             @londonbreed
## 11069                                                                                                                                            @lopezobrador
## 11070                                                                                                                                              @lorenaad80
## 11071                                                                                                                                               @maggienyt
## 11072                                                                                                                                          @mariabartiromo
## 11073                                                                                                                                            @mariolysosap
## 11074                                                                                                                                            @marshallproj
## 11075                                                                                                                                             @mcgovernmed
## 11076                                                                                                                                                @mckinsey
## 11077                                                                                                                                         @memorialhermann
## 11078                                                                                                                                             @mfleming877
## 11079                                                                                                                                         @michaelausiello
## 11080                                                                                                                                            @miguetavarez
## 11081                                                                                                                                               @mmabucsfb
## 11082                                                                                                                                                   @myaea
## 11083                                                                                                                                                   @naacp
## 11084                                                                                                                                                     @nar
## 11085                                                                                                                                                    @nasw
## 11086                                                                                                                                           @natesilver538
## 11087                                                                                                                                                     @nba
## 11088                                                                                                                                                   @nddoh
## 11089                                                                                                                                                    @nejm
## 11090                                                                                                                                                @nelpnews
## 11091                                                                                                                                                @newshour
## 11092                                                                                                                                             @nextlevelbb
## 11093                                                                                                                                                     @nih
## 11094                                                                                                                                             @nihprevents
## 11095                                                                                                                                                    @nike
## 11096                                                                                                                                              @nnickperry
## 11097                                                                                                                                          @noticentrowapa
## 11098                                                                                                                                              @nualafor34
## 11099                                                                                                                                                 @nync214
## 11100                                                                                                                                                @nypmetro
## 11101                                                                                                                                                   @nysut
## 11102                                                                                                                                              @oficialbna
## 11103                                                                                                                                          @oregongovbrown
## 11104                                                                                                                                                 @pcbrynn
## 11105                                                                                                                                                @pcronald
## 11106                                                                                                                                          @phillyinquirer
## 11107                                                                                                                                                 @pho12dc
## 11108                                                                                                                                           @phylogenomics
## 11109                                                                                                                                                @pmcgovau
## 11110                                                                                                                                              @prinzeskim
## 11111                                                                                                                                         @pronetworkerllc
## 11112                                                                                                                                             @qasimrashid
## 11113                                                                                                                                            @rachbarnhart
## 11114                                                                                                                                         @reaidonaidtripe
## 11115                                                                                                                                          @realjameswoods
## 11116                                                                                                                                                  @reason
## 11117                                                                                                                                               @redsteeze
## 11118                                                                                                                                              @repo520420
## 11119                                                                                                                                          @reservebankzim
## 11120                                                                                                                                          @richmondcityhd
## 11121                                                                                                                                                  @rivals
## 11122                                                                                                                                              @robbontaca
## 11123                                                                                                                                            @rollingstone
## 11124                                                                                                                                                    @rwjf
## 11125                                                                                                                                               @sanchak74
## 11126                                                                                                                                         @satvind30487005
## 11127                                                                                                                                             @scottkaplan
## 11128                                                                                                                                            @senatemajldr
## 11129                                                                                                                                          @senatorcollins
## 11130                                                                                                                                           @senatorparker
## 11131                                                                                                                                            @senjudiciary
## 11132                                                                                                                                           @senthomtillis
## 11133                                                                                                                                              @shincarsen
## 11134                                                                                                                                             @shufootball
## 11135                                                                                                                                         @shynefernandes1
## 11136                                                                                                                                            @siliconangle
## 11137                                                                                                                                           @sportslawlust
## 11138                                                                                                                                                 @spotify
## 11139                                                                                                                                               @statedept
## 11140                                                                                                                                                @stateoig
## 11141                                                                                                                                         @stevenbeschloss
## 11142                                                                                                                                            @suchabigegoh
## 11143                                                                                                                                             @susaneggman
## 11144                                                                                                                                           @tactica1gamer
## 11145                                                                                                                                                  @tcproj
## 11146                                                                                                                                                 @tedlieu
## 11147                                                                                                                                         @thebradfordfile
## 11148                                                                                                                                           @thedailybeast
## 11149                                                                                                                                           @thedanielcura
## 11150                                                                                                                                          @theglobalfight
## 11151                                                                                                                                         @thegreatoutdoo1
## 11152                                                                                                                                                 @thehill
## 11153                                                                                                                                             @theresistor
## 11154                                                                                                                                           @therickwilson
## 11155                                                                                                                                             @therinsekid
## 11156                                                                                                                                               @tidalmktg
## 11157                                                                                                                                                @tomgores
## 11158                                                                                                                                               @travelgov
## 11159                                                                                                                                                 @twitter
## 11160                                                                                                                                          @twittermoments
## 11161                                                                                                                                                  @ubswce
## 11162                                                                                                                                             @urifootball
## 11163                                                                                                                                                  @usagov
## 11164                                                                                                                                           @uscsocialwork
## 11165                                                                                                                                         @utahdepofhealth
## 11166                                                                                                                                                @uthealth
## 11167                                                                                                                                              @viajeschat
## 11168                                                                                                                                           @vikingshuddle
## 11169                                                                                                                                               @virenkaul
## 11170                                                                                                                                                @voceropr
## 11171                                                                                                                                               @voxdotcom
## 11172                                                                                                                                                @wamcnews
## 11173                                                                                                                                                @wbaltv11
## 11174                                                                                                                                             @webcentrick
## 11175                                                                                                                                                   @webmd
## 11176                                                                                                                                                     @who
## 11177                                                                                                                                                   @wnefb
## 11178                                                                                                                                                     @wsj
## 11179                                                                                                                                                 @yamiche
## 11180                                                                                                                                                  @yashar
## 11181                                                                                                                                                  @yft860
## 11182                                                                                                                                         @yogiatamalhotr1
## 11183                                                                                                                                                 @yongyea
## 11184                                                                                                                                          @yonkersschools
## 11185                                                                                                                                                  @yro854
## 11186                                                                                                                                             @zimtreasury
## 11187                                                                                                                                                       #a
## 11188                                                                                                                                                  #ab2261
## 11189                                                                                                                                                    #ad60
## 11190                                                                                                                                 #americafirstrepublicans
## 11191                                                                                                                                                  #ballot
## 11192                                                                                                                                                 #bayarea
## 11193                                                                                                                                                  #beauty
## 11194                                                                                                                                             #bethechange
## 11195                                                                                                                                          #bettertogether
## 11196                                                                                                                                               #bigpharma
## 11197                                                                                                                                    #breastcancersurvivor
## 11198                                                                                                                                           #breonnataylor
## 11199                                                                                                                                          #bunkerboytrump
## 11200                                                                                                                                                      #ca
## 11201                                                                                                                                              #california
## 11202                                                                                                                                                  #cares2
## 11203                                                                                                                                                     #cdc
## 11204                                                                                                                                                   #china
## 11205                                                                                                                                               #cigarlife
## 11206                                                                                                                                                  #cigars
## 11207                                                                                                                                                   #class
## 11208                                                                                                                                               #community
## 11209                                                                                                                                         #conciergenotary
## 11210                                                                                                                                          #coronavirusnyc
## 11211                                                                                                                                     #coronavirusoutbreak
## 11212                                                                                                                                     #coronaviruspandemic
## 11213                                                                                                                                              #counseling
## 11214                                                                                                                                             #covididiots
## 11215                                                                                                                                                    #crew
## 11216                                                                                                                                               #cristobal
## 11217                                                                                                                                             #cruiseships
## 11218                                                                                                                                                  #dallas
## 11219                                                                                                                                             #dallassalon
## 11220                                                                                                                                               #dcprotest
## 11221                                                                                                                                            #defundpolice
## 11222                                                                                                                                                #dfwsalon
## 11223                                                                                                                                                  #donate
## 11224                                                                                                                                           #dumptrump2020
## 11225                                                                                                                                                #eatlocal
## 11226                                                                                                                                            #elpasostrong
## 11227                                                                                                                                          #enoughisenough
## 11228                                                                                                                                              #epitwitter
## 11229                                                                                                                                                  #equity
## 11230                                                                                                                                                    #farm
## 11231                                                                                                                                                 #fitness
## 11232                                                                                                                                         #flattenthecurve
## 11233                                                                                                                                                    #food
## 11234                                                                                                                                              #fordranger
## 11235                                                                                                                                                   #funny
## 11236                                                                                                                                          #gooddaymemphis
## 11237                                                                                                                                    #gopcomplicittraitors
## 11238                                                                                                                                    #governmentcontractor
## 11239                                                                                                                                       #grandprairiesalon
## 11240                                                                                                                                           #hallofjustice
## 11241                                                                                                                                              #healthcare
## 11242                                                                                                                                        #healthcareheroes
## 11243                                                                                                                                       #healthdisparities
## 11244                                                                                                                                            #healthequity
## 11245                                                                                                                                                #humanity
## 11246                                                                                                                                             #humanrights
## 11247                                                                                                                                                   #icymi
## 11248                                                                                                                                  #ihivirtuallearninghour
## 11249                                                                                                                                               #instagram
## 11250                                                                                                                                          #inthistogether
## 11251                                                                                                                                                  #irvine
## 11252                                                                                                                                               #isolation
## 11253                                                                                                                                              #iteachmath
## 11254                                                                                                                                              #johnscreek
## 11255                                                                                                                                                       #k
## 11256                                                                                                                                           #kappaalphapsi
## 11257                                                                                                                                  #kellershorthairstylist
## 11258                                                                                                                                         #kennedalesalon�
## 11259                                                                                                                                                  #ladies
## 11260                                                                                                                                                   #lagov
## 11261                                                                                                                                          #laundryproject
## 11262                                                                                                                                                 #looting
## 11263                                                                                                                                              #losangeles
## 11264                                                                                                                                                    #maga
## 11265                                                                                                                                          #mansfieldsalon
## 11266                                                                                                                                                   #masks
## 11267                                                                                                                                                  #maskup
## 11268                                                                                                                                                  #mathed
## 11269                                                                                                                                                   #meded
## 11270                                                                                                                                                #mgmready
## 11271                                                                                                                                            #middleschool
## 11272                                                                                                                                          #migrantworkers
## 11273                                                                                                                                                #missouri
## 11274                                                                                                                                                   #money
## 11275                                                                                                                                                #move4atl
## 11276                                                                                                                                               #nashville
## 11277                                                                                                                                                     #nba
## 11278                                                                                                                                                   #ncpol
## 11279                                                                                                                                              #networking
## 11280                                                                                                                                                #newmusic
## 11281                                                                                                                                          #newmusicfriday
## 11282                                                                                                                                             #newyorkcity
## 11283                                                                                                                                                   #night
## 11284                                                                                                                                               #nightlife
## 11285                                                                                                                                      #northrichlandhills
## 11286                                                                                                                                            #nursinghomes
## 11287                                                                                                                                             #olderadults
## 11288                                                                                                                                            #orangecounty
## 11289                                                                                                                                               #plandemic
## 11290                                                                                                                                           #plexibarriers
## 11291                                                                                                                                              #plexiglass
## 11292                                                                                                                                                     #ppe
## 11293                                                                                                                                                 #realtor
## 11294                                                                                                                                               #resisters
## 11295                                                                                                                                                  #retail
## 11296                                                                                                                                                   #riots
## 11297                                                                                                                                                #rolltide
## 11298                                                                                                                                          #runhoutogether
## 11299                                                                                                                                                #sandiego
## 11300                                                                                                                                         #saturdaymorning
## 11301                                                                                                                                               #savelives
## 11302                                                                                                                                             #savinglives
## 11303                                                                                                                                                #selfcare
## 11304                                                                                                                                                    #sexy
## 11305                                                                                                                                                   #smoke
## 11306                                                                                                                                             #sneezeguard
## 11307                                                                                                                                         #socialisolation
## 11308                                                                                                                                               #staarprep
## 11309                                                                                                                                               #standards
## 11310                                                                                                                                        #stayhomestaysafe
## 11311                                                                                                                                               #stopincva
## 11312                                                                                                                                              #stopracism
## 11313                                                                                                                                #storiesnewsbyclaukosters
## 11314                                                                                                                                              #technology
## 11315                                                                                                                                         #thursdaymorning
## 11316                                                                                                                                        #thursdaythoughts
## 11317                                                                                                                                                 #topbuzz
## 11318                                                                                                                                                 #tourism
## 11319                                                                                                                                                  #travel
## 11320                                                                                                                                              #traveltips
## 11321                                                                                                                                               #trump2020
## 11322                                                                                                                                         #trumpdepression
## 11323                                                                                                                                             #trumpmustgo
## 11324                                                                                                                                                    #ttot
## 11325                                                                                                                                           #turntexasblue
## 11326                                                                                                                                            #unemployment
## 11327                                                                                                                                                  #update
## 11328                                                                                                                                                   #utpol
## 11329                                                                                                                                            #vaccineswork
## 11330                                                                                                                                                 #whiskey
## 11331                                                                                                                                                    #wine
## 11332                                                                                                                                                   #women
## 11333                                                                                                                                        #womenempowerment
## 11334                                                                                                                                      #worldfoodsafetyday
## 11335                                                                                                                                                    #zoom
## 11336                                                                                                                                             <u+0001f338>
## 11337                                                                                                                                             <u+0001f33a>
## 11338                                                                                                                                             <u+0001f399>
## 11339                                                                                                                                             <u+0001f39f>
## 11340                                                                                                                                             <u+0001f3a8>
## 11341                                                                                                                                             <u+0001f3c3>
## 11342                                                                                                                                             <u+0001f3e0>
## 11343                                                                                                                                             <u+0001f3f7>
## 11344                                                                                                                                 <u+0001f447><u+0001f3fb>
## 11345                                                                                                                                 <u+0001f447><u+0001f3fd>
## 11346                                                                                                                                 <u+0001f44a><u+0001f3fd>
## 11347                                                                                                                                             <u+0001f489>
## 11348                                                                                                                                             <u+0001f4b0>
## 11349                                                                                                                                             <u+0001f4f0>
## 11350                                                                                                                                             <u+0001f601>
## 11351                                                                                                                     <u+0001f602><u+0001f602><u+0001f602>
## 11352                                                                                                                                 <u+0001f602><u+0001f633>
## 11353                                                                                                                                             <u+0001f60f>
## 11354                                                                                                                                             <u+0001f612>
## 11355                                                                                                                                             <u+0001f615>
## 11356                                                                                                                                             <u+0001f618>
## 11357                                                                                                                                             <u+0001f629>
## 11358                                                                                                                                             <u+0001f62c>
## 11359                                                                                                                                 <u+0001f64c><u+0001f3fe>
## 11360                                                                                                                                             <u+0001f64f>
## 11361                                                                                                                                 <u+0001f64f><u+0001f3fc>
## 11362                                                                                                                                 <u+0001f64f><u+0001f3fd>
## 11363                                                                                                                                 <u+0001f64f><u+0001f3fe>
## 11364                                                                                                         <u+0001f926><u+0001f3fd><u+200d><u+2640><u+fe0f>
## 11365                                                                                                         <u+0001f926><u+0001f3fe><u+200d><u+2640><u+fe0f>
## 11366                                                                                                                                             <u+0001f92a>
## 11367                                                                                                         <u+0001f937><u+0001f3fd><u+200d><u+2642><u+fe0f>
## 11368                                                                                                                     <u+0001f937><u+200d><u+2640><u+fe0f>
## 11369                                                                                                                                             <u+0001f9d0>
## 11370                                                                                                                                         <u+041d><u+0430>
## 11371                                                                                                                                 <u+041e><u+041e><u+041d>
## 11372                                                                                                                                         <u+0420><u+0424>
## 11373                                                                                                                                         <u+0625><u+0646>
## 11374                                                                                                                                 <u+0634><u+0627><u+0621>
## 11375                                                                                                                 <u+0648><u+06cc><u+0631><u+0648><u+0633>
## 11376                                                                                                                                         <u+06a9><u+06cc>
## 11377                                                                                                                 <u+0917><u+0930><u+0947><u+0915><u+094b>
## 11378                                                                                                                                                 <u+2060>
## 11379                                                                                                                                         <u+2063><u+2063>
## 11380                                                                                                                                         <u+2639><u+fe0f>
## 11381                                                                                                                                         <u+2935><u+fe0f>
## 11382                                                                                                                                         <u+2b06><u+fe0f>
## 11383                                                                                                                         <u+2b07><u+fe0f><u+2b07><u+fe0f>
## 11384                                                                                                                                                   ~covid
## 11385                                                                                                                                                     $1bn
## 11386                                                                                                                                                    $bioc
## 11387                                                                                                                                                  10am6pm
## 11388                                                                                                                                                    11a6p
## 11389                                                                                                                                                     11am
## 11390                                                                                                                                                    126pm
## 11391                                                                                                                                                13newsnow
## 11392                                                                                                                                                     17pm
## 11393                                                                                                                                                     18th
## 11394                                                                                                                                                     24th
## 11395                                                                                                                                                     29th
## 11396                                                                                                                                                      2pm
## 11397                                                                                                                                                       4h
## 11398                                                                                                                                                      4pm
## 11399                                                                                                                                                       5k
## 11400                                                                                                                                                    700pm
## 11401                                                                                                                                                      70s
## 11402                                                                                                                                            7194395951for
## 11403                                                                                                                                                       8a
## 11404                                                                                                                                                     8a5p
## 11405                                                                                                                                                     8a6p
## 11406                                                                                                                                                   9am4pm
## 11407                                                                                                                                                    9news
## 11408                                                                                                                                                    abbot
## 11409                                                                                                                                                     abdi
## 11410                                                                                                                                                abilities
## 11411                                                                                                                                                  ability
## 11412                                                                                                                                                    abril
## 11413                                                                                                                                                 abstract
## 11414                                                                                                                                                  absurdo
## 11415                                                                                                                                                  abusive
## 11416                                                                                                                                               accelerate
## 11417                                                                                                                                              accelerates
## 11418                                                                                                                                               acceptable
## 11419                                                                                                                                                  accepts
## 11420                                                                                                                                              accommodate
## 11421                                                                                                                                             accomplished
## 11422                                                                                                                                                    aches
## 11423                                                                                                                                                 achieved
## 11424                                                                                                                                             acquiescence
## 11425                                                                                                                                                 actively
## 11426                                                                                                                                                 activist
## 11427                                                                                                                                                     acts
## 11428                                                                                                                                                adapting�
## 11429                                                                                                                                                   adem�s
## 11430                                                                                                                                                 adjusted
## 11431                                                                                                                                           administrators
## 11432                                                                                                                                                    admit
## 11433                                                                                                                                                 admitted
## 11434                                                                                                                                                adventure
## 11435                                                                                                                                                   advise
## 11436                                                                                                                                                 advisors
## 11437                                                                                                                                                 advisory
## 11438                                                                                                                                                 advocate
## 11439                                                                                                                                                      aed
## 11440                                                                                                                                                  aerosol
## 11441                                                                                                                                                afectadas
## 11442                                                                                                                                               affordable
## 11443                                                                                                                                         africanamericans
## 11444                                                                                                                                                       ag
## 11445                                                                                                                                                 agencies
## 11446                                                                                                                                                    agent
## 11447                                                                                                                                               aggravated
## 11448                                                                                                                                                    aging
## 11449                                                                                                                                                    agora
## 11450                                                                                                                                                   agosto
## 11451                                                                                                                                                      ahh
## 11452                                                                                                                                                     aida
## 11453                                                                                                                                                    aimed
## 11454                                                                                                                                                   airmen
## 11455                                                                                                                                                airplanes
## 11456                                                                                                                                                 airports
## 11457                                                                                                                                                   alaska
## 11458                                                                                                                                                      ale
## 11459                                                                                                                                                  aleluya
## 11460                                                                                                                                                     algo
## 11461                                                                                                                                                  alguien
## 11462                                                                                                                                                allegheny
## 11463                                                                                                                                                allentown
## 11464                                                                                                                                                  alltime
## 11465                                                                                                                                                 almighty
## 11466                                                                                                                                                   alone�
## 11467                                                                                                                                                     alta
## 11468                                                                                                                                                 ambiente
## 11469                                                                                                                                                 americas
## 11470                                                                                                                                                america�s
## 11471                                                                                                                                                  anarchy
## 11472                                                                                                                                                ancestors
## 11473                                                                                                                                                   animal
## 11474                                                                                                                                              antibiotics
## 11475                                                                                                                                                antiblack
## 11476                                                                                                                                              anticipated
## 11477                                                                                                                                             anticipation
## 11478                                                                                                                                                  antidot
## 11479                                                                                                                                              antimalaria
## 11480                                                                                                                                                       ao
## 11481                                                                                                                                                      aos
## 11482                                                                                                                                                       ap
## 11483                                                                                                                                                      aph
## 11484                                                                                                                                               apocalypse
## 11485                                                                                                                                                apologize
## 11486                                                                                                                                                  appeals
## 11487                                                                                                                                                  applied
## 11488                                                                                                                                            appropriation
## 11489                                                                                                                                                  approve
## 11490                                                                                                                                                     apps
## 11491                                                                                                                                                   arbery
## 11492                                                                                                                                                arguments
## 11493                                                                                                                                                arizonans
## 11494                                                                                                                                                 arizonas
## 11495                                                                                                                                                  arrests
## 11496                                                                                                                                                 arriving
## 11497                                                                                                                                                  artwork
## 11498                                                                                                                                                     asap
## 11499                                                                                                                                                      ash
## 11500                                                                                                                                                asheville
## 11501                                                                                                                                                  aspects
## 11502                                                                                                                                               assaulting
## 11503                                                                                                                                               assembling
## 11504                                                                                                                                                   assess
## 11505                                                                                                                                                   assets
## 11506                                                                                                                                                   asshat
## 11507                                                                                                                                                 assisted
## 11508                                                                                                                                                  assumed
## 11509                                                                                                                                              astrazeneca
## 11510                                                                                                                                            asymptomatic�
## 11511                                                                                                                                               asymptotic
## 11512                                                                                                                                             athletesuh�s
## 11513                                                                                                                                                attacking
## 11514                                                                                                                                                 audience
## 11515                                                                                                                                                     aunt
## 11516                                                                                                                                         authoritarianism
## 11517                                                                                                                                              authorities
## 11518                                                                                                                                                authority
## 11519                                                                                                                                            automatically
## 11520                                                                                                                                             availability
## 11521                                                                                                                                                      ave
## 11522                                                                                                                                                avoidable
## 11523                                                                                                                                                 avoiding
## 11524                                                                                                                                                     azim
## 11525                                                                                                                                                     a�os
## 11526                                                                                                                                                    badge
## 11527                                                                                                                                                    bahar
## 11528                                                                                                                                                     baja
## 11529                                                                                                                                                     bajo
## 11530                                                                                                                                                   bakari
## 11531                                                                                                                                              bakersfield
## 11532                                                                                                                                                baltimore
## 11533                                                                                                                                                     bama
## 11534                                                                                                                                                 bandcamp
## 11535                                                                                                                                                    bangs
## 11536                                                                                                                                                  banking
## 11537                                                                                                                                                  baptist
## 11538                                                                                                                                                  barbara
## 11539                                                                                                                                                   barber
## 11540                                                                                                                                                    basis
## 11541                                                                                                                                                      bat
## 11542                                                                                                                                                      bay
## 11543                                                                                                                                                   beach�
## 11544                                                                                                                                                    beard
## 11545                                                                                                                                               beginner�s
## 11546                                                                                                                                                  beliefs
## 11547                                                                                                                                                 believed
## 11548                                                                                                                                                     bell
## 11549                                                                                                                                                 bellevue
## 11550                                                                                                                                                   bernie
## 11551                                                                                                                                                  bersama
## 11552                                                                                                                                                      bff
## 11553                                                                                                                                          bhojani�staying
## 11554                                                                                                                                                     bias
## 11555                                                                                                                                                 bicycles
## 11556                                                                                                                                                     bien
## 11557                                                                                                                                                    bigot
## 11558                                                                                                                                                      bir
## 11559                                                                                                                                                  biscuit
## 11560                                                                                                                                                   bishop
## 11561                                                                                                                                                   blades
## 11562                                                                                                                                                   blames
## 11563                                                                                                                                                  blanket
## 11564                                                                                                                                                 blasting
## 11565                                                                                                                                                 bleeding
## 11566                                                                                                                                                     blew
## 11567                                                                                                                                                  blocked
## 11568                                                                                                                                                   blocks
## 11569                                                                                                                                                     blog
## 11570                                                                                                                                                  blowing
## 11571                                                                                                                                               blunderous
## 11572                                                                                                                                                  boarded
## 11573                                                                                                                                                boardwalk
## 11574                                                                                                                                                     boat
## 11575                                                                                                                                                    bogus
## 11576                                                                                                                                                bolsonaro
## 11577                                                                                                                                                   bonito
## 11578                                                                                                                                                      boo
## 11579                                                                                                                                                   booked
## 11580                                                                                                                                                 bookings
## 11581                                                                                                                                                  booming
## 11582                                                                                                                                                      bop
## 11583                                                                                                                                                  borders
## 11584                                                                                                                                                   bother
## 11585                                                                                                                                                   bounce
## 11586                                                                                                                                                  bouvier
## 11587                                                                                                                                                    boxes
## 11588                                                                                                                                                  boycott
## 11589                                                                                                                                                    boys�
## 11590                                                                                                                                           braincartiroid
## 11591                                                                                                                                                  brazils
## 11592                                                                                                                                                    bread
## 11593                                                                                                                                                breakfast
## 11594                                                                                                                                                 breakout
## 11595                                                                                                                                                 breathe�
## 11596                                                                                                                                                  brewing
## 11597                                                                                                                                                   bridge
## 11598                                                                                                                                                briefings
## 11599                                                                                                                                                brincando
## 11600                                                                                                                                                broadcast
## 11601                                                                                                                                               broadcasts
## 11602                                                                                                                                                 broadway
## 11603                                                                                                                                                  brokers
## 11604                                                                                                                                                    bronx
## 11605                                                                                                                                                   browse
## 11606                                                                                                                                                 brutally
## 11607                                                                                                                                                      btk
## 11608                                                                                                                                                     buck
## 11609                                                                                                                                                    bucks
## 11610                                                                                                                                                  buddies
## 11611                                                                                                                                                      bug
## 11612                                                                                                                                                  bullies
## 11613                                                                                                                                                 bullying
## 11614                                                                                                                                                     bump
## 11615                                                                                                                                                 bungling
## 11616                                                                                                                                                 bureau�s
## 11617                                                                                                                                                   buried
## 11618                                                                                                                                                   burned
## 11619                                                                                                                                                 buscando
## 11620                                                                                                                                                     bush
## 11621                                                                                                                                              businessman
## 11622                                                                                                                                                business�
## 11623                                                                                                                                               business�s
## 11624                                                                                                                                                     cada
## 11625                                                                                                                                                    calle
## 11626                                                                                                                                                    call�
## 11627                                                                                                                                                 calories
## 11628                                                                                                                                                cambridge
## 11629                                                                                                                                                  cameras
## 11630                                                                                                                                                campaigns
## 11631                                                                                                                                              campgrounds
## 11632                                                                                                                                                 campuses
## 11633                                                                                                                                                   candid
## 11634                                                                                                                                                candidate
## 11635                                                                                                                                                     cape
## 11636                                                                                                                                                   capita
## 11637                                                                                                                                               capitalize
## 11638                                                                                                                                                  caption
## 11639                                                                                                                                           cardiovascular
## 11640                                                                                                                                                   caring
## 11641                                                                                                                                                   carmel
## 11642                                                                                                                                                  carmelo
## 11643                                                                                                                                              carolinians
## 11644                                                                                                                                                  caseson
## 11645                                                                                                                                                  cashapp
## 11646                                                                                                                                                     caso
## 11647                                                                                                                                                     cass
## 11648                                                                                                                                                   castle
## 11649                                                                                                                                                   castro
## 11650                                                                                                                                                      cat
## 11651                                                                                                                                                 catalyst
## 11652                                                                                                                                                catholics
## 11653                                                                                                                                                     cats
## 11654                                                                                                                                                    ca�da
## 11655                                                                                                                                                      cbs
## 11656                                                                                                                                                       cc
## 11657                                                                                                                                                   centro
## 11658                                                                                                                                              certificate
## 11659                                                                                                                                                      cg7
## 11660                                                                                                                                                 chairman
## 11661                                                                                                                                               chairwoman
## 11662                                                                                                                                                champions
## 11663                                                                                                                                             championship
## 11664                                                                                                                                                 changing
## 11665                                                                                                                                                  channel
## 11666                                                                                                                                                 chaplain
## 11667                                                                                                                                                charlotte
## 11668                                                                                                                                          charlottesville
## 11669                                                                                                                                                 cheering
## 11670                                                                                                                                                   cheers
## 11671                                                                                                                                                   cheese
## 11672                                                                                                                                                chemicals
## 11673                                                                                                                                                 cherokee
## 11674                                                                                                                                                    chest
## 11675                                                                                                                                                  china�s
## 11676                                                                                                                                                   choked
## 11677                                                                                                                                              cholesterol
## 11678                                                                                                                                                 choosing
## 11679                                                                                                                                                     chop
## 11680                                                                                                                                                   chosen
## 11681                                                                                                                                                 christal
## 11682                                                                                                                                               christians
## 11683                                                                                                                                                 churched
## 11684                                                                                                                                                   circle
## 11685                                                                                                                                            circleoffirms
## 11686                                                                                                                                                civilians
## 11687                                                                                                                                                 civility
## 11688                                                                                                                                                  claimed
## 11689                                                                                                                                                     clan
## 11690                                                                                                                                                 clapping
## 11691                                                                                                                                            clarification
## 11692                                                                                                                                                  classic
## 11693                                                                                                                                                  cleaned
## 11694                                                                                                                                                 cleaners
## 11695                                                                                                                                                  cleared
## 11696                                                                                                                                                  clinton
## 11697                                                                                                                                                closeness
## 11698                                                                                                                                                    cloth
## 11699                                                                                                                                                      cms
## 11700                                                                                                                                                coalition
## 11701                                                                                                                                                     cobb
## 11702                                                                                                                                                 cobrando
## 11703                                                                                                                                                cognitive
## 11704                                                                                                                                              coincidence
## 11705                                                                                                                                            collaboration
## 11706                                                                                                                                                 collapse
## 11707                                                                                                                                               collective
## 11708                                                                                                                                                   collin
## 11709                                                                                                                                                  collins
## 11710                                                                                                                                                 colossal
## 11711                                                                                                                                                 columbia
## 11712                                                                                                                                                combating
## 11713                                                                                                                                                   comedy
## 11714                                                                                                                                               comenzaron
## 11715                                                                                                                                                comforted
## 11716                                                                                                                                                  commend
## 11717                                                                                                                                              commercials
## 11718                                                                                                                                               commitment
## 11719                                                                                                                                                  compare
## 11720                                                                                                                                               comparison
## 11721                                                                                                                                                 comparto
## 11722                                                                                                                                               compassion
## 11723                                                                                                                                            compassionate
## 11724                                                                                                                                               compatible
## 11725                                                                                                                                               compelling
## 11726                                                                                                                                                completes
## 11727                                                                                                                                               compliance
## 11728                                                                                                                                                component
## 11729                                                                                                                                                 computer
## 11730                                                                                                                                                computing
## 11731                                                                                                                                            concentration
## 11732                                                                                                                                             condemnation
## 11733                                                                                                                                              condolences
## 11734                                                                                                                                           confidentially
## 11735                                                                                                                                              confinement
## 11736                                                                                                                                                confusing
## 11737                                                                                                                                                    congo
## 11738                                                                                                                                               congregate
## 11739                                                                                                                                            congressional
## 11740                                                                                                                                               connecting
## 11741                                                                                                                                                   connie
## 11742                                                                                                                                            consecuencias
## 11743                                                                                                                                            conservatives
## 11744                                                                                                                                                  consult
## 11745                                                                                                                                                 consulta
## 11746                                                                                                                                                contained
## 11747                                                                                                                                            contemplativa
## 11748                                                                                                                                                  contest
## 11749                                                                                                                                            contributions
## 11750                                                                                                                                              contributor
## 11751                                                                                                                                            conversations
## 11752                                                                                                                                                   cooked
## 11753                                                                                                                                                   coping
## 11754                                                                                                                                       coronavirusrelated
## 11755                                                                                                                                              corporation
## 11756                                                                                                                                                    corps
## 11757                                                                                                                                             correctional
## 11758                                                                                                                                                correctly
## 11759                                                                                                                                                 cortland
## 11760                                                                                                                                                    cosas
## 11761                                                                                                                                                  costing
## 11762                                                                                                                                                  couldve
## 11763                                                                                                                                               councilman
## 11764                                                                                                                                            councilmember
## 11765                                                                                                                                                  counted
## 11766                                                                                                                                              countertops
## 11767                                                                                                                                                countless
## 11768                                                                                                                                                 country�
## 11769                                                                                                                                                country�s
## 11770                                                                                                                                             countydallas
## 11771                                                                                                                                                  courage
## 11772                                                                                                                                                   covers
## 11773                                                                                                                                                coworkers
## 11774                                                                                                                                                    cream
## 11775                                                                                                                                                     cree
## 11776                                                                                                                                                  cronies
## 11777                                                                                                                                                  crossed
## 11778                                                                                                                                                 crowding
## 11779                                                                                                                                                    cruel
## 11780                                                                                                                                                    crump
## 11781                                                                                                                                                      cry
## 11782                                                                                                                                                   crying
## 11783                                                                                                                                                      cst
## 11784                                                                                                                                                cualquier
## 11785                                                                                                                                                     cuba
## 11786                                                                                                                                                   cuenta
## 11787                                                                                                                                                   cuerpo
## 11788                                                                                                                                                     cult
## 11789                                                                                                                                                  cummins
## 11790                                                                                                                                               cumulative
## 11791                                                                                                                                                     cura
## 11792                                                                                                                                                    cured
## 11793                                                                                                                                                custodial
## 11794                                                                                                                                                   custom
## 11795                                                                                                                                                     cute
## 11796                                                                                                                                                  cutting
## 11797                                                                                                                                            cybersecurity
## 11798                                                                                                                                                 cytokine
## 11799                                                                                                                                                      dam
## 11800                                                                                                                                                 damaging
## 11801                                                                                                                                                  dancing
## 11802                                                                                                                                                      dar
## 11803                                                                                                                                                  darkest
## 11804                                                                                                                                                dashboard
## 11805                                                                                                                                                    dates
## 11806                                                                                                                                                    datos
## 11807                                                                                                                                                 davidson
## 11808                                                                                                                                                    davis
## 11809                                                                                                                                                      dea
## 11810                                                                                                                                                 deadline
## 11811                                                                                                                                                  dealers
## 11812                                                                                                                                                deathsfor
## 11813                                                                                                                                                   debido
## 11814                                                                                                                                                  decades
## 11815                                                                                                                                                 december
## 11816                                                                                                                                                   decent
## 11817                                                                                                                                                  declare
## 11818                                                                                                                                               decoration
## 11819                                                                                                                                              decorations
## 11820                                                                                                                                                decreases
## 11821                                                                                                                                               decreasing
## 11822                                                                                                                                                   defeat
## 11823                                                                                                                                                 defeated
## 11824                                                                                                                                                defenders
## 11825                                                                                                                                                  deflect
## 11826                                                                                                                                                 defunded
## 11827                                                                                                                                                   delays
## 11828                                                                                                                                                  deleted
## 11829                                                                                                                                                  deletes
## 11830                                                                                                                                                    delhi
## 11831                                                                                                                                             deliberately
## 11832                                                                                                                                               delivering
## 11833                                                                                                                                                  deluded
## 11834                                                                                                                                       democratssocialist
## 11835                                                                                                                                                    demon
## 11836                                                                                                                                            demonstrating
## 11837                                                                                                                                                     dems
## 11838                                                                                                                                                  deniers
## 11839                                                                                                                                                   denver
## 11840                                                                                                                                              departments
## 11841                                                                                                                                                  depends
## 11842                                                                                                                                                   deploy
## 11843                                                                                                                                                 derechos
## 11844                                                                                                                                                 deserves
## 11845                                                                                                                                                     desk
## 11846                                                                                                                                                desperate
## 11847                                                                                                                                               despicable
## 11848                                                                                                                                                 detained
## 11849                                                                                                                                                 detalles
## 11850                                                                                                                                               devastated
## 11851                                                                                                                                                  devices
## 11852                                                                                                                                                   dewine
## 11853                                                                                                                                                      dia
## 11854                                                                                                                                               diagnostic
## 11855                                                                                                                                                 diblasio
## 11856                                                                                                                                                dibruno�s
## 11857                                                                                                                                                 diciendo
## 11858                                                                                                                                              differences
## 11859                                                                                                                                                   dinero
## 11860                                                                                                                                                  diocese
## 11861                                                                                                                                                     dios
## 11862                                                                                                                                                  diploma
## 11863                                                                                                                                                     dire
## 11864                                                                                                                                                direction
## 11865                                                                                                                                                    dirty
## 11866                                                                                                                                                 disabled
## 11867                                                                                                                                                 disagree
## 11868                                                                                                                                               discipline
## 11869                                                                                                                                               discovered
## 11870                                                                                                                                                discredit
## 11871                                                                                                                                           discrimination
## 11872                                                                                                                                                discusses
## 11873                                                                                                                                                disgusted
## 11874                                                                                                                                                     dish
## 11875                                                                                                                                           disinformation
## 11876                                                                                                                                                  dislike
## 11877                                                                                                                                              dismantling
## 11878                                                                                                                                               disneyland
## 11879                                                                                                                                               disparaged
## 11880                                                                                                                                            disrespecting
## 11881                                                                                                                                               disruption
## 11882                                                                                                                                                     dist
## 11883                                                                                                                                                distanced
## 11884                                                                                                                                                distances
## 11885                                                                                                                                                distancia
## 11886                                                                                                                                              distancing�
## 11887                                                                                                                                                  distant
## 11888                                                                                                                                                 distract
## 11889                                                                                                                                              distraction
## 11890                                                                                                                                                 distress
## 11891                                                                                                                                               disturbing
## 11892                                                                                                                                                   divert
## 11893                                                                                                                                                 diverted
## 11894                                                                                                                                             divisiveness
## 11895                                                                                                                                                      djt
## 11896                                                                                                                                                      dnc
## 11897                                                                                                                                                      doc
## 11898                                                                                                                                              documentary
## 11899                                                                                                                                                documents
## 11900                                                                                                                                                     dogs
## 11901                                                                                                                                                      doj
## 11902                                                                                                                                                 domestic
## 11903                                                                                                                                                    donut
## 11904                                                                                                                                                     doug
## 11905                                                                                                                                             downloadable
## 11906                                                                                                                                              downplaying
## 11907                                                                                                                                                 downturn
## 11908                                                                                                                                                 downward
## 11909                                                                                                                                                    draft
## 11910                                                                                                                                                 dramatic
## 11911                                                                                                                                              drastically
## 11912                                                                                                                                                    drawn
## 11913                                                                                                                                                  dreamed
## 11914                                                                                                                                                  droplet
## 11915                                                                                                                                                  drrehal
## 11916                                                                                                                                                      drs
## 11917                                                                                                                                                      dry
## 11918                                                                                                                                                    ducey
## 11919                                                                                                                                                  durning
## 11920                                                                                                                                                   dymond
## 11921                                                                                                                                                     ears
## 11922                                                                                                                                               earthquake
## 11923                                                                                                                                                   easing
## 11924                                                                                                                                                    ebook
## 11925                                                                                                                                                 economy�
## 11926                                                                                                                                                 educated
## 11927                                                                                                                                                      eee
## 11928                                                                                                                                                  efect�a
## 11929                                                                                                                                                 elective
## 11930                                                                                                                                                 elevated
## 11931                                                                                                                                               eliminated
## 11932                                                                                                                                                    elite
## 11933                                                                                                                                                      elk
## 11934                                                                                                                                                  emailed
## 11935                                                                                                                                                 emailing
## 11936                                                                                                                                                   emails
## 11937                                                                                                                                                     emdr
## 11938                                                                                                                                              emotionally
## 11939                                                                                                                                                employers
## 11940                                                                                                                                                  empties
## 11941                                                                                                                                                 enclosed
## 11942                                                                                                                                              encountered
## 11943                                                                                                                                                 encuesta
## 11944                                                                                                                                                 endanger
## 11945                                                                                                                                              endangering
## 11946                                                                                                                                                  endured
## 11947                                                                                                                                                  enemies
## 11948                                                                                                                                                  enforce
## 11949                                                                                                                                                 enforced
## 11950                                                                                                                                                enforcing
## 11951                                                                                                                                                   engage
## 11952                                                                                                                                                  engaged
## 11953                                                                                                                                              engineering
## 11954                                                                                                                                                  english
## 11955                                                                                                                                                  enjoyed
## 11956                                                                                                                                                 enjoying
## 11957                                                                                                                                               enterprise
## 11958                                                                                                                                                   enters
## 11959                                                                                                                                            entertainment
## 11960                                                                                                                                            entrepreneurs
## 11961                                                                                                                                                      epa
## 11962                                                                                                                                                 episodes
## 11963                                                                                                                                                  equally
## 11964                                                                                                                                                equitable
## 11965                                                                                                                                                  equity�
## 11966                                                                                                                                                eradicate
## 11967                                                                                                                                                 escalate
## 11968                                                                                                                                            especialmente
## 11969                                                                                                                                                   espero
## 11970                                                                                                                                                      est
## 11971                                                                                                                                             estad�sticas
## 11972                                                                                                                                                    estan
## 11973                                                                                                                                                   estar�
## 11974                                                                                                                                                 estudios
## 11975                                                                                                                                                    est�o
## 11976                                                                                                                                                etnicidad
## 11977                                                                                                                                                      eua
## 11978                                                                                                                                               evaluating
## 11979                                                                                                                                                  evolved
## 11980                                                                                                                                                    exact
## 11981                                                                                                                                                 examiner
## 11982                                                                                                                                                excelente
## 11983                                                                                                                                                exception
## 11984                                                                                                                                              exceptional
## 11985                                                                                                                                                 exchange
## 11986                                                                                                                                                 exciting
## 11987                                                                                                                                                  excuses
## 11988                                                                                                                                               exercising
## 11989                                                                                                                                                  existed
## 11990                                                                                                                                                existence
## 11991                                                                                                                                                     exit
## 11992                                                                                                                                                    exnew
## 11993                                                                                                                                                expanding
## 11994                                                                                                                                                expansion
## 11995                                                                                                                                              experiences
## 11996                                                                                                                                               experiment
## 11997                                                                                                                                                expertise
## 11998                                                                                                                                                explained
## 11999                                                                                                                                                 explains
## 12000                                                                                                                                                exploding
## 12001                                                                                                                                                exposures
## 12002                                                                                                                                                 expresan
## 12003                                                                                                                                            extraordinary
## 12004                                                                                                                                                  eyewear
## 12005                                                                                                                                                 ezpeleta
## 12006                                                                                                                                                  faculty
## 12007                                                                                                                                                    fades
## 12008                                                                                                                                                     fail
## 12009                                                                                                                                                   fairly
## 12010                                                                                                                                                   fallen
## 12011                                                                                                                                                     farm
## 12012                                                                                                                                                     fase
## 12013                                                                                                                                                      fat
## 12014                                                                                                                                                    fatal
## 12015                                                                                                                                               fatherhood
## 12016                                                                                                                                                  fatigue
## 12017                                                                                                                                                 fatigued
## 12018                                                                                                                                                   feared
## 12019                                                                                                                                                    fears
## 12020                                                                                                                                                 feasible
## 12021                                                                                                                                                 features
## 12022                                                                                                                                                featuring
## 12023                                                                                                                                                  febrero
## 12024                                                                                                                                                    feces
## 12025                                                                                                                                                  fellows
## 12026                                                                                                                                                    fever
## 12027                                                                                                                                                    fewer
## 12028                                                                                                                                                   fields
## 12029                                                                                                                                                  fighter
## 12030                                                                                                                                                  filling
## 12031                                                                                                                                                     film
## 12032                                                                                                                                                 findings
## 12033                                                                                                                                                    fine�
## 12034                                                                                                                                                     fing
## 12035                                                                                                                                             firefighters
## 12036                                                                                                                                                     fish
## 12037                                                                                                                                                  fitting
## 12038                                                                                                                                                    flags
## 12039                                                                                                                                                    flash
## 12040                                                                                                                                                 flatbush
## 12041                                                                                                                                                  flights
## 12042                                                                                                                                                 flooding
## 12043                                                                                                                                                   floods
## 12044                                                                                                                                                florida�s
## 12045                                                                                                                                                  floyd�s
## 12046                                                                                                                                                  flulike
## 12047                                                                                                                                                      fly
## 12048                                                                                                                                                      foh
## 12049                                                                                                                                                  folding
## 12050                                                                                                                                                 follower
## 12051                                                                                                                                                followers
## 12052                                                                                                                                                     fool
## 12053                                                                                                                                                  foolish
## 12054                                                                                                                                                    fools
## 12055                                                                                                                                                  forcing
## 12056                                                                                                                                                 formally
## 12057                                                                                                                                                  forming
## 12058                                                                                                                                                    forum
## 12059                                                                                                                                                     for�
## 12060                                                                                                                                                   fossil
## 12061                                                                                                                                                   fourth
## 12062                                                                                                                                                  frankly
## 12063                                                                                                                                                    fraud
## 12064                                                                                                                                                     fred
## 12065                                                                                                                                                   freeze
## 12066                                                                                                                                                  freezer
## 12067                                                                                                                                                   fresno
## 12068                                                                                                                                                  fridays
## 12069                                                                                                                                                 friday�s
## 12070                                                                                                                                                  friston
## 12071                                                                                                                                                    fruit
## 12072                                                                                                                                                      fsd
## 12073                                                                                                                                                   fuckin
## 12074                                                                                                                                                    fucks
## 12075                                                                                                                                                   fueled
## 12076                                                                                                                                                  fueling
## 12077                                                                                                                                                    fuera
## 12078                                                                                                                                                fumadores
## 12079                                                                                                                                                   funded
## 12080                                                                                                                                                  funders
## 12081                                                                                                                                                 gallatin
## 12082                                                                                                                                                 gambling
## 12083                                                                                                                                                   gaming
## 12084                                                                                                                                                  ganduje
## 12085                                                                                                                                                 garcetti
## 12086                                                                                                                                                     gate
## 12087                                                                                                                                                  gathers
## 12088                                                                                                                                               generation
## 12089                                                                                                                                              generations
## 12090                                                                                                                                                genocidal
## 12091                                                                                                                                                   german
## 12092                                                                                                                                                       gf
## 12093                                                                                                                                                    giant
## 12094                                                                                                                                                  glasses
## 12095                                                                                                                                                 globally
## 12096                                                                                                                                                    glory
## 12097                                                                                                                                                    goals
## 12098                                                                                                                                                gobiernos
## 12099                                                                                                                                                     gods
## 12100                                                                                                                                                    god�s
## 12101                                                                                                                                                   golden
## 12102                                                                                                                                                  golfing
## 12103                                                                                                                                                  goodall
## 12104                                                                                                                                                    good�
## 12105                                                                                                                                                     goon
## 12106                                                                                                                                                 gorgeous
## 12107                                                                                                                                               governor�s
## 12108                                                                                                                                                     govs
## 12109                                                                                                                                                    gov�t
## 12110                                                                                                                                                      gps
## 12111                                                                                                                                                    grade
## 12112                                                                                                                                                graduated
## 12113                                                                                                                                              graduations
## 12114                                                                                                                                                   grad�a
## 12115                                                                                                                                            grandchildren
## 12116                                                                                                                                                  grandpa
## 12117                                                                                                                                             grandparents
## 12118                                                                                                                                                  granted
## 12119                                                                                                                                                    grave
## 12120                                                                                                                                                    gravy
## 12121                                                                                                                                                     grew
## 12122                                                                                                                                                     grid
## 12123                                                                                                                                                   grieve
## 12124                                                                                                                                                    grill
## 12125                                                                                                                                                groceries
## 12126                                                                                                                                                  grossly
## 12127                                                                                                                                                    grown
## 12128                                                                                                                                                   grumpy
## 12129                                                                                                                                                guadalupe
## 12130                                                                                                                                                 guardian
## 12131                                                                                                                                                 guessing
## 12132                                                                                                                                                    guise
## 12133                                                                                                                                                   guitar
## 12134                                                                                                                                                     gung
## 12135                                                                                                                                                     gyps
## 12136                                                                                                                                                    g�day
## 12137                                                                                                                                                   habits
## 12138                                                                                                                                                 haciendo
## 12139                                                                                                                                                  hacking
## 12140                                                                                                                                                 haircuts
## 12141                                                                                                                                                     halt
## 12142                                                                                                                                                   handed
## 12143                                                                                                                                                 handheld
## 12144                                                                                                                                                  handing
## 12145                                                                                                                                               handlebars
## 12146                                                                                                                                                 handsome
## 12147                                                                                                                                                  happier
## 12148                                                                                                                                                hardships
## 12149                                                                                                                                                   harlem
## 12150                                                                                                                                                harrasses
## 12151                                                                                                                                                  harvard
## 12152                                                                                                                                                   harvey
## 12153                                                                                                                                                  hashtag
## 12154                                                                                                                                                    hates
## 12155                                                                                                                                                   hazmat
## 12156                                                                                                                                                    heads
## 12157                                                                                                                                                    heals
## 12158                                                                                                                                                 hearings
## 12159                                                                                                                                               heartaches
## 12160                                                                                                                                                heartland
## 12161                                                                                                                                                    hecho
## 12162                                                                                                                                                     heck
## 12163                                                                                                                                                    hedge
## 12164                                                                                                                                                     heel
## 12165                                                                                                                                               helicopter
## 12166                                                                                                                                                     hemp
## 12167                                                                                                                                                henderson
## 12168                                                                                                                                                   herald
## 12169                                                                                                                                                herculean
## 12170                                                                                                                                                   hiatus
## 12171                                                                                                                                                  hidalgo
## 12172                                                                                                                                                highlight
## 12173                                                                                                                                              highlighted
## 12174                                                                                                                                                 highrisk
## 12175                                                                                                                                                 hightech
## 12176                                                                                                                                                     hill
## 12177                                                                                                                                                   hiring
## 12178                                                                                                                                                     hisd
## 12179                                                                                                                                                   hitler
## 12180                                                                                                                                                     hizo
## 12181                                                                                                                                                      hmm
## 12182                                                                                                                                                       ho
## 12183                                                                                                                                                   holder
## 12184                                                                                                                                                  holiday
## 12185                                                                                                                                               holmestown
## 12186                                                                                                                                                 homeland
## 12187                                                                                                                                                    honey
## 12188                                                                                                                                                  hopeful
## 12189                                                                                                                                                     hora
## 12190                                                                                                                                                    horas
## 12191                                                                                                                                                  hosting
## 12192                                                                                                                                               households
## 12193                                                                                                                                                   house�
## 12194                                                                                                                                                       hq
## 12195                                                                                                                                                       hr
## 12196                                                                                                                                                       hs
## 12197                                                                                                                                                       ht
## 12198                                                                                                                                  https://t.co/22r5kjlrn3
## 12199                                                                                                                                  https://t.co/2jflxjdknt
## 12200                                                                                                                                  https://t.co/2npg4rx258
## 12201                                                                                                                                  https://t.co/59q5pmqzoh
## 12202                                                                                                                                  https://t.co/6hcibztns8
## 12203                                                                                                                                  https://t.co/8uzuvhwx4u
## 12204                                                                                                                                  https://t.co/bh32uxutjq
## 12205                                                                                                                                  https://t.co/bnj6wsxany
## 12206                                                                                                                                  https://t.co/cdyxmbsp8n
## 12207                                                                                                                                  https://t.co/cwaaf7lyxr
## 12208                                                                                                                                  https://t.co/d7lif2ekou
## 12209                                                                                                                                  https://t.co/dkeksnxrr2
## 12210                                                                                                                                  https://t.co/eadauj7phf
## 12211                                                                                                                                 https://t.co/ecft4gbje7.
## 12212                                                                                                                                  https://t.co/febvorlflz
## 12213                                                                                                                                  https://t.co/gacf5ffy5d
## 12214                                                                                                                                  https://t.co/gkg2gmtzdy
## 12215                                                                                                                                  https://t.co/h2gekaucju
## 12216                                                                                                                                  https://t.co/hda4pdhgp0
## 12217                                                                                                                                  https://t.co/hza2ec9l5a
## 12218                                                                                                                                  https://t.co/ksduj0sje8
## 12219                                                                                                                                  https://t.co/mhfrq1nsed
## 12220                                                                                                                                  https://t.co/n5jlwhyhi4
## 12221                                                                                                                                  https://t.co/oap67fulgd
## 12222                                                                                                                                  https://t.co/oebpl2xo2h
## 12223                                                                                                                                  https://t.co/ohealwlr90
## 12224                                                                                                                                  https://t.co/pjgbovvwgn
## 12225                                                                                                                                  https://t.co/pp8zksvdds
## 12226                                                                                                                                  https://t.co/pwkpf3cpae
## 12227                                                                                                                                  https://t.co/qtgibvat1x
## 12228                                                                                                                                  https://t.co/qzwzgnsla1
## 12229                                                                                                                                  https://t.co/rczb52js5i
## 12230                                                                                                                                  https://t.co/ro0shxdoex
## 12231                                                                                                                                  https://t.co/ru7s8mmkcy
## 12232                                                                                                                                  https://t.co/rwgebnd5sc
## 12233                                                                                                                                  https://t.co/sjlxi1djfr
## 12234                                                                                                                                  https://t.co/teot3weitz
## 12235                                                                                                                                  https://t.co/tutzvmj0oo
## 12236                                                                                                                                  https://t.co/uto4eyn4f5
## 12237                                                                                                                                 https://t.co/uwekyhagch.
## 12238                                                                                                                                  https://t.co/vlhf4qtvj6
## 12239                                                                                                                                  https://t.co/wdzi2b683u
## 12240                                                                                                                                  https://t.co/wjg77odglr
## 12241                                                                                                                                 https://t.co/wnekfstim6.
## 12242                                                                                                                                  https://t.co/xahmyxfft5
## 12243                                                                                                                                  https://t.co/y7kgnqxnkr
## 12244                                                                                                                                       httpstco36mtd8pjre
## 12245                                                                                                                                                 huffpost
## 12246                                                                                                                                                      hug
## 12247                                                                                                                                                  hugging
## 12248                                                                                                                                                   hughey
## 12249                                                                                                                                                     hugs
## 12250                                                                                                                                                  humanos
## 12251                                                                                                                                                 huntsman
## 12252                                                                                                                                       hydroxycholorquine
## 12253                                                                                                                                               hypocrites
## 12254                                                                                                                                                  hyundai
## 12255                                                                                                                                                ibuprofen
## 12256                                                                                                                                               identified
## 12257                                                                                                                                                 identify
## 12258                                                                                                                                                idiocracy
## 12259                                                                                                                                                  idiotic
## 12260                                                                                                                                                      if�
## 12261                                                                                                                                               ignorancia
## 12262                                                                                                                                                      iii
## 12263                                                                                                                                                   images
## 12264                                                                                                                                              immigration
## 12265                                                                                                                                        immunocompromised
## 12266                                                                                                                                                  impacto
## 12267                                                                                                                                                impeached
## 12268                                                                                                                                                 implying
## 12269                                                                                                                                               importance
## 12270                                                                                                                                               importante
## 12271                                                                                                                                                  impress
## 12272                                                                                                                                               impressive
## 12273                                                                                                                                                 improved
## 12274                                                                                                                                              improvement
## 12275                                                                                                                                                inability
## 12276                                                                                                                                                 inaction
## 12277                                                                                                                                             inauguration
## 12278                                                                                                                                                 incident
## 12279                                                                                                                                                incidents
## 12280                                                                                                                                                inclusive
## 12281                                                                                                                                                incre�ble
## 12282                                                                                                                                              independent
## 12283                                                                                                                                                    index
## 12284                                                                                                                                               indication
## 12285                                                                                                                                             individuales
## 12286                                                                                                                                                  induced
## 12287                                                                                                                                              ineffective
## 12288                                                                                                                                                    inept
## 12289                                                                                                                                                   inform
## 12290                                                                                                                                                  inform�
## 12291                                                                                                                                              inhabitants
## 12292                                                                                                                                                inhibitor
## 12293                                                                                                                                                      ini
## 12294                                                                                                                                                  initial
## 12295                                                                                                                                                initiated
## 12296                                                                                                                                                injection
## 12297                                                                                                                                                   injury
## 12298                                                                                                                                                  inmates
## 12299                                                                                                                                               innovative
## 12300                                                                                                                                                    input
## 12301                                                                                                                                                 insanity
## 12302                                                                                                                                               insecurity
## 12303                                                                                                                                                inspected
## 12304                                                                                                                                                 inspired
## 12305                                                                                                                                                instagram
## 12306                                                                                                                                              installment
## 12307                                                                                                                                                 instance
## 12308                                                                                                                                                instantly
## 12309                                                                                                                                                institute
## 12310                                                                                                                                               instituted
## 12311                                                                                                                                             institutions
## 12312                                                                                                                                             insurrection
## 12313                                                                                                                                                   intent
## 12314                                                                                                                                                intention
## 12315                                                                                                                                              interactive
## 12316                                                                                                                                                 interior
## 12317                                                                                                                                                 internet
## 12318                                                                                                                                             interruption
## 12319                                                                                                                                              interviewed
## 12320                                                                                                                                               intimately
## 12321                                                                                                                                                 invasion
## 12322                                                                                                                                                inventory
## 12323                                                                                                                                                   invite
## 12324                                                                                                                                                   invoke
## 12325                                                                                                                                                      in�
## 12326                                                                                                                                                 ionnalee
## 12327                                                                                                                                                   ironic
## 12328                                                                                                                                                    irony
## 12329                                                                                                                                               irradiando
## 12330                                                                                                                                                 irradiar
## 12331                                                                                                                                                     irte
## 12332                                                                                                                                                     isis
## 12333                                                                                                                                                   issued
## 12334                                                                                                                                                  italian
## 12335                                                                                                                                                     item
## 12336                                                                                                                                                itinerary
## 12337                                                                                                                                                      it�
## 12338                                                                                                                                                    it�ll
## 12339                                                                                                                                                       iv
## 12340                                                                                                                                                   jackie
## 12341                                                                                                                                                  jackson
## 12342                                                                                                                                             jacksonville
## 12343                                                                                                                                                      jan
## 12344                                                                                                                                                     jane
## 12345                                                                                                                                                    janet
## 12346                                                                                                                                                   jaydon
## 12347                                                                                                                                            jcstaxservice
## 12348                                                                                                                                                 jennifer
## 12349                                                                                                                                                    jerry
## 12350                                                                                                                                                   jewish
## 12351                                                                                                                                                   jhonny
## 12352                                                                                                                                                       jk
## 12353                                                                                                                                                     job�
## 12354                                                                                                                                                     joel
## 12355                                                                                                                                                    joint
## 12356                                                                                                                                                   joking
## 12357                                                                                                                                                    jones
## 12358                                                                                                                                                  journey
## 12359                                                                                                                                                    joven
## 12360                                                                                                                                                   joyous
## 12361                                                                                                                                                     joys
## 12362                                                                                                                                                     juan
## 12363                                                                                                                                                judgement
## 12364                                                                                                                                                   judges
## 12365                                                                                                                                                judiciary
## 12366                                                                                                                                                  jugador
## 12367                                                                                                                                                  jupyter
## 12368                                                                                                                                                      jus
## 12369                                                                                                                                                    karen
## 12370                                                                                                                                                     karl
## 12371                                                                                                                                                    keene
## 12372                                                                                                                                                    keith
## 12373                                                                                                                                                  kennedy
## 12374                                                                                                                                                  kenneth
## 12375                                                                                                                                                    kevin
## 12376                                                                                                                                                      kid
## 12377                                                                                                                                                     king
## 12378                                                                                                                                                  kitchen
## 12379                                                                                                                                                   kristi
## 12380                                                                                                                                                     ktrk
## 12381                                                                                                                                                    kudos
## 12382                                                                                                                                                       ky
## 12383                                                                                                                                                 labeling
## 12384                                                                                                                                                     labs
## 12385                                                                                                                                                landlords
## 12386                                                                                                                                                languages
## 12387                                                                                                                                                      lap
## 12388                                                                                                                                                     lapd
## 12389                                                                                                                                                   laptop
## 12390                                                                                                                                                    larry
## 12391                                                                                                                                                    latin
## 12392                                                                                                                                          latinoamericans
## 12393                                                                                                                                                 launched
## 12394                                                                                                                                                 launches
## 12395                                                                                                                                              laundromart
## 12396                                                                                                                                                  laundry
## 12397                                                                                                                                                    laura
## 12398                                                                                                                                                 lawrence
## 12399                                                                                                                                                   lawyer
## 12400                                                                                                                                                  lawyers
## 12401                                                                                                                                                   layout
## 12402                                                                                                                                                      ldh
## 12403                                                                                                                                              leadership�
## 12404                                                                                                                                                  leftist
## 12405                                                                                                                                                   legacy
## 12406                                                                                                                                              legislators
## 12407                                                                                                                                                    legit
## 12408                                                                                                                                                   lesson
## 12409                                                                                                                                                   lethal
## 12410                                                                                                                                                      ley
## 12411                                                                                                                                                   lgbtq+
## 12412                                                                                                                                                    liars
## 12413                                                                                                                                                  library
## 12414                                                                                                                                                    libre
## 12415                                                                                                                                                  libtard
## 12416                                                                                                                                                     lieu
## 12417                                                                                                                                                 lifelong
## 12418                                                                                                                                               likefollow
## 12419                                                                                                                                                    linda
## 12420                                                                                                                                                    links
## 12421                                                                                                                                                   liquor
## 12422                                                                                                                                                  listing
## 12423                                                                                                                                                      lit
## 12424                                                                                                                                              livelihoods
## 12425                                                                                                                                                    live�
## 12426                                                                                                                                                    livid
## 12427                                                                                                                                                   llaman
## 12428                                                                                                                                                   llegar
## 12429                                                                                                                                                       lm
## 12430                                                                                                                                                   locate
## 12431                                                                                                                                                     lock
## 12432                                                                                                                                                   london
## 12433                                                                                                                                             longstanding
## 12434                                                                                                                                                 longtime
## 12435                                                                                                                                                   losers
## 12436                                                                                                                                                    loves
## 12437                                                                                                                                                lowincome
## 12438                                                                                                                                                     lows
## 12439                                                                                                                                                  lubbock
## 12440                                                                                                                                                  luckily
## 12441                                                                                                                                                    lucky
## 12442                                                                                                                                                  lugares
## 12443                                                                                                                                                      luu
## 12444                                                                                                                                                      luz
## 12445                                                                                                                                                  lynched
## 12446                                                                                                                                                lynchings
## 12447                                                                                                                                                    lysol
## 12448                                                                                                                                                    l�der
## 12449                                                                                                                                                       ma
## 12450                                                                                                                                                 machines
## 12451                                                                                                                                                   maddow
## 12452                                                                                                                                                  madison
## 12453                                                                                                                                                     maga
## 12454                                                                                                                                                 magazine
## 12455                                                                                                                                                    magic
## 12456                                                                                                                                                   mahalo
## 12457                                                                                                                                                   mailed
## 12458                                                                                                                                               maintained
## 12459                                                                                                                                                   makers
## 12460                                                                                                                                                     mall
## 12461                                                                                                                                                  man2man
## 12462                                                                                                                                                  manatee
## 12463                                                                                                                                                   manejo
## 12464                                                                                                                                               manipulate
## 12465                                                                                                                                             manuelboxing
## 12466                                                                                                                                            manufacturers
## 12467                                                                                                                                                      map
## 12468                                                                                                                                                     mara
## 12469                                                                                                                                                 marathon
## 12470                                                                                                                                                  marched
## 12471                                                                                                                                                   marcos
## 12472                                                                                                                                             marginalized
## 12473                                                                                                                                                    maria
## 12474                                                                                                                                              mariostacos
## 12475                                                                                                                                                marketing
## 12476                                                                                                                                                    marks
## 12477                                                                                                                                                  married
## 12478                                                                                                                                                 marshall
## 12479                                                                                                                                                  martino
## 12480                                                                                                                                                marvelous
## 12481                                                                                                                                                     mary
## 12482                                                                                                                                                   masked
## 12483                                                                                                                                            massachusetts
## 12484                                                                                                                                                    masse
## 12485                                                                                                                                                   masses
## 12486                                                                                                                                                 material
## 12487                                                                                                                                                  maximum
## 12488                                                                                                                                                   ma�ana
## 12489                                                                                                                                                 mcdonald
## 12490                                                                                                                                              mecklenburg
## 12491                                                                                                                                                      med
## 12492                                                                                                                                                 medicaid
## 12493                                                                                                                                                   medics
## 12494                                                                                                                                                     meds
## 12495                                                                                                                                                      mee
## 12496                                                                                                                                                    meets
## 12497                                                                                                                                                 memories
## 12498                                                                                                                                               mentioning
## 12499                                                                                                                                                  mentira
## 12500                                                                                                                                                    mercy
## 12501                                                                                                                                                      mes
## 12502                                                                                                                                                messaging
## 12503                                                                                                                                                    metal
## 12504                                                                                                                                                 metaphor
## 12505                                                                                                                                                     meth
## 12506                                                                                                                                                  methods
## 12507                                                                                                                                                  mexican
## 12508                                                                                                                                                       mf
## 12509                                                                                                                                                      mi6
## 12510                                                                                                                                                  microbe
## 12511                                                                                                                                             microblading
## 12512                                                                                                                                                      mid
## 12513                                                                                                                                                 midapril
## 12514                                                                                                                                                 midnight
## 12515                                                                                                                                                     mill
## 12516                                                                                                                                                milwaukee
## 12517                                                                                                                                                  mindful
## 12518                                                                                                                                                    minev
## 12519                                                                                                                                                 minimize
## 12520                                                                                                                                                  minimum
## 12521                                                                                                                                                 minority
## 12522                                                                                                                                            minorityowned
## 12523                                                                                                                                                minuscule
## 12524                                                                                                                                                   mirror
## 12525                                                                                                                                                      mis
## 12526                                                                                                                                            misclassified
## 12527                                                                                                                                              mississippi
## 12528                                                                                                                                                      mit
## 12529                                                                                                                                                      mls
## 12530                                                                                                                                                  mocking
## 12531                                                                                                                                                     mode
## 12532                                                                                                                                                 modeling
## 12533                                                                                                                                                moderated
## 12534                                                                                                                                               moderating
## 12535                                                                                                                                                   modern
## 12536                                                                                                                                                     mold
## 12537                                                                                                                                                molecular
## 12538                                                                                                                                              moleculares
## 12539                                                                                                                                                  momento
## 12540                                                                                                                                                  moment�
## 12541                                                                                                                                                  monster
## 12542                                                                                                                                                  montana
## 12543                                                                                                                                                 monterey
## 12544                                                                                                                                                  moronic
## 12545                                                                                                                                                 morreram
## 12546                                                                                                                                                   mortos
## 12547                                                                                                                                               mosquitoes
## 12548                                                                                                                                                mostraron
## 12549                                                                                                                                              motherinlaw
## 12550                                                                                                                                                  mothers
## 12551                                                                                                                                                    mount
## 12552                                                                                                                                                movements
## 12553                                                                                                                                                   movers
## 12554                                                                                                                                                    moves
## 12555                                                                                                                                                   movies
## 12556                                                                                                                                                    msnbc
## 12557                                                                                                                                                       mt
## 12558                                                                                                                                                      mta
## 12559                                                                                                                                                    mucha
## 12560                                                                                                                                                   muchas
## 12561                                                                                                                                               muchneeded
## 12562                                                                                                                                                   muchos
## 12563                                                                                                                                                  muertos
## 12564                                                                                                                                                    muita
## 12565                                                                                                                                                    muito
## 12566                                                                                                                                                municipio
## 12567                                                                                                                                                murderers
## 12568                                                                                                                                                   murphy
## 12569                                                                                                                                                      my�
## 12570                                                                                                                                                   m�dico
## 12571                                                                                                                                                   m�xico
## 12572                                                                                                                                                     nada
## 12573                                                                                                                                                    nails
## 12574                                                                                                                                                    naive
## 12575                                                                                                                                                   narcos
## 12576                                                                                                                                                    nariz
## 12577                                                                                                                                                 nation�s
## 12578                                                                                                                                                   native
## 12579                                                                                                                                                      naw
## 12580                                                                                                                                                     nc�s
## 12581                                                                                                                                                    ndocs
## 12582                                                                                                                                                    necks
## 12583                                                                                                                                               needlessly
## 12584                                                                                                                                               negatively
## 12585                                                                                                                                            neighborhoods
## 12586                                                                                                                                                    nerve
## 12587                                                                                                                                                  network
## 12588                                                                                                                                                 networks
## 12589                                                                                                                                                   nevada
## 12590                                                                                                                                                   newark
## 12591                                                                                                                                                newspaper
## 12592                                                                                                                                                     nick
## 12593                                                                                                                                                    niece
## 12594                                                                                                                                                   nights
## 12595                                                                                                                                                       nm
## 12596                                                                                                                                               nonprofits
## 12597                                                                                                                                                  nonstop
## 12598                                                                                                                                                  normal�
## 12599                                                                                                                                                  northam
## 12600                                                                                                                                                notebooks
## 12601                                                                                                                                                    noted
## 12602                                                                                                                                                    notes
## 12603                                                                                                                                             notification
## 12604                                                                                                                                                   notify
## 12605                                                                                                                                                      nov
## 12606                                                                                                                                                 nuestros
## 12607                                                                                                                                                   nvidia
## 12608                                                                                                                                                    nycha
## 12609                                                                                                                                                      nyu
## 12610                                                                                                                                                   object
## 12611                                                                                                                                             observations
## 12612                                                                                                                                                  observe
## 12613                                                                                                                                                observing
## 12614                                                                                                                                                  obvious
## 12615                                                                                                                                                    occur
## 12616                                                                                                                                                  october
## 12617                                                                                                                                                 offender
## 12618                                                                                                                                                     offs
## 12619                                                                                                                                                      of�
## 12620                                                                                                                                                    omaha
## 12621                                                                                                                                                      oms
## 12622                                                                                                                                                onslaught
## 12623                                                                                                                                                   openly
## 12624                                                                                                                                                operating
## 12625                                                                                                                                               operativos
## 12626                                                                                                                                                   opioid
## 12627                                                                                                                                                 opponent
## 12628                                                                                                                                                  opposed
## 12629                                                                                                                                               optimistic
## 12630                                                                                                                                                 ordinary
## 12631                                                                                                                                                organized
## 12632                                                                                                                                               organizing
## 12633                                                                                                                                               originated
## 12634                                                                                                                                                     our�
## 12635                                                                                                                                                 outdated
## 12636                                                                                                                                                  outlets
## 12637                                                                                                                                                 outraged
## 12638                                                                                                                                                     out�
## 12639                                                                                                                                                 overcome
## 12640                                                                                                                                               overcoming
## 12641                                                                                                                                                 overflow
## 12642                                                                                                                                                overtakes
## 12643                                                                                                                                                 paciente
## 12644                                                                                                                                                  pacific
## 12645                                                                                                                                                  packing
## 12646                                                                                                                                                    pages
## 12647                                                                                                                                                 painless
## 12648                                                                                                                                                    palma
## 12649                                                                                                                                                   pamper
## 12650                                                                                                                                                      pan
## 12651                                                                                                                                                  pandemi
## 12652                                                                                                                                                panhandle
## 12653                                                                                                                                                    panic
## 12654                                                                                                                                                   papers
## 12655                                                                                                                                              paradoxical
## 12656                                                                                                                                                    paris
## 12657                                                                                                                                            participating
## 12658                                                                                                                                                 passport
## 12659                                                                                                                                                 pathogen
## 12660                                                                                                                                                    patio
## 12661                                                                                                                                                 patricia
## 12662                                                                                                                                                  patrick
## 12663                                                                                                                                                patrolled
## 12664                                                                                                                                                 patterns
## 12665                                                                                                                                                     pays
## 12666                                                                                                                                                      pbs
## 12667                                                                                                                                               peacefully
## 12668                                                                                                                                                peachtree
## 12669                                                                                                                                                   peaked
## 12670                                                                                                                                                  pence�s
## 12671                                                                                                                                                 pendejos
## 12672                                                                                                                                                      pep
## 12673                                                                                                                                                  perform
## 12674                                                                                                                                                   permit
## 12675                                                                                                                                                  permite
## 12676                                                                                                                                                  permits
## 12677                                                                                                                                              perspective
## 12678                                                                                                                                                   persse
## 12679                                                                                                                                                     peru
## 12680                                                                                                                                                      pet
## 12681                                                                                                                                                    peter
## 12682                                                                                                                                                    petri
## 12683                                                                                                                                               pharmacies
## 12684                                                                                                                                                   phased
## 12685                                                                                                                                                      pho
## 12686                                                                                                                                                    phony
## 12687                                                                                                                                                   phrase
## 12688                                                                                                                                                 pichette
## 12689                                                                                                                                                 pictured
## 12690                                                                                                                                                 pivoting
## 12691                                                                                                                                                    pizza
## 12692                                                                                                                                                   place�
## 12693                                                                                                                                                  plagues
## 12694                                                                                                                                                    plant
## 12695                                                                                                                                                    plays
## 12696                                                                                                                                                    plexi
## 12697                                                                                                                                               plexiglass
## 12698                                                                                                                                                   plunge
## 12699                                                                                                                                                  pockets
## 12700                                                                                                                                                   podr�a
## 12701                                                                                                                                                   poison
## 12702                                                                                                                                                     pole
## 12703                                                                                                                                                    poles
## 12704                                                                                                                                                     poll
## 12705                                                                                                                                                    polls
## 12706                                                                                                                                                pollution
## 12707                                                                                                                                                 pol�tica
## 12708                                                                                                                                                   poorer
## 12709                                                                                                                                                   popped
## 12710                                                                                                                                                     pork
## 12711                                                                                                                                                     porn
## 12712                                                                                                                                                     port
## 12713                                                                                                                                                   portal
## 12714                                                                                                                                                  portion
## 12715                                                                                                                                                 portland
## 12716                                                                                                                                                  posible
## 12717                                                                                                                                                positivos
## 12718                                                                                                                                             postpandemic
## 12719                                                                                                                                                 potatoes
## 12720                                                                                                                                                   potent
## 12721                                                                                                                                                   pplday
## 12722                                                                                                                                                practiced
## 12723                                                                                                                                                preaching
## 12724                                                                                                                                                precedent
## 12725                                                                                                                                               predicting
## 12726                                                                                                                                              predictions
## 12727                                                                                                                                              preexisting
## 12728                                                                                                                                                   prefer
## 12729                                                                                                                                                pregnancy
## 12730                                                                                                                                                 pregnant
## 12731                                                                                                                                                  premier
## 12732                                                                                                                                                 premiere
## 12733                                                                                                                                                   premji
## 12734                                                                                                                                               presidency
## 12735                                                                                                                                               presidente
## 12736                                                                                                                                               presidents
## 12737                                                                                                                                             preventative
## 12738                                                                                                                                                     prez
## 12739                                                                                                                                                  priests
## 12740                                                                                                                                                   primer
## 12741                                                                                                                                                 pritzker
## 12742                                                                                                                                                    prize
## 12743                                                                                                                                              probability
## 12744                                                                                                                                                 probable
## 12745                                                                                                                                                  product
## 12746                                                                                                                                               productive
## 12747                                                                                                                                                 products
## 12748                                                                                                                                               professors
## 12749                                                                                                                                                   profit
## 12750                                                                                                                                               projection
## 12751                                                                                                                                                prominent
## 12752                                                                                                                                                 promised
## 12753                                                                                                                                                    promo
## 12754                                                                                                                                                promoting
## 12755                                                                                                                                              propagaci�n
## 12756                                                                                                                                                 proposed
## 12757                                                                                                                                                prosecute
## 12758                                                                                                                                              prosecutors
## 12759                                                                                                                                                prospects
## 12760                                                                                                                                                protected
## 12761                                                                                                                                               protective
## 12762                                                                                                                                               protegerse
## 12763                                                                                                                                                protocolo
## 12764                                                                                                                                                   proves
## 12765                                                                                                                                                  provost
## 12766                                                                                                                                                proximity
## 12767                                                                                                                                                     psst
## 12768                                                                                                                                                  psychic
## 12769                                                                                                                                               psychology
## 12770                                                                                                                                                     ptsd
## 12771                                                                                                                                             publichealth
## 12772                                                                                                                                                 publicly
## 12773                                                                                                                                                     pude
## 12774                                                                                                                                                  pueblos
## 12775                                                                                                                                                   puedan
## 12776                                                                                                                                                    puede
## 12777                                                                                                                                                  pulling
## 12778                                                                                                                                                pulmonary
## 12779                                                                                                                                                    punch
## 12780                                                                                                                                                   punish
## 12781                                                                                                                                                  puritan
## 12782                                                                                                                                                       qb
## 12783                                                                                                                                               qualifying
## 12784                                                                                                                                             quarantining
## 12785                                                                                                                                                  quarter
## 12786                                                                                                                                                   rabida
## 12787                                                                                                                                                  racismo
## 12788                                                                                                                                                     rain
## 12789                                                                                                                                                  rainbow
## 12790                                                                                                                                                   raking
## 12791                                                                                                                                                   random
## 12792                                                                                                                                                    range
## 12793                                                                                                                                                   rapids
## 12794                                                                                                                                                     rchs
## 12795                                                                                                                                                reactions
## 12796                                                                                                                                                    reads
## 12797                                                                                                                                                 realized
## 12798                                                                                                                                               reapertura
## 12799                                                                                                                                                     rear
## 12800                                                                                                                                                reasoning
## 12801                                                                                                                                                   rebate
## 12802                                                                                                                                                   reboot
## 12803                                                                                                                                              recognition
## 12804                                                                                                                                              recommended
## 12805                                                                                                                                            reconsidering
## 12806                                                                                                                                           recordbreaking
## 12807                                                                                                                                                 recuerda
## 12808                                                                                                                                                recycling
## 12809                                                                                                                                               redirected
## 12810                                                                                                                                                 reducing
## 12811                                                                                                                                                reelected
## 12812                                                                                                                                                    refer
## 12813                                                                                                                                                referring
## 12814                                                                                                                                               reflection
## 12815                                                                                                                                                 reflects
## 12816                                                                                                                                                  reforms
## 12817                                                                                                                                                 refugees
## 12818                                                                                                                                                   refuse
## 12819                                                                                                                                                  refused
## 12820                                                                                                                                                 refusing
## 12821                                                                                                                                                   regime
## 12822                                                                                                                                                  regions
## 12823                                                                                                                                              registrarse
## 12824                                                                                                                                                   regret
## 12825                                                                                                                                                regularly
## 12826                                                                                                                                                    rehab
## 12827                                                                                                                                             reintroduced
## 12828                                                                                                                                                 relaci�n
## 12829                                                                                                                                             relationship
## 12830                                                                                                                                                 relative
## 12831                                                                                                                                                 relaxing
## 12832                                                                                                                                                 relevant
## 12833                                                                                                                                                 reliance
## 12834                                                                                                                                                  relieve
## 12835                                                                                                                                                     rely
## 12836                                                                                                                                                  relying
## 12837                                                                                                                                                remainder
## 12838                                                                                                                                               remarkably
## 12839                                                                                                                                              remittances
## 12840                                                                                                                                                  removed
## 12841                                                                                                                                                  reopens
## 12842                                                                                                                                                      rep
## 12843                                                                                                                                               repeatedly
## 12844                                                                                                                                            repercussions
## 12845                                                                                                                                                  replace
## 12846                                                                                                                                              represented
## 12847                                                                                                                                                 reprieve
## 12848                                                                                                                                                requiring
## 12849                                                                                                                                              researchthe
## 12850                                                                                                                                                 reserved
## 12851                                                                                                                                                    reset
## 12852                                                                                                                                              residential
## 12853                                                                                                                                               resilience
## 12854                                                                                                                                                resilient
## 12855                                                                                                                                               resistance
## 12856                                                                                                                                                   resort
## 12857                                                                                                                                                respected
## 12858                                                                                                                                                 respects
## 12859                                                                                                                                             resplandecer
## 12860                                                                                                                                                responder
## 12861                                                                                                                                               restarting
## 12862                                                                                                                                                restraint
## 12863                                                                                                                                                resultado
## 12864                                                                                                                                                resulting
## 12865                                                                                                                                                 resuming
## 12866                                                                                                                                                 retested
## 12867                                                                                                                                                  rethink
## 12868                                                                                                                                                  retweet
## 12869                                                                                                                                                  reuters
## 12870                                                                                                                                                 revealed
## 12871                                                                                                                                               revolution
## 12872                                                                                                                                                    reyes
## 12873                                                                                                                                                     rick
## 12874                                                                                                                                                   riders
## 12875                                                                                                                                                   riesgo
## 12876                                                                                                                                             rightwingers
## 12877                                                                                                                                                 rigorous
## 12878                                                                                                                                                   rioter
## 12879                                                                                                                                                     ripa
## 12880                                                                                                                                                    risky
## 12881                                                                                                                                                      rob
## 12882                                                                                                                                                   robbed
## 12883                                                                                                                                                   robert
## 12884                                                                                                                                                  roberts
## 12885                                                                                                                                                rochester
## 12886                                                                                                                                                  rocking
## 12887                                                                                                                                                    roles
## 12888                                                                                                                                                   rooted
## 12889                                                                                                                                                  rooting
## 12890                                                                                                                                                 rosemead
## 12891                                                                                                                                                    roses
## 12892                                                                                                                                                    rough
## 12893                                                                                                                                  roxburysunflowerproject
## 12894                                                                                                                                                  roytman
## 12895                                                                                                                                                      rub
## 12896                                                                                                                                                     ruin
## 12897                                                                                                                                                    rumor
## 12898                                                                                                                                                      rut
## 12899                                                                                                                                               rutherford
## 12900                                                                                                                                                     ryan
## 12901                                                                                                                                                    sabes
## 12902                                                                                                                                               sacramento
## 12903                                                                                                                                                 saddened
## 12904                                                                                                                                               safeguards
## 12905                                                                                                                                              sagittarius
## 12906                                                                                                                                                   saling
## 12907                                                                                                                                                   salute
## 12908                                                                                                                                                      sam
## 12909                                                                                                                                                  samples
## 12910                                                                                                                                               sandwiches
## 12911                                                                                                                                                    santo
## 12912                                                                                                                                                    sauce
## 12913                                                                                                                                                    saved
## 12914                                                                                                                                                     saya
## 12915                                                                                                                                                    sa�de
## 12916                                                                                                                                                   scarce
## 12917                                                                                                                                                    scare
## 12918                                                                                                                                                    scene
## 12919                                                                                                                                                 scholars
## 12920                                                                                                                                              schoolhouse
## 12921                                                                                                                                                   scream
## 12922                                                                                                                                                   scrubs
## 12923                                                                                                                                                     sean
## 12924                                                                                                                                                searching
## 12925                                                                                                                                                   seated
## 12926                                                                                                                                                 seatings
## 12927                                                                                                                                                   secret
## 12928                                                                                                                                                  section
## 12929                                                                                                                                                  sectors
## 12930                                                                                                                                               secuencian
## 12931                                                                                                                                                     seek
## 12932                                                                                                                                                   seguir
## 12933                                                                                                                                                  segunda
## 12934                                                                                                                                                seguridad
## 12935                                                                                                                                                    seize
## 12936                                                                                                                                                   seized
## 12937                                                                                                                                                  seizing
## 12938                                                                                                                                                selection
## 12939                                                                                                                                                sensitive
## 12940                                                                                                                                                september
## 12941                                                                                                                                   serendipitylabsatlanta
## 12942                                                                                                                                                  servant
## 12943                                                                                                                                                 settings
## 12944                                                                                                                                                 settling
## 12945                                                                                                                                                      sex
## 12946                                                                                                                                                  shaking
## 12947                                                                                                                                                 shambles
## 12948                                                                                                                                                  shaming
## 12949                                                                                                                                                  shaping
## 12950                                                                                                                                                   shares
## 12951                                                                                                                                                    sheep
## 12952                                                                                                                                                 shelters
## 12953                                                                                                                                                 shielded
## 12954                                                                                                                                                  shifted
## 12955                                                                                                                                                   shifts
## 12956                                                                                                                                                shootings
## 12957                                                                                                                                                 shopping
## 12958                                                                                                                                                 shortage
## 12959                                                                                                                                                should�ve
## 12960                                                                                                                                                 shoutout
## 12961                                                                                                                                                   shouts
## 12962                                                                                                                                                shutdowns
## 12963                                                                                                                                                    shuts
## 12964                                                                                                                                                 shutting
## 12965                                                                                                                                                  sicilia
## 12966                                                                                                                                                 sickness
## 12967                                                                                                                                                  sigamos
## 12968                                                                                                                                                signaling
## 12969                                                                                                                                               signatures
## 12970                                                                                                                                                  signing
## 12971                                                                                                                                                   signup
## 12972                                                                                                                                               simulation
## 12973                                                                                                                                                    sinai
## 12974                                                                                                                                                singleday
## 12975                                                                                                                                                     sink
## 12976                                                                                                                                                  sistema
## 12977                                                                                                                                                skeptical
## 12978                                                                                                                                                    skill
## 12979                                                                                                                                                   skills
## 12980                                                                                                                                                     skin
## 12981                                                                                                                                                     skip
## 12982                                                                                                                                                      sky
## 12983                                                                                                                                          slaughterhouses
## 12984                                                                                                                                                    slept
## 12985                                                                                                                                                    slick
## 12986                                                                                                                                                    slide
## 12987                                                                                                                                                 slightly
## 12988                                                                                                                                                     slot
## 12989                                                                                                                                                    slots
## 12990                                                                                                                                                    smear
## 12991                                                                                                                                                  smoking
## 12992                                                                                                                                                    snake
## 12993                                                                                                                                                     soak
## 12994                                                                                                                                                     soar
## 12995                                                                                                                                                 sociedad
## 12996                                                                                                                                                societies
## 12997                                                                                                                                                     soky
## 12998                                                                                                                                                     solo
## 12999                                                                                                                                                   solved
## 13000                                                                                                                                                  solving
## 13001                                                                                                                                                    somos
## 13002                                                                                                                                                  soooooo
## 13003                                                                                                                                                   sophia
## 13004                                                                                                                                                     sore
## 13005                                                                                                                                                  sounded
## 13006                                                                                                                                                  spacing
## 13007                                                                                                                                                    spain
## 13008                                                                                                                                                    spark
## 13009                                                                                                                                              specialists
## 13010                                                                                                                                                  spelled
## 13011                                                                                                                                                  spirits
## 13012                                                                                                                                                spiritual
## 13013                                                                                                                                                     spit
## 13014                                                                                                                                                 sporting
## 13015                                                                                                                                                spotlight
## 13016                                                                                                                                                    spots
## 13017                                                                                                                                                  sprayed
## 13018                                                                                                                                                 spreader
## 13019                                                                                                                                                    squad
## 13020                                                                                                                                                 stadiums
## 13021                                                                                                                                                  staffer
## 13022                                                                                                                                                 standard
## 13023                                                                                                                                                  standup
## 13024                                                                                                                                                    stark
## 13025                                                                                                                                                   starve
## 13026                                                                                                                                                   stated
## 13027                                                                                                                                               statehouse
## 13028                                                                                                                                                 stations
## 13029                                                                                                                                            statistically
## 13030                                                                                                                                                    stays
## 13031                                                                                                                                                 steadily
## 13032                                                                                                                                                   steers
## 13033                                                                                                                                                     stem
## 13034                                                                                                                                                  stepdad
## 13035                                                                                                                                                  stepped
## 13036                                                                                                                                                    stick
## 13037                                                                                                                                                    stihl
## 13038                                                                                                                                                 stockton
## 13039                                                                                                                                                stonewall
## 13040                                                                                                                                                   storms
## 13041                                                                                                                                                  strains
## 13042                                                                                                                                                strangers
## 13043                                                                                                                                               strawberry
## 13044                                                                                                                                                 stressed
## 13045                                                                                                                                                   strict
## 13046                                                                                                                                                   string
## 13047                                                                                                                                                   struck
## 13048                                                                                                                                               structural
## 13049                                                                                                                                                struggled
## 13050                                                                                                                                           studentathlete
## 13051                                                                                                                                                  studied
## 13052                                                                                                                                                    stunt
## 13053                                                                                                                                                stupidity
## 13054                                                                                                                                                submitted
## 13055                                                                                                                                                  succeed
## 13056                                                                                                                                             successfully
## 13057                                                                                                                                                   suecia
## 13058                                                                                                                                                    sueco
## 13059                                                                                                                                                     sued
## 13060                                                                                                                                                   suffer
## 13061                                                                                                                                                   summit
## 13062                                                                                                                                                 sunlight
## 13063                                                                                                                                                 supplied
## 13064                                                                                                                                      support<u+0001f90d>
## 13065                                                                                                                                                supported
## 13066                                                                                                                                              supremacist
## 13067                                                                                                                                                  surgeon
## 13068                                                                                                                                                   surges
## 13069                                                                                                                                                 surgical
## 13070                                                                                                                                                surpasses
## 13071                                                                                                                                                  surving
## 13072                                                                                                                                                 survival
## 13073                                                                                                                                                    sushi
## 13074                                                                                                                                                suspected
## 13075                                                                                                                                               suspending
## 13076                                                                                                                                                    sweat
## 13077                                                                                                                                                 swimming
## 13078                                                                                                                                                 syndrome
## 13079                                                                                                                                               systematic
## 13080                                                                                                                                                      s�o
## 13081                                                                                                                                                    s�per
## 13082                                                                                                                                                   tackle
## 13083                                                                                                                                                     tags
## 13084                                                                                                                                                 talented
## 13085                                                                                                                                                  tambi�n
## 13086                                                                                                                                                    tampa
## 13087                                                                                                                                                    tanto
## 13088                                                                                                                                                  targets
## 13089                                                                                                                                                  tarrant
## 13090                                                                                                                                                   taunts
## 13091                                                                                                                                                  teargas
## 13092                                                                                                                                                  tearing
## 13093                                                                                                                                                technical
## 13094                                                                                                                                                technique
## 13095                                                                                                                                                 tecumseh
## 13096                                                                                                                                                    teddy
## 13097                                                                                                                                                  teenage
## 13098                                                                                                                                                     teks
## 13099                                                                                                                                                 telegram
## 13100                                                                                                                                               telehealth
## 13101                                                                                                                                                     temp
## 13102                                                                                                                                                  tenants
## 13103                                                                                                                                                  tenemos
## 13104                                                                                                                                                 tennfold
## 13105                                                                                                                                                      ter
## 13106                                                                                                                                               terremotos
## 13107                                                                                                                                                terrified
## 13108                                                                                                                                                  texting
## 13109                                                                                                                                                  theater
## 13110                                                                                                                                                    theme
## 13111                                                                                                                                                 theories
## 13112                                                                                                                                                  thereof
## 13113                                                                                                                                             thirdhighest
## 13114                                                                                                                                                   thirty
## 13115                                                                                                                                              thomasville
## 13116                                                                                                                                             thoughtfully
## 13117                                                                                                                                              threatening
## 13118                                                                                                                                                  threats
## 13119                                                                                                                                                   throat
## 13120                                                                                                                                                   thrust
## 13121                                                                                                                                                      thu
## 13122                                                                                                                                                  thurday
## 13123                                                                                                                                               thursday�s
## 13124                                                                                                                                                     tick
## 13125                                                                                                                                                   tiempo
## 13126                                                                                                                                                   tienen
## 13127                                                                                                                                                  tipping
## 13128                                                                                                                                               tirelessly
## 13129                                                                                                                                                    tires
## 13130                                                                                                                                                  tissues
## 13131                                                                                                                                                    title
## 13132                                                                                                                                                   titled
## 13133                                                                                                                                                       tl
## 13134                                                                                                                                                    todas
## 13135                                                                                                                                                  todav�a
## 13136                                                                                                                                                 tonights
## 13137                                                                                                                                                     torn
## 13138                                                                                                                                                  tornado
## 13139                                                                                                                                                   totals
## 13140                                                                                                                                                    touts
## 13141                                                                                                                                                   toxina
## 13142                                                                                                                                                   tragic
## 13143                                                                                                                                                    trail
## 13144                                                                                                                                           traitorinchief
## 13145                                                                                                                                                    trans
## 13146                                                                                                                                              transaction
## 13147                                                                                                                                           transformation
## 13148                                                                                                                                                  transit
## 13149                                                                                                                                            transitioning
## 13150                                                                                                                                              transmisi�n
## 13151                                                                                                                                             transparency
## 13152                                                                                                                                           transportation
## 13153                                                                                                                                                 traveler
## 13154                                                                                                                                                travelers
## 13155                                                                                                                                                travelled
## 13156                                                                                                                                               treatments
## 13157                                                                                                                                                     tres
## 13158                                                                                                                                                    tribe
## 13159                                                                                                                                                   tribes
## 13160                                                                                                                                                  tribute
## 13161                                                                                                                                                     trmp
## 13162                                                                                                                                                     troa
## 13163                                                                                                                                                  trouble
## 13164                                                                                                                                                trousdale
## 13165                                                                                                                                                   truman
## 13166                                                                                                                                               trumppence
## 13167                                                                                                                                                  trusted
## 13168                                                                                                                                                   tryout
## 13169                                                                                                                                                     tues
## 13170                                                                                                                                                   turkey
## 13171                                                                                                                                                  turmoil
## 13172                                                                                                                                                   twenty
## 13173                                                                                                                                               twentynine
## 13174                                                                                                                                                    twist
## 13175                                                                                                                                                   tyrant
## 13176                                                                                                                                                       ue
## 13177                                                                                                                                                      ugh
## 13178                                                                                                                                                uhcougars
## 13179                                                                                                                                                     uh�s
## 13180                                                                                                                                         unconstitutional
## 13181                                                                                                                                                   under�
## 13182                                                                                                                                             undocumented
## 13183                                                                                                                                              unfortunate
## 13184                                                                                                                                                  uniform
## 13185                                                                                                                                                  uniting
## 13186                                                                                                                                                      uno
## 13187                                                                                                                                                unreality
## 13188                                                                                                                                             unreasonable
## 13189                                                                                                                                              unthinkable
## 13190                                                                                                                                                unveiling
## 13191                                                                                                                                               unwavering
## 13192                                                                                                                                                unwilling
## 13193                                                                                                                                                   unwise
## 13194                                                                                                                                                    upper
## 13195                                                                                                                                                 uprising
## 13196                                                                                                                                                upsetting
## 13197                                                                                                                                                       ur
## 13198                                                                                                                                                    urged
## 13199                                                                                                                                                    urges
## 13200                                                                                                                                                    usage
## 13201                                                                                                                                                    users
## 13202                                                                                                                                                      uso
## 13203                                                                                                                                                  utility
## 13204                                                                                                                                                vacations
## 13205                                                                                                                                                      vai
## 13206                                                                                                                                                     vale
## 13207                                                                                                                                                    valid
## 13208                                                                                                                                                   valley
## 13209                                                                                                                                                    vamos
## 13210                                                                                                                                                    veces
## 13211                                                                                                                                                  vendors
## 13212                                                                                                                                                venezuela
## 13213                                                                                                                                                vengeance
## 13214                                                                                                                                                   versus
## 13215                                                                                                                                                  vessels
## 13216                                                                                                                                                     vice
## 13217                                                                                                                                                 victoria
## 13218                                                                                                                                                  victory
## 13219                                                                                                                                                  vietnam
## 13220                                                                                                                                                   viewed
## 13221                                                                                                                                                  viewing
## 13222                                                                                                                                                viewpoint
## 13223                                                                                                                                                    villa
## 13224                                                                                                                                                  village
## 13225                                                                                                                                                violating
## 13226                                                                                                                                                  visited
## 13227                                                                                                                                                     viva
## 13228                                                                                                                                                   volume
## 13229                                                                                                                                                  volumes
## 13230                                                                                                                                                voluntary
## 13231                                                                                                                                             volunteering
## 13232                                                                                                                                               volunteers
## 13233                                                                                                                                                     vows
## 13234                                                                                                                                            vulnerability
## 13235                                                                                                                                              vulnerable�
## 13236                                                                                                                                                    vurus
## 13237                                                                                                                                                    wages
## 13238                                                                                                                                                      wah
## 13239                                                                                                                                                   wakeup
## 13240                                                                                                                                                   walked
## 13241                                                                                                                                                   walkup
## 13242                                                                                                                                                    wanda
## 13243                                                                                                                                                warehouse
## 13244                                                                                                                                                   warmer
## 13245                                                                                                                                                   warned
## 13246                                                                                                                                                 warnings
## 13247                                                                                                                                                     wars
## 13248                                                                                                                                                     wart
## 13249                                                                                                                                                   waters
## 13250                                                                                                                                                   wausau
## 13251                                                                                                                                                      wax
## 13252                                                                                                                                          wearingchanging
## 13253                                                                                                                                                   webber
## 13254                                                                                                                                                    weigh
## 13255                                                                                                                                                 weighing
## 13256                                                                                                                                                  weights
## 13257                                                                                                                                                 welcomed
## 13258                                                                                                                                                welcoming
## 13259                                                                                                                                                  welfare
## 13260                                                                                                                                                wellbeing
## 13261                                                                                                                                                 wellness
## 13262                                                                                                                                                  western
## 13263                                                                                                                                                     we�d
## 13264                                                                                                                                                       wh
## 13265                                                                                                                                                   which�
## 13266                                                                                                                                                  whitmer
## 13267                                                                                                                                                    wholl
## 13268                                                                                                                                                    whove
## 13269                                                                                                                                                   who�ve
## 13270                                                                                                                                                 wildlife
## 13271                                                                                                                                                 williams
## 13272                                                                                                                                                willingly
## 13273                                                                                                                                                  windsor
## 13274                                                                                                                                                  wingers
## 13275                                                                                                                                                     wins
## 13276                                                                                                                                                   winter
## 13277                                                                                                                                                    wiped
## 13278                                                                                                                                                    wired
## 13279                                                                                                                                                   wisdom
## 13280                                                                                                                                                   wishes
## 13281                                                                                                                                                     wjhl
## 13282                                                                                                                                                      woe
## 13283                                                                                                                                                      won
## 13284                                                                                                                                                    woods
## 13285                                                                                                                                                 workers�
## 13286                                                                                                                                                workforce
## 13287                                                                                                                                                  workout
## 13288                                                                                                                                                workspace
## 13289                                                                                                                                                  worries
## 13290                                                                                                                                              worshipping
## 13291                                                                                                                                                 worsthit
## 13292                                                                                                                                               worthwhile
## 13293                                                                                                                                                   woulda
## 13294                                                                                                                                                   wounds
## 13295                                                                                                                                                     wthe
## 13296                                                                                                                                                       wv
## 13297                                                                                                                                                    xiong
## 13298                                                                                                                                                     yang
## 13299                                                                                                                                                     yard
## 13300                                                                                                                                                      yay
## 13301                                                                                                                                                   year�s
## 13302                                                                                                                                                   yellow
## 13303                                                                                                                                               yesterdays
## 13304                                                                                                                                                     yeti
## 13305                                                                                                                                                    yknow
## 13306                                                                                                                                                  yonkers
## 13307                                                                                                                                                     yooo
## 13308                                                                                                                                                  youtube
## 13309                                                                                                                                                zacatecas
## 13310                                                                                                                                                    zines
## 13311                                                                                                                                                zmarket91
## 13312                                                                                                                                                     zpak
## 13313                                                                                                                                                     �all
## 13314                                                                                                                                                   �brave
## 13315                                                                                                                                                   �china
## 13316                                                                                                                                              �complicit�
## 13317                                                                                                                                                  �donald
## 13318                                                                                                                                                     �for
## 13319                                                                                                                                                   �let�s
## 13320                                                                                                                                                    �look
## 13321                                                                                                                                                     �new
## 13322                                                                                                                                                      �no
## 13323                                                                                                                                                      �oh
## 13324                                                                                                                                                      �on
## 13325                                                                                                                                                  �opened
## 13326                                                                                                                                                     �our
## 13327                                                                                                                                                 �perfect
## 13328                                                                                                                                                �prolife�
## 13329                                                                                                                                                     �qu�
## 13330                                                                                                                                               �sometimes
## 13331                                                                                                                                                    �stay
## 13332                                                                                                                                                    �well
## 13333                                                                                                                                              @10tampabay
## 13334                                                                                                                                            @18thstlounge
## 13335                                                                                                                                                  @4noura
## 13336                                                                                                                                              @aannursing
## 13337                                                                                                                                             @adambaldwin
## 13338                                                                                                                                            @ahahospitals
## 13339                                                                                                                                             @aidansheart
## 13340                                                                                                                                             @aimlessryan
## 13341                                                                                                                                             @alabamaftbl
## 13342                                                                                                                                            @alexandriava
## 13343                                                                                                                                             @alyssafarah
## 13344                                                                                                                                            @alyssamilano
## 13345                                                                                                                                            @amerambassoc
## 13346                                                                                                                                          @amerikangirlll
## 13347                                                                                                                                             @angelsgal02
## 13348                                                                                                                                               @anonykatt
## 13349                                                                                                                                            @anothercohen
## 13350                                                                                                                                                     @aoc
## 13351                                                                                                                                                      @ap
## 13352                                                                                                                                                  @apaics
## 13353                                                                                                                                                 @apxflex
## 13354                                                                                                                                             @arthurbryer
## 13355                                                                                                                                           @asahutchinson
## 13356                                                                                                                                                @aslavitt
## 13357                                                                                                                                                 @atrupar
## 13358                                                                                                                                                 @aunttre
## 13359                                                                                                                              @battle1staidresponderservi
## 13360                                                                                                                                                 @benioff
## 13361                                                                                                                                                @bensasse
## 13362                                                                                                                                             @beschlossdc
## 13363                                                                                                                                            @bjarnebjarte
## 13364                                                                                                                                               @bonniez45
## 13365                                                                                                                                            @borisjohnson
## 13366                                                                                                                                         @bostonbubbalooo
## 13367                                                                                                                                                 @bris516
## 13368                                                                                                                                                @brithume
## 13369                                                                                                                                                  @browns
## 13370                                                                                                                                               @burgessev
## 13371                                                                                                                                              @cagovernor
## 13372                                                                                                                                              @callmegoro
## 13373                                                                                                                                            @casenatedems
## 13374                                                                                                                                               @casendems
## 13375                                                                                                                                              @ccontrarus
## 13376                                                                                                                                             @cdcdirector
## 13377                                                                                                                                             @chillcalvin
## 13378                                                                                                                                              @chipcoffey
## 13379                                                                                                                                          @chrisjfuselier
## 13380                                                                                                                                         @cityinvestments
## 13381                                                                                                                                            @cityofbhamal
## 13382                                                                                                                                               @cityofjax
## 13383                                                                                                                                           @clairecoppeto
## 13384                                                                                                                                          @clarkcountysch
## 13385                                                                                                                                            @clearlight34
## 13386                                                                                                                                         @cletalkingheads
## 13387                                                                                                                                             @cmthomas770
## 13388                                                                                                                                                    @cnni
## 13389                                                                                                                                             @codemonkeyz
## 13390                                                                                                                                            @colopolitics
## 13391                                                                                                                                         @conceptualjames
## 13392                                                                                                                                              @countyofla
## 13393                                                                                                                                          @covid19crusher
## 13394                                                                                                                                             @covid19lies
## 13395                                                                                                                                              @cpotterpgh
## 13396                                                                                                                                            @crimsonblu22
## 13397                                                                                                                                                    @cuny
## 13398                                                                                                                                              @danpatrick
## 13399                                                                                                                                         @danpriceseattle
## 13400                                                                                                                                              @danscavino
## 13401                                                                                                                                           @david28787016
## 13402                                                                                                                                                @dchealth
## 13403                                                                                                                                                @deadline
## 13404                                                                                                                                            @deneigebroom
## 13405                                                                                                                                             @deseretnews
## 13406                                                                                                                                         @desertg91900265
## 13407                                                                                                                                             @diegoarisot
## 13408                                                                                                                                             @dirtydawgjp
## 13409                                                                                                                                           @donvontemccoy
## 13410                                                                                                                                          @downhomesunset
## 13411                                                                                                                                                  @drdrew
## 13412                                                                                                                                         @elizabe50286054
## 13413                                                                                                                                          @emmanuelmacron
## 13414                                                                                                                                                 @enjen99
## 13415                                                                                                                                              @epochtimes
## 13416                                                                                                                                            @ericgarcetti
## 13417                                                                                                                                           @ericliptonnyt
## 13418                                                                                                                                                    @espn
## 13419                                                                                                                                              @eventbrite
## 13420                                                                                                                                                 @ewarren
## 13421                                                                                                                                               @farafinaw
## 13422                                                                                                                                                  @fcn2go
## 13423                                                                                                                                                  @flotus
## 13424                                                                                                                                                @flsenate
## 13425                                                                                                                                                   @freep
## 13426                                                                                                                                           @friendeden100
## 13427                                                                                                                                         @gatesfoundation
## 13428                                                                                                                                                 @gbush91
## 13429                                                                                                                                         @girlwspadetatoo
## 13430                                                                                                                                          @gooddayatlanta
## 13431                                                                                                                                            @gopgovupdate
## 13432                                                                                                                                               @gopsenate
## 13433                                                                                                                                               @gothamist
## 13434                                                                                                                                          @govchrissununu
## 13435                                                                                                                                              @govholcomb
## 13436                                                                                                                                           @govlarryhogan
## 13437                                                                                                                                           @govlaurakelly
## 13438                                                                                                                                           @govmikedewine
## 13439                                                                                                                                            @govnedlamont
## 13440                                                                                                                                           @greeneyedchic
## 13441                                                                                                                                          @greg2467535753
## 13442                                                                                                                                              @gregtravis
## 13443                                                                                                                                                @groizner
## 13444                                                                                                                                                  @gurdur
## 13445                                                                                                                                                 @hcashny
## 13446                                                                                                                                          @heatherlinda11
## 13447                                                                                                                                          @hotzonechiller
## 13448                                                                                                                                                @huffpost
## 13449                                                                                                                                             @huffpostent
## 13450                                                                                                                                             @huffpostpol
## 13451                                                                                                                                           @ifadpresident
## 13452                                                                                                                                           @irishbrat1966
## 13453                                                                                                                                          @israel80288564
## 13454                                                                                                                                                 @jacobwm
## 13455                                                                                                                                              @jakecorman
## 13456                                                                                                                                           @jennaellisesq
## 13457                                                                                                                                             @jeremyfaust
## 13458                                                                                                                                              @jimsciutto
## 13459                                                                                                                                                 @jkwelsh
## 13460                                                                                                                                               @jlrmackay
## 13461                                                                                                                                            @joannjenkins
## 13462                                                                                                                                           @joinclubhouse
## 13463                                                                                                                                         @joncoopertweets
## 13464                                                                                                                                              @joyannreid
## 13465                                                                                                                                               @jscalf123
## 13466                                                                                                                                                   @jsg54
## 13467                                                                                                                                                @juliahb1
## 13468                                                                                                                                             @justnfields
## 13469                                                                                                                                                  @katatk
## 13470                                                                                                                                                    @kdka
## 13471                                                                                                                                                @keesaroo
## 13472                                                                                                                                                @kerrimpr
## 13473                                                                                                                                             @ketvlincoln
## 13474                                                                                                                                                    @kfor
## 13475                                                                                                                                             @kingsthings
## 13476                                                                                                                                          @kirkherbstreit
## 13477                                                                                                                                            @kiro7seattle
## 13478                                                                                                                                         @kittytigerlily1
## 13479                                                                                                                                                @koconews
## 13480                                                                                                                                                @kpascuch
## 13481                                                                                                                                                    @krgv
## 13482                                                                                                                                              @kylekashuv
## 13483                                                                                                                                                @ladyag72
## 13484                                                                                                                                          @lapublichealth
## 13485                                                                                                                                            @larrykingnow
## 13486                                                                                                                                               @laschools
## 13487                                                                                                                                           @latsondheimer
## 13488                                                                                                                                           @laurenboebert
## 13489                                                                                                                                           @lelenapeacock
## 13490                                                                                                                                           @lisamurkowski
## 13491                                                                                                                                         @lizyoun58386941
## 13492                                                                                                                                               @lrihendry
## 13493                                                                                                                                              @ltgovnunez
## 13494                                                                                                                                               @lufthansa
## 13495                                                                                                                                            @lynbrooksupt
## 13496                                                                                                                                               @lynnfynn3
## 13497                                                                                                                                                 @maisybo
## 13498                                                                                                                                             @markready47
## 13499                                                                                                                                            @masslivenews
## 13500                                                                                                                                               @mattgaetz
## 13501                                                                                                                                           @mayorcantrell
## 13502                                                                                                                                          @michaelminalab
## 13503                                                                                                                                                  @mickid
## 13504                                                                                                                                                @millj919
## 13505                                                                                                                                              @mmpadellan
## 13506                                                                                                                                             @montaigne01
## 13507                                                                                                                                           @montefiorenyc
## 13508                                                                                                                                          @montgomerycomd
## 13509                                                                                                                                          @moogiemonsters
## 13510                                                                                                                                               @mrbeastyt
## 13511                                                                                                                                          @mrpetesonality
## 13512                                                                                                                                                   @msnbc
## 13513                                                                                                                                         @nassauexecutive
## 13514                                                                                                                                           @natesilver538
## 13515                                                                                                                                                   @nbc12
## 13516                                                                                                                                                  @nbcdfw
## 13517                                                                                                                                                   @nddoh
## 13518                                                                                                                                                @news12li
## 13519                                                                                                                                                   @news9
## 13520                                                                                                                                                     @nfl
## 13521                                                                                                                                                   @nhsuk
## 13522                                                                                                                                             @nickcarlin6
## 13523                                                                                                                                             @nihdirector
## 13524                                                                                                                                             @nitocortizo
## 13525                                                                                                                                               @npsvoices
## 13526                                                                                                                                                  @ntagmn
## 13527                                                                                                                                              @nyccouncil
## 13528                                                                                                                                              @nycschools
## 13529                                                                                                                                                @nysenate
## 13530                                                                                                                                               @ohiostate
## 13531                                                                                                                                         @ohiostathletics
## 13532                                                                                                                                                  @okcfox
## 13533                                                                                                                                           @okhouseofreps
## 13534                                                                                                                                            @oksenatedems
## 13535                                                                                                                                             @oksenategop
## 13536                                                                                                                                         @oncologynursing
## 13537                                                                                                                                          @onondagacounty
## 13538                                                                                                                                          @painadvocatear
## 13539                                                                                                                                          @patdonahoearmy
## 13540                                                                                                                                          @paulbradley425
## 13541                                                                                                                                                  @paypal
## 13542                                                                                                                                                  @pbcgov
## 13543                                                                                                                                                     @pbs
## 13544                                                                                                                                            @pennmedicine
## 13545                                                                                                                                                  @pfizer
## 13546                                                                                                                                         @picturegenetics
## 13547                                                                                                                                            @pinkshotdogs
## 13548                                                                                                                                               @pithypins
## 13549                                                                                                                                               @pix11news
## 13550                                                                                                                                                @politico
## 13551                                                                                                                                              @premnsikka
## 13552                                                                                                                                                @presssec
## 13553                                                                                                                                            @princetyreek
## 13554                                                                                                                                            @puppyluvr312
## 13555                                                                                                                                                @pwcsnews
## 13556                                                                                                                                          @ravensspirit68
## 13557                                                                                                                                            @realcandaceo
## 13558                                                                                                                                           @realmattcouch
## 13559                                                                                                                                           @realmickfoley
## 13560                                                                                                                                              @rebeccacpp
## 13561                                                                                                                                                @regejean
## 13562                                                                                                                                           @repbarbaralee
## 13563                                                                                                                                             @repmobrooks
## 13564                                                                                                                                              @reptedbudd
## 13565                                                                                                                                             @reptimwalzs
## 13566                                                                                                                                          @rhonda52807071
## 13567                                                                                                                                           @richardbarrow
## 13568                                                                                                                                          @rmumbasketball
## 13569                                                                                                                                             @robert27926
## 13570                                                                                                                                           @roguewolf2001
## 13571                                                                                                                                            @rollinslynda
## 13572                                                                                                                                            @rosebowlgame
## 13573                                                                                                                                         @rosesdaughter61
## 13574                                                                                                                                              @rudepundit
## 13575                                                                                                                                            @rudygiuliani
## 13576                                                                                                                                                  @saints
## 13577                                                                                                                                               @sdschools
## 13578                                                                                                                                             @seanhannity
## 13579                                                                                                                                         @senkamalaharris
## 13580                                                                                                                                               @sfunified
## 13581                                                                                                                                          @shelbytnhealth
## 13582                                                                                                                                           @shelleybean60
## 13583                                                                                                                                         @shortbr88532738
## 13584                                                                                                                                         @somersetbilly10
## 13585                                                                                                                                              @soofriends
## 13586                                                                                                                                         @southernmissmbb
## 13587                                                                                                                                           @spicypurritos
## 13588                                                                                                                                             @staceyrudin
## 13589                                                                                                                                                  @stachx
## 13590                                                                                                                                               @statedept
## 13591                                                                                                                                                @stevefda
## 13592                                                                                                                                           @stevenbritt13
## 13593                                                                                                                                            @stevescalise
## 13594                                                                                                                                                   @stmch
## 13595                                                                                                                                             @stopbaddocs
## 13596                                                                                                                                                    @suny
## 13597                                                                                                                                               @surenjaya
## 13598                                                                                                                                            @talkeetna101
## 13599                                                                                                                                                @teamtime
## 13600                                                                                                                                             @telemundo52
## 13601                                                                                                                                            @thedemocrats
## 13602                                                                                                                                          @therealtruther
## 13603                                                                                                                                              @therecount
## 13604                                                                                                                                                 @timwalz
## 13605                                                                                                                                                @timwalzs
## 13606                                                                                                                                                 @tlm0511
## 13607                                                                                                                                               @todayshow
## 13608                                                                                                                                                 @tprnews
## 13609                                                                                                                                            @tracewashere
## 13610                                                                                                                                              @tracybeanz
## 13611                                                                                                                                              @uamshealth
## 13612                                                                                                                                              @uncletexgp
## 13613                                                                                                                                             @uninoticias
## 13614                                                                                                                                                  @urapgh
## 13615                                                                                                                                           @urbanfatbiker
## 13616                                                                                                                                             @usattorneys
## 13617                                                                                                                                                    @usps
## 13618                                                                                                                                              @vacolleges
## 13619                                                                                                                                                @vasenate
## 13620                                                                                                                                                  @vccsso
## 13621                                                                                                                                           @vendingcomics
## 13622                                                                                                                                                   @verge
## 13623                                                                                                                                            @virginiatech
## 13624                                                                                                                                          @vivirfobsessed
## 13625                                                                                                                                                    @vnaa
## 13626                                                                                                                                            @vprasadmdmph
## 13627                                                                                                                                                 @walmart
## 13628                                                                                                                                                @wamcnews
## 13629                                                                                                                                                    @wapo
## 13630                                                                                                                                                @wbaltv11
## 13631                                                                                                                                                 @wcbs880
## 13632                                                                                                                                              @wchs8fox11
## 13633                                                                                                                                                    @wdsu
## 13634                                                                                                                                                   @webmd
## 13635                                                                                                                                                @wenurses
## 13636                                                                                                                                               @wespegden
## 13637                                                                                                                                                    @wfaa
## 13638                                                                                                                                                    @wfae
## 13639                                                                                                                                              @wfrvlocal5
## 13640                                                                                                                                              @wilkymouse
## 13641                                                                                                                                               @woutgorge
## 13642                                                                                                                                             @wplglocal10
## 13643                                                                                                                                                    @wpxi
## 13644                                                                                                                                                  @wvtm13
## 13645                                                                                                                                                   @yahoo
## 13646                                                                                                                                                  @yashar
## 13647                                                                                                                                                #airlines
## 13648                                                                                                                                                     #aoc
## 13649                                                                                                                                                    #arpx
## 13650                                                                                                                                       #arrestdonaldtrump
## 13651                                                                                                                                          #arresttrumpnow
## 13652                                                                                                                                                 #atlanta
## 13653                                                                                                                                                    #b117
## 13654                                                                                                                                             #balbination
## 13655                                                                                                                                                     #bch
## 13656                                                                                                                                                 #bengals
## 13657                                                                                                                                              #billsmafia
## 13658                                                                                                                                                  #boston
## 13659                                                                                                                                              #bridgerton
## 13660                                                                                                                                       #bridgertonnetflix
## 13661                                                                                                                                                #brooklyn
## 13662                                                                                                                                                #business
## 13663                                                                                                                                                    #cali
## 13664                                                                                                                                             #capitolhill
## 13665                                                                                                                                                   #cbs46
## 13666                                                                                                                                                 #ces2021
## 13667                                                                                                                                                 #chicago
## 13668                                                                                                                                                     #cnn
## 13669                                                                                                                                                  #comedy
## 13670                                                                                                                                            #commentbelow
## 13671                                                                                                                                               #community
## 13672                                                                                                                                           #coronavaccine
## 13673                                                                                                                                               #covid19uk
## 13674                                                                                                                                         #covid19vacccine
## 13675                                                                                                                                         #covid19vaccines
## 13676                                                                                                                                                #covid19�
## 13677                                                                                                                                         #covidsecondwave
## 13678                                                                                                                                              #covidsucks
## 13679                                                                                                                                            #covidtesting
## 13680                                                                                                                                         #covidvaccinated
## 13681                                                                                                                                              #dcprotests
## 13682                                                                                                                                             #deathsantis
## 13683                                                                                                                                               #defundopd
## 13684                                                                                                                                               #education
## 13685                                                                                                                                           #emprendedores
## 13686                                                                                                                                                  #emsvax
## 13687                                                                                                                                           #entertainment
## 13688                                                                                                                                                  #equity
## 13689                                                                                                                                               #exclusive
## 13690                                                                                                                                                   #facts
## 13691                                                                                                                                                  #family
## 13692                                                                                                                                                 #fitness
## 13693                                                                                                                                                #football
## 13694                                                                                                                                                 #foxnews
## 13695                                                                                                                                                   #fpsct
## 13696                                                                                                                                                    #fqhc
## 13697                                                                                                                                        #frontlineworkers
## 13698                                                                                                                                                   #funny
## 13699                                                                                                                                              #funnymemes
## 13700                                                                                                                                                   #gapol
## 13701                                                                                                                                           #gaysovercovid
## 13702                                                                                                                                            #georgiavoter
## 13703                                                                                                                                               #gettested
## 13704                                                                                                                                              #gettheshot
## 13705                                                                                                                                                  #goblue
## 13706                                                                                                                                               #goodvibes
## 13707                                                                                                                                      #gopbetrayedamerica
## 13708                                                                                                                                                #grateful
## 13709                                                                                                                                           #greeneyedchic
## 13710                                                                                                                                                   #happy
## 13711                                                                                                                                            #happynewyear
## 13712                                                                                                                                        #healthcareheroes
## 13713                                                                                                                              #healthcaremediacontributor
## 13714                                                                                                                                       #healthcareworkers
## 13715                                                                                                                                        #hypocriticalleft
## 13716                                                                                                                                               #ignorance
## 13717                                                                                                                                        #inmigrantecomotu
## 13718                                                                                                                                              #instadaily
## 13719                                                                                                                                             #itinthed381
## 13720                                                                                                                                                #joebiden
## 13721                                                                                                                                      #keepnycschoolsopen
## 13722                                                                                                                                              #kikismooth
## 13723                                                                                                                                        #kirkcameronsucks
## 13724                                                                                                                                            #knowyourrisk
## 13725                                                                                                                                                    #la36
## 13726                                                                                                                                                   #laugh
## 13727                                                                                                                               #laughteristhebestmedicine
## 13728                                                                                                                                               #letsgovcu
## 13729                                                                                                                                                    #life
## 13730                                                                                                                                         #magaiscancelled
## 13731                                                                                                                                                     #man
## 13732                                                                                                                                                  #mapoli
## 13733                                                                                                                                                    #mask
## 13734                                                                                                                                              #meditation
## 13735                                                                                                                                                   #memes
## 13736                                                                                                                                                   #miami
## 13737                                                                                                                                          #mitchmcconnell
## 13738                                                                                                                                                   #money
## 13739                                                                                                                                              #mycovidvax
## 13740                                                                                                                                                     #nbc
## 13741                                                                                                                                                   #nbcct
## 13742                                                                                                                                            #neighborhood
## 13743                                                                                                                                                  #nevada
## 13744                                                                                                                                                    #news
## 13745                                                                                                                                                 #newsmax
## 13746                                                                                                                                                 #newyear
## 13747                                                                                                                                                #newyears
## 13748                                                                                                                                              #nfltwitter
## 13749                                                                                                                                              #nhpolitics
## 13750                                                                                                                                           #northcarolina
## 13751                                                                                                                                               #ohiostate
## 13752                                                                                                                                                #oncology
## 13753                                                                                                                                                 #orlando
## 13754                                                                                                                                           #outdoordining
## 13755                                                                                                                                                #outdoors
## 13756                                                                                                                                         #palmbeachcounty
## 13757                                                                                                                                                #pasadena
## 13758                                                                                                                                            #pennsylvania
## 13759                                                                                                                                      #pfizercovidvaccine
## 13760                                                                                                                                           #pfizervaccine
## 13761                                                                                                                                            #pfizervacine
## 13762                                                                                                                                             #photography
## 13763                                                                                                                                           #photooftheday
## 13764                                                                                                                                                    #poly
## 13765                                                                                                                                                #producer
## 13766                                                                                                                                               #proudboys
## 13767                                                                                                                                                #quincyma
## 13768                                                                                                                                            #quincystrong
## 13769                                                                                                                                                    #rams
## 13770                                                                                                                                               #rarebreed
## 13771                                                                                                                                                   #ready
## 13772                                                                                                                                                #receipts
## 13773                                                                                                                                                  #redsea
## 13774                                                                                                                                  #refundrestorereimagine
## 13775                                                                                                                                          #removetrumpnow
## 13776                                                                                                                                                #research
## 13777                                                                                                                                                 #retweet
## 13778                                                                                                                                                     #rgv
## 13779                                                                                                                                           #riskasessment
## 13780                                                                                                                                                    #rona
## 13781                                                                                                                                                 #rtitbot
## 13782                                                                                                                                                     #sad
## 13783                                                                                                                                                   #salud
## 13784                                                                                                                                                #sandiego
## 13785                                                                                                                                          #sciencematters
## 13786                                                                                                                                            #seditiousgop
## 13787                                                                                                                                            #senatelosers
## 13788                                                                                                                                            #sexeducation
## 13789                                                                                                                                            #shareforward
## 13790                                                                                                                                                 #sincity
## 13791                                                                                                                                           #smallbusiness
## 13792                                                                                                                                                   #smttt
## 13793                                                                                                                                                 #snowday
## 13794                                                                                                                                              #spokenword
## 13795                                                                                                                                              #stayathome
## 13796                                                                                                                                           #stimuluscheck
## 13797                                                                                                                                               #superbowl
## 13798                                                                                                                                               #talkradio
## 13799                                                                                                                                           #tappingin1on1
## 13800                                                                                                                                         #themuslimnurses
## 13801                                                                                                                                                  #titans
## 13802                                                                                                                                               #toxicgays
## 13803                                                                                                                                                   #trans
## 13804                                                                                                                                                  #travel
## 13805                                                                                                                                              #truebeauty
## 13806                                                                                                                                               #trump2020
## 13807                                                                                                                                                      #uk
## 13808                                                                                                                                                  #update
## 13809                                                                                                                                                   #virus
## 13810                                                                                                                               #votewarnockossofftomorrow
## 13811                                                                                                                                            #washingtondc
## 13812                                                                                                                                           #washyourhands
## 13813                                                                                                                                                #whittier
## 13814                                                                                                                                                   #woman
## 13815                                                                                                                                                   #world
## 13816                                                                                                                                          #yearofthenurse
## 13817                                                                                                                                                +22deaths
## 13818                                                                                                                                                +25deaths
## 13819                                                                                                                                                +29deaths
## 13820                                                                                                                                                +32deaths
## 13821                                                                                                                                                +35deaths
## 13822                                                                                                                                                +37deaths
## 13823                                                                                                                                 <u+0001f1ef><u+0001f1f5>
## 13824                                                                                                                                             <u+0001f30e>
## 13825                                                                                                                                             <u+0001f32d>
## 13826                                                                                                                                             <u+0001f386>
## 13827                                                                                                                                             <u+0001f389>
## 13828                                                                                                                                 <u+0001f3b2><u+0001f3b2>
## 13829                                                                                                                                             <u+0001f3e5>
## 13830                              <u+0001f418><u+0001f3c8><u+0001f418><u+0001f42a><u+0001f525>osu<u+0001f525><u+0001f42a><u+0001f418><u+0001f3c8><u+0001f418>
## 13831                                                                                                                     <u+0001f447><u+0001f3ff><u+0001f637>
## 13832                                                                                                                                 <u+0001f449><u+0001f3fc>
## 13833                                                                                                                                 <u+0001f449><u+0001f3fd>
## 13834                                                                                                                           <u+0001f449>httpstcob6beokgjbb
## 13835                                                                                                                                             <u+0001f44a>
## 13836                                                                                                                                             <u+0001f44b>
## 13837                                                                                                                     <u+0001f480><u+0001f525><u+0001f480>
## 13838                                                                                                                                             <u+0001f494>
## 13839                                                                                                                                             <u+0001f49c>
## 13840                                                                                                                                             <u+0001f4a9>
## 13841                                                                                                                                             <u+0001f4af>
## 13842                                                                                                                                 <u+0001f4af><u+0001f38a>
## 13843                                                                                                                                             <u+0001f4f7>
## 13844                                                                                                         <u+0001f602><u+0001f602><u+0001f602><u+0001f602>
## 13845                                                                                                                                             <u+0001f606>
## 13846                                                                                                                                             <u+0001f60a>
## 13847                                                                                                                                             <u+0001f60b>
## 13848                                                                                                                                             <u+0001f615>
## 13849                                                                                                                                             <u+0001f61c>
## 13850                                                                                                                     <u+0001f621><u+0001f621><u+0001f621>
## 13851                                                                                                                                             <u+0001f62c>
## 13852                                                                                                                     <u+0001f637><u+0001f1fa><u+0001f1f8>
## 13853                                                                                                                     <u+0001f637><u+0001f64f><u+0001f3fc>
## 13854                                                                                                                                             <u+0001f63f>
## 13855                                                                                                                                             <u+0001f64c>
## 13856                                                                                                                                 <u+0001f64f><u+0001f3fb>
## 13857                                                                                                                     <u+0001f64f><u+0001f3fc><u+0001f637>
## 13858                                                                                                                                             <u+0001f6a9>
## 13859                                                                                                                                         <u+0001f6a9>were
## 13860                                                                                                                                             <u+0001f7e0>
## 13861                                                                                                                                             <u+0001f917>
## 13862                                                                                                                                 <u+0001f91e><u+0001f3fc>
## 13863                                                                                                                                             <u+0001f920>
## 13864                                                                                                                     <u+0001f923><u+0001f923><u+0001f923>
## 13865                                                                                                         <u+0001f926><u+0001f3fd><u+200d><u+2640><u+fe0f>
## 13866                                                                                                         <u+0001f937><u+0001f3fb><u+200d><u+2642><u+fe0f>
## 13867                                                                                                                                             <u+0001f973>
## 13868                                                                                                                     <u+0001f97a><u+0001f97a><u+0001f97a>
## 13869                                                                                                                             <u+0001f9c1><u+2764><u+fe0f>
## 13870                                                                                                                                             <u+0001fa78>
## 13871                                                                                                                                                 <u+0438>
## 13872                                                                                                                                         <u+0441><u+0435>
## 13873                                                                                                                                         <u+2615><u+fe0f>
## 13874                                                                                                                                         <u+2757><u+fe0f>
## 13875                                     <u+2764><u+fe0f><u+0001f3c6><u+0001f4af><u+0001f1fa><u+0001f1f8><u+0001f64b><u+200d><u+2642><u+fe0f><u+2764><u+fe0f>
## 13876 <u+2764><u+fe0f><u+0001f418><u+0001f30a><u+0001f418><u+2764><u+fe0f><u+0001f339><u+0001f377><u+0001f339><u+0001f377><u+0001f339><u+0001f377><u+0001f339>
## 13877                                                                                                                                                 <u+2800>
## 13878                                                                                                                                         <u+2935><u+fe0f>
## 13879                                                                                                                                                 <u+fffc>
## 13880                                                                                                                                                     $10k
## 13881                                                                                                                                                      $2k
## 13882                                                                                                                                                    $ocgn
## 13883                                                                                                                                            1<u+0001f6a9>
## 13884                                                                                                                                        1<u+fe0f><u+20e3>
## 13885                                                                                                                                                    10a5p
## 13886                                                                                                                                                      10s
## 13887                                                                                                                                                     10th
## 13888                                                                                                                                                     12th
## 13889                                                                                                                                                     14th
## 13890                                                                                                                                                   180day
## 13891                                                                                                                                                     18th
## 13892                                                                                                                                                      19i
## 13893                                                                                                                                                     19�s
## 13894                                                                                                                                                      1a1
## 13895                                                                                                                                                      1a2
## 13896                                                                                                                                                       1k
## 13897                                                                                                                                                     1on1
## 13898                                                                                                                                                      1pm
## 13899                                                                                                                                                     21st
## 13900                                                                                                                                                    24hrs
## 13901                                                                                                                                                25yearold
## 13902                                                                                                                                                     29th
## 13903                                                                                                                                           2daydatasingle
## 13904                                                                                                                                                       2x
## 13905                                                                                                                                                      3am
## 13906                                                                                                                                                       3k
## 13907                                                                                                                                                      3pm
## 13908                                                                                                                                                      6ft
## 13909                                                                                                                                                      6pm
## 13910                                                                                                                                                     72hs
## 13911                                                                                                                                                      7th
## 13912                                                                                                                                                   7yrold
## 13913                                                                                                                                                      9th
## 13914                                                                                                                                                   abbott
## 13915                                                                                                                                                    abide
## 13916                                                                                                                                                   absent
## 13917                                                                                                                                                   absurd
## 13918                                                                                                                                                      abt
## 13919                                                                                                                                                   abuela
## 13920                                                                                                                                                abundance
## 13921                                                                                                                                                  academy
## 13922                                                                                                                                               accelerate
## 13923                                                                                                                                             acceleration
## 13924                                                                                                                                               acceptable
## 13925                                                                                                                                                accepting
## 13926                                                                                                                                              accommodate
## 13927                                                                                                                                                     ace2
## 13928                                                                                                                                              achievement
## 13929                                                                                                                                           acknowledgment
## 13930                                                                                                                                                 activate
## 13931                                                                                                                                                 activity
## 13932                                                                                                                                                  actress
## 13933                                                                                                                                                   actual
## 13934                                                                                                                                              actualmente
## 13935                                                                                                                                                       ad
## 13936                                                                                                                                                    adams
## 13937                                                                                                                                                    adapt
## 13938                                                                                                                                                addiction
## 13939                                                                                                                                               addressing
## 13940                                                                                                                                                     adds
## 13941                                                                                                                                                   adhere
## 13942                                                                                                                                                     adhs
## 13943                                                                                                                                          administrations
## 13944                                                                                                                                            administrator
## 13945                                                                                                                                                   admins
## 13946                                                                                                                                               advantages
## 13947                                                                                                                                                   advice
## 13948                                                                                                                                          adviseimplement
## 13949                                                                                                                                                 advisory
## 13950                                                                                                                                                 advocacy
## 13951                                                                                                                                               advocating
## 13952                                                                                                                                                      aea
## 13953                                                                                                                                                affecting
## 13954                                                                                                                                               affiliated
## 13955                                                                                                                                                   agents
## 13956                                                                                                                                               aggressive
## 13957                                                                                                                                                     aide
## 13958                                                                                                                                                 airports
## 13959                                                                                                                                               airpowered
## 13960                                                                                                                                                      alb
## 13961                                                                                                                                                   albany
## 13962                                                                                                                                                  alguien
## 13963                                                                                                                                                    algum
## 13964                                                                                                                                                    alice
## 13965                                                                                                                                                allergies
## 13966                                                                                                                                                allocated
## 13967                                                                                                                                              allocations
## 13968                                                                                                                                                  alltime
## 13969                                                                                                                                                alongside
## 13970                                                                                                                                                    alter
## 13971                                                                                                                                                alternate
## 13972                                                                                                                                                     alto
## 13973                                                                                                                                                    alums
## 13974                                                                                                                                                   amazon
## 13975                                                                                                                                                 americas
## 13976                                                                                                                                                 america�
## 13977                                                                                                                                              amerikanere
## 13978                                                                                                                                                     amos
## 13979                                                                                                                                                  amounts
## 13980                                                                                                                                                      ana
## 13981                                                                                                                                                anecdotal
## 13982                                                                                                                                                 anniston
## 13983                                                                                                                                              anniversary
## 13984                                                                                                                                             announcement
## 13985                                                                                                                                                 answered
## 13986                                                                                                                                               antimasker
## 13987                                                                                                                                                  antioch
## 13988                                                                                                                                                   anvisa
## 13989                                                                                                                                                  anxiety
## 13990                                                                                                                                                  anxious
## 13991                                                                                                                                                       ap
## 13992                                                                                                                                              apocalyptic
## 13993                                                                                                                                                apologize
## 13994                                                                                                                                                    apoyo
## 13995                                                                                                                                                 apparent
## 13996                                                                                                                                                   appeal
## 13997                                                                                                                                          appointmentonly
## 13998                                                                                                                                             appointment�
## 13999                                                                                                                                             appreciation
## 14000                                                                                                                                                  approve
## 14001                                                                                                                                                approving
## 14002                                                                                                                                            approximately
## 14003                                                                                                                                                      apt
## 14004                                                                                                                                                       ar
## 14005                                                                                                                                                     ards
## 14006                                                                                                                                                   arenas
## 14007                                                                                                                                                    argue
## 14008                                                                                                                                                  arguing
## 14009                                                                                                                                                arguments
## 14010                                                                                                                                                arizonans
## 14011                                                                                                                                                arkansans
## 14012                                                                                                                                                    array
## 14013                                                                                                                                                 arriving
## 14014                                                                                                                                                   artist
## 14015                                                                                                                                                     arts
## 14016                                                                                                                                                 assisted
## 14017                                                                                                                                                      ate
## 14018                                                                                                                                                 atenci�n
## 14019                                                                                                                                                   athome
## 14020                                                                                                                                               atmosphere
## 14021                                                                                                                                                atrocious
## 14022                                                                                                                                                 attaches
## 14023                                                                                                                                                attacking
## 14024                                                                                                                                                  auditor
## 14025                                                                                                                                                  aumento
## 14026                                                                                                                                                    aunts
## 14027                                                                                                                                                   author
## 14028                                                                                                                                            authoritarian
## 14029                                                                                                                                            authorization
## 14030                                                                                                                                            automatically
## 14031                                                                                                                                                       av
## 14032                                                                                                                                                 averaged
## 14033                                                                                                                                                averaging
## 14034                                                                                                                                                      avg
## 14035                                                                                                                                                    award
## 14036                                                                                                                                                   awhile
## 14037                                                                                                                                                     b117
## 14038                                                                                                                                                   babies
## 14039                                                                                                                                               background
## 14040                                                                                                                                                      bag
## 14041                                                                                                                                                     bail
## 14042                                                                                                                                                baltimore
## 14043                                                                                                                                                 banished
## 14044                                                                                                                                                   barber
## 14045                                                                                                                                                  barrier
## 14046                                                                                                                                                  barring
## 14047                                                                                                                                                   barrio
## 14048                                                                                                                                                 baseball
## 14049                                                                                                                                                     bash
## 14050                                                                                                                                                    basis
## 14051                                                                                                                                                  bastard
## 14052                                                                                                                                                      bbc
## 14053                                                                                                                                                     bean
## 14054                                                                                                                                                    beast
## 14055                                                                                                                                                   beaten
## 14056                                                                                                                                                   beauty
## 14057                                                                                                                                                     beer
## 14058                                                                                                                                                   behalf
## 14059                                                                                                                                                 believer
## 14060                                                                                                                                                 believes
## 14061                                                                                                                                                  benefit
## 14062                                                                                                                                                   bennet
## 14063                                                                                                                                                bethlehem
## 14064                                                                                                                                                beverages
## 14065                                                                                                                                                    bible
## 14066                                                                                                                                                  biden21
## 14067                                                                                                                                                   bidens
## 14068                                                                                                                                                 billings
## 14069                                                                                                                                             bioterrorism
## 14070                                                                                                                                               bipartisan
## 14071                                                                                                                                                    birds
## 14072                                                                                                                                                    birth
## 14073                                                                                                                                                    bites
## 14074                                                                                                                                                   blacks
## 14075                                                                                                                                                    blake
## 14076                                                                                                                                                   blamed
## 14077                                                                                                                                                    blast
## 14078                                                                                                                                                   bleach
## 14079                                                                                                                                                     blow
## 14080                                                                                                                                                     blue
## 14081                                                                                                                                                      bob
## 14082                                                                                                                                                     bond
## 14083                                                                                                                                                    bonus
## 14084                                                                                                                                                    boost
## 14085                                                                                                                                                  booster
## 14086                                                                                                                                                  borders
## 14087                                                                                                                                                     born
## 14088                                                                                                                                                  bostons
## 14089                                                                                                                                                   bounce
## 14090                                                                                                                                                 bragging
## 14091                                                                                                                                                    brand
## 14092                                                                                                                                                    brave
## 14093                                                                                                                                                    bravo
## 14094                                                                                                                                                   brazos
## 14095                                                                                                                                                  breadth
## 14096                                                                                                                                                  breonna
## 14097                                                                                                                                                briefings
## 14098                                                                                                                                                brilliant
## 14099                                                                                                                                                   brooks
## 14100                                                                                                                                                  broward
## 14101                                                                                                                                                    brown
## 14102                                                                                                                                                brunswick
## 14103                                                                                                                                                   bubble
## 14104                                                                                                                                                    buddy
## 14105                                                                                                                                                      bug
## 14106                                                                                                                                                     bump
## 14107                                                                                                                                                   burden
## 14108                                                                                                                                                   buried
## 14109                                                                                                                                                    burma
## 14110                                                                                                                                                  burmese
## 14111                                                                                                                                                      bus
## 14112                                                                                                                                                   buying
## 14113                                                                                                                                                      c19
## 14114                                                                                                                                                  cabinet
## 14115                                                                                                                                               calculator
## 14116                                                                                                                                                   calder
## 14117                                                                                                                                                 calendar
## 14118                                                                                                                                                     calm
## 14119                                                                                                                                                    camas
## 14120                                                                                                                                                  cameron
## 14121                                                                                                                                                  candace
## 14122                                                                                                                                                  capable
## 14123                                                                                                                                                     cape
## 14124                                                                                                                                                   capita
## 14125                                                                                                                                                     caps
## 14126                                                                                                                                               caretakers
## 14127                                                                                                                                                   carlos
## 14128                                                                                                                                                    carne
## 14129                                                                                                                                                 carnival
## 14130                                                                                                                                                   carpet
## 14131                                                                                                                                                    carry
## 14132                                                                                                                                                     caso
## 14133                                                                                                                                               casualties
## 14134                                                                                                                                              catastrophe
## 14135                                                                                                                                             catastrophic
## 14136                                                                                                                                                 category
## 14137                                                                                                                                                  caution
## 14138                                                                                                                                                     cave
## 14139                                                                                                                                                       cc
## 14140                                                                                                                                                      ccp
## 14141                                                                                                                                                    cedar
## 14142                                                                                                                                                  ceguera
## 14143                                                                                                                                              celebrating
## 14144                                                                                                                                             celebrations
## 14145                                                                                                                                                    celia
## 14146                                                                                                                                                   cellar
## 14147                                                                                                                                                 centered
## 14148                                                                                                                                              centralized
## 14149                                                                                                                                                  century
## 14150                                                                                                                                                      ceo
## 14151                                                                                                                                                 chairman
## 14152                                                                                                                                                     chan
## 14153                                                                                                                                                  chances
## 14154                                                                                                                                                 changing
## 14155                                                                                                                                               characters
## 14156                                                                                                                                               charleston
## 14157                                                                                                                                                  charlie
## 14158                                                                                                                                                 cheatham
## 14159                                                                                                                                                 checking
## 14160                                                                                                                                                   cheers
## 14161                                                                                                                                                   cheese
## 14162                                                                                                                                               cheesecake
## 14163                                                                                                                                                  chelsea
## 14164                                                                                                                                                    chess
## 14165                                                                                                                                                    chest
## 14166                                                                                                                                              chickenshit
## 14167                                                                                                                                                chickfila
## 14168                                                                                                                                                childrens
## 14169                                                                                                                                                childress
## 14170                                                                                                                                                   chills
## 14171                                                                                                                                                     chip
## 14172                                                                                                                                                    chip�
## 14173                                                                                                                                                chocolate
## 14174                                                                                                                                                   choose
## 14175                                                                                                                                                    chris
## 14176                                                                                                                                                    chuck
## 14177                                                                                                                                                   circle
## 14178                                                                                                                                                  circuit
## 14179                                                                                                                                                     cite
## 14180                                                                                                                                                    civic
## 14181                                                                                                                                                  claimed
## 14182                                                                                                                                                  clarity
## 14183                                                                                                                                                    clark
## 14184                                                                                                                                                   clases
## 14185                                                                                                                                                classroom
## 14186                                                                                                                                                cleanings
## 14187                                                                                                                                                  cleared
## 14188                                                                                                                                                    clerk
## 14189                                                                                                                                                  clinton
## 14190                                                                                                                                                  closely
## 14191                                                                                                                                                  closest
## 14192                                                                                                                                                  clothes
## 14193                                                                                                                                                    cloud
## 14194                                                                                                                                                 coaching
## 14195                                                                                                                                                coalition
## 14196                                                                                                                                               coauthored
## 14197                                                                                                                                                  collins
## 14198                                                                                                                                                  colonel
## 14199                                                                                                                                                 colquitt
## 14200                                                                                                                                                     colt
## 14201                                                                                                                                                 combined
## 14202                                                                                                                                              comfortable
## 14203                                                                                                                                               commentary
## 14204                                                                                                                                                committed
## 14205                                                                                                                                             communicable
## 14206                                                                                                                                            communication
## 14207                                                                                                                                              comparisons
## 14208                                                                                                                                               compassion
## 14209                                                                                                                                             compensation
## 14210                                                                                                                                              competition
## 14211                                                                                                                                                 complain
## 14212                                                                                                                                               complaints
## 14213                                                                                                                                               completion
## 14214                                                                                                                                                complying
## 14215                                                                                                                                                  compton
## 14216                                                                                                                                                  concert
## 14217                                                                                                                                                concludes
## 14218                                                                                                                                               conclusion
## 14219                                                                                                                                              concomitant
## 14220                                                                                                                                                condici�n
## 14221                                                                                                                                             conditioning
## 14222                                                                                                                                                conducted
## 14223                                                                                                                                               conducting
## 14224                                                                                                                                                 confirms
## 14225                                                                                                                                                 confront
## 14226                                                                                                                                                confusing
## 14227                                                                                                                                               congregate
## 14228                                                                                                                                           congresspeople
## 14229                                                                                                                                            congresswoman
## 14230                                                                                                                                                  connect
## 14231                                                                                                                                                  consent
## 14232                                                                                                                                             conservative
## 14233                                                                                                                                            conservatives
## 14234                                                                                                                                           considerations
## 14235                                                                                                                                             conspiraci�n
## 14236                                                                                                                                               constantly
## 14237                                                                                                                                                consumers
## 14238                                                                                                                                                     cont
## 14239                                                                                                                                                 contagio
## 14240                                                                                                                                              continually
## 14241                                                                                                                                               continuous
## 14242                                                                                                                                              contractors
## 14243                                                                                                                                             contributors
## 14244                                                                                                                                                convinced
## 14245                                                                                                                                             coordination
## 14246                                                                                                                                              coordinator
## 14247                                                                                                                                                     cope
## 14248                                                                                                                                                     cops
## 14249                                                                                                                                             coronavirus�
## 14250                                                                                                                                              coronivirus
## 14251                                                                                                                                             corporations
## 14252                                                                                                                                               correction
## 14253                                                                                                                                                cosplayer
## 14254                                                                                                                                                  cottage
## 14255                                                                                                                                                countdown
## 14256                                                                                                                                                 countess
## 14257                                                                                                                                               courageous
## 14258                                                                                                                                           covid19reserve
## 14259                                                                                                                                                 covid19s
## 14260                                                                                                                                          covid19sarscov2
## 14261                                                                                                                                             covidrelated
## 14262                                                                                                                                                   coward
## 14263                                                                                                                                                   cowboy
## 14264                                                                                                                                                 coworker
## 14265                                                                                                                                                    crank
## 14266                                                                                                                                                    crash
## 14267                                                                                                                                                  crazies
## 14268                                                                                                                                                   create
## 14269                                                                                                                                                 creating
## 14270                                                                                                                                               creativity
## 14271                                                                                                                                                  credits
## 14272                                                                                                                                                    creek
## 14273                                                                                                                                                     creo
## 14274                                                                                                                                                  crimson
## 14275                                                                                                                                               critically
## 14276                                                                                                                                                    cruel
## 14277                                                                                                                                                   crying
## 14278                                                                                                                                                 cr�ticas
## 14279                                                                                                                                                     cult
## 14280                                                                                                                                                    cured
## 14281                                                                                                                                                  custody
## 14282                                                                                                                                                       cv
## 14283                                                                                                                                                     cv19
## 14284                                                                                                                                                    cyber
## 14285                                                                                                                                                     czar
## 14286                                                                                                                                                       d3
## 14287                                                                                                                                                     dads
## 14288                                                                                                                                                  damages
## 14289                                                                                                                                                     dame
## 14290                                                                                                                                                   damned
## 14291                                                                                                                                                     dana
## 14292                                                                                                                                                  dangers
## 14293                                                                                                                                                  darkest
## 14294                                                                                                                                                 daysweek
## 14295                                                                                                                                                     deaf
## 14296                                                                                                                                                     debe
## 14297                                                                                                                                                   debido
## 14298                                                                                                                                              decarcerate
## 14299                                                                                                                                                 declared
## 14300                                                                                                                                                decreased
## 14301                                                                                                                                                dedicated
## 14302                                                                                                                                               dedication
## 14303                                                                                                                                                      dee
## 14304                                                                                                                                                 defeated
## 14305                                                                                                                                                defeating
## 14306                                                                                                                                                defending
## 14307                                                                                                                                                  deficit
## 14308                                                                                                                                                   dekalb
## 14309                                                                                                                                               deliveries
## 14310                                                                                                                                                      dem
## 14311                                                                                                                                                  demands
## 14312                                                                                                                                                   demise
## 14313                                                                                                                                              demographic
## 14314                                                                                                                                                     dems
## 14315                                                                                                                                                   denies
## 14316                                                                                                                                                   denver
## 14317                                                                                                                                                     deny
## 14318                                                                                                                                                   deploy
## 14319                                                                                                                                                 deployed
## 14320                                                                                                                                                 depraved
## 14321                                                                                                                                               depressing
## 14322                                                                                                                                                    depth
## 14323                                                                                                                                              description
## 14324                                                                                                                                                 deserves
## 14325                                                                                                                                                   design
## 14326                                                                                                                                                 designed
## 14327                                                                                                                                                     desk
## 14328                                                                                                                                                    desks
## 14329                                                                                                                                                   desoto
## 14330                                                                                                                                                  despair
## 14331                                                                                                                                              destination
## 14332                                                                                                                                               destroying
## 14333                                                                                                                                              destruction
## 14334                                                                                                                                                 detained
## 14335                                                                                                                                                determine
## 14336                                                                                                                                               determined
## 14337                                                                                                                                                  devices
## 14338                                                                                                                                                  devonta
## 14339                                                                                                                                                       di
## 14340                                                                                                                                                     dial
## 14341                                                                                                                                                 dialysis
## 14342                                                                                                                                                   diaper
## 14343                                                                                                                                                  diarios
## 14344                                                                                                                                                 diarrhea
## 14345                                                                                                                                                    dicen
## 14346                                                                                                                                             dictatorship
## 14347                                                                                                                                            differentiate
## 14348                                                                                                                                             difficulties
## 14349                                                                                                                                                  dif�cil
## 14350                                                                                                                                                  digital
## 14351                                                                                                                                                  dignity
## 14352                                                                                                                                                 diminish
## 14353                                                                                                                                                      din
## 14354                                                                                                                                                    diner
## 14355                                                                                                                                                      dio
## 14356                                                                                                                                                     dion
## 14357                                                                                                                                                      dir
## 14358                                                                                                                                                     dire
## 14359                                                                                                                                                 directed
## 14360                                                                                                                                                 disagree
## 14361                                                                                                                                                disappear
## 14362                                                                                                                                              disappeared
## 14363                                                                                                                                               disastrous
## 14364                                                                                                                                                disciples
## 14365                                                                                                                                                 disclose
## 14366                                                                                                                                              disclosures
## 14367                                                                                                                                              discoveries
## 14368                                                                                                                                             discriminate
## 14369                                                                                                                                                discusses
## 14370                                                                                                                                               discussing
## 14371                                                                                                                                                 disgrace
## 14372                                                                                                                                             disinfecting
## 14373                                                                                                                                                  dislike
## 14374                                                                                                                                                   disney
## 14375                                                                                                                                                disparity
## 14376                                                                                                                                             dispensation
## 14377                                                                                                                                                 disputed
## 14378                                                                                                                                                disregard
## 14379                                                                                                                                               disrespect
## 14380                                                                                                                                               disruptive
## 14381                                                                                                                                              distinguish
## 14382                                                                                                                                              distraction
## 14383                                                                                                                                               district�s
## 14384                                                                                                                                                   divide
## 14385                                                                                                                                                  divided
## 14386                                                                                                                                                  divides
## 14387                                                                                                                                                      djs
## 14388                                                                                                                                                      dmc
## 14389                                                                                                                                                 docentes
## 14390                                                                                                                                                      dod
## 14391                                                                                                                                                  dogging
## 14392                                                                                                                                                      doh
## 14393                                                                                                                                                    donor
## 14394                                                                                                                                              dormitories
## 14395                                                                                                                                                      dos
## 14396                                                                                                                                                    dosis
## 14397                                                                                                                                                 doubling
## 14398                                                                                                                                                   doubts
## 14399                                                                                                                                                 download
## 14400                                                                                                                                               downplayed
## 14401                                                                                                                                                      do�
## 14402                                                                                                                                                 draining
## 14403                                                                                                                                             dramatically
## 14404                                                                                                                                              drastically
## 14405                                                                                                                                                     draw
## 14406                                                                                                                                                    draws
## 14407                                                                                                                                                  dreaded
## 14408                                                                                                                                                   drexel
## 14409                                                                                                                                                  drivers
## 14410                                                                                                                                                 driveway
## 14411                                                                                                                                                  driving
## 14412                                                                                                                                                    drove
## 14413                                                                                                                                                      drs
## 14414                                                                                                                                                     dshs
## 14415                                                                                                                                                    ducey
## 14416                                                                                                                                                      duh
## 14417                                                                                                                                                      dum
## 14418                                                                                                                                                 duration
## 14419                                                                                                                                                     dust
## 14420                                                                                                                                                    duval
## 14421                                                                                                                                                     dyer
## 14422                                                                                                                                                    eager
## 14423                                                                                                                                                      ear
## 14424                                                                                                                                                 earliest
## 14425                                                                                                                                                   easily
## 14426                                                                                                                                                    ebron
## 14427                                                                                                                                                 econom�a
## 14428                                                                                                                                                   edmond
## 14429                                                                                                                                              educational
## 14430                                                                                                                                                       ee
## 14431                                                                                                                                                     eeuu
## 14432                                                                                                                                                 efectiva
## 14433                                                                                                                                               efficiency
## 14434                                                                                                                                                 eficacia
## 14435                                                                                                                                                    elect
## 14436                                                                                                                                                eliminate
## 14437                                                                                                                                              elimination
## 14438                                                                                                                                            embarrassment
## 14439                                                                                                                                                 emotions
## 14440                                                                                                                                                  empathy
## 14441                                                                                                                                                 employer
## 14442                                                                                                                                                     emts
## 14443                                                                                                                                              encouraging
## 14444                                                                                                                                             enfermedades
## 14445                                                                                                                                                 entering
## 14446                                                                                                                                                entertain
## 14447                                                                                                                                                      eoc
## 14448                                                                                                                                          epidemiologists
## 14449                                                                                                                                                 episodes
## 14450                                                                                                                                                   equals
## 14451                                                                                                                                                eradicate
## 14452                                                                                                                                               esenciales
## 14453                                                                                                                                                  espa�ol
## 14454                                                                                                                                                     espn
## 14455                                                                                                                                               essentials
## 14456                                                                                                                                                      est
## 14457                                                                                                                                                  estable
## 14458                                                                                                                                                   estate
## 14459                                                                                                                                                estimates
## 14460                                                                                                                                                     esto
## 14461                                                                                                                                                  ethical
## 14462                                                                                                                                                       eu
## 14463                                                                                                                                                    evade
## 14464                                                                                                                                               eventbrite
## 14465                                                                                                                                                 everyday
## 14466                                                                                                                                              exacerbated
## 14467                                                                                                                                                  excuses
## 14468                                                                                                                                                execution
## 14469                                                                                                                                                 existing
## 14470                                                                                                                                                  expense
## 14471                                                                                                                                               experiment
## 14472                                                                                                                                             experimental
## 14473                                                                                                                                                   expert
## 14474                                                                                                                                                explosive
## 14475                                                                                                                                                   expose
## 14476                                                                                                                                                  express
## 14477                                                                                                                                                expressed
## 14478                                                                                                                                               expressing
## 14479                                                                                                                                                extending
## 14480                                                                                                                                                extensive
## 14481                                                                                                                                                   extent
## 14482                                                                                                                                               extremists
## 14483                                                                                                                                              facilities�
## 14484                                                                                                                                                  factory
## 14485                                                                                                                                                  factual
## 14486                                                                                                                                                  failing
## 14487                                                                                                                                                    fails
## 14488                                                                                                                                              fairgrounds
## 14489                                                                                                                                                  falsely
## 14490                                                                                                                                                      fam
## 14491                                                                                                                                                 familiar
## 14492                                                                                                                                               familiares
## 14493                                                                                                                                                  fascist
## 14494                                                                                                                                                    fatal
## 14495                                                                                                                                               fatalities
## 14496                                                                                                                                                      fbi
## 14497                                                                                                                                                  fearful
## 14498                                                                                                                                                featuring
## 14499                                                                                                                                                      fee
## 14500                                                                                                                                                  feeding
## 14501                                                                                                                                                     fees
## 14502                                                                                                                                                     fema
## 14503                                                                                                                                                      fil
## 14504                                                                                                                                                  filling
## 14505                                                                                                                                                     film
## 14506                                                                                                                                                  finance
## 14507                                                                                                                                                 finances
## 14508                                                                                                                                                 findings
## 14509                                                                                                                                                   finger
## 14510                                                                                                                                                   finish
## 14511                                                                                                                                                  finland
## 14512                                                                                                                                                    fires
## 14513                                                                                                                                                     firm
## 14514                                                                                                                                                      fla
## 14515                                                                                                                                               flattening
## 14516                                                                                                                                                flaunting
## 14517                                                                                                                                                   flavor
## 14518                                                                                                                                                   flawed
## 14519                                                                                                                                                  flights
## 14520                                                                                                                                                    flood
## 14521                                                                                                                                                   floors
## 14522                                                                                                                                                      fly
## 14523                                                                                                                                                     fool
## 14524                                                                                                                                              foreclosure
## 14525                                                                                                                                                  forgive
## 14526                                                                                                                                              forgiveness
## 14527                                                                                                                                                forgotten
## 14528                                                                                                                                                    forma
## 14529                                                                                                                                                   formal
## 14530                                                                                                                                                 formally
## 14531                                                                                                                                                    forms
## 14532                                                                                                                                                     foul
## 14533                                                                                                                                               foundation
## 14534                                                                                                                                                  founder
## 14535                                                                                                                                                      fox
## 14536                                                                                                                                                       fr
## 14537                                                                                                                                                     fred
## 14538                                                                                                                                                   freddy
## 14539                                                                                                                                                   freely
## 14540                                                                                                                                                  freezer
## 14541                                                                                                                                                      fri
## 14542                                                                                                                                               frontlines
## 14543                                                                                                                                                   frozen
## 14544                                                                                                                                                    fruit
## 14545                                                                                                                                              fundamental
## 14546                                                                                                                                               furloughed
## 14547                                                                                                                                                      fwd
## 14548                                                                                                                                                      fyi
## 14549                                                                                                                                                  gahanna
## 14550                                                                                                                                                   gaiter
## 14551                                                                                                                                                 gallatin
## 14552                                                                                                                                                      gap
## 14553                                                                                                                                                   garc�a
## 14554                                                                                                                                                  gateway
## 14555                                                                                                                                                 gathered
## 14556                                                                                                                                                      gay
## 14557                                                                                                                                                     gays
## 14558                                                                                                                                                   gender
## 14559                                                                                                                                                     gene
## 14560                                                                                                                                               generation
## 14561                                                                                                                                                    genes
## 14562                                                                                                                                                genocidal
## 14563                                                                                                                                                  gentler
## 14564                                                                                                                                                genuinely
## 14565                                                                                                                                               germantown
## 14566                                                                                                                                                    germs
## 14567                                                                                                                                                      gig
## 14568                                                                                                                                                     gila
## 14569                                                                                                                                                      gin
## 14570                                                                                                                                                 globally
## 14571                                                                                                                                                  goahead
## 14572                                                                                                                                                 gobierno
## 14573                                                                                                                                                    god�s
## 14574                                                                                                                                                     gold
## 14575                                                                                                                                                   goleta
## 14576                                                                                                                                                 gorgeous
## 14577                                                                                                                                                 graduate
## 14578                                                                                                                                                 grainger
## 14579                                                                                                                                             grandparents
## 14580                                                                                                                                                  graphic
## 14581                                                                                                                                                gratitude
## 14582                                                                                                                                                    grave
## 14583                                                                                                                                                graveyard
## 14584                                                                                                                                                  greatly
## 14585                                                                                                                                                   greedy
## 14586                                                                                                                                                     grew
## 14587                                                                                                                                                    grief
## 14588                                                                                                                                                 grieving
## 14589                                                                                                                                                   growth
## 14590                                                                                                                                                    guest
## 14591                                                                                                                                                    guide
## 14592                                                                                                                                     guidelinesespecially
## 14593                                                                                                                                                      gut
## 14594                                                                                                                                                     guy�
## 14595                                                                                                                                                     gyms
## 14596                                                                                                                                                    hacia
## 14597                                                                                                                                                    haden
## 14598                                                                                                                                                   hadn�t
## 14599                                                                                                                                                halfdoses
## 14600                                                                                                                                                     hall
## 14601                                                                                                                                                    halls
## 14602                                                                                                                                                 hamilton
## 14603                                                                                                                                                  handing
## 14604                                                                                                                                                 hardship
## 14605                                                                                                                                                 hartford
## 14606                                                                                                                                                  hateful
## 14607                                                                                                                                                   haters
## 14608                                                                                                                                                    hates
## 14609                                                                                                                                                   hatred
## 14610                                                                                                                                                   hawley
## 14611                                                                                                                                                     haya
## 14612                                                                                                                                                      hcw
## 14613                                                                                                                                                 headache
## 14614                                                                                                                                                 headline
## 14615                                                                                                                                                headlines
## 14616                                                                                                                                                   healed
## 14617                                                                                                                                            heartbreaking
## 14618                                                                                                                                               heartening
## 14619                                                                                                                                                heartfelt
## 14620                                                                                                                                                heartless
## 14621                                                                                                                                                   heated
## 14622                                                                                                                                                   heaven
## 14623                                                                                                                                                     helm
## 14624                                                                                                                                                  helpful
## 14625                                                                                                                                                   hiding
## 14626                                                                                                                                              highlighted
## 14627                                                                                                                                             highlighting
## 14628                                                                                                                                                 highrisk
## 14629                                                                                                                                                    highs
## 14630                                                                                                                                                hilarious
## 14631                                                                                                                                                    hills
## 14632                                                                                                                                                 historia
## 14633                                                                                                                                                 historic
## 14634                                                                                                                                               historical
## 14635                                                                                                                                             historically
## 14636                                                                                                                                                  hitting
## 14637                                                                                                                                                      hiv
## 14638                                                                                                                                                     hmmm
## 14639                                                                                                                                                    hogan
## 14640                                                                                                                                                     hole
## 14641                                                                                                                                             homelessness
## 14642                                                                                                                                               homeowners
## 14643                                                                                                                                             homes300000+
## 14644                                                                                                                                                homicides
## 14645                                                                                                                                                  hopeful
## 14646                                                                                                                                                     hora
## 14647                                                                                                                                                    horas
## 14648                                                                                                                                                   horror
## 14649                                                                                                                                                hospitais
## 14650                                                                                                                                               hospitales
## 14651                                                                                                                                            hospitalizado
## 14652                                                                                                                                                   hosted
## 14653                                                                                                                                                  hotline
## 14654                                                                                                                                                  hotspot
## 14655                                                                                                                                                 hotspots
## 14656                                                                                                                                               households
## 14657                                                                                                                                              houstonarea
## 14658                                                                                                                                                   howard
## 14659                                                                                                                                  https://t.co/07wrhmnfiw
## 14660                                                                                                                                  https://t.co/0qldnyskwl
## 14661                                                                                                                                  https://t.co/3aeobuykq7
## 14662                                                                                                                                  https://t.co/3jtpymy4hy
## 14663                                                                                                                                  https://t.co/4ikxsl101t
## 14664                                                                                                                                  https://t.co/4regwnq3ye
## 14665                                                                                                                                  https://t.co/5qdmxchpcn
## 14666                                                                                                                                  https://t.co/7mw7eyzvhx
## 14667                                                                                                                                  https://t.co/7tnefkffla
## 14668                                                                                                                                  https://t.co/8oumctpnmf
## 14669                                                                                                                                  https://t.co/bdwdq40sid
## 14670                                                                                                                                  https://t.co/bkho5tdeuf
## 14671                                                                                                                                  https://t.co/c3opapn6qe
## 14672                                                                                                                                  https://t.co/chfkwt8gby
## 14673                                                                                                                                  https://t.co/chmvoqbty8
## 14674                                                                                                                                  https://t.co/csbq0ccftg
## 14675                                                                                                                                  https://t.co/dfstrhne7e
## 14676                                                                                                                                  https://t.co/j7cdho3kva
## 14677                                                                                                                                  https://t.co/kirxofk5fk
## 14678                                                                                                                                  https://t.co/lp474blurx
## 14679                                                                                                                                  https://t.co/lptbwhxtpj
## 14680                                                                                                                                  https://t.co/mtgbe2wbo4
## 14681                                                                                                                                  https://t.co/ndzooic3da
## 14682                                                                                                                                  https://t.co/nwpridlu8d
## 14683                                                                                                                                  https://t.co/oyi4zsenli
## 14684                                                                                                                                  https://t.co/pt7jceyypt
## 14685                                                                                                                                  https://t.co/qkcre7v01c
## 14686                                                                                                                                  https://t.co/r22cciohq0
## 14687                                                                                                                                  https://t.co/tgyni2edaj
## 14688                                                                                                                                  https://t.co/tma038mwei
## 14689                                                                                                                                  https://t.co/vwkvmau8gi
## 14690                                                                                                                                  https://t.co/wdzi2b683u
## 14691                                                                                                                                  https://t.co/wf3iigncpj
## 14692                                                                                                                                  https://t.co/wkxal78qka
## 14693                                                                                                                                  https://t.co/wzfzw9pdrm
## 14694                                                                                                                                  https://t.co/x3dh4ghmag
## 14695                                                                                                                                  https://t.co/z45nmhglou
## 14696                                                                                                                                                      hub
## 14697                                                                                                                                                     hubs
## 14698                                                                                                                                              humiliating
## 14699                                                                                                                                                  hundred
## 14700                                                                                                                                                   hunter
## 14701                                                                                                                                                hurricane
## 14702                                                                                                                                                    hyper
## 14703                                                                                                                                                      ice
## 14704                                                                                                                                                   iconic
## 14705                                                                                                                                                    ideas
## 14706                                                                                                                                                ignorance
## 14707                                                                                                                                                       ii
## 14708                                                                                                                                                      iii
## 14709                                                                                                                                                  illegal
## 14710                                                                                                                                                   images
## 14711                                                                                                                                                 imagined
## 14712                                                                                                                                                     imma
## 14713                                                                                                                                            immunizations
## 14714                                                                                                                                                impacting
## 14715                                                                                                                                                 imperial
## 14716                                                                                                                                                implanted
## 14717                                                                                                                                                  imposed
## 14718                                                                                                                                                 improved
## 14719                                                                                                                                                improving
## 14720                                                                                                                                                 inaction
## 14721                                                                                                                                            incarceration
## 14722                                                                                                                                                 inclined
## 14723                                                                                                                                                 included
## 14724                                                                                                                                                  incluye
## 14725                                                                                                                                               incluyendo
## 14726                                                                                                                                            inconvenience
## 14727                                                                                                                                                increases
## 14728                                                                                                                                             increasingly
## 14729                                                                                                                                               indicators
## 14730                                                                                                                                             individuals�
## 14731                                                                                                                                                  indoors
## 14732                                                                                                                                               industryit
## 14733                                                                                                                                               ineptitude
## 14734                                                                                                                                               inequality
## 14735                                                                                                                                                   infamy
## 14736                                                                                                                                                influence
## 14737                                                                                                                                              informaci�n
## 14738                                                                                                                                                 infusion
## 14739                                                                                                                                               ingredient
## 14740                                                                                                                                               inherently
## 14741                                                                                                                                                 injected
## 14742                                                                                                                                                   injury
## 14743                                                                                                                                                injustice
## 14744                                                                                                                                                 innocent
## 14745                                                                                                                                                inoculate
## 14746                                                                                                                                               inoculated
## 14747                                                                                                                                              inoculation
## 14748                                                                                                                                                  inquire
## 14749                                                                                                                                               insecurity
## 14750                                                                                                                                              insensitive
## 14751                                                                                                                                               insightful
## 14752                                                                                                                                                 insolent
## 14753                                                                                                                                              inspiration
## 14754                                                                                                                                                inspiring
## 14755                                                                                                                                                installed
## 14756                                                                                                                                             institutions
## 14757                                                                                                                                                intensive
## 14758                                                                                                                                              interviewed
## 14759                                                                                                                                               introduces
## 14760                                                                                                                                                  invaded
## 14761                                                                                                                                                inventory
## 14762                                                                                                                                            investigating
## 14763                                                                                                                                           investigations
## 14764                                                                                                                                                investing
## 14765                                                                                                                                               investment
## 14766                                                                                                                                               invincible
## 14767                                                                                                                                                invisible
## 14768                                                                                                                                               invitation
## 14769                                                                                                                                                 inviting
## 14770                                                                                                                                                   invoke
## 14771                                                                                                                                              involvement
## 14772                                                                                                                                                involving
## 14773                                                                                                                                                      irs
## 14774                                                                                                                                                  isolate
## 14775                                                                                                                                                  israeli
## 14776                                                                                                                                                    items
## 14777                                                                                                                                                      it�
## 14778                                                                                                                                                     jack
## 14779                                                                                                                                                    japan
## 14780                                                                                                                                                    jarod
## 14781                                                                                                                                                jefferson
## 14782                                                                                                                                                  jeffrey
## 14783                                                                                                                                                   jerome
## 14784                                                                                                                                                    jerry
## 14785                                                                                                                                                  jessica
## 14786                                                                                                                                                     jill
## 14787                                                                                                                                                    jokes
## 14788                                                                                                                                                   jordan
## 14789                                                                                                                                                  jornada
## 14790                                                                                                                                                     joya
## 14791                                                                                                                                                     juan
## 14792                                                                                                                                                  judging
## 14793                                                                                                                                                      jus
## 14794                                                                                                                                                  justify
## 14795                                                                                                                                                       jv
## 14796                                                                                                                                                      k12
## 14797                                                                                                                                                   kansas
## 14798                                                                                                                                                    karen
## 14799                                                                                                                                                    karma
## 14800                                                                                                                                                      kid
## 14801                                                                                                                                                  kidding
## 14802                                                                                                                                                     kiki
## 14803                                                                                                                                                   kindly
## 14804                                                                                                                                                 kindness
## 14805                                                                                                                                                    kings
## 14806                                                                                                                                                  knocked
## 14807                                                                                                                                                knowingly
## 14808                                                                                                                                                    korea
## 14809                                                                                                                                                   kristi
## 14810                                                                                                                                                    kroft
## 14811                                                                                                                                                       ks
## 14812                                                                                                                                                    kudos
## 14813                                                                                                                                                  kushner
## 14814                                                                                                                                                    lacks
## 14815                                                                                                                                                     laid
## 14816                                                                                                                                                     lame
## 14817                                                                                                                                               lamentable
## 14818                                                                                                                                          lamentablemente
## 14819                                                                                                                                                   lamont
## 14820                                                                                                                                                 language
## 14821                                                                                                                                                   lasted
## 14822                                                                                                                                                   latinx
## 14823                                                                                                                                                    laugh
## 14824                                                                                                                                                 laughing
## 14825                                                                                                                                                   launch
## 14826                                                                                                                                                 launched
## 14827                                                                                                                                                 lawrence
## 14828                                                                                                                                                   lawrie
## 14829                                                                                                                                                  layoffs
## 14830                                                                                                                                                  leaving
## 14831                                                                                                                                                    left�
## 14832                                                                                                                                               legitimate
## 14833                                                                                                                                                      leo
## 14834                                                                                                                                                   lessen
## 14835                                                                                                                                                   lesson
## 14836                                                                                                                                                    letal
## 14837                                                                                                                                                lethality
## 14838                                                                                                                                                  letting
## 14839                                                                                                                                                   levine
## 14840                                                                                                                                                lexington
## 14841                                                                                                                                                 liberals
## 14842                                                                                                                                                  liberty
## 14843                                                                                                                                                lice�drug
## 14844                                                                                                                                                lifedeath
## 14845                                                                                                                                                 lifesite
## 14846                                                                                                                                                      lil
## 14847                                                                                                                                                   limits
## 14848                                                                                                                                                   linked
## 14849                                                                                                                                                   liquor
## 14850                                                                                                                                                    list�
## 14851                                                                                                                                                  literal
## 14852                                                                                                                                                    lived
## 14853                                                                                                                                                livestock
## 14854                                                                                                                                                    lizze
## 14855                                                                                                                                                     load
## 14856                                                                                                                                                    loads
## 14857                                                                                                                                                     loan
## 14858                                                                                                                                                  locally
## 14859                                                                                                                                                   locals
## 14860                                                                                                                                                  lodging
## 14861                                                                                                                                                    logan
## 14862                                                                                                                                                   looney
## 14863                                                                                                                                                   lorain
## 14864                                                                                                                                                  lottery
## 14865                                                                                                                                                     loud
## 14866                                                                                                                                                 lowering
## 14867                                                                                                                                                    loyal
## 14868                                                                                                                                                lunchtime
## 14869                                                                                                                                                     lyin
## 14870                                                                                                                                                  machine
## 14871                                                                                                                                                 magazine
## 14872                                                                                                                                                magically
## 14873                                                                                                                                                    magos
## 14874                                                                                                                                              maintaining
## 14875                                                                                                                                                   makeup
## 14876                                                                                                                                                  managed
## 14877                                                                                                                                                  manager
## 14878                                                                                                                                             manipulating
## 14879                                                                                                                                            manufacturing
## 14880                                                                                                                                                marketing
## 14881                                                                                                                                                   martin
## 14882                                                                                                                                              mascarillas
## 14883                                                                                                                                         mask<u+0001f637>
## 14884                                                                                                                                                 masslive
## 14885                                                                                                                                                  matches
## 14886                                                                                                                                                  matchup
## 14887                                                                                                                                                     math
## 14888                                                                                                                                                     matt
## 14889                                                                                                                                                      max
## 14890                                                                                                                                                  maximum
## 14891                                                                                                                                                    mccoy
## 14892                                                                                                                                                    mckay
## 14893                                                                                                                                                 mcknight
## 14894                                                                                                                                                   mclean
## 14895                                                                                                                                                  meaning
## 14896                                                                                                                                                    meant
## 14897                                                                                                                                              mecklenburg
## 14898                                                                                                                                                  medidas
## 14899                                                                                                                                                 meetings
## 14900                                                                                                                                                     mega
## 14901                                                                                                                                                 megasite
## 14902                                                                                                                                                    mejor
## 14903                                                                                                                                                 memorial
## 14904                                                                                                                                                    menos
## 14905                                                                                                                                                   merger
## 14906                                                                                                                                                  methods
## 14907                                                                                                                                                  metrics
## 14908                                                                                                                                                    metro
## 14909                                                                                                                                                mexicanos
## 14910                                                                                                                                                  mexicos
## 14911                                                                                                                                                  michael
## 14912                                                                                                                                                      mid
## 14913                                                                                                                                                  mienten
## 14914                                                                                                                                                 mientras
## 14915                                                                                                                                                   milton
## 14916                                                                                                                                              minneapolis
## 14917                                                                                                                                                      mis
## 14918                                                                                                                                                    misma
## 14919                                                                                                                                                    mismo
## 14920                                                                                                                                                   mismos
## 14921                                                                                                                                                  mission
## 14922                                                                                                                                                 mitigate
## 14923                                                                                                                                                     mitt
## 14924                                                                                                                                                      mix
## 14925                                                                                                                                                   mixing
## 14926                                                                                                                                                       mn
## 14927                                                                                                                                                       mo
## 14928                                                                                                                                                      mob
## 14929                                                                                                                                                   models
## 14930                                                                                                                                                 modified
## 14931                                                                                                                                                      mon
## 14932                                                                                                                                                     moon
## 14933                                                                                                                                                    moore
## 14934                                                                                                                                                morbidity
## 14935                                                                                                                                                    mount
## 14936                                                                                                                                                    mourn
## 14937                                                                                                                                                 movement
## 14938                                                                                                                                                       ms
## 14939                                                                                                                                                      msc
## 14940                                                                                                                                                    msnbc
## 14941                                                                                                                                                       mt
## 14942                                                                                                                                                    mucus
## 14943                                                                                                                                                  muestra
## 14944                                                                                                                                                 mulvaney
## 14945                                                                                                                                                    mundo
## 14946                                                                                                                                                   muscle
## 14947                                                                                                                                                musicians
## 14948                                                                                                                                                   mutate
## 14949                                                                                                                                                 mutating
## 14950                                                                                                                                               mutswangwa
## 14951                                                                                                                                                    myers
## 14952                                                                                                                                                  mystery
## 14953                                                                                                                                                   m�dica
## 14954                                                                                                                                                 m�scaras
## 14955                                                                                                                                                   m�xico
## 14956                                                                                                                                                    nadie
## 14957                                                                                                                                                      nah
## 14958                                                                                                                                                   nandin
## 14959                                                                                                                                                     napa
## 14960                                                                                                                                                   naples
## 14961                                                                                                                                                naturally
## 14962                                                                                                                                                 navigate
## 14963                                                                                                                                                       ne
## 14964                                                                                                                                                   nearby
## 14965                                                                                                                                                 needless
## 14966                                                                                                                                               needlessly
## 14967                                                                                                                                                  neglect
## 14968                                                                                                                                                negligent
## 14969                                                                                                                                               neighbours
## 14970                                                                                                                                                    nerve
## 14971                                                                                                                                                  netflix
## 14972                                                                                                                                                   nevada
## 14973                                                                                                                                                       nh
## 14974                                                                                                                                                      nhs
## 14975                                                                                                                                                       ni
## 14976                                                                                                                                                     nick
## 14977                                                                                                                                                     nicu
## 14978                                                                                                                                                    niega
## 14979                                                                                                                                                   ning�n
## 14980                                                                                                                                                  nittany
## 14981                                                                                                                                                    ni�os
## 14982                                                                                                                                                   nocost
## 14983                                                                                                                                             nonalcoholic
## 14984                                                                                                                                             nonessential
## 14985                                                                                                                                                   nordic
## 14986                                                                                                                                                  northam
## 14987                                                                                                                                             northeastern
## 14988                                                                                                                                                  notable
## 14989                                                                                                                                                  notices
## 14990                                                                                                                                                 notified
## 14991                                                                                                                                                   noting
## 14992                                                                                                                                                    notre
## 14993                                                                                                                                                      nov
## 14994                                                                                                                                                      npi
## 14995                                                                                                                                                      npr
## 14996                                                                                                                                                      nsa
## 14997                                                                                                                                                       nt
## 14998                                                                                                                                                    nueva
## 14999                                                                                                                                                   nuevas
## 15000                                                                                                                                                nutrition
## 15001                                                                                                                                                 nycmayor
## 15002                                                                                                                                                     ny�s
## 15003                                                                                                                                                     oaks
## 15004                                                                                                                                                  obesity
## 15005                                                                                                                                                    obgyn
## 15006                                                                                                                                                   object
## 15007                                                                                                                                                objecting
## 15008                                                                                                                                                obnoxious
## 15009                                                                                                                                                observing
## 15010                                                                                                                                                       oc
## 15011                                                                                                                                                occupancy
## 15012                                                                                                                                                    occur
## 15013                                                                                                                                                occurring
## 15014                                                                                                                                                    ocean
## 15015                                                                                                                                                      oct
## 15016                                                                                                                                                   odessa
## 15017                                                                                                                                                  ohioans
## 15018                                                                                                                                                      ole
## 15019                                                                                                                                                 olivarez
## 15020                                                                                                                                                 olympics
## 15021                                                                                                                                                     onde
## 15022                                                                                                                                                   oneday
## 15023                                                                                                                                                   onsite
## 15024                                                                                                                                                   opener
## 15025                                                                                                                                                operation
## 15026                                                                                                                                                  opinion
## 15027                                                                                                                                                  options
## 15028                                                                                                                                               organizers
## 15029                                                                                                                                                  orlando
## 15030                                                                                                                                                       os
## 15031                                                                                                                                                     osha
## 15032                                                                                                                                                   ostman
## 15033                                                                                                                                                      osu
## 15034                                                                                                                                                     otra
## 15035                                                                                                                                          ourselvesothers
## 15036                                                                                                                                                  outlook
## 15037                                                                                                                                                outweighs
## 15038                                                                                                                                                   overly
## 15039                                                                                                                                                overnight
## 15040                                                                                                                                                  overrun
## 15041                                                                                                                                                overthrow
## 15042                                                                                                                                               overwhelms
## 15043                                                                                                                                                    owens
## 15044                                                                                                                                                    owned
## 15045                                                                                                                                                pacientes
## 15046                                                                                                                                                  pacific
## 15047                                                                                                                                                     pack
## 15048                                                                                                                                                    pain�
## 15049                                                                                                                                                     pair
## 15050                                                                                                                                               pandemic�s
## 15051                                                                                                                                                paramedic
## 15052                                                                                                                                               paramedics
## 15053                                                                                                                                                  pardons
## 15054                                                                                                                                            participating
## 15055                                                                                                                                              partnership
## 15056                                                                                                                                                  pasando
## 15057                                                                                                                                                 passport
## 15058                                                                                                                                                  pastors
## 15059                                                                                                                                                  patents
## 15060                                                                                                                                                     path
## 15061                                                                                                                                                patients�
## 15062                                                                                                                                                  patriot
## 15063                                                                                                                                                patronage
## 15064                                                                                                                                                  pattern
## 15065                                                                                                                                                    payer
## 15066                                                                                                                                                  payment
## 15067                                                                                                                                                   pa�ses
## 15068                                                                                                                                                       pb
## 15069                                                                                                                                                       pd
## 15070                                                                                                                                                       pe
## 15071                                                                                                                                                 peaceful
## 15072                                                                                                                                                   peaked
## 15073                                                                                                                                                    pedal
## 15074                                                                                                                                                  pedindo
## 15075                                                                                                                                                     ped�
## 15076                                                                                                                                                    peeps
## 15077                                                                                                                                                  penalty
## 15078                                                                                                                                                    pence
## 15079                                                                                                                                                perfectly
## 15080                                                                                                                                              performance
## 15081                                                                                                                                                    perks
## 15082                                                                                                                                                permanent
## 15083                                                                                                                                                persevere
## 15084                                                                                                                                                  persona
## 15085                                                                                                                                                 person�s
## 15086                                                                                                                                                      pet
## 15087                                                                                                                                                    petro
## 15088                                                                                                                                           pharmaceutical
## 15089                                                                                                                                                   phased
## 15090                                                                                                                                                      phd
## 15091                                                                                                                                               phenomenon
## 15092                                                                                                                                                   phrase
## 15093                                                                                                                                               physically
## 15094                                                                                                                                                physician
## 15095                                                                                                                                                  picking
## 15096                                                                                                                                                     pima
## 15097                                                                                                                                                    pinal
## 15098                                                                                                                                                     pine
## 15099                                                                                                                                                      pit
## 15100                                                                                                                                                    plain
## 15101                                                                                                                                                    plane
## 15102                                                                                                                                                  planned
## 15103                                                                                                                                                 platform
## 15104                                                                                                                                                  pleased
## 15105                                                                                                                                                 pleasure
## 15106                                                                                                                                                   plenty
## 15107                                                                                                                                                  podcast
## 15108                                                                                                                                                pointless
## 15109                                                                                                                                                   point�
## 15110                                                                                                                                               politician
## 15111                                                                                                                                              politicized
## 15112                                                                                                                                                  popping
## 15113                                                                                                                                                populated
## 15114                                                                                                                                                    popup
## 15115                                                                                                                                                 pornstar
## 15116                                                                                                                                                 portland
## 15117                                                                                                                                               portuguese
## 15118                                                                                                                                                     pose
## 15119                                                                                                                                                positions
## 15120                                                                                                                                              postcovid19
## 15121                                                                                                                                              postholiday
## 15122                                                                                                                                                      pot
## 15123                                                                                                                                                   pounds
## 15124                                                                                                                                                poynter�s
## 15125                                                                                                                                                       pr
## 15126                                                                                                                                                practical
## 15127                                                                                                                                                      pre
## 15128                                                                                                                                               precaution
## 15129                                                                                                                                            precautionary
## 15130                                                                                                                                                predicted
## 15131                                                                                                                                              preexisting
## 15132                                                                                                                                                   prefer
## 15133                                                                                                                                                  pregame
## 15134                                                                                                                                              prepandemic
## 15135                                                                                                                                                  prepare
## 15136                                                                                                                                              preregister
## 15137                                                                                                                                                     pres
## 15138                                                                                                                                             prescription
## 15139                                                                                                                                                 presence
## 15140                                                                                                                                             presentation
## 15141                                                                                                                                                  pressed
## 15142                                                                                                                                               pretending
## 15143                                                                                                                                               prevalence
## 15144                                                                                                                                              preventable
## 15145                                                                                                                                                  preview
## 15146                                                                                                                                               previously
## 15147                                                                                                                                                    price
## 15148                                                                                                                                                   primer
## 15149                                                                                                                                                  primera
## 15150                                                                                                                                                  primero
## 15151                                                                                                                                                principal
## 15152                                                                                                                                                prioridad
## 15153                                                                                                                                           prioritization
## 15154                                                                                                                                             prioritizing
## 15155                                                                                                                                                    prize
## 15156                                                                                                                                                  product
## 15157                                                                                                                                                 products
## 15158                                                                                                                                               profitting
## 15159                                                                                                                                             progressives
## 15160                                                                                                                                                 promised
## 15161                                                                                                                                                 promises
## 15162                                                                                                                                                promoting
## 15163                                                                                                                                                    proof
## 15164                                                                                                                                                   propia
## 15165                                                                                                                                                 proposal
## 15166                                                                                                                                                prosecute
## 15167                                                                                                                                                protected
## 15168                                                                                                                                               protective
## 15169                                                                                                                                               protesters
## 15170                                                                                                                                                 protrump
## 15171                                                                                                                                                  proudly
## 15172                                                                                                                                                   proves
## 15173                                                                                                                                               provisions
## 15174                                                                                                                                                proximity
## 15175                                                                                                                                                 proyecto
## 15176                                                                                                                                                       ps
## 15177                                                                                                                                               psychology
## 15178                                                                                                                                                 publican
## 15179                                                                                                                                                 publicly
## 15180                                                                                                                                                   pueblo
## 15181                                                                                                                                                   puerto
## 15182                                                                                                                                                  pulling
## 15183                                                                                                                                                    pulse
## 15184                                                                                                                                                 purchase
## 15185                                                                                                                                                 purposes
## 15186                                                                                                                                                   putnam
## 15187                                                                                                                                                       p�
## 15188                                                                                                                                            quarantineing
## 15189                                                                                                                                              quarantines
## 15190                                                                                                                                                    queda
## 15191                                                                                                                                                   quer�a
## 15192                                                                                                                                                    quien
## 15193                                                                                                                                                  quienes
## 15194                                                                                                                                                  quieres
## 15195                                                                                                                                                  quintet
## 15196                                                                                                                                                     quiz
## 15197                                                                                                                                                    quote
## 15198                                                                                                                                                   rachel
## 15199                                                                                                                                                   racial
## 15200                                                                                                                                             racialethnic
## 15201                                                                                                                                                   racing
## 15202                                                                                                                                                  racists
## 15203                                                                                                                                                  radical
## 15204                                                                                                                                                   raised
## 15205                                                                                                                                                   raises
## 15206                                                                                                                                                    ralph
## 15207                                                                                                                                                  rangers
## 15208                                                                                                                                                   ranked
## 15209                                                                                                                                                  rapidly
## 15210                                                                                                                                                   rapper
## 15211                                                                                                                                                   rarely
## 15212                                                                                                                                                  ratings
## 15213                                                                                                                                                      raw
## 15214                                                                                                                                                 reacting
## 15215                                                                                                                                                readiness
## 15216                                                                                                                                                 realidad
## 15217                                                                                                                                                 realized
## 15218                                                                                                                                                     rear
## 15219                                                                                                                                                  reasons
## 15220                                                                                                                                                  recibir
## 15221                                                                                                                                                recipient
## 15222                                                                                                                                                recommend
## 15223                                                                                                                                          recommendations
## 15224                                                                                                                                                 recovers
## 15225                                                                                                                                                  reduces
## 15226                                                                                                                                                  redwood
## 15227                                                                                                                                               reelection
## 15228                                                                                                                                                    refer
## 15229                                                                                                                                                reference
## 15230                                                                                                                                              referencing
## 15231                                                                                                                                               reflection
## 15232                                                                                                                                             refrigerator
## 15233                                                                                                                                                  regimen
## 15234                                                                                                                                                  regions
## 15235                                                                                                                                              registering
## 15236                                                                                                                                                   regret
## 15237                                                                                                                                                regulator
## 15238                                                                                                                                               regulators
## 15239                                                                                                                                                    rehab
## 15240                                                                                                                                              reinfection
## 15241                                                                                                                                                   relate
## 15242                                                                                                                                             relationship
## 15243                                                                                                                                                 relevant
## 15244                                                                                                                                                 relieved
## 15245                                                                                                                                               remarkable
## 15246                                                                                                                                               remdesivir
## 15247                                                                                                                                                 remedies
## 15248                                                                                                                                                   remedy
## 15249                                                                                                                                                remembers
## 15250                                                                                                                                              remembrance
## 15251                                                                                                                                                   remind
## 15252                                                                                                                                                    renew
## 15253                                                                                                                                                  renters
## 15254                                                                                                                                                 reopened
## 15255                                                                                                                                                reopening
## 15256                                                                                                                                           reorganization
## 15257                                                                                                                                              reparations
## 15258                                                                                                                                                   repeat
## 15259                                                                                                                                                 repelect
## 15260                                                                                                                                                 reportus
## 15261                                                                                                                                          representatives
## 15262                                                                                                                                               reputation
## 15263                                                                                                                                               reschedule
## 15264                                                                                                                                              researchers
## 15265                                                                                                                                                 reserved
## 15266                                                                                                                                              residential
## 15267                                                                                                                                                   resist
## 15268                                                                                                                                               respective
## 15269                                                                                                                                              respiratory
## 15270                                                                                                                                                responder
## 15271                                                                                                                                                responses
## 15272                                                                                                                                         responsibilities
## 15273                                                                                                                                                   resume
## 15274                                                                                                                                               retirement
## 15275                                                                                                                                                 returned
## 15276                                                                                                                                                  returns
## 15277                                                                                                                                                  retweet
## 15278                                                                                                                                                 retweets
## 15279                                                                                                                                                  revenue
## 15280                                                                                                                                                 reviewed
## 15281                                                                                                                                                  review�
## 15282                                                                                                                                                    reyes
## 15283                                                                                                                                                       ri
## 15284                                                                                                                                                     ribs
## 15285                                                                                                                                                   richer
## 15286                                                                                                                                               ridgefield
## 15287                                                                                                                                                   riding
## 15288                                                                                                                                               rightfully
## 15289                                                                                                                                                     ring
## 15290                                                                                                                                                    risen
## 15291                                                                                                                                                    risks
## 15292                                                                                                                                                   ritual
## 15293                                                                                                                                                riverpark
## 15294                                                                                                                                                riverside
## 15295                                                                                                                                                      rna
## 15296                                                                                                                                                 robinson
## 15297                                                                                                                                                     roma
## 15298                                                                                                                                                      ron
## 15299                                                                                                                                                   ronald
## 15300                                                                                                                                                   ronnie
## 15301                                                                                                                                                roommates
## 15302                                                                                                                                                     root
## 15303                                                                                                                                                   rooted
## 15304                                                                                                                                                  rooting
## 15305                                                                                                                                                    roque
## 15306                                                                                                                                                     rosa
## 15307                                                                                                                                                  roswell
## 15308                                                                                                                                                   rounds
## 15309                                                                                                                                                    route
## 15310                                                                                                                                                  routine
## 15311                                                                                                                                                    royal
## 15312                                                                                                                                                     rsvp
## 15313                                                                                                                                                    rtpcr
## 15314                                                                                                                                                     rude
## 15315                                                                                                                                                   ruined
## 15316                                                                                                                                                  ruining
## 15317                                                                                                                                                   runner
## 15318                                                                                                                                                   rushed
## 15319                                                                                                                                                   rushes
## 15320                                                                                                                                                  rushing
## 15321                                                                                                                                                       rx
## 15322                                                                                                                                                    saban
## 15323                                                                                                                                                    saber
## 15324                                                                                                                                                    salty
## 15325                                                                                                                                                sanitized
## 15326                                                                                                                                                 sarasota
## 15327                                                                                                                                                saturdays
## 15328                                                                                                                                                    scare
## 15329                                                                                                                                                  scarier
## 15330                                                                                                                                                scattered
## 15331                                                                                                                                                    scene
## 15332                                                                                                                                                schematic
## 15333                                                                                                                                                  schemes
## 15334                                                                                                                                                    scope
## 15335                                                                                                                                                 scotland
## 15336                                                                                                                                                    scout
## 15337                                                                                                                                                  screwed
## 15338                                                                                                                                                 screwing
## 15339                                                                                                                                                       sd
## 15340                                                                                                                                                  seafood
## 15341                                                                                                                                                     seal
## 15342                                                                                                                                                    seats
## 15343                                                                                                                                                  section
## 15344                                                                                                                                                   sector
## 15345                                                                                                                                                seditious
## 15346                                                                                                                                                  seeking
## 15347                                                                                                                                                 segments
## 15348                                                                                                                                                seguran�a
## 15349                                                                                                                                                seguridad
## 15350                                                                                                                                                 selected
## 15351                                                                                                                                                    sends
## 15352                                                                                                                                                sensation
## 15353                                                                                                                                                     ser�
## 15354                                                                                                                                                 severely
## 15355                                                                                                                                                      sex
## 15356                                                                                                                                                     sexy
## 15357                                                                                                                                                    se�or
## 15358                                                                                                                                                    shape
## 15359                                                                                                                                                    shark
## 15360                                                                                                                                                    sharp
## 15361                                                                                                                                                     shay
## 15362                                                                                                                                                    sheep
## 15363                                                                                                                                                    shelf
## 15364                                                                                                                                                  shelter
## 15365                                                                                                                                                  sherman
## 15366                                                                                                                                                   shield
## 15367                                                                                                                                                     ship
## 15368                                                                                                                                                 shipping
## 15369                                                                                                                                                   shitty
## 15370                                                                                                                                                 shocking
## 15371                                                                                                                                                shootings
## 15372                                                                                                                                                shortness
## 15373                                                                                                                                              shortnotice
## 15374                                                                                                                                                shoulders
## 15375                                                                                                                                                    shown
## 15376                                                                                                                                                   shrunk
## 15377                                                                                                                                                sidelined
## 15378                                                                                                                                                   signal
## 15379                                                                                                                                                   signup
## 15380                                                                                                                                                    sigue
## 15381                                                                                                                                                  silence
## 15382                                                                                                                                                   silver
## 15383                                                                                                                                                    sinai
## 15384                                                                                                                                                  sincere
## 15385                                                                                                                                                sincerely
## 15386                                                                                                                                                     sing
## 15387                                                                                                                                                singapore
## 15388                                                                                                                                                singleday
## 15389                                                                                                                                                     sink
## 15390                                                                                                                                                    sissy
## 15391                                                                                                                                                      sit
## 15392                                                                                                                                                  skeptic
## 15393                                                                                                                                                     skin
## 15394                                                                                                                                                     skip
## 15395                                                                                                                                                 skipping
## 15396                                                                                                                                                     slam
## 15397                                                                                                                                                   slaoui
## 15398                                                                                                                                                  slavery
## 15399                                                                                                                                                   sleeve
## 15400                                                                                                                                                  sleeves
## 15401                                                                                                                                                   slight
## 15402                                                                                                                                                 slightly
## 15403                                                                                                                                                  sluckis
## 15404                                                                                                                                                    smile
## 15405                                                                                                                                                      smu
## 15406                                                                                                                                                     snow
## 15407                                                                                                                                               snowflakes
## 15408                                                                                                                                                 socalled
## 15409                                                                                                                                                socialism
## 15410                                                                                                                                                socialist
## 15411                                                                                                                                                societies
## 15412                                                                                                                                                 soldiers
## 15413                                                                                                                                                    solid
## 15414                                                                                                                                                  solidly
## 15415                                                                                                                                                solutions
## 15416                                                                                                                                                      sow
## 15417                                                                                                                                                       sp
## 15418                                                                                                                                                    spare
## 15419                                                                                                                                                   speaks
## 15420                                                                                                                                               specialist
## 15421                                                                                                                                              specialized
## 15422                                                                                                                                               speechless
## 15423                                                                                                                                                 speeding
## 15424                                                                                                                                                   speeds
## 15425                                                                                                                                                    spell
## 15426                                                                                                                                                 spinning
## 15427                                                                                                                                                    spoil
## 15428                                                                                                                                                  sponsor
## 15429                                                                                                                                                    sport
## 15430                                                                                                                                                  spreads
## 15431                                                                                                                                                  springs
## 15432                                                                                                                                               squandered
## 15433                                                                                                                                                       sr
## 15434                                                                                                                                                    stacy
## 15435                                                                                                                                                   stages
## 15436                                                                                                                                                    stake
## 15437                                                                                                                                                    stall
## 15438                                                                                                                                                  startup
## 15439                                                                                                                                                 starving
## 15440                                                                                                                                                   stated
## 15441                                                                                                                                               statements
## 15442                                                                                                                                                 staterun
## 15443                                                                                                                                                  states�
## 15444                                                                                                                                                statewide
## 15445                                                                                                                                                 statista
## 15446                                                                                                                                                    stats
## 15447                                                                                                                                                 stemming
## 15448                                                                                                                                                  stepped
## 15449                                                                                                                                                   steven
## 15450                                                                                                                                                 sticking
## 15451                                                                                                                                                    stint
## 15452                                                                                                                                              stockbridge
## 15453                                                                                                                                                   stolen
## 15454                                                                                                                                               straighten
## 15455                                                                                                                                               strengthen
## 15456                                                                                                                                                 strictly
## 15457                                                                                                                                                    strip
## 15458                                                                                                                                                   stroke
## 15459                                                                                                                                                 strongly
## 15460                                                                                                                                                  studied
## 15461                                                                                                                                                 stunning
## 15462                                                                                                                                                    style
## 15463                                                                                                                                             subcutaneous
## 15464                                                                                                                                                 subjects
## 15465                                                                                                                                                  suburbs
## 15466                                                                                                                                             successfully
## 15467                                                                                                                                               sufficient
## 15468                                                                                                                                                  suggest
## 15469                                                                                                                                              suggestions
## 15470                                                                                                                                                    suits
## 15471                                                                                                                                                     sums
## 15472                                                                                                                                                 sunday�s
## 15473                                                                                                                                                sunflower
## 15474                                                                                                                                                 sunshine
## 15475                                                                                                                                              supermarket
## 15476                                                                                                                                               supervisor
## 15477                                                                                                                                                supporter
## 15478                                                                                                                                                  suppose
## 15479                                                                                                                                                   surges
## 15480                                                                                                                                                  surging
## 15481                                                                                                                                             surprisingly
## 15482                                                                                                                                              surrounding
## 15483                                                                                                                                                sustained
## 15484                                                                                                                                                     swab
## 15485                                                                                                                                                    sweep
## 15486                                                                                                                                                     swim
## 15487                                                                                                                                                 switched
## 15488                                                                                                                                              switzerland
## 15489                                                                                                                                                  symptom
## 15490                                                                                                                                                 syndrome
## 15491                                                                                                                                                 system�s
## 15492                                                                                                                                                     s�lo
## 15493                                                                                                                                                  tactics
## 15494                                                                                                                                                   talent
## 15495                                                                                                                                                    talks
## 15496                                                                                                                                                     tame
## 15497                                                                                                                                                   tantas
## 15498                                                                                                                                                  tapping
## 15499                                                                                                                                                  targets
## 15500                                                                                                                                                      tds
## 15501                                                                                                                                                 teaching
## 15502                                                                                                                                                      tec
## 15503                                                                                                                                                   tech�s
## 15504                                                                                                                                                     teen
## 15505                                                                                                                                                  teepees
## 15506                                                                                                                                                     tega
## 15507                                                                                                                                               television
## 15508                                                                                                                                                      tem
## 15509                                                                                                                                                     tema
## 15510                                                                                                                                                   temple
## 15511                                                                                                                                                temporada
## 15512                                                                                                                                                  tempted
## 15513                                                                                                                                                     tent
## 15514                                                                                                                                                tentative
## 15515                                                                                                                                                    ten�a
## 15516                                                                                                                                                   ten�an
## 15517                                                                                                                                               terrifying
## 15518                                                                                                                                               terrorists
## 15519                                                                                                                                                   texans
## 15520                                                                                                                                                 thanking
## 15521                                                                                                                                                 thankyou
## 15522                                                                                                                                                    theft
## 15523                                                                                                                                                   theory
## 15524                                                                                                                                                   thirty
## 15525                                                                                                                                                 thompson
## 15526                                                                                                                                                     thou
## 15527                                                                                                                                                 threaten
## 15528                                                                                                                                                threshold
## 15529                                                                                                                                               thresholds
## 15530                                                                                                                                                   thrive
## 15531                                                                                                                                                      thu
## 15532                                                                                                                                                    thugs
## 15533                                                                                                                                                      thx
## 15534                                                                                                                                                      tie
## 15535                                                                                                                                                    tiene
## 15536                                                                                                                                                    tight
## 15537                                                                                                                                                  tighten
## 15538                                                                                                                                                  tighter
## 15539                                                                                                                                                      til
## 15540                                                                                                                                                   tipoff
## 15541                                                                                                                                               tirelessly
## 15542                                                                                                                                                   tissue
## 15543                                                                                                                                                       tl
## 15544                                                                                                                                                  tobacco
## 15545                                                                                                                                                   todate
## 15546                                                                                                                                                     toes
## 15547                                                                                                                                                    tokyo
## 15548                                                                                                                                                      tom
## 15549                                                                                                                                                     tony
## 15550                                                                                                                                                    tools
## 15551                                                                                                                                                   topics
## 15552                                                                                                                                                     tops
## 15553                                                                                                                                                    toque
## 15554                                                                                                                                                  tougher
## 15555                                                                                                                                                  tourist
## 15556                                                                                                                                                   touted
## 15557                                                                                                                                                    tower
## 15558                                                                                                                                                   towers
## 15559                                                                                                                                                 trabajar
## 15560                                                                                                                                                  trabajo
## 15561                                                                                                                                                  trading
## 15562                                                                                                                                               traditions
## 15563                                                                                                                                                  trained
## 15564                                                                                                                                                  traitor
## 15565                                                                                                                                                    trajo
## 15566                                                                                                                                                transform
## 15567                                                                                                                                            transmissible
## 15568                                                                                                                                                 transmit
## 15569                                                                                                                                                     tras
## 15570                                                                                                                                                 tratando
## 15571                                                                                                                                                 traveled
## 15572                                                                                                                                                travelers
## 15573                                                                                                                                               treatments
## 15574                                                                                                                                                   trebek
## 15575                                                                                                                                             tremendously
## 15576                                                                                                                                                     tres
## 15577                                                                                                                                                 tripling
## 15578                                                                                                                                                   troops
## 15579                                                                                                                                                  trouble
## 15580                                                                                                                                                   trucks
## 15581                                                                                                                                                  trumper
## 15582                                                                                                                                           trumpmcconnell
## 15583                                                                                                                                                  trusted
## 15584                                                                                                                                                 trusting
## 15585                                                                                                                                                    tryna
## 15586                                                                                                                                                   tryout
## 15587                                                                                                                                                      tua
## 15588                                                                                                                                                     turd
## 15589                                                                                                                                                 turistas
## 15590                                                                                                                                                  tweeted
## 15591                                                                                                                                                   tweets
## 15592                                                                                                                                                  typical
## 15593                                                                                                                                                      uab
## 15594                                                                                                                                                      ucf
## 15595                                                                                                                                                      ufo
## 15596                                                                                                                                                       uh
## 15597                                                                                                                                                     uk�s
## 15598                                                                                                                                               ultimately
## 15599                                                                                                                                                     ummm
## 15600                                                                                                                                             unacceptable
## 15601                                                                                                                                               unaffected
## 15602                                                                                                                                                  unarmed
## 15603                                                                                                                                             unbelievable
## 15604                                                                                                                                                      unc
## 15605                                                                                                                                                uncertain
## 15606                                                                                                                                               unexpected
## 15607                                                                                                                                              unfortunate
## 15608                                                                                                                                              universidad
## 15609                                                                                                                                              unknowingly
## 15610                                                                                                                                              unnecessary
## 15611                                                                                                                                                unrelated
## 15612                                                                                                                                               unreliable
## 15613                                                                                                                                                   unsafe
## 15614                                                                                                                                                  unveils
## 15615                                                                                                                                                     upmc
## 15616                                                                                                                                                   uproar
## 15617                                                                                                                                                   upside
## 15618                                                                                                                                                  upstate
## 15619                                                                                                                                                 uptodate
## 15620                                                                                                                                                    urban
## 15621                                                                                                                                                    urged
## 15622                                                                                                                                                   urgent
## 15623                                                                                                                                                    urges
## 15624                                                                                                                                                     usen
## 15625                                                                                                                                                       ut
## 15626                                                                                                                                                    utter
## 15627                                                                                                                                                  utterly
## 15628                                                                                                                                                       uu
## 15629                                                                                                                                            vaccinations�
## 15630                                                                                                                                      vaccine<u+0001f489>
## 15631                                                                                                                                                vaccines�
## 15632                                                                                                                                                vaksinasi
## 15633                                                                                                                                                   valued
## 15634                                                                                                                                                      van
## 15635                                                                                                                                                   vanish
## 15636                                                                                                                                                   varied
## 15637                                                                                                                                                      vax
## 15638                                                                                                                                                    veces
## 15639                                                                                                                                                    vegas
## 15640                                                                                                                                                   venues
## 15641                                                                                                                                                  vessels
## 15642                                                                                                                                                  veteran
## 15643                                                                                                                                                     vets
## 15644                                                                                                                                                     vida
## 15645                                                                                                                                                    views
## 15646                                                                                                                                               virginia�s
## 15647                                                                                                                                                  visibly
## 15648                                                                                                                                                 visitors
## 15649                                                                                                                                                      vit
## 15650                                                                                                                                                    vital
## 15651                                                                                                                                                    voice
## 15652                                                                                                                                                   volver
## 15653                                                                                                                                                    vomit
## 15654                                                                                                                                                      vos
## 15655                                                                                                                                                       vp
## 15656                                                                                                                                                     waco
## 15657                                                                                                                                                   waited
## 15658                                                                                                                                                    waits
## 15659                                                                                                                                                    wakey
## 15660                                                                                                                                                     walz
## 15661                                                                                                                                                  wanogho
## 15662                                                                                                                                                   wanton
## 15663                                                                                                                                                 warcraft
## 15664                                                                                                                                                 warriors
## 15665                                                                                                                                                     wars
## 15666                                                                                                                                                    watts
## 15667                                                                                                                                                     weak
## 15668                                                                                                                                                  weapons
## 15669                                                                                                                                                  webinar
## 15670                                                                                                                                                 websites
## 15671                                                                                                                                                  wedding
## 15672                                                                                                                                                weekend�s
## 15673                                                                                                                                                wellbeing
## 15674                                                                                                                                            wellconnected
## 15675                                                                                                                                                  western
## 15676                                                                                                                                                      wft
## 15677                                                                                                                                                     wgal
## 15678                                                                                                                                                    whiny
## 15679                                                                                                                                                    whove
## 15680                                                                                                                                                  wichita
## 15681                                                                                                                                                   widely
## 15682                                                                                                                                                wikipedia
## 15683                                                                                                                                                 wildcats
## 15684                                                                                                                                                  william
## 15685                                                                                                                                                     wing
## 15686                                                                                                                                                  wingtip
## 15687                                                                                                                                                  winston
## 15688                                                                                                                                                     wipe
## 15689                                                                                                                                            wisconsinites
## 15690                                                                                                                                                     wise
## 15691                                                                                                                                                   wishes
## 15692                                                                                                                                                    with�
## 15693                                                                                                                                                  witness
## 15694                                                                                                                                                     wknd
## 15695                                                                                                                                                       wo
## 15696                                                                                                                                                 woodward
## 15697                                                                                                                                                     wore
## 15698                                                                                                                                                   worlds
## 15699                                                                                                                                                worldwide
## 15700                                                                                                                                                   world�
## 15701                                                                                                                                                  worries
## 15702                                                                                                                                                 would�ve
## 15703                                                                                                                                                    wound
## 15704                                                                                                                                                     wout
## 15705                                                                                                                                                 wracking
## 15706                                                                                                                                                   wright
## 15707                                                                                                                                                   xavier
## 15708                                                                                                                                                  xfinity
## 15709                                                                                                                                                       xv
## 15710                                                                                                                                                    yards
## 15711                                                                                                                                                      yay
## 15712                                                                                                                                                    year�
## 15713                                                                                                                                                       yg
## 15714                                                                                                                                                    yorks
## 15715                                                                                                                                                    you�d
## 15716                                                                                                                                                      yup
## 15717                                                                                                                                                  zakaria
## 15718                                                                                                                                                 zimbabwe
## 15719                                                                                                                                                      zip
## 15720                                                                                                                                                   zombie
## 15721                                                                                                                                                    zumba
## 15722                                                                                                                                                      �5g
## 15723                                                                                                                                                      �an
## 15724                                                                                                                                                    �army
## 15725                                                                                                                                                �covid19�
## 15726                                                                                                                                                      �do
## 15727                                                                                                                                                     �how
## 15728                                                                                                                                                    �less
## 15729                                                                                                                                                     �new
## 15730                                                                                                                                                     �red
## 15731                                                                                                                                                   �south
## 15732                                                                                                                                                   �there
## 15733                                                                                                                                                    �this
## 15734                                                                                                                                                 �vaccine
## 15735                                                                                                                                               @13newsnow
## 15736                                                                                                                                                    @4aof
## 15737                                                                                                                                                @777cuddy
## 15738                                                                                                                                              @95camerino
## 15739                                                                                                                                                 @aamuedu
## 15740                                                                                                                                          @absolutegnosis
## 15741                                                                                                                                            @acasadevall1
## 15742                                                                                                                                         @aconcernedpare2
## 15743                                                                                                                                                @acweyand
## 15744                                                                                                                                                @aftunion
## 15745                                                                                                                                               @aggmagpie
## 15746                                                                                                                                           @albanyschools
## 15747                                                                                                                                            @alexandriava
## 15748                                                                                                                                              @alphae1978
## 15749                                                                                                                                          @andrewlazarus4
## 15750                                                                                                                                                @andylumm
## 15751                                                                                                                                                      @ap
## 15752                                                                                                                                           @apartmentboss
## 15753                                                                                                                                                    @apdn
## 15754                                                                                                                                              @archanaips
## 15755                                                                                                                                               @archdejan
## 15756                                                                                                                                            @arlingtondhs
## 15757                                                                                                                                             @arlingtonva
## 15758                                                                                                                                           @asahutchinson
## 15759                                                                                                                                                 @atrupar
## 15760                                                                                                                                         @auspublichealth
## 15761                                                                                                                                           @awithonelison
## 15762                                                                                                                                                   @azdhs
## 15763                                                                                                                                         @baltcityschools
## 15764                                                                                                                                           @berniesanders
## 15765                                                                                                                                           @bhupendrapbjp
## 15766                                                                                                                                              @bibbydebob
## 15767                                                                                                                                           @bigindiegiant
## 15768                                                                                                                                                  @blshiv
## 15769                                                                                                                                                @bobcha78
## 15770                                                                                                                                                @bobwxly2
## 15771                                                                                                                                           @breitbartnews
## 15772                                                                                                                                             @brocklesnar
## 15773                                                                                                                                                @business
## 15774                                                                                                                                          @bwbuckheadcity
## 15775                                                                                                                                              @cagovernor
## 15776                                                                                                                                              @cbschicago
## 15777                                                                                                                                              @cbsnewyork
## 15778                                                                                                                                                @cdcgov�s
## 15779                                                                                                                                             @chrislhayes
## 15780                                                                                                                                             @cienciaymas
## 15781                                                                                                                                            @cityofboston
## 15782                                                 @clarkwrestlinggpn901nicolas87293182pickettshaunrebsisingsrodrick76496943rusdadthrillofsportsworldofzen1
## 15783                                                                                                                                         @cobbles06786102
## 15784                                                                                                                                              @countyofla
## 15785                                                                                                                                               @cuehealth
## 15786                                                                                                                                             @curneyellen
## 15787                                                                                                                                              @dare2bwell
## 15788                                                                                                                                         @datgnarlyoldguy
## 15789                                                                                                                                                 @daystar
## 15790                                                                                                                                              @dbharrison
## 15791                                                                                                                                                @dbongino
## 15792                                                                                                                                                @dchealth
## 15793                                                                                                                                            @deaconblues0
## 15794                                                                                                                                                   @delta
## 15795                                                                                                                                             @denutrients
## 15796                                                                                                                                            @derroneshort
## 15797                                                                                                                                              @dleonhardt
## 15798                                                                                                                                              @doctorkarl
## 15799                                                                                                                                           @doechancellor
## 15800                                                                                                                                             @donfelixspm
## 15801                                                                                                                                            @doom37455413
## 15802                                                                                                                                                   @drcjm
## 15803                                                                                                                                              @drericding
## 15804                                                                                                                                           @drhirschfield
## 15805                                                                                                                                           @drlucymcbride
## 15806                                                                                                                                            @drtomfrieden
## 15807                                                                                                                                                  @ecob85
## 15808                                                                                                                                             @edogarizona
## 15809                                                                                                                                                @elonmusk
## 15810                                                                                                                                                @ereditsh
## 15811                                                                                                                                            @ericmmatheny
## 15812                                                                                                                                                  @esd714
## 15813                                                                                                                                                    @espn
## 15814                                                                                                                                              @ewerickson
## 15815                                                                                                                                                    @ewtn
## 15816                                                                                                                                           @facethenation
## 15817                                                                                                                                           @fairfaxhealth
## 15818                                                                                                                                                   @fedex
## 15819                                                                                                                                         @fight4freedom87
## 15820                                                                                                                                           @fightsforkids
## 15821                                                                                                                                         @fitterhappieraj
## 15822                                                                                                                                         @flhealthbroward
## 15823                                                                                                                                            @flsurgeongen
## 15824                                                                                                                                             @fortalezapr
## 15825                                                                                                                                              @fox23maine
## 15826                                                                                                                                               @franalabi
## 15827                                                                                                                                             @freddyatton
## 15828                                                                                                                                               @gdnejsb88
## 15829                                                                                                                                            @genobisconte
## 15830                                                                                                                                                 @gerdosi
## 15831                                                                                                                                              @gilliangem
## 15832                                                                                                                                               @gopleader
## 15833                                                                                                                                             @gotantibods
## 15834                                                                                                                                              @governorva
## 15835                                                                                                                                               @govmurphy
## 15836                                                                                                                                             @govparsonmo
## 15837                                                                                                                                              @gracebwell
## 15838                                                                                                                                              @gwhospital
## 15839                                                                                                                                           @handmadekathy
## 15840                                                                                                                                            @healthydavis
## 15841                                                                                                                                              @healthyfla
## 15842                                                                                                                                           @healwithkasey
## 15843                                                                                                                                           @heathermack18
## 15844                                                                                                                                         @hickoryhill8520
## 15845                                                                                                                                                @hleradio
## 15846                                                                                                                                         @hope4cleanwater
## 15847                                                                                                                                           @houstonhealth
## 15848                                                                                                                                            @hubiegreiner
## 15849                                                                                                                                           @iamjohncullen
## 15850                                                                                                                                         @idesignecourses
## 15851                                                                                                                                           @idunsdaughter
## 15852                                                                                                                                           @ingrahamangle
## 15853                                                                                                                                         @inovaalexandria
## 15854                                                                                                                                         @inovaffxtrauma1
## 15855                                                                                                                                         @janainadobrasil
## 15856                                                                                                                                               @janem1276
## 15857                                                                                                                                           @janipenttinen
## 15858                                                                                                                                          @jempyreangoals
## 15859                                                                                                                                           @jennaellisesq
## 15860                                                                                                                                            @jimeeliberty
## 15861                                                                                                                                                 @jkk4782
## 15862                                                                                                                                            @jlgoldfinger
## 15863                                                                                                                                              @joekgerald
## 15864                                                                                                                                                  @joenbc
## 15865                                                                                                                                              @joyannreid
## 15866                                                                                                                                               @jrjhealey
## 15867                                                                                                                                               @kath2cats
## 15868                                                                                                                                               @kathmlee1
## 15869                                                                                                                                            @katiepavlich
## 15870                                                                                                                                          @keepschoolopen
## 15871                                                                                                                                                 @kgwnews
## 15872                                                                                                                                                    @kmov
## 15873                                                                                                                                                  @ksorbs
## 15874                                                                                                                                                  @ktibus
## 15875                                                                                                                                                    @ktvu
## 15876                                                                                                                                                  @lalate
## 15877                                                                                                                                              @lisamccray
## 15878                                                                                                                                            @luisabinader
## 15879                                                                                                                                          @lukeanglindoor
## 15880                                                                                                                                         @magisdathletics
## 15881                                                                                                                                             @mainehealth
## 15882                                                                                                                                         @marshablackburn
## 15883                                                                                                                                              @marsonifdt
## 15884                                                                                                                                            @maschoolsk12
## 15885                                                                                                                                               @mattgaetz
## 15886                                                                                                                                         @matthewnewell67
## 15887                                                                                                                                                    @mcps
## 15888                                                                                                                                               @mdrisette
## 15889                                                                                                                                             @meddlinmegs
## 15890                                                                                                                                              @medstarguh
## 15891                                                                                                                                              @medstarwhc
## 15892                                                                                                                                           @mercantilectr
## 15893                                                                                                                                         @metrowestsports
## 15894                                                                                                                                          @michelleclay12
## 15895                                                                                                                                         @mightyheidihall
## 15896                                                                                                                                         @millanpatterson
## 15897                                                                                                                                           @mirelaboangiu
## 15898                                                                                                                                              @mohfwindia
## 15899                                                                                                                                                @morgfair
## 15900                                                                                                                                              @morningjoe
## 15901                                                                                                                                            @mspicuzzamjs
## 15902                                                                                                                                               @mstrixter
## 15903                                                                                                                                               @mxffusion
## 15904                                                                                                                                            @nailatrahman
## 15905                                                                                                                                          @nakedemperoruk
## 15906                                                                                                                                            @narendramodi
## 15907                                                                                                                                           @natesilver538
## 15908                                                                                                                                         @nathaliejacoby1
## 15909                                                                                                                                             @nayibbukele
## 15910                                                                                                                                                   @nbcla
## 15911                                                                                                                                                 @netflix
## 15912                                                                                                                                            @newschannel9
## 15913                                                                                                                                              @nhhousegop
## 15914                                                                                                                                                     @nhl
## 15915                                                                                                                                            @nicolelenoir
## 15916                                                                                                                                              @nomihealth
## 15917                                                                                                                                          @nychealthcommr
## 15918                                                                                                                                                  @nypost
## 15919                                                                                                                                                 @nytimes
## 15920                                                                                                                                                    @occc
## 15921                                                                                                                                                   @ocgop
## 15922                                                                                                                                              @ogilville1
## 15923                                                                                                                                             @overshoooot
## 15924                                                                                                                                                @paco7320
## 15925                                                                                                                                              @parsifaler
## 15926                                                                                                                                              @particle96
## 15927                                                                                                                                          @patrickmcenroe
## 15928                                                                                                                                            @patriottakes
## 15929                                                                                                                                               @pepalerts
## 15930                                                                                                                                               @peterdaou
## 15931                                                                                                                                             @piperobrien
## 15932                                                                                                                                                @pmoindia
## 15933                                                                                                                                             @primerahora
## 15934                                                                                                                                          @profemilyoster
## 15935                                                                                                                                                 @progr0k
## 15936                                                                                                                                             @provaxtexan
## 15937                                                                                                                                                 @quintic
## 15938                                                                                                                                                @randpaul
## 15939                                                                                                                                               @randy1116
## 15940                                                                                                                                           @raouldukeerik
## 15941                                                                                                                                          @realtimenews10
## 15942                                                                                                                                                  @reason
## 15943                                                                                                                                               @redsoxmvp
## 15944                                                                                                                                                  @repaoc
## 15945                                                                                                                                            @repbobbyrush
## 15946                                                                                                                                              @repcloudtx
## 15947                                                                                                                                         @repthomasmassie
## 15948                                                                                                                                           @reviewjournal
## 15949                                                                                                                                               @rhebright
## 15950                                                                                                                                           @rhondalbrown2
## 15951                                                                                                                                              @richykirsh
## 15952                                                                                                                                             @rickabright
## 15953                                                                                                                                         @rinationalguard
## 15954                                                                                                                                         @rochesterchambr
## 15955                                                                                                                                             @rocredwings
## 15956                                                                                                                                               @ronbegone
## 15957                                                                                                                                              @roncoleman
## 15958                                                                                                                                          @ronfilipkowski
## 15959                                                                                                                                            @ronjohnsonwi
## 15960                                                                                                                                                @rpmerkow
## 15961                                                                                                                                              @rsbnetwork
## 15962                                                                                                                                                 @rvawonk
## 15963                                                                                                                                                  @saclib
## 15964                                                                                                                                            @sailormandan
## 15965                                                                                                                                              @sammy44231
## 15966                                                                                                                                              @saxxytbear
## 15967                                                                                                                                                  @scdhec
## 15968                                                                                                                                               @scotsfyre
## 15969                                                                                                                                               @semimooch
## 15970                                                                                                                                         @sergiovengeance
## 15971                                                                                                                                             @sfchronicle
## 15972                                                                                                                                            @shawnquinn83
## 15973                                                                                                                                             @shiramstein
## 15974                                                                                                                                          @skepticalprune
## 15975                                                                                                                                                     @smh
## 15976                                                                                                                                         @sonjasantelises
## 15977                                                                                                                                           @statehealthin
## 15978                                                                                                                                          @surgeongeneral
## 15979                                                                                                                                              @swedishchf
## 15980                                                                                                                                             @sweetdoodmd
## 15981                                                                                                                                         @sylvesterturner
## 15982                                                                                                                                         @teamrondesantis
## 15983                                                                                                                                           @telemundonews
## 15984                                                                                                                                         @telestrtshooter
## 15985                                                                                                                                               @tenebra99
## 15986                                                                                                                                            @thechiefnerd
## 15987                                                                                                                                            @theodorehcom
## 15988                                                                                                                                              @therecount
## 15989                                                                                                                                           @therickwilson
## 15990                                                                                                                                                 @theview
## 15991                                                                                                                                         @timrunshismouth
## 15992                                                                                                                                            @tomsirolimus
## 15993                                                                                                                                               @tonybaduy
## 15994                                                                                                                                             @travistritt
## 15995                                                                                                                                            @troywahlberg
## 15996                                                                                                                                          @tweetworcester
## 15997                                                                                                                                             @uninoticias
## 15998                                                                                                                                           @uvahealthnews
## 15999                                                                                                                                           @vanessaforatx
## 16000                                                                                                                                                @vengynce
## 16001                                                                                                                                             @volpiranyas
## 16002                                                                                                                                         @waltdisneyworld
## 16003                                                                                                                                              @wendyorent
## 16004                                                                                                                                               @wookietim
## 16005                                                                                                                                             @wplglocal10
## 16006                                                                                                                                                    @wptv
## 16007                                                                                                                                            @wrestlinginc
## 16008                                                                                                                                                    @wtnh
## 16009                                                                                                                                                     @wwe
## 16010                                                                                                                                                @zeetubes
## 16011                                                                                                                                                   #abc11
## 16012                                                                                                                                              #actualidad
## 16013                                                                                                                                                      #ad
## 16014                                                                                                                                            #affirmations
## 16015                                                                                                                                             #antivaxxers
## 16016                                                                                                                                         #antivaxxerskill
## 16017                                                                                                                                                 #anxiety
## 16018                                                                                                                                         #artistontwitter
## 16019                                                                                                                                      #autismprowrestling
## 16020                                                                                                                                                #bachelor
## 16021                                                                                                                                                 #bayarea
## 16022                                                                                                                                              #benfrazier
## 16023                                                                                                                                                   #biden
## 16024                                                                                                                                                 #bitcoin
## 16025                                                                                                                                               #bloodclot
## 16026                                                                                                                                         #bluelivesmatter
## 16027                                                                                                                                              #boosterjab
## 16028                                                                                                                                                #boston25
## 16029                                                                                                                                    #chicagopublicschools
## 16030                                                                                                                                                     #cnn
## 16031                                                                                                                                                  #cnnnye
## 16032                                                                                                                                         #coronapocalypse
## 16033                                                                                                                                     #coronavirusoutbreak
## 16034                                                                                                                                     #coronaviruspandemic
## 16035                                                                                                                                              #covid19aus
## 16036                                                                                                                                           #covid19france
## 16037                                                                                                                                              #covid19vic
## 16038                                                                                                                                          #covidchristmas
## 16039                                                                                                                                    #covidisnotdonewithus
## 16040                                                                                                                                             #covidisreal
## 16041                                                                                                                                              #covidsucks
## 16042                                                                                                                                                  #darwin
## 16043                                                                                                                                                   #death
## 16044                                                                                                                                                    #defi
## 16045                                                                                                                                            #deltavariant
## 16046                                                                                                                                                 #desatan
## 16047                                                                                                                                                 #deworst
## 16048                                                                                                                                                     #dfw
## 16049                                                                                                                                              #diadereyes
## 16050                                                                                                                                        #disabilityrights
## 16051                                                                                                                                                #djokovic
## 16052                                                                                                                                               #donations
## 16053                                                                                                                                              #dontlookup
## 16054                                                                                                                                             #dontmissout
## 16055                                                                                                                                                  #edchat
## 16056                                                                                                                                               #education
## 16057                                                                                                                                               #educators
## 16058                                                                                                                                              #edutwitter
## 16059                                                                                                                                                    #espn
## 16060                                                                                                                                                #exercise
## 16061                                                                                                                                                 #falcons
## 16062                                                                                                                                                   #fauci
## 16063                                                                                                                                                #fentanyl
## 16064                                                                                                                                                     #fit
## 16065                                                                                                                                                 #fjbiden
## 16066                                                                                                                                            #floridacovid
## 16067                                                                                                                                                 #florona
## 16068                                                                                                                                                  #flyers
## 16069                                                                                                                                                #followme
## 16070                                                                                                                                               #friscoisd
## 16071                                                                                                                                         #fullyvaccinated
## 16072                                                                                                                                              #getboosted
## 16073                                                                                                                                               #gettested
## 16074                                                                                                                                                 #gobeavs
## 16075                                                                                                                                           #goodvibesonly
## 16076                                                                                                                                            #gopdeathcult
## 16077                                                                                                                                                 #goville
## 16078                                                                                                                                                 #grammys
## 16079                                                                                                                                               #hadestown
## 16080                                                                                                                                            #happeningnow
## 16081                                                                                                                                                    #hcpc
## 16082                                                                                                                                            #healthforall
## 16083                                                                                                                                        #healthylifestyle
## 16084                                                                                                                                                #highered
## 16085                                                                                                                                                    #home
## 16086                                                                                                                                                     #hoy
## 16087                                                                                                                                                #hydepark
## 16088                                                                                                                                                     #i95
## 16089                                                                                                                                              #iapolitics
## 16090                                                                                                                                                     #ihu
## 16091                                                                                                                                                #illinois
## 16092                                                                                                                                               #instagram
## 16093                                                                                                                                           #internacional
## 16094                                                                                                                                                  #jan6th
## 16095                                                                                                                                  #january6thinsurrection
## 16096                                                                                                                                      #juntoss�podemosusa
## 16097                                                                                                                                                   #kendo
## 16098                                                                                                                                                  #kep1er
## 16099                                                                                            #kep1er<u+c751><u+b2f5><u+5fdc><u+7b54><u+56de><u+7b54>wadada
## 16100                                                                                                                                                  #kindle
## 16101                                                                                                                                                #lasrozas
## 16102                                                                                                                                                #lasvegas
## 16103                                                                                                                                          #lawenforcement
## 16104                                                                                                                                              #leadership
## 16105                                                                                                                                                #localsyr
## 16106                                                                                                                                                #lovewins
## 16107                                                                                                                                                   #lupus
## 16108                                                                                                                                               #macron20h
## 16109                                                                                                                                         #makeitmakesense
## 16110                                                                                                                                    #marjorietaylorgreene
## 16111                                                                                                                                                #maryland
## 16112                                                                                                                                                   #mecfs
## 16113                                                                                                                                                   #memes
## 16114                                                                                                                                                   #miami
## 16115                                                                                                                                               #minnesota
## 16116                                                                                                                                          #misinformation
## 16117                                                                                                                                           #mondaymorning
## 16118                                                                                                                                        #mondaymotivation
## 16119                                                                                                                                                   #music
## 16120                                                                                                                                          #mybodymychoice
## 16121                                                                                                                                              #mzcannabiz
## 16122                                                                                                                                                   #ncpol
## 16123                                                                                                                                                #negative
## 16124                                                                                                                                                    #news
## 16125                                                                                                                                             #newyearseve
## 16126                                                                                                                                      #newyearsresolution
## 16127                                                                                                                                           #nftcommmunity
## 16128                                                                                                                                                    #nfts
## 16129                                                                                                                                          #notmypresident
## 16130                                                                                                                                                   #nurse
## 16131                                                                                                                                                  #nurses
## 16132                                                                                                                                                     #nye
## 16133                                                                                                                                                 #nye2021
## 16134                                                                                                                                                 #obesity
## 16135                                                                                                                                                 #omarion
## 16136                                                                                                                                #omicronisaglobalcalamity
## 16137                                                                                                                                                 #orlando
## 16138                                                                                                                                            #pandemiclife
## 16139                                                                                                                                         #passaiccountynj
## 16140                                                                                                                                              #patersonnj
## 16141                                                                                                                                                 #pcrtest
## 16142                                                                                                                                             #photography
## 16143                                                                                                                                                   #poems
## 16144                                                                                                                                                  #police
## 16145                                                                                                                                                 #politas
## 16146                                                                                                                                                #politics
## 16147                                                                                                                                        #pol�ticaregional
## 16148                                                                                                                                   #poweringupourpartners
## 16149                                                                                                                                       #purplepowerfamily
## 16150                                                                                                                                          #quarantinelife
## 16151                                                                                                                                               #removeron
## 16152                                                                                                                                            #removeronnow
## 16153                                                                                                                                   #representationmatters
## 16154                                                                                                                                             #romanreigns
## 16155                                                                                                                                               #ronbegone
## 16156                                                                                                                                                  #russia
## 16157                                                                                                                                             #safetyfirst
## 16158                                                                                                                                                 #science
## 16159                                                                                                                                          #sciencetwitter
## 16160                                                                                                                                                 #selfish
## 16161                                                                                                                                               #seriously
## 16162                                                                                                                                               #sfbayarea
## 16163                                                                                                                                                   #shame
## 16164                                                                                                                                                    #smtx
## 16165                                                                                                                                                    #snow
## 16166                                                                                                                                             #socialmedia
## 16167                                                                                                                                         #southwestphilly
## 16168                                                                                                                                             #stayhealthy
## 16169                                                                                                                                           #stopthespread
## 16170                                                                                                                                           #takecarehotel
## 16171                                                                                                                                                #teachers
## 16172                                                                                                                                          #teachertwitter
## 16173                                                                                                                                                    #test
## 16174                                                                                                                                                   #tests
## 16175                                                                                                                                                  #texans
## 16176                                                                                                                                                 #theater
## 16177                                                                                                                                                #thecovid
## 16178                                                                                                                                              #theomicron
## 16179                                                                                                                                         #thursdaymorning
## 16180                                                                                                                                        #thursdaythoughts
## 16181                                                                                                                                                   #trump
## 16182                                                                                                                                #trumpisanationaldisgrace
## 16183                                                                                                                                                   #truth
## 16184                                                                                                                                                 #tuesday
## 16185                                                                                                                                                 #twitter
## 16186                                                                                                                                                     #unc
## 16187                                                                                                                                            #unitedstates
## 16188                                                                                                                                            #unvaccinated
## 16189                                                                                                                         #vaccinationdone<u+2714><u+fe0f>
## 16190                                                                                                                                         #vaccinemandates
## 16191                                                                                                                                                #vaccines
## 16192                                                                                                                                       #vaccinessavelives
## 16193                                                                                                                                                  #vaxxed
## 16194                                                                                                                                                   #virus
## 16195                                                                                                                                                  #wakeup
## 16196                                                                                                                                            #washingtondc
## 16197                                                                                                                                           #wearadamnmask
## 16198                                                                                                                                              #weightgain
## 16199                                                                                                                                #weightlosstransformation
## 16200                                                                                                                                               #worcester
## 16201                                                                                                                                                     #wtf
## 16202                                                                                                                                                     #wwe
## 16203                                                                                                                                             <u+0001f195>
## 16204                                                                                                                                             <u+0001f356>
## 16205                                                                     <u+0001f386><u+0001f38d><u+0001f38b><u+0001f37e><u+0001f38a><u+0001f389><u+0001f387>
## 16206                                                                                                                                             <u+0001f389>
## 16207                                                                                                                                      <u+0001f3f5>covid19
## 16208                                                                                                                                 <u+0001f447><u+0001f3fb>
## 16209                                                                                                                                             <u+0001f449>
## 16210                                                                                                                                 <u+0001f449><u+0001f3fb>
## 16211                                                                                                                                 <u+0001f44a><u+0001f3fb>
## 16212                                                                                                                                 <u+0001f44f><u+0001f44f>
## 16213                                                                                             <u+0001f44f><u+0001f44f><u+0001f44f><u+0001f44f><u+0001f44f>
## 16214                                                                                             <u+0001f478><u+0001f3fb><u+0001f622><u+0001f64f><u+0001f3fc>
## 16215                                                                                                                                          <u+0001f489>get
## 16216                                                                                                                                             <u+0001f494>
## 16217                                                                                                                                             <u+0001f4b8>
## 16218                                                                                                                                             <u+0001f4cd>
## 16219                                                                                                                                             <u+0001f4de>
## 16220                                                                                                                                             <u+0001f4e3>
## 16221                                                                                                                                             <u+0001f50b>
## 16222                                                                                                                                             <u+0001f517>
## 16223                                                                                                                                           <u+0001f518>11
## 16224                                                                                                                                             <u+0001f539>
## 16225                                                                                                                                             <u+0001f575>
## 16226                                                                                                                         <u+0001f5e3><u+fe0f><u+0001f4e2>
## 16227                                                                                                                                         <u+0001f5f3>them
## 16228                                                                                                                                 <u+0001f602><u+0001f602>
## 16229                                                                                                                                             <u+0001f606>
## 16230                                                                                                                                             <u+0001f609>
## 16231                                                                                                                                             <u+0001f60f>
## 16232                                                                                                                                             <u+0001f612>
## 16233                                                                                                                                             <u+0001f614>
## 16234                                                                                                                                             <u+0001f618>
## 16235                                                                                                                                             <u+0001f62a>
## 16236                                                                                                                                             <u+0001f631>
## 16237                                                                                                                         <u+0001f635><u+200d><u+0001f4ab>
## 16238                                                     <u+0001f637><u+0001f9a0><u+0001f6ab><u+0001f6b6><u+0001f3fd><u+0001f699><u+0001f3e1><u+2614><u+fe0f>
## 16239                                                                                                                                             <u+0001f643>
## 16240                                                                                                         <u+0001f64b><u+0001f3fc><u+200d><u+2640><u+fe0f>
## 16241                                                                                                                                             <u+0001f64c>
## 16242                                                                                             <u+0001f64f><u+0001f3fc><u+0001f49a><u+0001f478><u+0001f3fb>
## 16243                                                                                                                                 <u+0001f64f><u+0001f3fe>
## 16244                                                                                                                                             <u+0001f90e>
## 16245                                                                                                                                             <u+0001f91d>
## 16246                                                                                                                                             <u+0001f920>
## 16247                                                                                                                                 <u+0001f923><u+0001f923>
## 16248                                                                                             <u+0001f923><u+0001f923><u+0001f923><u+0001f923><u+0001f923>
## 16249                                                                                                         <u+0001f926><u+0001f3fe><u+200d><u+2640><u+fe0f>
## 16250                                                                                                                     <u+0001f926><u+200d><u+2642><u+fe0f>
## 16251                                                                                                                                             <u+0001f92f>
## 16252                                                                                                                                             <u+0001f9f5>
## 16253                                                 <u+0262><u+1d07><u+1d1b><u+1d20><u+1d00><u+1d04><u+1d04><u+026a><u+0274><u+1d00><u+1d1b><u+1d07><u+1d05>
## 16254                                                                                                                                         <u+0623><u+0648>
## 16255                                                                                                 <u+0627><u+0644><u+0628><u+0634><u+0631><u+064a><u+0629>
## 16256                                                                                                         <u+0627><u+0644><u+0639><u+0638><u+064a><u+0645>
## 16257                                                                                                                                         <u+0645><u+0646>
## 16258                                                                                                                                         <u+25b6><u+fe0f>
## 16259                                         <u+2614><u+fe0f><u+0001f637><u+0001f9a0><u+0001f4b5><u+0001f64c><u+0001f3fc><u+0001f4af><u+0001f919><u+0001f3fc>
## 16260                                                                                                                                         <u+263a><u+fe0f>
## 16261                                                                                                                                         <u+2708><u+fe0f>
## 16262                                                                                                                                                 <u+270b>
## 16263                                                                                                                                                 <u+2764>
## 16264                                                                                                                                                 <u+c218>
## 16265                                                                                                                                         <u+c790><u+ac00>
## 16266                         <u+ccab><u+b208><u+cc98><u+b7fc><u+b2e4><u+ac00><u+c628><u+c9c0><u+c218><u+c758><u+c0dd><u+c77c><u+c744><u+cd95><u+d558><u+d574>
## 16267                                                                                                                                         <u+d638><u+d154>
## 16268                                                                                                                                                     100k
## 16269                                                                                                                                                    10day
## 16270                                                                                                                                                     10th
## 16271                                                                                                                                                     11am
## 16272                                                                                                                                                   1230pm
## 16273                                                                                                                                                16yearold
## 16274                                                                                                                                                     17th
## 16275                                                                                                                                                       1m
## 16276                                                                                                                                                2021recap
## 16277                                                                                                                                                     20th
## 16278                                                                                                                                                     21st
## 16279                                                                                                                                                    345pm
## 16280                                                                                                                                                       3x
## 16281                                                                                                                                                      54m
## 16282                                                                                                                                                57yearold
## 16283                                                                                                                                                     5way
## 16284                                                                                                                                                      80s
## 16285                                                                                                                                                 8am345pm
## 16286                                                                                                                                                   8am6pm
## 16287                                                                                                                                                      9th
## 16288                                                                                                                                                    abcnl
## 16289                                                                                                                                                  absence
## 16290                                                                                                                                                 absolute
## 16291                                                                                                                                                 academic
## 16292                                                                                                                                                  academy
## 16293                                                                                                                                               accessible
## 16294                                                                                                                                                 accident
## 16295                                                                                                                                               accidents�
## 16296                                                                                                                                              accommodate
## 16297                                                                                                                                                accounted
## 16298                                                                                                                                                 adequate
## 16299                                                                                                                                                   adjust
## 16300                                                                                                                                          administrations
## 16301                                                                                                                                                admission
## 16302                                                                                                                                                   admit�
## 16303                                                                                                                                                   advice
## 16304                                                                                                                                                  advised
## 16305                                                                                                                                                 advocate
## 16306                                                                                                                                               advocating
## 16307                                                                                                                                                  affects
## 16308                                                                                                                                             aggressively
## 16309                                                                                                                                                agotados�
## 16310                                                                                                                                                agreement
## 16311                                                                                                                                                      aid
## 16312                                                                                                                                                  airbags
## 16313                                                                                                                                                       ak
## 16314                                                                                                                                                      aka
## 16315                                                                                                                                                      ala
## 16316                                                                                                                                                  alameda
## 16317                                                                                                                                                  alcohol
## 16318                                                                                                                                                aleijadas
## 16319                                                                                                                                                alejandra
## 16320                                                                                                                                                alexander
## 16321                                                                                                                                                   alguno
## 16322                                                                                                                                                     alle
## 16323                                                                                                                                                    allen
## 16324                                                                                                                                                 allergic
## 16325                                                                                                                                                 allowing
## 16326                                                                                                                                                  almeida
## 16327                                                                                                                                                     alot
## 16328                                                                                                                                                    also�
## 16329                                                                                                                                                     alta
## 16330                                                                                                                                              alternativa
## 16331                                                                                                                                              alternative
## 16332                                                                                                                                                   amidst
## 16333                                                                                                                                              anaphylaxis
## 16334                                                                                                                                                    andre
## 16335                                                                                                                                                   andrew
## 16336                                                                                                                                                     andy
## 16337                                                                                                                                                      ann
## 16338                                                                                                                                                answering
## 16339                                                                                                                                                  answers
## 16340                                                                                                                                              anticipated
## 16341                                                                                                                                                   antics
## 16342                                                                                                                                                 antimask
## 16343                                                                                                                                              antimaskers
## 16344                                                                                                                                                   appeal
## 16345                                                                                                                                                    apple
## 16346                                                                                                                                                 approves
## 16347                                                                                                                                                    appts
## 16348                                                                                                                                                       ar
## 16349                                                                                                                                                      ara
## 16350                                                                                                                                                   ardent
## 16351                                                                                                                                                    area�
## 16352                                                                                                                                                     are�
## 16353                                                                                                                                                  arguing
## 16354                                                                                                                                                   arians
## 16355                                                                                                                                                 arkansas
## 16356                                                                                                                                                arlington
## 16357                                                                                                                                                   arrive
## 16358                                                                                                                                                 arrogant
## 16359                                                                                                                                                     arts
## 16360                                                                                                                                                   arwady
## 16361                                                                                                                                                     asap
## 16362                                                                                                                                                      asf
## 16363                                                                                                                                                    asian
## 16364                                                                                                                                                    assay
## 16365                                                                                                                                                 assuming
## 16366                                                                                                                                                   asthma
## 16367                                                                                                                                                      as�
## 16368                                                                                                                                                 athletes
## 16369                                                                                                                                                      att
## 16370                                                                                                                                                 attended
## 16371                                                                                                                                                attendees
## 16372                                                                                                                                             attributable
## 16373                                                                                                                                               attributed
## 16374                                                                                                                                                 aumentan
## 16375                                                                                                                                                  austria
## 16376                                                                                                                                               authorizes
## 16377                                                                                                                                                     auto
## 16378                                                                                                                                                   avance
## 16379                                                                                                                                                    awake
## 16380                                                                                                                                                   awards
## 16381                                                                                                                                                   b16402
## 16382                                                                                                                                                   babies
## 16383                                                                                                                                                  backlog
## 16384                                                                                                                                                 bacteria
## 16385                                                                                                                                                     bags
## 16386                                                                                                                                                  bailout
## 16387                                                                                                                                                     ball
## 16388                                                                                                                                                   ballad
## 16389                                                                                                                                                  banning
## 16390                                                                                                                                                     bans
## 16391                                                                                                                                                  baptism
## 16392                                                                                                                                                  baptist
## 16393                                                                                                                                                barcelona
## 16394                                                                                                                                                   bardot
## 16395                                                                                                                                             barranquitas
## 16396                                                                                                                                                   barred
## 16397                                                                                                                                                     bars
## 16398                                                                                                                                                 basement
## 16399                                                                                                                                                    basis
## 16400                                                                                                                                                   baxter
## 16401                                                                                                                                                      bbc
## 16402                                                                                                                                                    bears
## 16403                                                                                                                                                    beats
## 16404                                                                                                                                               behavioral
## 16405                                                                                                                                                  beijing
## 16406                                                                                                                                                   belief
## 16407                                                                                                                                                  beliefs
## 16408                                                                                                                                                    belly
## 16409                                                                                                                                                  belmont
## 16410                                                                                                                                                    bench
## 16411                                                                                                                                                  beshear
## 16412                                                                                                                                                      bid
## 16413                                                                                                                                                 bierhall
## 16414                                                                                                                                                biodesign
## 16415                                                                                                                                               birmingham
## 16416                                                                                                                                                    birth
## 16417                                                                                                                                                 birthday
## 16418                                                                                                                                                    bitch
## 16419                                                                                                                                                     bite
## 16420                                                                                                                                                  blatant
## 16421                                                                                                                                                    blind
## 16422                                                                                                                                              blockbuster
## 16423                                                                                                                                                 blocking
## 16424                                                                                                                                                    bluff
## 16425                                                                                                                                                      bmi
## 16426                                                                                                                                                 bnt162b2
## 16427                                                                                                                                                   boards
## 16428                                                                                                                                                     boat
## 16429                                                                                                                                                    bobby
## 16430                                                                                                                                                    boise
## 16431                                                                                                                                                  bolivia
## 16432                                                                                                                                                   bomber
## 16433                                                                                                                                                     boom
## 16434                                                                                                                                                    boost
## 16435                                                                                                                                                boostered
## 16436                                                                                                                                                     boot
## 16437                                                                                                                                                    bored
## 16438                                                                                                                                                     boss
## 16439                                                                                                                                                   bottle
## 16440                                                                                                                                                   bottom
## 16441                                                                                                                                                     bout
## 16442                                                                                                                                                    boxes
## 16443                                                                                                                                                      boy
## 16444                                                                                                                                                     boys
## 16445                                                                                                                                                  bradley
## 16446                                                                                                                                                    brags
## 16447                                                                                                                                                   branch
## 16448                                                                                                                                                 breakout
## 16449                                                                                                                                                   breath
## 16450                                                                                                                                                 brigitte
## 16451                                                                                                                                                brilliant
## 16452                                                                                                                                                 bringing
## 16453                                                                                                                                                    bruce
## 16454                                                                                                                                                    bryce
## 16455                                                                                                                                                      bts
## 16456                                                                                                                                                      btw
## 16457                                                                                                                                                     bucs
## 16458                                                                                                                                                  buddies
## 16459                                                                                                                                                    buena
## 16460                                                                                                                                                   buenas
## 16461                                                                                                                                                  buffalo
## 16462                                                                                                                                                      bug
## 16463                                                                                                                                                    build
## 16464                                                                                                                                                  burbank
## 16465                                                                                                                                                   burden
## 16466                                                                                                                                                   burger
## 16467                                                                                                                                                   burned
## 16468                                                                                                                                                   busses
## 16469                                                                                                                                                     butt
## 16470                                                                                                                                                 b�squeda
## 16471                                                                                                                                                     cada
## 16472                                                                                                                                                     cafe
## 16473                                                                                                                                               calculated
## 16474                                                                                                                                              californias
## 16475                                                                                                                                                    calma
## 16476                                                                                                                                                   camera
## 16477                                                                                                                                                 campuses
## 16478                                                                                                                                                   canada
## 16479                                                                                                                                                capricorn
## 16480                                                                                                                                                  cardiac
## 16481                                                                                                                                                    cared
## 16482                                                                                                                                               caregivers
## 16483                                                                                                                                                   carlos
## 16484                                                                                                                                                 carrying
## 16485                                                                                                                                                     casa
## 16486                                                                                                                                                   cases�
## 16487                                                                                                                                                     cast
## 16488                                                                                                                                                    causa
## 16489                                                                                                                                                     cave
## 16490                                                                                                                                                  caveats
## 16491                                                                                                                                              celebration
## 16492                                                                                                                                                  center�
## 16493                                                                                                                                                  century
## 16494                                                                                                                                                   cermak
## 16495                                                                                                                                              certificate
## 16496                                                                                                                                                    chain
## 16497                                                                                                                                                    chair
## 16498                                                                                                                                                 chairman
## 16499                                                                                                                                              challenging
## 16500                                                                                                                                                 changing
## 16501                                                                                                                                                  channel
## 16502                                                                                                                                                    chaos
## 16503                                                                                                                                                 chaplain
## 16504                                                                                                                                                  chapman
## 16505                                                                                                                                                character
## 16506                                                                                                                                                  charles
## 16507                                                                                                                                               charleston
## 16508                                                                                                                                               checkvaers
## 16509                                                                                                                                                   cheers
## 16510                                                                                                                                                  chelsea
## 16511                                                                                                                                                  chicano
## 16512                                                                                                                                                    chick
## 16513                                                                                                                                                childhood
## 16514                                                                                                                                                   chinas
## 16515                                                                                                                                                  chinese
## 16516                                                                                                                                                 choosing
## 16517                                                                                                                                                   chopra
## 16518                                                                                                                                                    chose
## 16519                                                                                                                                                chronicle
## 16520                                                                                                                                                   chucky
## 16521                                                                                                                                               cincinnati
## 16522                                                                                                                                                    cinco
## 16523                                                                                                                                                    civic
## 16524                                                                                                                                                    civil
## 16525                                                                                                                                            clarification
## 16526                                                                                                                                                    clark
## 16527                                                                                                                                                    clash
## 16528                                                                                                                                               classified
## 16529                                                                                                                                                 cleaning
## 16530                                                                                                                                                clickbait
## 16531                                                                                                                                                  clients
## 16532                                                                                                                                                    climb
## 16533                                                                                                                                                 clinical
## 16534                                                                                                                                                 closures
## 16535                                                                                                                                                 clueless
## 16536                                                                                                                                                  coaches
## 16537                                                                                                                                                     coat
## 16538                                                                                                                                            coinfecciones
## 16539                                                                                                                                             coinfections
## 16540                                                                                                                                                    colds
## 16541                                                                                                                                                    cold�
## 16542                                                                                                                                            collaborating
## 16543                                                                                                                                                  collect
## 16544                                                                                                                                                collected
## 16545                                                                                                                                               collecting
## 16546                                                                                                                                               collective
## 16547                                                                                                                                                    colts
## 16548                                                                                                                                                 columbus
## 16549                                                                                                                                                   column
## 16550                                                                                                                                              combinaci�n
## 16551                                                                                                                                                  combine
## 16552                                                                                                                                                 combined
## 16553                                                                                                                                                    comet
## 16554                                                                                                                                              comfortable
## 16555                                                                                                                                                 comienza
## 16556                                                                                                                                               commercial
## 16557                                                                                                                                              commercials
## 16558                                                                                                                                                   commit
## 16559                                                                                                                                               commitment
## 16560                                                                                                                                                committed
## 16561                                                                                                                                                committee
## 16562                                                                                                                                              community�s
## 16563                                                                                                                                                 companys
## 16564                                                                                                                                                comparing
## 16565                                                                                                                                               comparison
## 16566                                                                                                                                               compelling
## 16567                                                                                                                                           complications�
## 16568                                                                                                                                                component
## 16569                                                                                                                                               compulsory
## 16570                                                                                                                                                computers
## 16571                                                                                                                                               concussion
## 16572                                                                                                                                              condiciones
## 16573                                                                                                                                              conditional
## 16574                                                                                                                                              condolences
## 16575                                                                                                                                                  conduct
## 16576                                                                                                                                                conducted
## 16577                                                                                                                                                confident
## 16578                                                                                                                                                  confirm
## 16579                                                                                                                                                confusing
## 16580                                                                                                                                                confusion
## 16581                                                                                                                                                 congrats
## 16582                                                                                                                                          congratulations
## 16583                                                                                                                                            congresswoman
## 16584                                                                                                                                              connecticut
## 16585                                                                                                                                           considerations
## 16586                                                                                                                                                 constant
## 16587                                                                                                                                             constituents
## 16588                                                                                                                                                consulate
## 16589                                                                                                                                                contacted
## 16590                                                                                                                                               contagiado
## 16591                                                                                                                                                 contagio
## 16592                                                                                                                                                contained
## 16593                                                                                                                                            contemplating
## 16594                                                                                                                                               contenders
## 16595                                                                                                                                                contracts
## 16596                                                                                                                                           contradictions
## 16597                                                                                                                                            controversial
## 16598                                                                                                                                              controversy
## 16599                                                                                                                                             convalescent
## 16600                                                                                                                                               convenient
## 16601                                                                                                                                             conversation
## 16602                                                                                                                                                convinced
## 16603                                                                                                                                                   corner
## 16604                                                                                                                                            coronaviruses
## 16605                                                                                                                                                correctly
## 16606                                                                                                                                                  corrupt
## 16607                                                                                                                                               corruption
## 16608                                                                                                                                                 coughing
## 16609                                                                                                                                                 could�ve
## 16610                                                                                                                                                  countys
## 16611                                                                                                                                                   covid+
## 16612                                                                                                                                                 covid19+
## 16613                                                                                                                                        covid19associated
## 16614                                                                                                                                                 covid19i
## 16615                                                                                                                                                  covid20
## 16616                                                                                                                                                  covid22
## 16617                                                                                                                                                 covidiot
## 16618                                                                                                                                             covidrelated
## 16619                                                                                                                                                   coward
## 16620                                                                                                                                                      cox
## 16621                                                                                                                                                      cpd
## 16622                                                                                                                                                     cpps
## 16623                                                                                                                                                    crack
## 16624                                                                                                                                                    cream
## 16625                                                                                                                                                    creep
## 16626                                                                                                                                                 crenshaw
## 16627                                                                                                                                                criminals
## 16628                                                                                                                                                 criteria
## 16629                                                                                                                                               criticisms
## 16630                                                                                                                                           crosssectional
## 16631                                                                                                                                                  cruises
## 16632                                                                                                                                                      cry
## 16633                                                                                                                                                     cual
## 16634                                                                                                                                                   cuatro
## 16635                                                                                                                                                     cuba
## 16636                                                                                                                                                 cuidamos
## 16637                                                                                                                                                    cults
## 16638                                                                                                                                                 curbside
## 16639                                                                                                                                                    cures
## 16640                                                                                                                                                 customer
## 16641                                                                                                                                                customers
## 16642                                                                                                                                                      cuz
## 16643                                                                                                                                                     cv19
## 16644                                                                                                                                                       d3
## 16645                                                                                                                                                    daddy
## 16646                                                                                                                                                     dado
## 16647                                                                                                                                                   dafuck
## 16648                                                                                                                                                   dailey
## 16649                                                                                                                                                 damaging
## 16650                                                                                                                                                   damned
## 16651                                                                                                                                                     dang
## 16652                                                                                                                                                   daniel
## 16653                                                                                                                                                    darby
## 16654                                                                                                                                                  daycare
## 16655                                                                                                                                                 deadlier
## 16656                                                                                                                                                   death�
## 16657                                                                                                                                                     debe
## 16658                                                                                                                                                    deben
## 16659                                                                                                                                                 declares
## 16660                                                                                                                                                decreased
## 16661                                                                                                                                                   defeat
## 16662                                                                                                                                                defective
## 16663                                                                                                                                                   degree
## 16664                                                                                                                                                  deliver
## 16665                                                                                                                                                delmicron
## 16666                                                                                                                                                demanding
## 16667                                                                                                                                                 demencia
## 16668                                                                                                                                                democracy
## 16669                                                                                                                                               democratic
## 16670                                                                                                                                            demonstration
## 16671                                                                                                                                                   denial
## 16672                                                                                                                                                dentistas
## 16673                                                                                                                                             departamento
## 16674                                                                                                                                                departure
## 16675                                                                                                                                                  depends
## 16676                                                                                                                                               depression
## 16677                                                                                                                                            deprogramming
## 16678                                                                                                                                                     dept
## 16679                                                                                                                                                      des
## 16680                                                                                                                                                desantis�
## 16681                                                                                                                                                 deserves
## 16682                                                                                                                                                 designed
## 16683                                                                                                                                               desorienta
## 16684                                                                                                                                                desperate
## 16685                                                                                                                                              desperately
## 16686                                                                                                                                             destinations
## 16687                                                                                                                                                  destroy
## 16688                                                                                                                                                destroyed
## 16689                                                                                                                                                   detect
## 16690                                                                                                                                                     deve
## 16691                                                                                                                                                  develop
## 16692                                                                                                                                                  diablos
## 16693                                                                                                                                                     dice
## 16694                                                                                                                                                     diet
## 16695                                                                                                                                               diferencia
## 16696                                                                                                                                               difficulty
## 16697                                                                                                                                                     dijo
## 16698                                                                                                                                                   dinner
## 16699                                                                                                                                               disability
## 16700                                                                                                                                                 disabled
## 16701                                                                                                                                            disappointing
## 16702                                                                                                                                               discussion
## 16703                                                                                                                                                     dish
## 16704                                                                                                                                                disorders
## 16705                                                                                                                                                  dispara
## 16706                                                                                                                                                  display
## 16707                                                                                                                                       disproportionately
## 16708                                                                                                                                            disseminating
## 16709                                                                                                                                                distanced
## 16710                                                                                                                                              distinction
## 16711                                                                                                                                                     docs
## 16712                                                                                                                                              documentary
## 16713                                                                                                                                                   dollar
## 16714                                                                                                                                                  donovan
## 16715                                                                                                                                                     door
## 16716                                                                                                                                                  doubled
## 16717                                                                                                                                                    doubt
## 16718                                                                                                                                                   doubts
## 16719                                                                                                                                                     doug
## 16720                                                                                                                                                downplays
## 16721                                                                                                                                                 downward
## 16722                                                                                                                                                    draft
## 16723                                                                                                                                                    drink
## 16724                                                                                                                                                 drinking
## 16725                                                                                                                                                  drivers
## 16726                                                                                                                                             drivethrough
## 16727                                                                                                                                                  dropped
## 16728                                                                                                                                                    drove
## 16729                                                                                                                                                       du
## 16730                                                                                                                                                   dubbed
## 16731                                                                                                                                                    ducks
## 16732                                                                                                                                                      duh
## 16733                                                                                                                                                 dynamics
## 16734                                                                                                                                                   easier
## 16735                                                                                                                                                   easily
## 16736                                                                                                                                                     echo
## 16737                                                                                                                                                economies
## 16738                                                                                                                                                   editor
## 16739                                                                                                                                                      een
## 16740                                                                                                                                              effectively
## 16741                                                                                                                                              efficiently
## 16742                                                                                                                                                    elbow
## 16743                                                                                                                                                  elderly
## 16744                                                                                                                                                elections
## 16745                                                                                                                                                 elective
## 16746                                                                                                                                                    elite
## 16747                                                                                                                                                     ella
## 16748                                                                                                                                                   emails
## 16749                                                                                                                                                    embry
## 16750                                                                                                                                                emociones
## 16751                                                                                                                                                employers
## 16752                                                                                                                                            encouragement
## 16753                                                                                                                                               encourages
## 16754                                                                                                                                                encuentra
## 16755                                                                                                                                                  enfekte
## 16756                                                                                                                                                 enferman
## 16757                                                                                                                                              enforcement
## 16758                                                                                                                                                    enjoy
## 16759                                                                                                                                                 enpridan
## 16760                                                                                                                                                 entirety
## 16761                                                                                                                                           entrenamientos
## 16762                                                                                                                                                 enviaron
## 16763                                                                                                                                              environment
## 16764                                                                                                                                                 epidemic
## 16765                                                                                                                                                eradicate
## 16766                                                                                                                                                     eric
## 16767                                                                                                                                                 escalate
## 16768                                                                                                                                                esperamos
## 16769                                                                                                                                                   espero
## 16770                                                                                                                                               essentials
## 16771                                                                                                                                                    estas
## 16772                                                                                                                                                estimated
## 16773                                                                                                                                                 estudios
## 16774                                                                                                                                                   estuvo
## 16775                                                                                                                                                   ethnic
## 16776                                                                                                                                                 euroliga
## 16777                                                                                                                                               evansville
## 16778                                                                                                                                               everyone�s
## 16779                                                                                                                                                evidently
## 16780                                                                                                                                                evolution
## 16781                                                                                                                                                   evolve
## 16782                                                                                                                                                excelsior
## 16783                                                                                                                                                 exercise
## 16784                                                                                                                                                  existed
## 16785                                                                                                                                                  existen
## 16786                                                                                                                                                 expanded
## 16787                                                                                                                                                expanding
## 16788                                                                                                                                                  expects
## 16789                                                                                                                                               experiment
## 16790                                                                                                                                             experimental
## 16791                                                                                                                                                 expertos
## 16792                                                                                                                                               expiration
## 16793                                                                                                                                                explained
## 16794                                                                                                                                                exploding
## 16795                                                                                                                                                  explore
## 16796                                                                                                                                                   expose
## 16797                                                                                                                                                 exposing
## 16798                                                                                                                                                expressed
## 16799                                                                                                                                            extermination
## 16800                                                                                                                                                 facility
## 16801                                                                                                                                                  factors
## 16802                                                                                                                                                    faith
## 16803                                                                                                                                                    falar
## 16804                                                                                                                                               fallecidos
## 16805                                                                                                                                                   fallon
## 16806                                                                                                                                                    farce
## 16807                                                                                                                                               fastmoving
## 16808                                                                                                                                                      fat
## 16809                                                                                                                                                   fatige
## 16810                                                                                                                                                 favorite
## 16811                                                                                                                                                       fb
## 16812                                                                                                                                                       fe
## 16813                                                                                                                                                 feasible
## 16814                                                                                                                                                    feliz
## 16815                                                                                                                                                     fell
## 16816                                                                                                                                                   fellas
## 16817                                                                                                                                                 fentanyl
## 16818                                                                                                                                                      ffs
## 16819                                                                                                                                                       fi
## 16820                                                                                                                                                  fiction
## 16821                                                                                                                                                   fieber
## 16822                                                                                                                                                   fields
## 16823                                                                                                                                                  figured
## 16824                                                                                                                                                     file
## 16825                                                                                                                                                   filing
## 16826                                                                                                                                                     film
## 16827                                                                                                                                                  filming
## 16828                                                                                                                                                   finale
## 16829                                                                                                                                             firefighters
## 16830                                                                                                                                                   firing
## 16831                                                                                                                                                 fiscally
## 16832                                                                                                                                                      fix
## 16833                                                                                                                                                flashback
## 16834                                                                                                                                                     flex
## 16835                                                                                                                                                    flies
## 16836                                                                                                                                                 flipping
## 16837                                                                                                                                                    floor
## 16838                                                                                                                                              fluvoxamine
## 16839                                                                                                                                                      fly
## 16840                                                                                                                                                followers
## 16841                                                                                                                                                     fool
## 16842                                                                                                                                                 football
## 16843                                                                                                                                                   forbes
## 16844                                                                                                                                                  forcing
## 16845                                                                                                                                                     ford
## 16846                                                                                                                                                  fordham
## 16847                                                                                                                                               forgetting
## 16848                                                                                                                                                  forgive
## 16849                                                                                                                                                 formally
## 16850                                                                                                                                                 fortress
## 16851                                                                                                                                              fortunately
## 16852                                                                                                                                                   fought
## 16853                                                                                                                                                 franklin
## 16854                                                                                                                                                  fraught
## 16855                                                                                                                                                  frazier
## 16856                                                                                                                                                    freak
## 16857                                                                                                                                                 freezing
## 16858                                                                                                                                                    freno
## 16859                                                                                                                                                 freshman
## 16860                                                                                                                                                      fri
## 16861                                                                                                                                                 friday�s
## 16862                                                                                                                                                    fried
## 16863                                                                                                                                            friendsfamily
## 16864                                                                                                                                               friendship
## 16865                                                                                                                                                  friggin
## 16866                                                                                                                                                   fucked
## 16867                                                                                                                                                   fudido
## 16868                                                                                                                                                    funds
## 16869                                                                                                                                                     gain
## 16870                                                                                                                                                   garver
## 16871                                                                                                                                                      gen
## 16872                                                                                                                                               generation
## 16873                                                                                                                                                   gibson
## 16874                                                                                                                                                     gift
## 16875                                                                                                                                         gliederschmerzen
## 16876                                                                                                                                                 globally
## 16877                                                                                                                                                    glory
## 16878                                                                                                                                                      gma
## 16879                                                                                                                                                     goal
## 16880                                                                                                                                                    goals
## 16881                                                                                                                                               gobernador
## 16882                                                                                                                                                   gobert
## 16883                                                                                                                                                  goddamn
## 16884                                                                                                                                                  goedert
## 16885                                                                                                                                                     gold
## 16886                                                                                                                                                 goldberg
## 16887                                                                                                                                                goodnight
## 16888                                                                                                                                                    goody
## 16889                                                                                                                                            governmentrun
## 16890                                                                                                                                             government�s
## 16891                                                                                                                                           govrondesantis
## 16892                                                                                                                                                   grammy
## 16893                                                                                                                                            granddaughter
## 16894                                                                                                                                                 grandson
## 16895                                                                                                                                                    grant
## 16896                                                                                                                                                  granted
## 16897                                                                                                                                                   grants
## 16898                                                                                                                                                gratuitas
## 16899                                                                                                                                                 gratuito
## 16900                                                                                                                                               gravemente
## 16901                                                                                                                                                    greek
## 16902                                                                                                                                                     grew
## 16903                                                                                                                                                  grichka
## 16904                                                                                                                                                     grid
## 16905                                                                                                                                                   ground
## 16906                                                                                                                                                  grounds
## 16907                                                                                                                                                      gun
## 16908                                                                                                                                                  gunfire
## 16909                                                                                                                                                   guzm�n
## 16910                                                                                                                                                     h1n1
## 16911                                                                                                                                                    habr�
## 16912                                                                                                                                                    hacen
## 16913                                                                                                                                                  hacerse
## 16914                                                                                                                                                 haciendo
## 16915                                                                                                                                               hagerstown
## 16916                                                                                                                                                 halfsies
## 16917                                                                                                                                                hampshire
## 16918                                                                                                                                               handcuffed
## 16919                                                                                                                                                   handed
## 16920                                                                                                                                                  handing
## 16921                                                                                                                                                happiness
## 16922                                                                                                                                                     harm
## 16923                                                                                                                                                    harry
## 16924                                                                                                                                                   hasn�t
## 16925                                                                                                                                                     hays
## 16926                                                                                                                                                 headache
## 16927                                                                                                                                                   healed
## 16928                                                                                                                                                  hearing
## 16929                                                                                                                                            heartbreaking
## 16930                                                                                                                                                    hecho
## 16931                                                                                                                                                   height
## 16932                                                                                                                                                  helluva
## 16933                                                                                                                                                  henrico
## 16934                                                                                                                                                     hero
## 16935                                                                                                                                                 highland
## 16936                                                                                                                                                highlands
## 16937                                                                                                                                                highlight
## 16938                                                                                                                                                     hijo
## 16939                                                                                                                                                    hired
## 16940                                                                                                                                                 hispanic
## 16941                                                                                                                                                 historic
## 16942                                                                                                                                                      hiv
## 16943                                                                                                                                                     hizo
## 16944                                                                                                                                                    hogan
## 16945                                                                                                                                                 honestly
## 16946                                                                                                                                                  honesty
## 16947                                                                                                                                                    honor
## 16948                                                                                                                                                 hoosiers
## 16949                                                                                                                                                    hoped
## 16950                                                                                                                                                  hopeful
## 16951                                                                                                                                                horoscope
## 16952                                                                                                                                                    horse
## 16953                                                                                                                                        hospitalizaciones
## 16954                                                                                                                                               hospitals�
## 16955                                                                                                                                                   hosted
## 16956                                                                                                                                                      hot
## 16957                                                                                                                                               households
## 16958                                                                                                                                                  housing
## 16959                                                                                                                                                    hrqol
## 16960                                                                                                                                                      hrs
## 16961                                                                                                                                                       hs
## 16962                                                                                                                                  https://t.co/1hmyecvgdt
## 16963                                                                                                                                  https://t.co/3t0wbbhlpr
## 16964                                                                                                                                  https://t.co/3x0yidsgs3
## 16965                                                                                                                                  https://t.co/6htfots97r
## 16966                                                                                                                                  https://t.co/6sjba6nb0b
## 16967                                                                                                                                  https://t.co/6zwaaukzkh
## 16968                                                                                                                                  https://t.co/7pc2hgbfqf
## 16969                                                                                                                                  https://t.co/7s4s18v9vc
## 16970                                                                                                                                  https://t.co/acjebnnbhc
## 16971                                                                                                                                  https://t.co/aou8cepldn
## 16972                                                                                                                                  https://t.co/bn1q5xdftm
## 16973                                                                                                                                  https://t.co/cbilefbygv
## 16974                                                                                                                                  https://t.co/cjmkoldv5q
## 16975                                                                                                                                  https://t.co/da7httanoj
## 16976                                                                                                                                  https://t.co/dlfbifzad3
## 16977                                                                                                                                  https://t.co/dtdhyok7f6
## 16978                                                                                                                                  https://t.co/etiexge6ok
## 16979                                                                                                                                  https://t.co/f8oewsdzmb
## 16980                                                                                                                                  https://t.co/fcbkjw7nf0
## 16981                                                                                                                                  https://t.co/fxpt5ktbqg
## 16982                                                                                                                                  https://t.co/g0dx0f4lhr
## 16983                                                                                                                                  https://t.co/gzelpplgor
## 16984                                                                                                                                  https://t.co/hpco1iszdn
## 16985                                                                                                                                  https://t.co/hygxka3dbu
## 16986                                                                                                                                  https://t.co/j6fhqz2gqa
## 16987                                                                                                                                  https://t.co/jiexgem2i8
## 16988                                                                                                                                  https://t.co/l7rydziz31
## 16989                                                                                                                                  https://t.co/m5azusntjc
## 16990                                                                                                                                  https://t.co/nbdfvyrkzv
## 16991                                                                                                                                  https://t.co/q4gieeycdy
## 16992                                                                                                                                 https://t.co/qz88lssfdt.
## 16993                                                                                                                                  https://t.co/rjmdt6ckdr
## 16994                                                                                                                                  https://t.co/rponrvhjjg
## 16995                                                                                                                                  https://t.co/sdpf5xfvvi
## 16996                                                                                                                                  https://t.co/shrwsyigfu
## 16997                                                                                                                                  https://t.co/vojinirgtu
## 16998                                                                                                                                 https://t.co/vzojifkssm.
## 16999                                                                                                                                  https://t.co/wdosbdqvtq
## 17000                                                                                                                                  https://t.co/wjiwlvmb2o
## 17001                                                                                                                                  https://t.co/x71pd7uoxc
## 17002                                                                                                                                  https://t.co/xgztlanucs
## 17003                                                                                                                                  https://t.co/yrwnzlaqse
## 17004                                                                                                                                  https://t.co/zc9njedov7
## 17005                                                                                                                                                  hundred
## 17006                                                                                                                                                     hung
## 17007                                                                                                                                                  hygiene
## 17008                                                                                                                                             hypertension
## 17009                                                                                                                                                      i95
## 17010                                                                                                                                                      ice
## 17011                                                                                                                                                 identify
## 17012                                                                                                                                                  idiotic
## 17013                                                                                                                                                     igor
## 17014                                                                                                                                                    igual
## 17015                                                                                                                                                 illness�
## 17016                                                                                                                                                     imho
## 17017                                                                                                                                                 imminent
## 17018                                                                                                                                                  impacto
## 17019                                                                                                                                               impairment
## 17020                                                                                                                                                implement
## 17021                                                                                                                                             implications
## 17022                                                                                                                                                 improper
## 17023                                                                                                                                                improving
## 17024                                                                                                                                                 inaction
## 17025                                                                                                                                               incidencia
## 17026                                                                                                                                                  incited
## 17027                                                                                                                                               incredibly
## 17028                                                                                                                                            independently
## 17029                                                                                                                                               indicaci�n
## 17030                                                                                                                                               indication
## 17031                                                                                                                                               indigenous
## 17032                                                                                                                                               individual
## 17033                                                                                                                                               inequality
## 17034                                                                                                                                                 infartos
## 17035                                                                                                                                                infecci�n
## 17036                                                                                                                                                inflation
## 17037                                                                                                                                              informaci�n
## 17038                                                                                                                                                informing
## 17039                                                                                                                                           infrastructure
## 17040                                                                                                                                                   inhome
## 17041                                                                                                                                                   inicio
## 17042                                                                                                                                                   inject
## 17043                                                                                                                                               injunction
## 17044                                                                                                                                                  injured
## 17045                                                                                                                                                   innova
## 17046                                                                                                                                                inpatient
## 17047                                                                                                                                                 insanity
## 17048                                                                                                                                              insensitive
## 17049                                                                                                                                                  insider
## 17050                                                                                                                                                 insomnia
## 17051                                                                                                                                                  inspire
## 17052                                                                                                                                                 inspired
## 17053                                                                                                                                                  instant
## 17054                                                                                                                                               instituted
## 17055                                                                                                                                              institution
## 17056                                                                                                                                            institutional
## 17057                                                                                                                                               instrument
## 17058                                                                                                                                                   intact
## 17059                                                                                                                                             intelligence
## 17060                                                                                                                                                  intense
## 17061                                                                                                                                          interchangeably
## 17062                                                                                                                                               interviews
## 17063                                                                                                                                            investigation
## 17064                                                                                                                                               investment
## 17065                                                                                                                                                invitamos
## 17066                                                                                                                                                   invite
## 17067                                                                                                                                                     iowa
## 17068                                                                                                                                                   irvine
## 17069                                                                                                                                                      isd
## 17070                                                                                                                                                     isds
## 17071                                                                                                                                                      is�
## 17072                                                                                                                                                  iversen
## 17073                                                                                                                                             jacksonville
## 17074                                                                                                                                                     jake
## 17075                                                                                                                                                  jessica
## 17076                                                                                                                                                     jews
## 17077                                                                                                                                                    jews�
## 17078                                                                                                                                                      jim
## 17079                                                                                                                                                    jimmy
## 17080                                                                                                                                                  jornada
## 17081                                                                                                                                                   joseph
## 17082                                                                                                                                              journalists
## 17083                                                                                                                                                      jre
## 17084                                                                                                                                                jugadores
## 17085                                                                                                                                                     jump
## 17086                                                                                                                                                    junto
## 17087                                                                                                                                                     jury
## 17088                                                                                                                                                  justice
## 17089                                                                                                                                                   kamala
## 17090                                                                                                                                                    karen
## 17091                                                                                                                                                    kathy
## 17092                                                                                                                                                    kawan
## 17093                                                                                                                                                     kcmo
## 17094                                                                                                                                                 kentucky
## 17095                                                                                                                                                 ketching
## 17096                                                                                                                                                   kicked
## 17097                                                                                                                                                  kicking
## 17098                                                                                                                                                      kid
## 17099                                                                                                                                                    kid�s
## 17100                                                                                                                                                    kings
## 17101                                                                                                                                                    klain
## 17102                                                                                                                                                   knicks
## 17103                                                                                                                                                    knock
## 17104                                                                                                                                                    kongs
## 17105                                                                                                                                                  koolaid
## 17106                                                                                                                                                    kotyk
## 17107                                                                                                                                                   kroger
## 17108                                                                                                                                                  kshaped
## 17109                                                                                                                                              laboratorio
## 17110                                                                                                                                             laboratorios
## 17111                                                                                                                                                   ladapo
## 17112                                                                                                                                                   larger
## 17113                                                                                                                                                    largo
## 17114                                                                                                                                                    larry
## 17115                                                                                                                                                  lashley
## 17116                                                                                                                                                   lasted
## 17117                                                                                                                                                  latinos
## 17118                                                                                                                                                   latinx
## 17119                                                                                                                                               lauderdale
## 17120                                                                                                                                                   launch
## 17121                                                                                                                                                lawmakers
## 17122                                                                                                                                               laws�allow
## 17123                                                                                                                                                   league
## 17124                                                                                                                                                     lean
## 17125                                                                                                                                                      lee
## 17126                                                                                                                                                lehighton
## 17127                                                                                                                                                    lemon
## 17128                                                                                                                                                   lestat
## 17129                                                                                                                                                    liars
## 17130                                                                                                                                                  liberty
## 17131                                                                                                                                                      lic
## 17132                                                                                                                                                  license
## 17133                                                                                                                                                     liga
## 17134                                                                                                                                                 limiting
## 17135                                                                                                                                                  lindsay
## 17136                                                                                                                                                  lindsey
## 17137                                                                                                                                                    linea
## 17138                                                                                                                                                  lineage
## 17139                                                                                                                                                   lionel
## 17140                                                                                                                                                    lipid
## 17141                                                                                                                                                    lista
## 17142                                                                                                                                                   llamar
## 17143                                                                                                                                                     lmao
## 17144                                                                                                                                                     load
## 17145                                                                                                                                               loathesome
## 17146                                                                                                                                                    lobby
## 17147                                                                                                                                                     lock
## 17148                                                                                                                                                    locks
## 17149                                                                                                                                                    logan
## 17150                                                                                                                                                     loop
## 17151                                                                                                                                                       lt
## 17152                                                                                                                                                  luckily
## 17153                                                                                                                                                  luggage
## 17154                                                                                                                                                    lungs
## 17155                                                                                                                                                   luther
## 17156                                                                                                                                                      l�t
## 17157                                                                                                                                                     maam
## 17158                                                                                                                                                   madden
## 17159                                                                                                                                                  madison
## 17160                                                                                                                                                   madrid
## 17161                                                                                                                                                 maestros
## 17162                                                                                                                                                  mailing
## 17163                                                                                                                                               mainstream
## 17164                                                                                                                                              maintaining
## 17165                                                                                                                                                  malaria
## 17166                                                                                                                                                     male
## 17167                                                                                                                                                 malveaux
## 17168                                                                                                                                                   manage
## 17169                                                                                                                                               manageable
## 17170                                                                                                                                               management
## 17171                                                                                                                                                 managing
## 17172                                                                                                                                                  manatee
## 17173                                                                                                                                                   manera
## 17174                                                                                                                                               manipulate
## 17175                                                                                                                                                    manos
## 17176                                                                                                                                                   manuel
## 17177                                                                                                                                                     man�
## 17178                                                                                                                                                   marcos
## 17179                                                                                                                                                marketing
## 17180                                                                                                                                                 maskless
## 17181                                                                                                                                                  matchup
## 17182                                                                                                                                                materials
## 17183                                                                                                                                                  meaning
## 17184                                                                                                                                               meaningful
## 17185                                                                                                                                                    meant
## 17186                                                                                                                                                 meantime
## 17187                                                                                                                                                medically
## 17188                                                                                                                                                  medidas
## 17189                                                                                                                                                     mega
## 17190                                                                                                                                                    mejor
## 17191                                                                                                                                                   memory
## 17192                                                                                                                                                  menores
## 17193                                                                                                                                                    menos
## 17194                                                                                                                                                 mensajes
## 17195                                                                                                                                                mentality
## 17196                                                                                                                                                      mes
## 17197                                                                                                                                                     mess
## 17198                                                                                                                                                   messed
## 17199                                                                                                                                               metabolism
## 17200                                                                                                                                                    metal
## 17201                                                                                                                                                   method
## 17202                                                                                                                                       metrosqrverizonnet
## 17203                                                                                                                                                      me�
## 17204                                                                                                                                                     mgm3
## 17205                                                                                                                                                     mice
## 17206                                                                                                                                               midjanuary
## 17207                                                                                                                                                  midtown
## 17208                                                                                                                                                 miembros
## 17209                                                                                                                                                 might�ve
## 17210                                                                                                                                                      mil
## 17211                                                                                                                                                     mile
## 17212                                                                                                                                                   mill�n
## 17213                                                                                                                                                milwaukee
## 17214                                                                                                                                                  minimal
## 17215                                                                                                                                               minimizing
## 17216                                                                                                                                              minneapolis
## 17217                                                                                                                                                 minority
## 17218                                                                                                                                                    minot
## 17219                                                                                                                                                   minute
## 17220                                                                                                                                                     mira
## 17221                                                                                                                                                  misinfo
## 17222                                                                                                                                              misinformed
## 17223                                                                                                                                                  mislead
## 17224                                                                                                                                                 mitchell
## 17225                                                                                                                                               mobilizing
## 17226                                                                                                                                                 moderate
## 17227                                                                                                                                                molecular
## 17228                                                                                                                                             molnupiravir
## 17229                                                                                                                                                      mon
## 17230                                                                                                                                           mondaysaturday
## 17231                                                                                                                                               monitoring
## 17232                                                                                                                                               monopolies
## 17233                                                                                                                                               montgomery
## 17234                                                                                                                                                 montreal
## 17235                                                                                                                                                    monty
## 17236                                                                                                                                                   mortal
## 17237                                                                                                                                                   mortas
## 17238                                                                                                                                                  mostert
## 17239                                                                                                                                                   motive
## 17240                                                                                                                                                    motor
## 17241                                                                                                                                                    mpusd
## 17242                                                                                                                                                    msu�s
## 17243                                                                                                                                                       mt
## 17244                                                                                                                                                    mucho
## 17245                                                                                                                                                   mueran
## 17246                                                                                                                                                  museums
## 17247                                                                                                                                                   mutant
## 17248                                                                                                                                                  mutates
## 17249                                                                                                                                                    muted
## 17250                                                                                                                                                       na
## 17251                                                                                                                                                     nada
## 17252                                                                                                                                                    nadie
## 17253                                                                                                                                                      nah
## 17254                                                                                                                                                    names
## 17255                                                                                                                                                nashville
## 17256                                                                                                                                                     nate
## 17257                                                                                                                                                  nations
## 17258                                                                                                                                                   nature
## 17259                                                                                                                                                      nba
## 17260                                                                                                                                                       nc
## 17261                                                                                                                                                 ndifreke
## 17262                                                                                                                                                 nearterm
## 17263                                                                                                                                              necessarily
## 17264                                                                                                                                                negative�
## 17265                                                                                                                                                  network
## 17266                                                                                                                                             neurological
## 17267                                                                                                                                                    newly
## 17268                                                                                                                                                  newport
## 17269                                                                                                                                                       nh
## 17270                                                                                                                                                  night�s
## 17271                                                                                                                                                      nih
## 17272                                                                                                                                                       nj
## 17273                                                                                                                                                     nlrb
## 17274                                                                                                                                                nominated
## 17275                                                                                                                                              noninvasive
## 17276                                                                                                                                                 nonsense
## 17277                                                                                                                                           nontraditional
## 17278                                                                                                                                                nonurgent
## 17279                                                                                                                                             northwestern
## 17280                                                                                                                                                 nosotros
## 17281                                                                                                                                                    noted
## 17282                                                                                                                                                    notes
## 17283                                                                                                                                                      nou
## 17284                                                                                                                                                     nous
## 17285                                                                                                                                                     now�
## 17286                                                                                                                                                  nuestra
## 17287                                                                                                                                                  nuestro
## 17288                                                                                                                                               nuevamente
## 17289                                                                                                                                                nutrition
## 17290                                                                                                                                                      nye
## 17291                                                                                                                                                     nypd
## 17292                                                                                                                                                     obey
## 17293                                                                                                                                                 obliga�o
## 17294                                                                                                                                                 obsessed
## 17295                                                                                                                                                obsessing
## 17296                                                                                                                                                     ocda
## 17297                                                                                                                                                      oct
## 17298                                                                                                                                                  offered
## 17299                                                                                                                                                 oklahoma
## 17300                                                                                                                                                     okon
## 17301                                                                                                                                                       ol
## 17302                                                                                                                                                      oms
## 17303                                                                                                                                                 onethird
## 17304                                                                                                                                                     one�
## 17305                                                                                                                                                    one�s
## 17306                                                                                                                                                   openly
## 17307                                                                                                                                                operating
## 17308                                                                                                                                               operations
## 17309                                                                                                                                                 opinions
## 17310                                                                                                                                                 opponent
## 17311                                                                                                                                                  optimal
## 17312                                                                                                                                               optimizing
## 17313                                                                                                                                                    orden
## 17314                                                                                                                                                organized
## 17315                                                                                                                                               originally
## 17316                                                                                                                                                  orleans
## 17317                                                                                                                                                    otros
## 17318                                                                                                                                                  outcome
## 17319                                                                                                                                                 outdated
## 17320                                                                                                                                                    outta
## 17321                                                                                                                                                 overcome
## 17322                                                                                                                                               overworked
## 17323                                                                                                                                                    owens
## 17324                                                                                                                                                     pace
## 17325                                                                                                                                                pacientes
## 17326                                                                                                                                                  pacific
## 17327                                                                                                                                                   packed
## 17328                                                                                                                                                   padres
## 17329                                                                                                                                                    paint
## 17330                                                                                                                                                  panarin
## 17331                                                                                                                                                pandemic�
## 17332                                                                                                                                                      par
## 17333                                                                                                                                                   parece
## 17334                                                                                                                                                   parent
## 17335                                                                                                                                             parishioners
## 17336                                                                                                                                                   parque
## 17337                                                                                                                                                partially
## 17338                                                                                                                                            participating
## 17339                                                                                                                                            participation
## 17340                                                                                                                                              partnership
## 17341                                                                                                                                                      pas
## 17342                                                                                                                                                 pasadena
## 17343                                                                                                                                                   pasado
## 17344                                                                                                                                                   pastor
## 17345                                                                                                                                                 paterson
## 17346                                                                                                                                                 patience
## 17347                                                                                                                                                   patrol
## 17348                                                                                                                                                 paxlovid
## 17349                                                                                                                                                   payaso
## 17350                                                                                                                                                   paying
## 17351                                                                                                                                                 payments
## 17352                                                                                                                                                     pays
## 17353                                                                                                                                                  pegaram
## 17354                                                                                                                                                     peg�
## 17355                                                                                                                                                  pending
## 17356                                                                                                                                                     penn
## 17357                                                                                                                                           pennsylvania�s
## 17358                                                                                                                                                 pentagon
## 17359                                                                                                                                                  peoples
## 17360                                                                                                                                               percentage
## 17361                                                                                                                                               persistent
## 17362                                                                                                                                                personnel
## 17363                                                                                                                                             perspectives
## 17364                                                                                                                                              pestilences
## 17365                                                                                                                                                    petri
## 17366                                                                                                                                               pharmacist
## 17367                                                                                                                                                    phase
## 17368                                                                                                                                             philadelphia
## 17369                                                                                                                                                   philly
## 17370                                                                                                                                               physicians
## 17371                                                                                                                                              physician�s
## 17372                                                                                                                                                    picks
## 17373                                                                                                                                                     piss
## 17374                                                                                                                                                    pixar
## 17375                                                                                                                                                  plagues
## 17376                                                                                                                                                    plain
## 17377                                                                                                                                                   plasma
## 17378                                                                                                                                                    plays
## 17379                                                                                                                                                     plea
## 17380                                                                                                                                                 pleasant
## 17381                                                                                                                                                    pluto
## 17382                                                                                                                                                  podendo
## 17383                                                                                                                                                   poised
## 17384                                                                                                                                                   poison
## 17385                                                                                                                                                  policy�
## 17386                                                                                                                                               politician
## 17387                                                                                                                                              politicized
## 17388                                                                                                                                                   poorly
## 17389                                                                                                                                                    popup
## 17390                                                                                                                                                   popups
## 17391                                                                                                                                                   portal
## 17392                                                                                                                                                positives
## 17393                                                                                                                                                postpones
## 17394                                                                                                                                                    posts
## 17395                                                                                                                                                    potus
## 17396                                                                                                                                                      ppe
## 17397                                                                                                                                                      ppv
## 17398                                                                                                                                                       pr
## 17399                                                                                                                                                      prc
## 17400                                                                                                                                               precaution
## 17401                                                                                                                                              preliminary
## 17402                                                                                                                                                 prepared
## 17403                                                                                                                                               presidente
## 17404                                                                                                                                                primarily
## 17405                                                                                                                                                  primera
## 17406                                                                                                                                                principle
## 17407                                                                                                                                               prioritize
## 17408                                                                                                                                              prioritized
## 17409                                                                                                                                             prioritizing
## 17410                                                                                                                                                  prisons
## 17411                                                                                                                                                processed
## 17412                                                                                                                                                 produced
## 17413                                                                                                                                                 producer
## 17414                                                                                                                                              professions
## 17415                                                                                                                                                   profit
## 17416                                                                                                                                                  profits
## 17417                                                                                                                                              programming
## 17418                                                                                                                                                 progress
## 17419                                                                                                                                                  project
## 17420                                                                                                                                                projected
## 17421                                                                                                                                                  promise
## 17422                                                                                                                                                 promises
## 17423                                                                                                                                               proportion
## 17424                                                                                                                                              prosecutors
## 17425                                                                                                                                                  protest
## 17426                                                                                                                                                 provider
## 17427                                                                                                                                               psychosis�
## 17428                                                                                                                                                psychotic
## 17429                                                                                                                                                     ptsd
## 17430                                                                                                                                                   pueden
## 17431                                                                                                                                                     pues
## 17432                                                                                                                                                     pull
## 17433                                                                                                                                                pulmonary
## 17434                                                                                                                                                punishing
## 17435                                                                                                                                                 purchase
## 17436                                                                                                                                                   purple
## 17437                                                                                                                                                purposely
## 17438                                                                                                                                                   pushes
## 17439                                                                                                                                                       qr
## 17440                                                                                                                                             quasispecies
## 17441                                                                                                                                                    quest
## 17442                                                                                                                                             questionable
## 17443                                                                                                                                              questioning
## 17444                                                                                                                                                    queue
## 17445                                                                                                                                                    quien
## 17446                                                                                                                                                   quiero
## 17447                                                                                                                                                 quintile
## 17448                                                                                                                                                   quoted
## 17449                                                                                                                                                     rain
## 17450                                                                                                                                                      ran
## 17451                                                                                                                                                   random
## 17452                                                                                                                                                    range
## 17453                                                                                                                                                   ranked
## 17454                                                                                                                                                     rare
## 17455                                                                                                                                                    raros
## 17456                                                                                                                                                      raw
## 17457                                                                                                                                                    raz�n
## 17458                                                                                                                                                       rb
## 17459                                                                                                                                                  reaches
## 17460                                                                                                                                                    react
## 17461                                                                                                                                                    reads
## 17462                                                                                                                                             reassessment
## 17463                                                                                                                                               reassuring
## 17464                                                                                                                                                      rec
## 17465                                                                                                                                                 receives
## 17466                                                                                                                                                   recib�
## 17467                                                                                                                                              recognition
## 17468                                                                                                                                           recommendation
## 17469                                                                                                                                                 recordar
## 17470                                                                                                                                               recreation
## 17471                                                                                                                                                recycling
## 17472                                                                                                                                                 reducing
## 17473                                                                                                                                               reemerging
## 17474                                                                                                                                               reevaluate
## 17475                                                                                                                                                   reform
## 17476                                                                                                                                                   regain
## 17477                                                                                                                                                   regime
## 17478                                                                                                                                               registered
## 17479                                                                                                                                                 registra
## 17480                                                                                                                                                 regresar
## 17481                                                                                                                                                regularly
## 17482                                                                                                                                                     reid
## 17483                                                                                                                                            reimbursement
## 17484                                                                                                                                                 relation
## 17485                                                                                                                                                 relative
## 17486                                                                                                                                                 relevant
## 17487                                                                                                                                                     rely
## 17488                                                                                                                                                remainder
## 17489                                                                                                                                                 remained
## 17490                                                                                                                                                  remarks
## 17491                                                                                                                                                   remind
## 17492                                                                                                                                                reminding
## 17493                                                                                                                                                   reopen
## 17494                                                                                                                                                  repairs
## 17495                                                                                                                                                   repeat
## 17496                                                                                                                                                repeating
## 17497                                                                                                                                                  replies
## 17498                                                                                                                                           representation
## 17499                                                                                                                                          representatives
## 17500                                                                                                                                               requesting
## 17501                                                                                                                                               researcher
## 17502                                                                                                                                                   resign
## 17503                                                                                                                                                  respect
## 17504                                                                                                                                               respirator
## 17505                                                                                                                                            respiratorios
## 17506                                                                                                                                             respirat�rio
## 17507                                                                                                                                           responsibility
## 17508                                                                                                                                               restricted
## 17509                                                                                                                                                resulting
## 17510                                                                                                                                                  rethink
## 17511                                                                                                                                               retirement
## 17512                                                                                                                                                   reveal
## 17513                                                                                                                                                  revenue
## 17514                                                                                                                                                  reverse
## 17515                                                                                                                                                 reviewed
## 17516                                                                                                                                                  revised
## 17517                                                                                                                                                 rhetoric
## 17518                                                                                                                                               rhinovirus
## 17519                                                                                                                                                   rialto
## 17520                                                                                                                                                     rich
## 17521                                                                                                                                                 riddance
## 17522                                                                                                                                                     ride
## 17523                                                                                                                                                      rna
## 17524                                                                                                                                                    rocky
## 17525                                                                                                                                                  rodgers
## 17526                                                                                                                                                  rollins
## 17527                                                                                                                                                     rona
## 17528                                                                                                                                                   rookie
## 17529                                                                                                                                                    royal
## 17530                                                                                                                                                      rsv
## 17531                                                                                                                                                    runny
## 17532                                                                                                                                                     runs
## 17533                                                                                                                                                    rural
## 17534                                                                                                                                                   russia
## 17535                                                                                                                                                       rv
## 17536                                                                                                                                                   r�pida
## 17537                                                                                                                                                     sabe
## 17538                                                                                                                                                sacrament
## 17539                                                                                                                                                    safer
## 17540                                                                                                                                                   salary
## 17541                                                                                                                                                    sales
## 17542                                                                                                                                              salivabased
## 17543                                                                                                                                                    santa
## 17544                                                                                                                                                      sat
## 17545                                                                                                                                               saturday�s
## 17546                                                                                                                                                 savannah
## 17547                                                                                                                                                   saving
## 17548                                                                                                                                                       sb
## 17549                                                                                                                                                    scare
## 17550                                                                                                                                                    scene
## 17551                                                                                                                                               scheduling
## 17552                                                                                                                                                   scheme
## 17553                                                                                                                                                    scott
## 17554                                                                                                                                                 scratchy
## 17555                                                                                                                                                screaming
## 17556                                                                                                                                                      sdp
## 17557                                                                                                                                                      sea
## 17558                                                                                                                                                     sean
## 17559                                                                                                                                                seatbelts
## 17560                                                                                                                                                  seattle
## 17561                                                                                                                                                secondary
## 17562                                                                                                                                                  segundo
## 17563                                                                                                                                                   segura
## 17564                                                                                                                                                   select
## 17565                                                                                                                                              selfisolate
## 17566                                                                                                                                                    sells
## 17567                                                                                                                                                  semanas
## 17568                                                                                                                                                    sends
## 17569                                                                                                                                                    senil
## 17570                                                                                                                                                 sentence
## 17571                                                                                                                                                servicios
## 17572                                                                                                                                                     ser�
## 17573                                                                                                                                                    ser�a
## 17574                                                                                                                                                     sets
## 17575                                                                                                                                                     sham
## 17576                                                                                                                                                shapiro�s
## 17577                                                                                                                                                    shark
## 17578                                                                                                                                                    sheik
## 17579                                                                                                                                                   shelby
## 17580                                                                                                                                                   shield
## 17581                                                                                                                                                 shifting
## 17582                                                                                                                                                   shifts
## 17583                                                                                                                                                 shipment
## 17584                                                                                                                                                 shopping
## 17585                                                                                                                                                shortened
## 17586                                                                                                                                               shortening
## 17587                                                                                                                                                  shorter
## 17588                                                                                                                                              shorthanded
## 17589                                                                                                                                                 showcase
## 17590                                                                                                                                                  shurmur
## 17591                                                                                                                                                 shutting
## 17592                                                                                                                                                 sickness
## 17593                                                                                                                                                sidelined
## 17594                                                                                                                                                     sigh
## 17595                                                                                                                                                siguiendo
## 17596                                                                                                                                                   simone
## 17597                                                                                                                                           simultaneously
## 17598                                                                                                                                                sincerely
## 17599                                                                                                                                                  sinking
## 17600                                                                                                                                                 sintomas
## 17601                                                                                                                                                  sitting
## 17602                                                                                                                                                   slight
## 17603                                                                                                                                                  smarter
## 17604                                                                                                                                                    smile
## 17605                                                                                                                                                    smoke
## 17606                                                                                                                                                  smoking
## 17607                                                                                                                                                 sneezing
## 17608                                                                                                                                                    snowy
## 17609                                                                                                                                                  soaring
## 17610                                                                                                                                                 socially
## 17611                                                                                                                                                 software
## 17612                                                                                                                                                   solved
## 17613                                                                                                                                                    somos
## 17614                                                                                                                                                    sorta
## 17615                                                                                                                                                southwest
## 17616                                                                                                                                                   spaces
## 17617                                                                                                                                                     spat
## 17618                                                                                                                                                  speaker
## 17619                                                                                                                                                   speaks
## 17620                                                                                                                                                specialty
## 17621                                                                                                                                                  spewing
## 17622                                                                                                                                                  spiking
## 17623                                                                                                                                                     spin
## 17624                                                                                                                                        spokesmanrecorder
## 17625                                                                                                                                                sponsored
## 17626                                                                                                                                                    sport
## 17627                                                                                                                                                     spot
## 17628                                                                                                                                                  springs
## 17629                                                                                                                                                   square
## 17630                                                                                                                                                      ssr
## 17631                                                                                                                                                stability
## 17632                                                                                                                                                   staff�
## 17633                                                                                                                                                   stages
## 17634                                                                                                                                                  staging
## 17635                                                                                                                                                 stamford
## 17636                                                                                                                                                   stance
## 17637                                                                                                                                                 standard
## 17638                                                                                                                                                standards
## 17639                                                                                                                                                 stanford
## 17640                                                                                                                                                    stars
## 17641                                                                                                                                                     stat
## 17642                                                                                                                                                statewide
## 17643                                                                                                                                                  stating
## 17644                                                                                                                                                 stations
## 17645                                                                                                                                                    stats
## 17646                                                                                                                                                    stays
## 17647                                                                                                                                                    steal
## 17648                                                                                                                                                 steelers
## 17649                                                                                                                                                     stem
## 17650                                                                                                                                                  stepped
## 17651                                                                                                                                                    steps
## 17652                                                                                                                                                 stitches
## 17653                                                                                                                                                stockpile
## 17654                                                                                                                                                    stops
## 17655                                                                                                                                                  storage
## 17656                                                                                                                                                    storm
## 17657                                                                                                                                                  strains
## 17658                                                                                                                                                    straw
## 17659                                                                                                                                                 strength
## 17660                                                                                                                                                 stressed
## 17661                                                                                                                                                  stretch
## 17662                                                                                                                                                   strike
## 17663                                                                                                                                                    strip
## 17664                                                                                                                                                  stripes
## 17665                                                                                                                                                  strong�
## 17666                                                                                                                                                stupidity
## 17667                                                                                                                                            substantially
## 17668                                                                                                                                               substitute
## 17669                                                                                                                                               successful
## 17670                                                                                                                                                 suggests
## 17671                                                                                                                                                     suny
## 17672                                                                                                                                                  superar
## 17673                                                                                                                                                superstar
## 17674                                                                                                                                               supporting
## 17675                                                                                                                                                 suppress
## 17676                                                                                                                                               suppressed
## 17677                                                                                                                                                      sur
## 17678                                                                                                                                                surprised
## 17679                                                                                                                                               surprising
## 17680                                                                                                                                                  surreal
## 17681                                                                                                                                                survivors
## 17682                                                                                                                                                  suspect
## 17683                                                                                                                                                sutcliffe
## 17684                                                                                                                                                  swabbed
## 17685                                                                                                                                                  swagger
## 17686                                                                                                                                                    sweet
## 17687                                                                                                                                                 sweetgum
## 17688                                                                                                                                                    swept
## 17689                                                                                                                                                   switch
## 17690                                                                                                                                              sympathetic
## 17691                                                                                                                                                       s�
## 17692                                                                                                                                                   talked
## 17693                                                                                                                                                     task
## 17694                                                                                                                                                 taxpayer
## 17695                                                                                                                                                     tccc
## 17696                                                                                                                                               technology
## 17697                                                                                                                                                   tejano
## 17698                                                                                                                                                temporary
## 17699                                                                                                                                                  tenemos
## 17700                                                                                                                                                   tennis
## 17701                                                                                                                                                 tensions
## 17702                                                                                                                                                 terrible
## 17703                                                                                                                                                    teste
## 17704                                                                                                                                                   theory
## 17705                                                                                                                                                  therapy
## 17706                                                                                                                                                      tho
## 17707                                                                                                                                                     thou
## 17708                                                                                                                                     thoughts<u+0001f4ac>
## 17709                                                                                                                                                 thousand
## 17710                                                                                                                                                  thread�
## 17711                                                                                                                                                 threaten
## 17712                                                                                                                                                    throw
## 17713                                                                                                                                                 throwing
## 17714                                                                                                                                                    thurs
## 17715                                                                                                                                                   tienen
## 17716                                                                                                                                                    tight
## 17717                                                                                                                                                   tiktok
## 17718                                                                                                                                                      til
## 17719                                                                                                                                                 timoth�e
## 17720                                                                                                                                                     tips
## 17721                                                                                                                                                       tn
## 17722                                                                                                                                                  todav�a
## 17723                                                                                                                                                  toddler
## 17724                                                                                                                                                 toddlers
## 17725                                                                                                                                                 tolerant
## 17726                                                                                                                                                     too�
## 17727                                                                                                                                                   topics
## 17728                                                                                                                                                  tougher
## 17729                                                                                                                                                  tourism
## 17730                                                                                                                                               tournament
## 17731                                                                                                                                                    touts
## 17732                                                                                                                                                  trabajo
## 17733                                                                                                                                                    trace
## 17734                                                                                                                                                tradition
## 17735                                                                                                                                              traditional
## 17736                                                                                                                                                    train
## 17737                                                                                                                                                 training
## 17738                                                                                                                                              transferred
## 17739                                                                                                                                                  transit
## 17740                                                                                                                                               transition
## 17741                                                                                                                                              transmitted
## 17742                                                                                                                                           transportation
## 17743                                                                                                                                              tratamiento
## 17744                                                                                                                                               tremendous
## 17745                                                                                                                                                   trends
## 17746                                                                                                                                                    trent
## 17747                                                                                                                                                     tres
## 17748                                                                                                                                                   trials
## 17749                                                                                                                                                   tribal
## 17750                                                                                                                                                    truck
## 17751                                                                                                                                                   tryout
## 17752                                                                                                                                                  tryouts
## 17753                                                                                                                                                      tsa
## 17754                                                                                                                                                      tue
## 17755                                                                                                                                                    tulsa
## 17756                                                                                                                                               turnaround
## 17757                                                                                                                                                     twas
## 17758                                                                                                                                                   tweaks
## 17759                                                                                                                                                   tweets
## 17760                                                                                                                                             twitterverse
## 17761                                                                                                                                                twitter�s
## 17762                                                                                                                                                    types
## 17763                                                                                                                                                       uc
## 17764                                                                                                                                                     ucbc
## 17765                                                                                                                                                      ugh
## 17766                                                                                                                                              ultimamente
## 17767                                                                                                                                                   unanue
## 17768                                                                                                                                           understandable
## 17769                                                                                                                                                 underway
## 17770                                                                                                                                              unfortunate
## 17771                                                                                                                                                unhealthy
## 17772                                                                                                                                                   unions
## 17773                                                                                                                                                   unique
## 17774                                                                                                                                            unprecedented
## 17775                                                                                                                                             unsupervised
## 17776                                                                                                                                                  unvaxed
## 17777                                                                                                                                                 updating
## 17778                                                                                                                                                     upmc
## 17779                                                                                                                                                   upmost
## 17780                                                                                                                                                    upper
## 17781                                                                                                                                                    upset
## 17782                                                                                                                                                   uptick
## 17783                                                                                                                                                       ur
## 17784                                                                                                                                                  urgency
## 17785                                                                                                                                                     usps
## 17786                                                                                                                                                    usual
## 17787                                                                                                                                                       ut
## 17788                                                                                                                                                      uva
## 17789                                                                                                                                                       uw
## 17790                                                                                                                                             vaccination�
## 17791                                                                                                                                                vacinaram
## 17792                                                                                                                                                 vacunada
## 17793                                                                                                                                                  vacunar
## 17794                                                                                                                                                vacunarte
## 17795                                                                                                                                                   vacun�
## 17796                                                                                                                                                    vague
## 17797                                                                                                                                                     vans
## 17798                                                                                                                                                   varios
## 17799                                                                                                                                                     vast
## 17800                                                                                                                                                     vaxx
## 17801                                                                                                                                                     vaya
## 17802                                                                                                                                           vehiclerelated
## 17803                                                                                                                                                  vendors
## 17804                                                                                                                                                      ver
## 17805                                                                                                                                              veroorzaakt
## 17806                                                                                                                                                  victory
## 17807                                                                                                                                                    views
## 17808                                                                                                                                                 vigilant
## 17809                                                                                                                                                 violence
## 17810                                                                                                                                               visitation
## 17811                                                                                                                                                  visitor
## 17812                                                                                                                                                    vista
## 17813                                                                                                                                                    visto
## 17814                                                                                                                                                    vital
## 17815                                                                                                                                                 vitamins
## 17816                                                                                                                                                voluntary
## 17817                                                                                                                                                   volver
## 17818                                                                                                                                                   voodoo
## 17819                                                                                                                                                     voor
## 17820                                                                                                                                                     vous
## 17821                                                                                                                                                       vp
## 17822                                                                                                                                                       wa
## 17823                                                                                                                                                   walkes
## 17824                                                                                                                                                   walkup
## 17825                                                                                                                                                     wapo
## 17826                                                                                                                                                     warm
## 17827                                                                                                                                                     warp
## 17828                                                                                                                                                warranted
## 17829                                                                                                                                                  watched
## 17830                                                                                                                                                 wcovid19
## 17831                                                                                                                                                  webinar
## 17832                                                                                                                                               wednesdays
## 17833                                                                                                                                                   week�s
## 17834                                                                                                                                               weightloss
## 17835                                                                                                                                                wellknown
## 17836                                                                                                                                                 wellness
## 17837                                                                                                                                                    wheel
## 17838                                                                                                                                                  where�s
## 17839                                                                                                                                                     whit
## 17840                                                                                                                                                   whoopi
## 17841                                                                                                                                                willfully
## 17842                                                                                                                                                     wind
## 17843                                                                                                                                                     wins
## 17844                                                                                                                                                wiregrass
## 17845                                                                                                                                                     wisd
## 17846                                                                                                                                               withdrawal
## 17847                                                                                                                                              withholding
## 17848                                                                                                                                                       wo
## 17849                                                                                                                                                      won
## 17850                                                                                                                                               workplaces
## 17851                                                                                                                                                     worn
## 17852                                                                                                                                                worrisome
## 17853                                                                                                                                                    wound
## 17854                                                                                                                                                    wreak
## 17855                                                                                                                                                 wreaking
## 17856                                                                                                                                                wrestling
## 17857                                                                                                                                                      wsb
## 17858                                                                                                                                                     xmas
## 17859                                                                                                                                                      xvi
## 17860                                                                                                                                                     yale
## 17861                                                                                                                                                      yea
## 17862                                                                                                                                                     ymca
## 17863                                                                                                                                               youbecause
## 17864                                                                                                                                                    you�d
## 17865                                                                                                                                                       yr
## 17866                                                                                                                                                      yrf
## 17867                                                                                                                                                      yup
## 17868                                                                                                                                                     y�ap
## 17869                                                                                                                                                     zinc
## 17870                                                                                                                                                     zona
## 17871                                                                                                                                                     zone
## 17872                                                                                                                                                     zoom
## 17873                                                                                                                                                       �a
## 17874                                                                                                                                                     �all
## 17875                                                                                                                                                     �and
## 17876                                                                                                                                                   �covid
## 17877                                                                                                                                                 �doctor�
## 17878                                                                                                                                                   �don�t
## 17879                                                                                                                                                      �em
## 17880                                                                                                                                                    �epic
## 17881                                                                                                                                                 �estamos
## 17882                                                                                                                                               �euthanize
## 17883                                                                                                                                               �evidence�
## 17884                                                                                                                                                    �flu�
## 17885                                                                                                                                                     �for
## 17886                                                                                                                                                    �have
## 17887                                                                                                                                                       �l
## 17888                                                                                                                                                    �like
## 17889                                                                                                                                                    �mass
## 17890                                                                                                                                                    �most
## 17891                                                                                                                                                      �my
## 17892                                                                                                                                                     �new
## 17893                                                                                                                                                      �on
## 17894                                                                                                                                                �pandemic
## 17895                                                                                                                                             �plexiglass�
## 17896                                                                                                                                                    �plis
## 17897                                                                                                                                                       �s
## 17898                                                                                                                                                      �se
## 17899                                                                                                                                                   �these
## 17900                                                                                                                                                �vaccines
## 17901                                                                                                                                                 �willing
## 17902                                                                                                                                               ������75yo
## 17903                                                                                                                                                @0221tony
## 17904                                                                                                                                          @0fficialstacey
## 17905                                                                                                                                                 @1215deb
## 17906                                                                                                                                               @1423brown
## 17907                                                                                                                                             @1983dodgers
## 17908                                                                                                                                             @1dawnbrower
## 17909                                                                                                                                                   @1hood
## 17910                                                                                                                                            @1mauricewood
## 17911                                                                                                                                                   @205jw
## 17912                                                                                                                                              @24horastvn
## 17913                                                                                                                                            @27thletterrr
## 17914                                                                                                                                            @2chis1dogmom
## 17915                                                                                                                                                 @3dtruth
## 17916                                                                                                                                               @3ghtweets
## 17917                                                                                                                                                    @4aof
## 17918                                                                                                                                               @4hill2018
## 17919                                                                                                                                                @4nsmiley
## 17920                                                                                                                                           @51percentofus
## 17921                                                                                                                                               @60minutes
## 17922                                                                                                                                               @62walterp
## 17923                                                                                                                                                   @6news
## 17924                                                                                                                                                   @7news
## 17925                                                                                                                                         @805692b3bcc14be
## 17926                                                                                                                                               @84sorin88
## 17927                                                                                                                                                 @90lessw
## 17928                                                                                                                                                 @911lapd
## 17929                                                                                                                                             @9newssports
## 17930                                                                                                                                               @aaburke81
## 17931                                                                                                                                                  @aapmhq
## 17932                                                                                                                                         @aaronbrockett12
## 17933                                                                                                                                             @aaronhuncho
## 17934                                                                                                                                          @aaronjcorcoran
## 17935                                                                                                                                             @aarontorres
## 17936                                                                                                                                              @abajournal
## 17937                                                                                                                                             @abbeepusser
## 17938                                                                                                                                               @abc11wtvd
## 17939                                                                                                                                               @abc12wjrt
## 17940                                                                                                                                                   @abc15
## 17941                                                                                                                                                    @abc7
## 17942                                                                                                                                             @abc7chicago
## 17943                                                                                                                                         @abc7newsbayarea
## 17944                                                                                                                                                  @abc7ny
## 17945                                                                                                                                                 @abcnews
## 17946                                                                                                                                            @abcworldnews
## 17947                                                                                                                                            @abdullahzone
## 17948                                                                                                                                             @abhi2point0
## 17949                                                                                                                                          @absinthefather
## 17950                                                                                                                                               @acarr6453
## 17951                                                                                                                                            @acceleratesc
## 17952                                                                                                                                            @acecmissouri
## 17953                                                                                                                                            @acecnational
## 17954                                                                                                                                             @acelleaders
## 17955                                                                                                                                                 @achamer
## 17956                                                                                                                                                    @aclu
## 17957                                                                                                                                                  @aclumn
## 17958                                                                                                                                             @actbrigitte
## 17959                                                                                                                                           @actionnewsjax
## 17960                                                                                                                                             @adamcarolla
## 17961                                                                                                                                             @adamdiazzzz
## 17962                                                                                                                                          @adamgordon1977
## 17963                                                                                                                                                  @adhpio
## 17964                                                                                                                                         @adithyavikrams1
## 17965                                                                                                                                         @advancedlasermd
## 17966                                                                                                                                             @aewrestling
## 17967                                                                                                                                               @afacfeeds
## 17968                                                                                                                                            @affirmtweets
## 17969                                                                                                                                                @afge3428
## 17970                                                                                                                                            @afgenational
## 17971                                                                                                                                              @aflanery89
## 17972                                                                                                                                                     @afp
## 17973                                                                                                                                             @afreximbank
## 17974                                                                                                                                             @afroworld50
## 17975                                                                                                                                            @ahahospitals
## 17976                                                                                                                                                   @ahfdc
## 17977                                                                                                                                            @aidannrenayy
## 17978                                                                                                                                           @aidslifecycle
## 17979                                                                                                                                                 @airjudd
## 17980                                                                                                                                             @ajmcjournal
## 17981                                                                                                                                             @ajustphilly
## 17982                                                                                                                                                @akdafool
## 17983                                                                                                                                             @akhilesjohn
## 17984                                                                                                                                          @akronchildrens
## 17985                                                                                                                                              @alalibrary
## 17986                                                                                                                                               @alaskaair
## 17987                                                                                                                                            @alaynatreene
## 17988                                                                                                                                         @alberthelis17�s
## 17989                                                                                                                                                 @aldula2
## 17990                                                                                                                                              @aleahslish
## 17991                                                                                                                                                   @aleen
## 17992                                                                                                                                          @alejandramatus
## 17993                                                                                                                                          @alexandrae2180
## 17994                                                                                                                                            @alexberenson
## 17995                                                                                                                                           @alexgillespie
## 17996                                                                                                                                               @alexhanss
## 17997                                                                                                                                         @alexholleyfox29
## 17998                                                                                                                                              @aliciakeys
## 17999                                                                                                                                          @alisonjlangley
## 18000                                                                                                                                           @allcapsdcboyz
## 18001                                                                                                                                                @alliedvl
## 18002                                                                                                                                           @allisonholker
## 18003                                                                                                                                             @allofitwnyc
## 18004                                                                                                                                          @allyschweitzer
## 18005                                                                                                                                          @allyshachapman
## 18006                                                                                                                                            @almatter2020
## 18007                                                                                                                                           @aloha808aloha
## 18008                                                                                                                                           @alpharettagov
## 18009                                                                                                                                             @alpinecasey
## 18010                                                                                                                                               @alskiiitv
## 18011                                                                                                                                              @alswharton
## 18012                                                                                                                                          @alwayslovelola
## 18013                                                                                                                                                @alxthomp
## 18014                                                                                                                                          @alzheimersmanh
## 18015                                                                                                                                              @amandaabc7
## 18016                                                                                                                                            @amandal92983
## 18017                                                                                                                                                  @amazon
## 18018                                                                                                                                          @ambersutton123
## 18019                                                                                                                                           @amcatfootball
## 18020                                                                                                                                             @amctheatres
## 18021                                                                                                                                          @amercollphyadv
## 18022                                                                                                                                             @americanair
## 18023                                                                                                                                           @americanheart
## 18024                                                                                                                                          @americanutopia
## 18025                                                                                                                                       @amermedicalassn�s
## 18026                                                                                                                                          @amerurological
## 18027                                                                                                                                               @aminsense
## 18028                                                                                                                                         @amodeifornevada
## 18029                                                                                                                                               @amsleeper
## 18030                                                                                                                                            @amyathatcher
## 18031                                                                                                                                            @amycraycray�
## 18032                                                                                                                                            @anakasparian
## 18033                                                                                                                                           @ancientromans
## 18034                                                                                                                                          @andersoncooper
## 18035                                                                                                                                            @andrealouise
## 18036                                                                                                                                            @andreaprinzi
## 18037                                                                                                                                         @andrewdesiderio
## 18038                                                                                                                                           @andrewlalusis
## 18039                                                                                                                                             @andrewnbc12
## 18040                                                                                                                                          @andrewrchapman
## 18041                                                                                                                                            @andruedwards
## 18042                                                                                                                                                @andtimos
## 18043                                                                                                                                                 @andyguy
## 18044                                                                                                                                             @andylassner
## 18045                                                                                                                                               @andyman27
## 18046                                                                                                                                             @andystaples
## 18047                                                                                                                                          @anferneesimons
## 18048                                                                                                                                          @angelamwilhelm
## 18049                                                                                                                                         @angieeesunshine
## 18050                                                                                                                                          @angrierwhstaff
## 18051                                                                                                                                                @angusdav
## 18052                                                                                                                                           @anibalramosjr
## 18053                                                                                                                                           @aniesbaswedan
## 18054                                                                                                                                          @animalkeeper10
## 18055                                                                                                                                              @animalsaus
## 18056                                                                                                                                           @animatedgeoff
## 18057                                                                                                                                            @ankurkalramd
## 18058                                                                                                                                            @annarudowsky
## 18059                                                                                                                                           @annaturzgreen
## 18060                                                                                                                                              @anncoulter
## 18061                                                                                                                                             @annevittori
## 18062                                                                                                                                              @anniebosko
## 18063                                                                                                                                         @anthonyericmar3
## 18064                                                                                                                                            @antinanaheim
## 18065                                                                                                                                           @antiracismctr
## 18066                                                                                                                                           @antoniodjtone
## 18067                                                                                                                                          @antonyslumbers
## 18068                                                                                                                                                     @aoc
## 18069                                                                                                                                          @apesfollowkoba
## 18070                                                                                                                                                  @aphaha
## 18071                                                                                                                                         @apoliticalgoose
## 18072                                                                                                                                         @apondijodhiambo
## 18073                                                                                                                                          @aposagradoscor
## 18074                                                                                                                                               @aposource
## 18075                                                                                                                                             @aprilthames
## 18076                                                                                                                                                 @apsforg
## 18077                                                                                                                                             @apskimberly
## 18078                                                                                                                                            @apsmediaserv
## 18079                                                                                                                                         @apspeytonforest
## 18080                                                                                                                                               @apsupdate
## 18081                                                                                                                                            @aridavidpaul
## 18082                                                                                                                                                  @ariejr
## 18083                                                                                                                                           @arielleorsuto
## 18084                                                                                                                                                @ariscott
## 18085                                                                                                                                          @arlingtonvalib
## 18086                                                                                                                                           @armastrangelo
## 18087                                                                                                                                            @artsymarxist
## 18088                                                                                                                                         @asahutchinson�s
## 18089                                                                                                                                             @asalifeline
## 18090                                                                                                                                             @ascpchicago
## 18091                                                                                                                                           @ashagaines617
## 18092                                                                                                                                            @ashfordteaco
## 18093                                                                                                                                            @ashpofficial
## 18094                                                                                                                                                   @asmbs
## 18095                                                                                                                                              @aspentroll
## 18096                                                                                                                                               @asppharmd
## 18097                                                                                                                                             @aspphtweets
## 18098                                                                                                                                                   @astho
## 18099                                                                                                                                               @astout111
## 18100                                                                                                                                             @astroehlein
## 18101                                                                                                                                         @athens4cannabis
## 18102                                                                                                                                                @athersys
## 18103                                                                                                                                             @atlantaymca
## 18104                                                                                                                                                 @atmbill
## 18105                                                                                                                                              @atrammell3
## 18106                                                                                                                                                 @atrupar
## 18107                                                                                                                                               @auntlulie
## 18108                                                                                                                                                @aurora3s
## 18109                                                                                                                                          @austerepatriot
## 18110                                                                                                                                         @austinnotduncan
## 18111                                                                                                                                          @austinscott4ga
## 18112                                                                                                                                              @autopritts
## 18113                                                                                                                                           @avischiffmann
## 18114                                                                                                                                             @avoidoddlaw
## 18115                                                                                                                                               @ayeitsdre
## 18116                                                                                                                                              @aypftweets
## 18117                                                                                                                                                    @b105
## 18118                                                                                                                                               @b52malmet
## 18119                                                                                                                                            @babyandersen
## 18120                                                                                                                                             @backlinlisa
## 18121                                                                                                                                          @backstreetboys
## 18122                                                                                                                                         @backsweetbranch
## 18123                                                                                                                                             @baddcompani
## 18124                                                                                                                                           @badgercaustic
## 18125                                                                                                                                                 @balajis
## 18126                                                                                                                                             @bamatracker
## 18127                                                                                                                                           @bankofnamibia
## 18128                                                                                                                                            @bannerhealth
## 18129                                                                                                                                         @baptisthealthjx
## 18130                                                                                                                                         @barbara77051620
## 18131                                                                                                                                           @barbarawilcox
## 18132                                                                                                                                              @barnagroup
## 18133                                                                                                                                              @barredindc
## 18134                                                                                                                                           @barriermethod
## 18135                                                                                                                                           @baseballmarty
## 18136                                                                                                                                             @bat00000000
## 18137                                                                                                                                           @baumanncraigs
## 18138                                                                                                                                          @bballbandits01
## 18139                                                                                                                                          @bbcjohnbeattie
## 18140                                                                                                                                             @bbcworklife
## 18141                                                                                                                                                 @bcccuny
## 18142                                                                                                                                             @bcccunycuny
## 18143                                                                                                                                              @bcrchamber
## 18144                                                                                                                                                @bdaviskc
## 18145                                                                                                                                                 @bdk1521
## 18146                                                                                                                                               @beachmilk
## 18147                                                                                                                                               @beckalina
## 18148                                                                                                                                              @beeleetee2
## 18149                                                                                                                                            @beerbabesuzi
## 18150                                                                                                                                                @beewilly
## 18151                                                                                                                                               @bejayosby
## 18152                                                                                                                                            @beliveaufarm
## 18153                                                                                                                                                @benbrown
## 18154                                                                                                                                                @beneukel
## 18155                                                                                                                                              @benshapiro
## 18156                                                                                                                                           @bernardoverda
## 18157                                                                                                                                          @bethannfreeman
## 18158                                                                                                                                                @bethenny
## 18159                                                                                                                                                @bhanna10
## 18160                                                                                                                                            @bhhsbaseball
## 18161                                                                                                                                               @bhsredmen
## 18162                                                                                                                                            @bidenbrigade
## 18163                                                                                                                                            @bidendem2020
## 18164                                                                                                                                              @bigbertiet
## 18165                                                                                                                                          @bigbrotherjake
## 18166                                                                                                                                               @bigfav504
## 18167                                                                                                                                              @bigzackd55
## 18168                                                                                                                                            @bill73436561
## 18169                                                                                                                                               @billflood
## 18170                                                                                                                                           @biltmorehotel
## 18171                                                                                                                                             @bishopjakes
## 18172                                                                                                                                         @blacksocialists
## 18173                                                                                                                                             @blackvoices
## 18174                                                                                                                                          @blakeclass2020
## 18175                                                                                                                                          @blakehounshell
## 18176                                                                                                                                                @bldpj000
## 18177                                                                                                                                               @bleudawn7
## 18178                                                                                                                                             @blink155pod
## 18179                                                                                                                                                 @blkmdl3
## 18180                                                                                                                                           @bloombergpaul
## 18181                                                                                                                                             @bloomnight2
## 18182                                                                                                                                          @blossomnailspa
## 18183                                                                                                                                                  @blsgov
## 18184                                                                                                                                         @bluelinecrossed
## 18185                                                                                                                                         @bluelivesmatr01
## 18186                                                                                                                                               @blupriint
## 18187                                                                                                                                           @blxckpolitics
## 18188                                                                                                                                                @boba1959
## 18189                                                                                                                                            @bobarmstrong
## 18190                                                                                                                                              @bobbyscott
## 18191                                                                                                                                          @bobellisfulton
## 18192                                                                                                                                              @bobwachter
## 18193                                                                                                                                         @bobyatesboulder
## 18194                                                                                                                                                 @bobznhb
## 18195                                                                                                                                                 @bodog96
## 18196                                                                                                                                             @bomanijones
## 18197                                                                                                                                               @bondchc�s
## 18198                                                                                                                                              @bonitakale
## 18199                                                                                                                                          @boondogglelane
## 18200                                                                                                                                                @bopinion
## 18201                                                                                                                                         @bossyladysunday
## 18202                                                                                                                                             @bostonglobe
## 18203                                                                                                                                              @botts1paul
## 18204                                                                                                                                         @bouldercolorado
## 18205                                                                                                                                           @bouldergobldr
## 18206                                                                                                                                           @bowmanchazidy
## 18207                                                                                                                                             @bpericadams
## 18208                                                                                                                                              @bradkutner
## 18209                                                                                                                                             @bradpolumbo
## 18210                                                                                                                                          @braidyoncestan
## 18211                                                                                                                                            @brandondarby
## 18212                                                                                                                                          @brandonmartine
## 18213                                                                                                                                           @brdavissr2012
## 18214                                                                                                                                           @brennancenter
## 18215                                                                                                                                                @brewerie
## 18216                                                                                                                                           @brianhalligan
## 18217                                                                                                                                           @brianjensen77
## 18218                                                                                                                                          @briankoppelman
## 18219                                                                                                                                             @brianlehrer
## 18220                                                                                                                                          @brianneknadeau
## 18221                                                                                                                                            @brianphickey
## 18222                                                                                                                                              @brianriedl
## 18223                                                                                                                                          @brianstelter25
## 18224                                                                                                                                         @briantylercohen
## 18225                                                                                                                                                 @brijao8
## 18226                                                                                                                                           @brookingsinst
## 18227                                                                                                                                              @brooksrosa
## 18228                                                                                                                                                 @broy182
## 18229                                                                                                                                              @bryanbehar
## 18230                                                                                                                                              @bryanmkvue
## 18231                                                                                                                                         @brycepapenbrook
## 18232                                                                                                                                             @bsbmagazine
## 18233                                                                                                                                               @bsutterer
## 18234                                                                                                                                                  @bteany
## 18235                                                                                                                                             @bubbakellen
## 18236                                                                                                                                             @bubbasranch
## 18237                                                                                                                                                  @bubola
## 18238                                                                                                                                             @buckskinpop
## 18239                                                                                                                                               @buddoggin
## 18240                                                                                                                                            @buddywinston
## 18241                                                                                                                                  @bulwarkonlineexcellent
## 18242                                                                                                                                          @bunnybunnytail
## 18243                                                                                                                                            @buschgardens
## 18244                                                                                                                                                @business
## 18245                                                                                                                                          @butterskennedy
## 18246                                                                                                                                           @bycalvinphoto
## 18247                                                                                                                                              @bytimlogan
## 18248                                                                                                                                            @byubrochacho
## 18249                                                                                                                                                  @c0che�
## 18250                                                                                                                                              @caesarsent
## 18251                                                                                                                                           @caesarspalace
## 18252                                                                                                                                              @cagovernor
## 18253                                                                                                                                              @camacrejas
## 18254                                                                                                                                           @camatkinson13
## 18255                                                                                                                                         @cameronlmitchel
## 18256                                                                                                                                           @camilacabello
## 18257                                                                                                                                            @campingworld
## 18258                                                                                                                                              @camrynbleu
## 18259                                                                                                                                          @candacekellyto
## 18260                                                                                                                                              @canna420uk
## 18261                                                                                                                                           @cantguardmike
## 18262                                                                                                                                          @cantpretendtoo
## 18263                                                                                                                                            @capecohealth
## 18264                                                                                                                                             @capitalrels
## 18265                                                                                                                                               @carcached
## 18266                                                                                                                                               @carefirst
## 18267                                                                                                                                              @carladamit
## 18268                                                                                                                                           @carlosinator1
## 18269                                                                                                                                           @carlossaucedo
## 18270                                                                                                                                           @carmendefalco
## 18271                                                                                                                                          @carnivalcruise
## 18272                                                                                                                                         @carolin57695755
## 18273                                                                                                                                           @carolmillerwv
## 18274                                                                                                                                          @carolynnearens
## 18275                                                                                                                                            @carolynporta
## 18276                                                                                                                                             @carrieksada
## 18277                                                                                                                                                @carwarr1
## 18278                                                                                                                                           @carynbrooklyn
## 18279                                                                                                                                                 @cashapp
## 18280                                                                                                                                          @catchdesmoines
## 18281                                                                                                                                         @catdadd76769738
## 18282                                                                                                                                           @cathiebaker16
## 18283                                                                                                                                               @catsrule0
## 18284                                                                                                                                               @cbs19news
## 18285                                                                                                                                                   @cbs46
## 18286                                                                                                                                              @cbschicago
## 18287                                                                                                                                          @cbseveningnews
## 18288                                                                                                                                                  @ccfhnc
## 18289                                                                                                                                             @cdcdirector
## 18290                                                                                                                                  @cdcgov<u+7684><u+989d>
## 18291                                                                                                                                              @cdclifford
## 18292                                                                                                                                             @cdm70937617
## 18293                                                                                                                                              @cebmoxford
## 18294                                                                                                                                                 @ceemzee
## 18295                                                                                                                                             @cekanakismd
## 18296                                                                                                                                             @cellmart451
## 18297                                                                                                                                               @celticode
## 18298                                                                                                                                               @cenkuygur
## 18299                                                                                                                                            @centralctdsa
## 18300                                                                                                                                               @ceralarry
## 18301                                                                                                                                                     @ces
## 18302                                                                                                                                                   @cfsem
## 18303                                                                                                                                               @ch1b1m0m0
## 18304                                                                                                                                               @chadcluff
## 18305                                                                                                                                              @chadcottle
## 18306                                                                                                                                             @chainer2111
## 18307                                                                                                                                          @chakraview1971
## 18308                                                                                                                                             @chapaneco14
## 18309                                                                                                                                           @chapelhillgov
## 18310                                                                                                                                             @charlesnegy
## 18311                                                                                                                                          @charliebakerma
## 18312                                                                                                                                          @charlier1480am
## 18313                                                                                                                                         @charlot31041072
## 18314                                                                                                                                         @charmainexxxooo
## 18315                                                                                                                                                 @cheetah
## 18316                                                                                                                                             @cheezwitham
## 18317                                                                                                                                               @chefjkent
## 18318                                                                                                                                            @cheramileigh
## 18319                                                                                                                                              @cherieanne
## 18320                                                                                                                                          @chicagotribune
## 18321                                                                                                                                          @chickencovfefe
## 18322                                                                                                                                         @chicopeeschools
## 18323                                                                                                                                                  @chiefs
## 18324                                                                                                                                             @chinajude�s
## 18325                                                                                                                                            @chinnaiyanmd
## 18326                                                                                                                                     @chismenolikeoficial
## 18327                                                                                                                                            @choklitchika
## 18328                                                                                                                                            @chortlingman
## 18329                                                                                                                                               @chosen1ra
## 18330                                                                                                                                                @chpublib
## 18331                                                                                                                                          @chrisbroussard
## 18332                                                                                                                                           @chrisgeorgekc
## 18333                                                                                                                                           @chrismurphyct
## 18334                                                                                                                                             @chrispriebe
## 18335                                                                                                                                           @chrissyteigen
## 18336                                                                                                                                         @christianhlines
## 18337                                                                                                                                          @christinefffff
## 18338                                                                                                                                          @christinemcabz
## 18339                                                                                                                                         @christo24881262
## 18340                                                                                                                                            @chronopinion
## 18341                                                                                                                                                   @chsaa
## 18342                                                                                                                                                    @cidh
## 18343                                                                                                                                             @cillizzacnn
## 18344                                                                                                                                          @cincychildrens
## 18345                                                                                                                                            @cindybristow
## 18346                                                                                                                                              @cindycoops
## 18347                                                                                                                                              @citizenapp
## 18348                                                                                                                                              @cityofhope
## 18349                                                                                                                                           @cityofmadison
## 18350                                                                                                                                         @cityofmissiontx
## 18351                                                                                                                                         @cityofpeekskill
## 18352                                                                                                                                            @cityofrenton
## 18353                                                                                                                                          @cityofsandiego
## 18354                                                                                                                                           @cityofseattle
## 18355                                                                                                                                               @cityofsgf
## 18356                                                                                                                                                @cityofua
## 18357                                                                                                                                          @citysanleandro
## 18358                                                                                                                                               @civileats
## 18359                                                                                                                                         @civrightsvoices
## 18360                                                                                                                                            @cjenningswsb
## 18361                                                                                                                                               @cjeverett
## 18362                                                                                                                                            @cjsattorneys
## 18363                                                                                                                                              @clairlemon
## 18364                                                                                                                                             @clairminson
## 18365                                                                                                                                         @clapifyoulikeme
## 18366                                                                                                                                           @clarkcountynv
## 18367                                                                                                                                           @clauderoumain
## 18368                                                                                                                                         @claudiakosters1
## 18369                                                                                                                                              @claytravis
## 18370                                                                                                                                         @clevelandburchs
## 18371                                                                                                                                          @cleverbutshort
## 18372                                                                                                                                          @clickondetroit
## 18373                                                                                                                                             @climateguyw
## 18374                                                                                                                                               @clipperse
## 18375                                                                                                                                           @clivesimpkins
## 18376                                                                                                                                               @cltscgirl
## 18377                                                                                                                                             @cltuprising
## 18378                                                                                                                                           @cmbrandontodd
## 18379                                                                                                                                               @cmdgrosso
## 18380                                                                                                                                          @cmichaelgibson
## 18381                                                                                                                                              @cmporeilly
## 18382                                                                                                                                         @cmrobertwhitedc
## 18383                                                                                                                                                  @cmsgov
## 18384                                                                                                                                             @cmsilverman
## 18385                                                                                                                                                    @cnet
## 18386                                                                                                                                                    @cnns
## 18387                                                                                                                                                 @cnnsotu
## 18388                                                                                                                                               @cnntravel
## 18389                                                                                                                                           @coachhelton09
## 18390                                                                                                                                             @coachlebeau
## 18391                                                                                                                                          @coachstackrvxc
## 18392                                                                                                                                             @coastaltony
## 18393                                                                                                                                              @cobalttash
## 18394                                                                                                                                              @codeofvets
## 18395                                                                                                                                             @codyrobison
## 18396                                                                                                                                            @colbycakesss
## 18397                                                                                                                                             @colemanespn
## 18398                                                                                                                                              @coljames83
## 18399                                                                                                                                            @colorful1017
## 18400                                                                                                                                                @columbia
## 18401                                                                                                                                         @columbuscouncil
## 18402                                                                                                                                          @comicgeniustoo
## 18403                                                                                                                                         @commonwealthfnd
## 18404                                                                                                                                         @communitycycles
## 18405                                                                                                                                              @connaflcio
## 18406                                                                                                                                           @connectedcoun
## 18407                                                                                                                                          @connectforlife
## 18408                                                                                                                                               @connormll
## 18409                                                                                                                                         @connorratliff�s
## 18410                                                                                                                                                 @conor64
## 18411                                                                                                                                                @constelz
## 18412                                                                                                                                            @consulmexhou
## 18413                                                                                                                                          @contessabrewer
## 18414                                                                                                                                              @coolcatwon
## 18415                                                                                                                                         @coolercrestwood
## 18416                                                                                                                                             @cooperativa
## 18417                                                                                                                                                @copilco1
## 18418                                                                                                                                           @corepoweryoga
## 18419                                                                                                                                         @corsairfootball
## 18420                                                                                                                                            @costareports
## 18421                                                                                                                                                  @costco
## 18422                                                                                                                                             @councilofdc
## 18423                                                                                                                                               @countluku
## 18424                                                                                                                                               @covid19rs
## 18425                                                                                                                                             @cowboyastro
## 18426                                                                                                                                                @cpacman2
## 18427                                                                                                                                             @cpeltier007
## 18428                                                                                                                                           @creolecreole1
## 18429                                                                                                                                             @crestwoodmo
## 18430                                                                                                                                                  @crgcrm
## 18431                                                                                                                                         @criddlebenjamin
## 18432                                                                                                                                                @crossfit
## 18433                                                                                                                                               @cruiselaw
## 18434                                                                                                                                          @cruxsancta1666
## 18435                                                                                                                                             @crystalhead
## 18436                                                                                                                                           @crystallakepd
## 18437                                                                                                                                             @crystian916
## 18438                                                                                                                                                 @csbanow
## 18439                                                                                                                                                @cscstars
## 18440                                                                                                                                                 @csisisp
## 18441                                                                                                                                                 @cstroop
## 18442                                                                                                                                              @ctexaminer
## 18443                                                                                                                                          @cuepidemiology
## 18444                                                                                                                                             @culekingnic
## 18445                                                                                                                                           @culturesource
## 18446                                                                                                                                                 @cupsccm
## 18447                                                                                                                                         @curriculummatrs
## 18448                                                                                                                                             @curtishouck
## 18449                                                                                                                                              @cusolgroup
## 18450                                                                                                                                         @customcoolcover
## 18451                                                                                                                                               @cuurology
## 18452                                                                                                                                            @cybrpnkmusic
## 18453                                                                                                                                                 @cypclub
## 18454                                                                                                                                               @daddarius
## 18455                                                                                                                                              @dagodakbar
## 18456                                                                                                                                             @dailycaller
## 18457                                                                                                                                             @dailycamera
## 18458                                                                                                                                         @dailysoundnfury
## 18459                                                                                                                                          @dakotaalliance
## 18460                                                                                                                                          @danalanesports
## 18461                                                                                                                                              @danaykroyd
## 18462                                                                                                                                              @dancindoti
## 18463                                                                                                                                               @danfavale
## 18464                                                                                                                                            @danibananiie
## 18465                                                                                                                                            @daniellemurr
## 18466                                                                                                                                           @danimmergluck
## 18467                                                                                                                                             @dannyfunaro
## 18468                                                                                                                                             @dannygradio
## 18469                                                                                                                                         @danpriceseattle
## 18470                                                                                                                                            @danrobitzski
## 18471                                                                                                                                              @daodykhang
## 18472                                                                                                                                           @darmystrong76
## 18473                                                                                                                                           @darrellclarke
## 18474                                                                                                                                                @darrelln
## 18475                                                                                                                                            @darrenrovell
## 18476                                                                                                                                              @darthdaver
## 18477                                                                                                                                             @darthquaint
## 18478                                                                                                                                               @daveockop
## 18479                                                                                                                                         @davestewart4444
## 18480                                                                                                                                         @davidal02885967
## 18481                                                                                                                                           @davidbouley�s
## 18482                                                                                                                                             @davidcorndc
## 18483                                                                                                                                             @davidkirwan
## 18484                                                                                                                                          @davidlsmithiam
## 18485                                                                                                                                          @davidmweissman
## 18486                                                                                                                                         @davisbozemanlaw
## 18487                                                                                                                                           @davmassoffice
## 18488                                                                                                                                         @davvviiiidddd72
## 18489                                                                                                                                                 @dawgsax
## 18490                                                                                                                                              @dawnclark6
## 18491                                                                                                                                                @dawntj90
## 18492                                                                                                                                         @daytonchildrens
## 18493                                                                                                                                                 @dbk2387
## 18494                                                                                                                                             @dbtodomundo
## 18495                                                                                                                                                @dburbach
## 18496                                                                                                                                                 @dch1309
## 18497                                                                                                                                                   @dcist
## 18498                                                                                                                                                   @dcl60
## 18499                                                                                                                                              @dcowboys25
## 18500                                                                                                                                                  @ddale8
## 18501                                                                                                                                              @ddillardtv
## 18502                                                                                                                                          @dearauntcrabby
## 18503                                                                                                                                           @dearmratheist
## 18504                                                                                                                                             @deb09310422
## 18505                                                                                                                                          @debbie56111656
## 18506                                                                                                                                               @debdicker
## 18507                                                                                                                                                 @debkrol
## 18508                                                                                                                                               @deechieng
## 18509                                                                                                                                                @deedub67
## 18510                                                                                                                                              @delawareng
## 18511                                                                                                                                          @delawareonline
## 18512                                                                                                                                            @democracyinn
## 18513                                                                                                                                         @democracyreview
## 18514                                                                                                                                             @democratsup
## 18515                                                                                                                                         @demtweetsthosis
## 18516                                                                                                                                            @deneenmelody
## 18517                                                                                                                                          @denglerjoachim
## 18518                                                                                                                                             @dennysdiner
## 18519                                                                                                                                           @deptofdefense
## 18520                                                                                                                                          @derekfeeleyihi
## 18521                                                                                                                                           @derekjstevens
## 18522                                                                                                                                             @derrysherry
## 18523                                                                                                                                            @desertreview
## 18524                                                                                                                                                  @desfly
## 18525                                                                                                                                           @deshaunwatson
## 18526                                                                                                                                            @destiny36501
## 18527                                                                                                                                                 @dfisman
## 18528                                                                                                                                                  @dgod23
## 18529                                                                                                                                              @diamondjax
## 18530                                                                                                                                              @dianamhs70
## 18531                                                                                                                                                   @dicks
## 18532                                                                                                                                               @digboston
## 18533                                                                                                                                              @digestpill
## 18534                                                                                                                                              @dilanesper
## 18535                                                                                                                                          @dimartinobooth
## 18536                                                                                                                                          @directorjackie
## 18537                                                                                                                                         @direitasiqueira
## 18538                                                                                                                                          @disavowtrump20
## 18539                                                                                                                                             @discojerrys
## 18540                                                                                                                                                  @dislaw
## 18541                                                                                                                                                 @djac209
## 18542                                                                                                                                             @djsaviation
## 18543                                                                                                                                             @dkatsikakis
## 18544                                                                                                                                                  @dkuzny
## 18545                                                                                                                                             @dlw7cdcgov1
## 18546                                                                                                                                             @dmarealtors
## 18547                                                                                                                                                     @dnc
## 18548                                                                                                                                            @doctorfarola
## 18549                                                                                                                                             @doctorfauci
## 18550                                                                                                                                           @dodgerfan2k17
## 18551                                                                                                                                              @dollyd2271
## 18552                                                                                                                                             @domenergysc
## 18553                                                                                                                                           @dominicdupree
## 18554                                                                                                                                              @donberwick
## 18555                                                                                                                                          @donnamarie0503
## 18556                                                                                                                                           @donnasfineart
## 18557                                                                                                                                                @doordash
## 18558                                                                                                                                           @dougfordakota
## 18559                                                                                                                                           @dougstone2019
## 18560                                                                                                                                         @downtownboulder
## 18561                                                                                                                                             @dragonblaze
## 18562                                                                                                                                            @drdamonkimes
## 18563                                                                                                                                          @dreamdefenders
## 18564                                                                                                                                              @drericding
## 18565                                                                                                                                              @drewfromtv
## 18566                                                                                                                                                   @drfna
## 18567                                                                                                                                                 @dribram
## 18568                                                                                                                                               @drjashton
## 18569                                                                                                                                             @drjessigold
## 18570                                                                                                                                               @drlaurenp
## 18571                                                                                                                                         @drlenoreewalker
## 18572                                                                                                                                           @drlisaherring
## 18573                                                                                                                                                 @drmaika
## 18574                                                                                                                                               @drmsharma
## 18575                                                                                                                                           @droschnews3lv
## 18576                                                                                                                                               @drpattyrn
## 18577                                                                                                                                              @drreneego1
## 18578                                                                                                                                           @drsanjaygupta
## 18579                                                                                                                                           @drsarawickham
## 18580                                                                                                                                              @drsethinyc
## 18581                                                                                                                                               @drshmouni
## 18582                                                                                                                                                   @drvox
## 18583                                                                                                                                          @dryasminrashid
## 18584                                                                                                                                                     @dsm
## 18585                                                                                                                                          @dsteinhardtesq
## 18586                                                                                                                                              @duc2ndward
## 18587                                                                                                                                             @duderino102
## 18588                                                                                                                                           @dukemedschool
## 18589                                                                                                                                                   @dukeu
## 18590                                                                                                                                              @dustinpg11
## 18591                                                                                                                                          @dutchscientist
## 18592                                                                                                                                               @dvillella
## 18593                                                                                                                                          @dwuhlfelderlaw
## 18594                                                                                                                                              @dwulfeck98
## 18595                                                                                                                                                     @eab
## 18596                                                                                                                                                  @eachus
## 18597                                                                                                                                            @earthywombyn
## 18598                                                                                                                                           @easternviking
## 18599                                                                                                                                              @eatervegas
## 18600                                                                                                                                              @eaworkshop
## 18601                                                                                                                                               @ecowascdc
## 18602                                                                                                                                            @ecowascedeao
## 18603                                                                                                                                                @edanclay
## 18604                                                                                                                                               @edfredbed
## 18605                                                                                                                                            @edge0fablad3
## 18606                                                                                                                                             @edisoncheer
## 18607                                                                                                                                           @edith54231147
## 18608                                                                                                                                         @edithmitchellmd
## 18609                                                                                                                                          @editoreruggeri
## 18610                                                                                                                                                @edmondpd
## 18611                                                                                                                                            @edwardnorton
## 18612                                                                                                                                               @edyong209
## 18613                                                                                                                                              @efmoriarty
## 18614                                                                                                                                           @eifministries
## 18615                                                                                                                                           @eileencorbeil
## 18616                                                                                                                                             @eileeniorio
## 18617                                                                                                                                               @ejtwister
## 18618                                                                                                                                             @elaineermis
## 18619                                                                                                                                              @eldanman86
## 18620                                                                                                                                           @electroboyusa
## 18621                                                                                                                                          @elephantgurl24
## 18622                                                                                                                                          @elexmichaelson
## 18623                                                                                                                                                 @elienyc
## 18624                                                                                                                                                  @elignn
## 18625                                                                                                                                            @elijahdaniel
## 18626                                                                                                                                           @elizabethgore
## 18627                                                                                                                                            @elizabethodr
## 18628                                                                                                                                              @ellieroj13
## 18629                                                                                                                                         @ellisbamfan1964
## 18630                                                                                                                                          @elmaracucho642
## 18631                                                                                                                                             @elmostrador
## 18632                                                                                                                                           @elnacionalweb
## 18633                                                                                                                                                @elonmusk
## 18634                                                                                                                                            @eloraraymond
## 18635                                                                                                                                           @elpatriotaecu
## 18636                                                                                                                                                 @elrufai
## 18637                                                                                                                                                  @elteco
## 18638                                                                                                                                             @eluniversal
## 18639                                                                                                                                              @elvenestor
## 18640                                                                                                                                               @elyzium13
## 18641                                                                                                                                                    @emcb
## 18642                                                                                                                                            @emileeeelime
## 18643                                                                                                                                          @emmanuelmacron
## 18644                                                                                                                                                @emoryghi
## 18645                                                                                                                                           @emotionalnews
## 18646                                                                                                                                              @emptywheel
## 18647                                                                                                                                                  @emrazz
## 18648                                                                                                                                         @energyupgradeca
## 18649                                                                                                                                                @envyanne
## 18650                                                                                                                                                     @epa
## 18651                                                                                                                                                @eperlste
## 18652                                                                                                                                              @epflcswccm
## 18653                                                                                                                                             @epidrfreese
## 18654                                                                                                                                         @equality4theppl
## 18655                                                                                                                                            @eren30620277
## 18656                                                                                                                                           @ericcrespoedu
## 18657                                                                                                                                             @ericcrocker
## 18658                                                                                                                                            @ericgarcetti
## 18659                                                                                                                                             @ericmgarcia
## 18660                                                                                                                                            @ericonwheels
## 18661                                                                                                                                             @ericstangel
## 18662                                                                                                                                                @erin3197
## 18663                                                                                                                                              @erinmichos
## 18664                                                                                                                                         @escapeannapolis
## 18665                                                                                                                                                 @esdrumm
## 18666                                                                                                                                                @esperdod
## 18667                                                                                                                                         @estefan76270304
## 18668                                                                                                                                          @ethicalskeptic
## 18669                                                                                                                                             @ethonraptor
## 18670                                                                                                                                                @eugenegu
## 18671                                                                                                                                              @eurekalert
## 18672                                                                                                                                              @euricabral
## 18673                                                                                                                                              @eveyhugo96
## 18674                                                                                                                                             @evirahealth
## 18675                                                                                                                                               @f3poehler
## 18676                                                                                                                                           @faegredrinker
## 18677                                                                                                                                             @fahrenthold
## 18678                                                                                                                                              @faithgoldy
## 18679                                                                                                                                           @fakerobhunter
## 18680                                                                                                                                              @falkster16
## 18681                                                                                                                                                @famato53
## 18682                                                                                                                                                @famu1887
## 18683                                                                                                                                             @fanontastic
## 18684                                                                                                                                             @farberneuro
## 18685                                                                                                                                            @farmladyfarm
## 18686                                                                                                                                            @farpointtoys
## 18687                                                                                                                                                @fashjune
## 18688                                                                                                                                              @fastcasual
## 18689                                                                                                                                                  @fbimi6
## 18690                                                                                                                                          @fbiphoenixcaaa
## 18691                                                                                                                                              @fccstpauls
## 18692                                                                                                                                               @fchonline
## 18693                                                                                                                                                  @fecode
## 18694                                                                                                                                            @feeltheheath
## 18695                                                                                                                                               @ferrisweb
## 18696                                                                                                                                          @financialtimes
## 18697                                                                                                                                               @findinggg
## 18698                                                                                                                                                   @finkd
## 18699                                                                                                                                           @fionakelliher
## 18700                                                                                                                                          @firecrackerbsb
## 18701                                                                                                                                           @flamingovegas
## 18702                                                                                                                                                   @fldeo
## 18703                                                                                                                                          @floriankrammer
## 18704                                                                                                                                           @floridaalicat
## 18705                                                                                                                                                  @flotus
## 18706                                                                                                                                            @flowerlady61
## 18707                                                                                                                                             @flyfrontier
## 18708                                                                                                                                                 @focousa
## 18709                                                                                                                                                  @foecuz
## 18710                                                                                                                                            @foodbankcenc
## 18711                                                                                                                                            @foodyfetish�
## 18712                                                                                                                                                  @forbes
## 18713                                                                                                                                         @forcenetworkfnd
## 18714                                                                                                                                              @fordhamnyc
## 18715                                                                                                                                               @forrester
## 18716                                                                                                                                       @fortorangebrewing
## 18717                                                                                                                                             @fortpointer
## 18718                                                                                                                                            @forzacorrado
## 18719                                                                                                                                         @fosterthewill88
## 18720                                                                                                                                              @fotornelas
## 18721                                                                                                                                               @fox13news
## 18722                                                                                                                                                   @fox19
## 18723                                                                                                                                             @fox29philly
## 18724                                                                                                                                               @fox2deena
## 18725                                                                                                                                                @fox2news
## 18726                                                                                                                                               @fox47roch
## 18727                                                                                                                                                 @fox4now
## 18728                                                                                                                                                  @fox5dc
## 18729                                                                                                                                            @fox5sandiego
## 18730                                                                                                                                                 @fox6now
## 18731                                                                                                                                         @foxcarolinanews
## 18732                                                                                                                                                @foxd11�s
## 18733                                                                                                                                                   @foxla
## 18734                                                                                                                                            @foxnashville
## 18735                                                                                                                                              @fractweets
## 18736                                                                                                                                           @francemerrick
## 18737                                                                                                                                         @francesswaggart
## 18738                                                                                                                                           @frankbarreraf
## 18739                                                                                                                                         @frankfigliuzzi1
## 18740                                                                                                                                        @frankiejgalasso�
## 18741                                                                                                                                           @frankmartinsc
## 18742                                                                                                                                          @fredguttenberg
## 18743                                                                                                                                             @fredlucaswh
## 18744                                                                                                                                         @freedomwatchusa
## 18745                                                                                                                                             @freeojtoday
## 18746                                                                                                                                           @freepplstrike
## 18747                                                                                                                                          @fresnocountyca
## 18748                                                                                                                                         @friendsoscience
## 18749                                                                                                                                         @frjohnhollowell
## 18750                                                                                                                                         @frontlinemedic2
## 18751                                                                                                                                                  @fsbull
## 18752                                                                                                                                             @funkofchile
## 18753                                                                                                                                         @fuzzychubbywolf
## 18754                                                                                                                                          @gabrielsherman
## 18755                                                                                                                                                @gadeptag
## 18756                                                                                                                                              @gaetasusan
## 18757                                                                                                                                                 @gailbee
## 18758                                                                                                                                            @ganjapreneur
## 18759                                                                                                                                           @gardolphin733
## 18760                                                                                                                                              @garypeters
## 18761                                                                                                                                          @garysnyder2169
## 18762                                                                                                                                            @gasecofstate
## 18763                                                                                                                                                    @gavi
## 18764                                                                                                                                                   @gavi�
## 18765                                                                                                                                               @gcschools
## 18766                                                                                                                                              @gdinwiddie
## 18767                                                                                                                                             @gearhead455
## 18768                                                                                                                                             @geicoracing
## 18769                                                                                                                                              @gemini6ice
## 18770                                                                                                                                               @genejared
## 18771                                                                                                                                               @genemarks
## 18772                                                                                                                                               @geoff9cow
## 18773                                                                                                                                           @geoffrbennett
## 18774                                                                                                                                           @georgeallenva
## 18775                                                                                                                                             @georgiatech
## 18776                                                                                                                                           @geraldorivera
## 18777                                                                                                                                            @germhuntermd
## 18778                                                                                                                                            @gerrycraft11
## 18779                                                                                                                                           @getyourleadon
## 18780                                                                                                                                              @ggreenwald
## 18781                                                                                                                                           @ghost03242197
## 18782                                                                                                                                           @ghost18687888
## 18783                                                                                                                                                 @ghucnyc
## 18784                                                                                                                                              @giligili91
## 18785                                                                                                                                                 @gina660
## 18786                                                                                                                                              @ginamizell
## 18787                                                                                                                                         @gingerbreadmiss
## 18788                                                                                                                                          @gingerlytweets
## 18789                                                                                                                                              @gingiecato
## 18790                                                                                                                                         @girlsreallyrule
## 18791                                                                                                                                           @girlthatstiny
## 18792                                                                                                                                          @givebatsabreak
## 18793                                                                                                                                                @gladfly1
## 18794                                                                                                                                           @glangendorf01
## 18795                                                                                                                                          @glennb10809975
## 18796                                                                                                                                         @glenndavissoc�s
## 18797                                                                                                                                       @gloverparkgroup�s
## 18798                                                                                                                                                @gmant055
## 18799                                                                                                                                             @gnomemagic7
## 18800                                                                                                                                            @goddesskadia
## 18801                                                                                                                                           @goldenknights
## 18802                                                                                                                                          @goldennuggetlv
## 18803                                                                                                                                                 @golfcom
## 18804                                                                                                                                             @gonaivespap
## 18805                                                                                                                                                  @google
## 18806                                                                                                                                                    @gooy
## 18807                                                                                                                                            @gopokesvoice
## 18808                                                                                                                                              @govballnyc
## 18809                                                                                                                                          @govchrissununu
## 18810                                                                                                                                              @govherbert
## 18811                                                                                                                                              @govholcomb
## 18812                                                                                                                                               @govkaduna
## 18813                                                                                                                                                 @govkemp
## 18814                                                                                                                                           @govlarryhogan
## 18815                                                                                                                                           @govmikedewine
## 18816                                                                                                                                                  @govmlg
## 18817                                                                                                                                            @govnedlamont
## 18818                                                                                                                                             @govparsonmo
## 18819                                                                                                                                             @govpritzker
## 18820                                                                                                                                            @govroyvooper
## 18821                                                                                                                                              @govsisolak
## 18822                                                                                                                                             @gr33nm0ther
## 18823                                                                                                                                             @gradydoctor
## 18824                                                                                                                                           @grandviewohio
## 18825                                                                                                                                           @graveyardeyes
## 18826                                                                                                                                            @greatatlanta
## 18827                                                                                                                                         @greatlakesforex
## 18828                                                                                                                                          @greenburgerorg
## 18829                                                                                                                                             @gregatronn6
## 18830                                                                                                                                                @gregchun
## 18831                                                                                                                                              @gregraposo
## 18832                                                                                                                                                   @greta
## 18833                                                                                                                                          @greywhalesushi
## 18834                                                                                                                                          @grifflightning
## 18835                                                                                                                                               @grindboyx
## 18836                                                                                                                                                   @grist
## 18837                                                                                                                                               @grit16451
## 18838                                                                                                                                           @gromerjeffers
## 18839                                                                                                                                             @grumpysuper
## 18840                                                                                                                                               @gsimone14
## 18841                                                                                                                                                @guardian
## 18842                                                                                                                                           @guerillacross
## 18843                                                                                                                                            @guidogirardi
## 18844                                                                                                                                               @guidolock
## 18845                                                                                                                                             @gungglefont
## 18846                                                                                                                                                  @gunnyq
## 18847                                                                                                                                                 @gurumxa
## 18848                                                                                                                                             @gusistoofly
## 18849                                                                                                                                          @gwaymedsociety
## 18850                                                                                                                                                @gwenda44
## 18851                                                                                                                                              @gwengraham
## 18852                                                                                                                                               @gypsyiddy
## 18853                                                                                                                                           @hammondsports
## 18854                                                                                                                                         @hamptoncschools
## 18855                                                                                                                                            @hamsterkaren
## 18856                                                                                                                                               @hamutalro
## 18857                                                                                                                                           @hamzashafqaat
## 18858                                                                                                                                           @hannahfox6now
## 18859                                                                                                                                          @hannahgreports
## 18860                                                                                                                                          @hannahnatanson
## 18861                                                                                                                                            @hardlynormal
## 18862                                                                                                                                            @haririrobert
## 18863                                                                                                                                                  @harlan
## 18864                                                                                                                                             @harsty19901
## 18865                                                                                                                                           @hasanaltuntas
## 18866                                                                                                                                          @hastingscenter
## 18867                                                                                                                                          @haywoodschools
## 18868                                                                                                                                                     @hbo
## 18869                                                                                                                                             @healthunity
## 18870                                                                                                                                         @healthyamerica1
## 18871                                                                                                                                                  @heandb
## 18872                                                                                                                                                     @heb
## 18873                                                                                                                                            @hectorghz101
## 18874                                                                                                                                         @hectorverduzc16
## 18875                                                                                                                                                @heidinbc
## 18876                                                                                                                                            @helenkennedy
## 18877                                                                                                                                                 @helicon
## 18878                                                                                                                                             @hellbentvet
## 18879                                                                                                                                           @hellblazer200
## 18880                                                                                                                                              @helloalice
## 18881                                                                                                                                              @helpkckids
## 18882                                                                                                                                                @helthelt
## 18883                                                                                                                                         @hempsteadtown�s
## 18884                                                                                                                                          @henricocitizen
## 18885                                                                                                                                         @herecomstrouble
## 18886                                                                                                                                          @heritagepublic
## 18887                                                                                                                                           @heritageradio
## 18888                                                                                                                                           @hermithwarang
## 18889                                                                                                                                          @hernethehunter
## 18890                                                                                                                                              @hetalkgame
## 18891                                                                                                                                             @hetalparikh
## 18892                                                                                                                                              @heybuckhey
## 18893                                                                                                                                                @heyimdoc
## 18894                                                                                                                                               @heywhyjax
## 18895                                                                                                                                              @higginized
## 18896                                                                                                                                               @high0ntea
## 18897                                                                                                                                             @hillarlette
## 18898                                                                                                                                              @hillharper
## 18899                                                                                                                                                  @hipaix
## 18900                                                                                                                                         @historiadmialma
## 18901                                                                                                                                                 @history
## 18902                                                                                                                                                 @hivohio
## 18903                                                                                                                                                  @hjluks
## 18904                                                                                                                                               @hknightsf
## 18905                                                                                                                                                  @hmcmrs
## 18906                                                                                                                                          @hoarsewisperer
## 18907                                                                                                                                           @homedepot0907
## 18908                                                                                                                                            @homoinhiding
## 18909                                                                                                                                              @hoodhealer
## 18910                                                                                                                                             @hookemcougs
## 18911                                                                                                                                               @hoosier84
## 18912                                                                                                                                                @horrdorr
## 18913                                                                                                                                         @horsewithnona11
## 18914                                                                                                                                          @hospitals4kids
## 18915                                                                                                                                           @housebluedogs
## 18916                                                                                                                                          @housedemocrats
## 18917                                                                                                                                            @houstonchron
## 18918                                                                                                                                             @houstondash
## 18919                                                                                                                                           @howardfineman
## 18920                                                                                                                                                 @hoyoabo
## 18921                                                                                                                                                 @hrbtmrn
## 18922                                                                                                                                             @hrdministry
## 18923                                                                                                                                              @hrhbethany
## 18924                                                                                                                                               @hsg4value
## 18925                                                                                                                                         @hshelmettourney
## 18926                                                                                                @hsibaltimore<u+0001f46e><u+200d><u+2640><u+fe0f>stopping
## 18927                                                                                                                                   @httptwittercomwherald
## 18928                                                                                                                                                  @hubie0
## 18929                                                                                                                                                  @hubjhu
## 18930                                                                                                                                                @huffpost
## 18931                                                                                                                                               @hughhowey
## 18932                                                                                                                                         @humanityforward
## 18933                                                                                                                                              @hunterwalk
## 18934                                                                                                                                          @hunteryurachek
## 18935                                                                                                                                            @iamamnanawaz
## 18936                                                                                                                                         @iamsharifleming
## 18937                                                                                                                                            @iamssseasick
## 18938                                                                                                                                             @ianfitzespn
## 18939                                                                                                                                                 @icecube
## 18940                                                                                                                                                @icnurses
## 18941                                                                                                                                           @idstewardship
## 18942                                                                                                                                          @ihbminneapolis
## 18943                                                                                                                                                  @ihmeuw
## 18944                                                                                                                                         @iizamusicalgeek
## 18945                                                                                                                                            @iliketothink
## 18946                                                                                                                                              @imapeepels
## 18947                                                                                                                                             @imarispeaks
## 18948                                                                                                                                                  @imyawa
## 18949                                                                                                                                                   @imyke
## 18950                                                                                                                                           @inactionnever
## 18951                                                                                                                                         @indianagranny70
## 18952                                                                                                                                           @indiemusicbus
## 18953                                                                                                                                                 @indycar
## 18954                                                                                                                                           @indyspanglish
## 18955                                                                                                                                             @ingrandview
## 18956                                                                                                                                            @ingridingwah
## 18957                                                                                                                                                     @inl
## 18958                                                                                                                                            @insanelymade
## 18959                                                                                                                                           @insideedition
## 18960                                                                                                                                               @instagram
## 18961                                                                                                                                          @instylemagazin
## 18962                                                                                                                                           @irenesnydertv
## 18963                                                                                                                                             @irfanaryaan
## 18964                                                                                                                                                  @iris62
## 18965                                                                                                                                               @irmaraste
## 18966                                                                                                                                               @ironlight
## 18967                                                                                                                                             @isaacjwells
## 18968                                                                                                                                          @isardasorensen
## 18969                                                                                                                                         @ismaelm71762500
## 18970                                                                                                                                              @ismithkdka
## 18971                                                                                                                                          @isolovethelord
## 18972                                                                                                                                              @itsalinajo
## 18973                                                                                                                                                 @itsheed
## 18974                                                                                                                                         @itsjefftiedrich
## 18975                                                                                                                                             @itsmattfred
## 18976                                                                                                                                               @ivanduque
## 18977                                                                                                                                               @ivcollege
## 18978                                                                                                                                               @ivery5000
## 18979                                                                                                                                                 @ivpnews
## 18980                                                                                                                                                  @iwmfmb
## 18981                                                                                                                                               @j47130015
## 18982                                                                                                                                                 @jaaavis
## 18983                                                                                                                                                    @jack
## 18984                                                                                                                                         @jacks0ndinsmore
## 18985                                                                                                                                          @jacksonleetx18
## 18986                                                                                                                                           @jacksonlinder
## 18987                                                                                                                                         @jackywilliams28
## 18988                                                                                                                                             @jaimebaylys
## 18989                                                                                                                                             @jakekates45
## 18990                                                                                                                                          @jamarlinmartin
## 18991                                                                                                                                          @jamesaalongman
## 18992                                                                                                                                          @jamesjcourtney
## 18993                                                                                                                                          @jamieleecurtis
## 18994                                                                                                                                               @janeannej
## 18995                                                                                                                                           @janebrautigam
## 18996                                                                                                                                             @janeebsmith
## 18997                                                                                                                                            @janeflowers8
## 18998                                                                                                                                              @janicedean
## 18999                                                                                                                                           @janineberry20
## 19000                                                                                                                                           @jaredyamamoto
## 19001                                                                                                                                                @jascharl
## 19002                                                                                                                                                 @jasirix
## 19003                                                                                                                                           @jason01753497
## 19004                                                                                                                                               @jasonblum
## 19005                                                                                                                                         @jasoninthehouse
## 19006                                                                                                                                             @jasonnellis
## 19007                                                                                                                                            @jasonszegedi
## 19008                                                                                                                                            @jaubrickster
## 19009                                                                                                                                              @jay2thebee
## 19010                                                                                                                                             @jayhancock1
## 19011                                                                                                                                         @jayht55gmailco1
## 19012                                                                                                                                          @jaylivingstone
## 19013                                                                                                                                               @jaypitter
## 19014                                                                                                                                             @jaysonscout
## 19015                                                                                                                                               @jaytwarsh
## 19016                                                                                                                                                  @jbouie
## 19017                                                                                                                                              @jbpritzker
## 19018                                                                                                                                               @jchris816
## 19019                                                                                                                                              @jdubbs1969
## 19020                                                                                                                                                @jdwickie
## 19021                                                                                                                                                @jeaton33
## 19022                                                                                                                                               @jeffbezos
## 19023                                                                                                                                         @jeffersonianguy
## 19024                                                                                                                                           @jeffersonuniv
## 19025                                                                                                                                           @jeffparishgov
## 19026                                                                                                                                             @jeffreestar
## 19027                                                                                                                                            @jeffreyalvey
## 19028                                                                                                                                            @jeffriesanne
## 19029                                                                                                                                           @jennerific713
## 19030                                                                                                                                            @jenniferhorn
## 19031                                                                                                                                         @jenniferjjacobs
## 19032                                                                                                                                               @jennwcbus
## 19033                                                                                                                                          @jennyrachelpal
## 19034                                                                                                                                            @jennyschuetz
## 19035                                                                                                                                               @jenvonlee
## 19036                                                                                                                                          @jeromefrombham
## 19037                                                                                                                                             @jesselmccoy
## 19038                                                                                                                                          @jessemccartney
## 19039                                                                                                                                         @jessicalipscomb
## 19040                                                                                                                                                 @jetblue
## 19041                                                                                                                                               @jewhaditm
## 19042                                                                                                                                                   @jfssd
## 19043                                                                                                                                             @jgmcbrayer2
## 19044                                                                                                                                             @jgorman2424
## 19045                                                                                                                                                  @jhgurf
## 19046                                                                                                                                           @jhospmedicine
## 19047                                                                                                                                                     @jhu
## 19048                                                                                                                                          @jilliansmukler
## 19049                                                                                                                                               @jimdtweet
## 19050                                                                                                                                               @jimjordan
## 19051                                                                                                                                            @jimmykoolkat
## 19052                                                                                                                                                  @jirisv
## 19053                                                                                                                                           @jjdiazmachuca
## 19054                                                                                                                                                  @jjwatt
## 19055                                                                                                                                               @jkrowling
## 19056                                                                                                                                           @jmbaseball247
## 19057                                                                                                                                               @jmcchiefs
## 19058                                                                                                                                                  @jmmavs
## 19059                                                                                                                                                 @jmotoki
## 19060                                                                                                                                                  @jmtfxc
## 19061                                                                                                                                            @jobsfirstnyc
## 19062                                                                                                                                            @jodybelcher7
## 19063                                                                                                                                             @joeburrow10
## 19064                                                                                                                                             @joeconchatv
## 19065                                                                                                                                          @joedieseldodge
## 19066                                                                                                                                               @joeexotic
## 19067                                                                                                                                               @joesquawk
## 19068                                                                                                                                           @joey2theworld
## 19069                                                                                                                                            @johncarneyde
## 19070                                                                                                                                              @johncornyn
## 19071                                                                                                                                             @johnkingcnn
## 19072                                                                                                                                         @johnnybravolive
## 19073                                                                                                                                             @johnnykeyar
## 19074                                                                                                                                            @johnshopkins
## 19075                                                                                                                                         @johnshopkinsepi
## 19076                                                                                                                                         @johnshopkinssph
## 19077                                                                                                                                         @johnwscarpente1
## 19078                                                                                                                                           @jonahdispatch
## 19079                                                                                                                                           @jonathanvswan
## 19080                                                                                                                                               @jonchesto
## 19081                                                                                                                                           @jonesonthenba
## 19082                                                                                                                                               @jonlemire
## 19083                                                                                                                                               @jools6691
## 19084                                                                                                                                           @jordanbassior
## 19085                                                                                                                                          @jornalnacional
## 19086                                                                                                                                               @jorsmith1
## 19087                                                                                                                                            @josephgeha16
## 19088                                                                                                                                           @josephsuttner
## 19089                                                                                                                                         @joshbreslowwkrn
## 19090                                                                                                                                              @joshheymer
## 19091                                                                                                                                          @joshuahansonmd
## 19092                                                                                                                                            @joshuapotash
## 19093                                                                                                                                             @josianbruno
## 19094                                                                                                                                         @journaldequebec
## 19095                                                                                                                                         @joycewhitevance
## 19096                                                                                                                                                @jpmorgan
## 19097                                                                                                                                                @jrepique
## 19098                                                                                                                                               @jrigby619
## 19099                                                                                                                                            @jrotcmadison
## 19100                                                                                                                                               @jsdestiny
## 19101                                                                                                                                            @jshollenbeck
## 19102                                                                                                                                                  @jsnell
## 19103                                                                                                                                         @jsolomonreports
## 19104                                                                                                                                             @jstevens007
## 19105                                                                                                                                                   @jtwit
## 19106                                                                                                                                                @juanchos
## 19107                                                                                                                                              @judgeclayj
## 19108                                                                                                                                          @judgementday89
## 19109                                                                                                                                           @judicialwatch
## 19110                                                                                                                                              @jukebarosh
## 19111                                                                                                                                            @julieappleby
## 19112                                                                                                                                              @juliejusto
## 19113                                                                                                                                             @juliepeyton
## 19114                                                                                                                                           @julieroginsky
## 19115                                                                                                                                                @jumzyrau
## 19116                                                                                                                                                 @jusmojo
## 19117                                                                                                                                               @justacwab
## 19118                                                                                                                                             @justineskye
## 19119                                                                                                                                           @justintrudeau
## 19120                                                                                                                                            @juststimming
## 19121                                                                                                                                           @juuubsribeiro
## 19122                                                                                                                                                   @jyoop
## 19123                                                                                                                                            @k12albemarle
## 19124                                                                                                                                               @kabbfox29
## 19125                                                                                                                                               @kalaax008
## 19126                                                                                                                                         @kamilaalexander
## 19127                                                                                                                                             @karenhandel
## 19128                                                                                                                                            @karenpbuckmp
## 19129                                                                                                                                             @karrikemyst
## 19130                                                                                                                                             @kassydillon
## 19131                                                                                                                                             @katarinasos
## 19132                                                                                                                                               @katchin05
## 19133                                                                                                                                            @katebarstool
## 19134                                                                                                                                                 @katgal2
## 19135                                                                                                                                          @kathrynhertel1
## 19136                                                                                                                                              @katslife12
## 19137                                                                                                                                               @kattfunny
## 19138                                                                                                                                          @katymcguinness
## 19139                                                                                                                                                 @katzmum
## 19140                                                                                                                                             @kaydendowns
## 19141                                                                                                                                            @kaylanator17
## 19142                                                                                                                                              @kaylimills
## 19143                                                                                                                                                 @kaylwhy
## 19144                                                                                                                                                @kayysha1
## 19145                                                                                                                                             @kcpubhealth
## 19146                                                                                                                                                   @kctaz
## 19147                                                                                                                                                   @kctv5
## 19148                                                                                                                                                    @kdka
## 19149                                                                                                                                               @kdudley03
## 19150                                                                                                                                          @kellyannepolls
## 19151                                                                                                                                               @kellyybee
## 19152                                                                                                                                         @kelseychapstick
## 19153                                                                                                                                               @kelzkarma
## 19154                                                                                                                                                @kemental
## 19155                                                                                                                                                @kendvllv
## 19156                                                                                                                                         @kenneth72712993
## 19157                                                                                                                                           @kennethbunker
## 19158                                                                                                                                          @kennyalexander
## 19159                                                                                                                                            @kennywallace
## 19160                                                                                                                                               @kennyway8
## 19161                                                                                                                                                @kenolin1
## 19162                                                                                                                                               @kenziebok
## 19163                                                                                                                                                    @ketv
## 19164                                                                                                                                              @kevincorke
## 19165                                                                                                                                         @kevingerardcoo1
## 19166                                                                                                                                            @kevinmitnick
## 19167                                                                                                                                                   @kezi9
## 19168                                                                                                                                                     @kfc
## 19169                                                                                                                                                     @kff
## 19170                                                                                                                                              @kgeorgieva
## 19171                                                                                                                                               @kgolabmls
## 19172                                                                                                                                                 @kgwnews
## 19173                                                                                                                                          @khaiberpanizai
## 19174                                                                                                                                         @khaledabutoameh
## 19175                                                                                                                                                @khamel94
## 19176                                                                                                                                                    @khou
## 19177                                                                                                                                         @khsmustangfball
## 19178                                                                                                                                                   @kie12
## 19179                                                                                                                                                 @kiiyara
## 19180                                                                                                                                              @killermike
## 19181                                                                                                                                             @kimballbeck
## 19182                                                                                                                                           @kimberlywoods
## 19183                                                                                                                                           @kindredhealth
## 19184                                                                                                                                            @king5seattle
## 19185                                                                                                                                            @kingfish7418
## 19186                                                                                                                                             @kingsthings
## 19187                                                                                                                                                   @kitv4
## 19188                                                                                                                                              @kivunature
## 19189                                                                                                                                                @kkalra22
## 19190                                                                                                                                               @kkreitman
## 19191                                                                                                                                            @kkwestisbest
## 19192                                                                                                                                              @kllieblich
## 19193                                                                                                                                                  @kmirza
## 19194                                                                                                                                               @kneerecon
## 19195                                                                                                                                                 @knx1070
## 19196                                                                                                                                               @kociamber
## 19197                                                                                                                                              @kocodillon
## 19198                                                                                                                                                @koconews
## 19199                                                                                                                                            @koishakknahi
## 19200                                                                                                                                                @komonews
## 19201                                                                                                                                              @koulidakos
## 19202                                                                                                                                               @kpholla12
## 19203                                                                                                                                                    @krgv
## 19204                                                                                                                                              @kridingmls
## 19205                                                                                                                                              @krissielee
## 19206                                                                                                                                           @kristinabybee
## 19207                                                                                                                                                 @kschemp
## 19208                                                                                                                                                  @ksecus
## 19209                                                                                                                                                 @kslnews
## 19210                                                                                                                                              @kstateturk
## 19211                                                                                                                                              @ktsharrock
## 19212                                                                                                                                                  @kttctv
## 19213                                                                                                                                                @ktumulty
## 19214                                                                                                                                                @kucbnews
## 19215                                                                                                                                                   @kvshq
## 19216                                                                                                                                              @kwanzahall
## 19217                                                                                                                                              @kwikwarren
## 19218                                                                                                                                               @kwjazzman
## 19219                                                                                                                                             @kyblueblood
## 19220                                                                                                                                                  @kydems
## 19221                                                                                                                                                   @kygop
## 19222                                                                                                                                               @kylaoneil
## 19223                                                                                                                                             @kyledcheney
## 19224                                                                                                                                            @kylegriffin1
## 19225                                                                                                                                              @kylekashuv
## 19226                                                                                                                                                @kylerley
## 19227                                                                                                                                             @kyotusperry
## 19228                                                                                                                                                  @labecs
## 19229                                                                                                                                           @labsadanandam
## 19230                                                                                                                                            @lacewilliams
## 19231                                                                                                                                           @lacyjohnsonmn
## 19232                                                                                                                                               @ladyspat1
## 19233                                                                                                                                           @lagunitasbeer
## 19234                                                                                                                                               @laluzjose
## 19235                                                                                                                                            @landonbarton
## 19236                                                                                                                                                  @lapdhq
## 19237                                                                                                                                            @larashoutsbs
## 19238                                                                                                                                           @larrywoolfolk
## 19239                                                                                                                                                   @lary9
## 19240                                                                                                                                          @laurak357laura
## 19241                                                                                                                                          @lauralewishome
## 19242                                                                                                                                           @lauralloyd262
## 19243                                                                                                                                                @laurspag
## 19244                                                                                                                                           @laylaygoddess
## 19245                                                                                                                                                    @lbpd
## 19246                                                                                                                                              @ldcuervo22
## 19247                                                                                                                                               @ldnbybike
## 19248                                                                                                                                          @leadstoriescom
## 19249                                                                                                                                                  @leakri
## 19250                                                                                                                                         @learningnetwrks
## 19251                                                                                                                                                @leenme12
## 19252                                                                                                                                               @leeperdig
## 19253                                                                                                                                         @legacybrewingco
## 19254                                                                                                                                                @lempalyn
## 19255                                                                                                                                             @lesliem3355
## 19256                                                                                                                                           @letswinin2020
## 19257                                                                                                                                             @levarstoney
## 19258                                                                                                                                         @lgsuzannecrouch
## 19259                                                                                                                                             @libbyschaaf
## 19260                                                                                                                                              @libertyjen
## 19261                                                                                                                                           @libsinamerica
## 19262                                                                                                                                             @lightheart1
## 19263                                                                                                                                          @lightshine1776
## 19264                                                                                                                                            @lightup4good
## 19265                                                                                                                                         @likeagoodidea88
## 19266                                                                                                                                            @lilaubiegirl
## 19267                                                                                                                                              @lillies007
## 19268                                                                                                                                             @lilymarston
## 19269                                                                                                                                              @lilyshell5
## 19270                                                                                                                                           @linahidalgotx
## 19271                                                                                                                                               @lindsayph
## 19272                                                                                                                                           @linqpromenade
## 19273                                                                                                                                           @lisafororegon
## 19274                                                                                                                                                  @livepd
## 19275                                                                                                                                           @liverpoolsone
## 19276                                                                                                                                                 @lizmair
## 19277                                                                                                                                                  @lkbond
## 19278                                                                                                                                                @lkwhite5
## 19279                                                                                                                                               @llegopapa
## 19280                                                                                                                                                 @lleikus
## 19281                                                                                                                                                 @local12
## 19282                                                                                                                                            @lockupbiden1
## 19283                                                                                                                                                @loeanrdo
## 19284                                                                                                                                            @lolknbrhosts
## 19285                                                                                                                                                  @lomom2
## 19286                                                                                                                                             @lonestarblu
## 19287                                                                                                                                               @looknkrzy
## 19288                                                                                                                                                @loraries
## 19289                                                                                                                                         @lorenasgonzalez
## 19290                                                                                                                                         @lotuscandlescom
## 19291                                                                                                                                          @louclarkartist
## 19292                                                                                                                                            @lougoobryuss
## 19293                                                                                                                                           @louisjcoletti
## 19294                                                                                                                                                 @louxy77
## 19295                                                                                                                                          @loveamerica4u2
## 19296                                                                                                                                          @loverulesagain
## 19297                                                                                                                                                   @lowes
## 19298                                                                                                                                              @lowtownliz
## 19299                                                                                                                                             @lsfarmer311
## 19300                                                                                                                                               @ltheideal
## 19301                                                                                                                                             @lucaskavner
## 19302                                                                                                                                         @lucialopezchile
## 19303                                                                                                                                            @luisabinader
## 19304                                                                                                                                              @lunarteddy
## 19305                                                                                                                                         @lutherb99406283
## 19306                                                                                                                                             @luvofalibra
## 19307                                                                                                                                           @lydiapasteris
## 19308                                                                                                                                                 @lynagfe
## 19309                                                                                                                                               @lynda3035
## 19310                                                                                                                                              @lynnminges
## 19311                                                                                                                                                 @maanitk
## 19312                                                                                                                                          @macguyvermedia
## 19313                                                                                                                                           @macscreekwine
## 19314                                                                                                                                             @maddogcoops
## 19315                                                                                                                                          @madisonmavband
## 19316                                                                                                                                            @madviillainy
## 19317                                                                                                                                          @maggiepeggy123
## 19318                                                                                                                                              @maggiomatt
## 19319                                                                                                                                             @mainstmagic
## 19320                                                                                                                                               @maisierpx
## 19321                                                                                                                                               @maisongtv
## 19322                                                                                                                                          @malcolmoutloud
## 19323                                                                                                                                           @manishanalyst
## 19324                                                                                                                                           @mansionglobal
## 19325                                                                                                                                               @marcellaz
## 19326                                                                                                                                         @marcietimmerman
## 19327                                                                                                                                           @marcuslemonis
## 19328                                                                                                                                              @marialey88
## 19329                                                                                                                                           @marisolhern17
## 19330                                                                                                                                            @markeomurian
## 19331                                                                                                                                             @markharcan1
## 19332                                                                                                                                              @markniesse
## 19333                                                                                                                                                  @markos
## 19334                                                                                                                                         @markosilberhand
## 19335                                                                                                                                         @markreardonkmox
## 19336                                                                                                                                            @markthorsby1
## 19337                                                                                                                                            @markwietecha
## 19338                                                                                                                                          @markyoungtruth
## 19339                                                                                                                                          @martigcummings
## 19340                                                                                                                                                 @martina
## 19341                                                                                                                                         @martinvizcarrac
## 19342                                                                                                                                           @marwilliamson
## 19343                                                                                                                                         @marylandmatters
## 19344                                                                                                                                          @marylkrinskydo
## 19345                                                                                                                                              @maryshanon
## 19346                                                                                                                                         @mashfanficchick
## 19347                                                                                                                                                 @massdvs
## 19348                                                                                                                                            @massgovernor
## 19349                                                                                                                                                 @masshhs
## 19350                                                                                                                                               @massltgov
## 19351                                                                                                                                              @mastercard
## 19352                                                                                                                                              @mathieuera
## 19353                                                                                                                                             @mattberry05
## 19354                                                                                                                                                   @mattt
## 19355                                                                                                                                            @mattwallaert
## 19356                                                                                                                                            @mattwilsonob
## 19357                                                                                                                                         @maureenumehfox5
## 19358                                                                                                                                               @mawbymick
## 19359                                                                                                                                         @maxalexander091
## 19360                                                                                                                                                @maxy1017
## 19361                                                                                                                                               @maybeames
## 19362                                                                                                                                            @mayhalldiana
## 19363                                                                                                                                            @mayorbarnett
## 19364                                                                                                                                            @mayorgimenez
## 19365                                                                                                                                              @mayorjenny
## 19366                                                                                                                                         @mayostemcelllab
## 19367                                                                                                                                              @mayucuesta
## 19368                                                                                                                                         @mazinaleshaiker
## 19369                                                                                                                                                 @mbeisen
## 19370                                                                                                                                                @mbrave13
## 19371                                                                                                                                                 @mbuhari
## 19372                                                                                                                                           @mcartistdevel
## 19373                                                                                                                                              @mccrarytaz
## 19374                                                                                                                                               @mcgalec99
## 19375                                                                                                                                          @mcginleyisabel
## 19376                                                                                                                                                 @mcomofl
## 19377                                                                                                                                                    @mcps
## 19378                                                                                                                                            @mdhealthdept
## 19379                                                                                                                                                  @mdub71
## 19380                                                                                                                                                 @meaglen
## 19381                                                                                                                                          @medicsarcastic
## 19382                                                                                                                                                  @medium
## 19383                                                                                                                                           @meganmesserly
## 19384                                                                                                                                             @meganranney
## 19385                                                                                                                                              @megynkelly
## 19386                                                                                                                                             @mejicotoday
## 19387                                                                                                                                            @melaniatrump
## 19388                                                                                                                                                 @melanie
## 19389                                                                                                                                           @melanieht1919
## 19390                                                                                                                                         @melissaafrancis
## 19391                                                                                                                                          @melissablasius
## 19392                                                                                                                                         @melissajpeltier
## 19393                                                                                                                                           @melissaupton7
## 19394                                                                                                                                            @melmillerphd
## 19395                                                                                                                                           @melodycbarnes
## 19396                                                                                                                                                @menab719
## 19397                                                                                                                                              @menslifedc
## 19398                                                                                                                                                @mercnews
## 19399                                                                                                                                               @merdemill
## 19400                                                                                                                                               @merklermg
## 19401                                                                                                                                            @merrichristi
## 19402                                                                                                                                           @meyersleonard
## 19403                                                                                                                                                 @mfdicom
## 19404                                                                                                                                                @mhdksafa
## 19405                                                                                                                                                 @miabaga
## 19406                                                                                                                                               @miafarrow
## 19407                                                                                                                                             @miamisquadd
## 19408                                                                                                                                         @michaeleperrone
## 19409                                                                                                                                           @michaelkammes
## 19410                                                                                                                                         @michaelrapaport
## 19411                                                                                                                                           @michaelsroark
## 19412                                                                                                                                           @michaelsteele
## 19413                                                                                                                                            @michaeludine
## 19414                                                                                                                                         @michele92213510
## 19415                                                                                                                                         @michellekalehz1
## 19416                                                                                                                                          @michellemalkin
## 19417                                                                                                                                           @michellemorse
## 19418                                                                                                                                          @michellenewday
## 19419                                                                                                                                           @michelleobama
## 19420                                                                                                                                         @michelleruffvo1
## 19421                                                                                                                                         @michelletandler
## 19422                                                                                                                                            @miconservpac
## 19423                                                                                                                                          @midmichigannow
## 19424                                                                                                                                           @midwincharles
## 19425                                                                                                                                                  @migda7
## 19426                                                                                                                                               @mikecrapo
## 19427                                                                                                                                             @mikeduhaime
## 19428                                                                                                                                             @mikesievert
## 19429                                                                                                                                                @miket404
## 19430                                                                                                                                          @milehighhockey
## 19431                                                                                                                                           @mimitoddpress
## 19432                                                                                                                                              @minciencia
## 19433                                                                                                                                           @minda73992277
## 19434                                                                                                                                             @mindykaling
## 19435                                                                                                                                         @ministeriosalud
## 19436                                                                                                                                           @minneapolispd
## 19437                                                                                                                                                @minnpost
## 19438                                                                                                                                                @misdnews
## 19439                                                                                                                                            @mishacollins
## 19440                                                                                                                                                @missbree
## 19441                                                                                                                                             @missourigop
## 19442                                                                                                                                                @mistirio
## 19443                                                                                                                                          @mistywoodcabin
## 19444                                                                                                                                             @mitchellvii
## 19445                                                                                                                                              @mittromney
## 19446                                                                                                                                           @mkebizjournal
## 19447                                                                                                                                                  @mkraju
## 19448                                                                                                                                                 @mkues65
## 19449                                                                                                                                                     @mlb
## 19450                                                                                                                                                 @mlbinwa
## 19451                                                                                                                                                    @mls�
## 19452                                                                                                                                                   @mmars
## 19453                                                                                                                                                @mmattoch
## 19454                                                                                                                                              @mmcmahon09
## 19455                                                                                                                                              @mochajesus
## 19456                                                                                                                                              @modatimacl
## 19457                                                                                                                                          @modernactivism
## 19458                                                                                                                                               @mofanepal
## 19459                                                                                                                                                  @moharv
## 19460                                                                                                                                             @mojojohanna
## 19461                                                                                                                                           @molgascordero
## 19462                                                                                                                                               @mom4asher
## 19463                                                                                                                                           @monicacrowley
## 19464                                                                                                                                          @monicarmorton1
## 19465                                                                                                                                             @mooneyforwv
## 19466                                                                                                                                                @moreybah
## 19467                                                                                                                                             @morningmika
## 19468                                                                                                                                               @morrimike
## 19469                                                                                                                                             @moshekasher
## 19470                                                                                                                                                @mossadii
## 19471                                                                                                                                             @motherjones
## 19472                                                                                                                                           @motrpolitics1
## 19473                                                                                                                                            @mottchildren
## 19474                                                                                                                                              @moutajulio
## 19475                                                                                                                                              @moxycoxy24
## 19476                                                                                                                                               @mpotter74
## 19477                                                                                                                                               @mprinvale
## 19478                                                                                                                                              @mqmulville
## 19479                                                                                                                                                  @mraint
## 19480                                                                                                                                              @mrbrownsir
## 19481                                                                                                                                           @mrchicksports
## 19482                                                                                                                                          @mrdavidstaples
## 19483                                                                                                                                               @mrjohnpip
## 19484                                                                                                                                           @mrodriguezzzz
## 19485                                                                                                                                                 @mrpjtay
## 19486                                                                                                                                          @mrpoopiepants2
## 19487                                                                                                                                              @mrunni2435
## 19488                                                                                                                                              @mrwbabelon
## 19489                                                                                                                                           @mrwednesday11
## 19490                                                                                                                                                    @msdh
## 19491                                                                                                                                             @msk89680121
## 19492                                                                                                                                                @msmariat
## 19493                                                                                                                                           @msresjudicata
## 19494                                                                                                                                           @msrosalesafms
## 19495                                                                                                                                             @mssackstein
## 19496                                                                                                                                                @mstee510
## 19497                                                                                                                                               @mstourist
## 19498                                                                                                                                                 @msvespa
## 19499                                                                                                                                                  @multco
## 19500                                                                                                                                              @mvdlyinluv
## 19501                                                                                                                                                @my1blood
## 19502                                                                                                                                             @mycatalan88
## 19503                                                                                                                                          @myfathercigars
## 19504                                                                                                                                              @myglendale
## 19505                                                                                                                                             @mynethealth
## 19506                                                                                                                                                @myrakhan
## 19507                                                                                                                                             @myssissippi
## 19508                                                                                                                                               @naacpmpls
## 19509                                                                                                                                                @nabseorg
## 19510                                                                                                                                          @nacchealthcare
## 19511                                                                                                                                            @nacchoalerts
## 19512                                                                                                                                           @nacogdocheshs
## 19513                                                                                                                                            @nailingitusa
## 19514                                                                                                                                             @nakedcapsid
## 19515                                                                                                                                                    @naky
## 19516                                                                                                                                            @nanageddon57
## 19517                                                                                                                                         @nanceetomlinson
## 19518                                                                                                                                          @nancyspinelli9
## 19519                                                                                                                                               @nancyyohh
## 19520                                                                                                                                          @napolishkolnik
## 19521                                                                                                                                            @narendramodi
## 19522                                                                                                                                                  @nascar
## 19523                                                                                                                                             @nascaronfox
## 19524                                                                                                                                            @natakristine
## 19525                                                                                                                                           @nataleesnider
## 19526                                                                                                                                          @natalieallison
## 19527                                                                                                                                             @nathanvardi
## 19528                                                                                                                                          @nationwidekids
## 19529                                                                                                                                                @natureag
## 19530                                                                                                                                         @nbcphiladelphia
## 19531                                                                                                                                             @nbcsandiego
## 19532                                                                                                                                                 @nberlat
## 19533                                                                                                                                                   @nbpts
## 19534                                                                                                                                                     @nc5
## 19535                                                                                                                                           @nc5emilyluxen
## 19536                                                                                                                                                    @ncaa
## 19537                                                                                                                                                   @ncgop
## 19538                                                                                                                                          @ncisneworleans
## 19539                                                                                                                                                   @ncrla
## 19540                                                                                                                                               @nedanews8
## 19541                                                                                                                                                 @nehaorg
## 19542                                                                                                                                             @nellyhanley
## 19543                                                                                                                                              @neonnettle
## 19544                                                                                                                                              @nerdybyptw
## 19545                                                                                                                                         @nevertr74704466
## 19546                                                                                                                                             @nevervanity
## 19547                                                                                                                                         @nevrcomplicated
## 19548                                                                                                                                                 @news3lv
## 19549                                                                                                                                            @news4buffalo
## 19550                                                                                                                                         @newscentermaine
## 19551                                                                                                                                            @newschannel9
## 19552                                                                                                                                             @newshoundnc
## 19553                                                                                                                                                 @newsmax
## 19554                                                                                                                                            @nhannahjones
## 19555                                                                                                                                               @nhsconfed
## 19556                                                                                                                                               @nickwiger
## 19557                                                                                                                                              @nicoconina
## 19558                                                                                                                                         @nicolledwallace
## 19559                                                                                                                                               @nietteach
## 19560                                                                                                                                             @nigelstobbs
## 19561                                                                                                                                               @nikestore
## 19562                                                                                                                                                  @niketa
## 19563                                                                                                                                          @nikolovscience
## 19564                                                                                                                                          @nikwotherspoon
## 19565                                                                                                                                            @nisdkallison
## 19566                                                                                                                                              @nisdmurnin
## 19567                                                                                                                                               @nissanusa
## 19568                                                                                                                                             @njgirlkathy
## 19569                                                                                                                                                   @njgop
## 19570                                                                                                                                             @nlovelydark
## 19571                                                                                                                                                   @nmdoh
## 19572                                                                                                                                                    @nncc
## 19573                                                                                                                                                @no1trump
## 19574                                                                                                                                              @nobschools
## 19575                                                                                                                                               @nopdchief
## 19576                                                                                                                                                @nopdnews
## 19577                                                                                                                                           @norskladywolf
## 19578                                                                                                                                          @northsidefndrs
## 19579                                                                                                                                                 @notghgs
## 19580                                                                                                                                          @nouveauxdebuts
## 19581                                                                                                                                             @nowthisnews
## 19582                                                                                                                                                   @npob1
## 19583                                                                                                                                                    @nrdc
## 19584                                                                                                                                                @nrmorrow
## 19585                                                                                                                                             @nrosenbluth
## 19586                                                                                                                                            @nrspgeseaton
## 19587                                                                                                                                             @nterryellis
## 19588                                                                                                                                                 @ntn24ve
## 19589                                                                                                                                                 @nudog71
## 19590                                                                                                                                           @nufeinbergmed
## 19591                                                                                                                                               @nukestrat
## 19592                                                                                                                                                 @nusoqic
## 19593                                                                                                                                          @nyagandmarkets
## 19594                                                                                                                                           @nybookieduane
## 19595                                                                                                                                         @nychealthsystem
## 19596                                                                                                                                              @nychealthy
## 19597                                                                                                                                         @nycmayorsoffice
## 19598                                                                                                                                            @nylawjournal
## 19599                                                                                                                                                    @nypd
## 19600                                                                                                                                               @nypd47pct
## 19601                                                                                                                                         @nypdcommaffairs
## 19602                                                                                                                                          @nypddetectives
## 19603                                                                                                                                                @nypdshea
## 19604                                                                                                                                                @nyslabor
## 19605                                                                                                                                            @nyuniversity
## 19606                                                                                                                                                @nzherald
## 19607                                                                                                                                              @oakdenwolf
## 19608                                                                                                                                                  @oakgov
## 19609                                                                                                                                              @obamamalik
## 19610                                                                                                                                            @obsidianandy
## 19611                                                                                                                                           @obviousshirts
## 19612                                                                                                                                                  @obxjen
## 19613                                                                                                                                                 @obxlisa
## 19614                                                                                                                                                  @oddboz
## 19615                                                                                                                                                @odktiger
## 19616                                                                                                                                             @officialcrt
## 19617                                                                                                                                           @officialjoelf
## 19618                                                                                                                                          @ohcircuitrider
## 19619                                                                                                                                           @ohiochildhosp
## 19620                                                                                                                                              @ohiohealth
## 19621                                                                                                                                           @ohiohospitals
## 19622                                                                                                                                                 @ohiopjp
## 19623                                                                                                                                              @ohsodeerow
## 19624                                                                                                                                            @ojosbrujos00
## 19625                                                                                                                                           @oklahomawatch
## 19626                                                                                                                                         @oldguydoingfor1
## 19627                                                                                                                                         @oldmanbackagain
## 19628                                                                                                                                            @oldtimer1968
## 19629                                                                                                                                         @oliviac14337638
## 19630                                                                                                                                            @olivierpatti
## 19631                                                                                                                                             @olsonweller
## 19632                                                                                                                                            @oluisblessed
## 19633                                                                                                                                                @ommalloy
## 19634                                                                                                                                           @onlinecitizen
## 19635                                                                                                                                         @onlinedetective
## 19636                                                                                                                                             @onuderechos
## 19637                                                                                                                                                @ooaswaho
## 19638                                                                                                                                               @opentable
## 19639                                                                                                                                                   @oprah
## 19640                                                                                                                                                  @oprman
## 19641                                                                                                                                                  @opsoms
## 19642                                                                                                                                            @orlandomayor
## 19643                                                                                                                                               @ornaverum
## 19644                                                                                                                                               @orunychoi
## 19645                                                                                                                                            @osibaltimore
## 19646                                                                                                                                                 @ourtasc
## 19647                                                                                                                                                 @outkick
## 19648                                                                                                                                              @over400ppm
## 19649                                                                                                                                            @overrated708
## 19650                                                                                                                                              @overtheluv
## 19651                                                                                                                                                  @owoult
## 19652                                                                                                                                               @paaleo10z
## 19653                                                                                                                                           @pablogarciamd
## 19654                                                                                                                                              @pablonegri
## 19655                                                                                                                                                @padenpur
## 19656                                                                                                                                              @pagetpaget
## 19657                                                                                                                                                @paige933
## 19658                                                                                                                                               @paiges502
## 19659                                                                                                                                               @pamcampos
## 19660                                                                                                                                            @pamelaherbin
## 19661                                                                                                                                             @panampostes
## 19662                                                                                                                                               @pantomath
## 19663                                                                                                                                              @papiijuaan
## 19664                                                                                                                                           @paramitasen17
## 19665                                                                                                                                              @parham1961
## 19666                                                                                                                                            @parijatsen11
## 19667                                                                                                                                            @parknicollet
## 19668                                                                                                                                          @parneetgrewal6
## 19669                                                                                                                                              @parrishsky
## 19670                                                                                                                                             @pasadenagov
## 19671                                                                                                                                               @pastadrop
## 19672                                                                                                                                           @patmcafeeshow
## 19673                                                                                                                                                  @patmx1
## 19674                                                                                                                                                @patofdez
## 19675                                                                                                                                         @patrici99338384
## 19676                                                                                                                                          @patrickmahomes
## 19677                                                                                                                                              @patrickvot
## 19678                                                                                                                                              @patriotact
## 19679                                                                                                                                         @patrioticmaster
## 19680                                                                                                                                              @pattidudek
## 19681                                                                                                                                              @patton6966
## 19682                                                                                                                                           @pattyarquette
## 19683                                                                                                                                            @paulareidcbs
## 19684                                                                                                                                             @paulbrownuk
## 19685                                                                                                                                              @paulcobler
## 19686                                                                                                                                             @paulkrugman
## 19687                                                                                                                                              @paullarosa
## 19688                                                                                                                                            @paultenhaken
## 19689                                                                                                                                          @paulvandermeer
## 19690                                                                                                                                                   @pause
## 19691                                                                                                                                                @pberryrn
## 19692                                                                                                                                              @pccakebell
## 19693                                                                                                                                                  @peace1
## 19694                                                                                                                                         @peasantrevoltin
## 19695                                                                                                                                            @pedromcasals
## 19696                                                                                                                                                  @pegdid
## 19697                                                                                                                                              @pensandopr
## 19698                                                                                                                                                   @pepsi
## 19699                                                                                                                                          @perfumeflogger
## 19700                                                                                                                                         @personacustomcl
## 19701                                                                                                                                                    @peta
## 19702                                                                                                                                              @peteyboi76
## 19703                                                                                                                                          @petralovesbern
## 19704                                                                                                                                            @petruquiocec
## 19705                                                                                                                                         @philadelphiagov
## 19706                                                                                                                                                @philapsr
## 19707                                                                                                                                                @philcuff
## 19708                                                                                                                                           @phillybailout
## 19709                                                                                                                                             @phillymayor
## 19710                                                                                                                                            @phillyweekly
## 19711                                                                                                                                          @phlblackgiving
## 19712                                                                                                                                              @phlcouncil
## 19713                                                                                                                                           @phyllissharps
## 19714                                                                                                                                              @physiomacp
## 19715                                                                                                                                          @pinacocotweets
## 19716                                                                                                                                                    @pink
## 19717                                                                                                                                              @pinklady56
## 19718                                                                                                                                            @pittsburghpg
## 19719                                                                                                                                                   @pkr63
## 19720                                                                                                                                              @pkyongedrs
## 19721                                                                                                                                           @planetafuturo
## 19722                                                                                                                                          @platinumequity
## 19723                                                                                                                                            @pmurphysucks
## 19724                                                                                                                                              @pnjoshiacm
## 19725                                                                                                                                              @policyutsa
## 19726                                                                                                                                              @politicomx
## 19727                                                                                                                                           @pollardforhtx
## 19728                                                                                                                                         @pollennationmag
## 19729                                                                                                                                              @pontifexes
## 19730                                                                                                                                                  @popsci
## 19731                                                                                                                                                @popville
## 19732                                                                                                                                                 @porchnc
## 19733                                                                                                                                            @portlandcane
## 19734                                                                                                                                             @portlusglam
## 19735                                                                                                                                               @postmates
## 19736                                                                                                                                              @potstilled
## 19737                                                                                                                                                 @potus�s
## 19738                                                                                                                                              @prescarder
## 19739                                                                                                                                            @presidentbcc
## 19740                                                                                                                                           @pressnewdaynj
## 19741                                                                                                                                         @prettyb47360709
## 19742                                                                                                                                              @prettyvana
## 19743                                                                                                                                                    @prez
## 19744                                                                                                                                                @primeai3
## 19745                                                                                                                                                @priscian
## 19746                                                                                                                                              @priyanbcsd
## 19747                                                                                                                                              @prmoficial
## 19748                                                                                                                                                 @pro3263
## 19749                                                                                                                                         @profkarolsikora
## 19750                                                                                                                                         @promedicahealth
## 19751                                                                                                                                              @providence
## 19752                                                                                                                                            @proximalbaxi
## 19753                                                                                                                                          @prttyxprincess
## 19754                                                                                                                                                 @pshrink
## 19755                                                                                                                                               @psierra01
## 19756                                                                                                                                            @ptylerdallas
## 19757                                                                                                                                            @publichealth
## 19758                                                                                                                                          @pumpernickelmd
## 19759                                                                                                                                                  @pushat
## 19760                                                                                                                                             @pussycatinc
## 19761                                                                                                                                                  @pwcgov
## 19762                                                                                                                                                 @pynance
## 19763                                                                                                                                             @pyramidback
## 19764                                                                                                                                                @qshepp06
## 19765                                                                                                                                          @queencitynerve
## 19766                                                                                                                                                @queereye
## 19767                                                                                                                                           @racheldepompa
## 19768                                                                                                                                           @rachelkfriend
## 19769                                                                                                                                              @racmonitor
## 19770                                                                                                                                            @radiofreetom
## 19771                                                                                                                                            @radiologyacr
## 19772                                                                                                                                              @radiousach
## 19773                                                                                                                                                  @radkey
## 19774                                                                                                                                              @ragnar0300
## 19775                                                                                                                                             @raiderrob24
## 19776                                                                                                                                                 @raiders
## 19777                                                                                                                                            @ralphnortham
## 19778                                                                                                                                               @random230
## 19779                                                                                                                                                @randpaul
## 19780                                                                                                                                             @raphaelha67
## 19781                                                                                                                                           @rashikabansal
## 19782                                                                                                                                              @rasjbaraka
## 19783                                                                                                                                                 @ratioku
## 19784                                                                                                                                            @ravenpadilla
## 19785                                                                                                                                          @raymondarrieta
## 19786                                                                                                                                              @raziaiqbal
## 19787                                                                                                                                                 @rbartny
## 19788                                                                                                                                                 @rcmhere
## 19789                                                                                                                                           @readyletsgo27
## 19790                                                                                                                                           @reagansraptor
## 19791                                                                                                                                          @realanondouche
## 19792                                                                                                                                          @realcattycatty
## 19793                                                                                                                                           @realdavidrush
## 19794                                                                                                                                        @realdonaldtrumps
## 19795                                                                                                                                       @realdonaldtrump�s
## 19796                                                                                                                                          @realericcarmen
## 19797                                                                                                                                               @realggiii
## 19798                                                                                                                                           @realkiradavis
## 19799                                                                                                                                         @realpetewohlars
## 19800                                                                                                                                             @realredpimp
## 19801                                                                                                                                           @realronhoward
## 19802                                                                                                                                             @realstosh44
## 19803                                                                                                                                         @realtrumperland
## 19804                                                                                                                                         @realtuckfrumper
## 19805                                                                                                                                          @reasondontfear
## 19806                                                                                                                                           @rebeccajarvis
## 19807                                                                                                                                          @rebekahgordon1
## 19808                                                                                                                                         @rebelnewsonline
## 19809                                                                                                                                              @reblyn1963
## 19810                                                                                                                                          @redberetsm4all
## 19811                                                                                                                                                @redcross
## 19812                                                                                                                                            @reddsaidit�s
## 19813                                                                                                                                         @redheadrdmption
## 19814                                                                                                                                                 @redxsea
## 19815                                                                                                                                            @reesetheone1
## 19816                                                                                                                                                  @reform
## 19817                                                                                                                                           @refusefascism
## 19818                                                                                                                                               @rem110892
## 19819                                                                                                                                          @renitablunschi
## 19820                                                                                                                                           @repadamschiff
## 19821                                                                                                                                          @repandybiggsaz
## 19822                                                                                                                                          @repdancrenshaw
## 19823                                                                                                                                                @repgosar
## 19824                                                                                                                                             @repjeffries
## 19825                                                                                                                                           @repjoshharder
## 19826                                                                                                                                           @repkendrahorn
## 19827                                                                                                                                         @repmarygonzalez
## 19828                                                                                                                                           @reprichhudson
## 19829                                                                                                                                              @repshipley
## 19830                                                                                                                                            @republiculos
## 19831                                                                                                                                           @repvaldemings
## 19832                                                                                                                                                 @reubing
## 19833                                                                                                                                                 @reuters
## 19834                                                                                                                                                  @rev115
## 19835                                                                                                                                          @reverendfreako
## 19836                                                                                                                                           @revolutionbbq
## 19837                                                                                                                                           @rhodybaseball
## 19838                                                                                                                                               @rholftroy
## 19839                                                                                                                                           @rhondamarasco
## 19840                                                                                                                                             @rhythmjones
## 19841                                                                                                                                                @rialisms
## 19842                                                                                                                                            @ribibaseball
## 19843                                                                                                                                               @ricardohn
## 19844                                                                                                                                          @richardgrenell
## 19845                                                                                                                                            @richo2017tom
## 19846                                                                                                                                          @rickhargreaves
## 19847                                                                                                                                             @rickonassis
## 19848                                                                                                                                         @righteousminnie
## 19849                                                                                                                                               @rihealths
## 19850                                                                                                                                             @riotwomennn
## 19851                                                                                                                                            @risabrooks12
## 19852                                                                                                                                              @ritamacmom
## 19853                                                                                                                                              @rivalsmike
## 19854                                                                                                                                           @riverviewhosp
## 19855                                                                                                                                               @rjgraziul
## 19856                                                                                                                                                    @rjmx
## 19857                                                                                                                                                 @rmgduji
## 19858                                                                                                                                                     @rnc
## 19859                                                                                                                                               @robent805
## 19860                                                                                                                                          @robertaderholt
## 19861                                                                                                                                          @robertgarcialb
## 19862                                                                                                                                             @robferullo4
## 19863                                                                                                                                                  @robhon
## 19864                                                                                                                                              @robincogan
## 19865                                                                                                                                          @robotwhocleans
## 19866                                                                                                                                               @robreiner
## 19867                                                                                                                                                   @roche
## 19868                                                                                                                                          @rochesterhills
## 19869                                                                                                                                         @rochestermelany
## 19870                                                                                                                                          @rockefellerfdn
## 19871                                                                                                                                           @rockormiston2
## 19872                                                                                                                                         @rockymountviews
## 19873                                                                                                                                               @rockysly9
## 19874                                                                                                                                                @rodbenji
## 19875                                                                                                                                               @roddreher
## 19876                                                                                                                                             @rodneyrohde
## 19877                                                                                                                                           @rodrosenstein
## 19878                                                                                                                                          @rogeliosaenz42
## 19879                                                                                                                                         @rogergoodellmus
## 19880                                                                                                                                            @rogtallbloke
## 19881                                                                                                                                          @roguefirstlady
## 19882                                                                                                                                                @ron9gray
## 19883                                                                                                                                                @ronccole
## 19884                                                                                                                                               @roncookpg
## 19885                                                                                                                                           @rondesantisfl
## 19886                                                                                                                                         @ronnyjackson4tx
## 19887                                                                                                                                                 @roper93
## 19888                                                                                                                                                @rosmommy
## 19889                                                                                                                                            @rowancollege
## 19890                                                                                                                                                @royblunt
## 19891                                                                                                                                                @royce400
## 19892                                                                                                                                             @roycewesttx
## 19893                                                                                                                                             @roycoopernc
## 19894                                                                                                                                               @roylilley
## 19895                                                                                                                                           @rudegyalmauni
## 19896                                                                                                                                               @rumbalion
## 19897                                                                                                                                           @runtowin92427
## 19898                                                                                                                                          @rushuniversity
## 19899                                                                                                                                           @russopartners
## 19900                                                                                                                                            @russsherman5
## 19901                                                                                                                                               @ruthmalan
## 19902                                                                                                                                                @rvat2020
## 19903                                                                                                                                           @rvcoachbutler
## 19904                                                                                                                                              @rvdistance
## 19905                                                                                                                                           @ryanafournier
## 19906                                                                                                                                             @ryanjreilly
## 19907                                                                                                                                                @ryanwolf
## 19908                                                                                                                                            @saballes8470
## 19909                                                                                                                                         @sabrinasiddiqui
## 19910                                                                                                                                               @sadiqkhan
## 19911                                                                                                                                             @safetykleen
## 19912                                                                                                                                               @saidulloa
## 19913                                                                                                                                                 @saikatc
## 19914                                                                                                                                           @saintvitusbar
## 19915                                                                                                                                                 @sairafa
## 19916                                                                                                                                            @saleemranjha
## 19917                                                                                                                                                @sali1368
## 19918                                                                                                                                            @samadisongbb
## 19919                                                                                                                                           @samadisonmavs
## 19920                                                                                                                                            @samavsgolf72
## 19921                                                                                                                                           @samavsgsoccer
## 19922                                                                                                                                              @sameritech
## 19923                                                                                                                                               @samesmail
## 19924                                                                                                                                                @samizayn
## 19925                                                                                                                                                @samlounz
## 19926                                                                                                                                           @sammurraytory
## 19927                                                                                                                                              @sampweaver
## 19928                                                                                                                                                 @samsora
## 19929                                                                                                                                          @samuelljackson
## 19930                                                                                                                                              @sanaayesha
## 19931                                                                                                                                          @sandalsresorts
## 19932                                                                                                                                          @sandiegocounty
## 19933                                                                                                                                              @sandiegopd
## 19934                                                                                                                                         @sandyleevincent
## 19935                                                                                                                                           @sanfordhealth
## 19936                                                                                                                                               @sanjosepd
## 19937                                                                                                                                             @sanpadrepio
## 19938                                                                                                                                               @sansajran
## 19939                                                                                                                                          @santaanitapark
## 19940                                                                                                                                           @santosiglesia
## 19941                                                                                                                                                @sarahcpr
## 19942                                                                                                                                              @saraodette
## 19943                                                                                                                                             @sarasmalltv
## 19944                                                                                                                                           @sashabeauloux
## 19945                                                                                                                                         @sassyangelgirl4
## 19946                                                                                                                                           @sassycassycat
## 19947                                                                                                                                              @sayswhynot
## 19948                                                                                                                                             @sbnationnhl
## 19949                                                                                                                                            @sbuspoficial
## 19950                                                                                                                                              @scaramucci
## 19951                                                                                                                                              @scarymommy
## 19952                                                                                                                                                    @sccm
## 19953                                                                                                                                              @sccommerce
## 19954                                                                                                                                          @schwarzkopfusa
## 19955                                                                                                                                            @sciencealert
## 19956                                                                                                                                            @sciencedaily
## 19957                                                                                                                                         @sciencemagazine
## 19958                                                                                                                                               @scientits
## 19959                                                                                                                                           @sciimmunology
## 19960                                                                                                                                           @score4schools
## 19961                                                                                                                                               @scotsfyre
## 19962                                                                                                                                          @scottadamssays
## 19963                                                                                                                                              @scottandbr
## 19964                                                                                                                                         @scottdochterman
## 19965                                                                                                                                         @scottgottliebmd
## 19966                                                                                                                                              @scottjenks
## 19967                                                                                                                                            @scottsantens
## 19968                                                                                                                                           @scottturner45
## 19969                                                                                                                                             @scottwalker
## 19970                                                                                                                                         @scottwapnercnbc
## 19971                                                                                                                                         @scristianlozano
## 19972                                                                                                                                               @scupstate
## 19973                                                                                                                                                   @sddnp
## 19974                                                                                                                                           @sdmesachicano
## 19975                                                                                                                                           @sdmesacollege
## 19976                                                                                                                                                    @sdut
## 19977                                                                                                                                                @sdwc2020
## 19978                                                                                                                                          @seanmcmanamon1
## 19979                                                                                                                                                @seaworld
## 19980                                                                                                                                         @sectrehargett�s
## 19981                                                                                                                                               @sejournal
## 19982                                                                                                                                              @selacollab
## 19983                                                                                                                                                  @selaps
## 19984                                                                                                                                            @selfprovoked
## 19985                                                                                                                                            @senalexander
## 19986                                                                                                                                            @senatorhwang
## 19987                                                                                                                                              @senatorluz
## 19988                                                                                                                                           @senatorromney
## 19989                                                                                                                                          @senbillcassidy
## 19990                                                                                                                                            @sendougjones
## 19991                                                                                                                                            @senhorraposa
## 19992                                                                                                                                          @senjohnkennedy
## 19993                                                                                                                                              @senmikelee
## 19994                                                                                                                                           @senrobportman
## 19995                                                                                                                                               @senshelby
## 19996                                                                                                                                         @sensherrodbrown
## 19997                                                                                                                                              @sentedcruz
## 19998                                                                                                                                            @sentinasmith
## 19999                                                                                                                                          @senyorreporter
##          n total         freq
## 1     3832 65844 5.819817e-02
## 2     3626 66780 5.429769e-02
## 3     2568 55641 4.615302e-02
## 4      894 55641 1.606729e-02
## 5      643 65844 9.765506e-03
## 6      602 66780 9.014675e-03
## 7      499 65844 7.578519e-03
## 8      476 55641 8.554843e-03
## 9      454 65844 6.895085e-03
## 10     433 66780 6.483977e-03
## 11     389 66780 5.825097e-03
## 12     353 65844 5.361157e-03
## 13     347 55641 6.236408e-03
## 14     333 55641 5.984795e-03
## 15     309 55641 5.553459e-03
## 16     300 66780 4.492363e-03
## 17     275 55641 4.942399e-03
## 18     261 66780 3.908356e-03
## 19     259 65844 3.933540e-03
## 20     249 66780 3.728661e-03
## 21     237 55641 4.259449e-03
## 22     237 55641 4.259449e-03
## 23     224 65844 3.401980e-03
## 24     221 65844 3.356418e-03
## 25     213 65844 3.234919e-03
## 26     212 66780 3.174603e-03
## 27     211 65844 3.204544e-03
## 28     205 66780 3.069781e-03
## 29     201 65844 3.052670e-03
## 30     195 66780 2.920036e-03
## 31     195 55641 3.504610e-03
## 32     192 65844 2.915983e-03
## 33     189 66780 2.830189e-03
## 34     186 65844 2.824859e-03
## 35     186 65844 2.824859e-03
## 36     185 55641 3.324886e-03
## 37     184 66780 2.755316e-03
## 38     182 66780 2.725367e-03
## 39     180 55641 3.235025e-03
## 40     178 55641 3.199080e-03
## 41     174 65844 2.642610e-03
## 42     172 65844 2.612235e-03
## 43     167 65844 2.536298e-03
## 44     164 55641 2.947467e-03
## 45     162 66780 2.425876e-03
## 46     162 55641 2.911522e-03
## 47     161 66780 2.410901e-03
## 48     153 55641 2.749771e-03
## 49     152 66780 2.276131e-03
## 50     151 66780 2.261156e-03
## 51     147 66780 2.201258e-03
## 52     147 65844 2.232550e-03
## 53     146 66780 2.186283e-03
## 54     143 66780 2.141360e-03
## 55     140 55641 2.516130e-03
## 56     139 66780 2.081462e-03
## 57     138 66780 2.066487e-03
## 58     138 65844 2.095863e-03
## 59     137 65844 2.080676e-03
## 60     137 55641 2.462213e-03
## 61     136 55641 2.444241e-03
## 62     134 65844 2.035113e-03
## 63     134 55641 2.408296e-03
## 64     133 55641 2.390324e-03
## 65     132 65844 2.004738e-03
## 66     129 65844 1.959176e-03
## 67     128 66780 1.916742e-03
## 68     128 66780 1.916742e-03
## 69     128 65844 1.943989e-03
## 70     126 66780 1.886792e-03
## 71     125 66780 1.871818e-03
## 72     122 65844 1.852864e-03
## 73     122 55641 2.192628e-03
## 74     121 66780 1.811920e-03
## 75     121 55641 2.174655e-03
## 76     121 55641 2.174655e-03
## 77     120 65844 1.822490e-03
## 78     120 55641 2.156683e-03
## 79     119 66780 1.781971e-03
## 80     119 65844 1.807302e-03
## 81     119 55641 2.138711e-03
## 82     117 66780 1.752022e-03
## 83     117 65844 1.776927e-03
## 84     117 55641 2.102766e-03
## 85     116 65844 1.761740e-03
## 86     115 65844 1.746552e-03
## 87     114 66780 1.707098e-03
## 88     112 65844 1.700990e-03
## 89     112 55641 2.012904e-03
## 90     111 55641 1.994932e-03
## 91     110 66780 1.647200e-03
## 92     110 66780 1.647200e-03
## 93     110 65844 1.670615e-03
## 94     108 66780 1.617251e-03
## 95     108 66780 1.617251e-03
## 96     108 65844 1.640241e-03
## 97     108 55641 1.941015e-03
## 98     107 65844 1.625053e-03
## 99     106 66780 1.587302e-03
## 100    106 65844 1.609866e-03
## 101    104 66780 1.557353e-03
## 102    104 65844 1.579491e-03
## 103    104 65844 1.579491e-03
## 104    104 55641 1.869125e-03
## 105    103 66780 1.542378e-03
## 106    102 65844 1.549116e-03
## 107    100 66780 1.497454e-03
## 108     99 66780 1.482480e-03
## 109     99 55641 1.779263e-03
## 110     98 66780 1.467505e-03
## 111     98 65844 1.488366e-03
## 112     98 65844 1.488366e-03
## 113     98 55641 1.761291e-03
## 114     97 65844 1.473179e-03
## 115     97 65844 1.473179e-03
## 116     97 55641 1.743319e-03
## 117     96 66780 1.437556e-03
## 118     96 66780 1.437556e-03
## 119     96 65844 1.457992e-03
## 120     96 55641 1.725346e-03
## 121     94 66780 1.407607e-03
## 122     94 55641 1.689402e-03
## 123     94 55641 1.689402e-03
## 124     93 65844 1.412429e-03
## 125     91 66780 1.362683e-03
## 126     91 65844 1.382055e-03
## 127     91 55641 1.635485e-03
## 128     90 66780 1.347709e-03
## 129     90 65844 1.366867e-03
## 130     89 65844 1.351680e-03
## 131     89 65844 1.351680e-03
## 132     88 66780 1.317760e-03
## 133     88 55641 1.581568e-03
## 134     87 66780 1.302785e-03
## 135     86 65844 1.306117e-03
## 136     85 66780 1.272836e-03
## 137     85 66780 1.272836e-03
## 138     85 65844 1.290930e-03
## 139     84 65844 1.275743e-03
## 140     84 55641 1.509678e-03
## 141     83 66780 1.242887e-03
## 142     83 66780 1.242887e-03
## 143     83 65844 1.260555e-03
## 144     83 65844 1.260555e-03
## 145     83 55641 1.491706e-03
## 146     83 55641 1.491706e-03
## 147     83 55641 1.491706e-03
## 148     82 66780 1.227913e-03
## 149     82 66780 1.227913e-03
## 150     82 65844 1.245368e-03
## 151     82 55641 1.473733e-03
## 152     81 66780 1.212938e-03
## 153     81 66780 1.212938e-03
## 154     81 65844 1.230180e-03
## 155     80 65844 1.214993e-03
## 156     80 55641 1.437789e-03
## 157     79 66780 1.182989e-03
## 158     79 66780 1.182989e-03
## 159     79 65844 1.199806e-03
## 160     79 65844 1.199806e-03
## 161     79 55641 1.419816e-03
## 162     79 55641 1.419816e-03
## 163     78 66780 1.168014e-03
## 164     78 65844 1.184618e-03
## 165     77 66780 1.153040e-03
## 166     76 66780 1.138065e-03
## 167     76 66780 1.138065e-03
## 168     76 65844 1.154243e-03
## 169     75 66780 1.123091e-03
## 170     75 65844 1.139056e-03
## 171     75 65844 1.139056e-03
## 172     74 66780 1.108116e-03
## 173     74 66780 1.108116e-03
## 174     74 66780 1.108116e-03
## 175     74 66780 1.108116e-03
## 176     74 65844 1.123869e-03
## 177     72 66780 1.078167e-03
## 178     72 65844 1.093494e-03
## 179     72 55641 1.294010e-03
## 180     72 55641 1.294010e-03
## 181     71 66780 1.063193e-03
## 182     71 65844 1.078306e-03
## 183     71 55641 1.276037e-03
## 184     70 66780 1.048218e-03
## 185     70 65844 1.063119e-03
## 186     70 65844 1.063119e-03
## 187     70 65844 1.063119e-03
## 188     70 55641 1.258065e-03
## 189     69 65844 1.047931e-03
## 190     69 65844 1.047931e-03
## 191     69 65844 1.047931e-03
## 192     69 55641 1.240093e-03
## 193     69 55641 1.240093e-03
## 194     68 65844 1.032744e-03
## 195     67 66780 1.003294e-03
## 196     67 66780 1.003294e-03
## 197     67 66780 1.003294e-03
## 198     67 55641 1.204148e-03
## 199     67 55641 1.204148e-03
## 200     66 55641 1.186176e-03
## 201     66 55641 1.186176e-03
## 202     66 55641 1.186176e-03
## 203     66 55641 1.186176e-03
## 204     66 55641 1.186176e-03
## 205     66 55641 1.186176e-03
## 206     65 66780 9.733453e-04
## 207     65 65844 9.871818e-04
## 208     65 65844 9.871818e-04
## 209     65 65844 9.871818e-04
## 210     64 66780 9.583708e-04
## 211     64 66780 9.583708e-04
## 212     64 66780 9.583708e-04
## 213     64 65844 9.719944e-04
## 214     64 55641 1.150231e-03
## 215     63 66780 9.433962e-04
## 216     63 66780 9.433962e-04
## 217     63 55641 1.132259e-03
## 218     62 66780 9.284217e-04
## 219     62 66780 9.284217e-04
## 220     62 66780 9.284217e-04
## 221     62 65844 9.416196e-04
## 222     62 65844 9.416196e-04
## 223     61 66780 9.134471e-04
## 224     61 66780 9.134471e-04
## 225     61 66780 9.134471e-04
## 226     61 66780 9.134471e-04
## 227     61 65844 9.264322e-04
## 228     61 65844 9.264322e-04
## 229     61 55641 1.096314e-03
## 230     61 55641 1.096314e-03
## 231     61 55641 1.096314e-03
## 232     60 66780 8.984726e-04
## 233     60 66780 8.984726e-04
## 234     60 66780 8.984726e-04
## 235     60 66780 8.984726e-04
## 236     60 66780 8.984726e-04
## 237     60 65844 9.112448e-04
## 238     60 65844 9.112448e-04
## 239     60 65844 9.112448e-04
## 240     60 65844 9.112448e-04
## 241     60 55641 1.078342e-03
## 242     59 65844 8.960573e-04
## 243     59 65844 8.960573e-04
## 244     59 65844 8.960573e-04
## 245     59 65844 8.960573e-04
## 246     59 55641 1.060369e-03
## 247     59 55641 1.060369e-03
## 248     58 66780 8.685235e-04
## 249     58 55641 1.042397e-03
## 250     58 55641 1.042397e-03
## 251     58 55641 1.042397e-03
## 252     58 55641 1.042397e-03
## 253     58 55641 1.042397e-03
## 254     57 65844 8.656825e-04
## 255     57 65844 8.656825e-04
## 256     57 55641 1.024424e-03
## 257     57 55641 1.024424e-03
## 258     56 66780 8.385744e-04
## 259     56 66780 8.385744e-04
## 260     56 66780 8.385744e-04
## 261     56 65844 8.504951e-04
## 262     56 65844 8.504951e-04
## 263     56 65844 8.504951e-04
## 264     56 55641 1.006452e-03
## 265     55 66780 8.235999e-04
## 266     55 66780 8.235999e-04
## 267     55 66780 8.235999e-04
## 268     55 65844 8.353077e-04
## 269     55 65844 8.353077e-04
## 270     55 65844 8.353077e-04
## 271     55 65844 8.353077e-04
## 272     55 55641 9.884797e-04
## 273     55 55641 9.884797e-04
## 274     55 55641 9.884797e-04
## 275     55 55641 9.884797e-04
## 276     54 66780 8.086253e-04
## 277     54 66780 8.086253e-04
## 278     54 65844 8.201203e-04
## 279     54 65844 8.201203e-04
## 280     54 65844 8.201203e-04
## 281     54 65844 8.201203e-04
## 282     54 65844 8.201203e-04
## 283     54 65844 8.201203e-04
## 284     54 55641 9.705074e-04
## 285     54 55641 9.705074e-04
## 286     53 66780 7.936508e-04
## 287     53 66780 7.936508e-04
## 288     53 66780 7.936508e-04
## 289     53 65844 8.049329e-04
## 290     53 65844 8.049329e-04
## 291     53 65844 8.049329e-04
## 292     53 55641 9.525350e-04
## 293     53 55641 9.525350e-04
## 294     52 66780 7.786763e-04
## 295     52 66780 7.786763e-04
## 296     52 66780 7.786763e-04
## 297     52 66780 7.786763e-04
## 298     52 66780 7.786763e-04
## 299     52 65844 7.897455e-04
## 300     52 65844 7.897455e-04
## 301     52 65844 7.897455e-04
## 302     52 65844 7.897455e-04
## 303     52 65844 7.897455e-04
## 304     52 55641 9.345626e-04
## 305     52 55641 9.345626e-04
## 306     51 66780 7.637017e-04
## 307     51 65844 7.745580e-04
## 308     51 65844 7.745580e-04
## 309     51 55641 9.165903e-04
## 310     51 55641 9.165903e-04
## 311     50 65844 7.593706e-04
## 312     50 65844 7.593706e-04
## 313     50 65844 7.593706e-04
## 314     50 65844 7.593706e-04
## 315     50 65844 7.593706e-04
## 316     50 65844 7.593706e-04
## 317     50 55641 8.986179e-04
## 318     50 55641 8.986179e-04
## 319     49 66780 7.337526e-04
## 320     49 66780 7.337526e-04
## 321     49 66780 7.337526e-04
## 322     49 66780 7.337526e-04
## 323     49 66780 7.337526e-04
## 324     49 65844 7.441832e-04
## 325     49 65844 7.441832e-04
## 326     49 65844 7.441832e-04
## 327     49 65844 7.441832e-04
## 328     49 55641 8.806456e-04
## 329     49 55641 8.806456e-04
## 330     48 66780 7.187781e-04
## 331     48 66780 7.187781e-04
## 332     48 66780 7.187781e-04
## 333     48 66780 7.187781e-04
## 334     48 65844 7.289958e-04
## 335     48 55641 8.626732e-04
## 336     48 55641 8.626732e-04
## 337     47 66780 7.038035e-04
## 338     47 66780 7.038035e-04
## 339     47 66780 7.038035e-04
## 340     47 66780 7.038035e-04
## 341     47 66780 7.038035e-04
## 342     47 66780 7.038035e-04
## 343     47 65844 7.138084e-04
## 344     47 65844 7.138084e-04
## 345     47 65844 7.138084e-04
## 346     47 65844 7.138084e-04
## 347     47 65844 7.138084e-04
## 348     47 65844 7.138084e-04
## 349     47 65844 7.138084e-04
## 350     47 65844 7.138084e-04
## 351     47 65844 7.138084e-04
## 352     47 65844 7.138084e-04
## 353     46 66780 6.888290e-04
## 354     46 66780 6.888290e-04
## 355     46 66780 6.888290e-04
## 356     46 65844 6.986210e-04
## 357     46 65844 6.986210e-04
## 358     46 65844 6.986210e-04
## 359     46 65844 6.986210e-04
## 360     46 65844 6.986210e-04
## 361     46 65844 6.986210e-04
## 362     46 65844 6.986210e-04
## 363     46 65844 6.986210e-04
## 364     46 65844 6.986210e-04
## 365     46 55641 8.267285e-04
## 366     46 55641 8.267285e-04
## 367     46 55641 8.267285e-04
## 368     46 55641 8.267285e-04
## 369     46 55641 8.267285e-04
## 370     45 66780 6.738544e-04
## 371     45 66780 6.738544e-04
## 372     45 66780 6.738544e-04
## 373     45 66780 6.738544e-04
## 374     45 66780 6.738544e-04
## 375     45 65844 6.834336e-04
## 376     45 65844 6.834336e-04
## 377     45 65844 6.834336e-04
## 378     45 65844 6.834336e-04
## 379     45 65844 6.834336e-04
## 380     45 65844 6.834336e-04
## 381     45 65844 6.834336e-04
## 382     45 65844 6.834336e-04
## 383     45 65844 6.834336e-04
## 384     45 65844 6.834336e-04
## 385     45 55641 8.087561e-04
## 386     45 55641 8.087561e-04
## 387     45 55641 8.087561e-04
## 388     45 55641 8.087561e-04
## 389     45 55641 8.087561e-04
## 390     44 66780 6.588799e-04
## 391     44 66780 6.588799e-04
## 392     44 66780 6.588799e-04
## 393     44 66780 6.588799e-04
## 394     44 66780 6.588799e-04
## 395     44 66780 6.588799e-04
## 396     44 65844 6.682462e-04
## 397     44 65844 6.682462e-04
## 398     44 65844 6.682462e-04
## 399     44 65844 6.682462e-04
## 400     44 65844 6.682462e-04
## 401     44 65844 6.682462e-04
## 402     44 65844 6.682462e-04
## 403     44 55641 7.907838e-04
## 404     44 55641 7.907838e-04
## 405     43 66780 6.439054e-04
## 406     43 66780 6.439054e-04
## 407     43 66780 6.439054e-04
## 408     43 65844 6.530587e-04
## 409     43 65844 6.530587e-04
## 410     43 65844 6.530587e-04
## 411     43 55641 7.728114e-04
## 412     43 55641 7.728114e-04
## 413     43 55641 7.728114e-04
## 414     43 55641 7.728114e-04
## 415     43 55641 7.728114e-04
## 416     42 66780 6.289308e-04
## 417     42 66780 6.289308e-04
## 418     42 66780 6.289308e-04
## 419     42 66780 6.289308e-04
## 420     42 66780 6.289308e-04
## 421     42 66780 6.289308e-04
## 422     42 65844 6.378713e-04
## 423     42 65844 6.378713e-04
## 424     42 65844 6.378713e-04
## 425     42 65844 6.378713e-04
## 426     42 65844 6.378713e-04
## 427     42 65844 6.378713e-04
## 428     42 65844 6.378713e-04
## 429     42 55641 7.548391e-04
## 430     42 55641 7.548391e-04
## 431     42 55641 7.548391e-04
## 432     41 66780 6.139563e-04
## 433     41 66780 6.139563e-04
## 434     41 66780 6.139563e-04
## 435     41 66780 6.139563e-04
## 436     41 66780 6.139563e-04
## 437     41 65844 6.226839e-04
## 438     41 65844 6.226839e-04
## 439     41 65844 6.226839e-04
## 440     41 65844 6.226839e-04
## 441     41 65844 6.226839e-04
## 442     41 55641 7.368667e-04
## 443     41 55641 7.368667e-04
## 444     41 55641 7.368667e-04
## 445     41 55641 7.368667e-04
## 446     41 55641 7.368667e-04
## 447     40 66780 5.989817e-04
## 448     40 66780 5.989817e-04
## 449     40 66780 5.989817e-04
## 450     40 66780 5.989817e-04
## 451     40 66780 5.989817e-04
## 452     40 66780 5.989817e-04
## 453     40 66780 5.989817e-04
## 454     40 66780 5.989817e-04
## 455     40 65844 6.074965e-04
## 456     40 65844 6.074965e-04
## 457     40 65844 6.074965e-04
## 458     40 65844 6.074965e-04
## 459     40 65844 6.074965e-04
## 460     40 65844 6.074965e-04
## 461     40 65844 6.074965e-04
## 462     40 55641 7.188943e-04
## 463     40 55641 7.188943e-04
## 464     40 55641 7.188943e-04
## 465     40 55641 7.188943e-04
## 466     40 55641 7.188943e-04
## 467     40 55641 7.188943e-04
## 468     39 66780 5.840072e-04
## 469     39 66780 5.840072e-04
## 470     39 66780 5.840072e-04
## 471     39 66780 5.840072e-04
## 472     39 66780 5.840072e-04
## 473     39 66780 5.840072e-04
## 474     39 66780 5.840072e-04
## 475     39 66780 5.840072e-04
## 476     39 66780 5.840072e-04
## 477     39 65844 5.923091e-04
## 478     39 65844 5.923091e-04
## 479     39 65844 5.923091e-04
## 480     39 65844 5.923091e-04
## 481     39 65844 5.923091e-04
## 482     39 65844 5.923091e-04
## 483     39 65844 5.923091e-04
## 484     39 65844 5.923091e-04
## 485     39 65844 5.923091e-04
## 486     39 65844 5.923091e-04
## 487     39 65844 5.923091e-04
## 488     39 55641 7.009220e-04
## 489     39 55641 7.009220e-04
## 490     39 55641 7.009220e-04
## 491     39 55641 7.009220e-04
## 492     39 55641 7.009220e-04
## 493     39 55641 7.009220e-04
## 494     39 55641 7.009220e-04
## 495     39 55641 7.009220e-04
## 496     39 55641 7.009220e-04
## 497     39 55641 7.009220e-04
## 498     39 55641 7.009220e-04
## 499     38 66780 5.690326e-04
## 500     38 66780 5.690326e-04
## 501     38 66780 5.690326e-04
## 502     38 66780 5.690326e-04
## 503     38 65844 5.771217e-04
## 504     38 65844 5.771217e-04
## 505     38 65844 5.771217e-04
## 506     38 65844 5.771217e-04
## 507     38 65844 5.771217e-04
## 508     38 65844 5.771217e-04
## 509     38 65844 5.771217e-04
## 510     38 65844 5.771217e-04
## 511     38 55641 6.829496e-04
## 512     38 55641 6.829496e-04
## 513     38 55641 6.829496e-04
## 514     38 55641 6.829496e-04
## 515     38 55641 6.829496e-04
## 516     38 55641 6.829496e-04
## 517     38 55641 6.829496e-04
## 518     37 66780 5.540581e-04
## 519     37 66780 5.540581e-04
## 520     37 66780 5.540581e-04
## 521     37 66780 5.540581e-04
## 522     37 66780 5.540581e-04
## 523     37 66780 5.540581e-04
## 524     37 66780 5.540581e-04
## 525     37 66780 5.540581e-04
## 526     37 66780 5.540581e-04
## 527     37 65844 5.619343e-04
## 528     37 65844 5.619343e-04
## 529     37 65844 5.619343e-04
## 530     37 65844 5.619343e-04
## 531     37 65844 5.619343e-04
## 532     37 65844 5.619343e-04
## 533     37 55641 6.649773e-04
## 534     37 55641 6.649773e-04
## 535     37 55641 6.649773e-04
## 536     37 55641 6.649773e-04
## 537     36 66780 5.390836e-04
## 538     36 66780 5.390836e-04
## 539     36 66780 5.390836e-04
## 540     36 66780 5.390836e-04
## 541     36 66780 5.390836e-04
## 542     36 66780 5.390836e-04
## 543     36 66780 5.390836e-04
## 544     36 66780 5.390836e-04
## 545     36 66780 5.390836e-04
## 546     36 66780 5.390836e-04
## 547     36 66780 5.390836e-04
## 548     36 66780 5.390836e-04
## 549     36 66780 5.390836e-04
## 550     36 65844 5.467469e-04
## 551     36 65844 5.467469e-04
## 552     36 65844 5.467469e-04
## 553     36 65844 5.467469e-04
## 554     36 65844 5.467469e-04
## 555     36 65844 5.467469e-04
## 556     36 55641 6.470049e-04
## 557     36 55641 6.470049e-04
## 558     36 55641 6.470049e-04
## 559     36 55641 6.470049e-04
## 560     35 66780 5.241090e-04
## 561     35 66780 5.241090e-04
## 562     35 66780 5.241090e-04
## 563     35 66780 5.241090e-04
## 564     35 66780 5.241090e-04
## 565     35 66780 5.241090e-04
## 566     35 66780 5.241090e-04
## 567     35 66780 5.241090e-04
## 568     35 66780 5.241090e-04
## 569     35 66780 5.241090e-04
## 570     35 66780 5.241090e-04
## 571     35 66780 5.241090e-04
## 572     35 66780 5.241090e-04
## 573     35 65844 5.315594e-04
## 574     35 65844 5.315594e-04
## 575     35 65844 5.315594e-04
## 576     35 65844 5.315594e-04
## 577     35 65844 5.315594e-04
## 578     35 65844 5.315594e-04
## 579     35 65844 5.315594e-04
## 580     35 65844 5.315594e-04
## 581     35 55641 6.290325e-04
## 582     35 55641 6.290325e-04
## 583     35 55641 6.290325e-04
## 584     35 55641 6.290325e-04
## 585     35 55641 6.290325e-04
## 586     35 55641 6.290325e-04
## 587     35 55641 6.290325e-04
## 588     35 55641 6.290325e-04
## 589     34 66780 5.091345e-04
## 590     34 66780 5.091345e-04
## 591     34 66780 5.091345e-04
## 592     34 66780 5.091345e-04
## 593     34 66780 5.091345e-04
## 594     34 65844 5.163720e-04
## 595     34 65844 5.163720e-04
## 596     34 65844 5.163720e-04
## 597     34 65844 5.163720e-04
## 598     34 65844 5.163720e-04
## 599     34 65844 5.163720e-04
## 600     34 65844 5.163720e-04
## 601     34 65844 5.163720e-04
## 602     34 55641 6.110602e-04
## 603     34 55641 6.110602e-04
## 604     34 55641 6.110602e-04
## 605     34 55641 6.110602e-04
## 606     34 55641 6.110602e-04
## 607     34 55641 6.110602e-04
## 608     33 66780 4.941599e-04
## 609     33 66780 4.941599e-04
## 610     33 66780 4.941599e-04
## 611     33 66780 4.941599e-04
## 612     33 66780 4.941599e-04
## 613     33 66780 4.941599e-04
## 614     33 66780 4.941599e-04
## 615     33 66780 4.941599e-04
## 616     33 65844 5.011846e-04
## 617     33 65844 5.011846e-04
## 618     33 65844 5.011846e-04
## 619     33 65844 5.011846e-04
## 620     33 65844 5.011846e-04
## 621     33 65844 5.011846e-04
## 622     33 65844 5.011846e-04
## 623     33 65844 5.011846e-04
## 624     33 65844 5.011846e-04
## 625     33 65844 5.011846e-04
## 626     33 55641 5.930878e-04
## 627     33 55641 5.930878e-04
## 628     33 55641 5.930878e-04
## 629     32 66780 4.791854e-04
## 630     32 66780 4.791854e-04
## 631     32 66780 4.791854e-04
## 632     32 65844 4.859972e-04
## 633     32 65844 4.859972e-04
## 634     32 65844 4.859972e-04
## 635     32 65844 4.859972e-04
## 636     32 65844 4.859972e-04
## 637     32 65844 4.859972e-04
## 638     32 65844 4.859972e-04
## 639     32 65844 4.859972e-04
## 640     32 65844 4.859972e-04
## 641     32 65844 4.859972e-04
## 642     32 55641 5.751155e-04
## 643     32 55641 5.751155e-04
## 644     32 55641 5.751155e-04
## 645     32 55641 5.751155e-04
## 646     32 55641 5.751155e-04
## 647     32 55641 5.751155e-04
## 648     32 55641 5.751155e-04
## 649     31 66780 4.642108e-04
## 650     31 66780 4.642108e-04
## 651     31 66780 4.642108e-04
## 652     31 66780 4.642108e-04
## 653     31 66780 4.642108e-04
## 654     31 66780 4.642108e-04
## 655     31 66780 4.642108e-04
## 656     31 66780 4.642108e-04
## 657     31 66780 4.642108e-04
## 658     31 66780 4.642108e-04
## 659     31 65844 4.708098e-04
## 660     31 65844 4.708098e-04
## 661     31 65844 4.708098e-04
## 662     31 65844 4.708098e-04
## 663     31 65844 4.708098e-04
## 664     31 65844 4.708098e-04
## 665     31 65844 4.708098e-04
## 666     31 65844 4.708098e-04
## 667     31 65844 4.708098e-04
## 668     31 65844 4.708098e-04
## 669     31 65844 4.708098e-04
## 670     31 55641 5.571431e-04
## 671     31 55641 5.571431e-04
## 672     31 55641 5.571431e-04
## 673     31 55641 5.571431e-04
## 674     31 55641 5.571431e-04
## 675     31 55641 5.571431e-04
## 676     30 66780 4.492363e-04
## 677     30 66780 4.492363e-04
## 678     30 66780 4.492363e-04
## 679     30 66780 4.492363e-04
## 680     30 66780 4.492363e-04
## 681     30 66780 4.492363e-04
## 682     30 66780 4.492363e-04
## 683     30 66780 4.492363e-04
## 684     30 66780 4.492363e-04
## 685     30 66780 4.492363e-04
## 686     30 66780 4.492363e-04
## 687     30 66780 4.492363e-04
## 688     30 66780 4.492363e-04
## 689     30 66780 4.492363e-04
## 690     30 66780 4.492363e-04
## 691     30 65844 4.556224e-04
## 692     30 65844 4.556224e-04
## 693     30 65844 4.556224e-04
## 694     30 65844 4.556224e-04
## 695     30 65844 4.556224e-04
## 696     30 65844 4.556224e-04
## 697     30 65844 4.556224e-04
## 698     30 65844 4.556224e-04
## 699     30 65844 4.556224e-04
## 700     30 65844 4.556224e-04
## 701     30 65844 4.556224e-04
## 702     30 65844 4.556224e-04
## 703     30 65844 4.556224e-04
## 704     30 55641 5.391708e-04
## 705     30 55641 5.391708e-04
## 706     30 55641 5.391708e-04
## 707     30 55641 5.391708e-04
## 708     30 55641 5.391708e-04
## 709     30 55641 5.391708e-04
## 710     30 55641 5.391708e-04
## 711     30 55641 5.391708e-04
## 712     30 55641 5.391708e-04
## 713     30 55641 5.391708e-04
## 714     30 55641 5.391708e-04
## 715     29 66780 4.342618e-04
## 716     29 66780 4.342618e-04
## 717     29 66780 4.342618e-04
## 718     29 66780 4.342618e-04
## 719     29 66780 4.342618e-04
## 720     29 66780 4.342618e-04
## 721     29 66780 4.342618e-04
## 722     29 66780 4.342618e-04
## 723     29 65844 4.404350e-04
## 724     29 65844 4.404350e-04
## 725     29 65844 4.404350e-04
## 726     29 65844 4.404350e-04
## 727     29 65844 4.404350e-04
## 728     29 65844 4.404350e-04
## 729     29 65844 4.404350e-04
## 730     29 65844 4.404350e-04
## 731     29 65844 4.404350e-04
## 732     29 65844 4.404350e-04
## 733     29 55641 5.211984e-04
## 734     29 55641 5.211984e-04
## 735     29 55641 5.211984e-04
## 736     29 55641 5.211984e-04
## 737     29 55641 5.211984e-04
## 738     29 55641 5.211984e-04
## 739     29 55641 5.211984e-04
## 740     29 55641 5.211984e-04
## 741     29 55641 5.211984e-04
## 742     29 55641 5.211984e-04
## 743     29 55641 5.211984e-04
## 744     29 55641 5.211984e-04
## 745     29 55641 5.211984e-04
## 746     28 66780 4.192872e-04
## 747     28 66780 4.192872e-04
## 748     28 66780 4.192872e-04
## 749     28 66780 4.192872e-04
## 750     28 66780 4.192872e-04
## 751     28 66780 4.192872e-04
## 752     28 66780 4.192872e-04
## 753     28 66780 4.192872e-04
## 754     28 66780 4.192872e-04
## 755     28 66780 4.192872e-04
## 756     28 66780 4.192872e-04
## 757     28 66780 4.192872e-04
## 758     28 66780 4.192872e-04
## 759     28 66780 4.192872e-04
## 760     28 66780 4.192872e-04
## 761     28 65844 4.252476e-04
## 762     28 65844 4.252476e-04
## 763     28 65844 4.252476e-04
## 764     28 65844 4.252476e-04
## 765     28 65844 4.252476e-04
## 766     28 65844 4.252476e-04
## 767     28 65844 4.252476e-04
## 768     28 65844 4.252476e-04
## 769     28 65844 4.252476e-04
## 770     28 65844 4.252476e-04
## 771     28 65844 4.252476e-04
## 772     28 65844 4.252476e-04
## 773     28 65844 4.252476e-04
## 774     28 65844 4.252476e-04
## 775     28 65844 4.252476e-04
## 776     28 65844 4.252476e-04
## 777     28 65844 4.252476e-04
## 778     28 55641 5.032260e-04
## 779     28 55641 5.032260e-04
## 780     28 55641 5.032260e-04
## 781     28 55641 5.032260e-04
## 782     28 55641 5.032260e-04
## 783     28 55641 5.032260e-04
## 784     28 55641 5.032260e-04
## 785     27 66780 4.043127e-04
## 786     27 66780 4.043127e-04
## 787     27 66780 4.043127e-04
## 788     27 66780 4.043127e-04
## 789     27 66780 4.043127e-04
## 790     27 66780 4.043127e-04
## 791     27 66780 4.043127e-04
## 792     27 66780 4.043127e-04
## 793     27 66780 4.043127e-04
## 794     27 66780 4.043127e-04
## 795     27 66780 4.043127e-04
## 796     27 66780 4.043127e-04
## 797     27 66780 4.043127e-04
## 798     27 66780 4.043127e-04
## 799     27 66780 4.043127e-04
## 800     27 66780 4.043127e-04
## 801     27 66780 4.043127e-04
## 802     27 66780 4.043127e-04
## 803     27 66780 4.043127e-04
## 804     27 66780 4.043127e-04
## 805     27 66780 4.043127e-04
## 806     27 66780 4.043127e-04
## 807     27 66780 4.043127e-04
## 808     27 66780 4.043127e-04
## 809     27 66780 4.043127e-04
## 810     27 66780 4.043127e-04
## 811     27 65844 4.100601e-04
## 812     27 65844 4.100601e-04
## 813     27 65844 4.100601e-04
## 814     27 65844 4.100601e-04
## 815     27 65844 4.100601e-04
## 816     27 65844 4.100601e-04
## 817     27 65844 4.100601e-04
## 818     27 65844 4.100601e-04
## 819     27 65844 4.100601e-04
## 820     27 65844 4.100601e-04
## 821     27 65844 4.100601e-04
## 822     27 65844 4.100601e-04
## 823     27 65844 4.100601e-04
## 824     27 65844 4.100601e-04
## 825     27 55641 4.852537e-04
## 826     27 55641 4.852537e-04
## 827     27 55641 4.852537e-04
## 828     27 55641 4.852537e-04
## 829     27 55641 4.852537e-04
## 830     27 55641 4.852537e-04
## 831     27 55641 4.852537e-04
## 832     26 66780 3.893381e-04
## 833     26 66780 3.893381e-04
## 834     26 66780 3.893381e-04
## 835     26 66780 3.893381e-04
## 836     26 66780 3.893381e-04
## 837     26 66780 3.893381e-04
## 838     26 66780 3.893381e-04
## 839     26 66780 3.893381e-04
## 840     26 66780 3.893381e-04
## 841     26 66780 3.893381e-04
## 842     26 66780 3.893381e-04
## 843     26 66780 3.893381e-04
## 844     26 65844 3.948727e-04
## 845     26 65844 3.948727e-04
## 846     26 65844 3.948727e-04
## 847     26 65844 3.948727e-04
## 848     26 65844 3.948727e-04
## 849     26 65844 3.948727e-04
## 850     26 65844 3.948727e-04
## 851     26 65844 3.948727e-04
## 852     26 55641 4.672813e-04
## 853     26 55641 4.672813e-04
## 854     26 55641 4.672813e-04
## 855     26 55641 4.672813e-04
## 856     26 55641 4.672813e-04
## 857     26 55641 4.672813e-04
## 858     26 55641 4.672813e-04
## 859     26 55641 4.672813e-04
## 860     26 55641 4.672813e-04
## 861     26 55641 4.672813e-04
## 862     26 55641 4.672813e-04
## 863     26 55641 4.672813e-04
## 864     26 55641 4.672813e-04
## 865     26 55641 4.672813e-04
## 866     26 55641 4.672813e-04
## 867     26 55641 4.672813e-04
## 868     25 66780 3.743636e-04
## 869     25 66780 3.743636e-04
## 870     25 66780 3.743636e-04
## 871     25 66780 3.743636e-04
## 872     25 66780 3.743636e-04
## 873     25 66780 3.743636e-04
## 874     25 66780 3.743636e-04
## 875     25 66780 3.743636e-04
## 876     25 66780 3.743636e-04
## 877     25 66780 3.743636e-04
## 878     25 66780 3.743636e-04
## 879     25 66780 3.743636e-04
## 880     25 66780 3.743636e-04
## 881     25 66780 3.743636e-04
## 882     25 66780 3.743636e-04
## 883     25 66780 3.743636e-04
## 884     25 66780 3.743636e-04
## 885     25 66780 3.743636e-04
## 886     25 66780 3.743636e-04
## 887     25 66780 3.743636e-04
## 888     25 65844 3.796853e-04
## 889     25 65844 3.796853e-04
## 890     25 65844 3.796853e-04
## 891     25 65844 3.796853e-04
## 892     25 65844 3.796853e-04
## 893     25 65844 3.796853e-04
## 894     25 65844 3.796853e-04
## 895     25 65844 3.796853e-04
## 896     25 65844 3.796853e-04
## 897     25 65844 3.796853e-04
## 898     25 65844 3.796853e-04
## 899     25 65844 3.796853e-04
## 900     25 65844 3.796853e-04
## 901     25 55641 4.493090e-04
## 902     25 55641 4.493090e-04
## 903     25 55641 4.493090e-04
## 904     25 55641 4.493090e-04
## 905     25 55641 4.493090e-04
## 906     25 55641 4.493090e-04
## 907     25 55641 4.493090e-04
## 908     25 55641 4.493090e-04
## 909     25 55641 4.493090e-04
## 910     25 55641 4.493090e-04
## 911     25 55641 4.493090e-04
## 912     25 55641 4.493090e-04
## 913     25 55641 4.493090e-04
## 914     25 55641 4.493090e-04
## 915     25 55641 4.493090e-04
## 916     25 55641 4.493090e-04
## 917     25 55641 4.493090e-04
## 918     25 55641 4.493090e-04
## 919     24 66780 3.593890e-04
## 920     24 66780 3.593890e-04
## 921     24 66780 3.593890e-04
## 922     24 66780 3.593890e-04
## 923     24 66780 3.593890e-04
## 924     24 66780 3.593890e-04
## 925     24 66780 3.593890e-04
## 926     24 66780 3.593890e-04
## 927     24 66780 3.593890e-04
## 928     24 66780 3.593890e-04
## 929     24 66780 3.593890e-04
## 930     24 66780 3.593890e-04
## 931     24 66780 3.593890e-04
## 932     24 66780 3.593890e-04
## 933     24 66780 3.593890e-04
## 934     24 66780 3.593890e-04
## 935     24 66780 3.593890e-04
## 936     24 66780 3.593890e-04
## 937     24 66780 3.593890e-04
## 938     24 66780 3.593890e-04
## 939     24 66780 3.593890e-04
## 940     24 65844 3.644979e-04
## 941     24 65844 3.644979e-04
## 942     24 65844 3.644979e-04
## 943     24 65844 3.644979e-04
## 944     24 65844 3.644979e-04
## 945     24 65844 3.644979e-04
## 946     24 65844 3.644979e-04
## 947     24 65844 3.644979e-04
## 948     24 65844 3.644979e-04
## 949     24 65844 3.644979e-04
## 950     24 65844 3.644979e-04
## 951     24 65844 3.644979e-04
## 952     24 65844 3.644979e-04
## 953     24 65844 3.644979e-04
## 954     24 65844 3.644979e-04
## 955     24 55641 4.313366e-04
## 956     24 55641 4.313366e-04
## 957     24 55641 4.313366e-04
## 958     24 55641 4.313366e-04
## 959     24 55641 4.313366e-04
## 960     24 55641 4.313366e-04
## 961     24 55641 4.313366e-04
## 962     24 55641 4.313366e-04
## 963     24 55641 4.313366e-04
## 964     24 55641 4.313366e-04
## 965     24 55641 4.313366e-04
## 966     24 55641 4.313366e-04
## 967     24 55641 4.313366e-04
## 968     24 55641 4.313366e-04
## 969     23 66780 3.444145e-04
## 970     23 66780 3.444145e-04
## 971     23 66780 3.444145e-04
## 972     23 66780 3.444145e-04
## 973     23 66780 3.444145e-04
## 974     23 66780 3.444145e-04
## 975     23 66780 3.444145e-04
## 976     23 66780 3.444145e-04
## 977     23 66780 3.444145e-04
## 978     23 66780 3.444145e-04
## 979     23 66780 3.444145e-04
## 980     23 66780 3.444145e-04
## 981     23 66780 3.444145e-04
## 982     23 65844 3.493105e-04
## 983     23 65844 3.493105e-04
## 984     23 65844 3.493105e-04
## 985     23 65844 3.493105e-04
## 986     23 65844 3.493105e-04
## 987     23 65844 3.493105e-04
## 988     23 65844 3.493105e-04
## 989     23 65844 3.493105e-04
## 990     23 65844 3.493105e-04
## 991     23 65844 3.493105e-04
## 992     23 65844 3.493105e-04
## 993     23 65844 3.493105e-04
## 994     23 65844 3.493105e-04
## 995     23 65844 3.493105e-04
## 996     23 65844 3.493105e-04
## 997     23 65844 3.493105e-04
## 998     23 65844 3.493105e-04
## 999     23 65844 3.493105e-04
## 1000    23 65844 3.493105e-04
## 1001    23 65844 3.493105e-04
## 1002    23 65844 3.493105e-04
## 1003    23 65844 3.493105e-04
## 1004    23 65844 3.493105e-04
## 1005    23 65844 3.493105e-04
## 1006    23 65844 3.493105e-04
## 1007    23 65844 3.493105e-04
## 1008    23 55641 4.133642e-04
## 1009    23 55641 4.133642e-04
## 1010    23 55641 4.133642e-04
## 1011    23 55641 4.133642e-04
## 1012    23 55641 4.133642e-04
## 1013    23 55641 4.133642e-04
## 1014    23 55641 4.133642e-04
## 1015    23 55641 4.133642e-04
## 1016    23 55641 4.133642e-04
## 1017    23 55641 4.133642e-04
## 1018    23 55641 4.133642e-04
## 1019    23 55641 4.133642e-04
## 1020    22 66780 3.294400e-04
## 1021    22 66780 3.294400e-04
## 1022    22 66780 3.294400e-04
## 1023    22 66780 3.294400e-04
## 1024    22 66780 3.294400e-04
## 1025    22 66780 3.294400e-04
## 1026    22 66780 3.294400e-04
## 1027    22 66780 3.294400e-04
## 1028    22 66780 3.294400e-04
## 1029    22 66780 3.294400e-04
## 1030    22 66780 3.294400e-04
## 1031    22 66780 3.294400e-04
## 1032    22 66780 3.294400e-04
## 1033    22 66780 3.294400e-04
## 1034    22 66780 3.294400e-04
## 1035    22 66780 3.294400e-04
## 1036    22 66780 3.294400e-04
## 1037    22 66780 3.294400e-04
## 1038    22 65844 3.341231e-04
## 1039    22 65844 3.341231e-04
## 1040    22 65844 3.341231e-04
## 1041    22 65844 3.341231e-04
## 1042    22 65844 3.341231e-04
## 1043    22 65844 3.341231e-04
## 1044    22 65844 3.341231e-04
## 1045    22 65844 3.341231e-04
## 1046    22 65844 3.341231e-04
## 1047    22 65844 3.341231e-04
## 1048    22 65844 3.341231e-04
## 1049    22 65844 3.341231e-04
## 1050    22 65844 3.341231e-04
## 1051    22 65844 3.341231e-04
## 1052    22 65844 3.341231e-04
## 1053    22 65844 3.341231e-04
## 1054    22 65844 3.341231e-04
## 1055    22 65844 3.341231e-04
## 1056    22 65844 3.341231e-04
## 1057    22 65844 3.341231e-04
## 1058    22 65844 3.341231e-04
## 1059    22 65844 3.341231e-04
## 1060    22 65844 3.341231e-04
## 1061    22 65844 3.341231e-04
## 1062    22 55641 3.953919e-04
## 1063    22 55641 3.953919e-04
## 1064    22 55641 3.953919e-04
## 1065    22 55641 3.953919e-04
## 1066    22 55641 3.953919e-04
## 1067    22 55641 3.953919e-04
## 1068    22 55641 3.953919e-04
## 1069    22 55641 3.953919e-04
## 1070    22 55641 3.953919e-04
## 1071    22 55641 3.953919e-04
## 1072    22 55641 3.953919e-04
## 1073    22 55641 3.953919e-04
## 1074    22 55641 3.953919e-04
## 1075    22 55641 3.953919e-04
## 1076    22 55641 3.953919e-04
## 1077    22 55641 3.953919e-04
## 1078    22 55641 3.953919e-04
## 1079    22 55641 3.953919e-04
## 1080    22 55641 3.953919e-04
## 1081    22 55641 3.953919e-04
## 1082    22 55641 3.953919e-04
## 1083    22 55641 3.953919e-04
## 1084    22 55641 3.953919e-04
## 1085    22 55641 3.953919e-04
## 1086    22 55641 3.953919e-04
## 1087    21 66780 3.144654e-04
## 1088    21 66780 3.144654e-04
## 1089    21 66780 3.144654e-04
## 1090    21 66780 3.144654e-04
## 1091    21 66780 3.144654e-04
## 1092    21 66780 3.144654e-04
## 1093    21 66780 3.144654e-04
## 1094    21 66780 3.144654e-04
## 1095    21 66780 3.144654e-04
## 1096    21 66780 3.144654e-04
## 1097    21 66780 3.144654e-04
## 1098    21 66780 3.144654e-04
## 1099    21 66780 3.144654e-04
## 1100    21 66780 3.144654e-04
## 1101    21 66780 3.144654e-04
## 1102    21 66780 3.144654e-04
## 1103    21 66780 3.144654e-04
## 1104    21 66780 3.144654e-04
## 1105    21 66780 3.144654e-04
## 1106    21 66780 3.144654e-04
## 1107    21 66780 3.144654e-04
## 1108    21 65844 3.189357e-04
## 1109    21 65844 3.189357e-04
## 1110    21 65844 3.189357e-04
## 1111    21 65844 3.189357e-04
## 1112    21 65844 3.189357e-04
## 1113    21 65844 3.189357e-04
## 1114    21 65844 3.189357e-04
## 1115    21 65844 3.189357e-04
## 1116    21 65844 3.189357e-04
## 1117    21 65844 3.189357e-04
## 1118    21 65844 3.189357e-04
## 1119    21 65844 3.189357e-04
## 1120    21 65844 3.189357e-04
## 1121    21 65844 3.189357e-04
## 1122    21 65844 3.189357e-04
## 1123    21 65844 3.189357e-04
## 1124    21 65844 3.189357e-04
## 1125    21 65844 3.189357e-04
## 1126    21 65844 3.189357e-04
## 1127    21 65844 3.189357e-04
## 1128    21 65844 3.189357e-04
## 1129    21 65844 3.189357e-04
## 1130    21 65844 3.189357e-04
## 1131    21 55641 3.774195e-04
## 1132    21 55641 3.774195e-04
## 1133    21 55641 3.774195e-04
## 1134    21 55641 3.774195e-04
## 1135    21 55641 3.774195e-04
## 1136    21 55641 3.774195e-04
## 1137    21 55641 3.774195e-04
## 1138    21 55641 3.774195e-04
## 1139    21 55641 3.774195e-04
## 1140    21 55641 3.774195e-04
## 1141    21 55641 3.774195e-04
## 1142    21 55641 3.774195e-04
## 1143    21 55641 3.774195e-04
## 1144    21 55641 3.774195e-04
## 1145    21 55641 3.774195e-04
## 1146    21 55641 3.774195e-04
## 1147    21 55641 3.774195e-04
## 1148    21 55641 3.774195e-04
## 1149    21 55641 3.774195e-04
## 1150    21 55641 3.774195e-04
## 1151    21 55641 3.774195e-04
## 1152    21 55641 3.774195e-04
## 1153    21 55641 3.774195e-04
## 1154    20 66780 2.994909e-04
## 1155    20 66780 2.994909e-04
## 1156    20 66780 2.994909e-04
## 1157    20 66780 2.994909e-04
## 1158    20 66780 2.994909e-04
## 1159    20 66780 2.994909e-04
## 1160    20 66780 2.994909e-04
## 1161    20 66780 2.994909e-04
## 1162    20 66780 2.994909e-04
## 1163    20 66780 2.994909e-04
## 1164    20 66780 2.994909e-04
## 1165    20 66780 2.994909e-04
## 1166    20 66780 2.994909e-04
## 1167    20 66780 2.994909e-04
## 1168    20 66780 2.994909e-04
## 1169    20 66780 2.994909e-04
## 1170    20 66780 2.994909e-04
## 1171    20 66780 2.994909e-04
## 1172    20 66780 2.994909e-04
## 1173    20 66780 2.994909e-04
## 1174    20 66780 2.994909e-04
## 1175    20 66780 2.994909e-04
## 1176    20 66780 2.994909e-04
## 1177    20 66780 2.994909e-04
## 1178    20 66780 2.994909e-04
## 1179    20 66780 2.994909e-04
## 1180    20 66780 2.994909e-04
## 1181    20 66780 2.994909e-04
## 1182    20 66780 2.994909e-04
## 1183    20 66780 2.994909e-04
## 1184    20 65844 3.037483e-04
## 1185    20 65844 3.037483e-04
## 1186    20 65844 3.037483e-04
## 1187    20 65844 3.037483e-04
## 1188    20 65844 3.037483e-04
## 1189    20 65844 3.037483e-04
## 1190    20 65844 3.037483e-04
## 1191    20 65844 3.037483e-04
## 1192    20 65844 3.037483e-04
## 1193    20 65844 3.037483e-04
## 1194    20 65844 3.037483e-04
## 1195    20 65844 3.037483e-04
## 1196    20 65844 3.037483e-04
## 1197    20 65844 3.037483e-04
## 1198    20 65844 3.037483e-04
## 1199    20 65844 3.037483e-04
## 1200    20 65844 3.037483e-04
## 1201    20 65844 3.037483e-04
## 1202    20 65844 3.037483e-04
## 1203    20 65844 3.037483e-04
## 1204    20 65844 3.037483e-04
## 1205    20 65844 3.037483e-04
## 1206    20 55641 3.594472e-04
## 1207    20 55641 3.594472e-04
## 1208    20 55641 3.594472e-04
## 1209    20 55641 3.594472e-04
## 1210    20 55641 3.594472e-04
## 1211    20 55641 3.594472e-04
## 1212    20 55641 3.594472e-04
## 1213    20 55641 3.594472e-04
## 1214    20 55641 3.594472e-04
## 1215    20 55641 3.594472e-04
## 1216    20 55641 3.594472e-04
## 1217    20 55641 3.594472e-04
## 1218    20 55641 3.594472e-04
## 1219    20 55641 3.594472e-04
## 1220    20 55641 3.594472e-04
## 1221    20 55641 3.594472e-04
## 1222    20 55641 3.594472e-04
## 1223    20 55641 3.594472e-04
## 1224    20 55641 3.594472e-04
## 1225    20 55641 3.594472e-04
## 1226    20 55641 3.594472e-04
## 1227    19 66780 2.845163e-04
## 1228    19 66780 2.845163e-04
## 1229    19 66780 2.845163e-04
## 1230    19 66780 2.845163e-04
## 1231    19 66780 2.845163e-04
## 1232    19 66780 2.845163e-04
## 1233    19 66780 2.845163e-04
## 1234    19 66780 2.845163e-04
## 1235    19 66780 2.845163e-04
## 1236    19 66780 2.845163e-04
## 1237    19 66780 2.845163e-04
## 1238    19 66780 2.845163e-04
## 1239    19 66780 2.845163e-04
## 1240    19 66780 2.845163e-04
## 1241    19 66780 2.845163e-04
## 1242    19 66780 2.845163e-04
## 1243    19 66780 2.845163e-04
## 1244    19 66780 2.845163e-04
## 1245    19 66780 2.845163e-04
## 1246    19 66780 2.845163e-04
## 1247    19 66780 2.845163e-04
## 1248    19 66780 2.845163e-04
## 1249    19 66780 2.845163e-04
## 1250    19 66780 2.845163e-04
## 1251    19 66780 2.845163e-04
## 1252    19 66780 2.845163e-04
## 1253    19 66780 2.845163e-04
## 1254    19 66780 2.845163e-04
## 1255    19 66780 2.845163e-04
## 1256    19 66780 2.845163e-04
## 1257    19 66780 2.845163e-04
## 1258    19 66780 2.845163e-04
## 1259    19 66780 2.845163e-04
## 1260    19 66780 2.845163e-04
## 1261    19 66780 2.845163e-04
## 1262    19 66780 2.845163e-04
## 1263    19 66780 2.845163e-04
## 1264    19 66780 2.845163e-04
## 1265    19 66780 2.845163e-04
## 1266    19 66780 2.845163e-04
## 1267    19 66780 2.845163e-04
## 1268    19 65844 2.885608e-04
## 1269    19 65844 2.885608e-04
## 1270    19 65844 2.885608e-04
## 1271    19 65844 2.885608e-04
## 1272    19 65844 2.885608e-04
## 1273    19 65844 2.885608e-04
## 1274    19 65844 2.885608e-04
## 1275    19 65844 2.885608e-04
## 1276    19 65844 2.885608e-04
## 1277    19 65844 2.885608e-04
## 1278    19 65844 2.885608e-04
## 1279    19 65844 2.885608e-04
## 1280    19 65844 2.885608e-04
## 1281    19 65844 2.885608e-04
## 1282    19 65844 2.885608e-04
## 1283    19 65844 2.885608e-04
## 1284    19 65844 2.885608e-04
## 1285    19 65844 2.885608e-04
## 1286    19 65844 2.885608e-04
## 1287    19 65844 2.885608e-04
## 1288    19 65844 2.885608e-04
## 1289    19 65844 2.885608e-04
## 1290    19 65844 2.885608e-04
## 1291    19 65844 2.885608e-04
## 1292    19 65844 2.885608e-04
## 1293    19 65844 2.885608e-04
## 1294    19 65844 2.885608e-04
## 1295    19 65844 2.885608e-04
## 1296    19 65844 2.885608e-04
## 1297    19 65844 2.885608e-04
## 1298    19 65844 2.885608e-04
## 1299    19 65844 2.885608e-04
## 1300    19 65844 2.885608e-04
## 1301    19 55641 3.414748e-04
## 1302    19 55641 3.414748e-04
## 1303    19 55641 3.414748e-04
## 1304    19 55641 3.414748e-04
## 1305    19 55641 3.414748e-04
## 1306    19 55641 3.414748e-04
## 1307    19 55641 3.414748e-04
## 1308    19 55641 3.414748e-04
## 1309    19 55641 3.414748e-04
## 1310    19 55641 3.414748e-04
## 1311    19 55641 3.414748e-04
## 1312    19 55641 3.414748e-04
## 1313    19 55641 3.414748e-04
## 1314    19 55641 3.414748e-04
## 1315    19 55641 3.414748e-04
## 1316    19 55641 3.414748e-04
## 1317    19 55641 3.414748e-04
## 1318    19 55641 3.414748e-04
## 1319    19 55641 3.414748e-04
## 1320    19 55641 3.414748e-04
## 1321    19 55641 3.414748e-04
## 1322    19 55641 3.414748e-04
## 1323    19 55641 3.414748e-04
## 1324    19 55641 3.414748e-04
## 1325    18 66780 2.695418e-04
## 1326    18 66780 2.695418e-04
## 1327    18 66780 2.695418e-04
## 1328    18 66780 2.695418e-04
## 1329    18 66780 2.695418e-04
## 1330    18 66780 2.695418e-04
## 1331    18 66780 2.695418e-04
## 1332    18 66780 2.695418e-04
## 1333    18 66780 2.695418e-04
## 1334    18 66780 2.695418e-04
## 1335    18 66780 2.695418e-04
## 1336    18 66780 2.695418e-04
## 1337    18 66780 2.695418e-04
## 1338    18 66780 2.695418e-04
## 1339    18 66780 2.695418e-04
## 1340    18 66780 2.695418e-04
## 1341    18 66780 2.695418e-04
## 1342    18 66780 2.695418e-04
## 1343    18 66780 2.695418e-04
## 1344    18 66780 2.695418e-04
## 1345    18 66780 2.695418e-04
## 1346    18 66780 2.695418e-04
## 1347    18 66780 2.695418e-04
## 1348    18 66780 2.695418e-04
## 1349    18 66780 2.695418e-04
## 1350    18 66780 2.695418e-04
## 1351    18 66780 2.695418e-04
## 1352    18 66780 2.695418e-04
## 1353    18 66780 2.695418e-04
## 1354    18 66780 2.695418e-04
## 1355    18 66780 2.695418e-04
## 1356    18 65844 2.733734e-04
## 1357    18 65844 2.733734e-04
## 1358    18 65844 2.733734e-04
## 1359    18 65844 2.733734e-04
## 1360    18 65844 2.733734e-04
## 1361    18 65844 2.733734e-04
## 1362    18 65844 2.733734e-04
## 1363    18 65844 2.733734e-04
## 1364    18 65844 2.733734e-04
## 1365    18 65844 2.733734e-04
## 1366    18 65844 2.733734e-04
## 1367    18 65844 2.733734e-04
## 1368    18 65844 2.733734e-04
## 1369    18 65844 2.733734e-04
## 1370    18 65844 2.733734e-04
## 1371    18 65844 2.733734e-04
## 1372    18 65844 2.733734e-04
## 1373    18 65844 2.733734e-04
## 1374    18 65844 2.733734e-04
## 1375    18 65844 2.733734e-04
## 1376    18 65844 2.733734e-04
## 1377    18 65844 2.733734e-04
## 1378    18 65844 2.733734e-04
## 1379    18 65844 2.733734e-04
## 1380    18 65844 2.733734e-04
## 1381    18 65844 2.733734e-04
## 1382    18 65844 2.733734e-04
## 1383    18 65844 2.733734e-04
## 1384    18 65844 2.733734e-04
## 1385    18 65844 2.733734e-04
## 1386    18 65844 2.733734e-04
## 1387    18 65844 2.733734e-04
## 1388    18 65844 2.733734e-04
## 1389    18 65844 2.733734e-04
## 1390    18 55641 3.235025e-04
## 1391    18 55641 3.235025e-04
## 1392    18 55641 3.235025e-04
## 1393    18 55641 3.235025e-04
## 1394    18 55641 3.235025e-04
## 1395    18 55641 3.235025e-04
## 1396    18 55641 3.235025e-04
## 1397    18 55641 3.235025e-04
## 1398    18 55641 3.235025e-04
## 1399    18 55641 3.235025e-04
## 1400    18 55641 3.235025e-04
## 1401    18 55641 3.235025e-04
## 1402    18 55641 3.235025e-04
## 1403    18 55641 3.235025e-04
## 1404    18 55641 3.235025e-04
## 1405    18 55641 3.235025e-04
## 1406    18 55641 3.235025e-04
## 1407    18 55641 3.235025e-04
## 1408    18 55641 3.235025e-04
## 1409    18 55641 3.235025e-04
## 1410    18 55641 3.235025e-04
## 1411    18 55641 3.235025e-04
## 1412    18 55641 3.235025e-04
## 1413    18 55641 3.235025e-04
## 1414    18 55641 3.235025e-04
## 1415    18 55641 3.235025e-04
## 1416    17 66780 2.545672e-04
## 1417    17 66780 2.545672e-04
## 1418    17 66780 2.545672e-04
## 1419    17 66780 2.545672e-04
## 1420    17 66780 2.545672e-04
## 1421    17 66780 2.545672e-04
## 1422    17 66780 2.545672e-04
## 1423    17 66780 2.545672e-04
## 1424    17 66780 2.545672e-04
## 1425    17 66780 2.545672e-04
## 1426    17 66780 2.545672e-04
## 1427    17 66780 2.545672e-04
## 1428    17 66780 2.545672e-04
## 1429    17 66780 2.545672e-04
## 1430    17 66780 2.545672e-04
## 1431    17 66780 2.545672e-04
## 1432    17 66780 2.545672e-04
## 1433    17 66780 2.545672e-04
## 1434    17 66780 2.545672e-04
## 1435    17 66780 2.545672e-04
## 1436    17 66780 2.545672e-04
## 1437    17 66780 2.545672e-04
## 1438    17 66780 2.545672e-04
## 1439    17 66780 2.545672e-04
## 1440    17 66780 2.545672e-04
## 1441    17 66780 2.545672e-04
## 1442    17 66780 2.545672e-04
## 1443    17 66780 2.545672e-04
## 1444    17 66780 2.545672e-04
## 1445    17 66780 2.545672e-04
## 1446    17 66780 2.545672e-04
## 1447    17 66780 2.545672e-04
## 1448    17 66780 2.545672e-04
## 1449    17 66780 2.545672e-04
## 1450    17 66780 2.545672e-04
## 1451    17 66780 2.545672e-04
## 1452    17 66780 2.545672e-04
## 1453    17 66780 2.545672e-04
## 1454    17 66780 2.545672e-04
## 1455    17 66780 2.545672e-04
## 1456    17 66780 2.545672e-04
## 1457    17 66780 2.545672e-04
## 1458    17 66780 2.545672e-04
## 1459    17 66780 2.545672e-04
## 1460    17 66780 2.545672e-04
## 1461    17 65844 2.581860e-04
## 1462    17 65844 2.581860e-04
## 1463    17 65844 2.581860e-04
## 1464    17 65844 2.581860e-04
## 1465    17 65844 2.581860e-04
## 1466    17 65844 2.581860e-04
## 1467    17 65844 2.581860e-04
## 1468    17 65844 2.581860e-04
## 1469    17 65844 2.581860e-04
## 1470    17 65844 2.581860e-04
## 1471    17 65844 2.581860e-04
## 1472    17 65844 2.581860e-04
## 1473    17 65844 2.581860e-04
## 1474    17 65844 2.581860e-04
## 1475    17 65844 2.581860e-04
## 1476    17 65844 2.581860e-04
## 1477    17 65844 2.581860e-04
## 1478    17 65844 2.581860e-04
## 1479    17 65844 2.581860e-04
## 1480    17 65844 2.581860e-04
## 1481    17 65844 2.581860e-04
## 1482    17 65844 2.581860e-04
## 1483    17 65844 2.581860e-04
## 1484    17 65844 2.581860e-04
## 1485    17 65844 2.581860e-04
## 1486    17 65844 2.581860e-04
## 1487    17 65844 2.581860e-04
## 1488    17 65844 2.581860e-04
## 1489    17 65844 2.581860e-04
## 1490    17 65844 2.581860e-04
## 1491    17 65844 2.581860e-04
## 1492    17 65844 2.581860e-04
## 1493    17 65844 2.581860e-04
## 1494    17 65844 2.581860e-04
## 1495    17 65844 2.581860e-04
## 1496    17 65844 2.581860e-04
## 1497    17 65844 2.581860e-04
## 1498    17 65844 2.581860e-04
## 1499    17 65844 2.581860e-04
## 1500    17 65844 2.581860e-04
## 1501    17 65844 2.581860e-04
## 1502    17 65844 2.581860e-04
## 1503    17 65844 2.581860e-04
## 1504    17 65844 2.581860e-04
## 1505    17 55641 3.055301e-04
## 1506    17 55641 3.055301e-04
## 1507    17 55641 3.055301e-04
## 1508    17 55641 3.055301e-04
## 1509    17 55641 3.055301e-04
## 1510    17 55641 3.055301e-04
## 1511    17 55641 3.055301e-04
## 1512    17 55641 3.055301e-04
## 1513    17 55641 3.055301e-04
## 1514    17 55641 3.055301e-04
## 1515    17 55641 3.055301e-04
## 1516    17 55641 3.055301e-04
## 1517    17 55641 3.055301e-04
## 1518    17 55641 3.055301e-04
## 1519    17 55641 3.055301e-04
## 1520    17 55641 3.055301e-04
## 1521    17 55641 3.055301e-04
## 1522    17 55641 3.055301e-04
## 1523    17 55641 3.055301e-04
## 1524    17 55641 3.055301e-04
## 1525    17 55641 3.055301e-04
## 1526    17 55641 3.055301e-04
## 1527    17 55641 3.055301e-04
## 1528    17 55641 3.055301e-04
## 1529    17 55641 3.055301e-04
## 1530    17 55641 3.055301e-04
## 1531    17 55641 3.055301e-04
## 1532    17 55641 3.055301e-04
## 1533    17 55641 3.055301e-04
## 1534    17 55641 3.055301e-04
## 1535    17 55641 3.055301e-04
## 1536    17 55641 3.055301e-04
## 1537    17 55641 3.055301e-04
## 1538    17 55641 3.055301e-04
## 1539    16 66780 2.395927e-04
## 1540    16 66780 2.395927e-04
## 1541    16 66780 2.395927e-04
## 1542    16 66780 2.395927e-04
## 1543    16 66780 2.395927e-04
## 1544    16 66780 2.395927e-04
## 1545    16 66780 2.395927e-04
## 1546    16 66780 2.395927e-04
## 1547    16 66780 2.395927e-04
## 1548    16 66780 2.395927e-04
## 1549    16 66780 2.395927e-04
## 1550    16 66780 2.395927e-04
## 1551    16 66780 2.395927e-04
## 1552    16 66780 2.395927e-04
## 1553    16 66780 2.395927e-04
## 1554    16 66780 2.395927e-04
## 1555    16 66780 2.395927e-04
## 1556    16 66780 2.395927e-04
## 1557    16 66780 2.395927e-04
## 1558    16 66780 2.395927e-04
## 1559    16 66780 2.395927e-04
## 1560    16 66780 2.395927e-04
## 1561    16 66780 2.395927e-04
## 1562    16 66780 2.395927e-04
## 1563    16 66780 2.395927e-04
## 1564    16 66780 2.395927e-04
## 1565    16 66780 2.395927e-04
## 1566    16 66780 2.395927e-04
## 1567    16 66780 2.395927e-04
## 1568    16 66780 2.395927e-04
## 1569    16 66780 2.395927e-04
## 1570    16 66780 2.395927e-04
## 1571    16 66780 2.395927e-04
## 1572    16 66780 2.395927e-04
## 1573    16 66780 2.395927e-04
## 1574    16 66780 2.395927e-04
## 1575    16 66780 2.395927e-04
## 1576    16 66780 2.395927e-04
## 1577    16 66780 2.395927e-04
## 1578    16 66780 2.395927e-04
## 1579    16 66780 2.395927e-04
## 1580    16 66780 2.395927e-04
## 1581    16 66780 2.395927e-04
## 1582    16 66780 2.395927e-04
## 1583    16 66780 2.395927e-04
## 1584    16 66780 2.395927e-04
## 1585    16 66780 2.395927e-04
## 1586    16 66780 2.395927e-04
## 1587    16 66780 2.395927e-04
## 1588    16 66780 2.395927e-04
## 1589    16 66780 2.395927e-04
## 1590    16 66780 2.395927e-04
## 1591    16 65844 2.429986e-04
## 1592    16 65844 2.429986e-04
## 1593    16 65844 2.429986e-04
## 1594    16 65844 2.429986e-04
## 1595    16 65844 2.429986e-04
## 1596    16 65844 2.429986e-04
## 1597    16 65844 2.429986e-04
## 1598    16 65844 2.429986e-04
## 1599    16 65844 2.429986e-04
## 1600    16 65844 2.429986e-04
## 1601    16 65844 2.429986e-04
## 1602    16 65844 2.429986e-04
## 1603    16 65844 2.429986e-04
## 1604    16 65844 2.429986e-04
## 1605    16 65844 2.429986e-04
## 1606    16 65844 2.429986e-04
## 1607    16 65844 2.429986e-04
## 1608    16 65844 2.429986e-04
## 1609    16 65844 2.429986e-04
## 1610    16 65844 2.429986e-04
## 1611    16 65844 2.429986e-04
## 1612    16 65844 2.429986e-04
## 1613    16 65844 2.429986e-04
## 1614    16 65844 2.429986e-04
## 1615    16 65844 2.429986e-04
## 1616    16 65844 2.429986e-04
## 1617    16 65844 2.429986e-04
## 1618    16 65844 2.429986e-04
## 1619    16 65844 2.429986e-04
## 1620    16 65844 2.429986e-04
## 1621    16 65844 2.429986e-04
## 1622    16 65844 2.429986e-04
## 1623    16 65844 2.429986e-04
## 1624    16 65844 2.429986e-04
## 1625    16 65844 2.429986e-04
## 1626    16 55641 2.875577e-04
## 1627    16 55641 2.875577e-04
## 1628    16 55641 2.875577e-04
## 1629    16 55641 2.875577e-04
## 1630    16 55641 2.875577e-04
## 1631    16 55641 2.875577e-04
## 1632    16 55641 2.875577e-04
## 1633    16 55641 2.875577e-04
## 1634    16 55641 2.875577e-04
## 1635    16 55641 2.875577e-04
## 1636    16 55641 2.875577e-04
## 1637    16 55641 2.875577e-04
## 1638    16 55641 2.875577e-04
## 1639    16 55641 2.875577e-04
## 1640    16 55641 2.875577e-04
## 1641    16 55641 2.875577e-04
## 1642    16 55641 2.875577e-04
## 1643    16 55641 2.875577e-04
## 1644    16 55641 2.875577e-04
## 1645    16 55641 2.875577e-04
## 1646    16 55641 2.875577e-04
## 1647    16 55641 2.875577e-04
## 1648    16 55641 2.875577e-04
## 1649    16 55641 2.875577e-04
## 1650    16 55641 2.875577e-04
## 1651    16 55641 2.875577e-04
## 1652    16 55641 2.875577e-04
## 1653    16 55641 2.875577e-04
## 1654    16 55641 2.875577e-04
## 1655    16 55641 2.875577e-04
## 1656    16 55641 2.875577e-04
## 1657    16 55641 2.875577e-04
## 1658    15 66780 2.246181e-04
## 1659    15 66780 2.246181e-04
## 1660    15 66780 2.246181e-04
## 1661    15 66780 2.246181e-04
## 1662    15 66780 2.246181e-04
## 1663    15 66780 2.246181e-04
## 1664    15 66780 2.246181e-04
## 1665    15 66780 2.246181e-04
## 1666    15 66780 2.246181e-04
## 1667    15 66780 2.246181e-04
## 1668    15 66780 2.246181e-04
## 1669    15 66780 2.246181e-04
## 1670    15 66780 2.246181e-04
## 1671    15 66780 2.246181e-04
## 1672    15 66780 2.246181e-04
## 1673    15 66780 2.246181e-04
## 1674    15 66780 2.246181e-04
## 1675    15 66780 2.246181e-04
## 1676    15 66780 2.246181e-04
## 1677    15 66780 2.246181e-04
## 1678    15 66780 2.246181e-04
## 1679    15 66780 2.246181e-04
## 1680    15 66780 2.246181e-04
## 1681    15 66780 2.246181e-04
## 1682    15 66780 2.246181e-04
## 1683    15 66780 2.246181e-04
## 1684    15 66780 2.246181e-04
## 1685    15 66780 2.246181e-04
## 1686    15 66780 2.246181e-04
## 1687    15 66780 2.246181e-04
## 1688    15 66780 2.246181e-04
## 1689    15 66780 2.246181e-04
## 1690    15 66780 2.246181e-04
## 1691    15 66780 2.246181e-04
## 1692    15 66780 2.246181e-04
## 1693    15 66780 2.246181e-04
## 1694    15 66780 2.246181e-04
## 1695    15 66780 2.246181e-04
## 1696    15 66780 2.246181e-04
## 1697    15 66780 2.246181e-04
## 1698    15 66780 2.246181e-04
## 1699    15 66780 2.246181e-04
## 1700    15 66780 2.246181e-04
## 1701    15 66780 2.246181e-04
## 1702    15 66780 2.246181e-04
## 1703    15 66780 2.246181e-04
## 1704    15 66780 2.246181e-04
## 1705    15 66780 2.246181e-04
## 1706    15 66780 2.246181e-04
## 1707    15 66780 2.246181e-04
## 1708    15 66780 2.246181e-04
## 1709    15 66780 2.246181e-04
## 1710    15 66780 2.246181e-04
## 1711    15 65844 2.278112e-04
## 1712    15 65844 2.278112e-04
## 1713    15 65844 2.278112e-04
## 1714    15 65844 2.278112e-04
## 1715    15 65844 2.278112e-04
## 1716    15 65844 2.278112e-04
## 1717    15 65844 2.278112e-04
## 1718    15 65844 2.278112e-04
## 1719    15 65844 2.278112e-04
## 1720    15 65844 2.278112e-04
## 1721    15 65844 2.278112e-04
## 1722    15 65844 2.278112e-04
## 1723    15 65844 2.278112e-04
## 1724    15 65844 2.278112e-04
## 1725    15 65844 2.278112e-04
## 1726    15 65844 2.278112e-04
## 1727    15 65844 2.278112e-04
## 1728    15 65844 2.278112e-04
## 1729    15 65844 2.278112e-04
## 1730    15 65844 2.278112e-04
## 1731    15 65844 2.278112e-04
## 1732    15 65844 2.278112e-04
## 1733    15 65844 2.278112e-04
## 1734    15 65844 2.278112e-04
## 1735    15 65844 2.278112e-04
## 1736    15 65844 2.278112e-04
## 1737    15 65844 2.278112e-04
## 1738    15 65844 2.278112e-04
## 1739    15 65844 2.278112e-04
## 1740    15 65844 2.278112e-04
## 1741    15 65844 2.278112e-04
## 1742    15 65844 2.278112e-04
## 1743    15 65844 2.278112e-04
## 1744    15 65844 2.278112e-04
## 1745    15 65844 2.278112e-04
## 1746    15 65844 2.278112e-04
## 1747    15 65844 2.278112e-04
## 1748    15 65844 2.278112e-04
## 1749    15 65844 2.278112e-04
## 1750    15 65844 2.278112e-04
## 1751    15 65844 2.278112e-04
## 1752    15 55641 2.695854e-04
## 1753    15 55641 2.695854e-04
## 1754    15 55641 2.695854e-04
## 1755    15 55641 2.695854e-04
## 1756    15 55641 2.695854e-04
## 1757    15 55641 2.695854e-04
## 1758    15 55641 2.695854e-04
## 1759    15 55641 2.695854e-04
## 1760    15 55641 2.695854e-04
## 1761    15 55641 2.695854e-04
## 1762    15 55641 2.695854e-04
## 1763    15 55641 2.695854e-04
## 1764    15 55641 2.695854e-04
## 1765    15 55641 2.695854e-04
## 1766    15 55641 2.695854e-04
## 1767    15 55641 2.695854e-04
## 1768    15 55641 2.695854e-04
## 1769    15 55641 2.695854e-04
## 1770    15 55641 2.695854e-04
## 1771    15 55641 2.695854e-04
## 1772    15 55641 2.695854e-04
## 1773    15 55641 2.695854e-04
## 1774    15 55641 2.695854e-04
## 1775    15 55641 2.695854e-04
## 1776    15 55641 2.695854e-04
## 1777    15 55641 2.695854e-04
## 1778    15 55641 2.695854e-04
## 1779    15 55641 2.695854e-04
## 1780    15 55641 2.695854e-04
## 1781    15 55641 2.695854e-04
## 1782    15 55641 2.695854e-04
## 1783    15 55641 2.695854e-04
## 1784    15 55641 2.695854e-04
## 1785    15 55641 2.695854e-04
## 1786    15 55641 2.695854e-04
## 1787    14 66780 2.096436e-04
## 1788    14 66780 2.096436e-04
## 1789    14 66780 2.096436e-04
## 1790    14 66780 2.096436e-04
## 1791    14 66780 2.096436e-04
## 1792    14 66780 2.096436e-04
## 1793    14 66780 2.096436e-04
## 1794    14 66780 2.096436e-04
## 1795    14 66780 2.096436e-04
## 1796    14 66780 2.096436e-04
## 1797    14 66780 2.096436e-04
## 1798    14 66780 2.096436e-04
## 1799    14 66780 2.096436e-04
## 1800    14 66780 2.096436e-04
## 1801    14 66780 2.096436e-04
## 1802    14 66780 2.096436e-04
## 1803    14 66780 2.096436e-04
## 1804    14 66780 2.096436e-04
## 1805    14 66780 2.096436e-04
## 1806    14 66780 2.096436e-04
## 1807    14 66780 2.096436e-04
## 1808    14 66780 2.096436e-04
## 1809    14 66780 2.096436e-04
## 1810    14 66780 2.096436e-04
## 1811    14 66780 2.096436e-04
## 1812    14 66780 2.096436e-04
## 1813    14 66780 2.096436e-04
## 1814    14 66780 2.096436e-04
## 1815    14 66780 2.096436e-04
## 1816    14 66780 2.096436e-04
## 1817    14 66780 2.096436e-04
## 1818    14 66780 2.096436e-04
## 1819    14 66780 2.096436e-04
## 1820    14 66780 2.096436e-04
## 1821    14 66780 2.096436e-04
## 1822    14 66780 2.096436e-04
## 1823    14 66780 2.096436e-04
## 1824    14 66780 2.096436e-04
## 1825    14 66780 2.096436e-04
## 1826    14 66780 2.096436e-04
## 1827    14 66780 2.096436e-04
## 1828    14 66780 2.096436e-04
## 1829    14 66780 2.096436e-04
## 1830    14 66780 2.096436e-04
## 1831    14 66780 2.096436e-04
## 1832    14 66780 2.096436e-04
## 1833    14 66780 2.096436e-04
## 1834    14 66780 2.096436e-04
## 1835    14 66780 2.096436e-04
## 1836    14 66780 2.096436e-04
## 1837    14 66780 2.096436e-04
## 1838    14 66780 2.096436e-04
## 1839    14 66780 2.096436e-04
## 1840    14 66780 2.096436e-04
## 1841    14 66780 2.096436e-04
## 1842    14 66780 2.096436e-04
## 1843    14 66780 2.096436e-04
## 1844    14 66780 2.096436e-04
## 1845    14 66780 2.096436e-04
## 1846    14 66780 2.096436e-04
## 1847    14 66780 2.096436e-04
## 1848    14 66780 2.096436e-04
## 1849    14 66780 2.096436e-04
## 1850    14 66780 2.096436e-04
## 1851    14 66780 2.096436e-04
## 1852    14 66780 2.096436e-04
## 1853    14 66780 2.096436e-04
## 1854    14 66780 2.096436e-04
## 1855    14 66780 2.096436e-04
## 1856    14 66780 2.096436e-04
## 1857    14 66780 2.096436e-04
## 1858    14 65844 2.126238e-04
## 1859    14 65844 2.126238e-04
## 1860    14 65844 2.126238e-04
## 1861    14 65844 2.126238e-04
## 1862    14 65844 2.126238e-04
## 1863    14 65844 2.126238e-04
## 1864    14 65844 2.126238e-04
## 1865    14 65844 2.126238e-04
## 1866    14 65844 2.126238e-04
## 1867    14 65844 2.126238e-04
## 1868    14 65844 2.126238e-04
## 1869    14 65844 2.126238e-04
## 1870    14 65844 2.126238e-04
## 1871    14 65844 2.126238e-04
## 1872    14 65844 2.126238e-04
## 1873    14 65844 2.126238e-04
## 1874    14 65844 2.126238e-04
## 1875    14 65844 2.126238e-04
## 1876    14 65844 2.126238e-04
## 1877    14 65844 2.126238e-04
## 1878    14 65844 2.126238e-04
## 1879    14 65844 2.126238e-04
## 1880    14 65844 2.126238e-04
## 1881    14 65844 2.126238e-04
## 1882    14 65844 2.126238e-04
## 1883    14 65844 2.126238e-04
## 1884    14 65844 2.126238e-04
## 1885    14 65844 2.126238e-04
## 1886    14 65844 2.126238e-04
## 1887    14 65844 2.126238e-04
## 1888    14 65844 2.126238e-04
## 1889    14 65844 2.126238e-04
## 1890    14 65844 2.126238e-04
## 1891    14 65844 2.126238e-04
## 1892    14 65844 2.126238e-04
## 1893    14 65844 2.126238e-04
## 1894    14 65844 2.126238e-04
## 1895    14 65844 2.126238e-04
## 1896    14 65844 2.126238e-04
## 1897    14 65844 2.126238e-04
## 1898    14 65844 2.126238e-04
## 1899    14 65844 2.126238e-04
## 1900    14 65844 2.126238e-04
## 1901    14 65844 2.126238e-04
## 1902    14 65844 2.126238e-04
## 1903    14 65844 2.126238e-04
## 1904    14 65844 2.126238e-04
## 1905    14 65844 2.126238e-04
## 1906    14 65844 2.126238e-04
## 1907    14 65844 2.126238e-04
## 1908    14 65844 2.126238e-04
## 1909    14 55641 2.516130e-04
## 1910    14 55641 2.516130e-04
## 1911    14 55641 2.516130e-04
## 1912    14 55641 2.516130e-04
## 1913    14 55641 2.516130e-04
## 1914    14 55641 2.516130e-04
## 1915    14 55641 2.516130e-04
## 1916    14 55641 2.516130e-04
## 1917    14 55641 2.516130e-04
## 1918    14 55641 2.516130e-04
## 1919    14 55641 2.516130e-04
## 1920    14 55641 2.516130e-04
## 1921    14 55641 2.516130e-04
## 1922    14 55641 2.516130e-04
## 1923    14 55641 2.516130e-04
## 1924    14 55641 2.516130e-04
## 1925    14 55641 2.516130e-04
## 1926    14 55641 2.516130e-04
## 1927    14 55641 2.516130e-04
## 1928    14 55641 2.516130e-04
## 1929    14 55641 2.516130e-04
## 1930    14 55641 2.516130e-04
## 1931    14 55641 2.516130e-04
## 1932    14 55641 2.516130e-04
## 1933    14 55641 2.516130e-04
## 1934    14 55641 2.516130e-04
## 1935    14 55641 2.516130e-04
## 1936    14 55641 2.516130e-04
## 1937    14 55641 2.516130e-04
## 1938    14 55641 2.516130e-04
## 1939    14 55641 2.516130e-04
## 1940    14 55641 2.516130e-04
## 1941    14 55641 2.516130e-04
## 1942    14 55641 2.516130e-04
## 1943    14 55641 2.516130e-04
## 1944    14 55641 2.516130e-04
## 1945    14 55641 2.516130e-04
## 1946    14 55641 2.516130e-04
## 1947    14 55641 2.516130e-04
## 1948    14 55641 2.516130e-04
## 1949    14 55641 2.516130e-04
## 1950    14 55641 2.516130e-04
## 1951    14 55641 2.516130e-04
## 1952    14 55641 2.516130e-04
## 1953    14 55641 2.516130e-04
## 1954    14 55641 2.516130e-04
## 1955    14 55641 2.516130e-04
## 1956    14 55641 2.516130e-04
## 1957    14 55641 2.516130e-04
## 1958    13 66780 1.946691e-04
## 1959    13 66780 1.946691e-04
## 1960    13 66780 1.946691e-04
## 1961    13 66780 1.946691e-04
## 1962    13 66780 1.946691e-04
## 1963    13 66780 1.946691e-04
## 1964    13 66780 1.946691e-04
## 1965    13 66780 1.946691e-04
## 1966    13 66780 1.946691e-04
## 1967    13 66780 1.946691e-04
## 1968    13 66780 1.946691e-04
## 1969    13 66780 1.946691e-04
## 1970    13 66780 1.946691e-04
## 1971    13 66780 1.946691e-04
## 1972    13 66780 1.946691e-04
## 1973    13 66780 1.946691e-04
## 1974    13 66780 1.946691e-04
## 1975    13 66780 1.946691e-04
## 1976    13 66780 1.946691e-04
## 1977    13 66780 1.946691e-04
## 1978    13 66780 1.946691e-04
## 1979    13 66780 1.946691e-04
## 1980    13 66780 1.946691e-04
## 1981    13 66780 1.946691e-04
## 1982    13 66780 1.946691e-04
## 1983    13 66780 1.946691e-04
## 1984    13 66780 1.946691e-04
## 1985    13 66780 1.946691e-04
## 1986    13 66780 1.946691e-04
## 1987    13 66780 1.946691e-04
## 1988    13 66780 1.946691e-04
## 1989    13 66780 1.946691e-04
## 1990    13 66780 1.946691e-04
## 1991    13 66780 1.946691e-04
## 1992    13 66780 1.946691e-04
## 1993    13 66780 1.946691e-04
## 1994    13 66780 1.946691e-04
## 1995    13 66780 1.946691e-04
## 1996    13 66780 1.946691e-04
## 1997    13 66780 1.946691e-04
## 1998    13 66780 1.946691e-04
## 1999    13 66780 1.946691e-04
## 2000    13 66780 1.946691e-04
## 2001    13 66780 1.946691e-04
## 2002    13 66780 1.946691e-04
## 2003    13 66780 1.946691e-04
## 2004    13 66780 1.946691e-04
## 2005    13 66780 1.946691e-04
## 2006    13 66780 1.946691e-04
## 2007    13 66780 1.946691e-04
## 2008    13 66780 1.946691e-04
## 2009    13 66780 1.946691e-04
## 2010    13 66780 1.946691e-04
## 2011    13 66780 1.946691e-04
## 2012    13 66780 1.946691e-04
## 2013    13 66780 1.946691e-04
## 2014    13 66780 1.946691e-04
## 2015    13 66780 1.946691e-04
## 2016    13 66780 1.946691e-04
## 2017    13 66780 1.946691e-04
## 2018    13 66780 1.946691e-04
## 2019    13 65844 1.974364e-04
## 2020    13 65844 1.974364e-04
## 2021    13 65844 1.974364e-04
## 2022    13 65844 1.974364e-04
## 2023    13 65844 1.974364e-04
## 2024    13 65844 1.974364e-04
## 2025    13 65844 1.974364e-04
## 2026    13 65844 1.974364e-04
## 2027    13 65844 1.974364e-04
## 2028    13 65844 1.974364e-04
## 2029    13 65844 1.974364e-04
## 2030    13 65844 1.974364e-04
## 2031    13 65844 1.974364e-04
## 2032    13 65844 1.974364e-04
## 2033    13 65844 1.974364e-04
## 2034    13 65844 1.974364e-04
## 2035    13 65844 1.974364e-04
## 2036    13 65844 1.974364e-04
## 2037    13 65844 1.974364e-04
## 2038    13 65844 1.974364e-04
## 2039    13 65844 1.974364e-04
## 2040    13 65844 1.974364e-04
## 2041    13 65844 1.974364e-04
## 2042    13 65844 1.974364e-04
## 2043    13 65844 1.974364e-04
## 2044    13 65844 1.974364e-04
## 2045    13 65844 1.974364e-04
## 2046    13 65844 1.974364e-04
## 2047    13 65844 1.974364e-04
## 2048    13 65844 1.974364e-04
## 2049    13 65844 1.974364e-04
## 2050    13 65844 1.974364e-04
## 2051    13 65844 1.974364e-04
## 2052    13 65844 1.974364e-04
## 2053    13 65844 1.974364e-04
## 2054    13 65844 1.974364e-04
## 2055    13 65844 1.974364e-04
## 2056    13 65844 1.974364e-04
## 2057    13 65844 1.974364e-04
## 2058    13 65844 1.974364e-04
## 2059    13 65844 1.974364e-04
## 2060    13 65844 1.974364e-04
## 2061    13 65844 1.974364e-04
## 2062    13 65844 1.974364e-04
## 2063    13 65844 1.974364e-04
## 2064    13 65844 1.974364e-04
## 2065    13 65844 1.974364e-04
## 2066    13 65844 1.974364e-04
## 2067    13 65844 1.974364e-04
## 2068    13 65844 1.974364e-04
## 2069    13 65844 1.974364e-04
## 2070    13 65844 1.974364e-04
## 2071    13 65844 1.974364e-04
## 2072    13 65844 1.974364e-04
## 2073    13 65844 1.974364e-04
## 2074    13 65844 1.974364e-04
## 2075    13 65844 1.974364e-04
## 2076    13 65844 1.974364e-04
## 2077    13 65844 1.974364e-04
## 2078    13 65844 1.974364e-04
## 2079    13 65844 1.974364e-04
## 2080    13 65844 1.974364e-04
## 2081    13 65844 1.974364e-04
## 2082    13 65844 1.974364e-04
## 2083    13 65844 1.974364e-04
## 2084    13 65844 1.974364e-04
## 2085    13 55641 2.336407e-04
## 2086    13 55641 2.336407e-04
## 2087    13 55641 2.336407e-04
## 2088    13 55641 2.336407e-04
## 2089    13 55641 2.336407e-04
## 2090    13 55641 2.336407e-04
## 2091    13 55641 2.336407e-04
## 2092    13 55641 2.336407e-04
## 2093    13 55641 2.336407e-04
## 2094    13 55641 2.336407e-04
## 2095    13 55641 2.336407e-04
## 2096    13 55641 2.336407e-04
## 2097    13 55641 2.336407e-04
## 2098    13 55641 2.336407e-04
## 2099    13 55641 2.336407e-04
## 2100    13 55641 2.336407e-04
## 2101    13 55641 2.336407e-04
## 2102    13 55641 2.336407e-04
## 2103    13 55641 2.336407e-04
## 2104    13 55641 2.336407e-04
## 2105    13 55641 2.336407e-04
## 2106    13 55641 2.336407e-04
## 2107    13 55641 2.336407e-04
## 2108    13 55641 2.336407e-04
## 2109    13 55641 2.336407e-04
## 2110    13 55641 2.336407e-04
## 2111    13 55641 2.336407e-04
## 2112    13 55641 2.336407e-04
## 2113    13 55641 2.336407e-04
## 2114    13 55641 2.336407e-04
## 2115    13 55641 2.336407e-04
## 2116    13 55641 2.336407e-04
## 2117    13 55641 2.336407e-04
## 2118    13 55641 2.336407e-04
## 2119    13 55641 2.336407e-04
## 2120    13 55641 2.336407e-04
## 2121    13 55641 2.336407e-04
## 2122    13 55641 2.336407e-04
## 2123    13 55641 2.336407e-04
## 2124    13 55641 2.336407e-04
## 2125    13 55641 2.336407e-04
## 2126    13 55641 2.336407e-04
## 2127    13 55641 2.336407e-04
## 2128    13 55641 2.336407e-04
## 2129    12 66780 1.796945e-04
## 2130    12 66780 1.796945e-04
## 2131    12 66780 1.796945e-04
## 2132    12 66780 1.796945e-04
## 2133    12 66780 1.796945e-04
## 2134    12 66780 1.796945e-04
## 2135    12 66780 1.796945e-04
## 2136    12 66780 1.796945e-04
## 2137    12 66780 1.796945e-04
## 2138    12 66780 1.796945e-04
## 2139    12 66780 1.796945e-04
## 2140    12 66780 1.796945e-04
## 2141    12 66780 1.796945e-04
## 2142    12 66780 1.796945e-04
## 2143    12 66780 1.796945e-04
## 2144    12 66780 1.796945e-04
## 2145    12 66780 1.796945e-04
## 2146    12 66780 1.796945e-04
## 2147    12 66780 1.796945e-04
## 2148    12 66780 1.796945e-04
## 2149    12 66780 1.796945e-04
## 2150    12 66780 1.796945e-04
## 2151    12 66780 1.796945e-04
## 2152    12 66780 1.796945e-04
## 2153    12 66780 1.796945e-04
## 2154    12 66780 1.796945e-04
## 2155    12 66780 1.796945e-04
## 2156    12 66780 1.796945e-04
## 2157    12 66780 1.796945e-04
## 2158    12 66780 1.796945e-04
## 2159    12 66780 1.796945e-04
## 2160    12 66780 1.796945e-04
## 2161    12 66780 1.796945e-04
## 2162    12 66780 1.796945e-04
## 2163    12 66780 1.796945e-04
## 2164    12 66780 1.796945e-04
## 2165    12 66780 1.796945e-04
## 2166    12 66780 1.796945e-04
## 2167    12 66780 1.796945e-04
## 2168    12 66780 1.796945e-04
## 2169    12 66780 1.796945e-04
## 2170    12 66780 1.796945e-04
## 2171    12 66780 1.796945e-04
## 2172    12 66780 1.796945e-04
## 2173    12 66780 1.796945e-04
## 2174    12 66780 1.796945e-04
## 2175    12 66780 1.796945e-04
## 2176    12 66780 1.796945e-04
## 2177    12 66780 1.796945e-04
## 2178    12 66780 1.796945e-04
## 2179    12 66780 1.796945e-04
## 2180    12 66780 1.796945e-04
## 2181    12 66780 1.796945e-04
## 2182    12 66780 1.796945e-04
## 2183    12 66780 1.796945e-04
## 2184    12 66780 1.796945e-04
## 2185    12 66780 1.796945e-04
## 2186    12 66780 1.796945e-04
## 2187    12 66780 1.796945e-04
## 2188    12 66780 1.796945e-04
## 2189    12 66780 1.796945e-04
## 2190    12 66780 1.796945e-04
## 2191    12 66780 1.796945e-04
## 2192    12 66780 1.796945e-04
## 2193    12 66780 1.796945e-04
## 2194    12 66780 1.796945e-04
## 2195    12 66780 1.796945e-04
## 2196    12 66780 1.796945e-04
## 2197    12 66780 1.796945e-04
## 2198    12 66780 1.796945e-04
## 2199    12 66780 1.796945e-04
## 2200    12 66780 1.796945e-04
## 2201    12 66780 1.796945e-04
## 2202    12 66780 1.796945e-04
## 2203    12 66780 1.796945e-04
## 2204    12 66780 1.796945e-04
## 2205    12 66780 1.796945e-04
## 2206    12 66780 1.796945e-04
## 2207    12 66780 1.796945e-04
## 2208    12 66780 1.796945e-04
## 2209    12 66780 1.796945e-04
## 2210    12 66780 1.796945e-04
## 2211    12 66780 1.796945e-04
## 2212    12 66780 1.796945e-04
## 2213    12 66780 1.796945e-04
## 2214    12 66780 1.796945e-04
## 2215    12 66780 1.796945e-04
## 2216    12 66780 1.796945e-04
## 2217    12 66780 1.796945e-04
## 2218    12 66780 1.796945e-04
## 2219    12 66780 1.796945e-04
## 2220    12 66780 1.796945e-04
## 2221    12 66780 1.796945e-04
## 2222    12 66780 1.796945e-04
## 2223    12 66780 1.796945e-04
## 2224    12 66780 1.796945e-04
## 2225    12 66780 1.796945e-04
## 2226    12 66780 1.796945e-04
## 2227    12 65844 1.822490e-04
## 2228    12 65844 1.822490e-04
## 2229    12 65844 1.822490e-04
## 2230    12 65844 1.822490e-04
## 2231    12 65844 1.822490e-04
## 2232    12 65844 1.822490e-04
## 2233    12 65844 1.822490e-04
## 2234    12 65844 1.822490e-04
## 2235    12 65844 1.822490e-04
## 2236    12 65844 1.822490e-04
## 2237    12 65844 1.822490e-04
## 2238    12 65844 1.822490e-04
## 2239    12 65844 1.822490e-04
## 2240    12 65844 1.822490e-04
## 2241    12 65844 1.822490e-04
## 2242    12 65844 1.822490e-04
## 2243    12 65844 1.822490e-04
## 2244    12 65844 1.822490e-04
## 2245    12 65844 1.822490e-04
## 2246    12 65844 1.822490e-04
## 2247    12 65844 1.822490e-04
## 2248    12 65844 1.822490e-04
## 2249    12 65844 1.822490e-04
## 2250    12 65844 1.822490e-04
## 2251    12 65844 1.822490e-04
## 2252    12 65844 1.822490e-04
## 2253    12 65844 1.822490e-04
## 2254    12 65844 1.822490e-04
## 2255    12 65844 1.822490e-04
## 2256    12 65844 1.822490e-04
## 2257    12 65844 1.822490e-04
## 2258    12 65844 1.822490e-04
## 2259    12 65844 1.822490e-04
## 2260    12 65844 1.822490e-04
## 2261    12 65844 1.822490e-04
## 2262    12 65844 1.822490e-04
## 2263    12 65844 1.822490e-04
## 2264    12 65844 1.822490e-04
## 2265    12 65844 1.822490e-04
## 2266    12 65844 1.822490e-04
## 2267    12 65844 1.822490e-04
## 2268    12 65844 1.822490e-04
## 2269    12 65844 1.822490e-04
## 2270    12 65844 1.822490e-04
## 2271    12 65844 1.822490e-04
## 2272    12 65844 1.822490e-04
## 2273    12 65844 1.822490e-04
## 2274    12 65844 1.822490e-04
## 2275    12 65844 1.822490e-04
## 2276    12 65844 1.822490e-04
## 2277    12 65844 1.822490e-04
## 2278    12 65844 1.822490e-04
## 2279    12 65844 1.822490e-04
## 2280    12 65844 1.822490e-04
## 2281    12 65844 1.822490e-04
## 2282    12 65844 1.822490e-04
## 2283    12 65844 1.822490e-04
## 2284    12 65844 1.822490e-04
## 2285    12 65844 1.822490e-04
## 2286    12 65844 1.822490e-04
## 2287    12 65844 1.822490e-04
## 2288    12 65844 1.822490e-04
## 2289    12 65844 1.822490e-04
## 2290    12 65844 1.822490e-04
## 2291    12 65844 1.822490e-04
## 2292    12 65844 1.822490e-04
## 2293    12 65844 1.822490e-04
## 2294    12 65844 1.822490e-04
## 2295    12 65844 1.822490e-04
## 2296    12 65844 1.822490e-04
## 2297    12 65844 1.822490e-04
## 2298    12 65844 1.822490e-04
## 2299    12 65844 1.822490e-04
## 2300    12 65844 1.822490e-04
## 2301    12 65844 1.822490e-04
## 2302    12 65844 1.822490e-04
## 2303    12 65844 1.822490e-04
## 2304    12 65844 1.822490e-04
## 2305    12 65844 1.822490e-04
## 2306    12 65844 1.822490e-04
## 2307    12 65844 1.822490e-04
## 2308    12 55641 2.156683e-04
## 2309    12 55641 2.156683e-04
## 2310    12 55641 2.156683e-04
## 2311    12 55641 2.156683e-04
## 2312    12 55641 2.156683e-04
## 2313    12 55641 2.156683e-04
## 2314    12 55641 2.156683e-04
## 2315    12 55641 2.156683e-04
## 2316    12 55641 2.156683e-04
## 2317    12 55641 2.156683e-04
## 2318    12 55641 2.156683e-04
## 2319    12 55641 2.156683e-04
## 2320    12 55641 2.156683e-04
## 2321    12 55641 2.156683e-04
## 2322    12 55641 2.156683e-04
## 2323    12 55641 2.156683e-04
## 2324    12 55641 2.156683e-04
## 2325    12 55641 2.156683e-04
## 2326    12 55641 2.156683e-04
## 2327    12 55641 2.156683e-04
## 2328    12 55641 2.156683e-04
## 2329    12 55641 2.156683e-04
## 2330    12 55641 2.156683e-04
## 2331    12 55641 2.156683e-04
## 2332    12 55641 2.156683e-04
## 2333    12 55641 2.156683e-04
## 2334    12 55641 2.156683e-04
## 2335    12 55641 2.156683e-04
## 2336    12 55641 2.156683e-04
## 2337    12 55641 2.156683e-04
## 2338    12 55641 2.156683e-04
## 2339    12 55641 2.156683e-04
## 2340    12 55641 2.156683e-04
## 2341    12 55641 2.156683e-04
## 2342    12 55641 2.156683e-04
## 2343    12 55641 2.156683e-04
## 2344    12 55641 2.156683e-04
## 2345    12 55641 2.156683e-04
## 2346    12 55641 2.156683e-04
## 2347    12 55641 2.156683e-04
## 2348    12 55641 2.156683e-04
## 2349    12 55641 2.156683e-04
## 2350    12 55641 2.156683e-04
## 2351    12 55641 2.156683e-04
## 2352    12 55641 2.156683e-04
## 2353    12 55641 2.156683e-04
## 2354    12 55641 2.156683e-04
## 2355    12 55641 2.156683e-04
## 2356    12 55641 2.156683e-04
## 2357    12 55641 2.156683e-04
## 2358    12 55641 2.156683e-04
## 2359    12 55641 2.156683e-04
## 2360    12 55641 2.156683e-04
## 2361    12 55641 2.156683e-04
## 2362    12 55641 2.156683e-04
## 2363    12 55641 2.156683e-04
## 2364    12 55641 2.156683e-04
## 2365    12 55641 2.156683e-04
## 2366    12 55641 2.156683e-04
## 2367    12 55641 2.156683e-04
## 2368    12 55641 2.156683e-04
## 2369    12 55641 2.156683e-04
## 2370    12 55641 2.156683e-04
## 2371    12 55641 2.156683e-04
## 2372    12 55641 2.156683e-04
## 2373    12 55641 2.156683e-04
## 2374    12 55641 2.156683e-04
## 2375    12 55641 2.156683e-04
## 2376    11 66780 1.647200e-04
## 2377    11 66780 1.647200e-04
## 2378    11 66780 1.647200e-04
## 2379    11 66780 1.647200e-04
## 2380    11 66780 1.647200e-04
## 2381    11 66780 1.647200e-04
## 2382    11 66780 1.647200e-04
## 2383    11 66780 1.647200e-04
## 2384    11 66780 1.647200e-04
## 2385    11 66780 1.647200e-04
## 2386    11 66780 1.647200e-04
## 2387    11 66780 1.647200e-04
## 2388    11 66780 1.647200e-04
## 2389    11 66780 1.647200e-04
## 2390    11 66780 1.647200e-04
## 2391    11 66780 1.647200e-04
## 2392    11 66780 1.647200e-04
## 2393    11 66780 1.647200e-04
## 2394    11 66780 1.647200e-04
## 2395    11 66780 1.647200e-04
## 2396    11 66780 1.647200e-04
## 2397    11 66780 1.647200e-04
## 2398    11 66780 1.647200e-04
## 2399    11 66780 1.647200e-04
## 2400    11 66780 1.647200e-04
## 2401    11 66780 1.647200e-04
## 2402    11 66780 1.647200e-04
## 2403    11 66780 1.647200e-04
## 2404    11 66780 1.647200e-04
## 2405    11 66780 1.647200e-04
## 2406    11 66780 1.647200e-04
## 2407    11 66780 1.647200e-04
## 2408    11 66780 1.647200e-04
## 2409    11 66780 1.647200e-04
## 2410    11 66780 1.647200e-04
## 2411    11 66780 1.647200e-04
## 2412    11 66780 1.647200e-04
## 2413    11 66780 1.647200e-04
## 2414    11 66780 1.647200e-04
## 2415    11 66780 1.647200e-04
## 2416    11 66780 1.647200e-04
## 2417    11 66780 1.647200e-04
## 2418    11 66780 1.647200e-04
## 2419    11 66780 1.647200e-04
## 2420    11 66780 1.647200e-04
## 2421    11 66780 1.647200e-04
## 2422    11 66780 1.647200e-04
## 2423    11 66780 1.647200e-04
## 2424    11 66780 1.647200e-04
## 2425    11 66780 1.647200e-04
## 2426    11 66780 1.647200e-04
## 2427    11 66780 1.647200e-04
## 2428    11 66780 1.647200e-04
## 2429    11 66780 1.647200e-04
## 2430    11 66780 1.647200e-04
## 2431    11 66780 1.647200e-04
## 2432    11 66780 1.647200e-04
## 2433    11 66780 1.647200e-04
## 2434    11 66780 1.647200e-04
## 2435    11 66780 1.647200e-04
## 2436    11 66780 1.647200e-04
## 2437    11 66780 1.647200e-04
## 2438    11 66780 1.647200e-04
## 2439    11 66780 1.647200e-04
## 2440    11 66780 1.647200e-04
## 2441    11 66780 1.647200e-04
## 2442    11 66780 1.647200e-04
## 2443    11 66780 1.647200e-04
## 2444    11 66780 1.647200e-04
## 2445    11 66780 1.647200e-04
## 2446    11 66780 1.647200e-04
## 2447    11 66780 1.647200e-04
## 2448    11 66780 1.647200e-04
## 2449    11 66780 1.647200e-04
## 2450    11 66780 1.647200e-04
## 2451    11 66780 1.647200e-04
## 2452    11 66780 1.647200e-04
## 2453    11 66780 1.647200e-04
## 2454    11 66780 1.647200e-04
## 2455    11 66780 1.647200e-04
## 2456    11 66780 1.647200e-04
## 2457    11 66780 1.647200e-04
## 2458    11 66780 1.647200e-04
## 2459    11 66780 1.647200e-04
## 2460    11 66780 1.647200e-04
## 2461    11 66780 1.647200e-04
## 2462    11 66780 1.647200e-04
## 2463    11 66780 1.647200e-04
## 2464    11 66780 1.647200e-04
## 2465    11 66780 1.647200e-04
## 2466    11 66780 1.647200e-04
## 2467    11 66780 1.647200e-04
## 2468    11 66780 1.647200e-04
## 2469    11 66780 1.647200e-04
## 2470    11 66780 1.647200e-04
## 2471    11 66780 1.647200e-04
## 2472    11 66780 1.647200e-04
## 2473    11 65844 1.670615e-04
## 2474    11 65844 1.670615e-04
## 2475    11 65844 1.670615e-04
## 2476    11 65844 1.670615e-04
## 2477    11 65844 1.670615e-04
## 2478    11 65844 1.670615e-04
## 2479    11 65844 1.670615e-04
## 2480    11 65844 1.670615e-04
## 2481    11 65844 1.670615e-04
## 2482    11 65844 1.670615e-04
## 2483    11 65844 1.670615e-04
## 2484    11 65844 1.670615e-04
## 2485    11 65844 1.670615e-04
## 2486    11 65844 1.670615e-04
## 2487    11 65844 1.670615e-04
## 2488    11 65844 1.670615e-04
## 2489    11 65844 1.670615e-04
## 2490    11 65844 1.670615e-04
## 2491    11 65844 1.670615e-04
## 2492    11 65844 1.670615e-04
## 2493    11 65844 1.670615e-04
## 2494    11 65844 1.670615e-04
## 2495    11 65844 1.670615e-04
## 2496    11 65844 1.670615e-04
## 2497    11 65844 1.670615e-04
## 2498    11 65844 1.670615e-04
## 2499    11 65844 1.670615e-04
## 2500    11 65844 1.670615e-04
## 2501    11 65844 1.670615e-04
## 2502    11 65844 1.670615e-04
## 2503    11 65844 1.670615e-04
## 2504    11 65844 1.670615e-04
## 2505    11 65844 1.670615e-04
## 2506    11 65844 1.670615e-04
## 2507    11 65844 1.670615e-04
## 2508    11 65844 1.670615e-04
## 2509    11 65844 1.670615e-04
## 2510    11 65844 1.670615e-04
## 2511    11 65844 1.670615e-04
## 2512    11 65844 1.670615e-04
## 2513    11 65844 1.670615e-04
## 2514    11 65844 1.670615e-04
## 2515    11 65844 1.670615e-04
## 2516    11 65844 1.670615e-04
## 2517    11 65844 1.670615e-04
## 2518    11 65844 1.670615e-04
## 2519    11 65844 1.670615e-04
## 2520    11 65844 1.670615e-04
## 2521    11 65844 1.670615e-04
## 2522    11 65844 1.670615e-04
## 2523    11 65844 1.670615e-04
## 2524    11 65844 1.670615e-04
## 2525    11 65844 1.670615e-04
## 2526    11 65844 1.670615e-04
## 2527    11 65844 1.670615e-04
## 2528    11 65844 1.670615e-04
## 2529    11 65844 1.670615e-04
## 2530    11 65844 1.670615e-04
## 2531    11 65844 1.670615e-04
## 2532    11 65844 1.670615e-04
## 2533    11 65844 1.670615e-04
## 2534    11 65844 1.670615e-04
## 2535    11 65844 1.670615e-04
## 2536    11 65844 1.670615e-04
## 2537    11 65844 1.670615e-04
## 2538    11 65844 1.670615e-04
## 2539    11 65844 1.670615e-04
## 2540    11 65844 1.670615e-04
## 2541    11 65844 1.670615e-04
## 2542    11 65844 1.670615e-04
## 2543    11 65844 1.670615e-04
## 2544    11 65844 1.670615e-04
## 2545    11 65844 1.670615e-04
## 2546    11 65844 1.670615e-04
## 2547    11 65844 1.670615e-04
## 2548    11 65844 1.670615e-04
## 2549    11 65844 1.670615e-04
## 2550    11 65844 1.670615e-04
## 2551    11 65844 1.670615e-04
## 2552    11 65844 1.670615e-04
## 2553    11 65844 1.670615e-04
## 2554    11 65844 1.670615e-04
## 2555    11 65844 1.670615e-04
## 2556    11 65844 1.670615e-04
## 2557    11 65844 1.670615e-04
## 2558    11 65844 1.670615e-04
## 2559    11 65844 1.670615e-04
## 2560    11 65844 1.670615e-04
## 2561    11 55641 1.976959e-04
## 2562    11 55641 1.976959e-04
## 2563    11 55641 1.976959e-04
## 2564    11 55641 1.976959e-04
## 2565    11 55641 1.976959e-04
## 2566    11 55641 1.976959e-04
## 2567    11 55641 1.976959e-04
## 2568    11 55641 1.976959e-04
## 2569    11 55641 1.976959e-04
## 2570    11 55641 1.976959e-04
## 2571    11 55641 1.976959e-04
## 2572    11 55641 1.976959e-04
## 2573    11 55641 1.976959e-04
## 2574    11 55641 1.976959e-04
## 2575    11 55641 1.976959e-04
## 2576    11 55641 1.976959e-04
## 2577    11 55641 1.976959e-04
## 2578    11 55641 1.976959e-04
## 2579    11 55641 1.976959e-04
## 2580    11 55641 1.976959e-04
## 2581    11 55641 1.976959e-04
## 2582    11 55641 1.976959e-04
## 2583    11 55641 1.976959e-04
## 2584    11 55641 1.976959e-04
## 2585    11 55641 1.976959e-04
## 2586    11 55641 1.976959e-04
## 2587    11 55641 1.976959e-04
## 2588    11 55641 1.976959e-04
## 2589    11 55641 1.976959e-04
## 2590    11 55641 1.976959e-04
## 2591    11 55641 1.976959e-04
## 2592    11 55641 1.976959e-04
## 2593    11 55641 1.976959e-04
## 2594    11 55641 1.976959e-04
## 2595    11 55641 1.976959e-04
## 2596    11 55641 1.976959e-04
## 2597    11 55641 1.976959e-04
## 2598    11 55641 1.976959e-04
## 2599    11 55641 1.976959e-04
## 2600    11 55641 1.976959e-04
## 2601    11 55641 1.976959e-04
## 2602    11 55641 1.976959e-04
## 2603    11 55641 1.976959e-04
## 2604    11 55641 1.976959e-04
## 2605    11 55641 1.976959e-04
## 2606    11 55641 1.976959e-04
## 2607    11 55641 1.976959e-04
## 2608    11 55641 1.976959e-04
## 2609    11 55641 1.976959e-04
## 2610    11 55641 1.976959e-04
## 2611    11 55641 1.976959e-04
## 2612    11 55641 1.976959e-04
## 2613    11 55641 1.976959e-04
## 2614    11 55641 1.976959e-04
## 2615    11 55641 1.976959e-04
## 2616    11 55641 1.976959e-04
## 2617    11 55641 1.976959e-04
## 2618    11 55641 1.976959e-04
## 2619    11 55641 1.976959e-04
## 2620    11 55641 1.976959e-04
## 2621    11 55641 1.976959e-04
## 2622    11 55641 1.976959e-04
## 2623    11 55641 1.976959e-04
## 2624    11 55641 1.976959e-04
## 2625    11 55641 1.976959e-04
## 2626    11 55641 1.976959e-04
## 2627    11 55641 1.976959e-04
## 2628    11 55641 1.976959e-04
## 2629    11 55641 1.976959e-04
## 2630    11 55641 1.976959e-04
## 2631    11 55641 1.976959e-04
## 2632    11 55641 1.976959e-04
## 2633    11 55641 1.976959e-04
## 2634    10 66780 1.497454e-04
## 2635    10 66780 1.497454e-04
## 2636    10 66780 1.497454e-04
## 2637    10 66780 1.497454e-04
## 2638    10 66780 1.497454e-04
## 2639    10 66780 1.497454e-04
## 2640    10 66780 1.497454e-04
## 2641    10 66780 1.497454e-04
## 2642    10 66780 1.497454e-04
## 2643    10 66780 1.497454e-04
## 2644    10 66780 1.497454e-04
## 2645    10 66780 1.497454e-04
## 2646    10 66780 1.497454e-04
## 2647    10 66780 1.497454e-04
## 2648    10 66780 1.497454e-04
## 2649    10 66780 1.497454e-04
## 2650    10 66780 1.497454e-04
## 2651    10 66780 1.497454e-04
## 2652    10 66780 1.497454e-04
## 2653    10 66780 1.497454e-04
## 2654    10 66780 1.497454e-04
## 2655    10 66780 1.497454e-04
## 2656    10 66780 1.497454e-04
## 2657    10 66780 1.497454e-04
## 2658    10 66780 1.497454e-04
## 2659    10 66780 1.497454e-04
## 2660    10 66780 1.497454e-04
## 2661    10 66780 1.497454e-04
## 2662    10 66780 1.497454e-04
## 2663    10 66780 1.497454e-04
## 2664    10 66780 1.497454e-04
## 2665    10 66780 1.497454e-04
## 2666    10 66780 1.497454e-04
## 2667    10 66780 1.497454e-04
## 2668    10 66780 1.497454e-04
## 2669    10 66780 1.497454e-04
## 2670    10 66780 1.497454e-04
## 2671    10 66780 1.497454e-04
## 2672    10 66780 1.497454e-04
## 2673    10 66780 1.497454e-04
## 2674    10 66780 1.497454e-04
## 2675    10 66780 1.497454e-04
## 2676    10 66780 1.497454e-04
## 2677    10 66780 1.497454e-04
## 2678    10 66780 1.497454e-04
## 2679    10 66780 1.497454e-04
## 2680    10 66780 1.497454e-04
## 2681    10 66780 1.497454e-04
## 2682    10 66780 1.497454e-04
## 2683    10 66780 1.497454e-04
## 2684    10 66780 1.497454e-04
## 2685    10 66780 1.497454e-04
## 2686    10 66780 1.497454e-04
## 2687    10 66780 1.497454e-04
## 2688    10 66780 1.497454e-04
## 2689    10 66780 1.497454e-04
## 2690    10 66780 1.497454e-04
## 2691    10 66780 1.497454e-04
## 2692    10 66780 1.497454e-04
## 2693    10 66780 1.497454e-04
## 2694    10 66780 1.497454e-04
## 2695    10 66780 1.497454e-04
## 2696    10 66780 1.497454e-04
## 2697    10 66780 1.497454e-04
## 2698    10 66780 1.497454e-04
## 2699    10 66780 1.497454e-04
## 2700    10 66780 1.497454e-04
## 2701    10 66780 1.497454e-04
## 2702    10 66780 1.497454e-04
## 2703    10 66780 1.497454e-04
## 2704    10 66780 1.497454e-04
## 2705    10 66780 1.497454e-04
## 2706    10 66780 1.497454e-04
## 2707    10 66780 1.497454e-04
## 2708    10 66780 1.497454e-04
## 2709    10 66780 1.497454e-04
## 2710    10 66780 1.497454e-04
## 2711    10 66780 1.497454e-04
## 2712    10 66780 1.497454e-04
## 2713    10 66780 1.497454e-04
## 2714    10 66780 1.497454e-04
## 2715    10 66780 1.497454e-04
## 2716    10 66780 1.497454e-04
## 2717    10 66780 1.497454e-04
## 2718    10 66780 1.497454e-04
## 2719    10 66780 1.497454e-04
## 2720    10 66780 1.497454e-04
## 2721    10 66780 1.497454e-04
## 2722    10 66780 1.497454e-04
## 2723    10 66780 1.497454e-04
## 2724    10 66780 1.497454e-04
## 2725    10 66780 1.497454e-04
## 2726    10 66780 1.497454e-04
## 2727    10 66780 1.497454e-04
## 2728    10 66780 1.497454e-04
## 2729    10 66780 1.497454e-04
## 2730    10 66780 1.497454e-04
## 2731    10 66780 1.497454e-04
## 2732    10 66780 1.497454e-04
## 2733    10 66780 1.497454e-04
## 2734    10 66780 1.497454e-04
## 2735    10 65844 1.518741e-04
## 2736    10 65844 1.518741e-04
## 2737    10 65844 1.518741e-04
## 2738    10 65844 1.518741e-04
## 2739    10 65844 1.518741e-04
## 2740    10 65844 1.518741e-04
## 2741    10 65844 1.518741e-04
## 2742    10 65844 1.518741e-04
## 2743    10 65844 1.518741e-04
## 2744    10 65844 1.518741e-04
## 2745    10 65844 1.518741e-04
## 2746    10 65844 1.518741e-04
## 2747    10 65844 1.518741e-04
## 2748    10 65844 1.518741e-04
## 2749    10 65844 1.518741e-04
## 2750    10 65844 1.518741e-04
## 2751    10 65844 1.518741e-04
## 2752    10 65844 1.518741e-04
## 2753    10 65844 1.518741e-04
## 2754    10 65844 1.518741e-04
## 2755    10 65844 1.518741e-04
## 2756    10 65844 1.518741e-04
## 2757    10 65844 1.518741e-04
## 2758    10 65844 1.518741e-04
## 2759    10 65844 1.518741e-04
## 2760    10 65844 1.518741e-04
## 2761    10 65844 1.518741e-04
## 2762    10 65844 1.518741e-04
## 2763    10 65844 1.518741e-04
## 2764    10 65844 1.518741e-04
## 2765    10 65844 1.518741e-04
## 2766    10 65844 1.518741e-04
## 2767    10 65844 1.518741e-04
## 2768    10 65844 1.518741e-04
## 2769    10 65844 1.518741e-04
## 2770    10 65844 1.518741e-04
## 2771    10 65844 1.518741e-04
## 2772    10 65844 1.518741e-04
## 2773    10 65844 1.518741e-04
## 2774    10 65844 1.518741e-04
## 2775    10 65844 1.518741e-04
## 2776    10 65844 1.518741e-04
## 2777    10 65844 1.518741e-04
## 2778    10 65844 1.518741e-04
## 2779    10 65844 1.518741e-04
## 2780    10 65844 1.518741e-04
## 2781    10 65844 1.518741e-04
## 2782    10 65844 1.518741e-04
## 2783    10 65844 1.518741e-04
## 2784    10 65844 1.518741e-04
## 2785    10 65844 1.518741e-04
## 2786    10 65844 1.518741e-04
## 2787    10 65844 1.518741e-04
## 2788    10 65844 1.518741e-04
## 2789    10 65844 1.518741e-04
## 2790    10 65844 1.518741e-04
## 2791    10 65844 1.518741e-04
## 2792    10 65844 1.518741e-04
## 2793    10 65844 1.518741e-04
## 2794    10 65844 1.518741e-04
## 2795    10 65844 1.518741e-04
## 2796    10 65844 1.518741e-04
## 2797    10 65844 1.518741e-04
## 2798    10 65844 1.518741e-04
## 2799    10 65844 1.518741e-04
## 2800    10 65844 1.518741e-04
## 2801    10 65844 1.518741e-04
## 2802    10 65844 1.518741e-04
## 2803    10 65844 1.518741e-04
## 2804    10 65844 1.518741e-04
## 2805    10 65844 1.518741e-04
## 2806    10 65844 1.518741e-04
## 2807    10 65844 1.518741e-04
## 2808    10 65844 1.518741e-04
## 2809    10 65844 1.518741e-04
## 2810    10 65844 1.518741e-04
## 2811    10 65844 1.518741e-04
## 2812    10 65844 1.518741e-04
## 2813    10 65844 1.518741e-04
## 2814    10 65844 1.518741e-04
## 2815    10 65844 1.518741e-04
## 2816    10 65844 1.518741e-04
## 2817    10 65844 1.518741e-04
## 2818    10 65844 1.518741e-04
## 2819    10 55641 1.797236e-04
## 2820    10 55641 1.797236e-04
## 2821    10 55641 1.797236e-04
## 2822    10 55641 1.797236e-04
## 2823    10 55641 1.797236e-04
## 2824    10 55641 1.797236e-04
## 2825    10 55641 1.797236e-04
## 2826    10 55641 1.797236e-04
## 2827    10 55641 1.797236e-04
## 2828    10 55641 1.797236e-04
## 2829    10 55641 1.797236e-04
## 2830    10 55641 1.797236e-04
## 2831    10 55641 1.797236e-04
## 2832    10 55641 1.797236e-04
## 2833    10 55641 1.797236e-04
## 2834    10 55641 1.797236e-04
## 2835    10 55641 1.797236e-04
## 2836    10 55641 1.797236e-04
## 2837    10 55641 1.797236e-04
## 2838    10 55641 1.797236e-04
## 2839    10 55641 1.797236e-04
## 2840    10 55641 1.797236e-04
## 2841    10 55641 1.797236e-04
## 2842    10 55641 1.797236e-04
## 2843    10 55641 1.797236e-04
## 2844    10 55641 1.797236e-04
## 2845    10 55641 1.797236e-04
## 2846    10 55641 1.797236e-04
## 2847    10 55641 1.797236e-04
## 2848    10 55641 1.797236e-04
## 2849    10 55641 1.797236e-04
## 2850    10 55641 1.797236e-04
## 2851    10 55641 1.797236e-04
## 2852    10 55641 1.797236e-04
## 2853    10 55641 1.797236e-04
## 2854    10 55641 1.797236e-04
## 2855    10 55641 1.797236e-04
## 2856    10 55641 1.797236e-04
## 2857    10 55641 1.797236e-04
## 2858    10 55641 1.797236e-04
## 2859    10 55641 1.797236e-04
## 2860    10 55641 1.797236e-04
## 2861    10 55641 1.797236e-04
## 2862    10 55641 1.797236e-04
## 2863    10 55641 1.797236e-04
## 2864    10 55641 1.797236e-04
## 2865    10 55641 1.797236e-04
## 2866    10 55641 1.797236e-04
## 2867    10 55641 1.797236e-04
## 2868    10 55641 1.797236e-04
## 2869    10 55641 1.797236e-04
## 2870    10 55641 1.797236e-04
## 2871    10 55641 1.797236e-04
## 2872    10 55641 1.797236e-04
## 2873    10 55641 1.797236e-04
## 2874    10 55641 1.797236e-04
## 2875    10 55641 1.797236e-04
## 2876    10 55641 1.797236e-04
## 2877    10 55641 1.797236e-04
## 2878    10 55641 1.797236e-04
## 2879    10 55641 1.797236e-04
## 2880    10 55641 1.797236e-04
## 2881    10 55641 1.797236e-04
## 2882    10 55641 1.797236e-04
## 2883    10 55641 1.797236e-04
## 2884    10 55641 1.797236e-04
## 2885    10 55641 1.797236e-04
## 2886    10 55641 1.797236e-04
## 2887    10 55641 1.797236e-04
## 2888    10 55641 1.797236e-04
## 2889    10 55641 1.797236e-04
## 2890    10 55641 1.797236e-04
## 2891    10 55641 1.797236e-04
## 2892    10 55641 1.797236e-04
## 2893    10 55641 1.797236e-04
## 2894    10 55641 1.797236e-04
## 2895    10 55641 1.797236e-04
## 2896    10 55641 1.797236e-04
## 2897    10 55641 1.797236e-04
## 2898    10 55641 1.797236e-04
## 2899    10 55641 1.797236e-04
## 2900    10 55641 1.797236e-04
## 2901    10 55641 1.797236e-04
## 2902    10 55641 1.797236e-04
## 2903    10 55641 1.797236e-04
## 2904    10 55641 1.797236e-04
## 2905    10 55641 1.797236e-04
## 2906    10 55641 1.797236e-04
## 2907    10 55641 1.797236e-04
## 2908    10 55641 1.797236e-04
## 2909    10 55641 1.797236e-04
## 2910    10 55641 1.797236e-04
## 2911    10 55641 1.797236e-04
## 2912    10 55641 1.797236e-04
## 2913    10 55641 1.797236e-04
## 2914    10 55641 1.797236e-04
## 2915    10 55641 1.797236e-04
## 2916    10 55641 1.797236e-04
## 2917    10 55641 1.797236e-04
## 2918    10 55641 1.797236e-04
## 2919    10 55641 1.797236e-04
## 2920    10 55641 1.797236e-04
## 2921    10 55641 1.797236e-04
## 2922    10 55641 1.797236e-04
## 2923     9 66780 1.347709e-04
## 2924     9 66780 1.347709e-04
## 2925     9 66780 1.347709e-04
## 2926     9 66780 1.347709e-04
## 2927     9 66780 1.347709e-04
## 2928     9 66780 1.347709e-04
## 2929     9 66780 1.347709e-04
## 2930     9 66780 1.347709e-04
## 2931     9 66780 1.347709e-04
## 2932     9 66780 1.347709e-04
## 2933     9 66780 1.347709e-04
## 2934     9 66780 1.347709e-04
## 2935     9 66780 1.347709e-04
## 2936     9 66780 1.347709e-04
## 2937     9 66780 1.347709e-04
## 2938     9 66780 1.347709e-04
## 2939     9 66780 1.347709e-04
## 2940     9 66780 1.347709e-04
## 2941     9 66780 1.347709e-04
## 2942     9 66780 1.347709e-04
## 2943     9 66780 1.347709e-04
## 2944     9 66780 1.347709e-04
## 2945     9 66780 1.347709e-04
## 2946     9 66780 1.347709e-04
## 2947     9 66780 1.347709e-04
## 2948     9 66780 1.347709e-04
## 2949     9 66780 1.347709e-04
## 2950     9 66780 1.347709e-04
## 2951     9 66780 1.347709e-04
## 2952     9 66780 1.347709e-04
## 2953     9 66780 1.347709e-04
## 2954     9 66780 1.347709e-04
## 2955     9 66780 1.347709e-04
## 2956     9 66780 1.347709e-04
## 2957     9 66780 1.347709e-04
## 2958     9 66780 1.347709e-04
## 2959     9 66780 1.347709e-04
## 2960     9 66780 1.347709e-04
## 2961     9 66780 1.347709e-04
## 2962     9 66780 1.347709e-04
## 2963     9 66780 1.347709e-04
## 2964     9 66780 1.347709e-04
## 2965     9 66780 1.347709e-04
## 2966     9 66780 1.347709e-04
## 2967     9 66780 1.347709e-04
## 2968     9 66780 1.347709e-04
## 2969     9 66780 1.347709e-04
## 2970     9 66780 1.347709e-04
## 2971     9 66780 1.347709e-04
## 2972     9 66780 1.347709e-04
## 2973     9 66780 1.347709e-04
## 2974     9 66780 1.347709e-04
## 2975     9 66780 1.347709e-04
## 2976     9 66780 1.347709e-04
## 2977     9 66780 1.347709e-04
## 2978     9 66780 1.347709e-04
## 2979     9 66780 1.347709e-04
## 2980     9 66780 1.347709e-04
## 2981     9 66780 1.347709e-04
## 2982     9 66780 1.347709e-04
## 2983     9 66780 1.347709e-04
## 2984     9 66780 1.347709e-04
## 2985     9 66780 1.347709e-04
## 2986     9 66780 1.347709e-04
## 2987     9 66780 1.347709e-04
## 2988     9 66780 1.347709e-04
## 2989     9 66780 1.347709e-04
## 2990     9 66780 1.347709e-04
## 2991     9 66780 1.347709e-04
## 2992     9 66780 1.347709e-04
## 2993     9 66780 1.347709e-04
## 2994     9 66780 1.347709e-04
## 2995     9 66780 1.347709e-04
## 2996     9 66780 1.347709e-04
## 2997     9 66780 1.347709e-04
## 2998     9 66780 1.347709e-04
## 2999     9 66780 1.347709e-04
## 3000     9 66780 1.347709e-04
## 3001     9 66780 1.347709e-04
## 3002     9 66780 1.347709e-04
## 3003     9 66780 1.347709e-04
## 3004     9 66780 1.347709e-04
## 3005     9 66780 1.347709e-04
## 3006     9 66780 1.347709e-04
## 3007     9 66780 1.347709e-04
## 3008     9 66780 1.347709e-04
## 3009     9 66780 1.347709e-04
## 3010     9 66780 1.347709e-04
## 3011     9 66780 1.347709e-04
## 3012     9 66780 1.347709e-04
## 3013     9 66780 1.347709e-04
## 3014     9 66780 1.347709e-04
## 3015     9 66780 1.347709e-04
## 3016     9 66780 1.347709e-04
## 3017     9 66780 1.347709e-04
## 3018     9 66780 1.347709e-04
## 3019     9 66780 1.347709e-04
## 3020     9 66780 1.347709e-04
## 3021     9 66780 1.347709e-04
## 3022     9 66780 1.347709e-04
## 3023     9 66780 1.347709e-04
## 3024     9 66780 1.347709e-04
## 3025     9 66780 1.347709e-04
## 3026     9 66780 1.347709e-04
## 3027     9 66780 1.347709e-04
## 3028     9 66780 1.347709e-04
## 3029     9 66780 1.347709e-04
## 3030     9 66780 1.347709e-04
## 3031     9 66780 1.347709e-04
## 3032     9 66780 1.347709e-04
## 3033     9 66780 1.347709e-04
## 3034     9 66780 1.347709e-04
## 3035     9 66780 1.347709e-04
## 3036     9 66780 1.347709e-04
## 3037     9 66780 1.347709e-04
## 3038     9 66780 1.347709e-04
## 3039     9 66780 1.347709e-04
## 3040     9 66780 1.347709e-04
## 3041     9 66780 1.347709e-04
## 3042     9 66780 1.347709e-04
## 3043     9 66780 1.347709e-04
## 3044     9 66780 1.347709e-04
## 3045     9 66780 1.347709e-04
## 3046     9 66780 1.347709e-04
## 3047     9 66780 1.347709e-04
## 3048     9 66780 1.347709e-04
## 3049     9 66780 1.347709e-04
## 3050     9 66780 1.347709e-04
## 3051     9 65844 1.366867e-04
## 3052     9 65844 1.366867e-04
## 3053     9 65844 1.366867e-04
## 3054     9 65844 1.366867e-04
## 3055     9 65844 1.366867e-04
## 3056     9 65844 1.366867e-04
## 3057     9 65844 1.366867e-04
## 3058     9 65844 1.366867e-04
## 3059     9 65844 1.366867e-04
## 3060     9 65844 1.366867e-04
## 3061     9 65844 1.366867e-04
## 3062     9 65844 1.366867e-04
## 3063     9 65844 1.366867e-04
## 3064     9 65844 1.366867e-04
## 3065     9 65844 1.366867e-04
## 3066     9 65844 1.366867e-04
## 3067     9 65844 1.366867e-04
## 3068     9 65844 1.366867e-04
## 3069     9 65844 1.366867e-04
## 3070     9 65844 1.366867e-04
## 3071     9 65844 1.366867e-04
## 3072     9 65844 1.366867e-04
## 3073     9 65844 1.366867e-04
## 3074     9 65844 1.366867e-04
## 3075     9 65844 1.366867e-04
## 3076     9 65844 1.366867e-04
## 3077     9 65844 1.366867e-04
## 3078     9 65844 1.366867e-04
## 3079     9 65844 1.366867e-04
## 3080     9 65844 1.366867e-04
## 3081     9 65844 1.366867e-04
## 3082     9 65844 1.366867e-04
## 3083     9 65844 1.366867e-04
## 3084     9 65844 1.366867e-04
## 3085     9 65844 1.366867e-04
## 3086     9 65844 1.366867e-04
## 3087     9 65844 1.366867e-04
## 3088     9 65844 1.366867e-04
## 3089     9 65844 1.366867e-04
## 3090     9 65844 1.366867e-04
## 3091     9 65844 1.366867e-04
## 3092     9 65844 1.366867e-04
## 3093     9 65844 1.366867e-04
## 3094     9 65844 1.366867e-04
## 3095     9 65844 1.366867e-04
## 3096     9 65844 1.366867e-04
## 3097     9 65844 1.366867e-04
## 3098     9 65844 1.366867e-04
## 3099     9 65844 1.366867e-04
## 3100     9 65844 1.366867e-04
## 3101     9 65844 1.366867e-04
## 3102     9 65844 1.366867e-04
## 3103     9 65844 1.366867e-04
## 3104     9 65844 1.366867e-04
## 3105     9 65844 1.366867e-04
## 3106     9 65844 1.366867e-04
## 3107     9 65844 1.366867e-04
## 3108     9 65844 1.366867e-04
## 3109     9 65844 1.366867e-04
## 3110     9 65844 1.366867e-04
## 3111     9 65844 1.366867e-04
## 3112     9 65844 1.366867e-04
## 3113     9 65844 1.366867e-04
## 3114     9 65844 1.366867e-04
## 3115     9 65844 1.366867e-04
## 3116     9 65844 1.366867e-04
## 3117     9 65844 1.366867e-04
## 3118     9 65844 1.366867e-04
## 3119     9 65844 1.366867e-04
## 3120     9 65844 1.366867e-04
## 3121     9 65844 1.366867e-04
## 3122     9 65844 1.366867e-04
## 3123     9 65844 1.366867e-04
## 3124     9 65844 1.366867e-04
## 3125     9 65844 1.366867e-04
## 3126     9 65844 1.366867e-04
## 3127     9 65844 1.366867e-04
## 3128     9 65844 1.366867e-04
## 3129     9 65844 1.366867e-04
## 3130     9 65844 1.366867e-04
## 3131     9 65844 1.366867e-04
## 3132     9 65844 1.366867e-04
## 3133     9 65844 1.366867e-04
## 3134     9 65844 1.366867e-04
## 3135     9 65844 1.366867e-04
## 3136     9 65844 1.366867e-04
## 3137     9 65844 1.366867e-04
## 3138     9 65844 1.366867e-04
## 3139     9 65844 1.366867e-04
## 3140     9 65844 1.366867e-04
## 3141     9 65844 1.366867e-04
## 3142     9 65844 1.366867e-04
## 3143     9 65844 1.366867e-04
## 3144     9 65844 1.366867e-04
## 3145     9 65844 1.366867e-04
## 3146     9 65844 1.366867e-04
## 3147     9 65844 1.366867e-04
## 3148     9 65844 1.366867e-04
## 3149     9 65844 1.366867e-04
## 3150     9 65844 1.366867e-04
## 3151     9 65844 1.366867e-04
## 3152     9 65844 1.366867e-04
## 3153     9 65844 1.366867e-04
## 3154     9 65844 1.366867e-04
## 3155     9 65844 1.366867e-04
## 3156     9 65844 1.366867e-04
## 3157     9 65844 1.366867e-04
## 3158     9 65844 1.366867e-04
## 3159     9 65844 1.366867e-04
## 3160     9 65844 1.366867e-04
## 3161     9 65844 1.366867e-04
## 3162     9 65844 1.366867e-04
## 3163     9 65844 1.366867e-04
## 3164     9 65844 1.366867e-04
## 3165     9 65844 1.366867e-04
## 3166     9 65844 1.366867e-04
## 3167     9 65844 1.366867e-04
## 3168     9 65844 1.366867e-04
## 3169     9 65844 1.366867e-04
## 3170     9 65844 1.366867e-04
## 3171     9 65844 1.366867e-04
## 3172     9 65844 1.366867e-04
## 3173     9 65844 1.366867e-04
## 3174     9 65844 1.366867e-04
## 3175     9 65844 1.366867e-04
## 3176     9 65844 1.366867e-04
## 3177     9 55641 1.617512e-04
## 3178     9 55641 1.617512e-04
## 3179     9 55641 1.617512e-04
## 3180     9 55641 1.617512e-04
## 3181     9 55641 1.617512e-04
## 3182     9 55641 1.617512e-04
## 3183     9 55641 1.617512e-04
## 3184     9 55641 1.617512e-04
## 3185     9 55641 1.617512e-04
## 3186     9 55641 1.617512e-04
## 3187     9 55641 1.617512e-04
## 3188     9 55641 1.617512e-04
## 3189     9 55641 1.617512e-04
## 3190     9 55641 1.617512e-04
## 3191     9 55641 1.617512e-04
## 3192     9 55641 1.617512e-04
## 3193     9 55641 1.617512e-04
## 3194     9 55641 1.617512e-04
## 3195     9 55641 1.617512e-04
## 3196     9 55641 1.617512e-04
## 3197     9 55641 1.617512e-04
## 3198     9 55641 1.617512e-04
## 3199     9 55641 1.617512e-04
## 3200     9 55641 1.617512e-04
## 3201     9 55641 1.617512e-04
## 3202     9 55641 1.617512e-04
## 3203     9 55641 1.617512e-04
## 3204     9 55641 1.617512e-04
## 3205     9 55641 1.617512e-04
## 3206     9 55641 1.617512e-04
## 3207     9 55641 1.617512e-04
## 3208     9 55641 1.617512e-04
## 3209     9 55641 1.617512e-04
## 3210     9 55641 1.617512e-04
## 3211     9 55641 1.617512e-04
## 3212     9 55641 1.617512e-04
## 3213     9 55641 1.617512e-04
## 3214     9 55641 1.617512e-04
## 3215     9 55641 1.617512e-04
## 3216     9 55641 1.617512e-04
## 3217     9 55641 1.617512e-04
## 3218     9 55641 1.617512e-04
## 3219     9 55641 1.617512e-04
## 3220     9 55641 1.617512e-04
## 3221     9 55641 1.617512e-04
## 3222     9 55641 1.617512e-04
## 3223     9 55641 1.617512e-04
## 3224     9 55641 1.617512e-04
## 3225     9 55641 1.617512e-04
## 3226     9 55641 1.617512e-04
## 3227     9 55641 1.617512e-04
## 3228     9 55641 1.617512e-04
## 3229     9 55641 1.617512e-04
## 3230     9 55641 1.617512e-04
## 3231     9 55641 1.617512e-04
## 3232     9 55641 1.617512e-04
## 3233     9 55641 1.617512e-04
## 3234     9 55641 1.617512e-04
## 3235     9 55641 1.617512e-04
## 3236     9 55641 1.617512e-04
## 3237     9 55641 1.617512e-04
## 3238     9 55641 1.617512e-04
## 3239     9 55641 1.617512e-04
## 3240     9 55641 1.617512e-04
## 3241     9 55641 1.617512e-04
## 3242     9 55641 1.617512e-04
## 3243     9 55641 1.617512e-04
## 3244     9 55641 1.617512e-04
## 3245     9 55641 1.617512e-04
## 3246     9 55641 1.617512e-04
## 3247     9 55641 1.617512e-04
## 3248     9 55641 1.617512e-04
## 3249     9 55641 1.617512e-04
## 3250     9 55641 1.617512e-04
## 3251     9 55641 1.617512e-04
## 3252     9 55641 1.617512e-04
## 3253     9 55641 1.617512e-04
## 3254     9 55641 1.617512e-04
## 3255     9 55641 1.617512e-04
## 3256     9 55641 1.617512e-04
## 3257     9 55641 1.617512e-04
## 3258     9 55641 1.617512e-04
## 3259     9 55641 1.617512e-04
## 3260     9 55641 1.617512e-04
## 3261     9 55641 1.617512e-04
## 3262     9 55641 1.617512e-04
## 3263     9 55641 1.617512e-04
## 3264     9 55641 1.617512e-04
## 3265     9 55641 1.617512e-04
## 3266     9 55641 1.617512e-04
## 3267     9 55641 1.617512e-04
## 3268     9 55641 1.617512e-04
## 3269     9 55641 1.617512e-04
## 3270     9 55641 1.617512e-04
## 3271     9 55641 1.617512e-04
## 3272     9 55641 1.617512e-04
## 3273     9 55641 1.617512e-04
## 3274     9 55641 1.617512e-04
## 3275     9 55641 1.617512e-04
## 3276     9 55641 1.617512e-04
## 3277     9 55641 1.617512e-04
## 3278     9 55641 1.617512e-04
## 3279     9 55641 1.617512e-04
## 3280     9 55641 1.617512e-04
## 3281     9 55641 1.617512e-04
## 3282     9 55641 1.617512e-04
## 3283     9 55641 1.617512e-04
## 3284     8 66780 1.197963e-04
## 3285     8 66780 1.197963e-04
## 3286     8 66780 1.197963e-04
## 3287     8 66780 1.197963e-04
## 3288     8 66780 1.197963e-04
## 3289     8 66780 1.197963e-04
## 3290     8 66780 1.197963e-04
## 3291     8 66780 1.197963e-04
## 3292     8 66780 1.197963e-04
## 3293     8 66780 1.197963e-04
## 3294     8 66780 1.197963e-04
## 3295     8 66780 1.197963e-04
## 3296     8 66780 1.197963e-04
## 3297     8 66780 1.197963e-04
## 3298     8 66780 1.197963e-04
## 3299     8 66780 1.197963e-04
## 3300     8 66780 1.197963e-04
## 3301     8 66780 1.197963e-04
## 3302     8 66780 1.197963e-04
## 3303     8 66780 1.197963e-04
## 3304     8 66780 1.197963e-04
## 3305     8 66780 1.197963e-04
## 3306     8 66780 1.197963e-04
## 3307     8 66780 1.197963e-04
## 3308     8 66780 1.197963e-04
## 3309     8 66780 1.197963e-04
## 3310     8 66780 1.197963e-04
## 3311     8 66780 1.197963e-04
## 3312     8 66780 1.197963e-04
## 3313     8 66780 1.197963e-04
## 3314     8 66780 1.197963e-04
## 3315     8 66780 1.197963e-04
## 3316     8 66780 1.197963e-04
## 3317     8 66780 1.197963e-04
## 3318     8 66780 1.197963e-04
## 3319     8 66780 1.197963e-04
## 3320     8 66780 1.197963e-04
## 3321     8 66780 1.197963e-04
## 3322     8 66780 1.197963e-04
## 3323     8 66780 1.197963e-04
## 3324     8 66780 1.197963e-04
## 3325     8 66780 1.197963e-04
## 3326     8 66780 1.197963e-04
## 3327     8 66780 1.197963e-04
## 3328     8 66780 1.197963e-04
## 3329     8 66780 1.197963e-04
## 3330     8 66780 1.197963e-04
## 3331     8 66780 1.197963e-04
## 3332     8 66780 1.197963e-04
## 3333     8 66780 1.197963e-04
## 3334     8 66780 1.197963e-04
## 3335     8 66780 1.197963e-04
## 3336     8 66780 1.197963e-04
## 3337     8 66780 1.197963e-04
## 3338     8 66780 1.197963e-04
## 3339     8 66780 1.197963e-04
## 3340     8 66780 1.197963e-04
## 3341     8 66780 1.197963e-04
## 3342     8 66780 1.197963e-04
## 3343     8 66780 1.197963e-04
## 3344     8 66780 1.197963e-04
## 3345     8 66780 1.197963e-04
## 3346     8 66780 1.197963e-04
## 3347     8 66780 1.197963e-04
## 3348     8 66780 1.197963e-04
## 3349     8 66780 1.197963e-04
## 3350     8 66780 1.197963e-04
## 3351     8 66780 1.197963e-04
## 3352     8 66780 1.197963e-04
## 3353     8 66780 1.197963e-04
## 3354     8 66780 1.197963e-04
## 3355     8 66780 1.197963e-04
## 3356     8 66780 1.197963e-04
## 3357     8 66780 1.197963e-04
## 3358     8 66780 1.197963e-04
## 3359     8 66780 1.197963e-04
## 3360     8 66780 1.197963e-04
## 3361     8 66780 1.197963e-04
## 3362     8 66780 1.197963e-04
## 3363     8 66780 1.197963e-04
## 3364     8 66780 1.197963e-04
## 3365     8 66780 1.197963e-04
## 3366     8 66780 1.197963e-04
## 3367     8 66780 1.197963e-04
## 3368     8 66780 1.197963e-04
## 3369     8 66780 1.197963e-04
## 3370     8 66780 1.197963e-04
## 3371     8 66780 1.197963e-04
## 3372     8 66780 1.197963e-04
## 3373     8 66780 1.197963e-04
## 3374     8 66780 1.197963e-04
## 3375     8 66780 1.197963e-04
## 3376     8 66780 1.197963e-04
## 3377     8 66780 1.197963e-04
## 3378     8 66780 1.197963e-04
## 3379     8 66780 1.197963e-04
## 3380     8 66780 1.197963e-04
## 3381     8 66780 1.197963e-04
## 3382     8 66780 1.197963e-04
## 3383     8 66780 1.197963e-04
## 3384     8 66780 1.197963e-04
## 3385     8 66780 1.197963e-04
## 3386     8 66780 1.197963e-04
## 3387     8 66780 1.197963e-04
## 3388     8 66780 1.197963e-04
## 3389     8 66780 1.197963e-04
## 3390     8 66780 1.197963e-04
## 3391     8 66780 1.197963e-04
## 3392     8 66780 1.197963e-04
## 3393     8 66780 1.197963e-04
## 3394     8 66780 1.197963e-04
## 3395     8 66780 1.197963e-04
## 3396     8 66780 1.197963e-04
## 3397     8 66780 1.197963e-04
## 3398     8 66780 1.197963e-04
## 3399     8 66780 1.197963e-04
## 3400     8 66780 1.197963e-04
## 3401     8 66780 1.197963e-04
## 3402     8 66780 1.197963e-04
## 3403     8 66780 1.197963e-04
## 3404     8 66780 1.197963e-04
## 3405     8 66780 1.197963e-04
## 3406     8 66780 1.197963e-04
## 3407     8 66780 1.197963e-04
## 3408     8 66780 1.197963e-04
## 3409     8 66780 1.197963e-04
## 3410     8 66780 1.197963e-04
## 3411     8 66780 1.197963e-04
## 3412     8 66780 1.197963e-04
## 3413     8 66780 1.197963e-04
## 3414     8 66780 1.197963e-04
## 3415     8 66780 1.197963e-04
## 3416     8 66780 1.197963e-04
## 3417     8 66780 1.197963e-04
## 3418     8 66780 1.197963e-04
## 3419     8 66780 1.197963e-04
## 3420     8 66780 1.197963e-04
## 3421     8 66780 1.197963e-04
## 3422     8 66780 1.197963e-04
## 3423     8 66780 1.197963e-04
## 3424     8 66780 1.197963e-04
## 3425     8 66780 1.197963e-04
## 3426     8 66780 1.197963e-04
## 3427     8 66780 1.197963e-04
## 3428     8 66780 1.197963e-04
## 3429     8 66780 1.197963e-04
## 3430     8 66780 1.197963e-04
## 3431     8 66780 1.197963e-04
## 3432     8 66780 1.197963e-04
## 3433     8 65844 1.214993e-04
## 3434     8 65844 1.214993e-04
## 3435     8 65844 1.214993e-04
## 3436     8 65844 1.214993e-04
## 3437     8 65844 1.214993e-04
## 3438     8 65844 1.214993e-04
## 3439     8 65844 1.214993e-04
## 3440     8 65844 1.214993e-04
## 3441     8 65844 1.214993e-04
## 3442     8 65844 1.214993e-04
## 3443     8 65844 1.214993e-04
## 3444     8 65844 1.214993e-04
## 3445     8 65844 1.214993e-04
## 3446     8 65844 1.214993e-04
## 3447     8 65844 1.214993e-04
## 3448     8 65844 1.214993e-04
## 3449     8 65844 1.214993e-04
## 3450     8 65844 1.214993e-04
## 3451     8 65844 1.214993e-04
## 3452     8 65844 1.214993e-04
## 3453     8 65844 1.214993e-04
## 3454     8 65844 1.214993e-04
## 3455     8 65844 1.214993e-04
## 3456     8 65844 1.214993e-04
## 3457     8 65844 1.214993e-04
## 3458     8 65844 1.214993e-04
## 3459     8 65844 1.214993e-04
## 3460     8 65844 1.214993e-04
## 3461     8 65844 1.214993e-04
## 3462     8 65844 1.214993e-04
## 3463     8 65844 1.214993e-04
## 3464     8 65844 1.214993e-04
## 3465     8 65844 1.214993e-04
## 3466     8 65844 1.214993e-04
## 3467     8 65844 1.214993e-04
## 3468     8 65844 1.214993e-04
## 3469     8 65844 1.214993e-04
## 3470     8 65844 1.214993e-04
## 3471     8 65844 1.214993e-04
## 3472     8 65844 1.214993e-04
## 3473     8 65844 1.214993e-04
## 3474     8 65844 1.214993e-04
## 3475     8 65844 1.214993e-04
## 3476     8 65844 1.214993e-04
## 3477     8 65844 1.214993e-04
## 3478     8 65844 1.214993e-04
## 3479     8 65844 1.214993e-04
## 3480     8 65844 1.214993e-04
## 3481     8 65844 1.214993e-04
## 3482     8 65844 1.214993e-04
## 3483     8 65844 1.214993e-04
## 3484     8 65844 1.214993e-04
## 3485     8 65844 1.214993e-04
## 3486     8 65844 1.214993e-04
## 3487     8 65844 1.214993e-04
## 3488     8 65844 1.214993e-04
## 3489     8 65844 1.214993e-04
## 3490     8 65844 1.214993e-04
## 3491     8 65844 1.214993e-04
## 3492     8 65844 1.214993e-04
## 3493     8 65844 1.214993e-04
## 3494     8 65844 1.214993e-04
## 3495     8 65844 1.214993e-04
## 3496     8 65844 1.214993e-04
## 3497     8 65844 1.214993e-04
## 3498     8 65844 1.214993e-04
## 3499     8 65844 1.214993e-04
## 3500     8 65844 1.214993e-04
## 3501     8 65844 1.214993e-04
## 3502     8 65844 1.214993e-04
## 3503     8 65844 1.214993e-04
## 3504     8 65844 1.214993e-04
## 3505     8 65844 1.214993e-04
## 3506     8 65844 1.214993e-04
## 3507     8 65844 1.214993e-04
## 3508     8 65844 1.214993e-04
## 3509     8 65844 1.214993e-04
## 3510     8 65844 1.214993e-04
## 3511     8 65844 1.214993e-04
## 3512     8 65844 1.214993e-04
## 3513     8 65844 1.214993e-04
## 3514     8 65844 1.214993e-04
## 3515     8 65844 1.214993e-04
## 3516     8 65844 1.214993e-04
## 3517     8 65844 1.214993e-04
## 3518     8 65844 1.214993e-04
## 3519     8 65844 1.214993e-04
## 3520     8 65844 1.214993e-04
## 3521     8 65844 1.214993e-04
## 3522     8 65844 1.214993e-04
## 3523     8 65844 1.214993e-04
## 3524     8 65844 1.214993e-04
## 3525     8 65844 1.214993e-04
## 3526     8 65844 1.214993e-04
## 3527     8 65844 1.214993e-04
## 3528     8 65844 1.214993e-04
## 3529     8 65844 1.214993e-04
## 3530     8 65844 1.214993e-04
## 3531     8 65844 1.214993e-04
## 3532     8 65844 1.214993e-04
## 3533     8 65844 1.214993e-04
## 3534     8 65844 1.214993e-04
## 3535     8 65844 1.214993e-04
## 3536     8 65844 1.214993e-04
## 3537     8 65844 1.214993e-04
## 3538     8 65844 1.214993e-04
## 3539     8 65844 1.214993e-04
## 3540     8 65844 1.214993e-04
## 3541     8 65844 1.214993e-04
## 3542     8 65844 1.214993e-04
## 3543     8 65844 1.214993e-04
## 3544     8 65844 1.214993e-04
## 3545     8 65844 1.214993e-04
## 3546     8 65844 1.214993e-04
## 3547     8 65844 1.214993e-04
## 3548     8 65844 1.214993e-04
## 3549     8 65844 1.214993e-04
## 3550     8 65844 1.214993e-04
## 3551     8 65844 1.214993e-04
## 3552     8 65844 1.214993e-04
## 3553     8 65844 1.214993e-04
## 3554     8 65844 1.214993e-04
## 3555     8 65844 1.214993e-04
## 3556     8 65844 1.214993e-04
## 3557     8 65844 1.214993e-04
## 3558     8 65844 1.214993e-04
## 3559     8 65844 1.214993e-04
## 3560     8 65844 1.214993e-04
## 3561     8 65844 1.214993e-04
## 3562     8 65844 1.214993e-04
## 3563     8 65844 1.214993e-04
## 3564     8 65844 1.214993e-04
## 3565     8 65844 1.214993e-04
## 3566     8 65844 1.214993e-04
## 3567     8 65844 1.214993e-04
## 3568     8 65844 1.214993e-04
## 3569     8 65844 1.214993e-04
## 3570     8 65844 1.214993e-04
## 3571     8 65844 1.214993e-04
## 3572     8 65844 1.214993e-04
## 3573     8 65844 1.214993e-04
## 3574     8 65844 1.214993e-04
## 3575     8 65844 1.214993e-04
## 3576     8 65844 1.214993e-04
## 3577     8 65844 1.214993e-04
## 3578     8 65844 1.214993e-04
## 3579     8 65844 1.214993e-04
## 3580     8 65844 1.214993e-04
## 3581     8 65844 1.214993e-04
## 3582     8 65844 1.214993e-04
## 3583     8 65844 1.214993e-04
## 3584     8 65844 1.214993e-04
## 3585     8 65844 1.214993e-04
## 3586     8 55641 1.437789e-04
## 3587     8 55641 1.437789e-04
## 3588     8 55641 1.437789e-04
## 3589     8 55641 1.437789e-04
## 3590     8 55641 1.437789e-04
## 3591     8 55641 1.437789e-04
## 3592     8 55641 1.437789e-04
## 3593     8 55641 1.437789e-04
## 3594     8 55641 1.437789e-04
## 3595     8 55641 1.437789e-04
## 3596     8 55641 1.437789e-04
## 3597     8 55641 1.437789e-04
## 3598     8 55641 1.437789e-04
## 3599     8 55641 1.437789e-04
## 3600     8 55641 1.437789e-04
## 3601     8 55641 1.437789e-04
## 3602     8 55641 1.437789e-04
## 3603     8 55641 1.437789e-04
## 3604     8 55641 1.437789e-04
## 3605     8 55641 1.437789e-04
## 3606     8 55641 1.437789e-04
## 3607     8 55641 1.437789e-04
## 3608     8 55641 1.437789e-04
## 3609     8 55641 1.437789e-04
## 3610     8 55641 1.437789e-04
## 3611     8 55641 1.437789e-04
## 3612     8 55641 1.437789e-04
## 3613     8 55641 1.437789e-04
## 3614     8 55641 1.437789e-04
## 3615     8 55641 1.437789e-04
## 3616     8 55641 1.437789e-04
## 3617     8 55641 1.437789e-04
## 3618     8 55641 1.437789e-04
## 3619     8 55641 1.437789e-04
## 3620     8 55641 1.437789e-04
## 3621     8 55641 1.437789e-04
## 3622     8 55641 1.437789e-04
## 3623     8 55641 1.437789e-04
## 3624     8 55641 1.437789e-04
## 3625     8 55641 1.437789e-04
## 3626     8 55641 1.437789e-04
## 3627     8 55641 1.437789e-04
## 3628     8 55641 1.437789e-04
## 3629     8 55641 1.437789e-04
## 3630     8 55641 1.437789e-04
## 3631     8 55641 1.437789e-04
## 3632     8 55641 1.437789e-04
## 3633     8 55641 1.437789e-04
## 3634     8 55641 1.437789e-04
## 3635     8 55641 1.437789e-04
## 3636     8 55641 1.437789e-04
## 3637     8 55641 1.437789e-04
## 3638     8 55641 1.437789e-04
## 3639     8 55641 1.437789e-04
## 3640     8 55641 1.437789e-04
## 3641     8 55641 1.437789e-04
## 3642     8 55641 1.437789e-04
## 3643     8 55641 1.437789e-04
## 3644     8 55641 1.437789e-04
## 3645     8 55641 1.437789e-04
## 3646     8 55641 1.437789e-04
## 3647     8 55641 1.437789e-04
## 3648     8 55641 1.437789e-04
## 3649     8 55641 1.437789e-04
## 3650     8 55641 1.437789e-04
## 3651     8 55641 1.437789e-04
## 3652     8 55641 1.437789e-04
## 3653     8 55641 1.437789e-04
## 3654     8 55641 1.437789e-04
## 3655     8 55641 1.437789e-04
## 3656     8 55641 1.437789e-04
## 3657     8 55641 1.437789e-04
## 3658     8 55641 1.437789e-04
## 3659     8 55641 1.437789e-04
## 3660     8 55641 1.437789e-04
## 3661     8 55641 1.437789e-04
## 3662     8 55641 1.437789e-04
## 3663     8 55641 1.437789e-04
## 3664     8 55641 1.437789e-04
## 3665     8 55641 1.437789e-04
## 3666     8 55641 1.437789e-04
## 3667     8 55641 1.437789e-04
## 3668     8 55641 1.437789e-04
## 3669     8 55641 1.437789e-04
## 3670     8 55641 1.437789e-04
## 3671     8 55641 1.437789e-04
## 3672     8 55641 1.437789e-04
## 3673     8 55641 1.437789e-04
## 3674     8 55641 1.437789e-04
## 3675     8 55641 1.437789e-04
## 3676     8 55641 1.437789e-04
## 3677     8 55641 1.437789e-04
## 3678     8 55641 1.437789e-04
## 3679     8 55641 1.437789e-04
## 3680     8 55641 1.437789e-04
## 3681     8 55641 1.437789e-04
## 3682     8 55641 1.437789e-04
## 3683     8 55641 1.437789e-04
## 3684     8 55641 1.437789e-04
## 3685     8 55641 1.437789e-04
## 3686     8 55641 1.437789e-04
## 3687     8 55641 1.437789e-04
## 3688     8 55641 1.437789e-04
## 3689     8 55641 1.437789e-04
## 3690     8 55641 1.437789e-04
## 3691     8 55641 1.437789e-04
## 3692     8 55641 1.437789e-04
## 3693     8 55641 1.437789e-04
## 3694     8 55641 1.437789e-04
## 3695     8 55641 1.437789e-04
## 3696     8 55641 1.437789e-04
## 3697     8 55641 1.437789e-04
## 3698     8 55641 1.437789e-04
## 3699     8 55641 1.437789e-04
## 3700     8 55641 1.437789e-04
## 3701     8 55641 1.437789e-04
## 3702     8 55641 1.437789e-04
## 3703     8 55641 1.437789e-04
## 3704     8 55641 1.437789e-04
## 3705     8 55641 1.437789e-04
## 3706     8 55641 1.437789e-04
## 3707     8 55641 1.437789e-04
## 3708     8 55641 1.437789e-04
## 3709     8 55641 1.437789e-04
## 3710     8 55641 1.437789e-04
## 3711     8 55641 1.437789e-04
## 3712     8 55641 1.437789e-04
## 3713     8 55641 1.437789e-04
## 3714     8 55641 1.437789e-04
## 3715     8 55641 1.437789e-04
## 3716     8 55641 1.437789e-04
## 3717     8 55641 1.437789e-04
## 3718     7 66780 1.048218e-04
## 3719     7 66780 1.048218e-04
## 3720     7 66780 1.048218e-04
## 3721     7 66780 1.048218e-04
## 3722     7 66780 1.048218e-04
## 3723     7 66780 1.048218e-04
## 3724     7 66780 1.048218e-04
## 3725     7 66780 1.048218e-04
## 3726     7 66780 1.048218e-04
## 3727     7 66780 1.048218e-04
## 3728     7 66780 1.048218e-04
## 3729     7 66780 1.048218e-04
## 3730     7 66780 1.048218e-04
## 3731     7 66780 1.048218e-04
## 3732     7 66780 1.048218e-04
## 3733     7 66780 1.048218e-04
## 3734     7 66780 1.048218e-04
## 3735     7 66780 1.048218e-04
## 3736     7 66780 1.048218e-04
## 3737     7 66780 1.048218e-04
## 3738     7 66780 1.048218e-04
## 3739     7 66780 1.048218e-04
## 3740     7 66780 1.048218e-04
## 3741     7 66780 1.048218e-04
## 3742     7 66780 1.048218e-04
## 3743     7 66780 1.048218e-04
## 3744     7 66780 1.048218e-04
## 3745     7 66780 1.048218e-04
## 3746     7 66780 1.048218e-04
## 3747     7 66780 1.048218e-04
## 3748     7 66780 1.048218e-04
## 3749     7 66780 1.048218e-04
## 3750     7 66780 1.048218e-04
## 3751     7 66780 1.048218e-04
## 3752     7 66780 1.048218e-04
## 3753     7 66780 1.048218e-04
## 3754     7 66780 1.048218e-04
## 3755     7 66780 1.048218e-04
## 3756     7 66780 1.048218e-04
## 3757     7 66780 1.048218e-04
## 3758     7 66780 1.048218e-04
## 3759     7 66780 1.048218e-04
## 3760     7 66780 1.048218e-04
## 3761     7 66780 1.048218e-04
## 3762     7 66780 1.048218e-04
## 3763     7 66780 1.048218e-04
## 3764     7 66780 1.048218e-04
## 3765     7 66780 1.048218e-04
## 3766     7 66780 1.048218e-04
## 3767     7 66780 1.048218e-04
## 3768     7 66780 1.048218e-04
## 3769     7 66780 1.048218e-04
## 3770     7 66780 1.048218e-04
## 3771     7 66780 1.048218e-04
## 3772     7 66780 1.048218e-04
## 3773     7 66780 1.048218e-04
## 3774     7 66780 1.048218e-04
## 3775     7 66780 1.048218e-04
## 3776     7 66780 1.048218e-04
## 3777     7 66780 1.048218e-04
## 3778     7 66780 1.048218e-04
## 3779     7 66780 1.048218e-04
## 3780     7 66780 1.048218e-04
## 3781     7 66780 1.048218e-04
## 3782     7 66780 1.048218e-04
## 3783     7 66780 1.048218e-04
## 3784     7 66780 1.048218e-04
## 3785     7 66780 1.048218e-04
## 3786     7 66780 1.048218e-04
## 3787     7 66780 1.048218e-04
## 3788     7 66780 1.048218e-04
## 3789     7 66780 1.048218e-04
## 3790     7 66780 1.048218e-04
## 3791     7 66780 1.048218e-04
## 3792     7 66780 1.048218e-04
## 3793     7 66780 1.048218e-04
## 3794     7 66780 1.048218e-04
## 3795     7 66780 1.048218e-04
## 3796     7 66780 1.048218e-04
## 3797     7 66780 1.048218e-04
## 3798     7 66780 1.048218e-04
## 3799     7 66780 1.048218e-04
## 3800     7 66780 1.048218e-04
## 3801     7 66780 1.048218e-04
## 3802     7 66780 1.048218e-04
## 3803     7 66780 1.048218e-04
## 3804     7 66780 1.048218e-04
## 3805     7 66780 1.048218e-04
## 3806     7 66780 1.048218e-04
## 3807     7 66780 1.048218e-04
## 3808     7 66780 1.048218e-04
## 3809     7 66780 1.048218e-04
## 3810     7 66780 1.048218e-04
## 3811     7 66780 1.048218e-04
## 3812     7 66780 1.048218e-04
## 3813     7 66780 1.048218e-04
## 3814     7 66780 1.048218e-04
## 3815     7 66780 1.048218e-04
## 3816     7 66780 1.048218e-04
## 3817     7 66780 1.048218e-04
## 3818     7 66780 1.048218e-04
## 3819     7 66780 1.048218e-04
## 3820     7 66780 1.048218e-04
## 3821     7 66780 1.048218e-04
## 3822     7 66780 1.048218e-04
## 3823     7 66780 1.048218e-04
## 3824     7 66780 1.048218e-04
## 3825     7 66780 1.048218e-04
## 3826     7 66780 1.048218e-04
## 3827     7 66780 1.048218e-04
## 3828     7 66780 1.048218e-04
## 3829     7 66780 1.048218e-04
## 3830     7 66780 1.048218e-04
## 3831     7 66780 1.048218e-04
## 3832     7 66780 1.048218e-04
## 3833     7 66780 1.048218e-04
## 3834     7 66780 1.048218e-04
## 3835     7 66780 1.048218e-04
## 3836     7 66780 1.048218e-04
## 3837     7 66780 1.048218e-04
## 3838     7 66780 1.048218e-04
## 3839     7 66780 1.048218e-04
## 3840     7 66780 1.048218e-04
## 3841     7 66780 1.048218e-04
## 3842     7 66780 1.048218e-04
## 3843     7 66780 1.048218e-04
## 3844     7 66780 1.048218e-04
## 3845     7 66780 1.048218e-04
## 3846     7 66780 1.048218e-04
## 3847     7 66780 1.048218e-04
## 3848     7 66780 1.048218e-04
## 3849     7 66780 1.048218e-04
## 3850     7 66780 1.048218e-04
## 3851     7 66780 1.048218e-04
## 3852     7 66780 1.048218e-04
## 3853     7 66780 1.048218e-04
## 3854     7 66780 1.048218e-04
## 3855     7 66780 1.048218e-04
## 3856     7 66780 1.048218e-04
## 3857     7 66780 1.048218e-04
## 3858     7 66780 1.048218e-04
## 3859     7 66780 1.048218e-04
## 3860     7 66780 1.048218e-04
## 3861     7 66780 1.048218e-04
## 3862     7 66780 1.048218e-04
## 3863     7 66780 1.048218e-04
## 3864     7 66780 1.048218e-04
## 3865     7 66780 1.048218e-04
## 3866     7 66780 1.048218e-04
## 3867     7 66780 1.048218e-04
## 3868     7 66780 1.048218e-04
## 3869     7 66780 1.048218e-04
## 3870     7 66780 1.048218e-04
## 3871     7 66780 1.048218e-04
## 3872     7 66780 1.048218e-04
## 3873     7 66780 1.048218e-04
## 3874     7 66780 1.048218e-04
## 3875     7 66780 1.048218e-04
## 3876     7 66780 1.048218e-04
## 3877     7 66780 1.048218e-04
## 3878     7 66780 1.048218e-04
## 3879     7 66780 1.048218e-04
## 3880     7 66780 1.048218e-04
## 3881     7 66780 1.048218e-04
## 3882     7 66780 1.048218e-04
## 3883     7 66780 1.048218e-04
## 3884     7 66780 1.048218e-04
## 3885     7 66780 1.048218e-04
## 3886     7 66780 1.048218e-04
## 3887     7 66780 1.048218e-04
## 3888     7 66780 1.048218e-04
## 3889     7 66780 1.048218e-04
## 3890     7 66780 1.048218e-04
## 3891     7 66780 1.048218e-04
## 3892     7 66780 1.048218e-04
## 3893     7 66780 1.048218e-04
## 3894     7 66780 1.048218e-04
## 3895     7 66780 1.048218e-04
## 3896     7 66780 1.048218e-04
## 3897     7 66780 1.048218e-04
## 3898     7 66780 1.048218e-04
## 3899     7 66780 1.048218e-04
## 3900     7 66780 1.048218e-04
## 3901     7 66780 1.048218e-04
## 3902     7 66780 1.048218e-04
## 3903     7 66780 1.048218e-04
## 3904     7 66780 1.048218e-04
## 3905     7 66780 1.048218e-04
## 3906     7 66780 1.048218e-04
## 3907     7 66780 1.048218e-04
## 3908     7 66780 1.048218e-04
## 3909     7 66780 1.048218e-04
## 3910     7 66780 1.048218e-04
## 3911     7 66780 1.048218e-04
## 3912     7 66780 1.048218e-04
## 3913     7 66780 1.048218e-04
## 3914     7 66780 1.048218e-04
## 3915     7 66780 1.048218e-04
## 3916     7 66780 1.048218e-04
## 3917     7 66780 1.048218e-04
## 3918     7 66780 1.048218e-04
## 3919     7 66780 1.048218e-04
## 3920     7 66780 1.048218e-04
## 3921     7 66780 1.048218e-04
## 3922     7 66780 1.048218e-04
## 3923     7 66780 1.048218e-04
## 3924     7 66780 1.048218e-04
## 3925     7 66780 1.048218e-04
## 3926     7 66780 1.048218e-04
## 3927     7 66780 1.048218e-04
## 3928     7 66780 1.048218e-04
## 3929     7 66780 1.048218e-04
## 3930     7 66780 1.048218e-04
## 3931     7 66780 1.048218e-04
## 3932     7 66780 1.048218e-04
## 3933     7 66780 1.048218e-04
## 3934     7 66780 1.048218e-04
## 3935     7 66780 1.048218e-04
## 3936     7 66780 1.048218e-04
## 3937     7 66780 1.048218e-04
## 3938     7 66780 1.048218e-04
## 3939     7 66780 1.048218e-04
## 3940     7 66780 1.048218e-04
## 3941     7 66780 1.048218e-04
## 3942     7 65844 1.063119e-04
## 3943     7 65844 1.063119e-04
## 3944     7 65844 1.063119e-04
## 3945     7 65844 1.063119e-04
## 3946     7 65844 1.063119e-04
## 3947     7 65844 1.063119e-04
## 3948     7 65844 1.063119e-04
## 3949     7 65844 1.063119e-04
## 3950     7 65844 1.063119e-04
## 3951     7 65844 1.063119e-04
## 3952     7 65844 1.063119e-04
## 3953     7 65844 1.063119e-04
## 3954     7 65844 1.063119e-04
## 3955     7 65844 1.063119e-04
## 3956     7 65844 1.063119e-04
## 3957     7 65844 1.063119e-04
## 3958     7 65844 1.063119e-04
## 3959     7 65844 1.063119e-04
## 3960     7 65844 1.063119e-04
## 3961     7 65844 1.063119e-04
## 3962     7 65844 1.063119e-04
## 3963     7 65844 1.063119e-04
## 3964     7 65844 1.063119e-04
## 3965     7 65844 1.063119e-04
## 3966     7 65844 1.063119e-04
## 3967     7 65844 1.063119e-04
## 3968     7 65844 1.063119e-04
## 3969     7 65844 1.063119e-04
## 3970     7 65844 1.063119e-04
## 3971     7 65844 1.063119e-04
## 3972     7 65844 1.063119e-04
## 3973     7 65844 1.063119e-04
## 3974     7 65844 1.063119e-04
## 3975     7 65844 1.063119e-04
## 3976     7 65844 1.063119e-04
## 3977     7 65844 1.063119e-04
## 3978     7 65844 1.063119e-04
## 3979     7 65844 1.063119e-04
## 3980     7 65844 1.063119e-04
## 3981     7 65844 1.063119e-04
## 3982     7 65844 1.063119e-04
## 3983     7 65844 1.063119e-04
## 3984     7 65844 1.063119e-04
## 3985     7 65844 1.063119e-04
## 3986     7 65844 1.063119e-04
## 3987     7 65844 1.063119e-04
## 3988     7 65844 1.063119e-04
## 3989     7 65844 1.063119e-04
## 3990     7 65844 1.063119e-04
## 3991     7 65844 1.063119e-04
## 3992     7 65844 1.063119e-04
## 3993     7 65844 1.063119e-04
## 3994     7 65844 1.063119e-04
## 3995     7 65844 1.063119e-04
## 3996     7 65844 1.063119e-04
## 3997     7 65844 1.063119e-04
## 3998     7 65844 1.063119e-04
## 3999     7 65844 1.063119e-04
## 4000     7 65844 1.063119e-04
## 4001     7 65844 1.063119e-04
## 4002     7 65844 1.063119e-04
## 4003     7 65844 1.063119e-04
## 4004     7 65844 1.063119e-04
## 4005     7 65844 1.063119e-04
## 4006     7 65844 1.063119e-04
## 4007     7 65844 1.063119e-04
## 4008     7 65844 1.063119e-04
## 4009     7 65844 1.063119e-04
## 4010     7 65844 1.063119e-04
## 4011     7 65844 1.063119e-04
## 4012     7 65844 1.063119e-04
## 4013     7 65844 1.063119e-04
## 4014     7 65844 1.063119e-04
## 4015     7 65844 1.063119e-04
## 4016     7 65844 1.063119e-04
## 4017     7 65844 1.063119e-04
## 4018     7 65844 1.063119e-04
## 4019     7 65844 1.063119e-04
## 4020     7 65844 1.063119e-04
## 4021     7 65844 1.063119e-04
## 4022     7 65844 1.063119e-04
## 4023     7 65844 1.063119e-04
## 4024     7 65844 1.063119e-04
## 4025     7 65844 1.063119e-04
## 4026     7 65844 1.063119e-04
## 4027     7 65844 1.063119e-04
## 4028     7 65844 1.063119e-04
## 4029     7 65844 1.063119e-04
## 4030     7 65844 1.063119e-04
## 4031     7 65844 1.063119e-04
## 4032     7 65844 1.063119e-04
## 4033     7 65844 1.063119e-04
## 4034     7 65844 1.063119e-04
## 4035     7 65844 1.063119e-04
## 4036     7 65844 1.063119e-04
## 4037     7 65844 1.063119e-04
## 4038     7 65844 1.063119e-04
## 4039     7 65844 1.063119e-04
## 4040     7 65844 1.063119e-04
## 4041     7 65844 1.063119e-04
## 4042     7 65844 1.063119e-04
## 4043     7 65844 1.063119e-04
## 4044     7 65844 1.063119e-04
## 4045     7 65844 1.063119e-04
## 4046     7 65844 1.063119e-04
## 4047     7 65844 1.063119e-04
## 4048     7 65844 1.063119e-04
## 4049     7 65844 1.063119e-04
## 4050     7 65844 1.063119e-04
## 4051     7 65844 1.063119e-04
## 4052     7 65844 1.063119e-04
## 4053     7 65844 1.063119e-04
## 4054     7 65844 1.063119e-04
## 4055     7 65844 1.063119e-04
## 4056     7 65844 1.063119e-04
## 4057     7 65844 1.063119e-04
## 4058     7 65844 1.063119e-04
## 4059     7 65844 1.063119e-04
## 4060     7 65844 1.063119e-04
## 4061     7 65844 1.063119e-04
## 4062     7 65844 1.063119e-04
## 4063     7 65844 1.063119e-04
## 4064     7 65844 1.063119e-04
## 4065     7 65844 1.063119e-04
## 4066     7 65844 1.063119e-04
## 4067     7 65844 1.063119e-04
## 4068     7 65844 1.063119e-04
## 4069     7 65844 1.063119e-04
## 4070     7 65844 1.063119e-04
## 4071     7 65844 1.063119e-04
## 4072     7 65844 1.063119e-04
## 4073     7 65844 1.063119e-04
## 4074     7 65844 1.063119e-04
## 4075     7 65844 1.063119e-04
## 4076     7 65844 1.063119e-04
## 4077     7 65844 1.063119e-04
## 4078     7 65844 1.063119e-04
## 4079     7 65844 1.063119e-04
## 4080     7 65844 1.063119e-04
## 4081     7 65844 1.063119e-04
## 4082     7 65844 1.063119e-04
## 4083     7 65844 1.063119e-04
## 4084     7 65844 1.063119e-04
## 4085     7 65844 1.063119e-04
## 4086     7 65844 1.063119e-04
## 4087     7 65844 1.063119e-04
## 4088     7 65844 1.063119e-04
## 4089     7 65844 1.063119e-04
## 4090     7 65844 1.063119e-04
## 4091     7 65844 1.063119e-04
## 4092     7 65844 1.063119e-04
## 4093     7 65844 1.063119e-04
## 4094     7 65844 1.063119e-04
## 4095     7 65844 1.063119e-04
## 4096     7 65844 1.063119e-04
## 4097     7 65844 1.063119e-04
## 4098     7 65844 1.063119e-04
## 4099     7 65844 1.063119e-04
## 4100     7 65844 1.063119e-04
## 4101     7 65844 1.063119e-04
## 4102     7 65844 1.063119e-04
## 4103     7 65844 1.063119e-04
## 4104     7 65844 1.063119e-04
## 4105     7 65844 1.063119e-04
## 4106     7 65844 1.063119e-04
## 4107     7 65844 1.063119e-04
## 4108     7 65844 1.063119e-04
## 4109     7 65844 1.063119e-04
## 4110     7 65844 1.063119e-04
## 4111     7 65844 1.063119e-04
## 4112     7 65844 1.063119e-04
## 4113     7 65844 1.063119e-04
## 4114     7 65844 1.063119e-04
## 4115     7 65844 1.063119e-04
## 4116     7 65844 1.063119e-04
## 4117     7 65844 1.063119e-04
## 4118     7 65844 1.063119e-04
## 4119     7 65844 1.063119e-04
## 4120     7 65844 1.063119e-04
## 4121     7 65844 1.063119e-04
## 4122     7 65844 1.063119e-04
## 4123     7 65844 1.063119e-04
## 4124     7 65844 1.063119e-04
## 4125     7 65844 1.063119e-04
## 4126     7 65844 1.063119e-04
## 4127     7 65844 1.063119e-04
## 4128     7 65844 1.063119e-04
## 4129     7 55641 1.258065e-04
## 4130     7 55641 1.258065e-04
## 4131     7 55641 1.258065e-04
## 4132     7 55641 1.258065e-04
## 4133     7 55641 1.258065e-04
## 4134     7 55641 1.258065e-04
## 4135     7 55641 1.258065e-04
## 4136     7 55641 1.258065e-04
## 4137     7 55641 1.258065e-04
## 4138     7 55641 1.258065e-04
## 4139     7 55641 1.258065e-04
## 4140     7 55641 1.258065e-04
## 4141     7 55641 1.258065e-04
## 4142     7 55641 1.258065e-04
## 4143     7 55641 1.258065e-04
## 4144     7 55641 1.258065e-04
## 4145     7 55641 1.258065e-04
## 4146     7 55641 1.258065e-04
## 4147     7 55641 1.258065e-04
## 4148     7 55641 1.258065e-04
## 4149     7 55641 1.258065e-04
## 4150     7 55641 1.258065e-04
## 4151     7 55641 1.258065e-04
## 4152     7 55641 1.258065e-04
## 4153     7 55641 1.258065e-04
## 4154     7 55641 1.258065e-04
## 4155     7 55641 1.258065e-04
## 4156     7 55641 1.258065e-04
## 4157     7 55641 1.258065e-04
## 4158     7 55641 1.258065e-04
## 4159     7 55641 1.258065e-04
## 4160     7 55641 1.258065e-04
## 4161     7 55641 1.258065e-04
## 4162     7 55641 1.258065e-04
## 4163     7 55641 1.258065e-04
## 4164     7 55641 1.258065e-04
## 4165     7 55641 1.258065e-04
## 4166     7 55641 1.258065e-04
## 4167     7 55641 1.258065e-04
## 4168     7 55641 1.258065e-04
## 4169     7 55641 1.258065e-04
## 4170     7 55641 1.258065e-04
## 4171     7 55641 1.258065e-04
## 4172     7 55641 1.258065e-04
## 4173     7 55641 1.258065e-04
## 4174     7 55641 1.258065e-04
## 4175     7 55641 1.258065e-04
## 4176     7 55641 1.258065e-04
## 4177     7 55641 1.258065e-04
## 4178     7 55641 1.258065e-04
## 4179     7 55641 1.258065e-04
## 4180     7 55641 1.258065e-04
## 4181     7 55641 1.258065e-04
## 4182     7 55641 1.258065e-04
## 4183     7 55641 1.258065e-04
## 4184     7 55641 1.258065e-04
## 4185     7 55641 1.258065e-04
## 4186     7 55641 1.258065e-04
## 4187     7 55641 1.258065e-04
## 4188     7 55641 1.258065e-04
## 4189     7 55641 1.258065e-04
## 4190     7 55641 1.258065e-04
## 4191     7 55641 1.258065e-04
## 4192     7 55641 1.258065e-04
## 4193     7 55641 1.258065e-04
## 4194     7 55641 1.258065e-04
## 4195     7 55641 1.258065e-04
## 4196     7 55641 1.258065e-04
## 4197     7 55641 1.258065e-04
## 4198     7 55641 1.258065e-04
## 4199     7 55641 1.258065e-04
## 4200     7 55641 1.258065e-04
## 4201     7 55641 1.258065e-04
## 4202     7 55641 1.258065e-04
## 4203     7 55641 1.258065e-04
## 4204     7 55641 1.258065e-04
## 4205     7 55641 1.258065e-04
## 4206     7 55641 1.258065e-04
## 4207     7 55641 1.258065e-04
## 4208     7 55641 1.258065e-04
## 4209     7 55641 1.258065e-04
## 4210     7 55641 1.258065e-04
## 4211     7 55641 1.258065e-04
## 4212     7 55641 1.258065e-04
## 4213     7 55641 1.258065e-04
## 4214     7 55641 1.258065e-04
## 4215     7 55641 1.258065e-04
## 4216     7 55641 1.258065e-04
## 4217     7 55641 1.258065e-04
## 4218     7 55641 1.258065e-04
## 4219     7 55641 1.258065e-04
## 4220     7 55641 1.258065e-04
## 4221     7 55641 1.258065e-04
## 4222     7 55641 1.258065e-04
## 4223     7 55641 1.258065e-04
## 4224     7 55641 1.258065e-04
## 4225     7 55641 1.258065e-04
## 4226     7 55641 1.258065e-04
## 4227     7 55641 1.258065e-04
## 4228     7 55641 1.258065e-04
## 4229     7 55641 1.258065e-04
## 4230     7 55641 1.258065e-04
## 4231     7 55641 1.258065e-04
## 4232     7 55641 1.258065e-04
## 4233     7 55641 1.258065e-04
## 4234     7 55641 1.258065e-04
## 4235     7 55641 1.258065e-04
## 4236     7 55641 1.258065e-04
## 4237     7 55641 1.258065e-04
## 4238     7 55641 1.258065e-04
## 4239     7 55641 1.258065e-04
## 4240     7 55641 1.258065e-04
## 4241     7 55641 1.258065e-04
## 4242     7 55641 1.258065e-04
## 4243     7 55641 1.258065e-04
## 4244     7 55641 1.258065e-04
## 4245     7 55641 1.258065e-04
## 4246     7 55641 1.258065e-04
## 4247     7 55641 1.258065e-04
## 4248     7 55641 1.258065e-04
## 4249     7 55641 1.258065e-04
## 4250     7 55641 1.258065e-04
## 4251     7 55641 1.258065e-04
## 4252     7 55641 1.258065e-04
## 4253     7 55641 1.258065e-04
## 4254     7 55641 1.258065e-04
## 4255     7 55641 1.258065e-04
## 4256     7 55641 1.258065e-04
## 4257     7 55641 1.258065e-04
## 4258     7 55641 1.258065e-04
## 4259     7 55641 1.258065e-04
## 4260     7 55641 1.258065e-04
## 4261     7 55641 1.258065e-04
## 4262     7 55641 1.258065e-04
## 4263     7 55641 1.258065e-04
## 4264     7 55641 1.258065e-04
## 4265     7 55641 1.258065e-04
## 4266     7 55641 1.258065e-04
## 4267     7 55641 1.258065e-04
## 4268     7 55641 1.258065e-04
## 4269     7 55641 1.258065e-04
## 4270     7 55641 1.258065e-04
## 4271     7 55641 1.258065e-04
## 4272     7 55641 1.258065e-04
## 4273     7 55641 1.258065e-04
## 4274     7 55641 1.258065e-04
## 4275     7 55641 1.258065e-04
## 4276     7 55641 1.258065e-04
## 4277     7 55641 1.258065e-04
## 4278     7 55641 1.258065e-04
## 4279     7 55641 1.258065e-04
## 4280     7 55641 1.258065e-04
## 4281     7 55641 1.258065e-04
## 4282     7 55641 1.258065e-04
## 4283     7 55641 1.258065e-04
## 4284     7 55641 1.258065e-04
## 4285     7 55641 1.258065e-04
## 4286     7 55641 1.258065e-04
## 4287     7 55641 1.258065e-04
## 4288     6 66780 8.984726e-05
## 4289     6 66780 8.984726e-05
## 4290     6 66780 8.984726e-05
## 4291     6 66780 8.984726e-05
## 4292     6 66780 8.984726e-05
## 4293     6 66780 8.984726e-05
## 4294     6 66780 8.984726e-05
## 4295     6 66780 8.984726e-05
## 4296     6 66780 8.984726e-05
## 4297     6 66780 8.984726e-05
## 4298     6 66780 8.984726e-05
## 4299     6 66780 8.984726e-05
## 4300     6 66780 8.984726e-05
## 4301     6 66780 8.984726e-05
## 4302     6 66780 8.984726e-05
## 4303     6 66780 8.984726e-05
## 4304     6 66780 8.984726e-05
## 4305     6 66780 8.984726e-05
## 4306     6 66780 8.984726e-05
## 4307     6 66780 8.984726e-05
## 4308     6 66780 8.984726e-05
## 4309     6 66780 8.984726e-05
## 4310     6 66780 8.984726e-05
## 4311     6 66780 8.984726e-05
## 4312     6 66780 8.984726e-05
## 4313     6 66780 8.984726e-05
## 4314     6 66780 8.984726e-05
## 4315     6 66780 8.984726e-05
## 4316     6 66780 8.984726e-05
## 4317     6 66780 8.984726e-05
## 4318     6 66780 8.984726e-05
## 4319     6 66780 8.984726e-05
## 4320     6 66780 8.984726e-05
## 4321     6 66780 8.984726e-05
## 4322     6 66780 8.984726e-05
## 4323     6 66780 8.984726e-05
## 4324     6 66780 8.984726e-05
## 4325     6 66780 8.984726e-05
## 4326     6 66780 8.984726e-05
## 4327     6 66780 8.984726e-05
## 4328     6 66780 8.984726e-05
## 4329     6 66780 8.984726e-05
## 4330     6 66780 8.984726e-05
## 4331     6 66780 8.984726e-05
## 4332     6 66780 8.984726e-05
## 4333     6 66780 8.984726e-05
## 4334     6 66780 8.984726e-05
## 4335     6 66780 8.984726e-05
## 4336     6 66780 8.984726e-05
## 4337     6 66780 8.984726e-05
## 4338     6 66780 8.984726e-05
## 4339     6 66780 8.984726e-05
## 4340     6 66780 8.984726e-05
## 4341     6 66780 8.984726e-05
## 4342     6 66780 8.984726e-05
## 4343     6 66780 8.984726e-05
## 4344     6 66780 8.984726e-05
## 4345     6 66780 8.984726e-05
## 4346     6 66780 8.984726e-05
## 4347     6 66780 8.984726e-05
## 4348     6 66780 8.984726e-05
## 4349     6 66780 8.984726e-05
## 4350     6 66780 8.984726e-05
## 4351     6 66780 8.984726e-05
## 4352     6 66780 8.984726e-05
## 4353     6 66780 8.984726e-05
## 4354     6 66780 8.984726e-05
## 4355     6 66780 8.984726e-05
## 4356     6 66780 8.984726e-05
## 4357     6 66780 8.984726e-05
## 4358     6 66780 8.984726e-05
## 4359     6 66780 8.984726e-05
## 4360     6 66780 8.984726e-05
## 4361     6 66780 8.984726e-05
## 4362     6 66780 8.984726e-05
## 4363     6 66780 8.984726e-05
## 4364     6 66780 8.984726e-05
## 4365     6 66780 8.984726e-05
## 4366     6 66780 8.984726e-05
## 4367     6 66780 8.984726e-05
## 4368     6 66780 8.984726e-05
## 4369     6 66780 8.984726e-05
## 4370     6 66780 8.984726e-05
## 4371     6 66780 8.984726e-05
## 4372     6 66780 8.984726e-05
## 4373     6 66780 8.984726e-05
## 4374     6 66780 8.984726e-05
## 4375     6 66780 8.984726e-05
## 4376     6 66780 8.984726e-05
## 4377     6 66780 8.984726e-05
## 4378     6 66780 8.984726e-05
## 4379     6 66780 8.984726e-05
## 4380     6 66780 8.984726e-05
## 4381     6 66780 8.984726e-05
## 4382     6 66780 8.984726e-05
## 4383     6 66780 8.984726e-05
## 4384     6 66780 8.984726e-05
## 4385     6 66780 8.984726e-05
## 4386     6 66780 8.984726e-05
## 4387     6 66780 8.984726e-05
## 4388     6 66780 8.984726e-05
## 4389     6 66780 8.984726e-05
## 4390     6 66780 8.984726e-05
## 4391     6 66780 8.984726e-05
## 4392     6 66780 8.984726e-05
## 4393     6 66780 8.984726e-05
## 4394     6 66780 8.984726e-05
## 4395     6 66780 8.984726e-05
## 4396     6 66780 8.984726e-05
## 4397     6 66780 8.984726e-05
## 4398     6 66780 8.984726e-05
## 4399     6 66780 8.984726e-05
## 4400     6 66780 8.984726e-05
## 4401     6 66780 8.984726e-05
## 4402     6 66780 8.984726e-05
## 4403     6 66780 8.984726e-05
## 4404     6 66780 8.984726e-05
## 4405     6 66780 8.984726e-05
## 4406     6 66780 8.984726e-05
## 4407     6 66780 8.984726e-05
## 4408     6 66780 8.984726e-05
## 4409     6 66780 8.984726e-05
## 4410     6 66780 8.984726e-05
## 4411     6 66780 8.984726e-05
## 4412     6 66780 8.984726e-05
## 4413     6 66780 8.984726e-05
## 4414     6 66780 8.984726e-05
## 4415     6 66780 8.984726e-05
## 4416     6 66780 8.984726e-05
## 4417     6 66780 8.984726e-05
## 4418     6 66780 8.984726e-05
## 4419     6 66780 8.984726e-05
## 4420     6 66780 8.984726e-05
## 4421     6 66780 8.984726e-05
## 4422     6 66780 8.984726e-05
## 4423     6 66780 8.984726e-05
## 4424     6 66780 8.984726e-05
## 4425     6 66780 8.984726e-05
## 4426     6 66780 8.984726e-05
## 4427     6 66780 8.984726e-05
## 4428     6 66780 8.984726e-05
## 4429     6 66780 8.984726e-05
## 4430     6 66780 8.984726e-05
## 4431     6 66780 8.984726e-05
## 4432     6 66780 8.984726e-05
## 4433     6 66780 8.984726e-05
## 4434     6 66780 8.984726e-05
## 4435     6 66780 8.984726e-05
## 4436     6 66780 8.984726e-05
## 4437     6 66780 8.984726e-05
## 4438     6 66780 8.984726e-05
## 4439     6 66780 8.984726e-05
## 4440     6 66780 8.984726e-05
## 4441     6 66780 8.984726e-05
## 4442     6 66780 8.984726e-05
## 4443     6 66780 8.984726e-05
## 4444     6 66780 8.984726e-05
## 4445     6 66780 8.984726e-05
## 4446     6 66780 8.984726e-05
## 4447     6 66780 8.984726e-05
## 4448     6 66780 8.984726e-05
## 4449     6 66780 8.984726e-05
## 4450     6 66780 8.984726e-05
## 4451     6 66780 8.984726e-05
## 4452     6 66780 8.984726e-05
## 4453     6 66780 8.984726e-05
## 4454     6 66780 8.984726e-05
## 4455     6 66780 8.984726e-05
## 4456     6 66780 8.984726e-05
## 4457     6 66780 8.984726e-05
## 4458     6 66780 8.984726e-05
## 4459     6 66780 8.984726e-05
## 4460     6 66780 8.984726e-05
## 4461     6 66780 8.984726e-05
## 4462     6 66780 8.984726e-05
## 4463     6 66780 8.984726e-05
## 4464     6 66780 8.984726e-05
## 4465     6 66780 8.984726e-05
## 4466     6 66780 8.984726e-05
## 4467     6 66780 8.984726e-05
## 4468     6 66780 8.984726e-05
## 4469     6 66780 8.984726e-05
## 4470     6 66780 8.984726e-05
## 4471     6 66780 8.984726e-05
## 4472     6 66780 8.984726e-05
## 4473     6 66780 8.984726e-05
## 4474     6 66780 8.984726e-05
## 4475     6 66780 8.984726e-05
## 4476     6 66780 8.984726e-05
## 4477     6 66780 8.984726e-05
## 4478     6 66780 8.984726e-05
## 4479     6 66780 8.984726e-05
## 4480     6 66780 8.984726e-05
## 4481     6 66780 8.984726e-05
## 4482     6 66780 8.984726e-05
## 4483     6 66780 8.984726e-05
## 4484     6 66780 8.984726e-05
## 4485     6 66780 8.984726e-05
## 4486     6 66780 8.984726e-05
## 4487     6 66780 8.984726e-05
## 4488     6 66780 8.984726e-05
## 4489     6 66780 8.984726e-05
## 4490     6 66780 8.984726e-05
## 4491     6 66780 8.984726e-05
## 4492     6 66780 8.984726e-05
## 4493     6 66780 8.984726e-05
## 4494     6 66780 8.984726e-05
## 4495     6 66780 8.984726e-05
## 4496     6 66780 8.984726e-05
## 4497     6 66780 8.984726e-05
## 4498     6 66780 8.984726e-05
## 4499     6 66780 8.984726e-05
## 4500     6 66780 8.984726e-05
## 4501     6 66780 8.984726e-05
## 4502     6 66780 8.984726e-05
## 4503     6 66780 8.984726e-05
## 4504     6 66780 8.984726e-05
## 4505     6 66780 8.984726e-05
## 4506     6 66780 8.984726e-05
## 4507     6 66780 8.984726e-05
## 4508     6 66780 8.984726e-05
## 4509     6 66780 8.984726e-05
## 4510     6 66780 8.984726e-05
## 4511     6 66780 8.984726e-05
## 4512     6 66780 8.984726e-05
## 4513     6 66780 8.984726e-05
## 4514     6 66780 8.984726e-05
## 4515     6 66780 8.984726e-05
## 4516     6 66780 8.984726e-05
## 4517     6 66780 8.984726e-05
## 4518     6 66780 8.984726e-05
## 4519     6 66780 8.984726e-05
## 4520     6 66780 8.984726e-05
## 4521     6 66780 8.984726e-05
## 4522     6 66780 8.984726e-05
## 4523     6 66780 8.984726e-05
## 4524     6 66780 8.984726e-05
## 4525     6 66780 8.984726e-05
## 4526     6 66780 8.984726e-05
## 4527     6 66780 8.984726e-05
## 4528     6 66780 8.984726e-05
## 4529     6 66780 8.984726e-05
## 4530     6 66780 8.984726e-05
## 4531     6 66780 8.984726e-05
## 4532     6 66780 8.984726e-05
## 4533     6 66780 8.984726e-05
## 4534     6 66780 8.984726e-05
## 4535     6 66780 8.984726e-05
## 4536     6 66780 8.984726e-05
## 4537     6 66780 8.984726e-05
## 4538     6 66780 8.984726e-05
## 4539     6 66780 8.984726e-05
## 4540     6 66780 8.984726e-05
## 4541     6 66780 8.984726e-05
## 4542     6 66780 8.984726e-05
## 4543     6 65844 9.112448e-05
## 4544     6 65844 9.112448e-05
## 4545     6 65844 9.112448e-05
## 4546     6 65844 9.112448e-05
## 4547     6 65844 9.112448e-05
## 4548     6 65844 9.112448e-05
## 4549     6 65844 9.112448e-05
## 4550     6 65844 9.112448e-05
## 4551     6 65844 9.112448e-05
## 4552     6 65844 9.112448e-05
## 4553     6 65844 9.112448e-05
## 4554     6 65844 9.112448e-05
## 4555     6 65844 9.112448e-05
## 4556     6 65844 9.112448e-05
## 4557     6 65844 9.112448e-05
## 4558     6 65844 9.112448e-05
## 4559     6 65844 9.112448e-05
## 4560     6 65844 9.112448e-05
## 4561     6 65844 9.112448e-05
## 4562     6 65844 9.112448e-05
## 4563     6 65844 9.112448e-05
## 4564     6 65844 9.112448e-05
## 4565     6 65844 9.112448e-05
## 4566     6 65844 9.112448e-05
## 4567     6 65844 9.112448e-05
## 4568     6 65844 9.112448e-05
## 4569     6 65844 9.112448e-05
## 4570     6 65844 9.112448e-05
## 4571     6 65844 9.112448e-05
## 4572     6 65844 9.112448e-05
## 4573     6 65844 9.112448e-05
## 4574     6 65844 9.112448e-05
## 4575     6 65844 9.112448e-05
## 4576     6 65844 9.112448e-05
## 4577     6 65844 9.112448e-05
## 4578     6 65844 9.112448e-05
## 4579     6 65844 9.112448e-05
## 4580     6 65844 9.112448e-05
## 4581     6 65844 9.112448e-05
## 4582     6 65844 9.112448e-05
## 4583     6 65844 9.112448e-05
## 4584     6 65844 9.112448e-05
## 4585     6 65844 9.112448e-05
## 4586     6 65844 9.112448e-05
## 4587     6 65844 9.112448e-05
## 4588     6 65844 9.112448e-05
## 4589     6 65844 9.112448e-05
## 4590     6 65844 9.112448e-05
## 4591     6 65844 9.112448e-05
## 4592     6 65844 9.112448e-05
## 4593     6 65844 9.112448e-05
## 4594     6 65844 9.112448e-05
## 4595     6 65844 9.112448e-05
## 4596     6 65844 9.112448e-05
## 4597     6 65844 9.112448e-05
## 4598     6 65844 9.112448e-05
## 4599     6 65844 9.112448e-05
## 4600     6 65844 9.112448e-05
## 4601     6 65844 9.112448e-05
## 4602     6 65844 9.112448e-05
## 4603     6 65844 9.112448e-05
## 4604     6 65844 9.112448e-05
## 4605     6 65844 9.112448e-05
## 4606     6 65844 9.112448e-05
## 4607     6 65844 9.112448e-05
## 4608     6 65844 9.112448e-05
## 4609     6 65844 9.112448e-05
## 4610     6 65844 9.112448e-05
## 4611     6 65844 9.112448e-05
## 4612     6 65844 9.112448e-05
## 4613     6 65844 9.112448e-05
## 4614     6 65844 9.112448e-05
## 4615     6 65844 9.112448e-05
## 4616     6 65844 9.112448e-05
## 4617     6 65844 9.112448e-05
## 4618     6 65844 9.112448e-05
## 4619     6 65844 9.112448e-05
## 4620     6 65844 9.112448e-05
## 4621     6 65844 9.112448e-05
## 4622     6 65844 9.112448e-05
## 4623     6 65844 9.112448e-05
## 4624     6 65844 9.112448e-05
## 4625     6 65844 9.112448e-05
## 4626     6 65844 9.112448e-05
## 4627     6 65844 9.112448e-05
## 4628     6 65844 9.112448e-05
## 4629     6 65844 9.112448e-05
## 4630     6 65844 9.112448e-05
## 4631     6 65844 9.112448e-05
## 4632     6 65844 9.112448e-05
## 4633     6 65844 9.112448e-05
## 4634     6 65844 9.112448e-05
## 4635     6 65844 9.112448e-05
## 4636     6 65844 9.112448e-05
## 4637     6 65844 9.112448e-05
## 4638     6 65844 9.112448e-05
## 4639     6 65844 9.112448e-05
## 4640     6 65844 9.112448e-05
## 4641     6 65844 9.112448e-05
## 4642     6 65844 9.112448e-05
## 4643     6 65844 9.112448e-05
## 4644     6 65844 9.112448e-05
## 4645     6 65844 9.112448e-05
## 4646     6 65844 9.112448e-05
## 4647     6 65844 9.112448e-05
## 4648     6 65844 9.112448e-05
## 4649     6 65844 9.112448e-05
## 4650     6 65844 9.112448e-05
## 4651     6 65844 9.112448e-05
## 4652     6 65844 9.112448e-05
## 4653     6 65844 9.112448e-05
## 4654     6 65844 9.112448e-05
## 4655     6 65844 9.112448e-05
## 4656     6 65844 9.112448e-05
## 4657     6 65844 9.112448e-05
## 4658     6 65844 9.112448e-05
## 4659     6 65844 9.112448e-05
## 4660     6 65844 9.112448e-05
## 4661     6 65844 9.112448e-05
## 4662     6 65844 9.112448e-05
## 4663     6 65844 9.112448e-05
## 4664     6 65844 9.112448e-05
## 4665     6 65844 9.112448e-05
## 4666     6 65844 9.112448e-05
## 4667     6 65844 9.112448e-05
## 4668     6 65844 9.112448e-05
## 4669     6 65844 9.112448e-05
## 4670     6 65844 9.112448e-05
## 4671     6 65844 9.112448e-05
## 4672     6 65844 9.112448e-05
## 4673     6 65844 9.112448e-05
## 4674     6 65844 9.112448e-05
## 4675     6 65844 9.112448e-05
## 4676     6 65844 9.112448e-05
## 4677     6 65844 9.112448e-05
## 4678     6 65844 9.112448e-05
## 4679     6 65844 9.112448e-05
## 4680     6 65844 9.112448e-05
## 4681     6 65844 9.112448e-05
## 4682     6 65844 9.112448e-05
## 4683     6 65844 9.112448e-05
## 4684     6 65844 9.112448e-05
## 4685     6 65844 9.112448e-05
## 4686     6 65844 9.112448e-05
## 4687     6 65844 9.112448e-05
## 4688     6 65844 9.112448e-05
## 4689     6 65844 9.112448e-05
## 4690     6 65844 9.112448e-05
## 4691     6 65844 9.112448e-05
## 4692     6 65844 9.112448e-05
## 4693     6 65844 9.112448e-05
## 4694     6 65844 9.112448e-05
## 4695     6 65844 9.112448e-05
## 4696     6 65844 9.112448e-05
## 4697     6 65844 9.112448e-05
## 4698     6 65844 9.112448e-05
## 4699     6 65844 9.112448e-05
## 4700     6 65844 9.112448e-05
## 4701     6 65844 9.112448e-05
## 4702     6 65844 9.112448e-05
## 4703     6 65844 9.112448e-05
## 4704     6 65844 9.112448e-05
## 4705     6 65844 9.112448e-05
## 4706     6 65844 9.112448e-05
## 4707     6 65844 9.112448e-05
## 4708     6 65844 9.112448e-05
## 4709     6 65844 9.112448e-05
## 4710     6 65844 9.112448e-05
## 4711     6 65844 9.112448e-05
## 4712     6 65844 9.112448e-05
## 4713     6 65844 9.112448e-05
## 4714     6 65844 9.112448e-05
## 4715     6 65844 9.112448e-05
## 4716     6 65844 9.112448e-05
## 4717     6 65844 9.112448e-05
## 4718     6 65844 9.112448e-05
## 4719     6 65844 9.112448e-05
## 4720     6 65844 9.112448e-05
## 4721     6 65844 9.112448e-05
## 4722     6 65844 9.112448e-05
## 4723     6 65844 9.112448e-05
## 4724     6 65844 9.112448e-05
## 4725     6 65844 9.112448e-05
## 4726     6 65844 9.112448e-05
## 4727     6 65844 9.112448e-05
## 4728     6 65844 9.112448e-05
## 4729     6 65844 9.112448e-05
## 4730     6 65844 9.112448e-05
## 4731     6 65844 9.112448e-05
## 4732     6 65844 9.112448e-05
## 4733     6 65844 9.112448e-05
## 4734     6 65844 9.112448e-05
## 4735     6 65844 9.112448e-05
## 4736     6 65844 9.112448e-05
## 4737     6 65844 9.112448e-05
## 4738     6 65844 9.112448e-05
## 4739     6 65844 9.112448e-05
## 4740     6 65844 9.112448e-05
## 4741     6 65844 9.112448e-05
## 4742     6 65844 9.112448e-05
## 4743     6 65844 9.112448e-05
## 4744     6 65844 9.112448e-05
## 4745     6 65844 9.112448e-05
## 4746     6 65844 9.112448e-05
## 4747     6 65844 9.112448e-05
## 4748     6 65844 9.112448e-05
## 4749     6 65844 9.112448e-05
## 4750     6 65844 9.112448e-05
## 4751     6 65844 9.112448e-05
## 4752     6 65844 9.112448e-05
## 4753     6 65844 9.112448e-05
## 4754     6 65844 9.112448e-05
## 4755     6 65844 9.112448e-05
## 4756     6 65844 9.112448e-05
## 4757     6 65844 9.112448e-05
## 4758     6 65844 9.112448e-05
## 4759     6 65844 9.112448e-05
## 4760     6 65844 9.112448e-05
## 4761     6 65844 9.112448e-05
## 4762     6 65844 9.112448e-05
## 4763     6 65844 9.112448e-05
## 4764     6 65844 9.112448e-05
## 4765     6 65844 9.112448e-05
## 4766     6 65844 9.112448e-05
## 4767     6 65844 9.112448e-05
## 4768     6 65844 9.112448e-05
## 4769     6 65844 9.112448e-05
## 4770     6 65844 9.112448e-05
## 4771     6 65844 9.112448e-05
## 4772     6 65844 9.112448e-05
## 4773     6 65844 9.112448e-05
## 4774     6 65844 9.112448e-05
## 4775     6 65844 9.112448e-05
## 4776     6 65844 9.112448e-05
## 4777     6 65844 9.112448e-05
## 4778     6 65844 9.112448e-05
## 4779     6 65844 9.112448e-05
## 4780     6 65844 9.112448e-05
## 4781     6 65844 9.112448e-05
## 4782     6 65844 9.112448e-05
## 4783     6 65844 9.112448e-05
## 4784     6 65844 9.112448e-05
## 4785     6 65844 9.112448e-05
## 4786     6 65844 9.112448e-05
## 4787     6 65844 9.112448e-05
## 4788     6 55641 1.078342e-04
## 4789     6 55641 1.078342e-04
## 4790     6 55641 1.078342e-04
## 4791     6 55641 1.078342e-04
## 4792     6 55641 1.078342e-04
## 4793     6 55641 1.078342e-04
## 4794     6 55641 1.078342e-04
## 4795     6 55641 1.078342e-04
## 4796     6 55641 1.078342e-04
## 4797     6 55641 1.078342e-04
## 4798     6 55641 1.078342e-04
## 4799     6 55641 1.078342e-04
## 4800     6 55641 1.078342e-04
## 4801     6 55641 1.078342e-04
## 4802     6 55641 1.078342e-04
## 4803     6 55641 1.078342e-04
## 4804     6 55641 1.078342e-04
## 4805     6 55641 1.078342e-04
## 4806     6 55641 1.078342e-04
## 4807     6 55641 1.078342e-04
## 4808     6 55641 1.078342e-04
## 4809     6 55641 1.078342e-04
## 4810     6 55641 1.078342e-04
## 4811     6 55641 1.078342e-04
## 4812     6 55641 1.078342e-04
## 4813     6 55641 1.078342e-04
## 4814     6 55641 1.078342e-04
## 4815     6 55641 1.078342e-04
## 4816     6 55641 1.078342e-04
## 4817     6 55641 1.078342e-04
## 4818     6 55641 1.078342e-04
## 4819     6 55641 1.078342e-04
## 4820     6 55641 1.078342e-04
## 4821     6 55641 1.078342e-04
## 4822     6 55641 1.078342e-04
## 4823     6 55641 1.078342e-04
## 4824     6 55641 1.078342e-04
## 4825     6 55641 1.078342e-04
## 4826     6 55641 1.078342e-04
## 4827     6 55641 1.078342e-04
## 4828     6 55641 1.078342e-04
## 4829     6 55641 1.078342e-04
## 4830     6 55641 1.078342e-04
## 4831     6 55641 1.078342e-04
## 4832     6 55641 1.078342e-04
## 4833     6 55641 1.078342e-04
## 4834     6 55641 1.078342e-04
## 4835     6 55641 1.078342e-04
## 4836     6 55641 1.078342e-04
## 4837     6 55641 1.078342e-04
## 4838     6 55641 1.078342e-04
## 4839     6 55641 1.078342e-04
## 4840     6 55641 1.078342e-04
## 4841     6 55641 1.078342e-04
## 4842     6 55641 1.078342e-04
## 4843     6 55641 1.078342e-04
## 4844     6 55641 1.078342e-04
## 4845     6 55641 1.078342e-04
## 4846     6 55641 1.078342e-04
## 4847     6 55641 1.078342e-04
## 4848     6 55641 1.078342e-04
## 4849     6 55641 1.078342e-04
## 4850     6 55641 1.078342e-04
## 4851     6 55641 1.078342e-04
## 4852     6 55641 1.078342e-04
## 4853     6 55641 1.078342e-04
## 4854     6 55641 1.078342e-04
## 4855     6 55641 1.078342e-04
## 4856     6 55641 1.078342e-04
## 4857     6 55641 1.078342e-04
## 4858     6 55641 1.078342e-04
## 4859     6 55641 1.078342e-04
## 4860     6 55641 1.078342e-04
## 4861     6 55641 1.078342e-04
## 4862     6 55641 1.078342e-04
## 4863     6 55641 1.078342e-04
## 4864     6 55641 1.078342e-04
## 4865     6 55641 1.078342e-04
## 4866     6 55641 1.078342e-04
## 4867     6 55641 1.078342e-04
## 4868     6 55641 1.078342e-04
## 4869     6 55641 1.078342e-04
## 4870     6 55641 1.078342e-04
## 4871     6 55641 1.078342e-04
## 4872     6 55641 1.078342e-04
## 4873     6 55641 1.078342e-04
## 4874     6 55641 1.078342e-04
## 4875     6 55641 1.078342e-04
## 4876     6 55641 1.078342e-04
## 4877     6 55641 1.078342e-04
## 4878     6 55641 1.078342e-04
## 4879     6 55641 1.078342e-04
## 4880     6 55641 1.078342e-04
## 4881     6 55641 1.078342e-04
## 4882     6 55641 1.078342e-04
## 4883     6 55641 1.078342e-04
## 4884     6 55641 1.078342e-04
## 4885     6 55641 1.078342e-04
## 4886     6 55641 1.078342e-04
## 4887     6 55641 1.078342e-04
## 4888     6 55641 1.078342e-04
## 4889     6 55641 1.078342e-04
## 4890     6 55641 1.078342e-04
## 4891     6 55641 1.078342e-04
## 4892     6 55641 1.078342e-04
## 4893     6 55641 1.078342e-04
## 4894     6 55641 1.078342e-04
## 4895     6 55641 1.078342e-04
## 4896     6 55641 1.078342e-04
## 4897     6 55641 1.078342e-04
## 4898     6 55641 1.078342e-04
## 4899     6 55641 1.078342e-04
## 4900     6 55641 1.078342e-04
## 4901     6 55641 1.078342e-04
## 4902     6 55641 1.078342e-04
## 4903     6 55641 1.078342e-04
## 4904     6 55641 1.078342e-04
## 4905     6 55641 1.078342e-04
## 4906     6 55641 1.078342e-04
## 4907     6 55641 1.078342e-04
## 4908     6 55641 1.078342e-04
## 4909     6 55641 1.078342e-04
## 4910     6 55641 1.078342e-04
## 4911     6 55641 1.078342e-04
## 4912     6 55641 1.078342e-04
## 4913     6 55641 1.078342e-04
## 4914     6 55641 1.078342e-04
## 4915     6 55641 1.078342e-04
## 4916     6 55641 1.078342e-04
## 4917     6 55641 1.078342e-04
## 4918     6 55641 1.078342e-04
## 4919     6 55641 1.078342e-04
## 4920     6 55641 1.078342e-04
## 4921     6 55641 1.078342e-04
## 4922     6 55641 1.078342e-04
## 4923     6 55641 1.078342e-04
## 4924     6 55641 1.078342e-04
## 4925     6 55641 1.078342e-04
## 4926     6 55641 1.078342e-04
## 4927     6 55641 1.078342e-04
## 4928     6 55641 1.078342e-04
## 4929     6 55641 1.078342e-04
## 4930     6 55641 1.078342e-04
## 4931     6 55641 1.078342e-04
## 4932     6 55641 1.078342e-04
## 4933     6 55641 1.078342e-04
## 4934     6 55641 1.078342e-04
## 4935     6 55641 1.078342e-04
## 4936     6 55641 1.078342e-04
## 4937     6 55641 1.078342e-04
## 4938     6 55641 1.078342e-04
## 4939     6 55641 1.078342e-04
## 4940     6 55641 1.078342e-04
## 4941     6 55641 1.078342e-04
## 4942     6 55641 1.078342e-04
## 4943     6 55641 1.078342e-04
## 4944     6 55641 1.078342e-04
## 4945     6 55641 1.078342e-04
## 4946     6 55641 1.078342e-04
## 4947     6 55641 1.078342e-04
## 4948     6 55641 1.078342e-04
## 4949     6 55641 1.078342e-04
## 4950     6 55641 1.078342e-04
## 4951     6 55641 1.078342e-04
## 4952     6 55641 1.078342e-04
## 4953     6 55641 1.078342e-04
## 4954     6 55641 1.078342e-04
## 4955     6 55641 1.078342e-04
## 4956     6 55641 1.078342e-04
## 4957     6 55641 1.078342e-04
## 4958     6 55641 1.078342e-04
## 4959     6 55641 1.078342e-04
## 4960     6 55641 1.078342e-04
## 4961     6 55641 1.078342e-04
## 4962     6 55641 1.078342e-04
## 4963     6 55641 1.078342e-04
## 4964     6 55641 1.078342e-04
## 4965     6 55641 1.078342e-04
## 4966     6 55641 1.078342e-04
## 4967     6 55641 1.078342e-04
## 4968     6 55641 1.078342e-04
## 4969     6 55641 1.078342e-04
## 4970     6 55641 1.078342e-04
## 4971     6 55641 1.078342e-04
## 4972     6 55641 1.078342e-04
## 4973     6 55641 1.078342e-04
## 4974     6 55641 1.078342e-04
## 4975     6 55641 1.078342e-04
## 4976     6 55641 1.078342e-04
## 4977     6 55641 1.078342e-04
## 4978     6 55641 1.078342e-04
## 4979     6 55641 1.078342e-04
## 4980     6 55641 1.078342e-04
## 4981     6 55641 1.078342e-04
## 4982     6 55641 1.078342e-04
## 4983     6 55641 1.078342e-04
## 4984     6 55641 1.078342e-04
## 4985     6 55641 1.078342e-04
## 4986     6 55641 1.078342e-04
## 4987     6 55641 1.078342e-04
## 4988     6 55641 1.078342e-04
## 4989     6 55641 1.078342e-04
## 4990     6 55641 1.078342e-04
## 4991     6 55641 1.078342e-04
## 4992     6 55641 1.078342e-04
## 4993     6 55641 1.078342e-04
## 4994     6 55641 1.078342e-04
## 4995     6 55641 1.078342e-04
## 4996     6 55641 1.078342e-04
## 4997     6 55641 1.078342e-04
## 4998     6 55641 1.078342e-04
## 4999     6 55641 1.078342e-04
## 5000     6 55641 1.078342e-04
## 5001     6 55641 1.078342e-04
## 5002     6 55641 1.078342e-04
## 5003     6 55641 1.078342e-04
## 5004     6 55641 1.078342e-04
## 5005     6 55641 1.078342e-04
## 5006     6 55641 1.078342e-04
## 5007     6 55641 1.078342e-04
## 5008     6 55641 1.078342e-04
## 5009     6 55641 1.078342e-04
## 5010     6 55641 1.078342e-04
## 5011     6 55641 1.078342e-04
## 5012     6 55641 1.078342e-04
## 5013     6 55641 1.078342e-04
## 5014     6 55641 1.078342e-04
## 5015     6 55641 1.078342e-04
## 5016     6 55641 1.078342e-04
## 5017     6 55641 1.078342e-04
## 5018     6 55641 1.078342e-04
## 5019     6 55641 1.078342e-04
## 5020     6 55641 1.078342e-04
## 5021     6 55641 1.078342e-04
## 5022     6 55641 1.078342e-04
## 5023     6 55641 1.078342e-04
## 5024     6 55641 1.078342e-04
## 5025     6 55641 1.078342e-04
## 5026     6 55641 1.078342e-04
## 5027     6 55641 1.078342e-04
## 5028     6 55641 1.078342e-04
## 5029     6 55641 1.078342e-04
## 5030     6 55641 1.078342e-04
## 5031     6 55641 1.078342e-04
## 5032     6 55641 1.078342e-04
## 5033     6 55641 1.078342e-04
## 5034     6 55641 1.078342e-04
## 5035     6 55641 1.078342e-04
## 5036     6 55641 1.078342e-04
## 5037     6 55641 1.078342e-04
## 5038     6 55641 1.078342e-04
## 5039     6 55641 1.078342e-04
## 5040     6 55641 1.078342e-04
## 5041     6 55641 1.078342e-04
## 5042     6 55641 1.078342e-04
## 5043     6 55641 1.078342e-04
## 5044     5 66780 7.487272e-05
## 5045     5 66780 7.487272e-05
## 5046     5 66780 7.487272e-05
## 5047     5 66780 7.487272e-05
## 5048     5 66780 7.487272e-05
## 5049     5 66780 7.487272e-05
## 5050     5 66780 7.487272e-05
## 5051     5 66780 7.487272e-05
## 5052     5 66780 7.487272e-05
## 5053     5 66780 7.487272e-05
## 5054     5 66780 7.487272e-05
## 5055     5 66780 7.487272e-05
## 5056     5 66780 7.487272e-05
## 5057     5 66780 7.487272e-05
## 5058     5 66780 7.487272e-05
## 5059     5 66780 7.487272e-05
## 5060     5 66780 7.487272e-05
## 5061     5 66780 7.487272e-05
## 5062     5 66780 7.487272e-05
## 5063     5 66780 7.487272e-05
## 5064     5 66780 7.487272e-05
## 5065     5 66780 7.487272e-05
## 5066     5 66780 7.487272e-05
## 5067     5 66780 7.487272e-05
## 5068     5 66780 7.487272e-05
## 5069     5 66780 7.487272e-05
## 5070     5 66780 7.487272e-05
## 5071     5 66780 7.487272e-05
## 5072     5 66780 7.487272e-05
## 5073     5 66780 7.487272e-05
## 5074     5 66780 7.487272e-05
## 5075     5 66780 7.487272e-05
## 5076     5 66780 7.487272e-05
## 5077     5 66780 7.487272e-05
## 5078     5 66780 7.487272e-05
## 5079     5 66780 7.487272e-05
## 5080     5 66780 7.487272e-05
## 5081     5 66780 7.487272e-05
## 5082     5 66780 7.487272e-05
## 5083     5 66780 7.487272e-05
## 5084     5 66780 7.487272e-05
## 5085     5 66780 7.487272e-05
## 5086     5 66780 7.487272e-05
## 5087     5 66780 7.487272e-05
## 5088     5 66780 7.487272e-05
## 5089     5 66780 7.487272e-05
## 5090     5 66780 7.487272e-05
## 5091     5 66780 7.487272e-05
## 5092     5 66780 7.487272e-05
## 5093     5 66780 7.487272e-05
## 5094     5 66780 7.487272e-05
## 5095     5 66780 7.487272e-05
## 5096     5 66780 7.487272e-05
## 5097     5 66780 7.487272e-05
## 5098     5 66780 7.487272e-05
## 5099     5 66780 7.487272e-05
## 5100     5 66780 7.487272e-05
## 5101     5 66780 7.487272e-05
## 5102     5 66780 7.487272e-05
## 5103     5 66780 7.487272e-05
## 5104     5 66780 7.487272e-05
## 5105     5 66780 7.487272e-05
## 5106     5 66780 7.487272e-05
## 5107     5 66780 7.487272e-05
## 5108     5 66780 7.487272e-05
## 5109     5 66780 7.487272e-05
## 5110     5 66780 7.487272e-05
## 5111     5 66780 7.487272e-05
## 5112     5 66780 7.487272e-05
## 5113     5 66780 7.487272e-05
## 5114     5 66780 7.487272e-05
## 5115     5 66780 7.487272e-05
## 5116     5 66780 7.487272e-05
## 5117     5 66780 7.487272e-05
## 5118     5 66780 7.487272e-05
## 5119     5 66780 7.487272e-05
## 5120     5 66780 7.487272e-05
## 5121     5 66780 7.487272e-05
## 5122     5 66780 7.487272e-05
## 5123     5 66780 7.487272e-05
## 5124     5 66780 7.487272e-05
## 5125     5 66780 7.487272e-05
## 5126     5 66780 7.487272e-05
## 5127     5 66780 7.487272e-05
## 5128     5 66780 7.487272e-05
## 5129     5 66780 7.487272e-05
## 5130     5 66780 7.487272e-05
## 5131     5 66780 7.487272e-05
## 5132     5 66780 7.487272e-05
## 5133     5 66780 7.487272e-05
## 5134     5 66780 7.487272e-05
## 5135     5 66780 7.487272e-05
## 5136     5 66780 7.487272e-05
## 5137     5 66780 7.487272e-05
## 5138     5 66780 7.487272e-05
## 5139     5 66780 7.487272e-05
## 5140     5 66780 7.487272e-05
## 5141     5 66780 7.487272e-05
## 5142     5 66780 7.487272e-05
## 5143     5 66780 7.487272e-05
## 5144     5 66780 7.487272e-05
## 5145     5 66780 7.487272e-05
## 5146     5 66780 7.487272e-05
## 5147     5 66780 7.487272e-05
## 5148     5 66780 7.487272e-05
## 5149     5 66780 7.487272e-05
## 5150     5 66780 7.487272e-05
## 5151     5 66780 7.487272e-05
## 5152     5 66780 7.487272e-05
## 5153     5 66780 7.487272e-05
## 5154     5 66780 7.487272e-05
## 5155     5 66780 7.487272e-05
## 5156     5 66780 7.487272e-05
## 5157     5 66780 7.487272e-05
## 5158     5 66780 7.487272e-05
## 5159     5 66780 7.487272e-05
## 5160     5 66780 7.487272e-05
## 5161     5 66780 7.487272e-05
## 5162     5 66780 7.487272e-05
## 5163     5 66780 7.487272e-05
## 5164     5 66780 7.487272e-05
## 5165     5 66780 7.487272e-05
## 5166     5 66780 7.487272e-05
## 5167     5 66780 7.487272e-05
## 5168     5 66780 7.487272e-05
## 5169     5 66780 7.487272e-05
## 5170     5 66780 7.487272e-05
## 5171     5 66780 7.487272e-05
## 5172     5 66780 7.487272e-05
## 5173     5 66780 7.487272e-05
## 5174     5 66780 7.487272e-05
## 5175     5 66780 7.487272e-05
## 5176     5 66780 7.487272e-05
## 5177     5 66780 7.487272e-05
## 5178     5 66780 7.487272e-05
## 5179     5 66780 7.487272e-05
## 5180     5 66780 7.487272e-05
## 5181     5 66780 7.487272e-05
## 5182     5 66780 7.487272e-05
## 5183     5 66780 7.487272e-05
## 5184     5 66780 7.487272e-05
## 5185     5 66780 7.487272e-05
## 5186     5 66780 7.487272e-05
## 5187     5 66780 7.487272e-05
## 5188     5 66780 7.487272e-05
## 5189     5 66780 7.487272e-05
## 5190     5 66780 7.487272e-05
## 5191     5 66780 7.487272e-05
## 5192     5 66780 7.487272e-05
## 5193     5 66780 7.487272e-05
## 5194     5 66780 7.487272e-05
## 5195     5 66780 7.487272e-05
## 5196     5 66780 7.487272e-05
## 5197     5 66780 7.487272e-05
## 5198     5 66780 7.487272e-05
## 5199     5 66780 7.487272e-05
## 5200     5 66780 7.487272e-05
## 5201     5 66780 7.487272e-05
## 5202     5 66780 7.487272e-05
## 5203     5 66780 7.487272e-05
## 5204     5 66780 7.487272e-05
## 5205     5 66780 7.487272e-05
## 5206     5 66780 7.487272e-05
## 5207     5 66780 7.487272e-05
## 5208     5 66780 7.487272e-05
## 5209     5 66780 7.487272e-05
## 5210     5 66780 7.487272e-05
## 5211     5 66780 7.487272e-05
## 5212     5 66780 7.487272e-05
## 5213     5 66780 7.487272e-05
## 5214     5 66780 7.487272e-05
## 5215     5 66780 7.487272e-05
## 5216     5 66780 7.487272e-05
## 5217     5 66780 7.487272e-05
## 5218     5 66780 7.487272e-05
## 5219     5 66780 7.487272e-05
## 5220     5 66780 7.487272e-05
## 5221     5 66780 7.487272e-05
## 5222     5 66780 7.487272e-05
## 5223     5 66780 7.487272e-05
## 5224     5 66780 7.487272e-05
## 5225     5 66780 7.487272e-05
## 5226     5 66780 7.487272e-05
## 5227     5 66780 7.487272e-05
## 5228     5 66780 7.487272e-05
## 5229     5 66780 7.487272e-05
## 5230     5 66780 7.487272e-05
## 5231     5 66780 7.487272e-05
## 5232     5 66780 7.487272e-05
## 5233     5 66780 7.487272e-05
## 5234     5 66780 7.487272e-05
## 5235     5 66780 7.487272e-05
## 5236     5 66780 7.487272e-05
## 5237     5 66780 7.487272e-05
## 5238     5 66780 7.487272e-05
## 5239     5 66780 7.487272e-05
## 5240     5 66780 7.487272e-05
## 5241     5 66780 7.487272e-05
## 5242     5 66780 7.487272e-05
## 5243     5 66780 7.487272e-05
## 5244     5 66780 7.487272e-05
## 5245     5 66780 7.487272e-05
## 5246     5 66780 7.487272e-05
## 5247     5 66780 7.487272e-05
## 5248     5 66780 7.487272e-05
## 5249     5 66780 7.487272e-05
## 5250     5 66780 7.487272e-05
## 5251     5 66780 7.487272e-05
## 5252     5 66780 7.487272e-05
## 5253     5 66780 7.487272e-05
## 5254     5 66780 7.487272e-05
## 5255     5 66780 7.487272e-05
## 5256     5 66780 7.487272e-05
## 5257     5 66780 7.487272e-05
## 5258     5 66780 7.487272e-05
## 5259     5 66780 7.487272e-05
## 5260     5 66780 7.487272e-05
## 5261     5 66780 7.487272e-05
## 5262     5 66780 7.487272e-05
## 5263     5 66780 7.487272e-05
## 5264     5 66780 7.487272e-05
## 5265     5 66780 7.487272e-05
## 5266     5 66780 7.487272e-05
## 5267     5 66780 7.487272e-05
## 5268     5 66780 7.487272e-05
## 5269     5 66780 7.487272e-05
## 5270     5 66780 7.487272e-05
## 5271     5 66780 7.487272e-05
## 5272     5 66780 7.487272e-05
## 5273     5 66780 7.487272e-05
## 5274     5 66780 7.487272e-05
## 5275     5 66780 7.487272e-05
## 5276     5 66780 7.487272e-05
## 5277     5 66780 7.487272e-05
## 5278     5 66780 7.487272e-05
## 5279     5 66780 7.487272e-05
## 5280     5 66780 7.487272e-05
## 5281     5 66780 7.487272e-05
## 5282     5 66780 7.487272e-05
## 5283     5 66780 7.487272e-05
## 5284     5 66780 7.487272e-05
## 5285     5 66780 7.487272e-05
## 5286     5 66780 7.487272e-05
## 5287     5 66780 7.487272e-05
## 5288     5 66780 7.487272e-05
## 5289     5 66780 7.487272e-05
## 5290     5 66780 7.487272e-05
## 5291     5 66780 7.487272e-05
## 5292     5 66780 7.487272e-05
## 5293     5 66780 7.487272e-05
## 5294     5 66780 7.487272e-05
## 5295     5 66780 7.487272e-05
## 5296     5 66780 7.487272e-05
## 5297     5 66780 7.487272e-05
## 5298     5 66780 7.487272e-05
## 5299     5 66780 7.487272e-05
## 5300     5 66780 7.487272e-05
## 5301     5 66780 7.487272e-05
## 5302     5 66780 7.487272e-05
## 5303     5 66780 7.487272e-05
## 5304     5 66780 7.487272e-05
## 5305     5 66780 7.487272e-05
## 5306     5 66780 7.487272e-05
## 5307     5 66780 7.487272e-05
## 5308     5 66780 7.487272e-05
## 5309     5 66780 7.487272e-05
## 5310     5 66780 7.487272e-05
## 5311     5 66780 7.487272e-05
## 5312     5 66780 7.487272e-05
## 5313     5 66780 7.487272e-05
## 5314     5 66780 7.487272e-05
## 5315     5 66780 7.487272e-05
## 5316     5 66780 7.487272e-05
## 5317     5 66780 7.487272e-05
## 5318     5 66780 7.487272e-05
## 5319     5 66780 7.487272e-05
## 5320     5 66780 7.487272e-05
## 5321     5 66780 7.487272e-05
## 5322     5 66780 7.487272e-05
## 5323     5 66780 7.487272e-05
## 5324     5 66780 7.487272e-05
## 5325     5 66780 7.487272e-05
## 5326     5 66780 7.487272e-05
## 5327     5 66780 7.487272e-05
## 5328     5 66780 7.487272e-05
## 5329     5 66780 7.487272e-05
## 5330     5 66780 7.487272e-05
## 5331     5 66780 7.487272e-05
## 5332     5 66780 7.487272e-05
## 5333     5 66780 7.487272e-05
## 5334     5 66780 7.487272e-05
## 5335     5 66780 7.487272e-05
## 5336     5 66780 7.487272e-05
## 5337     5 66780 7.487272e-05
## 5338     5 66780 7.487272e-05
## 5339     5 66780 7.487272e-05
## 5340     5 66780 7.487272e-05
## 5341     5 66780 7.487272e-05
## 5342     5 66780 7.487272e-05
## 5343     5 66780 7.487272e-05
## 5344     5 66780 7.487272e-05
## 5345     5 66780 7.487272e-05
## 5346     5 66780 7.487272e-05
## 5347     5 66780 7.487272e-05
## 5348     5 66780 7.487272e-05
## 5349     5 66780 7.487272e-05
## 5350     5 66780 7.487272e-05
## 5351     5 66780 7.487272e-05
## 5352     5 66780 7.487272e-05
## 5353     5 66780 7.487272e-05
## 5354     5 66780 7.487272e-05
## 5355     5 66780 7.487272e-05
## 5356     5 66780 7.487272e-05
## 5357     5 66780 7.487272e-05
## 5358     5 66780 7.487272e-05
## 5359     5 66780 7.487272e-05
## 5360     5 66780 7.487272e-05
## 5361     5 66780 7.487272e-05
## 5362     5 66780 7.487272e-05
## 5363     5 66780 7.487272e-05
## 5364     5 66780 7.487272e-05
## 5365     5 66780 7.487272e-05
## 5366     5 66780 7.487272e-05
## 5367     5 66780 7.487272e-05
## 5368     5 66780 7.487272e-05
## 5369     5 66780 7.487272e-05
## 5370     5 66780 7.487272e-05
## 5371     5 66780 7.487272e-05
## 5372     5 66780 7.487272e-05
## 5373     5 66780 7.487272e-05
## 5374     5 66780 7.487272e-05
## 5375     5 66780 7.487272e-05
## 5376     5 66780 7.487272e-05
## 5377     5 66780 7.487272e-05
## 5378     5 66780 7.487272e-05
## 5379     5 66780 7.487272e-05
## 5380     5 66780 7.487272e-05
## 5381     5 66780 7.487272e-05
## 5382     5 66780 7.487272e-05
## 5383     5 66780 7.487272e-05
## 5384     5 66780 7.487272e-05
## 5385     5 66780 7.487272e-05
## 5386     5 66780 7.487272e-05
## 5387     5 66780 7.487272e-05
## 5388     5 66780 7.487272e-05
## 5389     5 66780 7.487272e-05
## 5390     5 66780 7.487272e-05
## 5391     5 66780 7.487272e-05
## 5392     5 66780 7.487272e-05
## 5393     5 66780 7.487272e-05
## 5394     5 66780 7.487272e-05
## 5395     5 66780 7.487272e-05
## 5396     5 66780 7.487272e-05
## 5397     5 66780 7.487272e-05
## 5398     5 66780 7.487272e-05
## 5399     5 66780 7.487272e-05
## 5400     5 66780 7.487272e-05
## 5401     5 66780 7.487272e-05
## 5402     5 66780 7.487272e-05
## 5403     5 66780 7.487272e-05
## 5404     5 66780 7.487272e-05
## 5405     5 66780 7.487272e-05
## 5406     5 66780 7.487272e-05
## 5407     5 66780 7.487272e-05
## 5408     5 66780 7.487272e-05
## 5409     5 66780 7.487272e-05
## 5410     5 66780 7.487272e-05
## 5411     5 66780 7.487272e-05
## 5412     5 66780 7.487272e-05
## 5413     5 66780 7.487272e-05
## 5414     5 66780 7.487272e-05
## 5415     5 66780 7.487272e-05
## 5416     5 66780 7.487272e-05
## 5417     5 66780 7.487272e-05
## 5418     5 66780 7.487272e-05
## 5419     5 65844 7.593706e-05
## 5420     5 65844 7.593706e-05
## 5421     5 65844 7.593706e-05
## 5422     5 65844 7.593706e-05
## 5423     5 65844 7.593706e-05
## 5424     5 65844 7.593706e-05
## 5425     5 65844 7.593706e-05
## 5426     5 65844 7.593706e-05
## 5427     5 65844 7.593706e-05
## 5428     5 65844 7.593706e-05
## 5429     5 65844 7.593706e-05
## 5430     5 65844 7.593706e-05
## 5431     5 65844 7.593706e-05
## 5432     5 65844 7.593706e-05
## 5433     5 65844 7.593706e-05
## 5434     5 65844 7.593706e-05
## 5435     5 65844 7.593706e-05
## 5436     5 65844 7.593706e-05
## 5437     5 65844 7.593706e-05
## 5438     5 65844 7.593706e-05
## 5439     5 65844 7.593706e-05
## 5440     5 65844 7.593706e-05
## 5441     5 65844 7.593706e-05
## 5442     5 65844 7.593706e-05
## 5443     5 65844 7.593706e-05
## 5444     5 65844 7.593706e-05
## 5445     5 65844 7.593706e-05
## 5446     5 65844 7.593706e-05
## 5447     5 65844 7.593706e-05
## 5448     5 65844 7.593706e-05
## 5449     5 65844 7.593706e-05
## 5450     5 65844 7.593706e-05
## 5451     5 65844 7.593706e-05
## 5452     5 65844 7.593706e-05
## 5453     5 65844 7.593706e-05
## 5454     5 65844 7.593706e-05
## 5455     5 65844 7.593706e-05
## 5456     5 65844 7.593706e-05
## 5457     5 65844 7.593706e-05
## 5458     5 65844 7.593706e-05
## 5459     5 65844 7.593706e-05
## 5460     5 65844 7.593706e-05
## 5461     5 65844 7.593706e-05
## 5462     5 65844 7.593706e-05
## 5463     5 65844 7.593706e-05
## 5464     5 65844 7.593706e-05
## 5465     5 65844 7.593706e-05
## 5466     5 65844 7.593706e-05
## 5467     5 65844 7.593706e-05
## 5468     5 65844 7.593706e-05
## 5469     5 65844 7.593706e-05
## 5470     5 65844 7.593706e-05
## 5471     5 65844 7.593706e-05
## 5472     5 65844 7.593706e-05
## 5473     5 65844 7.593706e-05
## 5474     5 65844 7.593706e-05
## 5475     5 65844 7.593706e-05
## 5476     5 65844 7.593706e-05
## 5477     5 65844 7.593706e-05
## 5478     5 65844 7.593706e-05
## 5479     5 65844 7.593706e-05
## 5480     5 65844 7.593706e-05
## 5481     5 65844 7.593706e-05
## 5482     5 65844 7.593706e-05
## 5483     5 65844 7.593706e-05
## 5484     5 65844 7.593706e-05
## 5485     5 65844 7.593706e-05
## 5486     5 65844 7.593706e-05
## 5487     5 65844 7.593706e-05
## 5488     5 65844 7.593706e-05
## 5489     5 65844 7.593706e-05
## 5490     5 65844 7.593706e-05
## 5491     5 65844 7.593706e-05
## 5492     5 65844 7.593706e-05
## 5493     5 65844 7.593706e-05
## 5494     5 65844 7.593706e-05
## 5495     5 65844 7.593706e-05
## 5496     5 65844 7.593706e-05
## 5497     5 65844 7.593706e-05
## 5498     5 65844 7.593706e-05
## 5499     5 65844 7.593706e-05
## 5500     5 65844 7.593706e-05
## 5501     5 65844 7.593706e-05
## 5502     5 65844 7.593706e-05
## 5503     5 65844 7.593706e-05
## 5504     5 65844 7.593706e-05
## 5505     5 65844 7.593706e-05
## 5506     5 65844 7.593706e-05
## 5507     5 65844 7.593706e-05
## 5508     5 65844 7.593706e-05
## 5509     5 65844 7.593706e-05
## 5510     5 65844 7.593706e-05
## 5511     5 65844 7.593706e-05
## 5512     5 65844 7.593706e-05
## 5513     5 65844 7.593706e-05
## 5514     5 65844 7.593706e-05
## 5515     5 65844 7.593706e-05
## 5516     5 65844 7.593706e-05
## 5517     5 65844 7.593706e-05
## 5518     5 65844 7.593706e-05
## 5519     5 65844 7.593706e-05
## 5520     5 65844 7.593706e-05
## 5521     5 65844 7.593706e-05
## 5522     5 65844 7.593706e-05
## 5523     5 65844 7.593706e-05
## 5524     5 65844 7.593706e-05
## 5525     5 65844 7.593706e-05
## 5526     5 65844 7.593706e-05
## 5527     5 65844 7.593706e-05
## 5528     5 65844 7.593706e-05
## 5529     5 65844 7.593706e-05
## 5530     5 65844 7.593706e-05
## 5531     5 65844 7.593706e-05
## 5532     5 65844 7.593706e-05
## 5533     5 65844 7.593706e-05
## 5534     5 65844 7.593706e-05
## 5535     5 65844 7.593706e-05
## 5536     5 65844 7.593706e-05
## 5537     5 65844 7.593706e-05
## 5538     5 65844 7.593706e-05
## 5539     5 65844 7.593706e-05
## 5540     5 65844 7.593706e-05
## 5541     5 65844 7.593706e-05
## 5542     5 65844 7.593706e-05
## 5543     5 65844 7.593706e-05
## 5544     5 65844 7.593706e-05
## 5545     5 65844 7.593706e-05
## 5546     5 65844 7.593706e-05
## 5547     5 65844 7.593706e-05
## 5548     5 65844 7.593706e-05
## 5549     5 65844 7.593706e-05
## 5550     5 65844 7.593706e-05
## 5551     5 65844 7.593706e-05
## 5552     5 65844 7.593706e-05
## 5553     5 65844 7.593706e-05
## 5554     5 65844 7.593706e-05
## 5555     5 65844 7.593706e-05
## 5556     5 65844 7.593706e-05
## 5557     5 65844 7.593706e-05
## 5558     5 65844 7.593706e-05
## 5559     5 65844 7.593706e-05
## 5560     5 65844 7.593706e-05
## 5561     5 65844 7.593706e-05
## 5562     5 65844 7.593706e-05
## 5563     5 65844 7.593706e-05
## 5564     5 65844 7.593706e-05
## 5565     5 65844 7.593706e-05
## 5566     5 65844 7.593706e-05
## 5567     5 65844 7.593706e-05
## 5568     5 65844 7.593706e-05
## 5569     5 65844 7.593706e-05
## 5570     5 65844 7.593706e-05
## 5571     5 65844 7.593706e-05
## 5572     5 65844 7.593706e-05
## 5573     5 65844 7.593706e-05
## 5574     5 65844 7.593706e-05
## 5575     5 65844 7.593706e-05
## 5576     5 65844 7.593706e-05
## 5577     5 65844 7.593706e-05
## 5578     5 65844 7.593706e-05
## 5579     5 65844 7.593706e-05
## 5580     5 65844 7.593706e-05
## 5581     5 65844 7.593706e-05
## 5582     5 65844 7.593706e-05
## 5583     5 65844 7.593706e-05
## 5584     5 65844 7.593706e-05
## 5585     5 65844 7.593706e-05
## 5586     5 65844 7.593706e-05
## 5587     5 65844 7.593706e-05
## 5588     5 65844 7.593706e-05
## 5589     5 65844 7.593706e-05
## 5590     5 65844 7.593706e-05
## 5591     5 65844 7.593706e-05
## 5592     5 65844 7.593706e-05
## 5593     5 65844 7.593706e-05
## 5594     5 65844 7.593706e-05
## 5595     5 65844 7.593706e-05
## 5596     5 65844 7.593706e-05
## 5597     5 65844 7.593706e-05
## 5598     5 65844 7.593706e-05
## 5599     5 65844 7.593706e-05
## 5600     5 65844 7.593706e-05
## 5601     5 65844 7.593706e-05
## 5602     5 65844 7.593706e-05
## 5603     5 65844 7.593706e-05
## 5604     5 65844 7.593706e-05
## 5605     5 65844 7.593706e-05
## 5606     5 65844 7.593706e-05
## 5607     5 65844 7.593706e-05
## 5608     5 65844 7.593706e-05
## 5609     5 65844 7.593706e-05
## 5610     5 65844 7.593706e-05
## 5611     5 65844 7.593706e-05
## 5612     5 65844 7.593706e-05
## 5613     5 65844 7.593706e-05
## 5614     5 65844 7.593706e-05
## 5615     5 65844 7.593706e-05
## 5616     5 65844 7.593706e-05
## 5617     5 65844 7.593706e-05
## 5618     5 65844 7.593706e-05
## 5619     5 65844 7.593706e-05
## 5620     5 65844 7.593706e-05
## 5621     5 65844 7.593706e-05
## 5622     5 65844 7.593706e-05
## 5623     5 65844 7.593706e-05
## 5624     5 65844 7.593706e-05
## 5625     5 65844 7.593706e-05
## 5626     5 65844 7.593706e-05
## 5627     5 65844 7.593706e-05
## 5628     5 65844 7.593706e-05
## 5629     5 65844 7.593706e-05
## 5630     5 65844 7.593706e-05
## 5631     5 65844 7.593706e-05
## 5632     5 65844 7.593706e-05
## 5633     5 65844 7.593706e-05
## 5634     5 65844 7.593706e-05
## 5635     5 65844 7.593706e-05
## 5636     5 65844 7.593706e-05
## 5637     5 65844 7.593706e-05
## 5638     5 65844 7.593706e-05
## 5639     5 65844 7.593706e-05
## 5640     5 65844 7.593706e-05
## 5641     5 65844 7.593706e-05
## 5642     5 65844 7.593706e-05
## 5643     5 65844 7.593706e-05
## 5644     5 65844 7.593706e-05
## 5645     5 65844 7.593706e-05
## 5646     5 65844 7.593706e-05
## 5647     5 65844 7.593706e-05
## 5648     5 65844 7.593706e-05
## 5649     5 65844 7.593706e-05
## 5650     5 65844 7.593706e-05
## 5651     5 65844 7.593706e-05
## 5652     5 65844 7.593706e-05
## 5653     5 65844 7.593706e-05
## 5654     5 65844 7.593706e-05
## 5655     5 65844 7.593706e-05
## 5656     5 65844 7.593706e-05
## 5657     5 65844 7.593706e-05
## 5658     5 65844 7.593706e-05
## 5659     5 65844 7.593706e-05
## 5660     5 65844 7.593706e-05
## 5661     5 65844 7.593706e-05
## 5662     5 65844 7.593706e-05
## 5663     5 65844 7.593706e-05
## 5664     5 65844 7.593706e-05
## 5665     5 65844 7.593706e-05
## 5666     5 65844 7.593706e-05
## 5667     5 65844 7.593706e-05
## 5668     5 65844 7.593706e-05
## 5669     5 65844 7.593706e-05
## 5670     5 65844 7.593706e-05
## 5671     5 65844 7.593706e-05
## 5672     5 65844 7.593706e-05
## 5673     5 65844 7.593706e-05
## 5674     5 65844 7.593706e-05
## 5675     5 65844 7.593706e-05
## 5676     5 65844 7.593706e-05
## 5677     5 65844 7.593706e-05
## 5678     5 65844 7.593706e-05
## 5679     5 65844 7.593706e-05
## 5680     5 65844 7.593706e-05
## 5681     5 65844 7.593706e-05
## 5682     5 65844 7.593706e-05
## 5683     5 65844 7.593706e-05
## 5684     5 65844 7.593706e-05
## 5685     5 65844 7.593706e-05
## 5686     5 65844 7.593706e-05
## 5687     5 65844 7.593706e-05
## 5688     5 65844 7.593706e-05
## 5689     5 65844 7.593706e-05
## 5690     5 65844 7.593706e-05
## 5691     5 65844 7.593706e-05
## 5692     5 65844 7.593706e-05
## 5693     5 65844 7.593706e-05
## 5694     5 65844 7.593706e-05
## 5695     5 65844 7.593706e-05
## 5696     5 65844 7.593706e-05
## 5697     5 65844 7.593706e-05
## 5698     5 65844 7.593706e-05
## 5699     5 65844 7.593706e-05
## 5700     5 65844 7.593706e-05
## 5701     5 65844 7.593706e-05
## 5702     5 65844 7.593706e-05
## 5703     5 65844 7.593706e-05
## 5704     5 65844 7.593706e-05
## 5705     5 65844 7.593706e-05
## 5706     5 65844 7.593706e-05
## 5707     5 65844 7.593706e-05
## 5708     5 65844 7.593706e-05
## 5709     5 65844 7.593706e-05
## 5710     5 65844 7.593706e-05
## 5711     5 65844 7.593706e-05
## 5712     5 65844 7.593706e-05
## 5713     5 65844 7.593706e-05
## 5714     5 65844 7.593706e-05
## 5715     5 65844 7.593706e-05
## 5716     5 65844 7.593706e-05
## 5717     5 65844 7.593706e-05
## 5718     5 65844 7.593706e-05
## 5719     5 65844 7.593706e-05
## 5720     5 65844 7.593706e-05
## 5721     5 65844 7.593706e-05
## 5722     5 65844 7.593706e-05
## 5723     5 65844 7.593706e-05
## 5724     5 65844 7.593706e-05
## 5725     5 65844 7.593706e-05
## 5726     5 65844 7.593706e-05
## 5727     5 65844 7.593706e-05
## 5728     5 65844 7.593706e-05
## 5729     5 65844 7.593706e-05
## 5730     5 65844 7.593706e-05
## 5731     5 65844 7.593706e-05
## 5732     5 65844 7.593706e-05
## 5733     5 65844 7.593706e-05
## 5734     5 65844 7.593706e-05
## 5735     5 65844 7.593706e-05
## 5736     5 65844 7.593706e-05
## 5737     5 65844 7.593706e-05
## 5738     5 65844 7.593706e-05
## 5739     5 65844 7.593706e-05
## 5740     5 65844 7.593706e-05
## 5741     5 65844 7.593706e-05
## 5742     5 65844 7.593706e-05
## 5743     5 65844 7.593706e-05
## 5744     5 65844 7.593706e-05
## 5745     5 65844 7.593706e-05
## 5746     5 65844 7.593706e-05
## 5747     5 65844 7.593706e-05
## 5748     5 65844 7.593706e-05
## 5749     5 65844 7.593706e-05
## 5750     5 65844 7.593706e-05
## 5751     5 65844 7.593706e-05
## 5752     5 65844 7.593706e-05
## 5753     5 65844 7.593706e-05
## 5754     5 65844 7.593706e-05
## 5755     5 65844 7.593706e-05
## 5756     5 65844 7.593706e-05
## 5757     5 65844 7.593706e-05
## 5758     5 65844 7.593706e-05
## 5759     5 65844 7.593706e-05
## 5760     5 65844 7.593706e-05
## 5761     5 65844 7.593706e-05
## 5762     5 65844 7.593706e-05
## 5763     5 65844 7.593706e-05
## 5764     5 65844 7.593706e-05
## 5765     5 65844 7.593706e-05
## 5766     5 65844 7.593706e-05
## 5767     5 65844 7.593706e-05
## 5768     5 65844 7.593706e-05
## 5769     5 65844 7.593706e-05
## 5770     5 65844 7.593706e-05
## 5771     5 65844 7.593706e-05
## 5772     5 65844 7.593706e-05
## 5773     5 65844 7.593706e-05
## 5774     5 65844 7.593706e-05
## 5775     5 65844 7.593706e-05
## 5776     5 65844 7.593706e-05
## 5777     5 65844 7.593706e-05
## 5778     5 65844 7.593706e-05
## 5779     5 65844 7.593706e-05
## 5780     5 65844 7.593706e-05
## 5781     5 65844 7.593706e-05
## 5782     5 65844 7.593706e-05
## 5783     5 65844 7.593706e-05
## 5784     5 65844 7.593706e-05
## 5785     5 65844 7.593706e-05
## 5786     5 65844 7.593706e-05
## 5787     5 65844 7.593706e-05
## 5788     5 65844 7.593706e-05
## 5789     5 65844 7.593706e-05
## 5790     5 65844 7.593706e-05
## 5791     5 65844 7.593706e-05
## 5792     5 65844 7.593706e-05
## 5793     5 65844 7.593706e-05
## 5794     5 65844 7.593706e-05
## 5795     5 65844 7.593706e-05
## 5796     5 65844 7.593706e-05
## 5797     5 65844 7.593706e-05
## 5798     5 65844 7.593706e-05
## 5799     5 65844 7.593706e-05
## 5800     5 65844 7.593706e-05
## 5801     5 65844 7.593706e-05
## 5802     5 65844 7.593706e-05
## 5803     5 65844 7.593706e-05
## 5804     5 65844 7.593706e-05
## 5805     5 65844 7.593706e-05
## 5806     5 65844 7.593706e-05
## 5807     5 65844 7.593706e-05
## 5808     5 65844 7.593706e-05
## 5809     5 65844 7.593706e-05
## 5810     5 65844 7.593706e-05
## 5811     5 65844 7.593706e-05
## 5812     5 65844 7.593706e-05
## 5813     5 65844 7.593706e-05
## 5814     5 65844 7.593706e-05
## 5815     5 65844 7.593706e-05
## 5816     5 65844 7.593706e-05
## 5817     5 65844 7.593706e-05
## 5818     5 65844 7.593706e-05
## 5819     5 65844 7.593706e-05
## 5820     5 65844 7.593706e-05
## 5821     5 65844 7.593706e-05
## 5822     5 65844 7.593706e-05
## 5823     5 65844 7.593706e-05
## 5824     5 65844 7.593706e-05
## 5825     5 65844 7.593706e-05
## 5826     5 55641 8.986179e-05
## 5827     5 55641 8.986179e-05
## 5828     5 55641 8.986179e-05
## 5829     5 55641 8.986179e-05
## 5830     5 55641 8.986179e-05
## 5831     5 55641 8.986179e-05
## 5832     5 55641 8.986179e-05
## 5833     5 55641 8.986179e-05
## 5834     5 55641 8.986179e-05
## 5835     5 55641 8.986179e-05
## 5836     5 55641 8.986179e-05
## 5837     5 55641 8.986179e-05
## 5838     5 55641 8.986179e-05
## 5839     5 55641 8.986179e-05
## 5840     5 55641 8.986179e-05
## 5841     5 55641 8.986179e-05
## 5842     5 55641 8.986179e-05
## 5843     5 55641 8.986179e-05
## 5844     5 55641 8.986179e-05
## 5845     5 55641 8.986179e-05
## 5846     5 55641 8.986179e-05
## 5847     5 55641 8.986179e-05
## 5848     5 55641 8.986179e-05
## 5849     5 55641 8.986179e-05
## 5850     5 55641 8.986179e-05
## 5851     5 55641 8.986179e-05
## 5852     5 55641 8.986179e-05
## 5853     5 55641 8.986179e-05
## 5854     5 55641 8.986179e-05
## 5855     5 55641 8.986179e-05
## 5856     5 55641 8.986179e-05
## 5857     5 55641 8.986179e-05
## 5858     5 55641 8.986179e-05
## 5859     5 55641 8.986179e-05
## 5860     5 55641 8.986179e-05
## 5861     5 55641 8.986179e-05
## 5862     5 55641 8.986179e-05
## 5863     5 55641 8.986179e-05
## 5864     5 55641 8.986179e-05
## 5865     5 55641 8.986179e-05
## 5866     5 55641 8.986179e-05
## 5867     5 55641 8.986179e-05
## 5868     5 55641 8.986179e-05
## 5869     5 55641 8.986179e-05
## 5870     5 55641 8.986179e-05
## 5871     5 55641 8.986179e-05
## 5872     5 55641 8.986179e-05
## 5873     5 55641 8.986179e-05
## 5874     5 55641 8.986179e-05
## 5875     5 55641 8.986179e-05
## 5876     5 55641 8.986179e-05
## 5877     5 55641 8.986179e-05
## 5878     5 55641 8.986179e-05
## 5879     5 55641 8.986179e-05
## 5880     5 55641 8.986179e-05
## 5881     5 55641 8.986179e-05
## 5882     5 55641 8.986179e-05
## 5883     5 55641 8.986179e-05
## 5884     5 55641 8.986179e-05
## 5885     5 55641 8.986179e-05
## 5886     5 55641 8.986179e-05
## 5887     5 55641 8.986179e-05
## 5888     5 55641 8.986179e-05
## 5889     5 55641 8.986179e-05
## 5890     5 55641 8.986179e-05
## 5891     5 55641 8.986179e-05
## 5892     5 55641 8.986179e-05
## 5893     5 55641 8.986179e-05
## 5894     5 55641 8.986179e-05
## 5895     5 55641 8.986179e-05
## 5896     5 55641 8.986179e-05
## 5897     5 55641 8.986179e-05
## 5898     5 55641 8.986179e-05
## 5899     5 55641 8.986179e-05
## 5900     5 55641 8.986179e-05
## 5901     5 55641 8.986179e-05
## 5902     5 55641 8.986179e-05
## 5903     5 55641 8.986179e-05
## 5904     5 55641 8.986179e-05
## 5905     5 55641 8.986179e-05
## 5906     5 55641 8.986179e-05
## 5907     5 55641 8.986179e-05
## 5908     5 55641 8.986179e-05
## 5909     5 55641 8.986179e-05
## 5910     5 55641 8.986179e-05
## 5911     5 55641 8.986179e-05
## 5912     5 55641 8.986179e-05
## 5913     5 55641 8.986179e-05
## 5914     5 55641 8.986179e-05
## 5915     5 55641 8.986179e-05
## 5916     5 55641 8.986179e-05
## 5917     5 55641 8.986179e-05
## 5918     5 55641 8.986179e-05
## 5919     5 55641 8.986179e-05
## 5920     5 55641 8.986179e-05
## 5921     5 55641 8.986179e-05
## 5922     5 55641 8.986179e-05
## 5923     5 55641 8.986179e-05
## 5924     5 55641 8.986179e-05
## 5925     5 55641 8.986179e-05
## 5926     5 55641 8.986179e-05
## 5927     5 55641 8.986179e-05
## 5928     5 55641 8.986179e-05
## 5929     5 55641 8.986179e-05
## 5930     5 55641 8.986179e-05
## 5931     5 55641 8.986179e-05
## 5932     5 55641 8.986179e-05
## 5933     5 55641 8.986179e-05
## 5934     5 55641 8.986179e-05
## 5935     5 55641 8.986179e-05
## 5936     5 55641 8.986179e-05
## 5937     5 55641 8.986179e-05
## 5938     5 55641 8.986179e-05
## 5939     5 55641 8.986179e-05
## 5940     5 55641 8.986179e-05
## 5941     5 55641 8.986179e-05
## 5942     5 55641 8.986179e-05
## 5943     5 55641 8.986179e-05
## 5944     5 55641 8.986179e-05
## 5945     5 55641 8.986179e-05
## 5946     5 55641 8.986179e-05
## 5947     5 55641 8.986179e-05
## 5948     5 55641 8.986179e-05
## 5949     5 55641 8.986179e-05
## 5950     5 55641 8.986179e-05
## 5951     5 55641 8.986179e-05
## 5952     5 55641 8.986179e-05
## 5953     5 55641 8.986179e-05
## 5954     5 55641 8.986179e-05
## 5955     5 55641 8.986179e-05
## 5956     5 55641 8.986179e-05
## 5957     5 55641 8.986179e-05
## 5958     5 55641 8.986179e-05
## 5959     5 55641 8.986179e-05
## 5960     5 55641 8.986179e-05
## 5961     5 55641 8.986179e-05
## 5962     5 55641 8.986179e-05
## 5963     5 55641 8.986179e-05
## 5964     5 55641 8.986179e-05
## 5965     5 55641 8.986179e-05
## 5966     5 55641 8.986179e-05
## 5967     5 55641 8.986179e-05
## 5968     5 55641 8.986179e-05
## 5969     5 55641 8.986179e-05
## 5970     5 55641 8.986179e-05
## 5971     5 55641 8.986179e-05
## 5972     5 55641 8.986179e-05
## 5973     5 55641 8.986179e-05
## 5974     5 55641 8.986179e-05
## 5975     5 55641 8.986179e-05
## 5976     5 55641 8.986179e-05
## 5977     5 55641 8.986179e-05
## 5978     5 55641 8.986179e-05
## 5979     5 55641 8.986179e-05
## 5980     5 55641 8.986179e-05
## 5981     5 55641 8.986179e-05
## 5982     5 55641 8.986179e-05
## 5983     5 55641 8.986179e-05
## 5984     5 55641 8.986179e-05
## 5985     5 55641 8.986179e-05
## 5986     5 55641 8.986179e-05
## 5987     5 55641 8.986179e-05
## 5988     5 55641 8.986179e-05
## 5989     5 55641 8.986179e-05
## 5990     5 55641 8.986179e-05
## 5991     5 55641 8.986179e-05
## 5992     5 55641 8.986179e-05
## 5993     5 55641 8.986179e-05
## 5994     5 55641 8.986179e-05
## 5995     5 55641 8.986179e-05
## 5996     5 55641 8.986179e-05
## 5997     5 55641 8.986179e-05
## 5998     5 55641 8.986179e-05
## 5999     5 55641 8.986179e-05
## 6000     5 55641 8.986179e-05
## 6001     5 55641 8.986179e-05
## 6002     5 55641 8.986179e-05
## 6003     5 55641 8.986179e-05
## 6004     5 55641 8.986179e-05
## 6005     5 55641 8.986179e-05
## 6006     5 55641 8.986179e-05
## 6007     5 55641 8.986179e-05
## 6008     5 55641 8.986179e-05
## 6009     5 55641 8.986179e-05
## 6010     5 55641 8.986179e-05
## 6011     5 55641 8.986179e-05
## 6012     5 55641 8.986179e-05
## 6013     5 55641 8.986179e-05
## 6014     5 55641 8.986179e-05
## 6015     5 55641 8.986179e-05
## 6016     5 55641 8.986179e-05
## 6017     5 55641 8.986179e-05
## 6018     5 55641 8.986179e-05
## 6019     5 55641 8.986179e-05
## 6020     5 55641 8.986179e-05
## 6021     5 55641 8.986179e-05
## 6022     5 55641 8.986179e-05
## 6023     5 55641 8.986179e-05
## 6024     5 55641 8.986179e-05
## 6025     5 55641 8.986179e-05
## 6026     5 55641 8.986179e-05
## 6027     5 55641 8.986179e-05
## 6028     5 55641 8.986179e-05
## 6029     5 55641 8.986179e-05
## 6030     5 55641 8.986179e-05
## 6031     5 55641 8.986179e-05
## 6032     5 55641 8.986179e-05
## 6033     5 55641 8.986179e-05
## 6034     5 55641 8.986179e-05
## 6035     5 55641 8.986179e-05
## 6036     5 55641 8.986179e-05
## 6037     5 55641 8.986179e-05
## 6038     5 55641 8.986179e-05
## 6039     5 55641 8.986179e-05
## 6040     5 55641 8.986179e-05
## 6041     5 55641 8.986179e-05
## 6042     5 55641 8.986179e-05
## 6043     5 55641 8.986179e-05
## 6044     5 55641 8.986179e-05
## 6045     5 55641 8.986179e-05
## 6046     5 55641 8.986179e-05
## 6047     5 55641 8.986179e-05
## 6048     5 55641 8.986179e-05
## 6049     5 55641 8.986179e-05
## 6050     5 55641 8.986179e-05
## 6051     5 55641 8.986179e-05
## 6052     5 55641 8.986179e-05
## 6053     5 55641 8.986179e-05
## 6054     5 55641 8.986179e-05
## 6055     5 55641 8.986179e-05
## 6056     5 55641 8.986179e-05
## 6057     5 55641 8.986179e-05
## 6058     5 55641 8.986179e-05
## 6059     5 55641 8.986179e-05
## 6060     5 55641 8.986179e-05
## 6061     5 55641 8.986179e-05
## 6062     5 55641 8.986179e-05
## 6063     5 55641 8.986179e-05
## 6064     5 55641 8.986179e-05
## 6065     5 55641 8.986179e-05
## 6066     5 55641 8.986179e-05
## 6067     5 55641 8.986179e-05
## 6068     5 55641 8.986179e-05
## 6069     5 55641 8.986179e-05
## 6070     5 55641 8.986179e-05
## 6071     5 55641 8.986179e-05
## 6072     5 55641 8.986179e-05
## 6073     5 55641 8.986179e-05
## 6074     5 55641 8.986179e-05
## 6075     5 55641 8.986179e-05
## 6076     5 55641 8.986179e-05
## 6077     5 55641 8.986179e-05
## 6078     5 55641 8.986179e-05
## 6079     5 55641 8.986179e-05
## 6080     5 55641 8.986179e-05
## 6081     5 55641 8.986179e-05
## 6082     5 55641 8.986179e-05
## 6083     5 55641 8.986179e-05
## 6084     5 55641 8.986179e-05
## 6085     5 55641 8.986179e-05
## 6086     5 55641 8.986179e-05
## 6087     5 55641 8.986179e-05
## 6088     5 55641 8.986179e-05
## 6089     5 55641 8.986179e-05
## 6090     5 55641 8.986179e-05
## 6091     5 55641 8.986179e-05
## 6092     5 55641 8.986179e-05
## 6093     5 55641 8.986179e-05
## 6094     5 55641 8.986179e-05
## 6095     5 55641 8.986179e-05
## 6096     5 55641 8.986179e-05
## 6097     5 55641 8.986179e-05
## 6098     5 55641 8.986179e-05
## 6099     5 55641 8.986179e-05
## 6100     5 55641 8.986179e-05
## 6101     5 55641 8.986179e-05
## 6102     5 55641 8.986179e-05
## 6103     5 55641 8.986179e-05
## 6104     5 55641 8.986179e-05
## 6105     5 55641 8.986179e-05
## 6106     5 55641 8.986179e-05
## 6107     5 55641 8.986179e-05
## 6108     5 55641 8.986179e-05
## 6109     5 55641 8.986179e-05
## 6110     5 55641 8.986179e-05
## 6111     5 55641 8.986179e-05
## 6112     5 55641 8.986179e-05
## 6113     5 55641 8.986179e-05
## 6114     5 55641 8.986179e-05
## 6115     5 55641 8.986179e-05
## 6116     5 55641 8.986179e-05
## 6117     5 55641 8.986179e-05
## 6118     5 55641 8.986179e-05
## 6119     5 55641 8.986179e-05
## 6120     5 55641 8.986179e-05
## 6121     5 55641 8.986179e-05
## 6122     5 55641 8.986179e-05
## 6123     5 55641 8.986179e-05
## 6124     5 55641 8.986179e-05
## 6125     5 55641 8.986179e-05
## 6126     5 55641 8.986179e-05
## 6127     5 55641 8.986179e-05
## 6128     5 55641 8.986179e-05
## 6129     5 55641 8.986179e-05
## 6130     5 55641 8.986179e-05
## 6131     5 55641 8.986179e-05
## 6132     5 55641 8.986179e-05
## 6133     5 55641 8.986179e-05
## 6134     5 55641 8.986179e-05
## 6135     5 55641 8.986179e-05
## 6136     5 55641 8.986179e-05
## 6137     5 55641 8.986179e-05
## 6138     5 55641 8.986179e-05
## 6139     5 55641 8.986179e-05
## 6140     5 55641 8.986179e-05
## 6141     5 55641 8.986179e-05
## 6142     5 55641 8.986179e-05
## 6143     4 66780 5.989817e-05
## 6144     4 66780 5.989817e-05
## 6145     4 66780 5.989817e-05
## 6146     4 66780 5.989817e-05
## 6147     4 66780 5.989817e-05
## 6148     4 66780 5.989817e-05
## 6149     4 66780 5.989817e-05
## 6150     4 66780 5.989817e-05
## 6151     4 66780 5.989817e-05
## 6152     4 66780 5.989817e-05
## 6153     4 66780 5.989817e-05
## 6154     4 66780 5.989817e-05
## 6155     4 66780 5.989817e-05
## 6156     4 66780 5.989817e-05
## 6157     4 66780 5.989817e-05
## 6158     4 66780 5.989817e-05
## 6159     4 66780 5.989817e-05
## 6160     4 66780 5.989817e-05
## 6161     4 66780 5.989817e-05
## 6162     4 66780 5.989817e-05
## 6163     4 66780 5.989817e-05
## 6164     4 66780 5.989817e-05
## 6165     4 66780 5.989817e-05
## 6166     4 66780 5.989817e-05
## 6167     4 66780 5.989817e-05
## 6168     4 66780 5.989817e-05
## 6169     4 66780 5.989817e-05
## 6170     4 66780 5.989817e-05
## 6171     4 66780 5.989817e-05
## 6172     4 66780 5.989817e-05
## 6173     4 66780 5.989817e-05
## 6174     4 66780 5.989817e-05
## 6175     4 66780 5.989817e-05
## 6176     4 66780 5.989817e-05
## 6177     4 66780 5.989817e-05
## 6178     4 66780 5.989817e-05
## 6179     4 66780 5.989817e-05
## 6180     4 66780 5.989817e-05
## 6181     4 66780 5.989817e-05
## 6182     4 66780 5.989817e-05
## 6183     4 66780 5.989817e-05
## 6184     4 66780 5.989817e-05
## 6185     4 66780 5.989817e-05
## 6186     4 66780 5.989817e-05
## 6187     4 66780 5.989817e-05
## 6188     4 66780 5.989817e-05
## 6189     4 66780 5.989817e-05
## 6190     4 66780 5.989817e-05
## 6191     4 66780 5.989817e-05
## 6192     4 66780 5.989817e-05
## 6193     4 66780 5.989817e-05
## 6194     4 66780 5.989817e-05
## 6195     4 66780 5.989817e-05
## 6196     4 66780 5.989817e-05
## 6197     4 66780 5.989817e-05
## 6198     4 66780 5.989817e-05
## 6199     4 66780 5.989817e-05
## 6200     4 66780 5.989817e-05
## 6201     4 66780 5.989817e-05
## 6202     4 66780 5.989817e-05
## 6203     4 66780 5.989817e-05
## 6204     4 66780 5.989817e-05
## 6205     4 66780 5.989817e-05
## 6206     4 66780 5.989817e-05
## 6207     4 66780 5.989817e-05
## 6208     4 66780 5.989817e-05
## 6209     4 66780 5.989817e-05
## 6210     4 66780 5.989817e-05
## 6211     4 66780 5.989817e-05
## 6212     4 66780 5.989817e-05
## 6213     4 66780 5.989817e-05
## 6214     4 66780 5.989817e-05
## 6215     4 66780 5.989817e-05
## 6216     4 66780 5.989817e-05
## 6217     4 66780 5.989817e-05
## 6218     4 66780 5.989817e-05
## 6219     4 66780 5.989817e-05
## 6220     4 66780 5.989817e-05
## 6221     4 66780 5.989817e-05
## 6222     4 66780 5.989817e-05
## 6223     4 66780 5.989817e-05
## 6224     4 66780 5.989817e-05
## 6225     4 66780 5.989817e-05
## 6226     4 66780 5.989817e-05
## 6227     4 66780 5.989817e-05
## 6228     4 66780 5.989817e-05
## 6229     4 66780 5.989817e-05
## 6230     4 66780 5.989817e-05
## 6231     4 66780 5.989817e-05
## 6232     4 66780 5.989817e-05
## 6233     4 66780 5.989817e-05
## 6234     4 66780 5.989817e-05
## 6235     4 66780 5.989817e-05
## 6236     4 66780 5.989817e-05
## 6237     4 66780 5.989817e-05
## 6238     4 66780 5.989817e-05
## 6239     4 66780 5.989817e-05
## 6240     4 66780 5.989817e-05
## 6241     4 66780 5.989817e-05
## 6242     4 66780 5.989817e-05
## 6243     4 66780 5.989817e-05
## 6244     4 66780 5.989817e-05
## 6245     4 66780 5.989817e-05
## 6246     4 66780 5.989817e-05
## 6247     4 66780 5.989817e-05
## 6248     4 66780 5.989817e-05
## 6249     4 66780 5.989817e-05
## 6250     4 66780 5.989817e-05
## 6251     4 66780 5.989817e-05
## 6252     4 66780 5.989817e-05
## 6253     4 66780 5.989817e-05
## 6254     4 66780 5.989817e-05
## 6255     4 66780 5.989817e-05
## 6256     4 66780 5.989817e-05
## 6257     4 66780 5.989817e-05
## 6258     4 66780 5.989817e-05
## 6259     4 66780 5.989817e-05
## 6260     4 66780 5.989817e-05
## 6261     4 66780 5.989817e-05
## 6262     4 66780 5.989817e-05
## 6263     4 66780 5.989817e-05
## 6264     4 66780 5.989817e-05
## 6265     4 66780 5.989817e-05
## 6266     4 66780 5.989817e-05
## 6267     4 66780 5.989817e-05
## 6268     4 66780 5.989817e-05
## 6269     4 66780 5.989817e-05
## 6270     4 66780 5.989817e-05
## 6271     4 66780 5.989817e-05
## 6272     4 66780 5.989817e-05
## 6273     4 66780 5.989817e-05
## 6274     4 66780 5.989817e-05
## 6275     4 66780 5.989817e-05
## 6276     4 66780 5.989817e-05
## 6277     4 66780 5.989817e-05
## 6278     4 66780 5.989817e-05
## 6279     4 66780 5.989817e-05
## 6280     4 66780 5.989817e-05
## 6281     4 66780 5.989817e-05
## 6282     4 66780 5.989817e-05
## 6283     4 66780 5.989817e-05
## 6284     4 66780 5.989817e-05
## 6285     4 66780 5.989817e-05
## 6286     4 66780 5.989817e-05
## 6287     4 66780 5.989817e-05
## 6288     4 66780 5.989817e-05
## 6289     4 66780 5.989817e-05
## 6290     4 66780 5.989817e-05
## 6291     4 66780 5.989817e-05
## 6292     4 66780 5.989817e-05
## 6293     4 66780 5.989817e-05
## 6294     4 66780 5.989817e-05
## 6295     4 66780 5.989817e-05
## 6296     4 66780 5.989817e-05
## 6297     4 66780 5.989817e-05
## 6298     4 66780 5.989817e-05
## 6299     4 66780 5.989817e-05
## 6300     4 66780 5.989817e-05
## 6301     4 66780 5.989817e-05
## 6302     4 66780 5.989817e-05
## 6303     4 66780 5.989817e-05
## 6304     4 66780 5.989817e-05
## 6305     4 66780 5.989817e-05
## 6306     4 66780 5.989817e-05
## 6307     4 66780 5.989817e-05
## 6308     4 66780 5.989817e-05
## 6309     4 66780 5.989817e-05
## 6310     4 66780 5.989817e-05
## 6311     4 66780 5.989817e-05
## 6312     4 66780 5.989817e-05
## 6313     4 66780 5.989817e-05
## 6314     4 66780 5.989817e-05
## 6315     4 66780 5.989817e-05
## 6316     4 66780 5.989817e-05
## 6317     4 66780 5.989817e-05
## 6318     4 66780 5.989817e-05
## 6319     4 66780 5.989817e-05
## 6320     4 66780 5.989817e-05
## 6321     4 66780 5.989817e-05
## 6322     4 66780 5.989817e-05
## 6323     4 66780 5.989817e-05
## 6324     4 66780 5.989817e-05
## 6325     4 66780 5.989817e-05
## 6326     4 66780 5.989817e-05
## 6327     4 66780 5.989817e-05
## 6328     4 66780 5.989817e-05
## 6329     4 66780 5.989817e-05
## 6330     4 66780 5.989817e-05
## 6331     4 66780 5.989817e-05
## 6332     4 66780 5.989817e-05
## 6333     4 66780 5.989817e-05
## 6334     4 66780 5.989817e-05
## 6335     4 66780 5.989817e-05
## 6336     4 66780 5.989817e-05
## 6337     4 66780 5.989817e-05
## 6338     4 66780 5.989817e-05
## 6339     4 66780 5.989817e-05
## 6340     4 66780 5.989817e-05
## 6341     4 66780 5.989817e-05
## 6342     4 66780 5.989817e-05
## 6343     4 66780 5.989817e-05
## 6344     4 66780 5.989817e-05
## 6345     4 66780 5.989817e-05
## 6346     4 66780 5.989817e-05
## 6347     4 66780 5.989817e-05
## 6348     4 66780 5.989817e-05
## 6349     4 66780 5.989817e-05
## 6350     4 66780 5.989817e-05
## 6351     4 66780 5.989817e-05
## 6352     4 66780 5.989817e-05
## 6353     4 66780 5.989817e-05
## 6354     4 66780 5.989817e-05
## 6355     4 66780 5.989817e-05
## 6356     4 66780 5.989817e-05
## 6357     4 66780 5.989817e-05
## 6358     4 66780 5.989817e-05
## 6359     4 66780 5.989817e-05
## 6360     4 66780 5.989817e-05
## 6361     4 66780 5.989817e-05
## 6362     4 66780 5.989817e-05
## 6363     4 66780 5.989817e-05
## 6364     4 66780 5.989817e-05
## 6365     4 66780 5.989817e-05
## 6366     4 66780 5.989817e-05
## 6367     4 66780 5.989817e-05
## 6368     4 66780 5.989817e-05
## 6369     4 66780 5.989817e-05
## 6370     4 66780 5.989817e-05
## 6371     4 66780 5.989817e-05
## 6372     4 66780 5.989817e-05
## 6373     4 66780 5.989817e-05
## 6374     4 66780 5.989817e-05
## 6375     4 66780 5.989817e-05
## 6376     4 66780 5.989817e-05
## 6377     4 66780 5.989817e-05
## 6378     4 66780 5.989817e-05
## 6379     4 66780 5.989817e-05
## 6380     4 66780 5.989817e-05
## 6381     4 66780 5.989817e-05
## 6382     4 66780 5.989817e-05
## 6383     4 66780 5.989817e-05
## 6384     4 66780 5.989817e-05
## 6385     4 66780 5.989817e-05
## 6386     4 66780 5.989817e-05
## 6387     4 66780 5.989817e-05
## 6388     4 66780 5.989817e-05
## 6389     4 66780 5.989817e-05
## 6390     4 66780 5.989817e-05
## 6391     4 66780 5.989817e-05
## 6392     4 66780 5.989817e-05
## 6393     4 66780 5.989817e-05
## 6394     4 66780 5.989817e-05
## 6395     4 66780 5.989817e-05
## 6396     4 66780 5.989817e-05
## 6397     4 66780 5.989817e-05
## 6398     4 66780 5.989817e-05
## 6399     4 66780 5.989817e-05
## 6400     4 66780 5.989817e-05
## 6401     4 66780 5.989817e-05
## 6402     4 66780 5.989817e-05
## 6403     4 66780 5.989817e-05
## 6404     4 66780 5.989817e-05
## 6405     4 66780 5.989817e-05
## 6406     4 66780 5.989817e-05
## 6407     4 66780 5.989817e-05
## 6408     4 66780 5.989817e-05
## 6409     4 66780 5.989817e-05
## 6410     4 66780 5.989817e-05
## 6411     4 66780 5.989817e-05
## 6412     4 66780 5.989817e-05
## 6413     4 66780 5.989817e-05
## 6414     4 66780 5.989817e-05
## 6415     4 66780 5.989817e-05
## 6416     4 66780 5.989817e-05
## 6417     4 66780 5.989817e-05
## 6418     4 66780 5.989817e-05
## 6419     4 66780 5.989817e-05
## 6420     4 66780 5.989817e-05
## 6421     4 66780 5.989817e-05
## 6422     4 66780 5.989817e-05
## 6423     4 66780 5.989817e-05
## 6424     4 66780 5.989817e-05
## 6425     4 66780 5.989817e-05
## 6426     4 66780 5.989817e-05
## 6427     4 66780 5.989817e-05
## 6428     4 66780 5.989817e-05
## 6429     4 66780 5.989817e-05
## 6430     4 66780 5.989817e-05
## 6431     4 66780 5.989817e-05
## 6432     4 66780 5.989817e-05
## 6433     4 66780 5.989817e-05
## 6434     4 66780 5.989817e-05
## 6435     4 66780 5.989817e-05
## 6436     4 66780 5.989817e-05
## 6437     4 66780 5.989817e-05
## 6438     4 66780 5.989817e-05
## 6439     4 66780 5.989817e-05
## 6440     4 66780 5.989817e-05
## 6441     4 66780 5.989817e-05
## 6442     4 66780 5.989817e-05
## 6443     4 66780 5.989817e-05
## 6444     4 66780 5.989817e-05
## 6445     4 66780 5.989817e-05
## 6446     4 66780 5.989817e-05
## 6447     4 66780 5.989817e-05
## 6448     4 66780 5.989817e-05
## 6449     4 66780 5.989817e-05
## 6450     4 66780 5.989817e-05
## 6451     4 66780 5.989817e-05
## 6452     4 66780 5.989817e-05
## 6453     4 66780 5.989817e-05
## 6454     4 66780 5.989817e-05
## 6455     4 66780 5.989817e-05
## 6456     4 66780 5.989817e-05
## 6457     4 66780 5.989817e-05
## 6458     4 66780 5.989817e-05
## 6459     4 66780 5.989817e-05
## 6460     4 66780 5.989817e-05
## 6461     4 66780 5.989817e-05
## 6462     4 66780 5.989817e-05
## 6463     4 66780 5.989817e-05
## 6464     4 66780 5.989817e-05
## 6465     4 66780 5.989817e-05
## 6466     4 66780 5.989817e-05
## 6467     4 66780 5.989817e-05
## 6468     4 66780 5.989817e-05
## 6469     4 66780 5.989817e-05
## 6470     4 66780 5.989817e-05
## 6471     4 66780 5.989817e-05
## 6472     4 66780 5.989817e-05
## 6473     4 66780 5.989817e-05
## 6474     4 66780 5.989817e-05
## 6475     4 66780 5.989817e-05
## 6476     4 66780 5.989817e-05
## 6477     4 66780 5.989817e-05
## 6478     4 66780 5.989817e-05
## 6479     4 66780 5.989817e-05
## 6480     4 66780 5.989817e-05
## 6481     4 66780 5.989817e-05
## 6482     4 66780 5.989817e-05
## 6483     4 66780 5.989817e-05
## 6484     4 66780 5.989817e-05
## 6485     4 66780 5.989817e-05
## 6486     4 66780 5.989817e-05
## 6487     4 66780 5.989817e-05
## 6488     4 66780 5.989817e-05
## 6489     4 66780 5.989817e-05
## 6490     4 66780 5.989817e-05
## 6491     4 66780 5.989817e-05
## 6492     4 66780 5.989817e-05
## 6493     4 66780 5.989817e-05
## 6494     4 66780 5.989817e-05
## 6495     4 66780 5.989817e-05
## 6496     4 66780 5.989817e-05
## 6497     4 66780 5.989817e-05
## 6498     4 66780 5.989817e-05
## 6499     4 66780 5.989817e-05
## 6500     4 66780 5.989817e-05
## 6501     4 66780 5.989817e-05
## 6502     4 66780 5.989817e-05
## 6503     4 66780 5.989817e-05
## 6504     4 66780 5.989817e-05
## 6505     4 66780 5.989817e-05
## 6506     4 66780 5.989817e-05
## 6507     4 66780 5.989817e-05
## 6508     4 66780 5.989817e-05
## 6509     4 66780 5.989817e-05
## 6510     4 66780 5.989817e-05
## 6511     4 66780 5.989817e-05
## 6512     4 66780 5.989817e-05
## 6513     4 66780 5.989817e-05
## 6514     4 66780 5.989817e-05
## 6515     4 66780 5.989817e-05
## 6516     4 66780 5.989817e-05
## 6517     4 66780 5.989817e-05
## 6518     4 66780 5.989817e-05
## 6519     4 66780 5.989817e-05
## 6520     4 66780 5.989817e-05
## 6521     4 66780 5.989817e-05
## 6522     4 66780 5.989817e-05
## 6523     4 66780 5.989817e-05
## 6524     4 66780 5.989817e-05
## 6525     4 66780 5.989817e-05
## 6526     4 66780 5.989817e-05
## 6527     4 66780 5.989817e-05
## 6528     4 66780 5.989817e-05
## 6529     4 66780 5.989817e-05
## 6530     4 66780 5.989817e-05
## 6531     4 66780 5.989817e-05
## 6532     4 66780 5.989817e-05
## 6533     4 66780 5.989817e-05
## 6534     4 66780 5.989817e-05
## 6535     4 66780 5.989817e-05
## 6536     4 66780 5.989817e-05
## 6537     4 66780 5.989817e-05
## 6538     4 66780 5.989817e-05
## 6539     4 66780 5.989817e-05
## 6540     4 66780 5.989817e-05
## 6541     4 66780 5.989817e-05
## 6542     4 66780 5.989817e-05
## 6543     4 66780 5.989817e-05
## 6544     4 66780 5.989817e-05
## 6545     4 66780 5.989817e-05
## 6546     4 66780 5.989817e-05
## 6547     4 66780 5.989817e-05
## 6548     4 66780 5.989817e-05
## 6549     4 66780 5.989817e-05
## 6550     4 66780 5.989817e-05
## 6551     4 66780 5.989817e-05
## 6552     4 66780 5.989817e-05
## 6553     4 66780 5.989817e-05
## 6554     4 66780 5.989817e-05
## 6555     4 66780 5.989817e-05
## 6556     4 66780 5.989817e-05
## 6557     4 66780 5.989817e-05
## 6558     4 66780 5.989817e-05
## 6559     4 66780 5.989817e-05
## 6560     4 66780 5.989817e-05
## 6561     4 66780 5.989817e-05
## 6562     4 66780 5.989817e-05
## 6563     4 66780 5.989817e-05
## 6564     4 66780 5.989817e-05
## 6565     4 66780 5.989817e-05
## 6566     4 66780 5.989817e-05
## 6567     4 66780 5.989817e-05
## 6568     4 66780 5.989817e-05
## 6569     4 66780 5.989817e-05
## 6570     4 66780 5.989817e-05
## 6571     4 66780 5.989817e-05
## 6572     4 66780 5.989817e-05
## 6573     4 66780 5.989817e-05
## 6574     4 66780 5.989817e-05
## 6575     4 66780 5.989817e-05
## 6576     4 66780 5.989817e-05
## 6577     4 66780 5.989817e-05
## 6578     4 66780 5.989817e-05
## 6579     4 66780 5.989817e-05
## 6580     4 66780 5.989817e-05
## 6581     4 66780 5.989817e-05
## 6582     4 66780 5.989817e-05
## 6583     4 66780 5.989817e-05
## 6584     4 66780 5.989817e-05
## 6585     4 66780 5.989817e-05
## 6586     4 66780 5.989817e-05
## 6587     4 66780 5.989817e-05
## 6588     4 66780 5.989817e-05
## 6589     4 66780 5.989817e-05
## 6590     4 66780 5.989817e-05
## 6591     4 66780 5.989817e-05
## 6592     4 66780 5.989817e-05
## 6593     4 66780 5.989817e-05
## 6594     4 66780 5.989817e-05
## 6595     4 66780 5.989817e-05
## 6596     4 66780 5.989817e-05
## 6597     4 66780 5.989817e-05
## 6598     4 66780 5.989817e-05
## 6599     4 66780 5.989817e-05
## 6600     4 66780 5.989817e-05
## 6601     4 66780 5.989817e-05
## 6602     4 66780 5.989817e-05
## 6603     4 66780 5.989817e-05
## 6604     4 66780 5.989817e-05
## 6605     4 66780 5.989817e-05
## 6606     4 66780 5.989817e-05
## 6607     4 66780 5.989817e-05
## 6608     4 66780 5.989817e-05
## 6609     4 66780 5.989817e-05
## 6610     4 66780 5.989817e-05
## 6611     4 66780 5.989817e-05
## 6612     4 66780 5.989817e-05
## 6613     4 66780 5.989817e-05
## 6614     4 66780 5.989817e-05
## 6615     4 66780 5.989817e-05
## 6616     4 66780 5.989817e-05
## 6617     4 66780 5.989817e-05
## 6618     4 66780 5.989817e-05
## 6619     4 66780 5.989817e-05
## 6620     4 66780 5.989817e-05
## 6621     4 66780 5.989817e-05
## 6622     4 66780 5.989817e-05
## 6623     4 66780 5.989817e-05
## 6624     4 66780 5.989817e-05
## 6625     4 66780 5.989817e-05
## 6626     4 66780 5.989817e-05
## 6627     4 66780 5.989817e-05
## 6628     4 66780 5.989817e-05
## 6629     4 66780 5.989817e-05
## 6630     4 66780 5.989817e-05
## 6631     4 66780 5.989817e-05
## 6632     4 66780 5.989817e-05
## 6633     4 66780 5.989817e-05
## 6634     4 66780 5.989817e-05
## 6635     4 66780 5.989817e-05
## 6636     4 66780 5.989817e-05
## 6637     4 66780 5.989817e-05
## 6638     4 66780 5.989817e-05
## 6639     4 66780 5.989817e-05
## 6640     4 66780 5.989817e-05
## 6641     4 66780 5.989817e-05
## 6642     4 66780 5.989817e-05
## 6643     4 66780 5.989817e-05
## 6644     4 66780 5.989817e-05
## 6645     4 66780 5.989817e-05
## 6646     4 66780 5.989817e-05
## 6647     4 66780 5.989817e-05
## 6648     4 66780 5.989817e-05
## 6649     4 66780 5.989817e-05
## 6650     4 66780 5.989817e-05
## 6651     4 66780 5.989817e-05
## 6652     4 66780 5.989817e-05
## 6653     4 66780 5.989817e-05
## 6654     4 66780 5.989817e-05
## 6655     4 66780 5.989817e-05
## 6656     4 66780 5.989817e-05
## 6657     4 66780 5.989817e-05
## 6658     4 66780 5.989817e-05
## 6659     4 66780 5.989817e-05
## 6660     4 66780 5.989817e-05
## 6661     4 66780 5.989817e-05
## 6662     4 66780 5.989817e-05
## 6663     4 66780 5.989817e-05
## 6664     4 66780 5.989817e-05
## 6665     4 66780 5.989817e-05
## 6666     4 66780 5.989817e-05
## 6667     4 66780 5.989817e-05
## 6668     4 66780 5.989817e-05
## 6669     4 66780 5.989817e-05
## 6670     4 66780 5.989817e-05
## 6671     4 66780 5.989817e-05
## 6672     4 66780 5.989817e-05
## 6673     4 66780 5.989817e-05
## 6674     4 66780 5.989817e-05
## 6675     4 66780 5.989817e-05
## 6676     4 66780 5.989817e-05
## 6677     4 66780 5.989817e-05
## 6678     4 66780 5.989817e-05
## 6679     4 66780 5.989817e-05
## 6680     4 66780 5.989817e-05
## 6681     4 66780 5.989817e-05
## 6682     4 66780 5.989817e-05
## 6683     4 66780 5.989817e-05
## 6684     4 66780 5.989817e-05
## 6685     4 66780 5.989817e-05
## 6686     4 66780 5.989817e-05
## 6687     4 66780 5.989817e-05
## 6688     4 66780 5.989817e-05
## 6689     4 66780 5.989817e-05
## 6690     4 66780 5.989817e-05
## 6691     4 66780 5.989817e-05
## 6692     4 66780 5.989817e-05
## 6693     4 66780 5.989817e-05
## 6694     4 66780 5.989817e-05
## 6695     4 66780 5.989817e-05
## 6696     4 66780 5.989817e-05
## 6697     4 66780 5.989817e-05
## 6698     4 66780 5.989817e-05
## 6699     4 66780 5.989817e-05
## 6700     4 66780 5.989817e-05
## 6701     4 66780 5.989817e-05
## 6702     4 66780 5.989817e-05
## 6703     4 66780 5.989817e-05
## 6704     4 66780 5.989817e-05
## 6705     4 66780 5.989817e-05
## 6706     4 66780 5.989817e-05
## 6707     4 66780 5.989817e-05
## 6708     4 66780 5.989817e-05
## 6709     4 66780 5.989817e-05
## 6710     4 66780 5.989817e-05
## 6711     4 66780 5.989817e-05
## 6712     4 66780 5.989817e-05
## 6713     4 66780 5.989817e-05
## 6714     4 66780 5.989817e-05
## 6715     4 66780 5.989817e-05
## 6716     4 66780 5.989817e-05
## 6717     4 66780 5.989817e-05
## 6718     4 66780 5.989817e-05
## 6719     4 66780 5.989817e-05
## 6720     4 66780 5.989817e-05
## 6721     4 66780 5.989817e-05
## 6722     4 66780 5.989817e-05
## 6723     4 66780 5.989817e-05
## 6724     4 66780 5.989817e-05
## 6725     4 66780 5.989817e-05
## 6726     4 66780 5.989817e-05
## 6727     4 66780 5.989817e-05
## 6728     4 66780 5.989817e-05
## 6729     4 66780 5.989817e-05
## 6730     4 66780 5.989817e-05
## 6731     4 66780 5.989817e-05
## 6732     4 66780 5.989817e-05
## 6733     4 66780 5.989817e-05
## 6734     4 66780 5.989817e-05
## 6735     4 66780 5.989817e-05
## 6736     4 66780 5.989817e-05
## 6737     4 66780 5.989817e-05
## 6738     4 66780 5.989817e-05
## 6739     4 66780 5.989817e-05
## 6740     4 66780 5.989817e-05
## 6741     4 66780 5.989817e-05
## 6742     4 66780 5.989817e-05
## 6743     4 66780 5.989817e-05
## 6744     4 66780 5.989817e-05
## 6745     4 66780 5.989817e-05
## 6746     4 66780 5.989817e-05
## 6747     4 66780 5.989817e-05
## 6748     4 66780 5.989817e-05
## 6749     4 66780 5.989817e-05
## 6750     4 65844 6.074965e-05
## 6751     4 65844 6.074965e-05
## 6752     4 65844 6.074965e-05
## 6753     4 65844 6.074965e-05
## 6754     4 65844 6.074965e-05
## 6755     4 65844 6.074965e-05
## 6756     4 65844 6.074965e-05
## 6757     4 65844 6.074965e-05
## 6758     4 65844 6.074965e-05
## 6759     4 65844 6.074965e-05
## 6760     4 65844 6.074965e-05
## 6761     4 65844 6.074965e-05
## 6762     4 65844 6.074965e-05
## 6763     4 65844 6.074965e-05
## 6764     4 65844 6.074965e-05
## 6765     4 65844 6.074965e-05
## 6766     4 65844 6.074965e-05
## 6767     4 65844 6.074965e-05
## 6768     4 65844 6.074965e-05
## 6769     4 65844 6.074965e-05
## 6770     4 65844 6.074965e-05
## 6771     4 65844 6.074965e-05
## 6772     4 65844 6.074965e-05
## 6773     4 65844 6.074965e-05
## 6774     4 65844 6.074965e-05
## 6775     4 65844 6.074965e-05
## 6776     4 65844 6.074965e-05
## 6777     4 65844 6.074965e-05
## 6778     4 65844 6.074965e-05
## 6779     4 65844 6.074965e-05
## 6780     4 65844 6.074965e-05
## 6781     4 65844 6.074965e-05
## 6782     4 65844 6.074965e-05
## 6783     4 65844 6.074965e-05
## 6784     4 65844 6.074965e-05
## 6785     4 65844 6.074965e-05
## 6786     4 65844 6.074965e-05
## 6787     4 65844 6.074965e-05
## 6788     4 65844 6.074965e-05
## 6789     4 65844 6.074965e-05
## 6790     4 65844 6.074965e-05
## 6791     4 65844 6.074965e-05
## 6792     4 65844 6.074965e-05
## 6793     4 65844 6.074965e-05
## 6794     4 65844 6.074965e-05
## 6795     4 65844 6.074965e-05
## 6796     4 65844 6.074965e-05
## 6797     4 65844 6.074965e-05
## 6798     4 65844 6.074965e-05
## 6799     4 65844 6.074965e-05
## 6800     4 65844 6.074965e-05
## 6801     4 65844 6.074965e-05
## 6802     4 65844 6.074965e-05
## 6803     4 65844 6.074965e-05
## 6804     4 65844 6.074965e-05
## 6805     4 65844 6.074965e-05
## 6806     4 65844 6.074965e-05
## 6807     4 65844 6.074965e-05
## 6808     4 65844 6.074965e-05
## 6809     4 65844 6.074965e-05
## 6810     4 65844 6.074965e-05
## 6811     4 65844 6.074965e-05
## 6812     4 65844 6.074965e-05
## 6813     4 65844 6.074965e-05
## 6814     4 65844 6.074965e-05
## 6815     4 65844 6.074965e-05
## 6816     4 65844 6.074965e-05
## 6817     4 65844 6.074965e-05
## 6818     4 65844 6.074965e-05
## 6819     4 65844 6.074965e-05
## 6820     4 65844 6.074965e-05
## 6821     4 65844 6.074965e-05
## 6822     4 65844 6.074965e-05
## 6823     4 65844 6.074965e-05
## 6824     4 65844 6.074965e-05
## 6825     4 65844 6.074965e-05
## 6826     4 65844 6.074965e-05
## 6827     4 65844 6.074965e-05
## 6828     4 65844 6.074965e-05
## 6829     4 65844 6.074965e-05
## 6830     4 65844 6.074965e-05
## 6831     4 65844 6.074965e-05
## 6832     4 65844 6.074965e-05
## 6833     4 65844 6.074965e-05
## 6834     4 65844 6.074965e-05
## 6835     4 65844 6.074965e-05
## 6836     4 65844 6.074965e-05
## 6837     4 65844 6.074965e-05
## 6838     4 65844 6.074965e-05
## 6839     4 65844 6.074965e-05
## 6840     4 65844 6.074965e-05
## 6841     4 65844 6.074965e-05
## 6842     4 65844 6.074965e-05
## 6843     4 65844 6.074965e-05
## 6844     4 65844 6.074965e-05
## 6845     4 65844 6.074965e-05
## 6846     4 65844 6.074965e-05
## 6847     4 65844 6.074965e-05
## 6848     4 65844 6.074965e-05
## 6849     4 65844 6.074965e-05
## 6850     4 65844 6.074965e-05
## 6851     4 65844 6.074965e-05
## 6852     4 65844 6.074965e-05
## 6853     4 65844 6.074965e-05
## 6854     4 65844 6.074965e-05
## 6855     4 65844 6.074965e-05
## 6856     4 65844 6.074965e-05
## 6857     4 65844 6.074965e-05
## 6858     4 65844 6.074965e-05
## 6859     4 65844 6.074965e-05
## 6860     4 65844 6.074965e-05
## 6861     4 65844 6.074965e-05
## 6862     4 65844 6.074965e-05
## 6863     4 65844 6.074965e-05
## 6864     4 65844 6.074965e-05
## 6865     4 65844 6.074965e-05
## 6866     4 65844 6.074965e-05
## 6867     4 65844 6.074965e-05
## 6868     4 65844 6.074965e-05
## 6869     4 65844 6.074965e-05
## 6870     4 65844 6.074965e-05
## 6871     4 65844 6.074965e-05
## 6872     4 65844 6.074965e-05
## 6873     4 65844 6.074965e-05
## 6874     4 65844 6.074965e-05
## 6875     4 65844 6.074965e-05
## 6876     4 65844 6.074965e-05
## 6877     4 65844 6.074965e-05
## 6878     4 65844 6.074965e-05
## 6879     4 65844 6.074965e-05
## 6880     4 65844 6.074965e-05
## 6881     4 65844 6.074965e-05
## 6882     4 65844 6.074965e-05
## 6883     4 65844 6.074965e-05
## 6884     4 65844 6.074965e-05
## 6885     4 65844 6.074965e-05
## 6886     4 65844 6.074965e-05
## 6887     4 65844 6.074965e-05
## 6888     4 65844 6.074965e-05
## 6889     4 65844 6.074965e-05
## 6890     4 65844 6.074965e-05
## 6891     4 65844 6.074965e-05
## 6892     4 65844 6.074965e-05
## 6893     4 65844 6.074965e-05
## 6894     4 65844 6.074965e-05
## 6895     4 65844 6.074965e-05
## 6896     4 65844 6.074965e-05
## 6897     4 65844 6.074965e-05
## 6898     4 65844 6.074965e-05
## 6899     4 65844 6.074965e-05
## 6900     4 65844 6.074965e-05
## 6901     4 65844 6.074965e-05
## 6902     4 65844 6.074965e-05
## 6903     4 65844 6.074965e-05
## 6904     4 65844 6.074965e-05
## 6905     4 65844 6.074965e-05
## 6906     4 65844 6.074965e-05
## 6907     4 65844 6.074965e-05
## 6908     4 65844 6.074965e-05
## 6909     4 65844 6.074965e-05
## 6910     4 65844 6.074965e-05
## 6911     4 65844 6.074965e-05
## 6912     4 65844 6.074965e-05
## 6913     4 65844 6.074965e-05
## 6914     4 65844 6.074965e-05
## 6915     4 65844 6.074965e-05
## 6916     4 65844 6.074965e-05
## 6917     4 65844 6.074965e-05
## 6918     4 65844 6.074965e-05
## 6919     4 65844 6.074965e-05
## 6920     4 65844 6.074965e-05
## 6921     4 65844 6.074965e-05
## 6922     4 65844 6.074965e-05
## 6923     4 65844 6.074965e-05
## 6924     4 65844 6.074965e-05
## 6925     4 65844 6.074965e-05
## 6926     4 65844 6.074965e-05
## 6927     4 65844 6.074965e-05
## 6928     4 65844 6.074965e-05
## 6929     4 65844 6.074965e-05
## 6930     4 65844 6.074965e-05
## 6931     4 65844 6.074965e-05
## 6932     4 65844 6.074965e-05
## 6933     4 65844 6.074965e-05
## 6934     4 65844 6.074965e-05
## 6935     4 65844 6.074965e-05
## 6936     4 65844 6.074965e-05
## 6937     4 65844 6.074965e-05
## 6938     4 65844 6.074965e-05
## 6939     4 65844 6.074965e-05
## 6940     4 65844 6.074965e-05
## 6941     4 65844 6.074965e-05
## 6942     4 65844 6.074965e-05
## 6943     4 65844 6.074965e-05
## 6944     4 65844 6.074965e-05
## 6945     4 65844 6.074965e-05
## 6946     4 65844 6.074965e-05
## 6947     4 65844 6.074965e-05
## 6948     4 65844 6.074965e-05
## 6949     4 65844 6.074965e-05
## 6950     4 65844 6.074965e-05
## 6951     4 65844 6.074965e-05
## 6952     4 65844 6.074965e-05
## 6953     4 65844 6.074965e-05
## 6954     4 65844 6.074965e-05
## 6955     4 65844 6.074965e-05
## 6956     4 65844 6.074965e-05
## 6957     4 65844 6.074965e-05
## 6958     4 65844 6.074965e-05
## 6959     4 65844 6.074965e-05
## 6960     4 65844 6.074965e-05
## 6961     4 65844 6.074965e-05
## 6962     4 65844 6.074965e-05
## 6963     4 65844 6.074965e-05
## 6964     4 65844 6.074965e-05
## 6965     4 65844 6.074965e-05
## 6966     4 65844 6.074965e-05
## 6967     4 65844 6.074965e-05
## 6968     4 65844 6.074965e-05
## 6969     4 65844 6.074965e-05
## 6970     4 65844 6.074965e-05
## 6971     4 65844 6.074965e-05
## 6972     4 65844 6.074965e-05
## 6973     4 65844 6.074965e-05
## 6974     4 65844 6.074965e-05
## 6975     4 65844 6.074965e-05
## 6976     4 65844 6.074965e-05
## 6977     4 65844 6.074965e-05
## 6978     4 65844 6.074965e-05
## 6979     4 65844 6.074965e-05
## 6980     4 65844 6.074965e-05
## 6981     4 65844 6.074965e-05
## 6982     4 65844 6.074965e-05
## 6983     4 65844 6.074965e-05
## 6984     4 65844 6.074965e-05
## 6985     4 65844 6.074965e-05
## 6986     4 65844 6.074965e-05
## 6987     4 65844 6.074965e-05
## 6988     4 65844 6.074965e-05
## 6989     4 65844 6.074965e-05
## 6990     4 65844 6.074965e-05
## 6991     4 65844 6.074965e-05
## 6992     4 65844 6.074965e-05
## 6993     4 65844 6.074965e-05
## 6994     4 65844 6.074965e-05
## 6995     4 65844 6.074965e-05
## 6996     4 65844 6.074965e-05
## 6997     4 65844 6.074965e-05
## 6998     4 65844 6.074965e-05
## 6999     4 65844 6.074965e-05
## 7000     4 65844 6.074965e-05
## 7001     4 65844 6.074965e-05
## 7002     4 65844 6.074965e-05
## 7003     4 65844 6.074965e-05
## 7004     4 65844 6.074965e-05
## 7005     4 65844 6.074965e-05
## 7006     4 65844 6.074965e-05
## 7007     4 65844 6.074965e-05
## 7008     4 65844 6.074965e-05
## 7009     4 65844 6.074965e-05
## 7010     4 65844 6.074965e-05
## 7011     4 65844 6.074965e-05
## 7012     4 65844 6.074965e-05
## 7013     4 65844 6.074965e-05
## 7014     4 65844 6.074965e-05
## 7015     4 65844 6.074965e-05
## 7016     4 65844 6.074965e-05
## 7017     4 65844 6.074965e-05
## 7018     4 65844 6.074965e-05
## 7019     4 65844 6.074965e-05
## 7020     4 65844 6.074965e-05
## 7021     4 65844 6.074965e-05
## 7022     4 65844 6.074965e-05
## 7023     4 65844 6.074965e-05
## 7024     4 65844 6.074965e-05
## 7025     4 65844 6.074965e-05
## 7026     4 65844 6.074965e-05
## 7027     4 65844 6.074965e-05
## 7028     4 65844 6.074965e-05
## 7029     4 65844 6.074965e-05
## 7030     4 65844 6.074965e-05
## 7031     4 65844 6.074965e-05
## 7032     4 65844 6.074965e-05
## 7033     4 65844 6.074965e-05
## 7034     4 65844 6.074965e-05
## 7035     4 65844 6.074965e-05
## 7036     4 65844 6.074965e-05
## 7037     4 65844 6.074965e-05
## 7038     4 65844 6.074965e-05
## 7039     4 65844 6.074965e-05
## 7040     4 65844 6.074965e-05
## 7041     4 65844 6.074965e-05
## 7042     4 65844 6.074965e-05
## 7043     4 65844 6.074965e-05
## 7044     4 65844 6.074965e-05
## 7045     4 65844 6.074965e-05
## 7046     4 65844 6.074965e-05
## 7047     4 65844 6.074965e-05
## 7048     4 65844 6.074965e-05
## 7049     4 65844 6.074965e-05
## 7050     4 65844 6.074965e-05
## 7051     4 65844 6.074965e-05
## 7052     4 65844 6.074965e-05
## 7053     4 65844 6.074965e-05
## 7054     4 65844 6.074965e-05
## 7055     4 65844 6.074965e-05
## 7056     4 65844 6.074965e-05
## 7057     4 65844 6.074965e-05
## 7058     4 65844 6.074965e-05
## 7059     4 65844 6.074965e-05
## 7060     4 65844 6.074965e-05
## 7061     4 65844 6.074965e-05
## 7062     4 65844 6.074965e-05
## 7063     4 65844 6.074965e-05
## 7064     4 65844 6.074965e-05
## 7065     4 65844 6.074965e-05
## 7066     4 65844 6.074965e-05
## 7067     4 65844 6.074965e-05
## 7068     4 65844 6.074965e-05
## 7069     4 65844 6.074965e-05
## 7070     4 65844 6.074965e-05
## 7071     4 65844 6.074965e-05
## 7072     4 65844 6.074965e-05
## 7073     4 65844 6.074965e-05
## 7074     4 65844 6.074965e-05
## 7075     4 65844 6.074965e-05
## 7076     4 65844 6.074965e-05
## 7077     4 65844 6.074965e-05
## 7078     4 65844 6.074965e-05
## 7079     4 65844 6.074965e-05
## 7080     4 65844 6.074965e-05
## 7081     4 65844 6.074965e-05
## 7082     4 65844 6.074965e-05
## 7083     4 65844 6.074965e-05
## 7084     4 65844 6.074965e-05
## 7085     4 65844 6.074965e-05
## 7086     4 65844 6.074965e-05
## 7087     4 65844 6.074965e-05
## 7088     4 65844 6.074965e-05
## 7089     4 65844 6.074965e-05
## 7090     4 65844 6.074965e-05
## 7091     4 65844 6.074965e-05
## 7092     4 65844 6.074965e-05
## 7093     4 65844 6.074965e-05
## 7094     4 65844 6.074965e-05
## 7095     4 65844 6.074965e-05
## 7096     4 65844 6.074965e-05
## 7097     4 65844 6.074965e-05
## 7098     4 65844 6.074965e-05
## 7099     4 65844 6.074965e-05
## 7100     4 65844 6.074965e-05
## 7101     4 65844 6.074965e-05
## 7102     4 65844 6.074965e-05
## 7103     4 65844 6.074965e-05
## 7104     4 65844 6.074965e-05
## 7105     4 65844 6.074965e-05
## 7106     4 65844 6.074965e-05
## 7107     4 65844 6.074965e-05
## 7108     4 65844 6.074965e-05
## 7109     4 65844 6.074965e-05
## 7110     4 65844 6.074965e-05
## 7111     4 65844 6.074965e-05
## 7112     4 65844 6.074965e-05
## 7113     4 65844 6.074965e-05
## 7114     4 65844 6.074965e-05
## 7115     4 65844 6.074965e-05
## 7116     4 65844 6.074965e-05
## 7117     4 65844 6.074965e-05
## 7118     4 65844 6.074965e-05
## 7119     4 65844 6.074965e-05
## 7120     4 65844 6.074965e-05
## 7121     4 65844 6.074965e-05
## 7122     4 65844 6.074965e-05
## 7123     4 65844 6.074965e-05
## 7124     4 65844 6.074965e-05
## 7125     4 65844 6.074965e-05
## 7126     4 65844 6.074965e-05
## 7127     4 65844 6.074965e-05
## 7128     4 65844 6.074965e-05
## 7129     4 65844 6.074965e-05
## 7130     4 65844 6.074965e-05
## 7131     4 65844 6.074965e-05
## 7132     4 65844 6.074965e-05
## 7133     4 65844 6.074965e-05
## 7134     4 65844 6.074965e-05
## 7135     4 65844 6.074965e-05
## 7136     4 65844 6.074965e-05
## 7137     4 65844 6.074965e-05
## 7138     4 65844 6.074965e-05
## 7139     4 65844 6.074965e-05
## 7140     4 65844 6.074965e-05
## 7141     4 65844 6.074965e-05
## 7142     4 65844 6.074965e-05
## 7143     4 65844 6.074965e-05
## 7144     4 65844 6.074965e-05
## 7145     4 65844 6.074965e-05
## 7146     4 65844 6.074965e-05
## 7147     4 65844 6.074965e-05
## 7148     4 65844 6.074965e-05
## 7149     4 65844 6.074965e-05
## 7150     4 65844 6.074965e-05
## 7151     4 65844 6.074965e-05
## 7152     4 65844 6.074965e-05
## 7153     4 65844 6.074965e-05
## 7154     4 65844 6.074965e-05
## 7155     4 65844 6.074965e-05
## 7156     4 65844 6.074965e-05
## 7157     4 65844 6.074965e-05
## 7158     4 65844 6.074965e-05
## 7159     4 65844 6.074965e-05
## 7160     4 65844 6.074965e-05
## 7161     4 65844 6.074965e-05
## 7162     4 65844 6.074965e-05
## 7163     4 65844 6.074965e-05
## 7164     4 65844 6.074965e-05
## 7165     4 65844 6.074965e-05
## 7166     4 65844 6.074965e-05
## 7167     4 65844 6.074965e-05
## 7168     4 65844 6.074965e-05
## 7169     4 65844 6.074965e-05
## 7170     4 65844 6.074965e-05
## 7171     4 65844 6.074965e-05
## 7172     4 65844 6.074965e-05
## 7173     4 65844 6.074965e-05
## 7174     4 65844 6.074965e-05
## 7175     4 65844 6.074965e-05
## 7176     4 65844 6.074965e-05
## 7177     4 65844 6.074965e-05
## 7178     4 65844 6.074965e-05
## 7179     4 65844 6.074965e-05
## 7180     4 65844 6.074965e-05
## 7181     4 65844 6.074965e-05
## 7182     4 65844 6.074965e-05
## 7183     4 65844 6.074965e-05
## 7184     4 65844 6.074965e-05
## 7185     4 65844 6.074965e-05
## 7186     4 65844 6.074965e-05
## 7187     4 65844 6.074965e-05
## 7188     4 65844 6.074965e-05
## 7189     4 65844 6.074965e-05
## 7190     4 65844 6.074965e-05
## 7191     4 65844 6.074965e-05
## 7192     4 65844 6.074965e-05
## 7193     4 65844 6.074965e-05
## 7194     4 65844 6.074965e-05
## 7195     4 65844 6.074965e-05
## 7196     4 65844 6.074965e-05
## 7197     4 65844 6.074965e-05
## 7198     4 65844 6.074965e-05
## 7199     4 65844 6.074965e-05
## 7200     4 65844 6.074965e-05
## 7201     4 65844 6.074965e-05
## 7202     4 65844 6.074965e-05
## 7203     4 65844 6.074965e-05
## 7204     4 65844 6.074965e-05
## 7205     4 65844 6.074965e-05
## 7206     4 65844 6.074965e-05
## 7207     4 65844 6.074965e-05
## 7208     4 65844 6.074965e-05
## 7209     4 65844 6.074965e-05
## 7210     4 65844 6.074965e-05
## 7211     4 65844 6.074965e-05
## 7212     4 65844 6.074965e-05
## 7213     4 65844 6.074965e-05
## 7214     4 65844 6.074965e-05
## 7215     4 65844 6.074965e-05
## 7216     4 65844 6.074965e-05
## 7217     4 65844 6.074965e-05
## 7218     4 65844 6.074965e-05
## 7219     4 65844 6.074965e-05
## 7220     4 65844 6.074965e-05
## 7221     4 65844 6.074965e-05
## 7222     4 65844 6.074965e-05
## 7223     4 65844 6.074965e-05
## 7224     4 65844 6.074965e-05
## 7225     4 65844 6.074965e-05
## 7226     4 65844 6.074965e-05
## 7227     4 65844 6.074965e-05
## 7228     4 65844 6.074965e-05
## 7229     4 65844 6.074965e-05
## 7230     4 65844 6.074965e-05
## 7231     4 65844 6.074965e-05
## 7232     4 65844 6.074965e-05
## 7233     4 65844 6.074965e-05
## 7234     4 65844 6.074965e-05
## 7235     4 65844 6.074965e-05
## 7236     4 65844 6.074965e-05
## 7237     4 65844 6.074965e-05
## 7238     4 65844 6.074965e-05
## 7239     4 65844 6.074965e-05
## 7240     4 65844 6.074965e-05
## 7241     4 65844 6.074965e-05
## 7242     4 65844 6.074965e-05
## 7243     4 65844 6.074965e-05
## 7244     4 65844 6.074965e-05
## 7245     4 65844 6.074965e-05
## 7246     4 65844 6.074965e-05
## 7247     4 65844 6.074965e-05
## 7248     4 65844 6.074965e-05
## 7249     4 65844 6.074965e-05
## 7250     4 65844 6.074965e-05
## 7251     4 65844 6.074965e-05
## 7252     4 65844 6.074965e-05
## 7253     4 65844 6.074965e-05
## 7254     4 65844 6.074965e-05
## 7255     4 65844 6.074965e-05
## 7256     4 65844 6.074965e-05
## 7257     4 65844 6.074965e-05
## 7258     4 65844 6.074965e-05
## 7259     4 65844 6.074965e-05
## 7260     4 65844 6.074965e-05
## 7261     4 65844 6.074965e-05
## 7262     4 65844 6.074965e-05
## 7263     4 65844 6.074965e-05
## 7264     4 65844 6.074965e-05
## 7265     4 65844 6.074965e-05
## 7266     4 65844 6.074965e-05
## 7267     4 65844 6.074965e-05
## 7268     4 65844 6.074965e-05
## 7269     4 65844 6.074965e-05
## 7270     4 65844 6.074965e-05
## 7271     4 65844 6.074965e-05
## 7272     4 65844 6.074965e-05
## 7273     4 65844 6.074965e-05
## 7274     4 65844 6.074965e-05
## 7275     4 65844 6.074965e-05
## 7276     4 65844 6.074965e-05
## 7277     4 65844 6.074965e-05
## 7278     4 65844 6.074965e-05
## 7279     4 65844 6.074965e-05
## 7280     4 65844 6.074965e-05
## 7281     4 65844 6.074965e-05
## 7282     4 65844 6.074965e-05
## 7283     4 65844 6.074965e-05
## 7284     4 65844 6.074965e-05
## 7285     4 65844 6.074965e-05
## 7286     4 65844 6.074965e-05
## 7287     4 65844 6.074965e-05
## 7288     4 65844 6.074965e-05
## 7289     4 65844 6.074965e-05
## 7290     4 65844 6.074965e-05
## 7291     4 65844 6.074965e-05
## 7292     4 65844 6.074965e-05
## 7293     4 65844 6.074965e-05
## 7294     4 65844 6.074965e-05
## 7295     4 65844 6.074965e-05
## 7296     4 65844 6.074965e-05
## 7297     4 65844 6.074965e-05
## 7298     4 65844 6.074965e-05
## 7299     4 65844 6.074965e-05
## 7300     4 65844 6.074965e-05
## 7301     4 65844 6.074965e-05
## 7302     4 65844 6.074965e-05
## 7303     4 65844 6.074965e-05
## 7304     4 65844 6.074965e-05
## 7305     4 65844 6.074965e-05
## 7306     4 65844 6.074965e-05
## 7307     4 65844 6.074965e-05
## 7308     4 65844 6.074965e-05
## 7309     4 65844 6.074965e-05
## 7310     4 65844 6.074965e-05
## 7311     4 65844 6.074965e-05
## 7312     4 65844 6.074965e-05
## 7313     4 65844 6.074965e-05
## 7314     4 65844 6.074965e-05
## 7315     4 65844 6.074965e-05
## 7316     4 65844 6.074965e-05
## 7317     4 65844 6.074965e-05
## 7318     4 65844 6.074965e-05
## 7319     4 65844 6.074965e-05
## 7320     4 65844 6.074965e-05
## 7321     4 65844 6.074965e-05
## 7322     4 65844 6.074965e-05
## 7323     4 65844 6.074965e-05
## 7324     4 65844 6.074965e-05
## 7325     4 65844 6.074965e-05
## 7326     4 65844 6.074965e-05
## 7327     4 65844 6.074965e-05
## 7328     4 65844 6.074965e-05
## 7329     4 65844 6.074965e-05
## 7330     4 65844 6.074965e-05
## 7331     4 65844 6.074965e-05
## 7332     4 65844 6.074965e-05
## 7333     4 65844 6.074965e-05
## 7334     4 65844 6.074965e-05
## 7335     4 65844 6.074965e-05
## 7336     4 65844 6.074965e-05
## 7337     4 65844 6.074965e-05
## 7338     4 65844 6.074965e-05
## 7339     4 65844 6.074965e-05
## 7340     4 65844 6.074965e-05
## 7341     4 65844 6.074965e-05
## 7342     4 65844 6.074965e-05
## 7343     4 65844 6.074965e-05
## 7344     4 65844 6.074965e-05
## 7345     4 65844 6.074965e-05
## 7346     4 65844 6.074965e-05
## 7347     4 65844 6.074965e-05
## 7348     4 65844 6.074965e-05
## 7349     4 65844 6.074965e-05
## 7350     4 65844 6.074965e-05
## 7351     4 65844 6.074965e-05
## 7352     4 65844 6.074965e-05
## 7353     4 65844 6.074965e-05
## 7354     4 65844 6.074965e-05
## 7355     4 65844 6.074965e-05
## 7356     4 65844 6.074965e-05
## 7357     4 65844 6.074965e-05
## 7358     4 65844 6.074965e-05
## 7359     4 65844 6.074965e-05
## 7360     4 65844 6.074965e-05
## 7361     4 65844 6.074965e-05
## 7362     4 65844 6.074965e-05
## 7363     4 65844 6.074965e-05
## 7364     4 65844 6.074965e-05
## 7365     4 65844 6.074965e-05
## 7366     4 65844 6.074965e-05
## 7367     4 65844 6.074965e-05
## 7368     4 65844 6.074965e-05
## 7369     4 65844 6.074965e-05
## 7370     4 65844 6.074965e-05
## 7371     4 65844 6.074965e-05
## 7372     4 65844 6.074965e-05
## 7373     4 65844 6.074965e-05
## 7374     4 65844 6.074965e-05
## 7375     4 65844 6.074965e-05
## 7376     4 65844 6.074965e-05
## 7377     4 65844 6.074965e-05
## 7378     4 65844 6.074965e-05
## 7379     4 65844 6.074965e-05
## 7380     4 65844 6.074965e-05
## 7381     4 65844 6.074965e-05
## 7382     4 65844 6.074965e-05
## 7383     4 65844 6.074965e-05
## 7384     4 65844 6.074965e-05
## 7385     4 65844 6.074965e-05
## 7386     4 65844 6.074965e-05
## 7387     4 65844 6.074965e-05
## 7388     4 65844 6.074965e-05
## 7389     4 65844 6.074965e-05
## 7390     4 65844 6.074965e-05
## 7391     4 65844 6.074965e-05
## 7392     4 65844 6.074965e-05
## 7393     4 65844 6.074965e-05
## 7394     4 65844 6.074965e-05
## 7395     4 65844 6.074965e-05
## 7396     4 65844 6.074965e-05
## 7397     4 65844 6.074965e-05
## 7398     4 65844 6.074965e-05
## 7399     4 65844 6.074965e-05
## 7400     4 65844 6.074965e-05
## 7401     4 65844 6.074965e-05
## 7402     4 55641 7.188943e-05
## 7403     4 55641 7.188943e-05
## 7404     4 55641 7.188943e-05
## 7405     4 55641 7.188943e-05
## 7406     4 55641 7.188943e-05
## 7407     4 55641 7.188943e-05
## 7408     4 55641 7.188943e-05
## 7409     4 55641 7.188943e-05
## 7410     4 55641 7.188943e-05
## 7411     4 55641 7.188943e-05
## 7412     4 55641 7.188943e-05
## 7413     4 55641 7.188943e-05
## 7414     4 55641 7.188943e-05
## 7415     4 55641 7.188943e-05
## 7416     4 55641 7.188943e-05
## 7417     4 55641 7.188943e-05
## 7418     4 55641 7.188943e-05
## 7419     4 55641 7.188943e-05
## 7420     4 55641 7.188943e-05
## 7421     4 55641 7.188943e-05
## 7422     4 55641 7.188943e-05
## 7423     4 55641 7.188943e-05
## 7424     4 55641 7.188943e-05
## 7425     4 55641 7.188943e-05
## 7426     4 55641 7.188943e-05
## 7427     4 55641 7.188943e-05
## 7428     4 55641 7.188943e-05
## 7429     4 55641 7.188943e-05
## 7430     4 55641 7.188943e-05
## 7431     4 55641 7.188943e-05
## 7432     4 55641 7.188943e-05
## 7433     4 55641 7.188943e-05
## 7434     4 55641 7.188943e-05
## 7435     4 55641 7.188943e-05
## 7436     4 55641 7.188943e-05
## 7437     4 55641 7.188943e-05
## 7438     4 55641 7.188943e-05
## 7439     4 55641 7.188943e-05
## 7440     4 55641 7.188943e-05
## 7441     4 55641 7.188943e-05
## 7442     4 55641 7.188943e-05
## 7443     4 55641 7.188943e-05
## 7444     4 55641 7.188943e-05
## 7445     4 55641 7.188943e-05
## 7446     4 55641 7.188943e-05
## 7447     4 55641 7.188943e-05
## 7448     4 55641 7.188943e-05
## 7449     4 55641 7.188943e-05
## 7450     4 55641 7.188943e-05
## 7451     4 55641 7.188943e-05
## 7452     4 55641 7.188943e-05
## 7453     4 55641 7.188943e-05
## 7454     4 55641 7.188943e-05
## 7455     4 55641 7.188943e-05
## 7456     4 55641 7.188943e-05
## 7457     4 55641 7.188943e-05
## 7458     4 55641 7.188943e-05
## 7459     4 55641 7.188943e-05
## 7460     4 55641 7.188943e-05
## 7461     4 55641 7.188943e-05
## 7462     4 55641 7.188943e-05
## 7463     4 55641 7.188943e-05
## 7464     4 55641 7.188943e-05
## 7465     4 55641 7.188943e-05
## 7466     4 55641 7.188943e-05
## 7467     4 55641 7.188943e-05
## 7468     4 55641 7.188943e-05
## 7469     4 55641 7.188943e-05
## 7470     4 55641 7.188943e-05
## 7471     4 55641 7.188943e-05
## 7472     4 55641 7.188943e-05
## 7473     4 55641 7.188943e-05
## 7474     4 55641 7.188943e-05
## 7475     4 55641 7.188943e-05
## 7476     4 55641 7.188943e-05
## 7477     4 55641 7.188943e-05
## 7478     4 55641 7.188943e-05
## 7479     4 55641 7.188943e-05
## 7480     4 55641 7.188943e-05
## 7481     4 55641 7.188943e-05
## 7482     4 55641 7.188943e-05
## 7483     4 55641 7.188943e-05
## 7484     4 55641 7.188943e-05
## 7485     4 55641 7.188943e-05
## 7486     4 55641 7.188943e-05
## 7487     4 55641 7.188943e-05
## 7488     4 55641 7.188943e-05
## 7489     4 55641 7.188943e-05
## 7490     4 55641 7.188943e-05
## 7491     4 55641 7.188943e-05
## 7492     4 55641 7.188943e-05
## 7493     4 55641 7.188943e-05
## 7494     4 55641 7.188943e-05
## 7495     4 55641 7.188943e-05
## 7496     4 55641 7.188943e-05
## 7497     4 55641 7.188943e-05
## 7498     4 55641 7.188943e-05
## 7499     4 55641 7.188943e-05
## 7500     4 55641 7.188943e-05
## 7501     4 55641 7.188943e-05
## 7502     4 55641 7.188943e-05
## 7503     4 55641 7.188943e-05
## 7504     4 55641 7.188943e-05
## 7505     4 55641 7.188943e-05
## 7506     4 55641 7.188943e-05
## 7507     4 55641 7.188943e-05
## 7508     4 55641 7.188943e-05
## 7509     4 55641 7.188943e-05
## 7510     4 55641 7.188943e-05
## 7511     4 55641 7.188943e-05
## 7512     4 55641 7.188943e-05
## 7513     4 55641 7.188943e-05
## 7514     4 55641 7.188943e-05
## 7515     4 55641 7.188943e-05
## 7516     4 55641 7.188943e-05
## 7517     4 55641 7.188943e-05
## 7518     4 55641 7.188943e-05
## 7519     4 55641 7.188943e-05
## 7520     4 55641 7.188943e-05
## 7521     4 55641 7.188943e-05
## 7522     4 55641 7.188943e-05
## 7523     4 55641 7.188943e-05
## 7524     4 55641 7.188943e-05
## 7525     4 55641 7.188943e-05
## 7526     4 55641 7.188943e-05
## 7527     4 55641 7.188943e-05
## 7528     4 55641 7.188943e-05
## 7529     4 55641 7.188943e-05
## 7530     4 55641 7.188943e-05
## 7531     4 55641 7.188943e-05
## 7532     4 55641 7.188943e-05
## 7533     4 55641 7.188943e-05
## 7534     4 55641 7.188943e-05
## 7535     4 55641 7.188943e-05
## 7536     4 55641 7.188943e-05
## 7537     4 55641 7.188943e-05
## 7538     4 55641 7.188943e-05
## 7539     4 55641 7.188943e-05
## 7540     4 55641 7.188943e-05
## 7541     4 55641 7.188943e-05
## 7542     4 55641 7.188943e-05
## 7543     4 55641 7.188943e-05
## 7544     4 55641 7.188943e-05
## 7545     4 55641 7.188943e-05
## 7546     4 55641 7.188943e-05
## 7547     4 55641 7.188943e-05
## 7548     4 55641 7.188943e-05
## 7549     4 55641 7.188943e-05
## 7550     4 55641 7.188943e-05
## 7551     4 55641 7.188943e-05
## 7552     4 55641 7.188943e-05
## 7553     4 55641 7.188943e-05
## 7554     4 55641 7.188943e-05
## 7555     4 55641 7.188943e-05
## 7556     4 55641 7.188943e-05
## 7557     4 55641 7.188943e-05
## 7558     4 55641 7.188943e-05
## 7559     4 55641 7.188943e-05
## 7560     4 55641 7.188943e-05
## 7561     4 55641 7.188943e-05
## 7562     4 55641 7.188943e-05
## 7563     4 55641 7.188943e-05
## 7564     4 55641 7.188943e-05
## 7565     4 55641 7.188943e-05
## 7566     4 55641 7.188943e-05
## 7567     4 55641 7.188943e-05
## 7568     4 55641 7.188943e-05
## 7569     4 55641 7.188943e-05
## 7570     4 55641 7.188943e-05
## 7571     4 55641 7.188943e-05
## 7572     4 55641 7.188943e-05
## 7573     4 55641 7.188943e-05
## 7574     4 55641 7.188943e-05
## 7575     4 55641 7.188943e-05
## 7576     4 55641 7.188943e-05
## 7577     4 55641 7.188943e-05
## 7578     4 55641 7.188943e-05
## 7579     4 55641 7.188943e-05
## 7580     4 55641 7.188943e-05
## 7581     4 55641 7.188943e-05
## 7582     4 55641 7.188943e-05
## 7583     4 55641 7.188943e-05
## 7584     4 55641 7.188943e-05
## 7585     4 55641 7.188943e-05
## 7586     4 55641 7.188943e-05
## 7587     4 55641 7.188943e-05
## 7588     4 55641 7.188943e-05
## 7589     4 55641 7.188943e-05
## 7590     4 55641 7.188943e-05
## 7591     4 55641 7.188943e-05
## 7592     4 55641 7.188943e-05
## 7593     4 55641 7.188943e-05
## 7594     4 55641 7.188943e-05
## 7595     4 55641 7.188943e-05
## 7596     4 55641 7.188943e-05
## 7597     4 55641 7.188943e-05
## 7598     4 55641 7.188943e-05
## 7599     4 55641 7.188943e-05
## 7600     4 55641 7.188943e-05
## 7601     4 55641 7.188943e-05
## 7602     4 55641 7.188943e-05
## 7603     4 55641 7.188943e-05
## 7604     4 55641 7.188943e-05
## 7605     4 55641 7.188943e-05
## 7606     4 55641 7.188943e-05
## 7607     4 55641 7.188943e-05
## 7608     4 55641 7.188943e-05
## 7609     4 55641 7.188943e-05
## 7610     4 55641 7.188943e-05
## 7611     4 55641 7.188943e-05
## 7612     4 55641 7.188943e-05
## 7613     4 55641 7.188943e-05
## 7614     4 55641 7.188943e-05
## 7615     4 55641 7.188943e-05
## 7616     4 55641 7.188943e-05
## 7617     4 55641 7.188943e-05
## 7618     4 55641 7.188943e-05
## 7619     4 55641 7.188943e-05
## 7620     4 55641 7.188943e-05
## 7621     4 55641 7.188943e-05
## 7622     4 55641 7.188943e-05
## 7623     4 55641 7.188943e-05
## 7624     4 55641 7.188943e-05
## 7625     4 55641 7.188943e-05
## 7626     4 55641 7.188943e-05
## 7627     4 55641 7.188943e-05
## 7628     4 55641 7.188943e-05
## 7629     4 55641 7.188943e-05
## 7630     4 55641 7.188943e-05
## 7631     4 55641 7.188943e-05
## 7632     4 55641 7.188943e-05
## 7633     4 55641 7.188943e-05
## 7634     4 55641 7.188943e-05
## 7635     4 55641 7.188943e-05
## 7636     4 55641 7.188943e-05
## 7637     4 55641 7.188943e-05
## 7638     4 55641 7.188943e-05
## 7639     4 55641 7.188943e-05
## 7640     4 55641 7.188943e-05
## 7641     4 55641 7.188943e-05
## 7642     4 55641 7.188943e-05
## 7643     4 55641 7.188943e-05
## 7644     4 55641 7.188943e-05
## 7645     4 55641 7.188943e-05
## 7646     4 55641 7.188943e-05
## 7647     4 55641 7.188943e-05
## 7648     4 55641 7.188943e-05
## 7649     4 55641 7.188943e-05
## 7650     4 55641 7.188943e-05
## 7651     4 55641 7.188943e-05
## 7652     4 55641 7.188943e-05
## 7653     4 55641 7.188943e-05
## 7654     4 55641 7.188943e-05
## 7655     4 55641 7.188943e-05
## 7656     4 55641 7.188943e-05
## 7657     4 55641 7.188943e-05
## 7658     4 55641 7.188943e-05
## 7659     4 55641 7.188943e-05
## 7660     4 55641 7.188943e-05
## 7661     4 55641 7.188943e-05
## 7662     4 55641 7.188943e-05
## 7663     4 55641 7.188943e-05
## 7664     4 55641 7.188943e-05
## 7665     4 55641 7.188943e-05
## 7666     4 55641 7.188943e-05
## 7667     4 55641 7.188943e-05
## 7668     4 55641 7.188943e-05
## 7669     4 55641 7.188943e-05
## 7670     4 55641 7.188943e-05
## 7671     4 55641 7.188943e-05
## 7672     4 55641 7.188943e-05
## 7673     4 55641 7.188943e-05
## 7674     4 55641 7.188943e-05
## 7675     4 55641 7.188943e-05
## 7676     4 55641 7.188943e-05
## 7677     4 55641 7.188943e-05
## 7678     4 55641 7.188943e-05
## 7679     4 55641 7.188943e-05
## 7680     4 55641 7.188943e-05
## 7681     4 55641 7.188943e-05
## 7682     4 55641 7.188943e-05
## 7683     4 55641 7.188943e-05
## 7684     4 55641 7.188943e-05
## 7685     4 55641 7.188943e-05
## 7686     4 55641 7.188943e-05
## 7687     4 55641 7.188943e-05
## 7688     4 55641 7.188943e-05
## 7689     4 55641 7.188943e-05
## 7690     4 55641 7.188943e-05
## 7691     4 55641 7.188943e-05
## 7692     4 55641 7.188943e-05
## 7693     4 55641 7.188943e-05
## 7694     4 55641 7.188943e-05
## 7695     4 55641 7.188943e-05
## 7696     4 55641 7.188943e-05
## 7697     4 55641 7.188943e-05
## 7698     4 55641 7.188943e-05
## 7699     4 55641 7.188943e-05
## 7700     4 55641 7.188943e-05
## 7701     4 55641 7.188943e-05
## 7702     4 55641 7.188943e-05
## 7703     4 55641 7.188943e-05
## 7704     4 55641 7.188943e-05
## 7705     4 55641 7.188943e-05
## 7706     4 55641 7.188943e-05
## 7707     4 55641 7.188943e-05
## 7708     4 55641 7.188943e-05
## 7709     4 55641 7.188943e-05
## 7710     4 55641 7.188943e-05
## 7711     4 55641 7.188943e-05
## 7712     4 55641 7.188943e-05
## 7713     4 55641 7.188943e-05
## 7714     4 55641 7.188943e-05
## 7715     4 55641 7.188943e-05
## 7716     4 55641 7.188943e-05
## 7717     4 55641 7.188943e-05
## 7718     4 55641 7.188943e-05
## 7719     4 55641 7.188943e-05
## 7720     4 55641 7.188943e-05
## 7721     4 55641 7.188943e-05
## 7722     4 55641 7.188943e-05
## 7723     4 55641 7.188943e-05
## 7724     4 55641 7.188943e-05
## 7725     4 55641 7.188943e-05
## 7726     4 55641 7.188943e-05
## 7727     4 55641 7.188943e-05
## 7728     4 55641 7.188943e-05
## 7729     4 55641 7.188943e-05
## 7730     4 55641 7.188943e-05
## 7731     4 55641 7.188943e-05
## 7732     4 55641 7.188943e-05
## 7733     4 55641 7.188943e-05
## 7734     4 55641 7.188943e-05
## 7735     4 55641 7.188943e-05
## 7736     4 55641 7.188943e-05
## 7737     4 55641 7.188943e-05
## 7738     4 55641 7.188943e-05
## 7739     4 55641 7.188943e-05
## 7740     4 55641 7.188943e-05
## 7741     4 55641 7.188943e-05
## 7742     4 55641 7.188943e-05
## 7743     4 55641 7.188943e-05
## 7744     4 55641 7.188943e-05
## 7745     4 55641 7.188943e-05
## 7746     4 55641 7.188943e-05
## 7747     4 55641 7.188943e-05
## 7748     4 55641 7.188943e-05
## 7749     4 55641 7.188943e-05
## 7750     4 55641 7.188943e-05
## 7751     4 55641 7.188943e-05
## 7752     4 55641 7.188943e-05
## 7753     4 55641 7.188943e-05
## 7754     4 55641 7.188943e-05
## 7755     4 55641 7.188943e-05
## 7756     4 55641 7.188943e-05
## 7757     4 55641 7.188943e-05
## 7758     4 55641 7.188943e-05
## 7759     4 55641 7.188943e-05
## 7760     4 55641 7.188943e-05
## 7761     4 55641 7.188943e-05
## 7762     4 55641 7.188943e-05
## 7763     4 55641 7.188943e-05
## 7764     4 55641 7.188943e-05
## 7765     4 55641 7.188943e-05
## 7766     4 55641 7.188943e-05
## 7767     4 55641 7.188943e-05
## 7768     4 55641 7.188943e-05
## 7769     4 55641 7.188943e-05
## 7770     4 55641 7.188943e-05
## 7771     4 55641 7.188943e-05
## 7772     4 55641 7.188943e-05
## 7773     4 55641 7.188943e-05
## 7774     4 55641 7.188943e-05
## 7775     4 55641 7.188943e-05
## 7776     4 55641 7.188943e-05
## 7777     4 55641 7.188943e-05
## 7778     4 55641 7.188943e-05
## 7779     4 55641 7.188943e-05
## 7780     4 55641 7.188943e-05
## 7781     4 55641 7.188943e-05
## 7782     4 55641 7.188943e-05
## 7783     4 55641 7.188943e-05
## 7784     4 55641 7.188943e-05
## 7785     4 55641 7.188943e-05
## 7786     4 55641 7.188943e-05
## 7787     4 55641 7.188943e-05
## 7788     4 55641 7.188943e-05
## 7789     4 55641 7.188943e-05
## 7790     4 55641 7.188943e-05
## 7791     4 55641 7.188943e-05
## 7792     4 55641 7.188943e-05
## 7793     4 55641 7.188943e-05
## 7794     4 55641 7.188943e-05
## 7795     4 55641 7.188943e-05
## 7796     4 55641 7.188943e-05
## 7797     4 55641 7.188943e-05
## 7798     4 55641 7.188943e-05
## 7799     4 55641 7.188943e-05
## 7800     4 55641 7.188943e-05
## 7801     4 55641 7.188943e-05
## 7802     4 55641 7.188943e-05
## 7803     4 55641 7.188943e-05
## 7804     4 55641 7.188943e-05
## 7805     4 55641 7.188943e-05
## 7806     4 55641 7.188943e-05
## 7807     4 55641 7.188943e-05
## 7808     4 55641 7.188943e-05
## 7809     4 55641 7.188943e-05
## 7810     4 55641 7.188943e-05
## 7811     4 55641 7.188943e-05
## 7812     4 55641 7.188943e-05
## 7813     4 55641 7.188943e-05
## 7814     4 55641 7.188943e-05
## 7815     4 55641 7.188943e-05
## 7816     4 55641 7.188943e-05
## 7817     4 55641 7.188943e-05
## 7818     4 55641 7.188943e-05
## 7819     4 55641 7.188943e-05
## 7820     4 55641 7.188943e-05
## 7821     4 55641 7.188943e-05
## 7822     4 55641 7.188943e-05
## 7823     4 55641 7.188943e-05
## 7824     4 55641 7.188943e-05
## 7825     4 55641 7.188943e-05
## 7826     4 55641 7.188943e-05
## 7827     4 55641 7.188943e-05
## 7828     4 55641 7.188943e-05
## 7829     4 55641 7.188943e-05
## 7830     4 55641 7.188943e-05
## 7831     4 55641 7.188943e-05
## 7832     4 55641 7.188943e-05
## 7833     4 55641 7.188943e-05
## 7834     4 55641 7.188943e-05
## 7835     4 55641 7.188943e-05
## 7836     4 55641 7.188943e-05
## 7837     4 55641 7.188943e-05
## 7838     4 55641 7.188943e-05
## 7839     4 55641 7.188943e-05
## 7840     4 55641 7.188943e-05
## 7841     4 55641 7.188943e-05
## 7842     4 55641 7.188943e-05
## 7843     4 55641 7.188943e-05
## 7844     4 55641 7.188943e-05
## 7845     4 55641 7.188943e-05
## 7846     4 55641 7.188943e-05
## 7847     4 55641 7.188943e-05
## 7848     4 55641 7.188943e-05
## 7849     4 55641 7.188943e-05
## 7850     4 55641 7.188943e-05
## 7851     4 55641 7.188943e-05
## 7852     4 55641 7.188943e-05
## 7853     4 55641 7.188943e-05
## 7854     4 55641 7.188943e-05
## 7855     4 55641 7.188943e-05
## 7856     4 55641 7.188943e-05
## 7857     4 55641 7.188943e-05
## 7858     4 55641 7.188943e-05
## 7859     4 55641 7.188943e-05
## 7860     4 55641 7.188943e-05
## 7861     4 55641 7.188943e-05
## 7862     4 55641 7.188943e-05
## 7863     4 55641 7.188943e-05
## 7864     4 55641 7.188943e-05
## 7865     4 55641 7.188943e-05
## 7866     4 55641 7.188943e-05
## 7867     4 55641 7.188943e-05
## 7868     4 55641 7.188943e-05
## 7869     4 55641 7.188943e-05
## 7870     4 55641 7.188943e-05
## 7871     4 55641 7.188943e-05
## 7872     4 55641 7.188943e-05
## 7873     4 55641 7.188943e-05
## 7874     4 55641 7.188943e-05
## 7875     4 55641 7.188943e-05
## 7876     4 55641 7.188943e-05
## 7877     4 55641 7.188943e-05
## 7878     4 55641 7.188943e-05
## 7879     4 55641 7.188943e-05
## 7880     4 55641 7.188943e-05
## 7881     4 55641 7.188943e-05
## 7882     4 55641 7.188943e-05
## 7883     4 55641 7.188943e-05
## 7884     4 55641 7.188943e-05
## 7885     4 55641 7.188943e-05
## 7886     4 55641 7.188943e-05
## 7887     4 55641 7.188943e-05
## 7888     4 55641 7.188943e-05
## 7889     4 55641 7.188943e-05
## 7890     4 55641 7.188943e-05
## 7891     4 55641 7.188943e-05
## 7892     4 55641 7.188943e-05
## 7893     4 55641 7.188943e-05
## 7894     4 55641 7.188943e-05
## 7895     4 55641 7.188943e-05
## 7896     4 55641 7.188943e-05
## 7897     4 55641 7.188943e-05
## 7898     4 55641 7.188943e-05
## 7899     4 55641 7.188943e-05
## 7900     4 55641 7.188943e-05
## 7901     4 55641 7.188943e-05
## 7902     4 55641 7.188943e-05
## 7903     4 55641 7.188943e-05
## 7904     4 55641 7.188943e-05
## 7905     4 55641 7.188943e-05
## 7906     4 55641 7.188943e-05
## 7907     4 55641 7.188943e-05
## 7908     4 55641 7.188943e-05
## 7909     4 55641 7.188943e-05
## 7910     4 55641 7.188943e-05
## 7911     4 55641 7.188943e-05
## 7912     4 55641 7.188943e-05
## 7913     4 55641 7.188943e-05
## 7914     4 55641 7.188943e-05
## 7915     4 55641 7.188943e-05
## 7916     4 55641 7.188943e-05
## 7917     4 55641 7.188943e-05
## 7918     4 55641 7.188943e-05
## 7919     4 55641 7.188943e-05
## 7920     4 55641 7.188943e-05
## 7921     4 55641 7.188943e-05
## 7922     4 55641 7.188943e-05
## 7923     4 55641 7.188943e-05
## 7924     4 55641 7.188943e-05
## 7925     4 55641 7.188943e-05
## 7926     4 55641 7.188943e-05
## 7927     4 55641 7.188943e-05
## 7928     4 55641 7.188943e-05
## 7929     4 55641 7.188943e-05
## 7930     4 55641 7.188943e-05
## 7931     4 55641 7.188943e-05
## 7932     4 55641 7.188943e-05
## 7933     3 66780 4.492363e-05
## 7934     3 66780 4.492363e-05
## 7935     3 66780 4.492363e-05
## 7936     3 66780 4.492363e-05
## 7937     3 66780 4.492363e-05
## 7938     3 66780 4.492363e-05
## 7939     3 66780 4.492363e-05
## 7940     3 66780 4.492363e-05
## 7941     3 66780 4.492363e-05
## 7942     3 66780 4.492363e-05
## 7943     3 66780 4.492363e-05
## 7944     3 66780 4.492363e-05
## 7945     3 66780 4.492363e-05
## 7946     3 66780 4.492363e-05
## 7947     3 66780 4.492363e-05
## 7948     3 66780 4.492363e-05
## 7949     3 66780 4.492363e-05
## 7950     3 66780 4.492363e-05
## 7951     3 66780 4.492363e-05
## 7952     3 66780 4.492363e-05
## 7953     3 66780 4.492363e-05
## 7954     3 66780 4.492363e-05
## 7955     3 66780 4.492363e-05
## 7956     3 66780 4.492363e-05
## 7957     3 66780 4.492363e-05
## 7958     3 66780 4.492363e-05
## 7959     3 66780 4.492363e-05
## 7960     3 66780 4.492363e-05
## 7961     3 66780 4.492363e-05
## 7962     3 66780 4.492363e-05
## 7963     3 66780 4.492363e-05
## 7964     3 66780 4.492363e-05
## 7965     3 66780 4.492363e-05
## 7966     3 66780 4.492363e-05
## 7967     3 66780 4.492363e-05
## 7968     3 66780 4.492363e-05
## 7969     3 66780 4.492363e-05
## 7970     3 66780 4.492363e-05
## 7971     3 66780 4.492363e-05
## 7972     3 66780 4.492363e-05
## 7973     3 66780 4.492363e-05
## 7974     3 66780 4.492363e-05
## 7975     3 66780 4.492363e-05
## 7976     3 66780 4.492363e-05
## 7977     3 66780 4.492363e-05
## 7978     3 66780 4.492363e-05
## 7979     3 66780 4.492363e-05
## 7980     3 66780 4.492363e-05
## 7981     3 66780 4.492363e-05
## 7982     3 66780 4.492363e-05
## 7983     3 66780 4.492363e-05
## 7984     3 66780 4.492363e-05
## 7985     3 66780 4.492363e-05
## 7986     3 66780 4.492363e-05
## 7987     3 66780 4.492363e-05
## 7988     3 66780 4.492363e-05
## 7989     3 66780 4.492363e-05
## 7990     3 66780 4.492363e-05
## 7991     3 66780 4.492363e-05
## 7992     3 66780 4.492363e-05
## 7993     3 66780 4.492363e-05
## 7994     3 66780 4.492363e-05
## 7995     3 66780 4.492363e-05
## 7996     3 66780 4.492363e-05
## 7997     3 66780 4.492363e-05
## 7998     3 66780 4.492363e-05
## 7999     3 66780 4.492363e-05
## 8000     3 66780 4.492363e-05
## 8001     3 66780 4.492363e-05
## 8002     3 66780 4.492363e-05
## 8003     3 66780 4.492363e-05
## 8004     3 66780 4.492363e-05
## 8005     3 66780 4.492363e-05
## 8006     3 66780 4.492363e-05
## 8007     3 66780 4.492363e-05
## 8008     3 66780 4.492363e-05
## 8009     3 66780 4.492363e-05
## 8010     3 66780 4.492363e-05
## 8011     3 66780 4.492363e-05
## 8012     3 66780 4.492363e-05
## 8013     3 66780 4.492363e-05
## 8014     3 66780 4.492363e-05
## 8015     3 66780 4.492363e-05
## 8016     3 66780 4.492363e-05
## 8017     3 66780 4.492363e-05
## 8018     3 66780 4.492363e-05
## 8019     3 66780 4.492363e-05
## 8020     3 66780 4.492363e-05
## 8021     3 66780 4.492363e-05
## 8022     3 66780 4.492363e-05
## 8023     3 66780 4.492363e-05
## 8024     3 66780 4.492363e-05
## 8025     3 66780 4.492363e-05
## 8026     3 66780 4.492363e-05
## 8027     3 66780 4.492363e-05
## 8028     3 66780 4.492363e-05
## 8029     3 66780 4.492363e-05
## 8030     3 66780 4.492363e-05
## 8031     3 66780 4.492363e-05
## 8032     3 66780 4.492363e-05
## 8033     3 66780 4.492363e-05
## 8034     3 66780 4.492363e-05
## 8035     3 66780 4.492363e-05
## 8036     3 66780 4.492363e-05
## 8037     3 66780 4.492363e-05
## 8038     3 66780 4.492363e-05
## 8039     3 66780 4.492363e-05
## 8040     3 66780 4.492363e-05
## 8041     3 66780 4.492363e-05
## 8042     3 66780 4.492363e-05
## 8043     3 66780 4.492363e-05
## 8044     3 66780 4.492363e-05
## 8045     3 66780 4.492363e-05
## 8046     3 66780 4.492363e-05
## 8047     3 66780 4.492363e-05
## 8048     3 66780 4.492363e-05
## 8049     3 66780 4.492363e-05
## 8050     3 66780 4.492363e-05
## 8051     3 66780 4.492363e-05
## 8052     3 66780 4.492363e-05
## 8053     3 66780 4.492363e-05
## 8054     3 66780 4.492363e-05
## 8055     3 66780 4.492363e-05
## 8056     3 66780 4.492363e-05
## 8057     3 66780 4.492363e-05
## 8058     3 66780 4.492363e-05
## 8059     3 66780 4.492363e-05
## 8060     3 66780 4.492363e-05
## 8061     3 66780 4.492363e-05
## 8062     3 66780 4.492363e-05
## 8063     3 66780 4.492363e-05
## 8064     3 66780 4.492363e-05
## 8065     3 66780 4.492363e-05
## 8066     3 66780 4.492363e-05
## 8067     3 66780 4.492363e-05
## 8068     3 66780 4.492363e-05
## 8069     3 66780 4.492363e-05
## 8070     3 66780 4.492363e-05
## 8071     3 66780 4.492363e-05
## 8072     3 66780 4.492363e-05
## 8073     3 66780 4.492363e-05
## 8074     3 66780 4.492363e-05
## 8075     3 66780 4.492363e-05
## 8076     3 66780 4.492363e-05
## 8077     3 66780 4.492363e-05
## 8078     3 66780 4.492363e-05
## 8079     3 66780 4.492363e-05
## 8080     3 66780 4.492363e-05
## 8081     3 66780 4.492363e-05
## 8082     3 66780 4.492363e-05
## 8083     3 66780 4.492363e-05
## 8084     3 66780 4.492363e-05
## 8085     3 66780 4.492363e-05
## 8086     3 66780 4.492363e-05
## 8087     3 66780 4.492363e-05
## 8088     3 66780 4.492363e-05
## 8089     3 66780 4.492363e-05
## 8090     3 66780 4.492363e-05
## 8091     3 66780 4.492363e-05
## 8092     3 66780 4.492363e-05
## 8093     3 66780 4.492363e-05
## 8094     3 66780 4.492363e-05
## 8095     3 66780 4.492363e-05
## 8096     3 66780 4.492363e-05
## 8097     3 66780 4.492363e-05
## 8098     3 66780 4.492363e-05
## 8099     3 66780 4.492363e-05
## 8100     3 66780 4.492363e-05
## 8101     3 66780 4.492363e-05
## 8102     3 66780 4.492363e-05
## 8103     3 66780 4.492363e-05
## 8104     3 66780 4.492363e-05
## 8105     3 66780 4.492363e-05
## 8106     3 66780 4.492363e-05
## 8107     3 66780 4.492363e-05
## 8108     3 66780 4.492363e-05
## 8109     3 66780 4.492363e-05
## 8110     3 66780 4.492363e-05
## 8111     3 66780 4.492363e-05
## 8112     3 66780 4.492363e-05
## 8113     3 66780 4.492363e-05
## 8114     3 66780 4.492363e-05
## 8115     3 66780 4.492363e-05
## 8116     3 66780 4.492363e-05
## 8117     3 66780 4.492363e-05
## 8118     3 66780 4.492363e-05
## 8119     3 66780 4.492363e-05
## 8120     3 66780 4.492363e-05
## 8121     3 66780 4.492363e-05
## 8122     3 66780 4.492363e-05
## 8123     3 66780 4.492363e-05
## 8124     3 66780 4.492363e-05
## 8125     3 66780 4.492363e-05
## 8126     3 66780 4.492363e-05
## 8127     3 66780 4.492363e-05
## 8128     3 66780 4.492363e-05
## 8129     3 66780 4.492363e-05
## 8130     3 66780 4.492363e-05
## 8131     3 66780 4.492363e-05
## 8132     3 66780 4.492363e-05
## 8133     3 66780 4.492363e-05
## 8134     3 66780 4.492363e-05
## 8135     3 66780 4.492363e-05
## 8136     3 66780 4.492363e-05
## 8137     3 66780 4.492363e-05
## 8138     3 66780 4.492363e-05
## 8139     3 66780 4.492363e-05
## 8140     3 66780 4.492363e-05
## 8141     3 66780 4.492363e-05
## 8142     3 66780 4.492363e-05
## 8143     3 66780 4.492363e-05
## 8144     3 66780 4.492363e-05
## 8145     3 66780 4.492363e-05
## 8146     3 66780 4.492363e-05
## 8147     3 66780 4.492363e-05
## 8148     3 66780 4.492363e-05
## 8149     3 66780 4.492363e-05
## 8150     3 66780 4.492363e-05
## 8151     3 66780 4.492363e-05
## 8152     3 66780 4.492363e-05
## 8153     3 66780 4.492363e-05
## 8154     3 66780 4.492363e-05
## 8155     3 66780 4.492363e-05
## 8156     3 66780 4.492363e-05
## 8157     3 66780 4.492363e-05
## 8158     3 66780 4.492363e-05
## 8159     3 66780 4.492363e-05
## 8160     3 66780 4.492363e-05
## 8161     3 66780 4.492363e-05
## 8162     3 66780 4.492363e-05
## 8163     3 66780 4.492363e-05
## 8164     3 66780 4.492363e-05
## 8165     3 66780 4.492363e-05
## 8166     3 66780 4.492363e-05
## 8167     3 66780 4.492363e-05
## 8168     3 66780 4.492363e-05
## 8169     3 66780 4.492363e-05
## 8170     3 66780 4.492363e-05
## 8171     3 66780 4.492363e-05
## 8172     3 66780 4.492363e-05
## 8173     3 66780 4.492363e-05
## 8174     3 66780 4.492363e-05
## 8175     3 66780 4.492363e-05
## 8176     3 66780 4.492363e-05
## 8177     3 66780 4.492363e-05
## 8178     3 66780 4.492363e-05
## 8179     3 66780 4.492363e-05
## 8180     3 66780 4.492363e-05
## 8181     3 66780 4.492363e-05
## 8182     3 66780 4.492363e-05
## 8183     3 66780 4.492363e-05
## 8184     3 66780 4.492363e-05
## 8185     3 66780 4.492363e-05
## 8186     3 66780 4.492363e-05
## 8187     3 66780 4.492363e-05
## 8188     3 66780 4.492363e-05
## 8189     3 66780 4.492363e-05
## 8190     3 66780 4.492363e-05
## 8191     3 66780 4.492363e-05
## 8192     3 66780 4.492363e-05
## 8193     3 66780 4.492363e-05
## 8194     3 66780 4.492363e-05
## 8195     3 66780 4.492363e-05
## 8196     3 66780 4.492363e-05
## 8197     3 66780 4.492363e-05
## 8198     3 66780 4.492363e-05
## 8199     3 66780 4.492363e-05
## 8200     3 66780 4.492363e-05
## 8201     3 66780 4.492363e-05
## 8202     3 66780 4.492363e-05
## 8203     3 66780 4.492363e-05
## 8204     3 66780 4.492363e-05
## 8205     3 66780 4.492363e-05
## 8206     3 66780 4.492363e-05
## 8207     3 66780 4.492363e-05
## 8208     3 66780 4.492363e-05
## 8209     3 66780 4.492363e-05
## 8210     3 66780 4.492363e-05
## 8211     3 66780 4.492363e-05
## 8212     3 66780 4.492363e-05
## 8213     3 66780 4.492363e-05
## 8214     3 66780 4.492363e-05
## 8215     3 66780 4.492363e-05
## 8216     3 66780 4.492363e-05
## 8217     3 66780 4.492363e-05
## 8218     3 66780 4.492363e-05
## 8219     3 66780 4.492363e-05
## 8220     3 66780 4.492363e-05
## 8221     3 66780 4.492363e-05
## 8222     3 66780 4.492363e-05
## 8223     3 66780 4.492363e-05
## 8224     3 66780 4.492363e-05
## 8225     3 66780 4.492363e-05
## 8226     3 66780 4.492363e-05
## 8227     3 66780 4.492363e-05
## 8228     3 66780 4.492363e-05
## 8229     3 66780 4.492363e-05
## 8230     3 66780 4.492363e-05
## 8231     3 66780 4.492363e-05
## 8232     3 66780 4.492363e-05
## 8233     3 66780 4.492363e-05
## 8234     3 66780 4.492363e-05
## 8235     3 66780 4.492363e-05
## 8236     3 66780 4.492363e-05
## 8237     3 66780 4.492363e-05
## 8238     3 66780 4.492363e-05
## 8239     3 66780 4.492363e-05
## 8240     3 66780 4.492363e-05
## 8241     3 66780 4.492363e-05
## 8242     3 66780 4.492363e-05
## 8243     3 66780 4.492363e-05
## 8244     3 66780 4.492363e-05
## 8245     3 66780 4.492363e-05
## 8246     3 66780 4.492363e-05
## 8247     3 66780 4.492363e-05
## 8248     3 66780 4.492363e-05
## 8249     3 66780 4.492363e-05
## 8250     3 66780 4.492363e-05
## 8251     3 66780 4.492363e-05
## 8252     3 66780 4.492363e-05
## 8253     3 66780 4.492363e-05
## 8254     3 66780 4.492363e-05
## 8255     3 66780 4.492363e-05
## 8256     3 66780 4.492363e-05
## 8257     3 66780 4.492363e-05
## 8258     3 66780 4.492363e-05
## 8259     3 66780 4.492363e-05
## 8260     3 66780 4.492363e-05
## 8261     3 66780 4.492363e-05
## 8262     3 66780 4.492363e-05
## 8263     3 66780 4.492363e-05
## 8264     3 66780 4.492363e-05
## 8265     3 66780 4.492363e-05
## 8266     3 66780 4.492363e-05
## 8267     3 66780 4.492363e-05
## 8268     3 66780 4.492363e-05
## 8269     3 66780 4.492363e-05
## 8270     3 66780 4.492363e-05
## 8271     3 66780 4.492363e-05
## 8272     3 66780 4.492363e-05
## 8273     3 66780 4.492363e-05
## 8274     3 66780 4.492363e-05
## 8275     3 66780 4.492363e-05
## 8276     3 66780 4.492363e-05
## 8277     3 66780 4.492363e-05
## 8278     3 66780 4.492363e-05
## 8279     3 66780 4.492363e-05
## 8280     3 66780 4.492363e-05
## 8281     3 66780 4.492363e-05
## 8282     3 66780 4.492363e-05
## 8283     3 66780 4.492363e-05
## 8284     3 66780 4.492363e-05
## 8285     3 66780 4.492363e-05
## 8286     3 66780 4.492363e-05
## 8287     3 66780 4.492363e-05
## 8288     3 66780 4.492363e-05
## 8289     3 66780 4.492363e-05
## 8290     3 66780 4.492363e-05
## 8291     3 66780 4.492363e-05
## 8292     3 66780 4.492363e-05
## 8293     3 66780 4.492363e-05
## 8294     3 66780 4.492363e-05
## 8295     3 66780 4.492363e-05
## 8296     3 66780 4.492363e-05
## 8297     3 66780 4.492363e-05
## 8298     3 66780 4.492363e-05
## 8299     3 66780 4.492363e-05
## 8300     3 66780 4.492363e-05
## 8301     3 66780 4.492363e-05
## 8302     3 66780 4.492363e-05
## 8303     3 66780 4.492363e-05
## 8304     3 66780 4.492363e-05
## 8305     3 66780 4.492363e-05
## 8306     3 66780 4.492363e-05
## 8307     3 66780 4.492363e-05
## 8308     3 66780 4.492363e-05
## 8309     3 66780 4.492363e-05
## 8310     3 66780 4.492363e-05
## 8311     3 66780 4.492363e-05
## 8312     3 66780 4.492363e-05
## 8313     3 66780 4.492363e-05
## 8314     3 66780 4.492363e-05
## 8315     3 66780 4.492363e-05
## 8316     3 66780 4.492363e-05
## 8317     3 66780 4.492363e-05
## 8318     3 66780 4.492363e-05
## 8319     3 66780 4.492363e-05
## 8320     3 66780 4.492363e-05
## 8321     3 66780 4.492363e-05
## 8322     3 66780 4.492363e-05
## 8323     3 66780 4.492363e-05
## 8324     3 66780 4.492363e-05
## 8325     3 66780 4.492363e-05
## 8326     3 66780 4.492363e-05
## 8327     3 66780 4.492363e-05
## 8328     3 66780 4.492363e-05
## 8329     3 66780 4.492363e-05
## 8330     3 66780 4.492363e-05
## 8331     3 66780 4.492363e-05
## 8332     3 66780 4.492363e-05
## 8333     3 66780 4.492363e-05
## 8334     3 66780 4.492363e-05
## 8335     3 66780 4.492363e-05
## 8336     3 66780 4.492363e-05
## 8337     3 66780 4.492363e-05
## 8338     3 66780 4.492363e-05
## 8339     3 66780 4.492363e-05
## 8340     3 66780 4.492363e-05
## 8341     3 66780 4.492363e-05
## 8342     3 66780 4.492363e-05
## 8343     3 66780 4.492363e-05
## 8344     3 66780 4.492363e-05
## 8345     3 66780 4.492363e-05
## 8346     3 66780 4.492363e-05
## 8347     3 66780 4.492363e-05
## 8348     3 66780 4.492363e-05
## 8349     3 66780 4.492363e-05
## 8350     3 66780 4.492363e-05
## 8351     3 66780 4.492363e-05
## 8352     3 66780 4.492363e-05
## 8353     3 66780 4.492363e-05
## 8354     3 66780 4.492363e-05
## 8355     3 66780 4.492363e-05
## 8356     3 66780 4.492363e-05
## 8357     3 66780 4.492363e-05
## 8358     3 66780 4.492363e-05
## 8359     3 66780 4.492363e-05
## 8360     3 66780 4.492363e-05
## 8361     3 66780 4.492363e-05
## 8362     3 66780 4.492363e-05
## 8363     3 66780 4.492363e-05
## 8364     3 66780 4.492363e-05
## 8365     3 66780 4.492363e-05
## 8366     3 66780 4.492363e-05
## 8367     3 66780 4.492363e-05
## 8368     3 66780 4.492363e-05
## 8369     3 66780 4.492363e-05
## 8370     3 66780 4.492363e-05
## 8371     3 66780 4.492363e-05
## 8372     3 66780 4.492363e-05
## 8373     3 66780 4.492363e-05
## 8374     3 66780 4.492363e-05
## 8375     3 66780 4.492363e-05
## 8376     3 66780 4.492363e-05
## 8377     3 66780 4.492363e-05
## 8378     3 66780 4.492363e-05
## 8379     3 66780 4.492363e-05
## 8380     3 66780 4.492363e-05
## 8381     3 66780 4.492363e-05
## 8382     3 66780 4.492363e-05
## 8383     3 66780 4.492363e-05
## 8384     3 66780 4.492363e-05
## 8385     3 66780 4.492363e-05
## 8386     3 66780 4.492363e-05
## 8387     3 66780 4.492363e-05
## 8388     3 66780 4.492363e-05
## 8389     3 66780 4.492363e-05
## 8390     3 66780 4.492363e-05
## 8391     3 66780 4.492363e-05
## 8392     3 66780 4.492363e-05
## 8393     3 66780 4.492363e-05
## 8394     3 66780 4.492363e-05
## 8395     3 66780 4.492363e-05
## 8396     3 66780 4.492363e-05
## 8397     3 66780 4.492363e-05
## 8398     3 66780 4.492363e-05
## 8399     3 66780 4.492363e-05
## 8400     3 66780 4.492363e-05
## 8401     3 66780 4.492363e-05
## 8402     3 66780 4.492363e-05
## 8403     3 66780 4.492363e-05
## 8404     3 66780 4.492363e-05
## 8405     3 66780 4.492363e-05
## 8406     3 66780 4.492363e-05
## 8407     3 66780 4.492363e-05
## 8408     3 66780 4.492363e-05
## 8409     3 66780 4.492363e-05
## 8410     3 66780 4.492363e-05
## 8411     3 66780 4.492363e-05
## 8412     3 66780 4.492363e-05
## 8413     3 66780 4.492363e-05
## 8414     3 66780 4.492363e-05
## 8415     3 66780 4.492363e-05
## 8416     3 66780 4.492363e-05
## 8417     3 66780 4.492363e-05
## 8418     3 66780 4.492363e-05
## 8419     3 66780 4.492363e-05
## 8420     3 66780 4.492363e-05
## 8421     3 66780 4.492363e-05
## 8422     3 66780 4.492363e-05
## 8423     3 66780 4.492363e-05
## 8424     3 66780 4.492363e-05
## 8425     3 66780 4.492363e-05
## 8426     3 66780 4.492363e-05
## 8427     3 66780 4.492363e-05
## 8428     3 66780 4.492363e-05
## 8429     3 66780 4.492363e-05
## 8430     3 66780 4.492363e-05
## 8431     3 66780 4.492363e-05
## 8432     3 66780 4.492363e-05
## 8433     3 66780 4.492363e-05
## 8434     3 66780 4.492363e-05
## 8435     3 66780 4.492363e-05
## 8436     3 66780 4.492363e-05
## 8437     3 66780 4.492363e-05
## 8438     3 66780 4.492363e-05
## 8439     3 66780 4.492363e-05
## 8440     3 66780 4.492363e-05
## 8441     3 66780 4.492363e-05
## 8442     3 66780 4.492363e-05
## 8443     3 66780 4.492363e-05
## 8444     3 66780 4.492363e-05
## 8445     3 66780 4.492363e-05
## 8446     3 66780 4.492363e-05
## 8447     3 66780 4.492363e-05
## 8448     3 66780 4.492363e-05
## 8449     3 66780 4.492363e-05
## 8450     3 66780 4.492363e-05
## 8451     3 66780 4.492363e-05
## 8452     3 66780 4.492363e-05
## 8453     3 66780 4.492363e-05
## 8454     3 66780 4.492363e-05
## 8455     3 66780 4.492363e-05
## 8456     3 66780 4.492363e-05
## 8457     3 66780 4.492363e-05
## 8458     3 66780 4.492363e-05
## 8459     3 66780 4.492363e-05
## 8460     3 66780 4.492363e-05
## 8461     3 66780 4.492363e-05
## 8462     3 66780 4.492363e-05
## 8463     3 66780 4.492363e-05
## 8464     3 66780 4.492363e-05
## 8465     3 66780 4.492363e-05
## 8466     3 66780 4.492363e-05
## 8467     3 66780 4.492363e-05
## 8468     3 66780 4.492363e-05
## 8469     3 66780 4.492363e-05
## 8470     3 66780 4.492363e-05
## 8471     3 66780 4.492363e-05
## 8472     3 66780 4.492363e-05
## 8473     3 66780 4.492363e-05
## 8474     3 66780 4.492363e-05
## 8475     3 66780 4.492363e-05
## 8476     3 66780 4.492363e-05
## 8477     3 66780 4.492363e-05
## 8478     3 66780 4.492363e-05
## 8479     3 66780 4.492363e-05
## 8480     3 66780 4.492363e-05
## 8481     3 66780 4.492363e-05
## 8482     3 66780 4.492363e-05
## 8483     3 66780 4.492363e-05
## 8484     3 66780 4.492363e-05
## 8485     3 66780 4.492363e-05
## 8486     3 66780 4.492363e-05
## 8487     3 66780 4.492363e-05
## 8488     3 66780 4.492363e-05
## 8489     3 66780 4.492363e-05
## 8490     3 66780 4.492363e-05
## 8491     3 66780 4.492363e-05
## 8492     3 66780 4.492363e-05
## 8493     3 66780 4.492363e-05
## 8494     3 66780 4.492363e-05
## 8495     3 66780 4.492363e-05
## 8496     3 66780 4.492363e-05
## 8497     3 66780 4.492363e-05
## 8498     3 66780 4.492363e-05
## 8499     3 66780 4.492363e-05
## 8500     3 66780 4.492363e-05
## 8501     3 66780 4.492363e-05
## 8502     3 66780 4.492363e-05
## 8503     3 66780 4.492363e-05
## 8504     3 66780 4.492363e-05
## 8505     3 66780 4.492363e-05
## 8506     3 66780 4.492363e-05
## 8507     3 66780 4.492363e-05
## 8508     3 66780 4.492363e-05
## 8509     3 66780 4.492363e-05
## 8510     3 66780 4.492363e-05
## 8511     3 66780 4.492363e-05
## 8512     3 66780 4.492363e-05
## 8513     3 66780 4.492363e-05
## 8514     3 66780 4.492363e-05
## 8515     3 66780 4.492363e-05
## 8516     3 66780 4.492363e-05
## 8517     3 66780 4.492363e-05
## 8518     3 66780 4.492363e-05
## 8519     3 66780 4.492363e-05
## 8520     3 66780 4.492363e-05
## 8521     3 66780 4.492363e-05
## 8522     3 66780 4.492363e-05
## 8523     3 66780 4.492363e-05
## 8524     3 66780 4.492363e-05
## 8525     3 66780 4.492363e-05
## 8526     3 66780 4.492363e-05
## 8527     3 66780 4.492363e-05
## 8528     3 66780 4.492363e-05
## 8529     3 66780 4.492363e-05
## 8530     3 66780 4.492363e-05
## 8531     3 66780 4.492363e-05
## 8532     3 66780 4.492363e-05
## 8533     3 66780 4.492363e-05
## 8534     3 66780 4.492363e-05
## 8535     3 66780 4.492363e-05
## 8536     3 66780 4.492363e-05
## 8537     3 66780 4.492363e-05
## 8538     3 66780 4.492363e-05
## 8539     3 66780 4.492363e-05
## 8540     3 66780 4.492363e-05
## 8541     3 66780 4.492363e-05
## 8542     3 66780 4.492363e-05
## 8543     3 66780 4.492363e-05
## 8544     3 66780 4.492363e-05
## 8545     3 66780 4.492363e-05
## 8546     3 66780 4.492363e-05
## 8547     3 66780 4.492363e-05
## 8548     3 66780 4.492363e-05
## 8549     3 66780 4.492363e-05
## 8550     3 66780 4.492363e-05
## 8551     3 66780 4.492363e-05
## 8552     3 66780 4.492363e-05
## 8553     3 66780 4.492363e-05
## 8554     3 66780 4.492363e-05
## 8555     3 66780 4.492363e-05
## 8556     3 66780 4.492363e-05
## 8557     3 66780 4.492363e-05
## 8558     3 66780 4.492363e-05
## 8559     3 66780 4.492363e-05
## 8560     3 66780 4.492363e-05
## 8561     3 66780 4.492363e-05
## 8562     3 66780 4.492363e-05
## 8563     3 66780 4.492363e-05
## 8564     3 66780 4.492363e-05
## 8565     3 66780 4.492363e-05
## 8566     3 66780 4.492363e-05
## 8567     3 66780 4.492363e-05
## 8568     3 66780 4.492363e-05
## 8569     3 66780 4.492363e-05
## 8570     3 66780 4.492363e-05
## 8571     3 66780 4.492363e-05
## 8572     3 66780 4.492363e-05
## 8573     3 66780 4.492363e-05
## 8574     3 66780 4.492363e-05
## 8575     3 66780 4.492363e-05
## 8576     3 66780 4.492363e-05
## 8577     3 66780 4.492363e-05
## 8578     3 66780 4.492363e-05
## 8579     3 66780 4.492363e-05
## 8580     3 66780 4.492363e-05
## 8581     3 66780 4.492363e-05
## 8582     3 66780 4.492363e-05
## 8583     3 66780 4.492363e-05
## 8584     3 66780 4.492363e-05
## 8585     3 66780 4.492363e-05
## 8586     3 66780 4.492363e-05
## 8587     3 66780 4.492363e-05
## 8588     3 66780 4.492363e-05
## 8589     3 66780 4.492363e-05
## 8590     3 66780 4.492363e-05
## 8591     3 66780 4.492363e-05
## 8592     3 66780 4.492363e-05
## 8593     3 66780 4.492363e-05
## 8594     3 66780 4.492363e-05
## 8595     3 66780 4.492363e-05
## 8596     3 66780 4.492363e-05
## 8597     3 66780 4.492363e-05
## 8598     3 66780 4.492363e-05
## 8599     3 66780 4.492363e-05
## 8600     3 66780 4.492363e-05
## 8601     3 66780 4.492363e-05
## 8602     3 66780 4.492363e-05
## 8603     3 66780 4.492363e-05
## 8604     3 66780 4.492363e-05
## 8605     3 66780 4.492363e-05
## 8606     3 66780 4.492363e-05
## 8607     3 66780 4.492363e-05
## 8608     3 66780 4.492363e-05
## 8609     3 66780 4.492363e-05
## 8610     3 66780 4.492363e-05
## 8611     3 66780 4.492363e-05
## 8612     3 66780 4.492363e-05
## 8613     3 66780 4.492363e-05
## 8614     3 66780 4.492363e-05
## 8615     3 66780 4.492363e-05
## 8616     3 66780 4.492363e-05
## 8617     3 66780 4.492363e-05
## 8618     3 66780 4.492363e-05
## 8619     3 66780 4.492363e-05
## 8620     3 66780 4.492363e-05
## 8621     3 66780 4.492363e-05
## 8622     3 66780 4.492363e-05
## 8623     3 66780 4.492363e-05
## 8624     3 66780 4.492363e-05
## 8625     3 66780 4.492363e-05
## 8626     3 66780 4.492363e-05
## 8627     3 66780 4.492363e-05
## 8628     3 66780 4.492363e-05
## 8629     3 66780 4.492363e-05
## 8630     3 66780 4.492363e-05
## 8631     3 66780 4.492363e-05
## 8632     3 66780 4.492363e-05
## 8633     3 66780 4.492363e-05
## 8634     3 66780 4.492363e-05
## 8635     3 66780 4.492363e-05
## 8636     3 66780 4.492363e-05
## 8637     3 66780 4.492363e-05
## 8638     3 66780 4.492363e-05
## 8639     3 66780 4.492363e-05
## 8640     3 66780 4.492363e-05
## 8641     3 66780 4.492363e-05
## 8642     3 66780 4.492363e-05
## 8643     3 66780 4.492363e-05
## 8644     3 66780 4.492363e-05
## 8645     3 66780 4.492363e-05
## 8646     3 66780 4.492363e-05
## 8647     3 66780 4.492363e-05
## 8648     3 66780 4.492363e-05
## 8649     3 66780 4.492363e-05
## 8650     3 66780 4.492363e-05
## 8651     3 66780 4.492363e-05
## 8652     3 66780 4.492363e-05
## 8653     3 66780 4.492363e-05
## 8654     3 66780 4.492363e-05
## 8655     3 66780 4.492363e-05
## 8656     3 66780 4.492363e-05
## 8657     3 66780 4.492363e-05
## 8658     3 66780 4.492363e-05
## 8659     3 66780 4.492363e-05
## 8660     3 66780 4.492363e-05
## 8661     3 66780 4.492363e-05
## 8662     3 66780 4.492363e-05
## 8663     3 66780 4.492363e-05
## 8664     3 66780 4.492363e-05
## 8665     3 66780 4.492363e-05
## 8666     3 66780 4.492363e-05
## 8667     3 66780 4.492363e-05
## 8668     3 66780 4.492363e-05
## 8669     3 66780 4.492363e-05
## 8670     3 66780 4.492363e-05
## 8671     3 66780 4.492363e-05
## 8672     3 66780 4.492363e-05
## 8673     3 66780 4.492363e-05
## 8674     3 66780 4.492363e-05
## 8675     3 66780 4.492363e-05
## 8676     3 66780 4.492363e-05
## 8677     3 66780 4.492363e-05
## 8678     3 66780 4.492363e-05
## 8679     3 66780 4.492363e-05
## 8680     3 66780 4.492363e-05
## 8681     3 66780 4.492363e-05
## 8682     3 66780 4.492363e-05
## 8683     3 66780 4.492363e-05
## 8684     3 66780 4.492363e-05
## 8685     3 66780 4.492363e-05
## 8686     3 66780 4.492363e-05
## 8687     3 66780 4.492363e-05
## 8688     3 66780 4.492363e-05
## 8689     3 66780 4.492363e-05
## 8690     3 66780 4.492363e-05
## 8691     3 66780 4.492363e-05
## 8692     3 66780 4.492363e-05
## 8693     3 66780 4.492363e-05
## 8694     3 66780 4.492363e-05
## 8695     3 66780 4.492363e-05
## 8696     3 66780 4.492363e-05
## 8697     3 66780 4.492363e-05
## 8698     3 66780 4.492363e-05
## 8699     3 66780 4.492363e-05
## 8700     3 66780 4.492363e-05
## 8701     3 66780 4.492363e-05
## 8702     3 66780 4.492363e-05
## 8703     3 66780 4.492363e-05
## 8704     3 66780 4.492363e-05
## 8705     3 66780 4.492363e-05
## 8706     3 66780 4.492363e-05
## 8707     3 66780 4.492363e-05
## 8708     3 66780 4.492363e-05
## 8709     3 66780 4.492363e-05
## 8710     3 66780 4.492363e-05
## 8711     3 66780 4.492363e-05
## 8712     3 66780 4.492363e-05
## 8713     3 66780 4.492363e-05
## 8714     3 66780 4.492363e-05
## 8715     3 66780 4.492363e-05
## 8716     3 66780 4.492363e-05
## 8717     3 66780 4.492363e-05
## 8718     3 66780 4.492363e-05
## 8719     3 66780 4.492363e-05
## 8720     3 66780 4.492363e-05
## 8721     3 66780 4.492363e-05
## 8722     3 66780 4.492363e-05
## 8723     3 66780 4.492363e-05
## 8724     3 66780 4.492363e-05
## 8725     3 66780 4.492363e-05
## 8726     3 66780 4.492363e-05
## 8727     3 66780 4.492363e-05
## 8728     3 66780 4.492363e-05
## 8729     3 66780 4.492363e-05
## 8730     3 66780 4.492363e-05
## 8731     3 66780 4.492363e-05
## 8732     3 66780 4.492363e-05
## 8733     3 66780 4.492363e-05
## 8734     3 66780 4.492363e-05
## 8735     3 66780 4.492363e-05
## 8736     3 66780 4.492363e-05
## 8737     3 66780 4.492363e-05
## 8738     3 66780 4.492363e-05
## 8739     3 66780 4.492363e-05
## 8740     3 66780 4.492363e-05
## 8741     3 66780 4.492363e-05
## 8742     3 66780 4.492363e-05
## 8743     3 66780 4.492363e-05
## 8744     3 66780 4.492363e-05
## 8745     3 66780 4.492363e-05
## 8746     3 66780 4.492363e-05
## 8747     3 66780 4.492363e-05
## 8748     3 66780 4.492363e-05
## 8749     3 66780 4.492363e-05
## 8750     3 66780 4.492363e-05
## 8751     3 66780 4.492363e-05
## 8752     3 66780 4.492363e-05
## 8753     3 66780 4.492363e-05
## 8754     3 66780 4.492363e-05
## 8755     3 66780 4.492363e-05
## 8756     3 66780 4.492363e-05
## 8757     3 66780 4.492363e-05
## 8758     3 66780 4.492363e-05
## 8759     3 66780 4.492363e-05
## 8760     3 66780 4.492363e-05
## 8761     3 66780 4.492363e-05
## 8762     3 66780 4.492363e-05
## 8763     3 66780 4.492363e-05
## 8764     3 66780 4.492363e-05
## 8765     3 66780 4.492363e-05
## 8766     3 66780 4.492363e-05
## 8767     3 66780 4.492363e-05
## 8768     3 66780 4.492363e-05
## 8769     3 66780 4.492363e-05
## 8770     3 66780 4.492363e-05
## 8771     3 66780 4.492363e-05
## 8772     3 66780 4.492363e-05
## 8773     3 66780 4.492363e-05
## 8774     3 66780 4.492363e-05
## 8775     3 66780 4.492363e-05
## 8776     3 66780 4.492363e-05
## 8777     3 66780 4.492363e-05
## 8778     3 66780 4.492363e-05
## 8779     3 66780 4.492363e-05
## 8780     3 66780 4.492363e-05
## 8781     3 66780 4.492363e-05
## 8782     3 66780 4.492363e-05
## 8783     3 66780 4.492363e-05
## 8784     3 66780 4.492363e-05
## 8785     3 66780 4.492363e-05
## 8786     3 66780 4.492363e-05
## 8787     3 66780 4.492363e-05
## 8788     3 66780 4.492363e-05
## 8789     3 66780 4.492363e-05
## 8790     3 66780 4.492363e-05
## 8791     3 66780 4.492363e-05
## 8792     3 66780 4.492363e-05
## 8793     3 66780 4.492363e-05
## 8794     3 66780 4.492363e-05
## 8795     3 66780 4.492363e-05
## 8796     3 66780 4.492363e-05
## 8797     3 66780 4.492363e-05
## 8798     3 66780 4.492363e-05
## 8799     3 66780 4.492363e-05
## 8800     3 66780 4.492363e-05
## 8801     3 66780 4.492363e-05
## 8802     3 66780 4.492363e-05
## 8803     3 66780 4.492363e-05
## 8804     3 66780 4.492363e-05
## 8805     3 66780 4.492363e-05
## 8806     3 66780 4.492363e-05
## 8807     3 66780 4.492363e-05
## 8808     3 66780 4.492363e-05
## 8809     3 66780 4.492363e-05
## 8810     3 66780 4.492363e-05
## 8811     3 66780 4.492363e-05
## 8812     3 66780 4.492363e-05
## 8813     3 66780 4.492363e-05
## 8814     3 66780 4.492363e-05
## 8815     3 66780 4.492363e-05
## 8816     3 66780 4.492363e-05
## 8817     3 66780 4.492363e-05
## 8818     3 66780 4.492363e-05
## 8819     3 66780 4.492363e-05
## 8820     3 66780 4.492363e-05
## 8821     3 66780 4.492363e-05
## 8822     3 66780 4.492363e-05
## 8823     3 66780 4.492363e-05
## 8824     3 66780 4.492363e-05
## 8825     3 66780 4.492363e-05
## 8826     3 66780 4.492363e-05
## 8827     3 66780 4.492363e-05
## 8828     3 66780 4.492363e-05
## 8829     3 66780 4.492363e-05
## 8830     3 66780 4.492363e-05
## 8831     3 66780 4.492363e-05
## 8832     3 66780 4.492363e-05
## 8833     3 66780 4.492363e-05
## 8834     3 66780 4.492363e-05
## 8835     3 66780 4.492363e-05
## 8836     3 66780 4.492363e-05
## 8837     3 66780 4.492363e-05
## 8838     3 66780 4.492363e-05
## 8839     3 66780 4.492363e-05
## 8840     3 66780 4.492363e-05
## 8841     3 66780 4.492363e-05
## 8842     3 66780 4.492363e-05
## 8843     3 66780 4.492363e-05
## 8844     3 66780 4.492363e-05
## 8845     3 66780 4.492363e-05
## 8846     3 66780 4.492363e-05
## 8847     3 66780 4.492363e-05
## 8848     3 66780 4.492363e-05
## 8849     3 66780 4.492363e-05
## 8850     3 66780 4.492363e-05
## 8851     3 66780 4.492363e-05
## 8852     3 66780 4.492363e-05
## 8853     3 66780 4.492363e-05
## 8854     3 66780 4.492363e-05
## 8855     3 66780 4.492363e-05
## 8856     3 66780 4.492363e-05
## 8857     3 66780 4.492363e-05
## 8858     3 66780 4.492363e-05
## 8859     3 66780 4.492363e-05
## 8860     3 66780 4.492363e-05
## 8861     3 66780 4.492363e-05
## 8862     3 66780 4.492363e-05
## 8863     3 66780 4.492363e-05
## 8864     3 66780 4.492363e-05
## 8865     3 66780 4.492363e-05
## 8866     3 66780 4.492363e-05
## 8867     3 66780 4.492363e-05
## 8868     3 66780 4.492363e-05
## 8869     3 66780 4.492363e-05
## 8870     3 66780 4.492363e-05
## 8871     3 66780 4.492363e-05
## 8872     3 66780 4.492363e-05
## 8873     3 66780 4.492363e-05
## 8874     3 66780 4.492363e-05
## 8875     3 66780 4.492363e-05
## 8876     3 66780 4.492363e-05
## 8877     3 66780 4.492363e-05
## 8878     3 66780 4.492363e-05
## 8879     3 66780 4.492363e-05
## 8880     3 66780 4.492363e-05
## 8881     3 66780 4.492363e-05
## 8882     3 66780 4.492363e-05
## 8883     3 66780 4.492363e-05
## 8884     3 66780 4.492363e-05
## 8885     3 66780 4.492363e-05
## 8886     3 66780 4.492363e-05
## 8887     3 66780 4.492363e-05
## 8888     3 66780 4.492363e-05
## 8889     3 66780 4.492363e-05
## 8890     3 66780 4.492363e-05
## 8891     3 66780 4.492363e-05
## 8892     3 66780 4.492363e-05
## 8893     3 66780 4.492363e-05
## 8894     3 66780 4.492363e-05
## 8895     3 66780 4.492363e-05
## 8896     3 66780 4.492363e-05
## 8897     3 66780 4.492363e-05
## 8898     3 66780 4.492363e-05
## 8899     3 66780 4.492363e-05
## 8900     3 66780 4.492363e-05
## 8901     3 66780 4.492363e-05
## 8902     3 66780 4.492363e-05
## 8903     3 66780 4.492363e-05
## 8904     3 66780 4.492363e-05
## 8905     3 66780 4.492363e-05
## 8906     3 66780 4.492363e-05
## 8907     3 66780 4.492363e-05
## 8908     3 66780 4.492363e-05
## 8909     3 66780 4.492363e-05
## 8910     3 66780 4.492363e-05
## 8911     3 66780 4.492363e-05
## 8912     3 66780 4.492363e-05
## 8913     3 66780 4.492363e-05
## 8914     3 66780 4.492363e-05
## 8915     3 66780 4.492363e-05
## 8916     3 66780 4.492363e-05
## 8917     3 66780 4.492363e-05
## 8918     3 66780 4.492363e-05
## 8919     3 66780 4.492363e-05
## 8920     3 66780 4.492363e-05
## 8921     3 66780 4.492363e-05
## 8922     3 66780 4.492363e-05
## 8923     3 66780 4.492363e-05
## 8924     3 66780 4.492363e-05
## 8925     3 66780 4.492363e-05
## 8926     3 66780 4.492363e-05
## 8927     3 66780 4.492363e-05
## 8928     3 66780 4.492363e-05
## 8929     3 66780 4.492363e-05
## 8930     3 66780 4.492363e-05
## 8931     3 66780 4.492363e-05
## 8932     3 66780 4.492363e-05
## 8933     3 66780 4.492363e-05
## 8934     3 66780 4.492363e-05
## 8935     3 66780 4.492363e-05
## 8936     3 66780 4.492363e-05
## 8937     3 66780 4.492363e-05
## 8938     3 66780 4.492363e-05
## 8939     3 66780 4.492363e-05
## 8940     3 66780 4.492363e-05
## 8941     3 66780 4.492363e-05
## 8942     3 66780 4.492363e-05
## 8943     3 66780 4.492363e-05
## 8944     3 66780 4.492363e-05
## 8945     3 66780 4.492363e-05
## 8946     3 66780 4.492363e-05
## 8947     3 66780 4.492363e-05
## 8948     3 66780 4.492363e-05
## 8949     3 66780 4.492363e-05
## 8950     3 66780 4.492363e-05
## 8951     3 66780 4.492363e-05
## 8952     3 66780 4.492363e-05
## 8953     3 66780 4.492363e-05
## 8954     3 66780 4.492363e-05
## 8955     3 66780 4.492363e-05
## 8956     3 66780 4.492363e-05
## 8957     3 66780 4.492363e-05
## 8958     3 66780 4.492363e-05
## 8959     3 66780 4.492363e-05
## 8960     3 66780 4.492363e-05
## 8961     3 66780 4.492363e-05
## 8962     3 66780 4.492363e-05
## 8963     3 66780 4.492363e-05
## 8964     3 66780 4.492363e-05
## 8965     3 65844 4.556224e-05
## 8966     3 65844 4.556224e-05
## 8967     3 65844 4.556224e-05
## 8968     3 65844 4.556224e-05
## 8969     3 65844 4.556224e-05
## 8970     3 65844 4.556224e-05
## 8971     3 65844 4.556224e-05
## 8972     3 65844 4.556224e-05
## 8973     3 65844 4.556224e-05
## 8974     3 65844 4.556224e-05
## 8975     3 65844 4.556224e-05
## 8976     3 65844 4.556224e-05
## 8977     3 65844 4.556224e-05
## 8978     3 65844 4.556224e-05
## 8979     3 65844 4.556224e-05
## 8980     3 65844 4.556224e-05
## 8981     3 65844 4.556224e-05
## 8982     3 65844 4.556224e-05
## 8983     3 65844 4.556224e-05
## 8984     3 65844 4.556224e-05
## 8985     3 65844 4.556224e-05
## 8986     3 65844 4.556224e-05
## 8987     3 65844 4.556224e-05
## 8988     3 65844 4.556224e-05
## 8989     3 65844 4.556224e-05
## 8990     3 65844 4.556224e-05
## 8991     3 65844 4.556224e-05
## 8992     3 65844 4.556224e-05
## 8993     3 65844 4.556224e-05
## 8994     3 65844 4.556224e-05
## 8995     3 65844 4.556224e-05
## 8996     3 65844 4.556224e-05
## 8997     3 65844 4.556224e-05
## 8998     3 65844 4.556224e-05
## 8999     3 65844 4.556224e-05
## 9000     3 65844 4.556224e-05
## 9001     3 65844 4.556224e-05
## 9002     3 65844 4.556224e-05
## 9003     3 65844 4.556224e-05
## 9004     3 65844 4.556224e-05
## 9005     3 65844 4.556224e-05
## 9006     3 65844 4.556224e-05
## 9007     3 65844 4.556224e-05
## 9008     3 65844 4.556224e-05
## 9009     3 65844 4.556224e-05
## 9010     3 65844 4.556224e-05
## 9011     3 65844 4.556224e-05
## 9012     3 65844 4.556224e-05
## 9013     3 65844 4.556224e-05
## 9014     3 65844 4.556224e-05
## 9015     3 65844 4.556224e-05
## 9016     3 65844 4.556224e-05
## 9017     3 65844 4.556224e-05
## 9018     3 65844 4.556224e-05
## 9019     3 65844 4.556224e-05
## 9020     3 65844 4.556224e-05
## 9021     3 65844 4.556224e-05
## 9022     3 65844 4.556224e-05
## 9023     3 65844 4.556224e-05
## 9024     3 65844 4.556224e-05
## 9025     3 65844 4.556224e-05
## 9026     3 65844 4.556224e-05
## 9027     3 65844 4.556224e-05
## 9028     3 65844 4.556224e-05
## 9029     3 65844 4.556224e-05
## 9030     3 65844 4.556224e-05
## 9031     3 65844 4.556224e-05
## 9032     3 65844 4.556224e-05
## 9033     3 65844 4.556224e-05
## 9034     3 65844 4.556224e-05
## 9035     3 65844 4.556224e-05
## 9036     3 65844 4.556224e-05
## 9037     3 65844 4.556224e-05
## 9038     3 65844 4.556224e-05
## 9039     3 65844 4.556224e-05
## 9040     3 65844 4.556224e-05
## 9041     3 65844 4.556224e-05
## 9042     3 65844 4.556224e-05
## 9043     3 65844 4.556224e-05
## 9044     3 65844 4.556224e-05
## 9045     3 65844 4.556224e-05
## 9046     3 65844 4.556224e-05
## 9047     3 65844 4.556224e-05
## 9048     3 65844 4.556224e-05
## 9049     3 65844 4.556224e-05
## 9050     3 65844 4.556224e-05
## 9051     3 65844 4.556224e-05
## 9052     3 65844 4.556224e-05
## 9053     3 65844 4.556224e-05
## 9054     3 65844 4.556224e-05
## 9055     3 65844 4.556224e-05
## 9056     3 65844 4.556224e-05
## 9057     3 65844 4.556224e-05
## 9058     3 65844 4.556224e-05
## 9059     3 65844 4.556224e-05
## 9060     3 65844 4.556224e-05
## 9061     3 65844 4.556224e-05
## 9062     3 65844 4.556224e-05
## 9063     3 65844 4.556224e-05
## 9064     3 65844 4.556224e-05
## 9065     3 65844 4.556224e-05
## 9066     3 65844 4.556224e-05
## 9067     3 65844 4.556224e-05
## 9068     3 65844 4.556224e-05
## 9069     3 65844 4.556224e-05
## 9070     3 65844 4.556224e-05
## 9071     3 65844 4.556224e-05
## 9072     3 65844 4.556224e-05
## 9073     3 65844 4.556224e-05
## 9074     3 65844 4.556224e-05
## 9075     3 65844 4.556224e-05
## 9076     3 65844 4.556224e-05
## 9077     3 65844 4.556224e-05
## 9078     3 65844 4.556224e-05
## 9079     3 65844 4.556224e-05
## 9080     3 65844 4.556224e-05
## 9081     3 65844 4.556224e-05
## 9082     3 65844 4.556224e-05
## 9083     3 65844 4.556224e-05
## 9084     3 65844 4.556224e-05
## 9085     3 65844 4.556224e-05
## 9086     3 65844 4.556224e-05
## 9087     3 65844 4.556224e-05
## 9088     3 65844 4.556224e-05
## 9089     3 65844 4.556224e-05
## 9090     3 65844 4.556224e-05
## 9091     3 65844 4.556224e-05
## 9092     3 65844 4.556224e-05
## 9093     3 65844 4.556224e-05
## 9094     3 65844 4.556224e-05
## 9095     3 65844 4.556224e-05
## 9096     3 65844 4.556224e-05
## 9097     3 65844 4.556224e-05
## 9098     3 65844 4.556224e-05
## 9099     3 65844 4.556224e-05
## 9100     3 65844 4.556224e-05
## 9101     3 65844 4.556224e-05
## 9102     3 65844 4.556224e-05
## 9103     3 65844 4.556224e-05
## 9104     3 65844 4.556224e-05
## 9105     3 65844 4.556224e-05
## 9106     3 65844 4.556224e-05
## 9107     3 65844 4.556224e-05
## 9108     3 65844 4.556224e-05
## 9109     3 65844 4.556224e-05
## 9110     3 65844 4.556224e-05
## 9111     3 65844 4.556224e-05
## 9112     3 65844 4.556224e-05
## 9113     3 65844 4.556224e-05
## 9114     3 65844 4.556224e-05
## 9115     3 65844 4.556224e-05
## 9116     3 65844 4.556224e-05
## 9117     3 65844 4.556224e-05
## 9118     3 65844 4.556224e-05
## 9119     3 65844 4.556224e-05
## 9120     3 65844 4.556224e-05
## 9121     3 65844 4.556224e-05
## 9122     3 65844 4.556224e-05
## 9123     3 65844 4.556224e-05
## 9124     3 65844 4.556224e-05
## 9125     3 65844 4.556224e-05
## 9126     3 65844 4.556224e-05
## 9127     3 65844 4.556224e-05
## 9128     3 65844 4.556224e-05
## 9129     3 65844 4.556224e-05
## 9130     3 65844 4.556224e-05
## 9131     3 65844 4.556224e-05
## 9132     3 65844 4.556224e-05
## 9133     3 65844 4.556224e-05
## 9134     3 65844 4.556224e-05
## 9135     3 65844 4.556224e-05
## 9136     3 65844 4.556224e-05
## 9137     3 65844 4.556224e-05
## 9138     3 65844 4.556224e-05
## 9139     3 65844 4.556224e-05
## 9140     3 65844 4.556224e-05
## 9141     3 65844 4.556224e-05
## 9142     3 65844 4.556224e-05
## 9143     3 65844 4.556224e-05
## 9144     3 65844 4.556224e-05
## 9145     3 65844 4.556224e-05
## 9146     3 65844 4.556224e-05
## 9147     3 65844 4.556224e-05
## 9148     3 65844 4.556224e-05
## 9149     3 65844 4.556224e-05
## 9150     3 65844 4.556224e-05
## 9151     3 65844 4.556224e-05
## 9152     3 65844 4.556224e-05
## 9153     3 65844 4.556224e-05
## 9154     3 65844 4.556224e-05
## 9155     3 65844 4.556224e-05
## 9156     3 65844 4.556224e-05
## 9157     3 65844 4.556224e-05
## 9158     3 65844 4.556224e-05
## 9159     3 65844 4.556224e-05
## 9160     3 65844 4.556224e-05
## 9161     3 65844 4.556224e-05
## 9162     3 65844 4.556224e-05
## 9163     3 65844 4.556224e-05
## 9164     3 65844 4.556224e-05
## 9165     3 65844 4.556224e-05
## 9166     3 65844 4.556224e-05
## 9167     3 65844 4.556224e-05
## 9168     3 65844 4.556224e-05
## 9169     3 65844 4.556224e-05
## 9170     3 65844 4.556224e-05
## 9171     3 65844 4.556224e-05
## 9172     3 65844 4.556224e-05
## 9173     3 65844 4.556224e-05
## 9174     3 65844 4.556224e-05
## 9175     3 65844 4.556224e-05
## 9176     3 65844 4.556224e-05
## 9177     3 65844 4.556224e-05
## 9178     3 65844 4.556224e-05
## 9179     3 65844 4.556224e-05
## 9180     3 65844 4.556224e-05
## 9181     3 65844 4.556224e-05
## 9182     3 65844 4.556224e-05
## 9183     3 65844 4.556224e-05
## 9184     3 65844 4.556224e-05
## 9185     3 65844 4.556224e-05
## 9186     3 65844 4.556224e-05
## 9187     3 65844 4.556224e-05
## 9188     3 65844 4.556224e-05
## 9189     3 65844 4.556224e-05
## 9190     3 65844 4.556224e-05
## 9191     3 65844 4.556224e-05
## 9192     3 65844 4.556224e-05
## 9193     3 65844 4.556224e-05
## 9194     3 65844 4.556224e-05
## 9195     3 65844 4.556224e-05
## 9196     3 65844 4.556224e-05
## 9197     3 65844 4.556224e-05
## 9198     3 65844 4.556224e-05
## 9199     3 65844 4.556224e-05
## 9200     3 65844 4.556224e-05
## 9201     3 65844 4.556224e-05
## 9202     3 65844 4.556224e-05
## 9203     3 65844 4.556224e-05
## 9204     3 65844 4.556224e-05
## 9205     3 65844 4.556224e-05
## 9206     3 65844 4.556224e-05
## 9207     3 65844 4.556224e-05
## 9208     3 65844 4.556224e-05
## 9209     3 65844 4.556224e-05
## 9210     3 65844 4.556224e-05
## 9211     3 65844 4.556224e-05
## 9212     3 65844 4.556224e-05
## 9213     3 65844 4.556224e-05
## 9214     3 65844 4.556224e-05
## 9215     3 65844 4.556224e-05
## 9216     3 65844 4.556224e-05
## 9217     3 65844 4.556224e-05
## 9218     3 65844 4.556224e-05
## 9219     3 65844 4.556224e-05
## 9220     3 65844 4.556224e-05
## 9221     3 65844 4.556224e-05
## 9222     3 65844 4.556224e-05
## 9223     3 65844 4.556224e-05
## 9224     3 65844 4.556224e-05
## 9225     3 65844 4.556224e-05
## 9226     3 65844 4.556224e-05
## 9227     3 65844 4.556224e-05
## 9228     3 65844 4.556224e-05
## 9229     3 65844 4.556224e-05
## 9230     3 65844 4.556224e-05
## 9231     3 65844 4.556224e-05
## 9232     3 65844 4.556224e-05
## 9233     3 65844 4.556224e-05
## 9234     3 65844 4.556224e-05
## 9235     3 65844 4.556224e-05
## 9236     3 65844 4.556224e-05
## 9237     3 65844 4.556224e-05
## 9238     3 65844 4.556224e-05
## 9239     3 65844 4.556224e-05
## 9240     3 65844 4.556224e-05
## 9241     3 65844 4.556224e-05
## 9242     3 65844 4.556224e-05
## 9243     3 65844 4.556224e-05
## 9244     3 65844 4.556224e-05
## 9245     3 65844 4.556224e-05
## 9246     3 65844 4.556224e-05
## 9247     3 65844 4.556224e-05
## 9248     3 65844 4.556224e-05
## 9249     3 65844 4.556224e-05
## 9250     3 65844 4.556224e-05
## 9251     3 65844 4.556224e-05
## 9252     3 65844 4.556224e-05
## 9253     3 65844 4.556224e-05
## 9254     3 65844 4.556224e-05
## 9255     3 65844 4.556224e-05
## 9256     3 65844 4.556224e-05
## 9257     3 65844 4.556224e-05
## 9258     3 65844 4.556224e-05
## 9259     3 65844 4.556224e-05
## 9260     3 65844 4.556224e-05
## 9261     3 65844 4.556224e-05
## 9262     3 65844 4.556224e-05
## 9263     3 65844 4.556224e-05
## 9264     3 65844 4.556224e-05
## 9265     3 65844 4.556224e-05
## 9266     3 65844 4.556224e-05
## 9267     3 65844 4.556224e-05
## 9268     3 65844 4.556224e-05
## 9269     3 65844 4.556224e-05
## 9270     3 65844 4.556224e-05
## 9271     3 65844 4.556224e-05
## 9272     3 65844 4.556224e-05
## 9273     3 65844 4.556224e-05
## 9274     3 65844 4.556224e-05
## 9275     3 65844 4.556224e-05
## 9276     3 65844 4.556224e-05
## 9277     3 65844 4.556224e-05
## 9278     3 65844 4.556224e-05
## 9279     3 65844 4.556224e-05
## 9280     3 65844 4.556224e-05
## 9281     3 65844 4.556224e-05
## 9282     3 65844 4.556224e-05
## 9283     3 65844 4.556224e-05
## 9284     3 65844 4.556224e-05
## 9285     3 65844 4.556224e-05
## 9286     3 65844 4.556224e-05
## 9287     3 65844 4.556224e-05
## 9288     3 65844 4.556224e-05
## 9289     3 65844 4.556224e-05
## 9290     3 65844 4.556224e-05
## 9291     3 65844 4.556224e-05
## 9292     3 65844 4.556224e-05
## 9293     3 65844 4.556224e-05
## 9294     3 65844 4.556224e-05
## 9295     3 65844 4.556224e-05
## 9296     3 65844 4.556224e-05
## 9297     3 65844 4.556224e-05
## 9298     3 65844 4.556224e-05
## 9299     3 65844 4.556224e-05
## 9300     3 65844 4.556224e-05
## 9301     3 65844 4.556224e-05
## 9302     3 65844 4.556224e-05
## 9303     3 65844 4.556224e-05
## 9304     3 65844 4.556224e-05
## 9305     3 65844 4.556224e-05
## 9306     3 65844 4.556224e-05
## 9307     3 65844 4.556224e-05
## 9308     3 65844 4.556224e-05
## 9309     3 65844 4.556224e-05
## 9310     3 65844 4.556224e-05
## 9311     3 65844 4.556224e-05
## 9312     3 65844 4.556224e-05
## 9313     3 65844 4.556224e-05
## 9314     3 65844 4.556224e-05
## 9315     3 65844 4.556224e-05
## 9316     3 65844 4.556224e-05
## 9317     3 65844 4.556224e-05
## 9318     3 65844 4.556224e-05
## 9319     3 65844 4.556224e-05
## 9320     3 65844 4.556224e-05
## 9321     3 65844 4.556224e-05
## 9322     3 65844 4.556224e-05
## 9323     3 65844 4.556224e-05
## 9324     3 65844 4.556224e-05
## 9325     3 65844 4.556224e-05
## 9326     3 65844 4.556224e-05
## 9327     3 65844 4.556224e-05
## 9328     3 65844 4.556224e-05
## 9329     3 65844 4.556224e-05
## 9330     3 65844 4.556224e-05
## 9331     3 65844 4.556224e-05
## 9332     3 65844 4.556224e-05
## 9333     3 65844 4.556224e-05
## 9334     3 65844 4.556224e-05
## 9335     3 65844 4.556224e-05
## 9336     3 65844 4.556224e-05
## 9337     3 65844 4.556224e-05
## 9338     3 65844 4.556224e-05
## 9339     3 65844 4.556224e-05
## 9340     3 65844 4.556224e-05
## 9341     3 65844 4.556224e-05
## 9342     3 65844 4.556224e-05
## 9343     3 65844 4.556224e-05
## 9344     3 65844 4.556224e-05
## 9345     3 65844 4.556224e-05
## 9346     3 65844 4.556224e-05
## 9347     3 65844 4.556224e-05
## 9348     3 65844 4.556224e-05
## 9349     3 65844 4.556224e-05
## 9350     3 65844 4.556224e-05
## 9351     3 65844 4.556224e-05
## 9352     3 65844 4.556224e-05
## 9353     3 65844 4.556224e-05
## 9354     3 65844 4.556224e-05
## 9355     3 65844 4.556224e-05
## 9356     3 65844 4.556224e-05
## 9357     3 65844 4.556224e-05
## 9358     3 65844 4.556224e-05
## 9359     3 65844 4.556224e-05
## 9360     3 65844 4.556224e-05
## 9361     3 65844 4.556224e-05
## 9362     3 65844 4.556224e-05
## 9363     3 65844 4.556224e-05
## 9364     3 65844 4.556224e-05
## 9365     3 65844 4.556224e-05
## 9366     3 65844 4.556224e-05
## 9367     3 65844 4.556224e-05
## 9368     3 65844 4.556224e-05
## 9369     3 65844 4.556224e-05
## 9370     3 65844 4.556224e-05
## 9371     3 65844 4.556224e-05
## 9372     3 65844 4.556224e-05
## 9373     3 65844 4.556224e-05
## 9374     3 65844 4.556224e-05
## 9375     3 65844 4.556224e-05
## 9376     3 65844 4.556224e-05
## 9377     3 65844 4.556224e-05
## 9378     3 65844 4.556224e-05
## 9379     3 65844 4.556224e-05
## 9380     3 65844 4.556224e-05
## 9381     3 65844 4.556224e-05
## 9382     3 65844 4.556224e-05
## 9383     3 65844 4.556224e-05
## 9384     3 65844 4.556224e-05
## 9385     3 65844 4.556224e-05
## 9386     3 65844 4.556224e-05
## 9387     3 65844 4.556224e-05
## 9388     3 65844 4.556224e-05
## 9389     3 65844 4.556224e-05
## 9390     3 65844 4.556224e-05
## 9391     3 65844 4.556224e-05
## 9392     3 65844 4.556224e-05
## 9393     3 65844 4.556224e-05
## 9394     3 65844 4.556224e-05
## 9395     3 65844 4.556224e-05
## 9396     3 65844 4.556224e-05
## 9397     3 65844 4.556224e-05
## 9398     3 65844 4.556224e-05
## 9399     3 65844 4.556224e-05
## 9400     3 65844 4.556224e-05
## 9401     3 65844 4.556224e-05
## 9402     3 65844 4.556224e-05
## 9403     3 65844 4.556224e-05
## 9404     3 65844 4.556224e-05
## 9405     3 65844 4.556224e-05
## 9406     3 65844 4.556224e-05
## 9407     3 65844 4.556224e-05
## 9408     3 65844 4.556224e-05
## 9409     3 65844 4.556224e-05
## 9410     3 65844 4.556224e-05
## 9411     3 65844 4.556224e-05
## 9412     3 65844 4.556224e-05
## 9413     3 65844 4.556224e-05
## 9414     3 65844 4.556224e-05
## 9415     3 65844 4.556224e-05
## 9416     3 65844 4.556224e-05
## 9417     3 65844 4.556224e-05
## 9418     3 65844 4.556224e-05
## 9419     3 65844 4.556224e-05
## 9420     3 65844 4.556224e-05
## 9421     3 65844 4.556224e-05
## 9422     3 65844 4.556224e-05
## 9423     3 65844 4.556224e-05
## 9424     3 65844 4.556224e-05
## 9425     3 65844 4.556224e-05
## 9426     3 65844 4.556224e-05
## 9427     3 65844 4.556224e-05
## 9428     3 65844 4.556224e-05
## 9429     3 65844 4.556224e-05
## 9430     3 65844 4.556224e-05
## 9431     3 65844 4.556224e-05
## 9432     3 65844 4.556224e-05
## 9433     3 65844 4.556224e-05
## 9434     3 65844 4.556224e-05
## 9435     3 65844 4.556224e-05
## 9436     3 65844 4.556224e-05
## 9437     3 65844 4.556224e-05
## 9438     3 65844 4.556224e-05
## 9439     3 65844 4.556224e-05
## 9440     3 65844 4.556224e-05
## 9441     3 65844 4.556224e-05
## 9442     3 65844 4.556224e-05
## 9443     3 65844 4.556224e-05
## 9444     3 65844 4.556224e-05
## 9445     3 65844 4.556224e-05
## 9446     3 65844 4.556224e-05
## 9447     3 65844 4.556224e-05
## 9448     3 65844 4.556224e-05
## 9449     3 65844 4.556224e-05
## 9450     3 65844 4.556224e-05
## 9451     3 65844 4.556224e-05
## 9452     3 65844 4.556224e-05
## 9453     3 65844 4.556224e-05
## 9454     3 65844 4.556224e-05
## 9455     3 65844 4.556224e-05
## 9456     3 65844 4.556224e-05
## 9457     3 65844 4.556224e-05
## 9458     3 65844 4.556224e-05
## 9459     3 65844 4.556224e-05
## 9460     3 65844 4.556224e-05
## 9461     3 65844 4.556224e-05
## 9462     3 65844 4.556224e-05
## 9463     3 65844 4.556224e-05
## 9464     3 65844 4.556224e-05
## 9465     3 65844 4.556224e-05
## 9466     3 65844 4.556224e-05
## 9467     3 65844 4.556224e-05
## 9468     3 65844 4.556224e-05
## 9469     3 65844 4.556224e-05
## 9470     3 65844 4.556224e-05
## 9471     3 65844 4.556224e-05
## 9472     3 65844 4.556224e-05
## 9473     3 65844 4.556224e-05
## 9474     3 65844 4.556224e-05
## 9475     3 65844 4.556224e-05
## 9476     3 65844 4.556224e-05
## 9477     3 65844 4.556224e-05
## 9478     3 65844 4.556224e-05
## 9479     3 65844 4.556224e-05
## 9480     3 65844 4.556224e-05
## 9481     3 65844 4.556224e-05
## 9482     3 65844 4.556224e-05
## 9483     3 65844 4.556224e-05
## 9484     3 65844 4.556224e-05
## 9485     3 65844 4.556224e-05
## 9486     3 65844 4.556224e-05
## 9487     3 65844 4.556224e-05
## 9488     3 65844 4.556224e-05
## 9489     3 65844 4.556224e-05
## 9490     3 65844 4.556224e-05
## 9491     3 65844 4.556224e-05
## 9492     3 65844 4.556224e-05
## 9493     3 65844 4.556224e-05
## 9494     3 65844 4.556224e-05
## 9495     3 65844 4.556224e-05
## 9496     3 65844 4.556224e-05
## 9497     3 65844 4.556224e-05
## 9498     3 65844 4.556224e-05
## 9499     3 65844 4.556224e-05
## 9500     3 65844 4.556224e-05
## 9501     3 65844 4.556224e-05
## 9502     3 65844 4.556224e-05
## 9503     3 65844 4.556224e-05
## 9504     3 65844 4.556224e-05
## 9505     3 65844 4.556224e-05
## 9506     3 65844 4.556224e-05
## 9507     3 65844 4.556224e-05
## 9508     3 65844 4.556224e-05
## 9509     3 65844 4.556224e-05
## 9510     3 65844 4.556224e-05
## 9511     3 65844 4.556224e-05
## 9512     3 65844 4.556224e-05
## 9513     3 65844 4.556224e-05
## 9514     3 65844 4.556224e-05
## 9515     3 65844 4.556224e-05
## 9516     3 65844 4.556224e-05
## 9517     3 65844 4.556224e-05
## 9518     3 65844 4.556224e-05
## 9519     3 65844 4.556224e-05
## 9520     3 65844 4.556224e-05
## 9521     3 65844 4.556224e-05
## 9522     3 65844 4.556224e-05
## 9523     3 65844 4.556224e-05
## 9524     3 65844 4.556224e-05
## 9525     3 65844 4.556224e-05
## 9526     3 65844 4.556224e-05
## 9527     3 65844 4.556224e-05
## 9528     3 65844 4.556224e-05
## 9529     3 65844 4.556224e-05
## 9530     3 65844 4.556224e-05
## 9531     3 65844 4.556224e-05
## 9532     3 65844 4.556224e-05
## 9533     3 65844 4.556224e-05
## 9534     3 65844 4.556224e-05
## 9535     3 65844 4.556224e-05
## 9536     3 65844 4.556224e-05
## 9537     3 65844 4.556224e-05
## 9538     3 65844 4.556224e-05
## 9539     3 65844 4.556224e-05
## 9540     3 65844 4.556224e-05
## 9541     3 65844 4.556224e-05
## 9542     3 65844 4.556224e-05
## 9543     3 65844 4.556224e-05
## 9544     3 65844 4.556224e-05
## 9545     3 65844 4.556224e-05
## 9546     3 65844 4.556224e-05
## 9547     3 65844 4.556224e-05
## 9548     3 65844 4.556224e-05
## 9549     3 65844 4.556224e-05
## 9550     3 65844 4.556224e-05
## 9551     3 65844 4.556224e-05
## 9552     3 65844 4.556224e-05
## 9553     3 65844 4.556224e-05
## 9554     3 65844 4.556224e-05
## 9555     3 65844 4.556224e-05
## 9556     3 65844 4.556224e-05
## 9557     3 65844 4.556224e-05
## 9558     3 65844 4.556224e-05
## 9559     3 65844 4.556224e-05
## 9560     3 65844 4.556224e-05
## 9561     3 65844 4.556224e-05
## 9562     3 65844 4.556224e-05
## 9563     3 65844 4.556224e-05
## 9564     3 65844 4.556224e-05
## 9565     3 65844 4.556224e-05
## 9566     3 65844 4.556224e-05
## 9567     3 65844 4.556224e-05
## 9568     3 65844 4.556224e-05
## 9569     3 65844 4.556224e-05
## 9570     3 65844 4.556224e-05
## 9571     3 65844 4.556224e-05
## 9572     3 65844 4.556224e-05
## 9573     3 65844 4.556224e-05
## 9574     3 65844 4.556224e-05
## 9575     3 65844 4.556224e-05
## 9576     3 65844 4.556224e-05
## 9577     3 65844 4.556224e-05
## 9578     3 65844 4.556224e-05
## 9579     3 65844 4.556224e-05
## 9580     3 65844 4.556224e-05
## 9581     3 65844 4.556224e-05
## 9582     3 65844 4.556224e-05
## 9583     3 65844 4.556224e-05
## 9584     3 65844 4.556224e-05
## 9585     3 65844 4.556224e-05
## 9586     3 65844 4.556224e-05
## 9587     3 65844 4.556224e-05
## 9588     3 65844 4.556224e-05
## 9589     3 65844 4.556224e-05
## 9590     3 65844 4.556224e-05
## 9591     3 65844 4.556224e-05
## 9592     3 65844 4.556224e-05
## 9593     3 65844 4.556224e-05
## 9594     3 65844 4.556224e-05
## 9595     3 65844 4.556224e-05
## 9596     3 65844 4.556224e-05
## 9597     3 65844 4.556224e-05
## 9598     3 65844 4.556224e-05
## 9599     3 65844 4.556224e-05
## 9600     3 65844 4.556224e-05
## 9601     3 65844 4.556224e-05
## 9602     3 65844 4.556224e-05
## 9603     3 65844 4.556224e-05
## 9604     3 65844 4.556224e-05
## 9605     3 65844 4.556224e-05
## 9606     3 65844 4.556224e-05
## 9607     3 65844 4.556224e-05
## 9608     3 65844 4.556224e-05
## 9609     3 65844 4.556224e-05
## 9610     3 65844 4.556224e-05
## 9611     3 65844 4.556224e-05
## 9612     3 65844 4.556224e-05
## 9613     3 65844 4.556224e-05
## 9614     3 65844 4.556224e-05
## 9615     3 65844 4.556224e-05
## 9616     3 65844 4.556224e-05
## 9617     3 65844 4.556224e-05
## 9618     3 65844 4.556224e-05
## 9619     3 65844 4.556224e-05
## 9620     3 65844 4.556224e-05
## 9621     3 65844 4.556224e-05
## 9622     3 65844 4.556224e-05
## 9623     3 65844 4.556224e-05
## 9624     3 65844 4.556224e-05
## 9625     3 65844 4.556224e-05
## 9626     3 65844 4.556224e-05
## 9627     3 65844 4.556224e-05
## 9628     3 65844 4.556224e-05
## 9629     3 65844 4.556224e-05
## 9630     3 65844 4.556224e-05
## 9631     3 65844 4.556224e-05
## 9632     3 65844 4.556224e-05
## 9633     3 65844 4.556224e-05
## 9634     3 65844 4.556224e-05
## 9635     3 65844 4.556224e-05
## 9636     3 65844 4.556224e-05
## 9637     3 65844 4.556224e-05
## 9638     3 65844 4.556224e-05
## 9639     3 65844 4.556224e-05
## 9640     3 65844 4.556224e-05
## 9641     3 65844 4.556224e-05
## 9642     3 65844 4.556224e-05
## 9643     3 65844 4.556224e-05
## 9644     3 65844 4.556224e-05
## 9645     3 65844 4.556224e-05
## 9646     3 65844 4.556224e-05
## 9647     3 65844 4.556224e-05
## 9648     3 65844 4.556224e-05
## 9649     3 65844 4.556224e-05
## 9650     3 65844 4.556224e-05
## 9651     3 65844 4.556224e-05
## 9652     3 65844 4.556224e-05
## 9653     3 65844 4.556224e-05
## 9654     3 65844 4.556224e-05
## 9655     3 65844 4.556224e-05
## 9656     3 65844 4.556224e-05
## 9657     3 65844 4.556224e-05
## 9658     3 65844 4.556224e-05
## 9659     3 65844 4.556224e-05
## 9660     3 65844 4.556224e-05
## 9661     3 65844 4.556224e-05
## 9662     3 65844 4.556224e-05
## 9663     3 65844 4.556224e-05
## 9664     3 65844 4.556224e-05
## 9665     3 65844 4.556224e-05
## 9666     3 65844 4.556224e-05
## 9667     3 65844 4.556224e-05
## 9668     3 65844 4.556224e-05
## 9669     3 65844 4.556224e-05
## 9670     3 65844 4.556224e-05
## 9671     3 65844 4.556224e-05
## 9672     3 65844 4.556224e-05
## 9673     3 65844 4.556224e-05
## 9674     3 65844 4.556224e-05
## 9675     3 65844 4.556224e-05
## 9676     3 65844 4.556224e-05
## 9677     3 65844 4.556224e-05
## 9678     3 65844 4.556224e-05
## 9679     3 65844 4.556224e-05
## 9680     3 65844 4.556224e-05
## 9681     3 65844 4.556224e-05
## 9682     3 65844 4.556224e-05
## 9683     3 65844 4.556224e-05
## 9684     3 65844 4.556224e-05
## 9685     3 65844 4.556224e-05
## 9686     3 65844 4.556224e-05
## 9687     3 65844 4.556224e-05
## 9688     3 65844 4.556224e-05
## 9689     3 65844 4.556224e-05
## 9690     3 65844 4.556224e-05
## 9691     3 65844 4.556224e-05
## 9692     3 65844 4.556224e-05
## 9693     3 65844 4.556224e-05
## 9694     3 65844 4.556224e-05
## 9695     3 65844 4.556224e-05
## 9696     3 65844 4.556224e-05
## 9697     3 65844 4.556224e-05
## 9698     3 65844 4.556224e-05
## 9699     3 65844 4.556224e-05
## 9700     3 65844 4.556224e-05
## 9701     3 65844 4.556224e-05
## 9702     3 65844 4.556224e-05
## 9703     3 65844 4.556224e-05
## 9704     3 65844 4.556224e-05
## 9705     3 65844 4.556224e-05
## 9706     3 65844 4.556224e-05
## 9707     3 65844 4.556224e-05
## 9708     3 65844 4.556224e-05
## 9709     3 65844 4.556224e-05
## 9710     3 65844 4.556224e-05
## 9711     3 65844 4.556224e-05
## 9712     3 65844 4.556224e-05
## 9713     3 65844 4.556224e-05
## 9714     3 65844 4.556224e-05
## 9715     3 65844 4.556224e-05
## 9716     3 65844 4.556224e-05
## 9717     3 65844 4.556224e-05
## 9718     3 65844 4.556224e-05
## 9719     3 65844 4.556224e-05
## 9720     3 65844 4.556224e-05
## 9721     3 65844 4.556224e-05
## 9722     3 65844 4.556224e-05
## 9723     3 65844 4.556224e-05
## 9724     3 65844 4.556224e-05
## 9725     3 65844 4.556224e-05
## 9726     3 65844 4.556224e-05
## 9727     3 65844 4.556224e-05
## 9728     3 65844 4.556224e-05
## 9729     3 65844 4.556224e-05
## 9730     3 65844 4.556224e-05
## 9731     3 65844 4.556224e-05
## 9732     3 65844 4.556224e-05
## 9733     3 65844 4.556224e-05
## 9734     3 65844 4.556224e-05
## 9735     3 65844 4.556224e-05
## 9736     3 65844 4.556224e-05
## 9737     3 65844 4.556224e-05
## 9738     3 65844 4.556224e-05
## 9739     3 65844 4.556224e-05
## 9740     3 65844 4.556224e-05
## 9741     3 65844 4.556224e-05
## 9742     3 65844 4.556224e-05
## 9743     3 65844 4.556224e-05
## 9744     3 65844 4.556224e-05
## 9745     3 65844 4.556224e-05
## 9746     3 65844 4.556224e-05
## 9747     3 65844 4.556224e-05
## 9748     3 65844 4.556224e-05
## 9749     3 65844 4.556224e-05
## 9750     3 65844 4.556224e-05
## 9751     3 65844 4.556224e-05
## 9752     3 65844 4.556224e-05
## 9753     3 65844 4.556224e-05
## 9754     3 65844 4.556224e-05
## 9755     3 65844 4.556224e-05
## 9756     3 65844 4.556224e-05
## 9757     3 65844 4.556224e-05
## 9758     3 65844 4.556224e-05
## 9759     3 65844 4.556224e-05
## 9760     3 65844 4.556224e-05
## 9761     3 65844 4.556224e-05
## 9762     3 65844 4.556224e-05
## 9763     3 65844 4.556224e-05
## 9764     3 65844 4.556224e-05
## 9765     3 65844 4.556224e-05
## 9766     3 65844 4.556224e-05
## 9767     3 65844 4.556224e-05
## 9768     3 65844 4.556224e-05
## 9769     3 65844 4.556224e-05
## 9770     3 65844 4.556224e-05
## 9771     3 65844 4.556224e-05
## 9772     3 65844 4.556224e-05
## 9773     3 65844 4.556224e-05
## 9774     3 65844 4.556224e-05
## 9775     3 65844 4.556224e-05
## 9776     3 65844 4.556224e-05
## 9777     3 65844 4.556224e-05
## 9778     3 65844 4.556224e-05
## 9779     3 65844 4.556224e-05
## 9780     3 65844 4.556224e-05
## 9781     3 65844 4.556224e-05
## 9782     3 65844 4.556224e-05
## 9783     3 65844 4.556224e-05
## 9784     3 65844 4.556224e-05
## 9785     3 65844 4.556224e-05
## 9786     3 65844 4.556224e-05
## 9787     3 65844 4.556224e-05
## 9788     3 65844 4.556224e-05
## 9789     3 65844 4.556224e-05
## 9790     3 65844 4.556224e-05
## 9791     3 65844 4.556224e-05
## 9792     3 65844 4.556224e-05
## 9793     3 65844 4.556224e-05
## 9794     3 65844 4.556224e-05
## 9795     3 65844 4.556224e-05
## 9796     3 65844 4.556224e-05
## 9797     3 65844 4.556224e-05
## 9798     3 65844 4.556224e-05
## 9799     3 65844 4.556224e-05
## 9800     3 65844 4.556224e-05
## 9801     3 65844 4.556224e-05
## 9802     3 65844 4.556224e-05
## 9803     3 65844 4.556224e-05
## 9804     3 65844 4.556224e-05
## 9805     3 65844 4.556224e-05
## 9806     3 65844 4.556224e-05
## 9807     3 65844 4.556224e-05
## 9808     3 65844 4.556224e-05
## 9809     3 65844 4.556224e-05
## 9810     3 65844 4.556224e-05
## 9811     3 65844 4.556224e-05
## 9812     3 65844 4.556224e-05
## 9813     3 65844 4.556224e-05
## 9814     3 65844 4.556224e-05
## 9815     3 65844 4.556224e-05
## 9816     3 65844 4.556224e-05
## 9817     3 65844 4.556224e-05
## 9818     3 65844 4.556224e-05
## 9819     3 65844 4.556224e-05
## 9820     3 65844 4.556224e-05
## 9821     3 65844 4.556224e-05
## 9822     3 65844 4.556224e-05
## 9823     3 65844 4.556224e-05
## 9824     3 65844 4.556224e-05
## 9825     3 65844 4.556224e-05
## 9826     3 65844 4.556224e-05
## 9827     3 65844 4.556224e-05
## 9828     3 65844 4.556224e-05
## 9829     3 65844 4.556224e-05
## 9830     3 65844 4.556224e-05
## 9831     3 65844 4.556224e-05
## 9832     3 65844 4.556224e-05
## 9833     3 65844 4.556224e-05
## 9834     3 65844 4.556224e-05
## 9835     3 65844 4.556224e-05
## 9836     3 65844 4.556224e-05
## 9837     3 65844 4.556224e-05
## 9838     3 65844 4.556224e-05
## 9839     3 65844 4.556224e-05
## 9840     3 65844 4.556224e-05
## 9841     3 65844 4.556224e-05
## 9842     3 65844 4.556224e-05
## 9843     3 65844 4.556224e-05
## 9844     3 65844 4.556224e-05
## 9845     3 65844 4.556224e-05
## 9846     3 65844 4.556224e-05
## 9847     3 65844 4.556224e-05
## 9848     3 65844 4.556224e-05
## 9849     3 65844 4.556224e-05
## 9850     3 65844 4.556224e-05
## 9851     3 65844 4.556224e-05
## 9852     3 65844 4.556224e-05
## 9853     3 65844 4.556224e-05
## 9854     3 65844 4.556224e-05
## 9855     3 65844 4.556224e-05
## 9856     3 65844 4.556224e-05
## 9857     3 65844 4.556224e-05
## 9858     3 65844 4.556224e-05
## 9859     3 65844 4.556224e-05
## 9860     3 65844 4.556224e-05
## 9861     3 65844 4.556224e-05
## 9862     3 65844 4.556224e-05
## 9863     3 65844 4.556224e-05
## 9864     3 65844 4.556224e-05
## 9865     3 65844 4.556224e-05
## 9866     3 65844 4.556224e-05
## 9867     3 65844 4.556224e-05
## 9868     3 65844 4.556224e-05
## 9869     3 65844 4.556224e-05
## 9870     3 65844 4.556224e-05
## 9871     3 65844 4.556224e-05
## 9872     3 65844 4.556224e-05
## 9873     3 65844 4.556224e-05
## 9874     3 65844 4.556224e-05
## 9875     3 65844 4.556224e-05
## 9876     3 65844 4.556224e-05
## 9877     3 65844 4.556224e-05
## 9878     3 65844 4.556224e-05
## 9879     3 65844 4.556224e-05
## 9880     3 65844 4.556224e-05
## 9881     3 65844 4.556224e-05
## 9882     3 65844 4.556224e-05
## 9883     3 65844 4.556224e-05
## 9884     3 65844 4.556224e-05
## 9885     3 65844 4.556224e-05
## 9886     3 65844 4.556224e-05
## 9887     3 65844 4.556224e-05
## 9888     3 65844 4.556224e-05
## 9889     3 65844 4.556224e-05
## 9890     3 65844 4.556224e-05
## 9891     3 65844 4.556224e-05
## 9892     3 65844 4.556224e-05
## 9893     3 65844 4.556224e-05
## 9894     3 65844 4.556224e-05
## 9895     3 65844 4.556224e-05
## 9896     3 65844 4.556224e-05
## 9897     3 65844 4.556224e-05
## 9898     3 65844 4.556224e-05
## 9899     3 65844 4.556224e-05
## 9900     3 65844 4.556224e-05
## 9901     3 65844 4.556224e-05
## 9902     3 65844 4.556224e-05
## 9903     3 65844 4.556224e-05
## 9904     3 65844 4.556224e-05
## 9905     3 65844 4.556224e-05
## 9906     3 65844 4.556224e-05
## 9907     3 65844 4.556224e-05
## 9908     3 65844 4.556224e-05
## 9909     3 65844 4.556224e-05
## 9910     3 65844 4.556224e-05
## 9911     3 65844 4.556224e-05
## 9912     3 65844 4.556224e-05
## 9913     3 65844 4.556224e-05
## 9914     3 65844 4.556224e-05
## 9915     3 65844 4.556224e-05
## 9916     3 65844 4.556224e-05
## 9917     3 65844 4.556224e-05
## 9918     3 65844 4.556224e-05
## 9919     3 65844 4.556224e-05
## 9920     3 65844 4.556224e-05
## 9921     3 65844 4.556224e-05
## 9922     3 65844 4.556224e-05
## 9923     3 65844 4.556224e-05
## 9924     3 65844 4.556224e-05
## 9925     3 65844 4.556224e-05
## 9926     3 65844 4.556224e-05
## 9927     3 65844 4.556224e-05
## 9928     3 65844 4.556224e-05
## 9929     3 65844 4.556224e-05
## 9930     3 65844 4.556224e-05
## 9931     3 65844 4.556224e-05
## 9932     3 65844 4.556224e-05
## 9933     3 65844 4.556224e-05
## 9934     3 65844 4.556224e-05
## 9935     3 65844 4.556224e-05
## 9936     3 65844 4.556224e-05
## 9937     3 65844 4.556224e-05
## 9938     3 65844 4.556224e-05
## 9939     3 65844 4.556224e-05
## 9940     3 65844 4.556224e-05
## 9941     3 65844 4.556224e-05
## 9942     3 65844 4.556224e-05
## 9943     3 65844 4.556224e-05
## 9944     3 65844 4.556224e-05
## 9945     3 65844 4.556224e-05
## 9946     3 65844 4.556224e-05
## 9947     3 65844 4.556224e-05
## 9948     3 65844 4.556224e-05
## 9949     3 65844 4.556224e-05
## 9950     3 65844 4.556224e-05
## 9951     3 65844 4.556224e-05
## 9952     3 65844 4.556224e-05
## 9953     3 65844 4.556224e-05
## 9954     3 65844 4.556224e-05
## 9955     3 65844 4.556224e-05
## 9956     3 65844 4.556224e-05
## 9957     3 65844 4.556224e-05
## 9958     3 65844 4.556224e-05
## 9959     3 65844 4.556224e-05
## 9960     3 65844 4.556224e-05
## 9961     3 65844 4.556224e-05
## 9962     3 65844 4.556224e-05
## 9963     3 65844 4.556224e-05
## 9964     3 65844 4.556224e-05
## 9965     3 65844 4.556224e-05
## 9966     3 65844 4.556224e-05
## 9967     3 65844 4.556224e-05
## 9968     3 65844 4.556224e-05
## 9969     3 65844 4.556224e-05
## 9970     3 65844 4.556224e-05
## 9971     3 65844 4.556224e-05
## 9972     3 65844 4.556224e-05
## 9973     3 65844 4.556224e-05
## 9974     3 65844 4.556224e-05
## 9975     3 65844 4.556224e-05
## 9976     3 65844 4.556224e-05
## 9977     3 65844 4.556224e-05
## 9978     3 65844 4.556224e-05
## 9979     3 65844 4.556224e-05
## 9980     3 65844 4.556224e-05
## 9981     3 65844 4.556224e-05
## 9982     3 65844 4.556224e-05
## 9983     3 65844 4.556224e-05
## 9984     3 65844 4.556224e-05
## 9985     3 65844 4.556224e-05
## 9986     3 55641 5.391708e-05
## 9987     3 55641 5.391708e-05
## 9988     3 55641 5.391708e-05
## 9989     3 55641 5.391708e-05
## 9990     3 55641 5.391708e-05
## 9991     3 55641 5.391708e-05
## 9992     3 55641 5.391708e-05
## 9993     3 55641 5.391708e-05
## 9994     3 55641 5.391708e-05
## 9995     3 55641 5.391708e-05
## 9996     3 55641 5.391708e-05
## 9997     3 55641 5.391708e-05
## 9998     3 55641 5.391708e-05
## 9999     3 55641 5.391708e-05
## 10000    3 55641 5.391708e-05
## 10001    3 55641 5.391708e-05
## 10002    3 55641 5.391708e-05
## 10003    3 55641 5.391708e-05
## 10004    3 55641 5.391708e-05
## 10005    3 55641 5.391708e-05
## 10006    3 55641 5.391708e-05
## 10007    3 55641 5.391708e-05
## 10008    3 55641 5.391708e-05
## 10009    3 55641 5.391708e-05
## 10010    3 55641 5.391708e-05
## 10011    3 55641 5.391708e-05
## 10012    3 55641 5.391708e-05
## 10013    3 55641 5.391708e-05
## 10014    3 55641 5.391708e-05
## 10015    3 55641 5.391708e-05
## 10016    3 55641 5.391708e-05
## 10017    3 55641 5.391708e-05
## 10018    3 55641 5.391708e-05
## 10019    3 55641 5.391708e-05
## 10020    3 55641 5.391708e-05
## 10021    3 55641 5.391708e-05
## 10022    3 55641 5.391708e-05
## 10023    3 55641 5.391708e-05
## 10024    3 55641 5.391708e-05
## 10025    3 55641 5.391708e-05
## 10026    3 55641 5.391708e-05
## 10027    3 55641 5.391708e-05
## 10028    3 55641 5.391708e-05
## 10029    3 55641 5.391708e-05
## 10030    3 55641 5.391708e-05
## 10031    3 55641 5.391708e-05
## 10032    3 55641 5.391708e-05
## 10033    3 55641 5.391708e-05
## 10034    3 55641 5.391708e-05
## 10035    3 55641 5.391708e-05
## 10036    3 55641 5.391708e-05
## 10037    3 55641 5.391708e-05
## 10038    3 55641 5.391708e-05
## 10039    3 55641 5.391708e-05
## 10040    3 55641 5.391708e-05
## 10041    3 55641 5.391708e-05
## 10042    3 55641 5.391708e-05
## 10043    3 55641 5.391708e-05
## 10044    3 55641 5.391708e-05
## 10045    3 55641 5.391708e-05
## 10046    3 55641 5.391708e-05
## 10047    3 55641 5.391708e-05
## 10048    3 55641 5.391708e-05
## 10049    3 55641 5.391708e-05
## 10050    3 55641 5.391708e-05
## 10051    3 55641 5.391708e-05
## 10052    3 55641 5.391708e-05
## 10053    3 55641 5.391708e-05
## 10054    3 55641 5.391708e-05
## 10055    3 55641 5.391708e-05
## 10056    3 55641 5.391708e-05
## 10057    3 55641 5.391708e-05
## 10058    3 55641 5.391708e-05
## 10059    3 55641 5.391708e-05
## 10060    3 55641 5.391708e-05
## 10061    3 55641 5.391708e-05
## 10062    3 55641 5.391708e-05
## 10063    3 55641 5.391708e-05
## 10064    3 55641 5.391708e-05
## 10065    3 55641 5.391708e-05
## 10066    3 55641 5.391708e-05
## 10067    3 55641 5.391708e-05
## 10068    3 55641 5.391708e-05
## 10069    3 55641 5.391708e-05
## 10070    3 55641 5.391708e-05
## 10071    3 55641 5.391708e-05
## 10072    3 55641 5.391708e-05
## 10073    3 55641 5.391708e-05
## 10074    3 55641 5.391708e-05
## 10075    3 55641 5.391708e-05
## 10076    3 55641 5.391708e-05
## 10077    3 55641 5.391708e-05
## 10078    3 55641 5.391708e-05
## 10079    3 55641 5.391708e-05
## 10080    3 55641 5.391708e-05
## 10081    3 55641 5.391708e-05
## 10082    3 55641 5.391708e-05
## 10083    3 55641 5.391708e-05
## 10084    3 55641 5.391708e-05
## 10085    3 55641 5.391708e-05
## 10086    3 55641 5.391708e-05
## 10087    3 55641 5.391708e-05
## 10088    3 55641 5.391708e-05
## 10089    3 55641 5.391708e-05
## 10090    3 55641 5.391708e-05
## 10091    3 55641 5.391708e-05
## 10092    3 55641 5.391708e-05
## 10093    3 55641 5.391708e-05
## 10094    3 55641 5.391708e-05
## 10095    3 55641 5.391708e-05
## 10096    3 55641 5.391708e-05
## 10097    3 55641 5.391708e-05
## 10098    3 55641 5.391708e-05
## 10099    3 55641 5.391708e-05
## 10100    3 55641 5.391708e-05
## 10101    3 55641 5.391708e-05
## 10102    3 55641 5.391708e-05
## 10103    3 55641 5.391708e-05
## 10104    3 55641 5.391708e-05
## 10105    3 55641 5.391708e-05
## 10106    3 55641 5.391708e-05
## 10107    3 55641 5.391708e-05
## 10108    3 55641 5.391708e-05
## 10109    3 55641 5.391708e-05
## 10110    3 55641 5.391708e-05
## 10111    3 55641 5.391708e-05
## 10112    3 55641 5.391708e-05
## 10113    3 55641 5.391708e-05
## 10114    3 55641 5.391708e-05
## 10115    3 55641 5.391708e-05
## 10116    3 55641 5.391708e-05
## 10117    3 55641 5.391708e-05
## 10118    3 55641 5.391708e-05
## 10119    3 55641 5.391708e-05
## 10120    3 55641 5.391708e-05
## 10121    3 55641 5.391708e-05
## 10122    3 55641 5.391708e-05
## 10123    3 55641 5.391708e-05
## 10124    3 55641 5.391708e-05
## 10125    3 55641 5.391708e-05
## 10126    3 55641 5.391708e-05
## 10127    3 55641 5.391708e-05
## 10128    3 55641 5.391708e-05
## 10129    3 55641 5.391708e-05
## 10130    3 55641 5.391708e-05
## 10131    3 55641 5.391708e-05
## 10132    3 55641 5.391708e-05
## 10133    3 55641 5.391708e-05
## 10134    3 55641 5.391708e-05
## 10135    3 55641 5.391708e-05
## 10136    3 55641 5.391708e-05
## 10137    3 55641 5.391708e-05
## 10138    3 55641 5.391708e-05
## 10139    3 55641 5.391708e-05
## 10140    3 55641 5.391708e-05
## 10141    3 55641 5.391708e-05
## 10142    3 55641 5.391708e-05
## 10143    3 55641 5.391708e-05
## 10144    3 55641 5.391708e-05
## 10145    3 55641 5.391708e-05
## 10146    3 55641 5.391708e-05
## 10147    3 55641 5.391708e-05
## 10148    3 55641 5.391708e-05
## 10149    3 55641 5.391708e-05
## 10150    3 55641 5.391708e-05
## 10151    3 55641 5.391708e-05
## 10152    3 55641 5.391708e-05
## 10153    3 55641 5.391708e-05
## 10154    3 55641 5.391708e-05
## 10155    3 55641 5.391708e-05
## 10156    3 55641 5.391708e-05
## 10157    3 55641 5.391708e-05
## 10158    3 55641 5.391708e-05
## 10159    3 55641 5.391708e-05
## 10160    3 55641 5.391708e-05
## 10161    3 55641 5.391708e-05
## 10162    3 55641 5.391708e-05
## 10163    3 55641 5.391708e-05
## 10164    3 55641 5.391708e-05
## 10165    3 55641 5.391708e-05
## 10166    3 55641 5.391708e-05
## 10167    3 55641 5.391708e-05
## 10168    3 55641 5.391708e-05
## 10169    3 55641 5.391708e-05
## 10170    3 55641 5.391708e-05
## 10171    3 55641 5.391708e-05
## 10172    3 55641 5.391708e-05
## 10173    3 55641 5.391708e-05
## 10174    3 55641 5.391708e-05
## 10175    3 55641 5.391708e-05
## 10176    3 55641 5.391708e-05
## 10177    3 55641 5.391708e-05
## 10178    3 55641 5.391708e-05
## 10179    3 55641 5.391708e-05
## 10180    3 55641 5.391708e-05
## 10181    3 55641 5.391708e-05
## 10182    3 55641 5.391708e-05
## 10183    3 55641 5.391708e-05
## 10184    3 55641 5.391708e-05
## 10185    3 55641 5.391708e-05
## 10186    3 55641 5.391708e-05
## 10187    3 55641 5.391708e-05
## 10188    3 55641 5.391708e-05
## 10189    3 55641 5.391708e-05
## 10190    3 55641 5.391708e-05
## 10191    3 55641 5.391708e-05
## 10192    3 55641 5.391708e-05
## 10193    3 55641 5.391708e-05
## 10194    3 55641 5.391708e-05
## 10195    3 55641 5.391708e-05
## 10196    3 55641 5.391708e-05
## 10197    3 55641 5.391708e-05
## 10198    3 55641 5.391708e-05
## 10199    3 55641 5.391708e-05
## 10200    3 55641 5.391708e-05
## 10201    3 55641 5.391708e-05
## 10202    3 55641 5.391708e-05
## 10203    3 55641 5.391708e-05
## 10204    3 55641 5.391708e-05
## 10205    3 55641 5.391708e-05
## 10206    3 55641 5.391708e-05
## 10207    3 55641 5.391708e-05
## 10208    3 55641 5.391708e-05
## 10209    3 55641 5.391708e-05
## 10210    3 55641 5.391708e-05
## 10211    3 55641 5.391708e-05
## 10212    3 55641 5.391708e-05
## 10213    3 55641 5.391708e-05
## 10214    3 55641 5.391708e-05
## 10215    3 55641 5.391708e-05
## 10216    3 55641 5.391708e-05
## 10217    3 55641 5.391708e-05
## 10218    3 55641 5.391708e-05
## 10219    3 55641 5.391708e-05
## 10220    3 55641 5.391708e-05
## 10221    3 55641 5.391708e-05
## 10222    3 55641 5.391708e-05
## 10223    3 55641 5.391708e-05
## 10224    3 55641 5.391708e-05
## 10225    3 55641 5.391708e-05
## 10226    3 55641 5.391708e-05
## 10227    3 55641 5.391708e-05
## 10228    3 55641 5.391708e-05
## 10229    3 55641 5.391708e-05
## 10230    3 55641 5.391708e-05
## 10231    3 55641 5.391708e-05
## 10232    3 55641 5.391708e-05
## 10233    3 55641 5.391708e-05
## 10234    3 55641 5.391708e-05
## 10235    3 55641 5.391708e-05
## 10236    3 55641 5.391708e-05
## 10237    3 55641 5.391708e-05
## 10238    3 55641 5.391708e-05
## 10239    3 55641 5.391708e-05
## 10240    3 55641 5.391708e-05
## 10241    3 55641 5.391708e-05
## 10242    3 55641 5.391708e-05
## 10243    3 55641 5.391708e-05
## 10244    3 55641 5.391708e-05
## 10245    3 55641 5.391708e-05
## 10246    3 55641 5.391708e-05
## 10247    3 55641 5.391708e-05
## 10248    3 55641 5.391708e-05
## 10249    3 55641 5.391708e-05
## 10250    3 55641 5.391708e-05
## 10251    3 55641 5.391708e-05
## 10252    3 55641 5.391708e-05
## 10253    3 55641 5.391708e-05
## 10254    3 55641 5.391708e-05
## 10255    3 55641 5.391708e-05
## 10256    3 55641 5.391708e-05
## 10257    3 55641 5.391708e-05
## 10258    3 55641 5.391708e-05
## 10259    3 55641 5.391708e-05
## 10260    3 55641 5.391708e-05
## 10261    3 55641 5.391708e-05
## 10262    3 55641 5.391708e-05
## 10263    3 55641 5.391708e-05
## 10264    3 55641 5.391708e-05
## 10265    3 55641 5.391708e-05
## 10266    3 55641 5.391708e-05
## 10267    3 55641 5.391708e-05
## 10268    3 55641 5.391708e-05
## 10269    3 55641 5.391708e-05
## 10270    3 55641 5.391708e-05
## 10271    3 55641 5.391708e-05
## 10272    3 55641 5.391708e-05
## 10273    3 55641 5.391708e-05
## 10274    3 55641 5.391708e-05
## 10275    3 55641 5.391708e-05
## 10276    3 55641 5.391708e-05
## 10277    3 55641 5.391708e-05
## 10278    3 55641 5.391708e-05
## 10279    3 55641 5.391708e-05
## 10280    3 55641 5.391708e-05
## 10281    3 55641 5.391708e-05
## 10282    3 55641 5.391708e-05
## 10283    3 55641 5.391708e-05
## 10284    3 55641 5.391708e-05
## 10285    3 55641 5.391708e-05
## 10286    3 55641 5.391708e-05
## 10287    3 55641 5.391708e-05
## 10288    3 55641 5.391708e-05
## 10289    3 55641 5.391708e-05
## 10290    3 55641 5.391708e-05
## 10291    3 55641 5.391708e-05
## 10292    3 55641 5.391708e-05
## 10293    3 55641 5.391708e-05
## 10294    3 55641 5.391708e-05
## 10295    3 55641 5.391708e-05
## 10296    3 55641 5.391708e-05
## 10297    3 55641 5.391708e-05
## 10298    3 55641 5.391708e-05
## 10299    3 55641 5.391708e-05
## 10300    3 55641 5.391708e-05
## 10301    3 55641 5.391708e-05
## 10302    3 55641 5.391708e-05
## 10303    3 55641 5.391708e-05
## 10304    3 55641 5.391708e-05
## 10305    3 55641 5.391708e-05
## 10306    3 55641 5.391708e-05
## 10307    3 55641 5.391708e-05
## 10308    3 55641 5.391708e-05
## 10309    3 55641 5.391708e-05
## 10310    3 55641 5.391708e-05
## 10311    3 55641 5.391708e-05
## 10312    3 55641 5.391708e-05
## 10313    3 55641 5.391708e-05
## 10314    3 55641 5.391708e-05
## 10315    3 55641 5.391708e-05
## 10316    3 55641 5.391708e-05
## 10317    3 55641 5.391708e-05
## 10318    3 55641 5.391708e-05
## 10319    3 55641 5.391708e-05
## 10320    3 55641 5.391708e-05
## 10321    3 55641 5.391708e-05
## 10322    3 55641 5.391708e-05
## 10323    3 55641 5.391708e-05
## 10324    3 55641 5.391708e-05
## 10325    3 55641 5.391708e-05
## 10326    3 55641 5.391708e-05
## 10327    3 55641 5.391708e-05
## 10328    3 55641 5.391708e-05
## 10329    3 55641 5.391708e-05
## 10330    3 55641 5.391708e-05
## 10331    3 55641 5.391708e-05
## 10332    3 55641 5.391708e-05
## 10333    3 55641 5.391708e-05
## 10334    3 55641 5.391708e-05
## 10335    3 55641 5.391708e-05
## 10336    3 55641 5.391708e-05
## 10337    3 55641 5.391708e-05
## 10338    3 55641 5.391708e-05
## 10339    3 55641 5.391708e-05
## 10340    3 55641 5.391708e-05
## 10341    3 55641 5.391708e-05
## 10342    3 55641 5.391708e-05
## 10343    3 55641 5.391708e-05
## 10344    3 55641 5.391708e-05
## 10345    3 55641 5.391708e-05
## 10346    3 55641 5.391708e-05
## 10347    3 55641 5.391708e-05
## 10348    3 55641 5.391708e-05
## 10349    3 55641 5.391708e-05
## 10350    3 55641 5.391708e-05
## 10351    3 55641 5.391708e-05
## 10352    3 55641 5.391708e-05
## 10353    3 55641 5.391708e-05
## 10354    3 55641 5.391708e-05
## 10355    3 55641 5.391708e-05
## 10356    3 55641 5.391708e-05
## 10357    3 55641 5.391708e-05
## 10358    3 55641 5.391708e-05
## 10359    3 55641 5.391708e-05
## 10360    3 55641 5.391708e-05
## 10361    3 55641 5.391708e-05
## 10362    3 55641 5.391708e-05
## 10363    3 55641 5.391708e-05
## 10364    3 55641 5.391708e-05
## 10365    3 55641 5.391708e-05
## 10366    3 55641 5.391708e-05
## 10367    3 55641 5.391708e-05
## 10368    3 55641 5.391708e-05
## 10369    3 55641 5.391708e-05
## 10370    3 55641 5.391708e-05
## 10371    3 55641 5.391708e-05
## 10372    3 55641 5.391708e-05
## 10373    3 55641 5.391708e-05
## 10374    3 55641 5.391708e-05
## 10375    3 55641 5.391708e-05
## 10376    3 55641 5.391708e-05
## 10377    3 55641 5.391708e-05
## 10378    3 55641 5.391708e-05
## 10379    3 55641 5.391708e-05
## 10380    3 55641 5.391708e-05
## 10381    3 55641 5.391708e-05
## 10382    3 55641 5.391708e-05
## 10383    3 55641 5.391708e-05
## 10384    3 55641 5.391708e-05
## 10385    3 55641 5.391708e-05
## 10386    3 55641 5.391708e-05
## 10387    3 55641 5.391708e-05
## 10388    3 55641 5.391708e-05
## 10389    3 55641 5.391708e-05
## 10390    3 55641 5.391708e-05
## 10391    3 55641 5.391708e-05
## 10392    3 55641 5.391708e-05
## 10393    3 55641 5.391708e-05
## 10394    3 55641 5.391708e-05
## 10395    3 55641 5.391708e-05
## 10396    3 55641 5.391708e-05
## 10397    3 55641 5.391708e-05
## 10398    3 55641 5.391708e-05
## 10399    3 55641 5.391708e-05
## 10400    3 55641 5.391708e-05
## 10401    3 55641 5.391708e-05
## 10402    3 55641 5.391708e-05
## 10403    3 55641 5.391708e-05
## 10404    3 55641 5.391708e-05
## 10405    3 55641 5.391708e-05
## 10406    3 55641 5.391708e-05
## 10407    3 55641 5.391708e-05
## 10408    3 55641 5.391708e-05
## 10409    3 55641 5.391708e-05
## 10410    3 55641 5.391708e-05
## 10411    3 55641 5.391708e-05
## 10412    3 55641 5.391708e-05
## 10413    3 55641 5.391708e-05
## 10414    3 55641 5.391708e-05
## 10415    3 55641 5.391708e-05
## 10416    3 55641 5.391708e-05
## 10417    3 55641 5.391708e-05
## 10418    3 55641 5.391708e-05
## 10419    3 55641 5.391708e-05
## 10420    3 55641 5.391708e-05
## 10421    3 55641 5.391708e-05
## 10422    3 55641 5.391708e-05
## 10423    3 55641 5.391708e-05
## 10424    3 55641 5.391708e-05
## 10425    3 55641 5.391708e-05
## 10426    3 55641 5.391708e-05
## 10427    3 55641 5.391708e-05
## 10428    3 55641 5.391708e-05
## 10429    3 55641 5.391708e-05
## 10430    3 55641 5.391708e-05
## 10431    3 55641 5.391708e-05
## 10432    3 55641 5.391708e-05
## 10433    3 55641 5.391708e-05
## 10434    3 55641 5.391708e-05
## 10435    3 55641 5.391708e-05
## 10436    3 55641 5.391708e-05
## 10437    3 55641 5.391708e-05
## 10438    3 55641 5.391708e-05
## 10439    3 55641 5.391708e-05
## 10440    3 55641 5.391708e-05
## 10441    3 55641 5.391708e-05
## 10442    3 55641 5.391708e-05
## 10443    3 55641 5.391708e-05
## 10444    3 55641 5.391708e-05
## 10445    3 55641 5.391708e-05
## 10446    3 55641 5.391708e-05
## 10447    3 55641 5.391708e-05
## 10448    3 55641 5.391708e-05
## 10449    3 55641 5.391708e-05
## 10450    3 55641 5.391708e-05
## 10451    3 55641 5.391708e-05
## 10452    3 55641 5.391708e-05
## 10453    3 55641 5.391708e-05
## 10454    3 55641 5.391708e-05
## 10455    3 55641 5.391708e-05
## 10456    3 55641 5.391708e-05
## 10457    3 55641 5.391708e-05
## 10458    3 55641 5.391708e-05
## 10459    3 55641 5.391708e-05
## 10460    3 55641 5.391708e-05
## 10461    3 55641 5.391708e-05
## 10462    3 55641 5.391708e-05
## 10463    3 55641 5.391708e-05
## 10464    3 55641 5.391708e-05
## 10465    3 55641 5.391708e-05
## 10466    3 55641 5.391708e-05
## 10467    3 55641 5.391708e-05
## 10468    3 55641 5.391708e-05
## 10469    3 55641 5.391708e-05
## 10470    3 55641 5.391708e-05
## 10471    3 55641 5.391708e-05
## 10472    3 55641 5.391708e-05
## 10473    3 55641 5.391708e-05
## 10474    3 55641 5.391708e-05
## 10475    3 55641 5.391708e-05
## 10476    3 55641 5.391708e-05
## 10477    3 55641 5.391708e-05
## 10478    3 55641 5.391708e-05
## 10479    3 55641 5.391708e-05
## 10480    3 55641 5.391708e-05
## 10481    3 55641 5.391708e-05
## 10482    3 55641 5.391708e-05
## 10483    3 55641 5.391708e-05
## 10484    3 55641 5.391708e-05
## 10485    3 55641 5.391708e-05
## 10486    3 55641 5.391708e-05
## 10487    3 55641 5.391708e-05
## 10488    3 55641 5.391708e-05
## 10489    3 55641 5.391708e-05
## 10490    3 55641 5.391708e-05
## 10491    3 55641 5.391708e-05
## 10492    3 55641 5.391708e-05
## 10493    3 55641 5.391708e-05
## 10494    3 55641 5.391708e-05
## 10495    3 55641 5.391708e-05
## 10496    3 55641 5.391708e-05
## 10497    3 55641 5.391708e-05
## 10498    3 55641 5.391708e-05
## 10499    3 55641 5.391708e-05
## 10500    3 55641 5.391708e-05
## 10501    3 55641 5.391708e-05
## 10502    3 55641 5.391708e-05
## 10503    3 55641 5.391708e-05
## 10504    3 55641 5.391708e-05
## 10505    3 55641 5.391708e-05
## 10506    3 55641 5.391708e-05
## 10507    3 55641 5.391708e-05
## 10508    3 55641 5.391708e-05
## 10509    3 55641 5.391708e-05
## 10510    3 55641 5.391708e-05
## 10511    3 55641 5.391708e-05
## 10512    3 55641 5.391708e-05
## 10513    3 55641 5.391708e-05
## 10514    3 55641 5.391708e-05
## 10515    3 55641 5.391708e-05
## 10516    3 55641 5.391708e-05
## 10517    3 55641 5.391708e-05
## 10518    3 55641 5.391708e-05
## 10519    3 55641 5.391708e-05
## 10520    3 55641 5.391708e-05
## 10521    3 55641 5.391708e-05
## 10522    3 55641 5.391708e-05
## 10523    3 55641 5.391708e-05
## 10524    3 55641 5.391708e-05
## 10525    3 55641 5.391708e-05
## 10526    3 55641 5.391708e-05
## 10527    3 55641 5.391708e-05
## 10528    3 55641 5.391708e-05
## 10529    3 55641 5.391708e-05
## 10530    3 55641 5.391708e-05
## 10531    3 55641 5.391708e-05
## 10532    3 55641 5.391708e-05
## 10533    3 55641 5.391708e-05
## 10534    3 55641 5.391708e-05
## 10535    3 55641 5.391708e-05
## 10536    3 55641 5.391708e-05
## 10537    3 55641 5.391708e-05
## 10538    3 55641 5.391708e-05
## 10539    3 55641 5.391708e-05
## 10540    3 55641 5.391708e-05
## 10541    3 55641 5.391708e-05
## 10542    3 55641 5.391708e-05
## 10543    3 55641 5.391708e-05
## 10544    3 55641 5.391708e-05
## 10545    3 55641 5.391708e-05
## 10546    3 55641 5.391708e-05
## 10547    3 55641 5.391708e-05
## 10548    3 55641 5.391708e-05
## 10549    3 55641 5.391708e-05
## 10550    3 55641 5.391708e-05
## 10551    3 55641 5.391708e-05
## 10552    3 55641 5.391708e-05
## 10553    3 55641 5.391708e-05
## 10554    3 55641 5.391708e-05
## 10555    3 55641 5.391708e-05
## 10556    3 55641 5.391708e-05
## 10557    3 55641 5.391708e-05
## 10558    3 55641 5.391708e-05
## 10559    3 55641 5.391708e-05
## 10560    3 55641 5.391708e-05
## 10561    3 55641 5.391708e-05
## 10562    3 55641 5.391708e-05
## 10563    3 55641 5.391708e-05
## 10564    3 55641 5.391708e-05
## 10565    3 55641 5.391708e-05
## 10566    3 55641 5.391708e-05
## 10567    3 55641 5.391708e-05
## 10568    3 55641 5.391708e-05
## 10569    3 55641 5.391708e-05
## 10570    3 55641 5.391708e-05
## 10571    3 55641 5.391708e-05
## 10572    3 55641 5.391708e-05
## 10573    3 55641 5.391708e-05
## 10574    3 55641 5.391708e-05
## 10575    3 55641 5.391708e-05
## 10576    3 55641 5.391708e-05
## 10577    3 55641 5.391708e-05
## 10578    3 55641 5.391708e-05
## 10579    3 55641 5.391708e-05
## 10580    3 55641 5.391708e-05
## 10581    3 55641 5.391708e-05
## 10582    3 55641 5.391708e-05
## 10583    3 55641 5.391708e-05
## 10584    3 55641 5.391708e-05
## 10585    3 55641 5.391708e-05
## 10586    3 55641 5.391708e-05
## 10587    3 55641 5.391708e-05
## 10588    3 55641 5.391708e-05
## 10589    3 55641 5.391708e-05
## 10590    3 55641 5.391708e-05
## 10591    3 55641 5.391708e-05
## 10592    3 55641 5.391708e-05
## 10593    3 55641 5.391708e-05
## 10594    3 55641 5.391708e-05
## 10595    3 55641 5.391708e-05
## 10596    3 55641 5.391708e-05
## 10597    3 55641 5.391708e-05
## 10598    3 55641 5.391708e-05
## 10599    3 55641 5.391708e-05
## 10600    3 55641 5.391708e-05
## 10601    3 55641 5.391708e-05
## 10602    3 55641 5.391708e-05
## 10603    3 55641 5.391708e-05
## 10604    3 55641 5.391708e-05
## 10605    3 55641 5.391708e-05
## 10606    3 55641 5.391708e-05
## 10607    3 55641 5.391708e-05
## 10608    3 55641 5.391708e-05
## 10609    3 55641 5.391708e-05
## 10610    3 55641 5.391708e-05
## 10611    3 55641 5.391708e-05
## 10612    3 55641 5.391708e-05
## 10613    3 55641 5.391708e-05
## 10614    3 55641 5.391708e-05
## 10615    3 55641 5.391708e-05
## 10616    3 55641 5.391708e-05
## 10617    3 55641 5.391708e-05
## 10618    3 55641 5.391708e-05
## 10619    3 55641 5.391708e-05
## 10620    3 55641 5.391708e-05
## 10621    3 55641 5.391708e-05
## 10622    3 55641 5.391708e-05
## 10623    3 55641 5.391708e-05
## 10624    3 55641 5.391708e-05
## 10625    3 55641 5.391708e-05
## 10626    3 55641 5.391708e-05
## 10627    3 55641 5.391708e-05
## 10628    3 55641 5.391708e-05
## 10629    3 55641 5.391708e-05
## 10630    3 55641 5.391708e-05
## 10631    3 55641 5.391708e-05
## 10632    3 55641 5.391708e-05
## 10633    3 55641 5.391708e-05
## 10634    3 55641 5.391708e-05
## 10635    3 55641 5.391708e-05
## 10636    3 55641 5.391708e-05
## 10637    3 55641 5.391708e-05
## 10638    3 55641 5.391708e-05
## 10639    3 55641 5.391708e-05
## 10640    3 55641 5.391708e-05
## 10641    3 55641 5.391708e-05
## 10642    3 55641 5.391708e-05
## 10643    3 55641 5.391708e-05
## 10644    3 55641 5.391708e-05
## 10645    3 55641 5.391708e-05
## 10646    3 55641 5.391708e-05
## 10647    3 55641 5.391708e-05
## 10648    3 55641 5.391708e-05
## 10649    3 55641 5.391708e-05
## 10650    3 55641 5.391708e-05
## 10651    3 55641 5.391708e-05
## 10652    3 55641 5.391708e-05
## 10653    3 55641 5.391708e-05
## 10654    3 55641 5.391708e-05
## 10655    3 55641 5.391708e-05
## 10656    3 55641 5.391708e-05
## 10657    3 55641 5.391708e-05
## 10658    3 55641 5.391708e-05
## 10659    3 55641 5.391708e-05
## 10660    3 55641 5.391708e-05
## 10661    3 55641 5.391708e-05
## 10662    3 55641 5.391708e-05
## 10663    3 55641 5.391708e-05
## 10664    3 55641 5.391708e-05
## 10665    3 55641 5.391708e-05
## 10666    3 55641 5.391708e-05
## 10667    3 55641 5.391708e-05
## 10668    3 55641 5.391708e-05
## 10669    3 55641 5.391708e-05
## 10670    3 55641 5.391708e-05
## 10671    3 55641 5.391708e-05
## 10672    3 55641 5.391708e-05
## 10673    3 55641 5.391708e-05
## 10674    3 55641 5.391708e-05
## 10675    3 55641 5.391708e-05
## 10676    3 55641 5.391708e-05
## 10677    3 55641 5.391708e-05
## 10678    3 55641 5.391708e-05
## 10679    3 55641 5.391708e-05
## 10680    3 55641 5.391708e-05
## 10681    3 55641 5.391708e-05
## 10682    3 55641 5.391708e-05
## 10683    3 55641 5.391708e-05
## 10684    3 55641 5.391708e-05
## 10685    3 55641 5.391708e-05
## 10686    3 55641 5.391708e-05
## 10687    3 55641 5.391708e-05
## 10688    3 55641 5.391708e-05
## 10689    3 55641 5.391708e-05
## 10690    3 55641 5.391708e-05
## 10691    3 55641 5.391708e-05
## 10692    3 55641 5.391708e-05
## 10693    3 55641 5.391708e-05
## 10694    3 55641 5.391708e-05
## 10695    3 55641 5.391708e-05
## 10696    3 55641 5.391708e-05
## 10697    3 55641 5.391708e-05
## 10698    3 55641 5.391708e-05
## 10699    3 55641 5.391708e-05
## 10700    3 55641 5.391708e-05
## 10701    3 55641 5.391708e-05
## 10702    3 55641 5.391708e-05
## 10703    3 55641 5.391708e-05
## 10704    3 55641 5.391708e-05
## 10705    3 55641 5.391708e-05
## 10706    3 55641 5.391708e-05
## 10707    3 55641 5.391708e-05
## 10708    3 55641 5.391708e-05
## 10709    3 55641 5.391708e-05
## 10710    3 55641 5.391708e-05
## 10711    3 55641 5.391708e-05
## 10712    3 55641 5.391708e-05
## 10713    3 55641 5.391708e-05
## 10714    3 55641 5.391708e-05
## 10715    3 55641 5.391708e-05
## 10716    3 55641 5.391708e-05
## 10717    3 55641 5.391708e-05
## 10718    3 55641 5.391708e-05
## 10719    3 55641 5.391708e-05
## 10720    3 55641 5.391708e-05
## 10721    3 55641 5.391708e-05
## 10722    3 55641 5.391708e-05
## 10723    3 55641 5.391708e-05
## 10724    3 55641 5.391708e-05
## 10725    3 55641 5.391708e-05
## 10726    3 55641 5.391708e-05
## 10727    3 55641 5.391708e-05
## 10728    3 55641 5.391708e-05
## 10729    3 55641 5.391708e-05
## 10730    3 55641 5.391708e-05
## 10731    3 55641 5.391708e-05
## 10732    3 55641 5.391708e-05
## 10733    3 55641 5.391708e-05
## 10734    3 55641 5.391708e-05
## 10735    3 55641 5.391708e-05
## 10736    3 55641 5.391708e-05
## 10737    3 55641 5.391708e-05
## 10738    3 55641 5.391708e-05
## 10739    3 55641 5.391708e-05
## 10740    3 55641 5.391708e-05
## 10741    3 55641 5.391708e-05
## 10742    3 55641 5.391708e-05
## 10743    3 55641 5.391708e-05
## 10744    3 55641 5.391708e-05
## 10745    3 55641 5.391708e-05
## 10746    3 55641 5.391708e-05
## 10747    3 55641 5.391708e-05
## 10748    3 55641 5.391708e-05
## 10749    3 55641 5.391708e-05
## 10750    3 55641 5.391708e-05
## 10751    3 55641 5.391708e-05
## 10752    3 55641 5.391708e-05
## 10753    3 55641 5.391708e-05
## 10754    3 55641 5.391708e-05
## 10755    3 55641 5.391708e-05
## 10756    3 55641 5.391708e-05
## 10757    3 55641 5.391708e-05
## 10758    3 55641 5.391708e-05
## 10759    3 55641 5.391708e-05
## 10760    3 55641 5.391708e-05
## 10761    3 55641 5.391708e-05
## 10762    3 55641 5.391708e-05
## 10763    3 55641 5.391708e-05
## 10764    3 55641 5.391708e-05
## 10765    3 55641 5.391708e-05
## 10766    3 55641 5.391708e-05
## 10767    3 55641 5.391708e-05
## 10768    3 55641 5.391708e-05
## 10769    3 55641 5.391708e-05
## 10770    3 55641 5.391708e-05
## 10771    3 55641 5.391708e-05
## 10772    3 55641 5.391708e-05
## 10773    3 55641 5.391708e-05
## 10774    3 55641 5.391708e-05
## 10775    3 55641 5.391708e-05
## 10776    3 55641 5.391708e-05
## 10777    3 55641 5.391708e-05
## 10778    3 55641 5.391708e-05
## 10779    3 55641 5.391708e-05
## 10780    3 55641 5.391708e-05
## 10781    3 55641 5.391708e-05
## 10782    3 55641 5.391708e-05
## 10783    3 55641 5.391708e-05
## 10784    3 55641 5.391708e-05
## 10785    3 55641 5.391708e-05
## 10786    3 55641 5.391708e-05
## 10787    3 55641 5.391708e-05
## 10788    3 55641 5.391708e-05
## 10789    3 55641 5.391708e-05
## 10790    3 55641 5.391708e-05
## 10791    3 55641 5.391708e-05
## 10792    3 55641 5.391708e-05
## 10793    3 55641 5.391708e-05
## 10794    3 55641 5.391708e-05
## 10795    3 55641 5.391708e-05
## 10796    3 55641 5.391708e-05
## 10797    3 55641 5.391708e-05
## 10798    3 55641 5.391708e-05
## 10799    3 55641 5.391708e-05
## 10800    3 55641 5.391708e-05
## 10801    3 55641 5.391708e-05
## 10802    3 55641 5.391708e-05
## 10803    3 55641 5.391708e-05
## 10804    3 55641 5.391708e-05
## 10805    3 55641 5.391708e-05
## 10806    3 55641 5.391708e-05
## 10807    3 55641 5.391708e-05
## 10808    3 55641 5.391708e-05
## 10809    3 55641 5.391708e-05
## 10810    3 55641 5.391708e-05
## 10811    3 55641 5.391708e-05
## 10812    3 55641 5.391708e-05
## 10813    3 55641 5.391708e-05
## 10814    3 55641 5.391708e-05
## 10815    3 55641 5.391708e-05
## 10816    3 55641 5.391708e-05
## 10817    3 55641 5.391708e-05
## 10818    3 55641 5.391708e-05
## 10819    3 55641 5.391708e-05
## 10820    3 55641 5.391708e-05
## 10821    3 55641 5.391708e-05
## 10822    3 55641 5.391708e-05
## 10823    3 55641 5.391708e-05
## 10824    3 55641 5.391708e-05
## 10825    3 55641 5.391708e-05
## 10826    3 55641 5.391708e-05
## 10827    3 55641 5.391708e-05
## 10828    3 55641 5.391708e-05
## 10829    3 55641 5.391708e-05
## 10830    3 55641 5.391708e-05
## 10831    3 55641 5.391708e-05
## 10832    3 55641 5.391708e-05
## 10833    3 55641 5.391708e-05
## 10834    3 55641 5.391708e-05
## 10835    3 55641 5.391708e-05
## 10836    3 55641 5.391708e-05
## 10837    3 55641 5.391708e-05
## 10838    3 55641 5.391708e-05
## 10839    3 55641 5.391708e-05
## 10840    3 55641 5.391708e-05
## 10841    3 55641 5.391708e-05
## 10842    3 55641 5.391708e-05
## 10843    3 55641 5.391708e-05
## 10844    3 55641 5.391708e-05
## 10845    3 55641 5.391708e-05
## 10846    3 55641 5.391708e-05
## 10847    3 55641 5.391708e-05
## 10848    3 55641 5.391708e-05
## 10849    3 55641 5.391708e-05
## 10850    3 55641 5.391708e-05
## 10851    3 55641 5.391708e-05
## 10852    3 55641 5.391708e-05
## 10853    3 55641 5.391708e-05
## 10854    3 55641 5.391708e-05
## 10855    3 55641 5.391708e-05
## 10856    3 55641 5.391708e-05
## 10857    3 55641 5.391708e-05
## 10858    3 55641 5.391708e-05
## 10859    3 55641 5.391708e-05
## 10860    3 55641 5.391708e-05
## 10861    3 55641 5.391708e-05
## 10862    3 55641 5.391708e-05
## 10863    3 55641 5.391708e-05
## 10864    3 55641 5.391708e-05
## 10865    3 55641 5.391708e-05
## 10866    3 55641 5.391708e-05
## 10867    3 55641 5.391708e-05
## 10868    3 55641 5.391708e-05
## 10869    3 55641 5.391708e-05
## 10870    3 55641 5.391708e-05
## 10871    3 55641 5.391708e-05
## 10872    3 55641 5.391708e-05
## 10873    3 55641 5.391708e-05
## 10874    3 55641 5.391708e-05
## 10875    3 55641 5.391708e-05
## 10876    3 55641 5.391708e-05
## 10877    3 55641 5.391708e-05
## 10878    3 55641 5.391708e-05
## 10879    3 55641 5.391708e-05
## 10880    3 55641 5.391708e-05
## 10881    3 55641 5.391708e-05
## 10882    3 55641 5.391708e-05
## 10883    3 55641 5.391708e-05
## 10884    3 55641 5.391708e-05
## 10885    3 55641 5.391708e-05
## 10886    3 55641 5.391708e-05
## 10887    3 55641 5.391708e-05
## 10888    3 55641 5.391708e-05
## 10889    3 55641 5.391708e-05
## 10890    3 55641 5.391708e-05
## 10891    3 55641 5.391708e-05
## 10892    3 55641 5.391708e-05
## 10893    3 55641 5.391708e-05
## 10894    3 55641 5.391708e-05
## 10895    3 55641 5.391708e-05
## 10896    3 55641 5.391708e-05
## 10897    3 55641 5.391708e-05
## 10898    3 55641 5.391708e-05
## 10899    3 55641 5.391708e-05
## 10900    3 55641 5.391708e-05
## 10901    2 66780 2.994909e-05
## 10902    2 66780 2.994909e-05
## 10903    2 66780 2.994909e-05
## 10904    2 66780 2.994909e-05
## 10905    2 66780 2.994909e-05
## 10906    2 66780 2.994909e-05
## 10907    2 66780 2.994909e-05
## 10908    2 66780 2.994909e-05
## 10909    2 66780 2.994909e-05
## 10910    2 66780 2.994909e-05
## 10911    2 66780 2.994909e-05
## 10912    2 66780 2.994909e-05
## 10913    2 66780 2.994909e-05
## 10914    2 66780 2.994909e-05
## 10915    2 66780 2.994909e-05
## 10916    2 66780 2.994909e-05
## 10917    2 66780 2.994909e-05
## 10918    2 66780 2.994909e-05
## 10919    2 66780 2.994909e-05
## 10920    2 66780 2.994909e-05
## 10921    2 66780 2.994909e-05
## 10922    2 66780 2.994909e-05
## 10923    2 66780 2.994909e-05
## 10924    2 66780 2.994909e-05
## 10925    2 66780 2.994909e-05
## 10926    2 66780 2.994909e-05
## 10927    2 66780 2.994909e-05
## 10928    2 66780 2.994909e-05
## 10929    2 66780 2.994909e-05
## 10930    2 66780 2.994909e-05
## 10931    2 66780 2.994909e-05
## 10932    2 66780 2.994909e-05
## 10933    2 66780 2.994909e-05
## 10934    2 66780 2.994909e-05
## 10935    2 66780 2.994909e-05
## 10936    2 66780 2.994909e-05
## 10937    2 66780 2.994909e-05
## 10938    2 66780 2.994909e-05
## 10939    2 66780 2.994909e-05
## 10940    2 66780 2.994909e-05
## 10941    2 66780 2.994909e-05
## 10942    2 66780 2.994909e-05
## 10943    2 66780 2.994909e-05
## 10944    2 66780 2.994909e-05
## 10945    2 66780 2.994909e-05
## 10946    2 66780 2.994909e-05
## 10947    2 66780 2.994909e-05
## 10948    2 66780 2.994909e-05
## 10949    2 66780 2.994909e-05
## 10950    2 66780 2.994909e-05
## 10951    2 66780 2.994909e-05
## 10952    2 66780 2.994909e-05
## 10953    2 66780 2.994909e-05
## 10954    2 66780 2.994909e-05
## 10955    2 66780 2.994909e-05
## 10956    2 66780 2.994909e-05
## 10957    2 66780 2.994909e-05
## 10958    2 66780 2.994909e-05
## 10959    2 66780 2.994909e-05
## 10960    2 66780 2.994909e-05
## 10961    2 66780 2.994909e-05
## 10962    2 66780 2.994909e-05
## 10963    2 66780 2.994909e-05
## 10964    2 66780 2.994909e-05
## 10965    2 66780 2.994909e-05
## 10966    2 66780 2.994909e-05
## 10967    2 66780 2.994909e-05
## 10968    2 66780 2.994909e-05
## 10969    2 66780 2.994909e-05
## 10970    2 66780 2.994909e-05
## 10971    2 66780 2.994909e-05
## 10972    2 66780 2.994909e-05
## 10973    2 66780 2.994909e-05
## 10974    2 66780 2.994909e-05
## 10975    2 66780 2.994909e-05
## 10976    2 66780 2.994909e-05
## 10977    2 66780 2.994909e-05
## 10978    2 66780 2.994909e-05
## 10979    2 66780 2.994909e-05
## 10980    2 66780 2.994909e-05
## 10981    2 66780 2.994909e-05
## 10982    2 66780 2.994909e-05
## 10983    2 66780 2.994909e-05
## 10984    2 66780 2.994909e-05
## 10985    2 66780 2.994909e-05
## 10986    2 66780 2.994909e-05
## 10987    2 66780 2.994909e-05
## 10988    2 66780 2.994909e-05
## 10989    2 66780 2.994909e-05
## 10990    2 66780 2.994909e-05
## 10991    2 66780 2.994909e-05
## 10992    2 66780 2.994909e-05
## 10993    2 66780 2.994909e-05
## 10994    2 66780 2.994909e-05
## 10995    2 66780 2.994909e-05
## 10996    2 66780 2.994909e-05
## 10997    2 66780 2.994909e-05
## 10998    2 66780 2.994909e-05
## 10999    2 66780 2.994909e-05
## 11000    2 66780 2.994909e-05
## 11001    2 66780 2.994909e-05
## 11002    2 66780 2.994909e-05
## 11003    2 66780 2.994909e-05
## 11004    2 66780 2.994909e-05
## 11005    2 66780 2.994909e-05
## 11006    2 66780 2.994909e-05
## 11007    2 66780 2.994909e-05
## 11008    2 66780 2.994909e-05
## 11009    2 66780 2.994909e-05
## 11010    2 66780 2.994909e-05
## 11011    2 66780 2.994909e-05
## 11012    2 66780 2.994909e-05
## 11013    2 66780 2.994909e-05
## 11014    2 66780 2.994909e-05
## 11015    2 66780 2.994909e-05
## 11016    2 66780 2.994909e-05
## 11017    2 66780 2.994909e-05
## 11018    2 66780 2.994909e-05
## 11019    2 66780 2.994909e-05
## 11020    2 66780 2.994909e-05
## 11021    2 66780 2.994909e-05
## 11022    2 66780 2.994909e-05
## 11023    2 66780 2.994909e-05
## 11024    2 66780 2.994909e-05
## 11025    2 66780 2.994909e-05
## 11026    2 66780 2.994909e-05
## 11027    2 66780 2.994909e-05
## 11028    2 66780 2.994909e-05
## 11029    2 66780 2.994909e-05
## 11030    2 66780 2.994909e-05
## 11031    2 66780 2.994909e-05
## 11032    2 66780 2.994909e-05
## 11033    2 66780 2.994909e-05
## 11034    2 66780 2.994909e-05
## 11035    2 66780 2.994909e-05
## 11036    2 66780 2.994909e-05
## 11037    2 66780 2.994909e-05
## 11038    2 66780 2.994909e-05
## 11039    2 66780 2.994909e-05
## 11040    2 66780 2.994909e-05
## 11041    2 66780 2.994909e-05
## 11042    2 66780 2.994909e-05
## 11043    2 66780 2.994909e-05
## 11044    2 66780 2.994909e-05
## 11045    2 66780 2.994909e-05
## 11046    2 66780 2.994909e-05
## 11047    2 66780 2.994909e-05
## 11048    2 66780 2.994909e-05
## 11049    2 66780 2.994909e-05
## 11050    2 66780 2.994909e-05
## 11051    2 66780 2.994909e-05
## 11052    2 66780 2.994909e-05
## 11053    2 66780 2.994909e-05
## 11054    2 66780 2.994909e-05
## 11055    2 66780 2.994909e-05
## 11056    2 66780 2.994909e-05
## 11057    2 66780 2.994909e-05
## 11058    2 66780 2.994909e-05
## 11059    2 66780 2.994909e-05
## 11060    2 66780 2.994909e-05
## 11061    2 66780 2.994909e-05
## 11062    2 66780 2.994909e-05
## 11063    2 66780 2.994909e-05
## 11064    2 66780 2.994909e-05
## 11065    2 66780 2.994909e-05
## 11066    2 66780 2.994909e-05
## 11067    2 66780 2.994909e-05
## 11068    2 66780 2.994909e-05
## 11069    2 66780 2.994909e-05
## 11070    2 66780 2.994909e-05
## 11071    2 66780 2.994909e-05
## 11072    2 66780 2.994909e-05
## 11073    2 66780 2.994909e-05
## 11074    2 66780 2.994909e-05
## 11075    2 66780 2.994909e-05
## 11076    2 66780 2.994909e-05
## 11077    2 66780 2.994909e-05
## 11078    2 66780 2.994909e-05
## 11079    2 66780 2.994909e-05
## 11080    2 66780 2.994909e-05
## 11081    2 66780 2.994909e-05
## 11082    2 66780 2.994909e-05
## 11083    2 66780 2.994909e-05
## 11084    2 66780 2.994909e-05
## 11085    2 66780 2.994909e-05
## 11086    2 66780 2.994909e-05
## 11087    2 66780 2.994909e-05
## 11088    2 66780 2.994909e-05
## 11089    2 66780 2.994909e-05
## 11090    2 66780 2.994909e-05
## 11091    2 66780 2.994909e-05
## 11092    2 66780 2.994909e-05
## 11093    2 66780 2.994909e-05
## 11094    2 66780 2.994909e-05
## 11095    2 66780 2.994909e-05
## 11096    2 66780 2.994909e-05
## 11097    2 66780 2.994909e-05
## 11098    2 66780 2.994909e-05
## 11099    2 66780 2.994909e-05
## 11100    2 66780 2.994909e-05
## 11101    2 66780 2.994909e-05
## 11102    2 66780 2.994909e-05
## 11103    2 66780 2.994909e-05
## 11104    2 66780 2.994909e-05
## 11105    2 66780 2.994909e-05
## 11106    2 66780 2.994909e-05
## 11107    2 66780 2.994909e-05
## 11108    2 66780 2.994909e-05
## 11109    2 66780 2.994909e-05
## 11110    2 66780 2.994909e-05
## 11111    2 66780 2.994909e-05
## 11112    2 66780 2.994909e-05
## 11113    2 66780 2.994909e-05
## 11114    2 66780 2.994909e-05
## 11115    2 66780 2.994909e-05
## 11116    2 66780 2.994909e-05
## 11117    2 66780 2.994909e-05
## 11118    2 66780 2.994909e-05
## 11119    2 66780 2.994909e-05
## 11120    2 66780 2.994909e-05
## 11121    2 66780 2.994909e-05
## 11122    2 66780 2.994909e-05
## 11123    2 66780 2.994909e-05
## 11124    2 66780 2.994909e-05
## 11125    2 66780 2.994909e-05
## 11126    2 66780 2.994909e-05
## 11127    2 66780 2.994909e-05
## 11128    2 66780 2.994909e-05
## 11129    2 66780 2.994909e-05
## 11130    2 66780 2.994909e-05
## 11131    2 66780 2.994909e-05
## 11132    2 66780 2.994909e-05
## 11133    2 66780 2.994909e-05
## 11134    2 66780 2.994909e-05
## 11135    2 66780 2.994909e-05
## 11136    2 66780 2.994909e-05
## 11137    2 66780 2.994909e-05
## 11138    2 66780 2.994909e-05
## 11139    2 66780 2.994909e-05
## 11140    2 66780 2.994909e-05
## 11141    2 66780 2.994909e-05
## 11142    2 66780 2.994909e-05
## 11143    2 66780 2.994909e-05
## 11144    2 66780 2.994909e-05
## 11145    2 66780 2.994909e-05
## 11146    2 66780 2.994909e-05
## 11147    2 66780 2.994909e-05
## 11148    2 66780 2.994909e-05
## 11149    2 66780 2.994909e-05
## 11150    2 66780 2.994909e-05
## 11151    2 66780 2.994909e-05
## 11152    2 66780 2.994909e-05
## 11153    2 66780 2.994909e-05
## 11154    2 66780 2.994909e-05
## 11155    2 66780 2.994909e-05
## 11156    2 66780 2.994909e-05
## 11157    2 66780 2.994909e-05
## 11158    2 66780 2.994909e-05
## 11159    2 66780 2.994909e-05
## 11160    2 66780 2.994909e-05
## 11161    2 66780 2.994909e-05
## 11162    2 66780 2.994909e-05
## 11163    2 66780 2.994909e-05
## 11164    2 66780 2.994909e-05
## 11165    2 66780 2.994909e-05
## 11166    2 66780 2.994909e-05
## 11167    2 66780 2.994909e-05
## 11168    2 66780 2.994909e-05
## 11169    2 66780 2.994909e-05
## 11170    2 66780 2.994909e-05
## 11171    2 66780 2.994909e-05
## 11172    2 66780 2.994909e-05
## 11173    2 66780 2.994909e-05
## 11174    2 66780 2.994909e-05
## 11175    2 66780 2.994909e-05
## 11176    2 66780 2.994909e-05
## 11177    2 66780 2.994909e-05
## 11178    2 66780 2.994909e-05
## 11179    2 66780 2.994909e-05
## 11180    2 66780 2.994909e-05
## 11181    2 66780 2.994909e-05
## 11182    2 66780 2.994909e-05
## 11183    2 66780 2.994909e-05
## 11184    2 66780 2.994909e-05
## 11185    2 66780 2.994909e-05
## 11186    2 66780 2.994909e-05
## 11187    2 66780 2.994909e-05
## 11188    2 66780 2.994909e-05
## 11189    2 66780 2.994909e-05
## 11190    2 66780 2.994909e-05
## 11191    2 66780 2.994909e-05
## 11192    2 66780 2.994909e-05
## 11193    2 66780 2.994909e-05
## 11194    2 66780 2.994909e-05
## 11195    2 66780 2.994909e-05
## 11196    2 66780 2.994909e-05
## 11197    2 66780 2.994909e-05
## 11198    2 66780 2.994909e-05
## 11199    2 66780 2.994909e-05
## 11200    2 66780 2.994909e-05
## 11201    2 66780 2.994909e-05
## 11202    2 66780 2.994909e-05
## 11203    2 66780 2.994909e-05
## 11204    2 66780 2.994909e-05
## 11205    2 66780 2.994909e-05
## 11206    2 66780 2.994909e-05
## 11207    2 66780 2.994909e-05
## 11208    2 66780 2.994909e-05
## 11209    2 66780 2.994909e-05
## 11210    2 66780 2.994909e-05
## 11211    2 66780 2.994909e-05
## 11212    2 66780 2.994909e-05
## 11213    2 66780 2.994909e-05
## 11214    2 66780 2.994909e-05
## 11215    2 66780 2.994909e-05
## 11216    2 66780 2.994909e-05
## 11217    2 66780 2.994909e-05
## 11218    2 66780 2.994909e-05
## 11219    2 66780 2.994909e-05
## 11220    2 66780 2.994909e-05
## 11221    2 66780 2.994909e-05
## 11222    2 66780 2.994909e-05
## 11223    2 66780 2.994909e-05
## 11224    2 66780 2.994909e-05
## 11225    2 66780 2.994909e-05
## 11226    2 66780 2.994909e-05
## 11227    2 66780 2.994909e-05
## 11228    2 66780 2.994909e-05
## 11229    2 66780 2.994909e-05
## 11230    2 66780 2.994909e-05
## 11231    2 66780 2.994909e-05
## 11232    2 66780 2.994909e-05
## 11233    2 66780 2.994909e-05
## 11234    2 66780 2.994909e-05
## 11235    2 66780 2.994909e-05
## 11236    2 66780 2.994909e-05
## 11237    2 66780 2.994909e-05
## 11238    2 66780 2.994909e-05
## 11239    2 66780 2.994909e-05
## 11240    2 66780 2.994909e-05
## 11241    2 66780 2.994909e-05
## 11242    2 66780 2.994909e-05
## 11243    2 66780 2.994909e-05
## 11244    2 66780 2.994909e-05
## 11245    2 66780 2.994909e-05
## 11246    2 66780 2.994909e-05
## 11247    2 66780 2.994909e-05
## 11248    2 66780 2.994909e-05
## 11249    2 66780 2.994909e-05
## 11250    2 66780 2.994909e-05
## 11251    2 66780 2.994909e-05
## 11252    2 66780 2.994909e-05
## 11253    2 66780 2.994909e-05
## 11254    2 66780 2.994909e-05
## 11255    2 66780 2.994909e-05
## 11256    2 66780 2.994909e-05
## 11257    2 66780 2.994909e-05
## 11258    2 66780 2.994909e-05
## 11259    2 66780 2.994909e-05
## 11260    2 66780 2.994909e-05
## 11261    2 66780 2.994909e-05
## 11262    2 66780 2.994909e-05
## 11263    2 66780 2.994909e-05
## 11264    2 66780 2.994909e-05
## 11265    2 66780 2.994909e-05
## 11266    2 66780 2.994909e-05
## 11267    2 66780 2.994909e-05
## 11268    2 66780 2.994909e-05
## 11269    2 66780 2.994909e-05
## 11270    2 66780 2.994909e-05
## 11271    2 66780 2.994909e-05
## 11272    2 66780 2.994909e-05
## 11273    2 66780 2.994909e-05
## 11274    2 66780 2.994909e-05
## 11275    2 66780 2.994909e-05
## 11276    2 66780 2.994909e-05
## 11277    2 66780 2.994909e-05
## 11278    2 66780 2.994909e-05
## 11279    2 66780 2.994909e-05
## 11280    2 66780 2.994909e-05
## 11281    2 66780 2.994909e-05
## 11282    2 66780 2.994909e-05
## 11283    2 66780 2.994909e-05
## 11284    2 66780 2.994909e-05
## 11285    2 66780 2.994909e-05
## 11286    2 66780 2.994909e-05
## 11287    2 66780 2.994909e-05
## 11288    2 66780 2.994909e-05
## 11289    2 66780 2.994909e-05
## 11290    2 66780 2.994909e-05
## 11291    2 66780 2.994909e-05
## 11292    2 66780 2.994909e-05
## 11293    2 66780 2.994909e-05
## 11294    2 66780 2.994909e-05
## 11295    2 66780 2.994909e-05
## 11296    2 66780 2.994909e-05
## 11297    2 66780 2.994909e-05
## 11298    2 66780 2.994909e-05
## 11299    2 66780 2.994909e-05
## 11300    2 66780 2.994909e-05
## 11301    2 66780 2.994909e-05
## 11302    2 66780 2.994909e-05
## 11303    2 66780 2.994909e-05
## 11304    2 66780 2.994909e-05
## 11305    2 66780 2.994909e-05
## 11306    2 66780 2.994909e-05
## 11307    2 66780 2.994909e-05
## 11308    2 66780 2.994909e-05
## 11309    2 66780 2.994909e-05
## 11310    2 66780 2.994909e-05
## 11311    2 66780 2.994909e-05
## 11312    2 66780 2.994909e-05
## 11313    2 66780 2.994909e-05
## 11314    2 66780 2.994909e-05
## 11315    2 66780 2.994909e-05
## 11316    2 66780 2.994909e-05
## 11317    2 66780 2.994909e-05
## 11318    2 66780 2.994909e-05
## 11319    2 66780 2.994909e-05
## 11320    2 66780 2.994909e-05
## 11321    2 66780 2.994909e-05
## 11322    2 66780 2.994909e-05
## 11323    2 66780 2.994909e-05
## 11324    2 66780 2.994909e-05
## 11325    2 66780 2.994909e-05
## 11326    2 66780 2.994909e-05
## 11327    2 66780 2.994909e-05
## 11328    2 66780 2.994909e-05
## 11329    2 66780 2.994909e-05
## 11330    2 66780 2.994909e-05
## 11331    2 66780 2.994909e-05
## 11332    2 66780 2.994909e-05
## 11333    2 66780 2.994909e-05
## 11334    2 66780 2.994909e-05
## 11335    2 66780 2.994909e-05
## 11336    2 66780 2.994909e-05
## 11337    2 66780 2.994909e-05
## 11338    2 66780 2.994909e-05
## 11339    2 66780 2.994909e-05
## 11340    2 66780 2.994909e-05
## 11341    2 66780 2.994909e-05
## 11342    2 66780 2.994909e-05
## 11343    2 66780 2.994909e-05
## 11344    2 66780 2.994909e-05
## 11345    2 66780 2.994909e-05
## 11346    2 66780 2.994909e-05
## 11347    2 66780 2.994909e-05
## 11348    2 66780 2.994909e-05
## 11349    2 66780 2.994909e-05
## 11350    2 66780 2.994909e-05
## 11351    2 66780 2.994909e-05
## 11352    2 66780 2.994909e-05
## 11353    2 66780 2.994909e-05
## 11354    2 66780 2.994909e-05
## 11355    2 66780 2.994909e-05
## 11356    2 66780 2.994909e-05
## 11357    2 66780 2.994909e-05
## 11358    2 66780 2.994909e-05
## 11359    2 66780 2.994909e-05
## 11360    2 66780 2.994909e-05
## 11361    2 66780 2.994909e-05
## 11362    2 66780 2.994909e-05
## 11363    2 66780 2.994909e-05
## 11364    2 66780 2.994909e-05
## 11365    2 66780 2.994909e-05
## 11366    2 66780 2.994909e-05
## 11367    2 66780 2.994909e-05
## 11368    2 66780 2.994909e-05
## 11369    2 66780 2.994909e-05
## 11370    2 66780 2.994909e-05
## 11371    2 66780 2.994909e-05
## 11372    2 66780 2.994909e-05
## 11373    2 66780 2.994909e-05
## 11374    2 66780 2.994909e-05
## 11375    2 66780 2.994909e-05
## 11376    2 66780 2.994909e-05
## 11377    2 66780 2.994909e-05
## 11378    2 66780 2.994909e-05
## 11379    2 66780 2.994909e-05
## 11380    2 66780 2.994909e-05
## 11381    2 66780 2.994909e-05
## 11382    2 66780 2.994909e-05
## 11383    2 66780 2.994909e-05
## 11384    2 66780 2.994909e-05
## 11385    2 66780 2.994909e-05
## 11386    2 66780 2.994909e-05
## 11387    2 66780 2.994909e-05
## 11388    2 66780 2.994909e-05
## 11389    2 66780 2.994909e-05
## 11390    2 66780 2.994909e-05
## 11391    2 66780 2.994909e-05
## 11392    2 66780 2.994909e-05
## 11393    2 66780 2.994909e-05
## 11394    2 66780 2.994909e-05
## 11395    2 66780 2.994909e-05
## 11396    2 66780 2.994909e-05
## 11397    2 66780 2.994909e-05
## 11398    2 66780 2.994909e-05
## 11399    2 66780 2.994909e-05
## 11400    2 66780 2.994909e-05
## 11401    2 66780 2.994909e-05
## 11402    2 66780 2.994909e-05
## 11403    2 66780 2.994909e-05
## 11404    2 66780 2.994909e-05
## 11405    2 66780 2.994909e-05
## 11406    2 66780 2.994909e-05
## 11407    2 66780 2.994909e-05
## 11408    2 66780 2.994909e-05
## 11409    2 66780 2.994909e-05
## 11410    2 66780 2.994909e-05
## 11411    2 66780 2.994909e-05
## 11412    2 66780 2.994909e-05
## 11413    2 66780 2.994909e-05
## 11414    2 66780 2.994909e-05
## 11415    2 66780 2.994909e-05
## 11416    2 66780 2.994909e-05
## 11417    2 66780 2.994909e-05
## 11418    2 66780 2.994909e-05
## 11419    2 66780 2.994909e-05
## 11420    2 66780 2.994909e-05
## 11421    2 66780 2.994909e-05
## 11422    2 66780 2.994909e-05
## 11423    2 66780 2.994909e-05
## 11424    2 66780 2.994909e-05
## 11425    2 66780 2.994909e-05
## 11426    2 66780 2.994909e-05
## 11427    2 66780 2.994909e-05
## 11428    2 66780 2.994909e-05
## 11429    2 66780 2.994909e-05
## 11430    2 66780 2.994909e-05
## 11431    2 66780 2.994909e-05
## 11432    2 66780 2.994909e-05
## 11433    2 66780 2.994909e-05
## 11434    2 66780 2.994909e-05
## 11435    2 66780 2.994909e-05
## 11436    2 66780 2.994909e-05
## 11437    2 66780 2.994909e-05
## 11438    2 66780 2.994909e-05
## 11439    2 66780 2.994909e-05
## 11440    2 66780 2.994909e-05
## 11441    2 66780 2.994909e-05
## 11442    2 66780 2.994909e-05
## 11443    2 66780 2.994909e-05
## 11444    2 66780 2.994909e-05
## 11445    2 66780 2.994909e-05
## 11446    2 66780 2.994909e-05
## 11447    2 66780 2.994909e-05
## 11448    2 66780 2.994909e-05
## 11449    2 66780 2.994909e-05
## 11450    2 66780 2.994909e-05
## 11451    2 66780 2.994909e-05
## 11452    2 66780 2.994909e-05
## 11453    2 66780 2.994909e-05
## 11454    2 66780 2.994909e-05
## 11455    2 66780 2.994909e-05
## 11456    2 66780 2.994909e-05
## 11457    2 66780 2.994909e-05
## 11458    2 66780 2.994909e-05
## 11459    2 66780 2.994909e-05
## 11460    2 66780 2.994909e-05
## 11461    2 66780 2.994909e-05
## 11462    2 66780 2.994909e-05
## 11463    2 66780 2.994909e-05
## 11464    2 66780 2.994909e-05
## 11465    2 66780 2.994909e-05
## 11466    2 66780 2.994909e-05
## 11467    2 66780 2.994909e-05
## 11468    2 66780 2.994909e-05
## 11469    2 66780 2.994909e-05
## 11470    2 66780 2.994909e-05
## 11471    2 66780 2.994909e-05
## 11472    2 66780 2.994909e-05
## 11473    2 66780 2.994909e-05
## 11474    2 66780 2.994909e-05
## 11475    2 66780 2.994909e-05
## 11476    2 66780 2.994909e-05
## 11477    2 66780 2.994909e-05
## 11478    2 66780 2.994909e-05
## 11479    2 66780 2.994909e-05
## 11480    2 66780 2.994909e-05
## 11481    2 66780 2.994909e-05
## 11482    2 66780 2.994909e-05
## 11483    2 66780 2.994909e-05
## 11484    2 66780 2.994909e-05
## 11485    2 66780 2.994909e-05
## 11486    2 66780 2.994909e-05
## 11487    2 66780 2.994909e-05
## 11488    2 66780 2.994909e-05
## 11489    2 66780 2.994909e-05
## 11490    2 66780 2.994909e-05
## 11491    2 66780 2.994909e-05
## 11492    2 66780 2.994909e-05
## 11493    2 66780 2.994909e-05
## 11494    2 66780 2.994909e-05
## 11495    2 66780 2.994909e-05
## 11496    2 66780 2.994909e-05
## 11497    2 66780 2.994909e-05
## 11498    2 66780 2.994909e-05
## 11499    2 66780 2.994909e-05
## 11500    2 66780 2.994909e-05
## 11501    2 66780 2.994909e-05
## 11502    2 66780 2.994909e-05
## 11503    2 66780 2.994909e-05
## 11504    2 66780 2.994909e-05
## 11505    2 66780 2.994909e-05
## 11506    2 66780 2.994909e-05
## 11507    2 66780 2.994909e-05
## 11508    2 66780 2.994909e-05
## 11509    2 66780 2.994909e-05
## 11510    2 66780 2.994909e-05
## 11511    2 66780 2.994909e-05
## 11512    2 66780 2.994909e-05
## 11513    2 66780 2.994909e-05
## 11514    2 66780 2.994909e-05
## 11515    2 66780 2.994909e-05
## 11516    2 66780 2.994909e-05
## 11517    2 66780 2.994909e-05
## 11518    2 66780 2.994909e-05
## 11519    2 66780 2.994909e-05
## 11520    2 66780 2.994909e-05
## 11521    2 66780 2.994909e-05
## 11522    2 66780 2.994909e-05
## 11523    2 66780 2.994909e-05
## 11524    2 66780 2.994909e-05
## 11525    2 66780 2.994909e-05
## 11526    2 66780 2.994909e-05
## 11527    2 66780 2.994909e-05
## 11528    2 66780 2.994909e-05
## 11529    2 66780 2.994909e-05
## 11530    2 66780 2.994909e-05
## 11531    2 66780 2.994909e-05
## 11532    2 66780 2.994909e-05
## 11533    2 66780 2.994909e-05
## 11534    2 66780 2.994909e-05
## 11535    2 66780 2.994909e-05
## 11536    2 66780 2.994909e-05
## 11537    2 66780 2.994909e-05
## 11538    2 66780 2.994909e-05
## 11539    2 66780 2.994909e-05
## 11540    2 66780 2.994909e-05
## 11541    2 66780 2.994909e-05
## 11542    2 66780 2.994909e-05
## 11543    2 66780 2.994909e-05
## 11544    2 66780 2.994909e-05
## 11545    2 66780 2.994909e-05
## 11546    2 66780 2.994909e-05
## 11547    2 66780 2.994909e-05
## 11548    2 66780 2.994909e-05
## 11549    2 66780 2.994909e-05
## 11550    2 66780 2.994909e-05
## 11551    2 66780 2.994909e-05
## 11552    2 66780 2.994909e-05
## 11553    2 66780 2.994909e-05
## 11554    2 66780 2.994909e-05
## 11555    2 66780 2.994909e-05
## 11556    2 66780 2.994909e-05
## 11557    2 66780 2.994909e-05
## 11558    2 66780 2.994909e-05
## 11559    2 66780 2.994909e-05
## 11560    2 66780 2.994909e-05
## 11561    2 66780 2.994909e-05
## 11562    2 66780 2.994909e-05
## 11563    2 66780 2.994909e-05
## 11564    2 66780 2.994909e-05
## 11565    2 66780 2.994909e-05
## 11566    2 66780 2.994909e-05
## 11567    2 66780 2.994909e-05
## 11568    2 66780 2.994909e-05
## 11569    2 66780 2.994909e-05
## 11570    2 66780 2.994909e-05
## 11571    2 66780 2.994909e-05
## 11572    2 66780 2.994909e-05
## 11573    2 66780 2.994909e-05
## 11574    2 66780 2.994909e-05
## 11575    2 66780 2.994909e-05
## 11576    2 66780 2.994909e-05
## 11577    2 66780 2.994909e-05
## 11578    2 66780 2.994909e-05
## 11579    2 66780 2.994909e-05
## 11580    2 66780 2.994909e-05
## 11581    2 66780 2.994909e-05
## 11582    2 66780 2.994909e-05
## 11583    2 66780 2.994909e-05
## 11584    2 66780 2.994909e-05
## 11585    2 66780 2.994909e-05
## 11586    2 66780 2.994909e-05
## 11587    2 66780 2.994909e-05
## 11588    2 66780 2.994909e-05
## 11589    2 66780 2.994909e-05
## 11590    2 66780 2.994909e-05
## 11591    2 66780 2.994909e-05
## 11592    2 66780 2.994909e-05
## 11593    2 66780 2.994909e-05
## 11594    2 66780 2.994909e-05
## 11595    2 66780 2.994909e-05
## 11596    2 66780 2.994909e-05
## 11597    2 66780 2.994909e-05
## 11598    2 66780 2.994909e-05
## 11599    2 66780 2.994909e-05
## 11600    2 66780 2.994909e-05
## 11601    2 66780 2.994909e-05
## 11602    2 66780 2.994909e-05
## 11603    2 66780 2.994909e-05
## 11604    2 66780 2.994909e-05
## 11605    2 66780 2.994909e-05
## 11606    2 66780 2.994909e-05
## 11607    2 66780 2.994909e-05
## 11608    2 66780 2.994909e-05
## 11609    2 66780 2.994909e-05
## 11610    2 66780 2.994909e-05
## 11611    2 66780 2.994909e-05
## 11612    2 66780 2.994909e-05
## 11613    2 66780 2.994909e-05
## 11614    2 66780 2.994909e-05
## 11615    2 66780 2.994909e-05
## 11616    2 66780 2.994909e-05
## 11617    2 66780 2.994909e-05
## 11618    2 66780 2.994909e-05
## 11619    2 66780 2.994909e-05
## 11620    2 66780 2.994909e-05
## 11621    2 66780 2.994909e-05
## 11622    2 66780 2.994909e-05
## 11623    2 66780 2.994909e-05
## 11624    2 66780 2.994909e-05
## 11625    2 66780 2.994909e-05
## 11626    2 66780 2.994909e-05
## 11627    2 66780 2.994909e-05
## 11628    2 66780 2.994909e-05
## 11629    2 66780 2.994909e-05
## 11630    2 66780 2.994909e-05
## 11631    2 66780 2.994909e-05
## 11632    2 66780 2.994909e-05
## 11633    2 66780 2.994909e-05
## 11634    2 66780 2.994909e-05
## 11635    2 66780 2.994909e-05
## 11636    2 66780 2.994909e-05
## 11637    2 66780 2.994909e-05
## 11638    2 66780 2.994909e-05
## 11639    2 66780 2.994909e-05
## 11640    2 66780 2.994909e-05
## 11641    2 66780 2.994909e-05
## 11642    2 66780 2.994909e-05
## 11643    2 66780 2.994909e-05
## 11644    2 66780 2.994909e-05
## 11645    2 66780 2.994909e-05
## 11646    2 66780 2.994909e-05
## 11647    2 66780 2.994909e-05
## 11648    2 66780 2.994909e-05
## 11649    2 66780 2.994909e-05
## 11650    2 66780 2.994909e-05
## 11651    2 66780 2.994909e-05
## 11652    2 66780 2.994909e-05
## 11653    2 66780 2.994909e-05
## 11654    2 66780 2.994909e-05
## 11655    2 66780 2.994909e-05
## 11656    2 66780 2.994909e-05
## 11657    2 66780 2.994909e-05
## 11658    2 66780 2.994909e-05
## 11659    2 66780 2.994909e-05
## 11660    2 66780 2.994909e-05
## 11661    2 66780 2.994909e-05
## 11662    2 66780 2.994909e-05
## 11663    2 66780 2.994909e-05
## 11664    2 66780 2.994909e-05
## 11665    2 66780 2.994909e-05
## 11666    2 66780 2.994909e-05
## 11667    2 66780 2.994909e-05
## 11668    2 66780 2.994909e-05
## 11669    2 66780 2.994909e-05
## 11670    2 66780 2.994909e-05
## 11671    2 66780 2.994909e-05
## 11672    2 66780 2.994909e-05
## 11673    2 66780 2.994909e-05
## 11674    2 66780 2.994909e-05
## 11675    2 66780 2.994909e-05
## 11676    2 66780 2.994909e-05
## 11677    2 66780 2.994909e-05
## 11678    2 66780 2.994909e-05
## 11679    2 66780 2.994909e-05
## 11680    2 66780 2.994909e-05
## 11681    2 66780 2.994909e-05
## 11682    2 66780 2.994909e-05
## 11683    2 66780 2.994909e-05
## 11684    2 66780 2.994909e-05
## 11685    2 66780 2.994909e-05
## 11686    2 66780 2.994909e-05
## 11687    2 66780 2.994909e-05
## 11688    2 66780 2.994909e-05
## 11689    2 66780 2.994909e-05
## 11690    2 66780 2.994909e-05
## 11691    2 66780 2.994909e-05
## 11692    2 66780 2.994909e-05
## 11693    2 66780 2.994909e-05
## 11694    2 66780 2.994909e-05
## 11695    2 66780 2.994909e-05
## 11696    2 66780 2.994909e-05
## 11697    2 66780 2.994909e-05
## 11698    2 66780 2.994909e-05
## 11699    2 66780 2.994909e-05
## 11700    2 66780 2.994909e-05
## 11701    2 66780 2.994909e-05
## 11702    2 66780 2.994909e-05
## 11703    2 66780 2.994909e-05
## 11704    2 66780 2.994909e-05
## 11705    2 66780 2.994909e-05
## 11706    2 66780 2.994909e-05
## 11707    2 66780 2.994909e-05
## 11708    2 66780 2.994909e-05
## 11709    2 66780 2.994909e-05
## 11710    2 66780 2.994909e-05
## 11711    2 66780 2.994909e-05
## 11712    2 66780 2.994909e-05
## 11713    2 66780 2.994909e-05
## 11714    2 66780 2.994909e-05
## 11715    2 66780 2.994909e-05
## 11716    2 66780 2.994909e-05
## 11717    2 66780 2.994909e-05
## 11718    2 66780 2.994909e-05
## 11719    2 66780 2.994909e-05
## 11720    2 66780 2.994909e-05
## 11721    2 66780 2.994909e-05
## 11722    2 66780 2.994909e-05
## 11723    2 66780 2.994909e-05
## 11724    2 66780 2.994909e-05
## 11725    2 66780 2.994909e-05
## 11726    2 66780 2.994909e-05
## 11727    2 66780 2.994909e-05
## 11728    2 66780 2.994909e-05
## 11729    2 66780 2.994909e-05
## 11730    2 66780 2.994909e-05
## 11731    2 66780 2.994909e-05
## 11732    2 66780 2.994909e-05
## 11733    2 66780 2.994909e-05
## 11734    2 66780 2.994909e-05
## 11735    2 66780 2.994909e-05
## 11736    2 66780 2.994909e-05
## 11737    2 66780 2.994909e-05
## 11738    2 66780 2.994909e-05
## 11739    2 66780 2.994909e-05
## 11740    2 66780 2.994909e-05
## 11741    2 66780 2.994909e-05
## 11742    2 66780 2.994909e-05
## 11743    2 66780 2.994909e-05
## 11744    2 66780 2.994909e-05
## 11745    2 66780 2.994909e-05
## 11746    2 66780 2.994909e-05
## 11747    2 66780 2.994909e-05
## 11748    2 66780 2.994909e-05
## 11749    2 66780 2.994909e-05
## 11750    2 66780 2.994909e-05
## 11751    2 66780 2.994909e-05
## 11752    2 66780 2.994909e-05
## 11753    2 66780 2.994909e-05
## 11754    2 66780 2.994909e-05
## 11755    2 66780 2.994909e-05
## 11756    2 66780 2.994909e-05
## 11757    2 66780 2.994909e-05
## 11758    2 66780 2.994909e-05
## 11759    2 66780 2.994909e-05
## 11760    2 66780 2.994909e-05
## 11761    2 66780 2.994909e-05
## 11762    2 66780 2.994909e-05
## 11763    2 66780 2.994909e-05
## 11764    2 66780 2.994909e-05
## 11765    2 66780 2.994909e-05
## 11766    2 66780 2.994909e-05
## 11767    2 66780 2.994909e-05
## 11768    2 66780 2.994909e-05
## 11769    2 66780 2.994909e-05
## 11770    2 66780 2.994909e-05
## 11771    2 66780 2.994909e-05
## 11772    2 66780 2.994909e-05
## 11773    2 66780 2.994909e-05
## 11774    2 66780 2.994909e-05
## 11775    2 66780 2.994909e-05
## 11776    2 66780 2.994909e-05
## 11777    2 66780 2.994909e-05
## 11778    2 66780 2.994909e-05
## 11779    2 66780 2.994909e-05
## 11780    2 66780 2.994909e-05
## 11781    2 66780 2.994909e-05
## 11782    2 66780 2.994909e-05
## 11783    2 66780 2.994909e-05
## 11784    2 66780 2.994909e-05
## 11785    2 66780 2.994909e-05
## 11786    2 66780 2.994909e-05
## 11787    2 66780 2.994909e-05
## 11788    2 66780 2.994909e-05
## 11789    2 66780 2.994909e-05
## 11790    2 66780 2.994909e-05
## 11791    2 66780 2.994909e-05
## 11792    2 66780 2.994909e-05
## 11793    2 66780 2.994909e-05
## 11794    2 66780 2.994909e-05
## 11795    2 66780 2.994909e-05
## 11796    2 66780 2.994909e-05
## 11797    2 66780 2.994909e-05
## 11798    2 66780 2.994909e-05
## 11799    2 66780 2.994909e-05
## 11800    2 66780 2.994909e-05
## 11801    2 66780 2.994909e-05
## 11802    2 66780 2.994909e-05
## 11803    2 66780 2.994909e-05
## 11804    2 66780 2.994909e-05
## 11805    2 66780 2.994909e-05
## 11806    2 66780 2.994909e-05
## 11807    2 66780 2.994909e-05
## 11808    2 66780 2.994909e-05
## 11809    2 66780 2.994909e-05
## 11810    2 66780 2.994909e-05
## 11811    2 66780 2.994909e-05
## 11812    2 66780 2.994909e-05
## 11813    2 66780 2.994909e-05
## 11814    2 66780 2.994909e-05
## 11815    2 66780 2.994909e-05
## 11816    2 66780 2.994909e-05
## 11817    2 66780 2.994909e-05
## 11818    2 66780 2.994909e-05
## 11819    2 66780 2.994909e-05
## 11820    2 66780 2.994909e-05
## 11821    2 66780 2.994909e-05
## 11822    2 66780 2.994909e-05
## 11823    2 66780 2.994909e-05
## 11824    2 66780 2.994909e-05
## 11825    2 66780 2.994909e-05
## 11826    2 66780 2.994909e-05
## 11827    2 66780 2.994909e-05
## 11828    2 66780 2.994909e-05
## 11829    2 66780 2.994909e-05
## 11830    2 66780 2.994909e-05
## 11831    2 66780 2.994909e-05
## 11832    2 66780 2.994909e-05
## 11833    2 66780 2.994909e-05
## 11834    2 66780 2.994909e-05
## 11835    2 66780 2.994909e-05
## 11836    2 66780 2.994909e-05
## 11837    2 66780 2.994909e-05
## 11838    2 66780 2.994909e-05
## 11839    2 66780 2.994909e-05
## 11840    2 66780 2.994909e-05
## 11841    2 66780 2.994909e-05
## 11842    2 66780 2.994909e-05
## 11843    2 66780 2.994909e-05
## 11844    2 66780 2.994909e-05
## 11845    2 66780 2.994909e-05
## 11846    2 66780 2.994909e-05
## 11847    2 66780 2.994909e-05
## 11848    2 66780 2.994909e-05
## 11849    2 66780 2.994909e-05
## 11850    2 66780 2.994909e-05
## 11851    2 66780 2.994909e-05
## 11852    2 66780 2.994909e-05
## 11853    2 66780 2.994909e-05
## 11854    2 66780 2.994909e-05
## 11855    2 66780 2.994909e-05
## 11856    2 66780 2.994909e-05
## 11857    2 66780 2.994909e-05
## 11858    2 66780 2.994909e-05
## 11859    2 66780 2.994909e-05
## 11860    2 66780 2.994909e-05
## 11861    2 66780 2.994909e-05
## 11862    2 66780 2.994909e-05
## 11863    2 66780 2.994909e-05
## 11864    2 66780 2.994909e-05
## 11865    2 66780 2.994909e-05
## 11866    2 66780 2.994909e-05
## 11867    2 66780 2.994909e-05
## 11868    2 66780 2.994909e-05
## 11869    2 66780 2.994909e-05
## 11870    2 66780 2.994909e-05
## 11871    2 66780 2.994909e-05
## 11872    2 66780 2.994909e-05
## 11873    2 66780 2.994909e-05
## 11874    2 66780 2.994909e-05
## 11875    2 66780 2.994909e-05
## 11876    2 66780 2.994909e-05
## 11877    2 66780 2.994909e-05
## 11878    2 66780 2.994909e-05
## 11879    2 66780 2.994909e-05
## 11880    2 66780 2.994909e-05
## 11881    2 66780 2.994909e-05
## 11882    2 66780 2.994909e-05
## 11883    2 66780 2.994909e-05
## 11884    2 66780 2.994909e-05
## 11885    2 66780 2.994909e-05
## 11886    2 66780 2.994909e-05
## 11887    2 66780 2.994909e-05
## 11888    2 66780 2.994909e-05
## 11889    2 66780 2.994909e-05
## 11890    2 66780 2.994909e-05
## 11891    2 66780 2.994909e-05
## 11892    2 66780 2.994909e-05
## 11893    2 66780 2.994909e-05
## 11894    2 66780 2.994909e-05
## 11895    2 66780 2.994909e-05
## 11896    2 66780 2.994909e-05
## 11897    2 66780 2.994909e-05
## 11898    2 66780 2.994909e-05
## 11899    2 66780 2.994909e-05
## 11900    2 66780 2.994909e-05
## 11901    2 66780 2.994909e-05
## 11902    2 66780 2.994909e-05
## 11903    2 66780 2.994909e-05
## 11904    2 66780 2.994909e-05
## 11905    2 66780 2.994909e-05
## 11906    2 66780 2.994909e-05
## 11907    2 66780 2.994909e-05
## 11908    2 66780 2.994909e-05
## 11909    2 66780 2.994909e-05
## 11910    2 66780 2.994909e-05
## 11911    2 66780 2.994909e-05
## 11912    2 66780 2.994909e-05
## 11913    2 66780 2.994909e-05
## 11914    2 66780 2.994909e-05
## 11915    2 66780 2.994909e-05
## 11916    2 66780 2.994909e-05
## 11917    2 66780 2.994909e-05
## 11918    2 66780 2.994909e-05
## 11919    2 66780 2.994909e-05
## 11920    2 66780 2.994909e-05
## 11921    2 66780 2.994909e-05
## 11922    2 66780 2.994909e-05
## 11923    2 66780 2.994909e-05
## 11924    2 66780 2.994909e-05
## 11925    2 66780 2.994909e-05
## 11926    2 66780 2.994909e-05
## 11927    2 66780 2.994909e-05
## 11928    2 66780 2.994909e-05
## 11929    2 66780 2.994909e-05
## 11930    2 66780 2.994909e-05
## 11931    2 66780 2.994909e-05
## 11932    2 66780 2.994909e-05
## 11933    2 66780 2.994909e-05
## 11934    2 66780 2.994909e-05
## 11935    2 66780 2.994909e-05
## 11936    2 66780 2.994909e-05
## 11937    2 66780 2.994909e-05
## 11938    2 66780 2.994909e-05
## 11939    2 66780 2.994909e-05
## 11940    2 66780 2.994909e-05
## 11941    2 66780 2.994909e-05
## 11942    2 66780 2.994909e-05
## 11943    2 66780 2.994909e-05
## 11944    2 66780 2.994909e-05
## 11945    2 66780 2.994909e-05
## 11946    2 66780 2.994909e-05
## 11947    2 66780 2.994909e-05
## 11948    2 66780 2.994909e-05
## 11949    2 66780 2.994909e-05
## 11950    2 66780 2.994909e-05
## 11951    2 66780 2.994909e-05
## 11952    2 66780 2.994909e-05
## 11953    2 66780 2.994909e-05
## 11954    2 66780 2.994909e-05
## 11955    2 66780 2.994909e-05
## 11956    2 66780 2.994909e-05
## 11957    2 66780 2.994909e-05
## 11958    2 66780 2.994909e-05
## 11959    2 66780 2.994909e-05
## 11960    2 66780 2.994909e-05
## 11961    2 66780 2.994909e-05
## 11962    2 66780 2.994909e-05
## 11963    2 66780 2.994909e-05
## 11964    2 66780 2.994909e-05
## 11965    2 66780 2.994909e-05
## 11966    2 66780 2.994909e-05
## 11967    2 66780 2.994909e-05
## 11968    2 66780 2.994909e-05
## 11969    2 66780 2.994909e-05
## 11970    2 66780 2.994909e-05
## 11971    2 66780 2.994909e-05
## 11972    2 66780 2.994909e-05
## 11973    2 66780 2.994909e-05
## 11974    2 66780 2.994909e-05
## 11975    2 66780 2.994909e-05
## 11976    2 66780 2.994909e-05
## 11977    2 66780 2.994909e-05
## 11978    2 66780 2.994909e-05
## 11979    2 66780 2.994909e-05
## 11980    2 66780 2.994909e-05
## 11981    2 66780 2.994909e-05
## 11982    2 66780 2.994909e-05
## 11983    2 66780 2.994909e-05
## 11984    2 66780 2.994909e-05
## 11985    2 66780 2.994909e-05
## 11986    2 66780 2.994909e-05
## 11987    2 66780 2.994909e-05
## 11988    2 66780 2.994909e-05
## 11989    2 66780 2.994909e-05
## 11990    2 66780 2.994909e-05
## 11991    2 66780 2.994909e-05
## 11992    2 66780 2.994909e-05
## 11993    2 66780 2.994909e-05
## 11994    2 66780 2.994909e-05
## 11995    2 66780 2.994909e-05
## 11996    2 66780 2.994909e-05
## 11997    2 66780 2.994909e-05
## 11998    2 66780 2.994909e-05
## 11999    2 66780 2.994909e-05
## 12000    2 66780 2.994909e-05
## 12001    2 66780 2.994909e-05
## 12002    2 66780 2.994909e-05
## 12003    2 66780 2.994909e-05
## 12004    2 66780 2.994909e-05
## 12005    2 66780 2.994909e-05
## 12006    2 66780 2.994909e-05
## 12007    2 66780 2.994909e-05
## 12008    2 66780 2.994909e-05
## 12009    2 66780 2.994909e-05
## 12010    2 66780 2.994909e-05
## 12011    2 66780 2.994909e-05
## 12012    2 66780 2.994909e-05
## 12013    2 66780 2.994909e-05
## 12014    2 66780 2.994909e-05
## 12015    2 66780 2.994909e-05
## 12016    2 66780 2.994909e-05
## 12017    2 66780 2.994909e-05
## 12018    2 66780 2.994909e-05
## 12019    2 66780 2.994909e-05
## 12020    2 66780 2.994909e-05
## 12021    2 66780 2.994909e-05
## 12022    2 66780 2.994909e-05
## 12023    2 66780 2.994909e-05
## 12024    2 66780 2.994909e-05
## 12025    2 66780 2.994909e-05
## 12026    2 66780 2.994909e-05
## 12027    2 66780 2.994909e-05
## 12028    2 66780 2.994909e-05
## 12029    2 66780 2.994909e-05
## 12030    2 66780 2.994909e-05
## 12031    2 66780 2.994909e-05
## 12032    2 66780 2.994909e-05
## 12033    2 66780 2.994909e-05
## 12034    2 66780 2.994909e-05
## 12035    2 66780 2.994909e-05
## 12036    2 66780 2.994909e-05
## 12037    2 66780 2.994909e-05
## 12038    2 66780 2.994909e-05
## 12039    2 66780 2.994909e-05
## 12040    2 66780 2.994909e-05
## 12041    2 66780 2.994909e-05
## 12042    2 66780 2.994909e-05
## 12043    2 66780 2.994909e-05
## 12044    2 66780 2.994909e-05
## 12045    2 66780 2.994909e-05
## 12046    2 66780 2.994909e-05
## 12047    2 66780 2.994909e-05
## 12048    2 66780 2.994909e-05
## 12049    2 66780 2.994909e-05
## 12050    2 66780 2.994909e-05
## 12051    2 66780 2.994909e-05
## 12052    2 66780 2.994909e-05
## 12053    2 66780 2.994909e-05
## 12054    2 66780 2.994909e-05
## 12055    2 66780 2.994909e-05
## 12056    2 66780 2.994909e-05
## 12057    2 66780 2.994909e-05
## 12058    2 66780 2.994909e-05
## 12059    2 66780 2.994909e-05
## 12060    2 66780 2.994909e-05
## 12061    2 66780 2.994909e-05
## 12062    2 66780 2.994909e-05
## 12063    2 66780 2.994909e-05
## 12064    2 66780 2.994909e-05
## 12065    2 66780 2.994909e-05
## 12066    2 66780 2.994909e-05
## 12067    2 66780 2.994909e-05
## 12068    2 66780 2.994909e-05
## 12069    2 66780 2.994909e-05
## 12070    2 66780 2.994909e-05
## 12071    2 66780 2.994909e-05
## 12072    2 66780 2.994909e-05
## 12073    2 66780 2.994909e-05
## 12074    2 66780 2.994909e-05
## 12075    2 66780 2.994909e-05
## 12076    2 66780 2.994909e-05
## 12077    2 66780 2.994909e-05
## 12078    2 66780 2.994909e-05
## 12079    2 66780 2.994909e-05
## 12080    2 66780 2.994909e-05
## 12081    2 66780 2.994909e-05
## 12082    2 66780 2.994909e-05
## 12083    2 66780 2.994909e-05
## 12084    2 66780 2.994909e-05
## 12085    2 66780 2.994909e-05
## 12086    2 66780 2.994909e-05
## 12087    2 66780 2.994909e-05
## 12088    2 66780 2.994909e-05
## 12089    2 66780 2.994909e-05
## 12090    2 66780 2.994909e-05
## 12091    2 66780 2.994909e-05
## 12092    2 66780 2.994909e-05
## 12093    2 66780 2.994909e-05
## 12094    2 66780 2.994909e-05
## 12095    2 66780 2.994909e-05
## 12096    2 66780 2.994909e-05
## 12097    2 66780 2.994909e-05
## 12098    2 66780 2.994909e-05
## 12099    2 66780 2.994909e-05
## 12100    2 66780 2.994909e-05
## 12101    2 66780 2.994909e-05
## 12102    2 66780 2.994909e-05
## 12103    2 66780 2.994909e-05
## 12104    2 66780 2.994909e-05
## 12105    2 66780 2.994909e-05
## 12106    2 66780 2.994909e-05
## 12107    2 66780 2.994909e-05
## 12108    2 66780 2.994909e-05
## 12109    2 66780 2.994909e-05
## 12110    2 66780 2.994909e-05
## 12111    2 66780 2.994909e-05
## 12112    2 66780 2.994909e-05
## 12113    2 66780 2.994909e-05
## 12114    2 66780 2.994909e-05
## 12115    2 66780 2.994909e-05
## 12116    2 66780 2.994909e-05
## 12117    2 66780 2.994909e-05
## 12118    2 66780 2.994909e-05
## 12119    2 66780 2.994909e-05
## 12120    2 66780 2.994909e-05
## 12121    2 66780 2.994909e-05
## 12122    2 66780 2.994909e-05
## 12123    2 66780 2.994909e-05
## 12124    2 66780 2.994909e-05
## 12125    2 66780 2.994909e-05
## 12126    2 66780 2.994909e-05
## 12127    2 66780 2.994909e-05
## 12128    2 66780 2.994909e-05
## 12129    2 66780 2.994909e-05
## 12130    2 66780 2.994909e-05
## 12131    2 66780 2.994909e-05
## 12132    2 66780 2.994909e-05
## 12133    2 66780 2.994909e-05
## 12134    2 66780 2.994909e-05
## 12135    2 66780 2.994909e-05
## 12136    2 66780 2.994909e-05
## 12137    2 66780 2.994909e-05
## 12138    2 66780 2.994909e-05
## 12139    2 66780 2.994909e-05
## 12140    2 66780 2.994909e-05
## 12141    2 66780 2.994909e-05
## 12142    2 66780 2.994909e-05
## 12143    2 66780 2.994909e-05
## 12144    2 66780 2.994909e-05
## 12145    2 66780 2.994909e-05
## 12146    2 66780 2.994909e-05
## 12147    2 66780 2.994909e-05
## 12148    2 66780 2.994909e-05
## 12149    2 66780 2.994909e-05
## 12150    2 66780 2.994909e-05
## 12151    2 66780 2.994909e-05
## 12152    2 66780 2.994909e-05
## 12153    2 66780 2.994909e-05
## 12154    2 66780 2.994909e-05
## 12155    2 66780 2.994909e-05
## 12156    2 66780 2.994909e-05
## 12157    2 66780 2.994909e-05
## 12158    2 66780 2.994909e-05
## 12159    2 66780 2.994909e-05
## 12160    2 66780 2.994909e-05
## 12161    2 66780 2.994909e-05
## 12162    2 66780 2.994909e-05
## 12163    2 66780 2.994909e-05
## 12164    2 66780 2.994909e-05
## 12165    2 66780 2.994909e-05
## 12166    2 66780 2.994909e-05
## 12167    2 66780 2.994909e-05
## 12168    2 66780 2.994909e-05
## 12169    2 66780 2.994909e-05
## 12170    2 66780 2.994909e-05
## 12171    2 66780 2.994909e-05
## 12172    2 66780 2.994909e-05
## 12173    2 66780 2.994909e-05
## 12174    2 66780 2.994909e-05
## 12175    2 66780 2.994909e-05
## 12176    2 66780 2.994909e-05
## 12177    2 66780 2.994909e-05
## 12178    2 66780 2.994909e-05
## 12179    2 66780 2.994909e-05
## 12180    2 66780 2.994909e-05
## 12181    2 66780 2.994909e-05
## 12182    2 66780 2.994909e-05
## 12183    2 66780 2.994909e-05
## 12184    2 66780 2.994909e-05
## 12185    2 66780 2.994909e-05
## 12186    2 66780 2.994909e-05
## 12187    2 66780 2.994909e-05
## 12188    2 66780 2.994909e-05
## 12189    2 66780 2.994909e-05
## 12190    2 66780 2.994909e-05
## 12191    2 66780 2.994909e-05
## 12192    2 66780 2.994909e-05
## 12193    2 66780 2.994909e-05
## 12194    2 66780 2.994909e-05
## 12195    2 66780 2.994909e-05
## 12196    2 66780 2.994909e-05
## 12197    2 66780 2.994909e-05
## 12198    2 66780 2.994909e-05
## 12199    2 66780 2.994909e-05
## 12200    2 66780 2.994909e-05
## 12201    2 66780 2.994909e-05
## 12202    2 66780 2.994909e-05
## 12203    2 66780 2.994909e-05
## 12204    2 66780 2.994909e-05
## 12205    2 66780 2.994909e-05
## 12206    2 66780 2.994909e-05
## 12207    2 66780 2.994909e-05
## 12208    2 66780 2.994909e-05
## 12209    2 66780 2.994909e-05
## 12210    2 66780 2.994909e-05
## 12211    2 66780 2.994909e-05
## 12212    2 66780 2.994909e-05
## 12213    2 66780 2.994909e-05
## 12214    2 66780 2.994909e-05
## 12215    2 66780 2.994909e-05
## 12216    2 66780 2.994909e-05
## 12217    2 66780 2.994909e-05
## 12218    2 66780 2.994909e-05
## 12219    2 66780 2.994909e-05
## 12220    2 66780 2.994909e-05
## 12221    2 66780 2.994909e-05
## 12222    2 66780 2.994909e-05
## 12223    2 66780 2.994909e-05
## 12224    2 66780 2.994909e-05
## 12225    2 66780 2.994909e-05
## 12226    2 66780 2.994909e-05
## 12227    2 66780 2.994909e-05
## 12228    2 66780 2.994909e-05
## 12229    2 66780 2.994909e-05
## 12230    2 66780 2.994909e-05
## 12231    2 66780 2.994909e-05
## 12232    2 66780 2.994909e-05
## 12233    2 66780 2.994909e-05
## 12234    2 66780 2.994909e-05
## 12235    2 66780 2.994909e-05
## 12236    2 66780 2.994909e-05
## 12237    2 66780 2.994909e-05
## 12238    2 66780 2.994909e-05
## 12239    2 66780 2.994909e-05
## 12240    2 66780 2.994909e-05
## 12241    2 66780 2.994909e-05
## 12242    2 66780 2.994909e-05
## 12243    2 66780 2.994909e-05
## 12244    2 66780 2.994909e-05
## 12245    2 66780 2.994909e-05
## 12246    2 66780 2.994909e-05
## 12247    2 66780 2.994909e-05
## 12248    2 66780 2.994909e-05
## 12249    2 66780 2.994909e-05
## 12250    2 66780 2.994909e-05
## 12251    2 66780 2.994909e-05
## 12252    2 66780 2.994909e-05
## 12253    2 66780 2.994909e-05
## 12254    2 66780 2.994909e-05
## 12255    2 66780 2.994909e-05
## 12256    2 66780 2.994909e-05
## 12257    2 66780 2.994909e-05
## 12258    2 66780 2.994909e-05
## 12259    2 66780 2.994909e-05
## 12260    2 66780 2.994909e-05
## 12261    2 66780 2.994909e-05
## 12262    2 66780 2.994909e-05
## 12263    2 66780 2.994909e-05
## 12264    2 66780 2.994909e-05
## 12265    2 66780 2.994909e-05
## 12266    2 66780 2.994909e-05
## 12267    2 66780 2.994909e-05
## 12268    2 66780 2.994909e-05
## 12269    2 66780 2.994909e-05
## 12270    2 66780 2.994909e-05
## 12271    2 66780 2.994909e-05
## 12272    2 66780 2.994909e-05
## 12273    2 66780 2.994909e-05
## 12274    2 66780 2.994909e-05
## 12275    2 66780 2.994909e-05
## 12276    2 66780 2.994909e-05
## 12277    2 66780 2.994909e-05
## 12278    2 66780 2.994909e-05
## 12279    2 66780 2.994909e-05
## 12280    2 66780 2.994909e-05
## 12281    2 66780 2.994909e-05
## 12282    2 66780 2.994909e-05
## 12283    2 66780 2.994909e-05
## 12284    2 66780 2.994909e-05
## 12285    2 66780 2.994909e-05
## 12286    2 66780 2.994909e-05
## 12287    2 66780 2.994909e-05
## 12288    2 66780 2.994909e-05
## 12289    2 66780 2.994909e-05
## 12290    2 66780 2.994909e-05
## 12291    2 66780 2.994909e-05
## 12292    2 66780 2.994909e-05
## 12293    2 66780 2.994909e-05
## 12294    2 66780 2.994909e-05
## 12295    2 66780 2.994909e-05
## 12296    2 66780 2.994909e-05
## 12297    2 66780 2.994909e-05
## 12298    2 66780 2.994909e-05
## 12299    2 66780 2.994909e-05
## 12300    2 66780 2.994909e-05
## 12301    2 66780 2.994909e-05
## 12302    2 66780 2.994909e-05
## 12303    2 66780 2.994909e-05
## 12304    2 66780 2.994909e-05
## 12305    2 66780 2.994909e-05
## 12306    2 66780 2.994909e-05
## 12307    2 66780 2.994909e-05
## 12308    2 66780 2.994909e-05
## 12309    2 66780 2.994909e-05
## 12310    2 66780 2.994909e-05
## 12311    2 66780 2.994909e-05
## 12312    2 66780 2.994909e-05
## 12313    2 66780 2.994909e-05
## 12314    2 66780 2.994909e-05
## 12315    2 66780 2.994909e-05
## 12316    2 66780 2.994909e-05
## 12317    2 66780 2.994909e-05
## 12318    2 66780 2.994909e-05
## 12319    2 66780 2.994909e-05
## 12320    2 66780 2.994909e-05
## 12321    2 66780 2.994909e-05
## 12322    2 66780 2.994909e-05
## 12323    2 66780 2.994909e-05
## 12324    2 66780 2.994909e-05
## 12325    2 66780 2.994909e-05
## 12326    2 66780 2.994909e-05
## 12327    2 66780 2.994909e-05
## 12328    2 66780 2.994909e-05
## 12329    2 66780 2.994909e-05
## 12330    2 66780 2.994909e-05
## 12331    2 66780 2.994909e-05
## 12332    2 66780 2.994909e-05
## 12333    2 66780 2.994909e-05
## 12334    2 66780 2.994909e-05
## 12335    2 66780 2.994909e-05
## 12336    2 66780 2.994909e-05
## 12337    2 66780 2.994909e-05
## 12338    2 66780 2.994909e-05
## 12339    2 66780 2.994909e-05
## 12340    2 66780 2.994909e-05
## 12341    2 66780 2.994909e-05
## 12342    2 66780 2.994909e-05
## 12343    2 66780 2.994909e-05
## 12344    2 66780 2.994909e-05
## 12345    2 66780 2.994909e-05
## 12346    2 66780 2.994909e-05
## 12347    2 66780 2.994909e-05
## 12348    2 66780 2.994909e-05
## 12349    2 66780 2.994909e-05
## 12350    2 66780 2.994909e-05
## 12351    2 66780 2.994909e-05
## 12352    2 66780 2.994909e-05
## 12353    2 66780 2.994909e-05
## 12354    2 66780 2.994909e-05
## 12355    2 66780 2.994909e-05
## 12356    2 66780 2.994909e-05
## 12357    2 66780 2.994909e-05
## 12358    2 66780 2.994909e-05
## 12359    2 66780 2.994909e-05
## 12360    2 66780 2.994909e-05
## 12361    2 66780 2.994909e-05
## 12362    2 66780 2.994909e-05
## 12363    2 66780 2.994909e-05
## 12364    2 66780 2.994909e-05
## 12365    2 66780 2.994909e-05
## 12366    2 66780 2.994909e-05
## 12367    2 66780 2.994909e-05
## 12368    2 66780 2.994909e-05
## 12369    2 66780 2.994909e-05
## 12370    2 66780 2.994909e-05
## 12371    2 66780 2.994909e-05
## 12372    2 66780 2.994909e-05
## 12373    2 66780 2.994909e-05
## 12374    2 66780 2.994909e-05
## 12375    2 66780 2.994909e-05
## 12376    2 66780 2.994909e-05
## 12377    2 66780 2.994909e-05
## 12378    2 66780 2.994909e-05
## 12379    2 66780 2.994909e-05
## 12380    2 66780 2.994909e-05
## 12381    2 66780 2.994909e-05
## 12382    2 66780 2.994909e-05
## 12383    2 66780 2.994909e-05
## 12384    2 66780 2.994909e-05
## 12385    2 66780 2.994909e-05
## 12386    2 66780 2.994909e-05
## 12387    2 66780 2.994909e-05
## 12388    2 66780 2.994909e-05
## 12389    2 66780 2.994909e-05
## 12390    2 66780 2.994909e-05
## 12391    2 66780 2.994909e-05
## 12392    2 66780 2.994909e-05
## 12393    2 66780 2.994909e-05
## 12394    2 66780 2.994909e-05
## 12395    2 66780 2.994909e-05
## 12396    2 66780 2.994909e-05
## 12397    2 66780 2.994909e-05
## 12398    2 66780 2.994909e-05
## 12399    2 66780 2.994909e-05
## 12400    2 66780 2.994909e-05
## 12401    2 66780 2.994909e-05
## 12402    2 66780 2.994909e-05
## 12403    2 66780 2.994909e-05
## 12404    2 66780 2.994909e-05
## 12405    2 66780 2.994909e-05
## 12406    2 66780 2.994909e-05
## 12407    2 66780 2.994909e-05
## 12408    2 66780 2.994909e-05
## 12409    2 66780 2.994909e-05
## 12410    2 66780 2.994909e-05
## 12411    2 66780 2.994909e-05
## 12412    2 66780 2.994909e-05
## 12413    2 66780 2.994909e-05
## 12414    2 66780 2.994909e-05
## 12415    2 66780 2.994909e-05
## 12416    2 66780 2.994909e-05
## 12417    2 66780 2.994909e-05
## 12418    2 66780 2.994909e-05
## 12419    2 66780 2.994909e-05
## 12420    2 66780 2.994909e-05
## 12421    2 66780 2.994909e-05
## 12422    2 66780 2.994909e-05
## 12423    2 66780 2.994909e-05
## 12424    2 66780 2.994909e-05
## 12425    2 66780 2.994909e-05
## 12426    2 66780 2.994909e-05
## 12427    2 66780 2.994909e-05
## 12428    2 66780 2.994909e-05
## 12429    2 66780 2.994909e-05
## 12430    2 66780 2.994909e-05
## 12431    2 66780 2.994909e-05
## 12432    2 66780 2.994909e-05
## 12433    2 66780 2.994909e-05
## 12434    2 66780 2.994909e-05
## 12435    2 66780 2.994909e-05
## 12436    2 66780 2.994909e-05
## 12437    2 66780 2.994909e-05
## 12438    2 66780 2.994909e-05
## 12439    2 66780 2.994909e-05
## 12440    2 66780 2.994909e-05
## 12441    2 66780 2.994909e-05
## 12442    2 66780 2.994909e-05
## 12443    2 66780 2.994909e-05
## 12444    2 66780 2.994909e-05
## 12445    2 66780 2.994909e-05
## 12446    2 66780 2.994909e-05
## 12447    2 66780 2.994909e-05
## 12448    2 66780 2.994909e-05
## 12449    2 66780 2.994909e-05
## 12450    2 66780 2.994909e-05
## 12451    2 66780 2.994909e-05
## 12452    2 66780 2.994909e-05
## 12453    2 66780 2.994909e-05
## 12454    2 66780 2.994909e-05
## 12455    2 66780 2.994909e-05
## 12456    2 66780 2.994909e-05
## 12457    2 66780 2.994909e-05
## 12458    2 66780 2.994909e-05
## 12459    2 66780 2.994909e-05
## 12460    2 66780 2.994909e-05
## 12461    2 66780 2.994909e-05
## 12462    2 66780 2.994909e-05
## 12463    2 66780 2.994909e-05
## 12464    2 66780 2.994909e-05
## 12465    2 66780 2.994909e-05
## 12466    2 66780 2.994909e-05
## 12467    2 66780 2.994909e-05
## 12468    2 66780 2.994909e-05
## 12469    2 66780 2.994909e-05
## 12470    2 66780 2.994909e-05
## 12471    2 66780 2.994909e-05
## 12472    2 66780 2.994909e-05
## 12473    2 66780 2.994909e-05
## 12474    2 66780 2.994909e-05
## 12475    2 66780 2.994909e-05
## 12476    2 66780 2.994909e-05
## 12477    2 66780 2.994909e-05
## 12478    2 66780 2.994909e-05
## 12479    2 66780 2.994909e-05
## 12480    2 66780 2.994909e-05
## 12481    2 66780 2.994909e-05
## 12482    2 66780 2.994909e-05
## 12483    2 66780 2.994909e-05
## 12484    2 66780 2.994909e-05
## 12485    2 66780 2.994909e-05
## 12486    2 66780 2.994909e-05
## 12487    2 66780 2.994909e-05
## 12488    2 66780 2.994909e-05
## 12489    2 66780 2.994909e-05
## 12490    2 66780 2.994909e-05
## 12491    2 66780 2.994909e-05
## 12492    2 66780 2.994909e-05
## 12493    2 66780 2.994909e-05
## 12494    2 66780 2.994909e-05
## 12495    2 66780 2.994909e-05
## 12496    2 66780 2.994909e-05
## 12497    2 66780 2.994909e-05
## 12498    2 66780 2.994909e-05
## 12499    2 66780 2.994909e-05
## 12500    2 66780 2.994909e-05
## 12501    2 66780 2.994909e-05
## 12502    2 66780 2.994909e-05
## 12503    2 66780 2.994909e-05
## 12504    2 66780 2.994909e-05
## 12505    2 66780 2.994909e-05
## 12506    2 66780 2.994909e-05
## 12507    2 66780 2.994909e-05
## 12508    2 66780 2.994909e-05
## 12509    2 66780 2.994909e-05
## 12510    2 66780 2.994909e-05
## 12511    2 66780 2.994909e-05
## 12512    2 66780 2.994909e-05
## 12513    2 66780 2.994909e-05
## 12514    2 66780 2.994909e-05
## 12515    2 66780 2.994909e-05
## 12516    2 66780 2.994909e-05
## 12517    2 66780 2.994909e-05
## 12518    2 66780 2.994909e-05
## 12519    2 66780 2.994909e-05
## 12520    2 66780 2.994909e-05
## 12521    2 66780 2.994909e-05
## 12522    2 66780 2.994909e-05
## 12523    2 66780 2.994909e-05
## 12524    2 66780 2.994909e-05
## 12525    2 66780 2.994909e-05
## 12526    2 66780 2.994909e-05
## 12527    2 66780 2.994909e-05
## 12528    2 66780 2.994909e-05
## 12529    2 66780 2.994909e-05
## 12530    2 66780 2.994909e-05
## 12531    2 66780 2.994909e-05
## 12532    2 66780 2.994909e-05
## 12533    2 66780 2.994909e-05
## 12534    2 66780 2.994909e-05
## 12535    2 66780 2.994909e-05
## 12536    2 66780 2.994909e-05
## 12537    2 66780 2.994909e-05
## 12538    2 66780 2.994909e-05
## 12539    2 66780 2.994909e-05
## 12540    2 66780 2.994909e-05
## 12541    2 66780 2.994909e-05
## 12542    2 66780 2.994909e-05
## 12543    2 66780 2.994909e-05
## 12544    2 66780 2.994909e-05
## 12545    2 66780 2.994909e-05
## 12546    2 66780 2.994909e-05
## 12547    2 66780 2.994909e-05
## 12548    2 66780 2.994909e-05
## 12549    2 66780 2.994909e-05
## 12550    2 66780 2.994909e-05
## 12551    2 66780 2.994909e-05
## 12552    2 66780 2.994909e-05
## 12553    2 66780 2.994909e-05
## 12554    2 66780 2.994909e-05
## 12555    2 66780 2.994909e-05
## 12556    2 66780 2.994909e-05
## 12557    2 66780 2.994909e-05
## 12558    2 66780 2.994909e-05
## 12559    2 66780 2.994909e-05
## 12560    2 66780 2.994909e-05
## 12561    2 66780 2.994909e-05
## 12562    2 66780 2.994909e-05
## 12563    2 66780 2.994909e-05
## 12564    2 66780 2.994909e-05
## 12565    2 66780 2.994909e-05
## 12566    2 66780 2.994909e-05
## 12567    2 66780 2.994909e-05
## 12568    2 66780 2.994909e-05
## 12569    2 66780 2.994909e-05
## 12570    2 66780 2.994909e-05
## 12571    2 66780 2.994909e-05
## 12572    2 66780 2.994909e-05
## 12573    2 66780 2.994909e-05
## 12574    2 66780 2.994909e-05
## 12575    2 66780 2.994909e-05
## 12576    2 66780 2.994909e-05
## 12577    2 66780 2.994909e-05
## 12578    2 66780 2.994909e-05
## 12579    2 66780 2.994909e-05
## 12580    2 66780 2.994909e-05
## 12581    2 66780 2.994909e-05
## 12582    2 66780 2.994909e-05
## 12583    2 66780 2.994909e-05
## 12584    2 66780 2.994909e-05
## 12585    2 66780 2.994909e-05
## 12586    2 66780 2.994909e-05
## 12587    2 66780 2.994909e-05
## 12588    2 66780 2.994909e-05
## 12589    2 66780 2.994909e-05
## 12590    2 66780 2.994909e-05
## 12591    2 66780 2.994909e-05
## 12592    2 66780 2.994909e-05
## 12593    2 66780 2.994909e-05
## 12594    2 66780 2.994909e-05
## 12595    2 66780 2.994909e-05
## 12596    2 66780 2.994909e-05
## 12597    2 66780 2.994909e-05
## 12598    2 66780 2.994909e-05
## 12599    2 66780 2.994909e-05
## 12600    2 66780 2.994909e-05
## 12601    2 66780 2.994909e-05
## 12602    2 66780 2.994909e-05
## 12603    2 66780 2.994909e-05
## 12604    2 66780 2.994909e-05
## 12605    2 66780 2.994909e-05
## 12606    2 66780 2.994909e-05
## 12607    2 66780 2.994909e-05
## 12608    2 66780 2.994909e-05
## 12609    2 66780 2.994909e-05
## 12610    2 66780 2.994909e-05
## 12611    2 66780 2.994909e-05
## 12612    2 66780 2.994909e-05
## 12613    2 66780 2.994909e-05
## 12614    2 66780 2.994909e-05
## 12615    2 66780 2.994909e-05
## 12616    2 66780 2.994909e-05
## 12617    2 66780 2.994909e-05
## 12618    2 66780 2.994909e-05
## 12619    2 66780 2.994909e-05
## 12620    2 66780 2.994909e-05
## 12621    2 66780 2.994909e-05
## 12622    2 66780 2.994909e-05
## 12623    2 66780 2.994909e-05
## 12624    2 66780 2.994909e-05
## 12625    2 66780 2.994909e-05
## 12626    2 66780 2.994909e-05
## 12627    2 66780 2.994909e-05
## 12628    2 66780 2.994909e-05
## 12629    2 66780 2.994909e-05
## 12630    2 66780 2.994909e-05
## 12631    2 66780 2.994909e-05
## 12632    2 66780 2.994909e-05
## 12633    2 66780 2.994909e-05
## 12634    2 66780 2.994909e-05
## 12635    2 66780 2.994909e-05
## 12636    2 66780 2.994909e-05
## 12637    2 66780 2.994909e-05
## 12638    2 66780 2.994909e-05
## 12639    2 66780 2.994909e-05
## 12640    2 66780 2.994909e-05
## 12641    2 66780 2.994909e-05
## 12642    2 66780 2.994909e-05
## 12643    2 66780 2.994909e-05
## 12644    2 66780 2.994909e-05
## 12645    2 66780 2.994909e-05
## 12646    2 66780 2.994909e-05
## 12647    2 66780 2.994909e-05
## 12648    2 66780 2.994909e-05
## 12649    2 66780 2.994909e-05
## 12650    2 66780 2.994909e-05
## 12651    2 66780 2.994909e-05
## 12652    2 66780 2.994909e-05
## 12653    2 66780 2.994909e-05
## 12654    2 66780 2.994909e-05
## 12655    2 66780 2.994909e-05
## 12656    2 66780 2.994909e-05
## 12657    2 66780 2.994909e-05
## 12658    2 66780 2.994909e-05
## 12659    2 66780 2.994909e-05
## 12660    2 66780 2.994909e-05
## 12661    2 66780 2.994909e-05
## 12662    2 66780 2.994909e-05
## 12663    2 66780 2.994909e-05
## 12664    2 66780 2.994909e-05
## 12665    2 66780 2.994909e-05
## 12666    2 66780 2.994909e-05
## 12667    2 66780 2.994909e-05
## 12668    2 66780 2.994909e-05
## 12669    2 66780 2.994909e-05
## 12670    2 66780 2.994909e-05
## 12671    2 66780 2.994909e-05
## 12672    2 66780 2.994909e-05
## 12673    2 66780 2.994909e-05
## 12674    2 66780 2.994909e-05
## 12675    2 66780 2.994909e-05
## 12676    2 66780 2.994909e-05
## 12677    2 66780 2.994909e-05
## 12678    2 66780 2.994909e-05
## 12679    2 66780 2.994909e-05
## 12680    2 66780 2.994909e-05
## 12681    2 66780 2.994909e-05
## 12682    2 66780 2.994909e-05
## 12683    2 66780 2.994909e-05
## 12684    2 66780 2.994909e-05
## 12685    2 66780 2.994909e-05
## 12686    2 66780 2.994909e-05
## 12687    2 66780 2.994909e-05
## 12688    2 66780 2.994909e-05
## 12689    2 66780 2.994909e-05
## 12690    2 66780 2.994909e-05
## 12691    2 66780 2.994909e-05
## 12692    2 66780 2.994909e-05
## 12693    2 66780 2.994909e-05
## 12694    2 66780 2.994909e-05
## 12695    2 66780 2.994909e-05
## 12696    2 66780 2.994909e-05
## 12697    2 66780 2.994909e-05
## 12698    2 66780 2.994909e-05
## 12699    2 66780 2.994909e-05
## 12700    2 66780 2.994909e-05
## 12701    2 66780 2.994909e-05
## 12702    2 66780 2.994909e-05
## 12703    2 66780 2.994909e-05
## 12704    2 66780 2.994909e-05
## 12705    2 66780 2.994909e-05
## 12706    2 66780 2.994909e-05
## 12707    2 66780 2.994909e-05
## 12708    2 66780 2.994909e-05
## 12709    2 66780 2.994909e-05
## 12710    2 66780 2.994909e-05
## 12711    2 66780 2.994909e-05
## 12712    2 66780 2.994909e-05
## 12713    2 66780 2.994909e-05
## 12714    2 66780 2.994909e-05
## 12715    2 66780 2.994909e-05
## 12716    2 66780 2.994909e-05
## 12717    2 66780 2.994909e-05
## 12718    2 66780 2.994909e-05
## 12719    2 66780 2.994909e-05
## 12720    2 66780 2.994909e-05
## 12721    2 66780 2.994909e-05
## 12722    2 66780 2.994909e-05
## 12723    2 66780 2.994909e-05
## 12724    2 66780 2.994909e-05
## 12725    2 66780 2.994909e-05
## 12726    2 66780 2.994909e-05
## 12727    2 66780 2.994909e-05
## 12728    2 66780 2.994909e-05
## 12729    2 66780 2.994909e-05
## 12730    2 66780 2.994909e-05
## 12731    2 66780 2.994909e-05
## 12732    2 66780 2.994909e-05
## 12733    2 66780 2.994909e-05
## 12734    2 66780 2.994909e-05
## 12735    2 66780 2.994909e-05
## 12736    2 66780 2.994909e-05
## 12737    2 66780 2.994909e-05
## 12738    2 66780 2.994909e-05
## 12739    2 66780 2.994909e-05
## 12740    2 66780 2.994909e-05
## 12741    2 66780 2.994909e-05
## 12742    2 66780 2.994909e-05
## 12743    2 66780 2.994909e-05
## 12744    2 66780 2.994909e-05
## 12745    2 66780 2.994909e-05
## 12746    2 66780 2.994909e-05
## 12747    2 66780 2.994909e-05
## 12748    2 66780 2.994909e-05
## 12749    2 66780 2.994909e-05
## 12750    2 66780 2.994909e-05
## 12751    2 66780 2.994909e-05
## 12752    2 66780 2.994909e-05
## 12753    2 66780 2.994909e-05
## 12754    2 66780 2.994909e-05
## 12755    2 66780 2.994909e-05
## 12756    2 66780 2.994909e-05
## 12757    2 66780 2.994909e-05
## 12758    2 66780 2.994909e-05
## 12759    2 66780 2.994909e-05
## 12760    2 66780 2.994909e-05
## 12761    2 66780 2.994909e-05
## 12762    2 66780 2.994909e-05
## 12763    2 66780 2.994909e-05
## 12764    2 66780 2.994909e-05
## 12765    2 66780 2.994909e-05
## 12766    2 66780 2.994909e-05
## 12767    2 66780 2.994909e-05
## 12768    2 66780 2.994909e-05
## 12769    2 66780 2.994909e-05
## 12770    2 66780 2.994909e-05
## 12771    2 66780 2.994909e-05
## 12772    2 66780 2.994909e-05
## 12773    2 66780 2.994909e-05
## 12774    2 66780 2.994909e-05
## 12775    2 66780 2.994909e-05
## 12776    2 66780 2.994909e-05
## 12777    2 66780 2.994909e-05
## 12778    2 66780 2.994909e-05
## 12779    2 66780 2.994909e-05
## 12780    2 66780 2.994909e-05
## 12781    2 66780 2.994909e-05
## 12782    2 66780 2.994909e-05
## 12783    2 66780 2.994909e-05
## 12784    2 66780 2.994909e-05
## 12785    2 66780 2.994909e-05
## 12786    2 66780 2.994909e-05
## 12787    2 66780 2.994909e-05
## 12788    2 66780 2.994909e-05
## 12789    2 66780 2.994909e-05
## 12790    2 66780 2.994909e-05
## 12791    2 66780 2.994909e-05
## 12792    2 66780 2.994909e-05
## 12793    2 66780 2.994909e-05
## 12794    2 66780 2.994909e-05
## 12795    2 66780 2.994909e-05
## 12796    2 66780 2.994909e-05
## 12797    2 66780 2.994909e-05
## 12798    2 66780 2.994909e-05
## 12799    2 66780 2.994909e-05
## 12800    2 66780 2.994909e-05
## 12801    2 66780 2.994909e-05
## 12802    2 66780 2.994909e-05
## 12803    2 66780 2.994909e-05
## 12804    2 66780 2.994909e-05
## 12805    2 66780 2.994909e-05
## 12806    2 66780 2.994909e-05
## 12807    2 66780 2.994909e-05
## 12808    2 66780 2.994909e-05
## 12809    2 66780 2.994909e-05
## 12810    2 66780 2.994909e-05
## 12811    2 66780 2.994909e-05
## 12812    2 66780 2.994909e-05
## 12813    2 66780 2.994909e-05
## 12814    2 66780 2.994909e-05
## 12815    2 66780 2.994909e-05
## 12816    2 66780 2.994909e-05
## 12817    2 66780 2.994909e-05
## 12818    2 66780 2.994909e-05
## 12819    2 66780 2.994909e-05
## 12820    2 66780 2.994909e-05
## 12821    2 66780 2.994909e-05
## 12822    2 66780 2.994909e-05
## 12823    2 66780 2.994909e-05
## 12824    2 66780 2.994909e-05
## 12825    2 66780 2.994909e-05
## 12826    2 66780 2.994909e-05
## 12827    2 66780 2.994909e-05
## 12828    2 66780 2.994909e-05
## 12829    2 66780 2.994909e-05
## 12830    2 66780 2.994909e-05
## 12831    2 66780 2.994909e-05
## 12832    2 66780 2.994909e-05
## 12833    2 66780 2.994909e-05
## 12834    2 66780 2.994909e-05
## 12835    2 66780 2.994909e-05
## 12836    2 66780 2.994909e-05
## 12837    2 66780 2.994909e-05
## 12838    2 66780 2.994909e-05
## 12839    2 66780 2.994909e-05
## 12840    2 66780 2.994909e-05
## 12841    2 66780 2.994909e-05
## 12842    2 66780 2.994909e-05
## 12843    2 66780 2.994909e-05
## 12844    2 66780 2.994909e-05
## 12845    2 66780 2.994909e-05
## 12846    2 66780 2.994909e-05
## 12847    2 66780 2.994909e-05
## 12848    2 66780 2.994909e-05
## 12849    2 66780 2.994909e-05
## 12850    2 66780 2.994909e-05
## 12851    2 66780 2.994909e-05
## 12852    2 66780 2.994909e-05
## 12853    2 66780 2.994909e-05
## 12854    2 66780 2.994909e-05
## 12855    2 66780 2.994909e-05
## 12856    2 66780 2.994909e-05
## 12857    2 66780 2.994909e-05
## 12858    2 66780 2.994909e-05
## 12859    2 66780 2.994909e-05
## 12860    2 66780 2.994909e-05
## 12861    2 66780 2.994909e-05
## 12862    2 66780 2.994909e-05
## 12863    2 66780 2.994909e-05
## 12864    2 66780 2.994909e-05
## 12865    2 66780 2.994909e-05
## 12866    2 66780 2.994909e-05
## 12867    2 66780 2.994909e-05
## 12868    2 66780 2.994909e-05
## 12869    2 66780 2.994909e-05
## 12870    2 66780 2.994909e-05
## 12871    2 66780 2.994909e-05
## 12872    2 66780 2.994909e-05
## 12873    2 66780 2.994909e-05
## 12874    2 66780 2.994909e-05
## 12875    2 66780 2.994909e-05
## 12876    2 66780 2.994909e-05
## 12877    2 66780 2.994909e-05
## 12878    2 66780 2.994909e-05
## 12879    2 66780 2.994909e-05
## 12880    2 66780 2.994909e-05
## 12881    2 66780 2.994909e-05
## 12882    2 66780 2.994909e-05
## 12883    2 66780 2.994909e-05
## 12884    2 66780 2.994909e-05
## 12885    2 66780 2.994909e-05
## 12886    2 66780 2.994909e-05
## 12887    2 66780 2.994909e-05
## 12888    2 66780 2.994909e-05
## 12889    2 66780 2.994909e-05
## 12890    2 66780 2.994909e-05
## 12891    2 66780 2.994909e-05
## 12892    2 66780 2.994909e-05
## 12893    2 66780 2.994909e-05
## 12894    2 66780 2.994909e-05
## 12895    2 66780 2.994909e-05
## 12896    2 66780 2.994909e-05
## 12897    2 66780 2.994909e-05
## 12898    2 66780 2.994909e-05
## 12899    2 66780 2.994909e-05
## 12900    2 66780 2.994909e-05
## 12901    2 66780 2.994909e-05
## 12902    2 66780 2.994909e-05
## 12903    2 66780 2.994909e-05
## 12904    2 66780 2.994909e-05
## 12905    2 66780 2.994909e-05
## 12906    2 66780 2.994909e-05
## 12907    2 66780 2.994909e-05
## 12908    2 66780 2.994909e-05
## 12909    2 66780 2.994909e-05
## 12910    2 66780 2.994909e-05
## 12911    2 66780 2.994909e-05
## 12912    2 66780 2.994909e-05
## 12913    2 66780 2.994909e-05
## 12914    2 66780 2.994909e-05
## 12915    2 66780 2.994909e-05
## 12916    2 66780 2.994909e-05
## 12917    2 66780 2.994909e-05
## 12918    2 66780 2.994909e-05
## 12919    2 66780 2.994909e-05
## 12920    2 66780 2.994909e-05
## 12921    2 66780 2.994909e-05
## 12922    2 66780 2.994909e-05
## 12923    2 66780 2.994909e-05
## 12924    2 66780 2.994909e-05
## 12925    2 66780 2.994909e-05
## 12926    2 66780 2.994909e-05
## 12927    2 66780 2.994909e-05
## 12928    2 66780 2.994909e-05
## 12929    2 66780 2.994909e-05
## 12930    2 66780 2.994909e-05
## 12931    2 66780 2.994909e-05
## 12932    2 66780 2.994909e-05
## 12933    2 66780 2.994909e-05
## 12934    2 66780 2.994909e-05
## 12935    2 66780 2.994909e-05
## 12936    2 66780 2.994909e-05
## 12937    2 66780 2.994909e-05
## 12938    2 66780 2.994909e-05
## 12939    2 66780 2.994909e-05
## 12940    2 66780 2.994909e-05
## 12941    2 66780 2.994909e-05
## 12942    2 66780 2.994909e-05
## 12943    2 66780 2.994909e-05
## 12944    2 66780 2.994909e-05
## 12945    2 66780 2.994909e-05
## 12946    2 66780 2.994909e-05
## 12947    2 66780 2.994909e-05
## 12948    2 66780 2.994909e-05
## 12949    2 66780 2.994909e-05
## 12950    2 66780 2.994909e-05
## 12951    2 66780 2.994909e-05
## 12952    2 66780 2.994909e-05
## 12953    2 66780 2.994909e-05
## 12954    2 66780 2.994909e-05
## 12955    2 66780 2.994909e-05
## 12956    2 66780 2.994909e-05
## 12957    2 66780 2.994909e-05
## 12958    2 66780 2.994909e-05
## 12959    2 66780 2.994909e-05
## 12960    2 66780 2.994909e-05
## 12961    2 66780 2.994909e-05
## 12962    2 66780 2.994909e-05
## 12963    2 66780 2.994909e-05
## 12964    2 66780 2.994909e-05
## 12965    2 66780 2.994909e-05
## 12966    2 66780 2.994909e-05
## 12967    2 66780 2.994909e-05
## 12968    2 66780 2.994909e-05
## 12969    2 66780 2.994909e-05
## 12970    2 66780 2.994909e-05
## 12971    2 66780 2.994909e-05
## 12972    2 66780 2.994909e-05
## 12973    2 66780 2.994909e-05
## 12974    2 66780 2.994909e-05
## 12975    2 66780 2.994909e-05
## 12976    2 66780 2.994909e-05
## 12977    2 66780 2.994909e-05
## 12978    2 66780 2.994909e-05
## 12979    2 66780 2.994909e-05
## 12980    2 66780 2.994909e-05
## 12981    2 66780 2.994909e-05
## 12982    2 66780 2.994909e-05
## 12983    2 66780 2.994909e-05
## 12984    2 66780 2.994909e-05
## 12985    2 66780 2.994909e-05
## 12986    2 66780 2.994909e-05
## 12987    2 66780 2.994909e-05
## 12988    2 66780 2.994909e-05
## 12989    2 66780 2.994909e-05
## 12990    2 66780 2.994909e-05
## 12991    2 66780 2.994909e-05
## 12992    2 66780 2.994909e-05
## 12993    2 66780 2.994909e-05
## 12994    2 66780 2.994909e-05
## 12995    2 66780 2.994909e-05
## 12996    2 66780 2.994909e-05
## 12997    2 66780 2.994909e-05
## 12998    2 66780 2.994909e-05
## 12999    2 66780 2.994909e-05
## 13000    2 66780 2.994909e-05
## 13001    2 66780 2.994909e-05
## 13002    2 66780 2.994909e-05
## 13003    2 66780 2.994909e-05
## 13004    2 66780 2.994909e-05
## 13005    2 66780 2.994909e-05
## 13006    2 66780 2.994909e-05
## 13007    2 66780 2.994909e-05
## 13008    2 66780 2.994909e-05
## 13009    2 66780 2.994909e-05
## 13010    2 66780 2.994909e-05
## 13011    2 66780 2.994909e-05
## 13012    2 66780 2.994909e-05
## 13013    2 66780 2.994909e-05
## 13014    2 66780 2.994909e-05
## 13015    2 66780 2.994909e-05
## 13016    2 66780 2.994909e-05
## 13017    2 66780 2.994909e-05
## 13018    2 66780 2.994909e-05
## 13019    2 66780 2.994909e-05
## 13020    2 66780 2.994909e-05
## 13021    2 66780 2.994909e-05
## 13022    2 66780 2.994909e-05
## 13023    2 66780 2.994909e-05
## 13024    2 66780 2.994909e-05
## 13025    2 66780 2.994909e-05
## 13026    2 66780 2.994909e-05
## 13027    2 66780 2.994909e-05
## 13028    2 66780 2.994909e-05
## 13029    2 66780 2.994909e-05
## 13030    2 66780 2.994909e-05
## 13031    2 66780 2.994909e-05
## 13032    2 66780 2.994909e-05
## 13033    2 66780 2.994909e-05
## 13034    2 66780 2.994909e-05
## 13035    2 66780 2.994909e-05
## 13036    2 66780 2.994909e-05
## 13037    2 66780 2.994909e-05
## 13038    2 66780 2.994909e-05
## 13039    2 66780 2.994909e-05
## 13040    2 66780 2.994909e-05
## 13041    2 66780 2.994909e-05
## 13042    2 66780 2.994909e-05
## 13043    2 66780 2.994909e-05
## 13044    2 66780 2.994909e-05
## 13045    2 66780 2.994909e-05
## 13046    2 66780 2.994909e-05
## 13047    2 66780 2.994909e-05
## 13048    2 66780 2.994909e-05
## 13049    2 66780 2.994909e-05
## 13050    2 66780 2.994909e-05
## 13051    2 66780 2.994909e-05
## 13052    2 66780 2.994909e-05
## 13053    2 66780 2.994909e-05
## 13054    2 66780 2.994909e-05
## 13055    2 66780 2.994909e-05
## 13056    2 66780 2.994909e-05
## 13057    2 66780 2.994909e-05
## 13058    2 66780 2.994909e-05
## 13059    2 66780 2.994909e-05
## 13060    2 66780 2.994909e-05
## 13061    2 66780 2.994909e-05
## 13062    2 66780 2.994909e-05
## 13063    2 66780 2.994909e-05
## 13064    2 66780 2.994909e-05
## 13065    2 66780 2.994909e-05
## 13066    2 66780 2.994909e-05
## 13067    2 66780 2.994909e-05
## 13068    2 66780 2.994909e-05
## 13069    2 66780 2.994909e-05
## 13070    2 66780 2.994909e-05
## 13071    2 66780 2.994909e-05
## 13072    2 66780 2.994909e-05
## 13073    2 66780 2.994909e-05
## 13074    2 66780 2.994909e-05
## 13075    2 66780 2.994909e-05
## 13076    2 66780 2.994909e-05
## 13077    2 66780 2.994909e-05
## 13078    2 66780 2.994909e-05
## 13079    2 66780 2.994909e-05
## 13080    2 66780 2.994909e-05
## 13081    2 66780 2.994909e-05
## 13082    2 66780 2.994909e-05
## 13083    2 66780 2.994909e-05
## 13084    2 66780 2.994909e-05
## 13085    2 66780 2.994909e-05
## 13086    2 66780 2.994909e-05
## 13087    2 66780 2.994909e-05
## 13088    2 66780 2.994909e-05
## 13089    2 66780 2.994909e-05
## 13090    2 66780 2.994909e-05
## 13091    2 66780 2.994909e-05
## 13092    2 66780 2.994909e-05
## 13093    2 66780 2.994909e-05
## 13094    2 66780 2.994909e-05
## 13095    2 66780 2.994909e-05
## 13096    2 66780 2.994909e-05
## 13097    2 66780 2.994909e-05
## 13098    2 66780 2.994909e-05
## 13099    2 66780 2.994909e-05
## 13100    2 66780 2.994909e-05
## 13101    2 66780 2.994909e-05
## 13102    2 66780 2.994909e-05
## 13103    2 66780 2.994909e-05
## 13104    2 66780 2.994909e-05
## 13105    2 66780 2.994909e-05
## 13106    2 66780 2.994909e-05
## 13107    2 66780 2.994909e-05
## 13108    2 66780 2.994909e-05
## 13109    2 66780 2.994909e-05
## 13110    2 66780 2.994909e-05
## 13111    2 66780 2.994909e-05
## 13112    2 66780 2.994909e-05
## 13113    2 66780 2.994909e-05
## 13114    2 66780 2.994909e-05
## 13115    2 66780 2.994909e-05
## 13116    2 66780 2.994909e-05
## 13117    2 66780 2.994909e-05
## 13118    2 66780 2.994909e-05
## 13119    2 66780 2.994909e-05
## 13120    2 66780 2.994909e-05
## 13121    2 66780 2.994909e-05
## 13122    2 66780 2.994909e-05
## 13123    2 66780 2.994909e-05
## 13124    2 66780 2.994909e-05
## 13125    2 66780 2.994909e-05
## 13126    2 66780 2.994909e-05
## 13127    2 66780 2.994909e-05
## 13128    2 66780 2.994909e-05
## 13129    2 66780 2.994909e-05
## 13130    2 66780 2.994909e-05
## 13131    2 66780 2.994909e-05
## 13132    2 66780 2.994909e-05
## 13133    2 66780 2.994909e-05
## 13134    2 66780 2.994909e-05
## 13135    2 66780 2.994909e-05
## 13136    2 66780 2.994909e-05
## 13137    2 66780 2.994909e-05
## 13138    2 66780 2.994909e-05
## 13139    2 66780 2.994909e-05
## 13140    2 66780 2.994909e-05
## 13141    2 66780 2.994909e-05
## 13142    2 66780 2.994909e-05
## 13143    2 66780 2.994909e-05
## 13144    2 66780 2.994909e-05
## 13145    2 66780 2.994909e-05
## 13146    2 66780 2.994909e-05
## 13147    2 66780 2.994909e-05
## 13148    2 66780 2.994909e-05
## 13149    2 66780 2.994909e-05
## 13150    2 66780 2.994909e-05
## 13151    2 66780 2.994909e-05
## 13152    2 66780 2.994909e-05
## 13153    2 66780 2.994909e-05
## 13154    2 66780 2.994909e-05
## 13155    2 66780 2.994909e-05
## 13156    2 66780 2.994909e-05
## 13157    2 66780 2.994909e-05
## 13158    2 66780 2.994909e-05
## 13159    2 66780 2.994909e-05
## 13160    2 66780 2.994909e-05
## 13161    2 66780 2.994909e-05
## 13162    2 66780 2.994909e-05
## 13163    2 66780 2.994909e-05
## 13164    2 66780 2.994909e-05
## 13165    2 66780 2.994909e-05
## 13166    2 66780 2.994909e-05
## 13167    2 66780 2.994909e-05
## 13168    2 66780 2.994909e-05
## 13169    2 66780 2.994909e-05
## 13170    2 66780 2.994909e-05
## 13171    2 66780 2.994909e-05
## 13172    2 66780 2.994909e-05
## 13173    2 66780 2.994909e-05
## 13174    2 66780 2.994909e-05
## 13175    2 66780 2.994909e-05
## 13176    2 66780 2.994909e-05
## 13177    2 66780 2.994909e-05
## 13178    2 66780 2.994909e-05
## 13179    2 66780 2.994909e-05
## 13180    2 66780 2.994909e-05
## 13181    2 66780 2.994909e-05
## 13182    2 66780 2.994909e-05
## 13183    2 66780 2.994909e-05
## 13184    2 66780 2.994909e-05
## 13185    2 66780 2.994909e-05
## 13186    2 66780 2.994909e-05
## 13187    2 66780 2.994909e-05
## 13188    2 66780 2.994909e-05
## 13189    2 66780 2.994909e-05
## 13190    2 66780 2.994909e-05
## 13191    2 66780 2.994909e-05
## 13192    2 66780 2.994909e-05
## 13193    2 66780 2.994909e-05
## 13194    2 66780 2.994909e-05
## 13195    2 66780 2.994909e-05
## 13196    2 66780 2.994909e-05
## 13197    2 66780 2.994909e-05
## 13198    2 66780 2.994909e-05
## 13199    2 66780 2.994909e-05
## 13200    2 66780 2.994909e-05
## 13201    2 66780 2.994909e-05
## 13202    2 66780 2.994909e-05
## 13203    2 66780 2.994909e-05
## 13204    2 66780 2.994909e-05
## 13205    2 66780 2.994909e-05
## 13206    2 66780 2.994909e-05
## 13207    2 66780 2.994909e-05
## 13208    2 66780 2.994909e-05
## 13209    2 66780 2.994909e-05
## 13210    2 66780 2.994909e-05
## 13211    2 66780 2.994909e-05
## 13212    2 66780 2.994909e-05
## 13213    2 66780 2.994909e-05
## 13214    2 66780 2.994909e-05
## 13215    2 66780 2.994909e-05
## 13216    2 66780 2.994909e-05
## 13217    2 66780 2.994909e-05
## 13218    2 66780 2.994909e-05
## 13219    2 66780 2.994909e-05
## 13220    2 66780 2.994909e-05
## 13221    2 66780 2.994909e-05
## 13222    2 66780 2.994909e-05
## 13223    2 66780 2.994909e-05
## 13224    2 66780 2.994909e-05
## 13225    2 66780 2.994909e-05
## 13226    2 66780 2.994909e-05
## 13227    2 66780 2.994909e-05
## 13228    2 66780 2.994909e-05
## 13229    2 66780 2.994909e-05
## 13230    2 66780 2.994909e-05
## 13231    2 66780 2.994909e-05
## 13232    2 66780 2.994909e-05
## 13233    2 66780 2.994909e-05
## 13234    2 66780 2.994909e-05
## 13235    2 66780 2.994909e-05
## 13236    2 66780 2.994909e-05
## 13237    2 66780 2.994909e-05
## 13238    2 66780 2.994909e-05
## 13239    2 66780 2.994909e-05
## 13240    2 66780 2.994909e-05
## 13241    2 66780 2.994909e-05
## 13242    2 66780 2.994909e-05
## 13243    2 66780 2.994909e-05
## 13244    2 66780 2.994909e-05
## 13245    2 66780 2.994909e-05
## 13246    2 66780 2.994909e-05
## 13247    2 66780 2.994909e-05
## 13248    2 66780 2.994909e-05
## 13249    2 66780 2.994909e-05
## 13250    2 66780 2.994909e-05
## 13251    2 66780 2.994909e-05
## 13252    2 66780 2.994909e-05
## 13253    2 66780 2.994909e-05
## 13254    2 66780 2.994909e-05
## 13255    2 66780 2.994909e-05
## 13256    2 66780 2.994909e-05
## 13257    2 66780 2.994909e-05
## 13258    2 66780 2.994909e-05
## 13259    2 66780 2.994909e-05
## 13260    2 66780 2.994909e-05
## 13261    2 66780 2.994909e-05
## 13262    2 66780 2.994909e-05
## 13263    2 66780 2.994909e-05
## 13264    2 66780 2.994909e-05
## 13265    2 66780 2.994909e-05
## 13266    2 66780 2.994909e-05
## 13267    2 66780 2.994909e-05
## 13268    2 66780 2.994909e-05
## 13269    2 66780 2.994909e-05
## 13270    2 66780 2.994909e-05
## 13271    2 66780 2.994909e-05
## 13272    2 66780 2.994909e-05
## 13273    2 66780 2.994909e-05
## 13274    2 66780 2.994909e-05
## 13275    2 66780 2.994909e-05
## 13276    2 66780 2.994909e-05
## 13277    2 66780 2.994909e-05
## 13278    2 66780 2.994909e-05
## 13279    2 66780 2.994909e-05
## 13280    2 66780 2.994909e-05
## 13281    2 66780 2.994909e-05
## 13282    2 66780 2.994909e-05
## 13283    2 66780 2.994909e-05
## 13284    2 66780 2.994909e-05
## 13285    2 66780 2.994909e-05
## 13286    2 66780 2.994909e-05
## 13287    2 66780 2.994909e-05
## 13288    2 66780 2.994909e-05
## 13289    2 66780 2.994909e-05
## 13290    2 66780 2.994909e-05
## 13291    2 66780 2.994909e-05
## 13292    2 66780 2.994909e-05
## 13293    2 66780 2.994909e-05
## 13294    2 66780 2.994909e-05
## 13295    2 66780 2.994909e-05
## 13296    2 66780 2.994909e-05
## 13297    2 66780 2.994909e-05
## 13298    2 66780 2.994909e-05
## 13299    2 66780 2.994909e-05
## 13300    2 66780 2.994909e-05
## 13301    2 66780 2.994909e-05
## 13302    2 66780 2.994909e-05
## 13303    2 66780 2.994909e-05
## 13304    2 66780 2.994909e-05
## 13305    2 66780 2.994909e-05
## 13306    2 66780 2.994909e-05
## 13307    2 66780 2.994909e-05
## 13308    2 66780 2.994909e-05
## 13309    2 66780 2.994909e-05
## 13310    2 66780 2.994909e-05
## 13311    2 66780 2.994909e-05
## 13312    2 66780 2.994909e-05
## 13313    2 66780 2.994909e-05
## 13314    2 66780 2.994909e-05
## 13315    2 66780 2.994909e-05
## 13316    2 66780 2.994909e-05
## 13317    2 66780 2.994909e-05
## 13318    2 66780 2.994909e-05
## 13319    2 66780 2.994909e-05
## 13320    2 66780 2.994909e-05
## 13321    2 66780 2.994909e-05
## 13322    2 66780 2.994909e-05
## 13323    2 66780 2.994909e-05
## 13324    2 66780 2.994909e-05
## 13325    2 66780 2.994909e-05
## 13326    2 66780 2.994909e-05
## 13327    2 66780 2.994909e-05
## 13328    2 66780 2.994909e-05
## 13329    2 66780 2.994909e-05
## 13330    2 66780 2.994909e-05
## 13331    2 66780 2.994909e-05
## 13332    2 66780 2.994909e-05
## 13333    2 65844 3.037483e-05
## 13334    2 65844 3.037483e-05
## 13335    2 65844 3.037483e-05
## 13336    2 65844 3.037483e-05
## 13337    2 65844 3.037483e-05
## 13338    2 65844 3.037483e-05
## 13339    2 65844 3.037483e-05
## 13340    2 65844 3.037483e-05
## 13341    2 65844 3.037483e-05
## 13342    2 65844 3.037483e-05
## 13343    2 65844 3.037483e-05
## 13344    2 65844 3.037483e-05
## 13345    2 65844 3.037483e-05
## 13346    2 65844 3.037483e-05
## 13347    2 65844 3.037483e-05
## 13348    2 65844 3.037483e-05
## 13349    2 65844 3.037483e-05
## 13350    2 65844 3.037483e-05
## 13351    2 65844 3.037483e-05
## 13352    2 65844 3.037483e-05
## 13353    2 65844 3.037483e-05
## 13354    2 65844 3.037483e-05
## 13355    2 65844 3.037483e-05
## 13356    2 65844 3.037483e-05
## 13357    2 65844 3.037483e-05
## 13358    2 65844 3.037483e-05
## 13359    2 65844 3.037483e-05
## 13360    2 65844 3.037483e-05
## 13361    2 65844 3.037483e-05
## 13362    2 65844 3.037483e-05
## 13363    2 65844 3.037483e-05
## 13364    2 65844 3.037483e-05
## 13365    2 65844 3.037483e-05
## 13366    2 65844 3.037483e-05
## 13367    2 65844 3.037483e-05
## 13368    2 65844 3.037483e-05
## 13369    2 65844 3.037483e-05
## 13370    2 65844 3.037483e-05
## 13371    2 65844 3.037483e-05
## 13372    2 65844 3.037483e-05
## 13373    2 65844 3.037483e-05
## 13374    2 65844 3.037483e-05
## 13375    2 65844 3.037483e-05
## 13376    2 65844 3.037483e-05
## 13377    2 65844 3.037483e-05
## 13378    2 65844 3.037483e-05
## 13379    2 65844 3.037483e-05
## 13380    2 65844 3.037483e-05
## 13381    2 65844 3.037483e-05
## 13382    2 65844 3.037483e-05
## 13383    2 65844 3.037483e-05
## 13384    2 65844 3.037483e-05
## 13385    2 65844 3.037483e-05
## 13386    2 65844 3.037483e-05
## 13387    2 65844 3.037483e-05
## 13388    2 65844 3.037483e-05
## 13389    2 65844 3.037483e-05
## 13390    2 65844 3.037483e-05
## 13391    2 65844 3.037483e-05
## 13392    2 65844 3.037483e-05
## 13393    2 65844 3.037483e-05
## 13394    2 65844 3.037483e-05
## 13395    2 65844 3.037483e-05
## 13396    2 65844 3.037483e-05
## 13397    2 65844 3.037483e-05
## 13398    2 65844 3.037483e-05
## 13399    2 65844 3.037483e-05
## 13400    2 65844 3.037483e-05
## 13401    2 65844 3.037483e-05
## 13402    2 65844 3.037483e-05
## 13403    2 65844 3.037483e-05
## 13404    2 65844 3.037483e-05
## 13405    2 65844 3.037483e-05
## 13406    2 65844 3.037483e-05
## 13407    2 65844 3.037483e-05
## 13408    2 65844 3.037483e-05
## 13409    2 65844 3.037483e-05
## 13410    2 65844 3.037483e-05
## 13411    2 65844 3.037483e-05
## 13412    2 65844 3.037483e-05
## 13413    2 65844 3.037483e-05
## 13414    2 65844 3.037483e-05
## 13415    2 65844 3.037483e-05
## 13416    2 65844 3.037483e-05
## 13417    2 65844 3.037483e-05
## 13418    2 65844 3.037483e-05
## 13419    2 65844 3.037483e-05
## 13420    2 65844 3.037483e-05
## 13421    2 65844 3.037483e-05
## 13422    2 65844 3.037483e-05
## 13423    2 65844 3.037483e-05
## 13424    2 65844 3.037483e-05
## 13425    2 65844 3.037483e-05
## 13426    2 65844 3.037483e-05
## 13427    2 65844 3.037483e-05
## 13428    2 65844 3.037483e-05
## 13429    2 65844 3.037483e-05
## 13430    2 65844 3.037483e-05
## 13431    2 65844 3.037483e-05
## 13432    2 65844 3.037483e-05
## 13433    2 65844 3.037483e-05
## 13434    2 65844 3.037483e-05
## 13435    2 65844 3.037483e-05
## 13436    2 65844 3.037483e-05
## 13437    2 65844 3.037483e-05
## 13438    2 65844 3.037483e-05
## 13439    2 65844 3.037483e-05
## 13440    2 65844 3.037483e-05
## 13441    2 65844 3.037483e-05
## 13442    2 65844 3.037483e-05
## 13443    2 65844 3.037483e-05
## 13444    2 65844 3.037483e-05
## 13445    2 65844 3.037483e-05
## 13446    2 65844 3.037483e-05
## 13447    2 65844 3.037483e-05
## 13448    2 65844 3.037483e-05
## 13449    2 65844 3.037483e-05
## 13450    2 65844 3.037483e-05
## 13451    2 65844 3.037483e-05
## 13452    2 65844 3.037483e-05
## 13453    2 65844 3.037483e-05
## 13454    2 65844 3.037483e-05
## 13455    2 65844 3.037483e-05
## 13456    2 65844 3.037483e-05
## 13457    2 65844 3.037483e-05
## 13458    2 65844 3.037483e-05
## 13459    2 65844 3.037483e-05
## 13460    2 65844 3.037483e-05
## 13461    2 65844 3.037483e-05
## 13462    2 65844 3.037483e-05
## 13463    2 65844 3.037483e-05
## 13464    2 65844 3.037483e-05
## 13465    2 65844 3.037483e-05
## 13466    2 65844 3.037483e-05
## 13467    2 65844 3.037483e-05
## 13468    2 65844 3.037483e-05
## 13469    2 65844 3.037483e-05
## 13470    2 65844 3.037483e-05
## 13471    2 65844 3.037483e-05
## 13472    2 65844 3.037483e-05
## 13473    2 65844 3.037483e-05
## 13474    2 65844 3.037483e-05
## 13475    2 65844 3.037483e-05
## 13476    2 65844 3.037483e-05
## 13477    2 65844 3.037483e-05
## 13478    2 65844 3.037483e-05
## 13479    2 65844 3.037483e-05
## 13480    2 65844 3.037483e-05
## 13481    2 65844 3.037483e-05
## 13482    2 65844 3.037483e-05
## 13483    2 65844 3.037483e-05
## 13484    2 65844 3.037483e-05
## 13485    2 65844 3.037483e-05
## 13486    2 65844 3.037483e-05
## 13487    2 65844 3.037483e-05
## 13488    2 65844 3.037483e-05
## 13489    2 65844 3.037483e-05
## 13490    2 65844 3.037483e-05
## 13491    2 65844 3.037483e-05
## 13492    2 65844 3.037483e-05
## 13493    2 65844 3.037483e-05
## 13494    2 65844 3.037483e-05
## 13495    2 65844 3.037483e-05
## 13496    2 65844 3.037483e-05
## 13497    2 65844 3.037483e-05
## 13498    2 65844 3.037483e-05
## 13499    2 65844 3.037483e-05
## 13500    2 65844 3.037483e-05
## 13501    2 65844 3.037483e-05
## 13502    2 65844 3.037483e-05
## 13503    2 65844 3.037483e-05
## 13504    2 65844 3.037483e-05
## 13505    2 65844 3.037483e-05
## 13506    2 65844 3.037483e-05
## 13507    2 65844 3.037483e-05
## 13508    2 65844 3.037483e-05
## 13509    2 65844 3.037483e-05
## 13510    2 65844 3.037483e-05
## 13511    2 65844 3.037483e-05
## 13512    2 65844 3.037483e-05
## 13513    2 65844 3.037483e-05
## 13514    2 65844 3.037483e-05
## 13515    2 65844 3.037483e-05
## 13516    2 65844 3.037483e-05
## 13517    2 65844 3.037483e-05
## 13518    2 65844 3.037483e-05
## 13519    2 65844 3.037483e-05
## 13520    2 65844 3.037483e-05
## 13521    2 65844 3.037483e-05
## 13522    2 65844 3.037483e-05
## 13523    2 65844 3.037483e-05
## 13524    2 65844 3.037483e-05
## 13525    2 65844 3.037483e-05
## 13526    2 65844 3.037483e-05
## 13527    2 65844 3.037483e-05
## 13528    2 65844 3.037483e-05
## 13529    2 65844 3.037483e-05
## 13530    2 65844 3.037483e-05
## 13531    2 65844 3.037483e-05
## 13532    2 65844 3.037483e-05
## 13533    2 65844 3.037483e-05
## 13534    2 65844 3.037483e-05
## 13535    2 65844 3.037483e-05
## 13536    2 65844 3.037483e-05
## 13537    2 65844 3.037483e-05
## 13538    2 65844 3.037483e-05
## 13539    2 65844 3.037483e-05
## 13540    2 65844 3.037483e-05
## 13541    2 65844 3.037483e-05
## 13542    2 65844 3.037483e-05
## 13543    2 65844 3.037483e-05
## 13544    2 65844 3.037483e-05
## 13545    2 65844 3.037483e-05
## 13546    2 65844 3.037483e-05
## 13547    2 65844 3.037483e-05
## 13548    2 65844 3.037483e-05
## 13549    2 65844 3.037483e-05
## 13550    2 65844 3.037483e-05
## 13551    2 65844 3.037483e-05
## 13552    2 65844 3.037483e-05
## 13553    2 65844 3.037483e-05
## 13554    2 65844 3.037483e-05
## 13555    2 65844 3.037483e-05
## 13556    2 65844 3.037483e-05
## 13557    2 65844 3.037483e-05
## 13558    2 65844 3.037483e-05
## 13559    2 65844 3.037483e-05
## 13560    2 65844 3.037483e-05
## 13561    2 65844 3.037483e-05
## 13562    2 65844 3.037483e-05
## 13563    2 65844 3.037483e-05
## 13564    2 65844 3.037483e-05
## 13565    2 65844 3.037483e-05
## 13566    2 65844 3.037483e-05
## 13567    2 65844 3.037483e-05
## 13568    2 65844 3.037483e-05
## 13569    2 65844 3.037483e-05
## 13570    2 65844 3.037483e-05
## 13571    2 65844 3.037483e-05
## 13572    2 65844 3.037483e-05
## 13573    2 65844 3.037483e-05
## 13574    2 65844 3.037483e-05
## 13575    2 65844 3.037483e-05
## 13576    2 65844 3.037483e-05
## 13577    2 65844 3.037483e-05
## 13578    2 65844 3.037483e-05
## 13579    2 65844 3.037483e-05
## 13580    2 65844 3.037483e-05
## 13581    2 65844 3.037483e-05
## 13582    2 65844 3.037483e-05
## 13583    2 65844 3.037483e-05
## 13584    2 65844 3.037483e-05
## 13585    2 65844 3.037483e-05
## 13586    2 65844 3.037483e-05
## 13587    2 65844 3.037483e-05
## 13588    2 65844 3.037483e-05
## 13589    2 65844 3.037483e-05
## 13590    2 65844 3.037483e-05
## 13591    2 65844 3.037483e-05
## 13592    2 65844 3.037483e-05
## 13593    2 65844 3.037483e-05
## 13594    2 65844 3.037483e-05
## 13595    2 65844 3.037483e-05
## 13596    2 65844 3.037483e-05
## 13597    2 65844 3.037483e-05
## 13598    2 65844 3.037483e-05
## 13599    2 65844 3.037483e-05
## 13600    2 65844 3.037483e-05
## 13601    2 65844 3.037483e-05
## 13602    2 65844 3.037483e-05
## 13603    2 65844 3.037483e-05
## 13604    2 65844 3.037483e-05
## 13605    2 65844 3.037483e-05
## 13606    2 65844 3.037483e-05
## 13607    2 65844 3.037483e-05
## 13608    2 65844 3.037483e-05
## 13609    2 65844 3.037483e-05
## 13610    2 65844 3.037483e-05
## 13611    2 65844 3.037483e-05
## 13612    2 65844 3.037483e-05
## 13613    2 65844 3.037483e-05
## 13614    2 65844 3.037483e-05
## 13615    2 65844 3.037483e-05
## 13616    2 65844 3.037483e-05
## 13617    2 65844 3.037483e-05
## 13618    2 65844 3.037483e-05
## 13619    2 65844 3.037483e-05
## 13620    2 65844 3.037483e-05
## 13621    2 65844 3.037483e-05
## 13622    2 65844 3.037483e-05
## 13623    2 65844 3.037483e-05
## 13624    2 65844 3.037483e-05
## 13625    2 65844 3.037483e-05
## 13626    2 65844 3.037483e-05
## 13627    2 65844 3.037483e-05
## 13628    2 65844 3.037483e-05
## 13629    2 65844 3.037483e-05
## 13630    2 65844 3.037483e-05
## 13631    2 65844 3.037483e-05
## 13632    2 65844 3.037483e-05
## 13633    2 65844 3.037483e-05
## 13634    2 65844 3.037483e-05
## 13635    2 65844 3.037483e-05
## 13636    2 65844 3.037483e-05
## 13637    2 65844 3.037483e-05
## 13638    2 65844 3.037483e-05
## 13639    2 65844 3.037483e-05
## 13640    2 65844 3.037483e-05
## 13641    2 65844 3.037483e-05
## 13642    2 65844 3.037483e-05
## 13643    2 65844 3.037483e-05
## 13644    2 65844 3.037483e-05
## 13645    2 65844 3.037483e-05
## 13646    2 65844 3.037483e-05
## 13647    2 65844 3.037483e-05
## 13648    2 65844 3.037483e-05
## 13649    2 65844 3.037483e-05
## 13650    2 65844 3.037483e-05
## 13651    2 65844 3.037483e-05
## 13652    2 65844 3.037483e-05
## 13653    2 65844 3.037483e-05
## 13654    2 65844 3.037483e-05
## 13655    2 65844 3.037483e-05
## 13656    2 65844 3.037483e-05
## 13657    2 65844 3.037483e-05
## 13658    2 65844 3.037483e-05
## 13659    2 65844 3.037483e-05
## 13660    2 65844 3.037483e-05
## 13661    2 65844 3.037483e-05
## 13662    2 65844 3.037483e-05
## 13663    2 65844 3.037483e-05
## 13664    2 65844 3.037483e-05
## 13665    2 65844 3.037483e-05
## 13666    2 65844 3.037483e-05
## 13667    2 65844 3.037483e-05
## 13668    2 65844 3.037483e-05
## 13669    2 65844 3.037483e-05
## 13670    2 65844 3.037483e-05
## 13671    2 65844 3.037483e-05
## 13672    2 65844 3.037483e-05
## 13673    2 65844 3.037483e-05
## 13674    2 65844 3.037483e-05
## 13675    2 65844 3.037483e-05
## 13676    2 65844 3.037483e-05
## 13677    2 65844 3.037483e-05
## 13678    2 65844 3.037483e-05
## 13679    2 65844 3.037483e-05
## 13680    2 65844 3.037483e-05
## 13681    2 65844 3.037483e-05
## 13682    2 65844 3.037483e-05
## 13683    2 65844 3.037483e-05
## 13684    2 65844 3.037483e-05
## 13685    2 65844 3.037483e-05
## 13686    2 65844 3.037483e-05
## 13687    2 65844 3.037483e-05
## 13688    2 65844 3.037483e-05
## 13689    2 65844 3.037483e-05
## 13690    2 65844 3.037483e-05
## 13691    2 65844 3.037483e-05
## 13692    2 65844 3.037483e-05
## 13693    2 65844 3.037483e-05
## 13694    2 65844 3.037483e-05
## 13695    2 65844 3.037483e-05
## 13696    2 65844 3.037483e-05
## 13697    2 65844 3.037483e-05
## 13698    2 65844 3.037483e-05
## 13699    2 65844 3.037483e-05
## 13700    2 65844 3.037483e-05
## 13701    2 65844 3.037483e-05
## 13702    2 65844 3.037483e-05
## 13703    2 65844 3.037483e-05
## 13704    2 65844 3.037483e-05
## 13705    2 65844 3.037483e-05
## 13706    2 65844 3.037483e-05
## 13707    2 65844 3.037483e-05
## 13708    2 65844 3.037483e-05
## 13709    2 65844 3.037483e-05
## 13710    2 65844 3.037483e-05
## 13711    2 65844 3.037483e-05
## 13712    2 65844 3.037483e-05
## 13713    2 65844 3.037483e-05
## 13714    2 65844 3.037483e-05
## 13715    2 65844 3.037483e-05
## 13716    2 65844 3.037483e-05
## 13717    2 65844 3.037483e-05
## 13718    2 65844 3.037483e-05
## 13719    2 65844 3.037483e-05
## 13720    2 65844 3.037483e-05
## 13721    2 65844 3.037483e-05
## 13722    2 65844 3.037483e-05
## 13723    2 65844 3.037483e-05
## 13724    2 65844 3.037483e-05
## 13725    2 65844 3.037483e-05
## 13726    2 65844 3.037483e-05
## 13727    2 65844 3.037483e-05
## 13728    2 65844 3.037483e-05
## 13729    2 65844 3.037483e-05
## 13730    2 65844 3.037483e-05
## 13731    2 65844 3.037483e-05
## 13732    2 65844 3.037483e-05
## 13733    2 65844 3.037483e-05
## 13734    2 65844 3.037483e-05
## 13735    2 65844 3.037483e-05
## 13736    2 65844 3.037483e-05
## 13737    2 65844 3.037483e-05
## 13738    2 65844 3.037483e-05
## 13739    2 65844 3.037483e-05
## 13740    2 65844 3.037483e-05
## 13741    2 65844 3.037483e-05
## 13742    2 65844 3.037483e-05
## 13743    2 65844 3.037483e-05
## 13744    2 65844 3.037483e-05
## 13745    2 65844 3.037483e-05
## 13746    2 65844 3.037483e-05
## 13747    2 65844 3.037483e-05
## 13748    2 65844 3.037483e-05
## 13749    2 65844 3.037483e-05
## 13750    2 65844 3.037483e-05
## 13751    2 65844 3.037483e-05
## 13752    2 65844 3.037483e-05
## 13753    2 65844 3.037483e-05
## 13754    2 65844 3.037483e-05
## 13755    2 65844 3.037483e-05
## 13756    2 65844 3.037483e-05
## 13757    2 65844 3.037483e-05
## 13758    2 65844 3.037483e-05
## 13759    2 65844 3.037483e-05
## 13760    2 65844 3.037483e-05
## 13761    2 65844 3.037483e-05
## 13762    2 65844 3.037483e-05
## 13763    2 65844 3.037483e-05
## 13764    2 65844 3.037483e-05
## 13765    2 65844 3.037483e-05
## 13766    2 65844 3.037483e-05
## 13767    2 65844 3.037483e-05
## 13768    2 65844 3.037483e-05
## 13769    2 65844 3.037483e-05
## 13770    2 65844 3.037483e-05
## 13771    2 65844 3.037483e-05
## 13772    2 65844 3.037483e-05
## 13773    2 65844 3.037483e-05
## 13774    2 65844 3.037483e-05
## 13775    2 65844 3.037483e-05
## 13776    2 65844 3.037483e-05
## 13777    2 65844 3.037483e-05
## 13778    2 65844 3.037483e-05
## 13779    2 65844 3.037483e-05
## 13780    2 65844 3.037483e-05
## 13781    2 65844 3.037483e-05
## 13782    2 65844 3.037483e-05
## 13783    2 65844 3.037483e-05
## 13784    2 65844 3.037483e-05
## 13785    2 65844 3.037483e-05
## 13786    2 65844 3.037483e-05
## 13787    2 65844 3.037483e-05
## 13788    2 65844 3.037483e-05
## 13789    2 65844 3.037483e-05
## 13790    2 65844 3.037483e-05
## 13791    2 65844 3.037483e-05
## 13792    2 65844 3.037483e-05
## 13793    2 65844 3.037483e-05
## 13794    2 65844 3.037483e-05
## 13795    2 65844 3.037483e-05
## 13796    2 65844 3.037483e-05
## 13797    2 65844 3.037483e-05
## 13798    2 65844 3.037483e-05
## 13799    2 65844 3.037483e-05
## 13800    2 65844 3.037483e-05
## 13801    2 65844 3.037483e-05
## 13802    2 65844 3.037483e-05
## 13803    2 65844 3.037483e-05
## 13804    2 65844 3.037483e-05
## 13805    2 65844 3.037483e-05
## 13806    2 65844 3.037483e-05
## 13807    2 65844 3.037483e-05
## 13808    2 65844 3.037483e-05
## 13809    2 65844 3.037483e-05
## 13810    2 65844 3.037483e-05
## 13811    2 65844 3.037483e-05
## 13812    2 65844 3.037483e-05
## 13813    2 65844 3.037483e-05
## 13814    2 65844 3.037483e-05
## 13815    2 65844 3.037483e-05
## 13816    2 65844 3.037483e-05
## 13817    2 65844 3.037483e-05
## 13818    2 65844 3.037483e-05
## 13819    2 65844 3.037483e-05
## 13820    2 65844 3.037483e-05
## 13821    2 65844 3.037483e-05
## 13822    2 65844 3.037483e-05
## 13823    2 65844 3.037483e-05
## 13824    2 65844 3.037483e-05
## 13825    2 65844 3.037483e-05
## 13826    2 65844 3.037483e-05
## 13827    2 65844 3.037483e-05
## 13828    2 65844 3.037483e-05
## 13829    2 65844 3.037483e-05
## 13830    2 65844 3.037483e-05
## 13831    2 65844 3.037483e-05
## 13832    2 65844 3.037483e-05
## 13833    2 65844 3.037483e-05
## 13834    2 65844 3.037483e-05
## 13835    2 65844 3.037483e-05
## 13836    2 65844 3.037483e-05
## 13837    2 65844 3.037483e-05
## 13838    2 65844 3.037483e-05
## 13839    2 65844 3.037483e-05
## 13840    2 65844 3.037483e-05
## 13841    2 65844 3.037483e-05
## 13842    2 65844 3.037483e-05
## 13843    2 65844 3.037483e-05
## 13844    2 65844 3.037483e-05
## 13845    2 65844 3.037483e-05
## 13846    2 65844 3.037483e-05
## 13847    2 65844 3.037483e-05
## 13848    2 65844 3.037483e-05
## 13849    2 65844 3.037483e-05
## 13850    2 65844 3.037483e-05
## 13851    2 65844 3.037483e-05
## 13852    2 65844 3.037483e-05
## 13853    2 65844 3.037483e-05
## 13854    2 65844 3.037483e-05
## 13855    2 65844 3.037483e-05
## 13856    2 65844 3.037483e-05
## 13857    2 65844 3.037483e-05
## 13858    2 65844 3.037483e-05
## 13859    2 65844 3.037483e-05
## 13860    2 65844 3.037483e-05
## 13861    2 65844 3.037483e-05
## 13862    2 65844 3.037483e-05
## 13863    2 65844 3.037483e-05
## 13864    2 65844 3.037483e-05
## 13865    2 65844 3.037483e-05
## 13866    2 65844 3.037483e-05
## 13867    2 65844 3.037483e-05
## 13868    2 65844 3.037483e-05
## 13869    2 65844 3.037483e-05
## 13870    2 65844 3.037483e-05
## 13871    2 65844 3.037483e-05
## 13872    2 65844 3.037483e-05
## 13873    2 65844 3.037483e-05
## 13874    2 65844 3.037483e-05
## 13875    2 65844 3.037483e-05
## 13876    2 65844 3.037483e-05
## 13877    2 65844 3.037483e-05
## 13878    2 65844 3.037483e-05
## 13879    2 65844 3.037483e-05
## 13880    2 65844 3.037483e-05
## 13881    2 65844 3.037483e-05
## 13882    2 65844 3.037483e-05
## 13883    2 65844 3.037483e-05
## 13884    2 65844 3.037483e-05
## 13885    2 65844 3.037483e-05
## 13886    2 65844 3.037483e-05
## 13887    2 65844 3.037483e-05
## 13888    2 65844 3.037483e-05
## 13889    2 65844 3.037483e-05
## 13890    2 65844 3.037483e-05
## 13891    2 65844 3.037483e-05
## 13892    2 65844 3.037483e-05
## 13893    2 65844 3.037483e-05
## 13894    2 65844 3.037483e-05
## 13895    2 65844 3.037483e-05
## 13896    2 65844 3.037483e-05
## 13897    2 65844 3.037483e-05
## 13898    2 65844 3.037483e-05
## 13899    2 65844 3.037483e-05
## 13900    2 65844 3.037483e-05
## 13901    2 65844 3.037483e-05
## 13902    2 65844 3.037483e-05
## 13903    2 65844 3.037483e-05
## 13904    2 65844 3.037483e-05
## 13905    2 65844 3.037483e-05
## 13906    2 65844 3.037483e-05
## 13907    2 65844 3.037483e-05
## 13908    2 65844 3.037483e-05
## 13909    2 65844 3.037483e-05
## 13910    2 65844 3.037483e-05
## 13911    2 65844 3.037483e-05
## 13912    2 65844 3.037483e-05
## 13913    2 65844 3.037483e-05
## 13914    2 65844 3.037483e-05
## 13915    2 65844 3.037483e-05
## 13916    2 65844 3.037483e-05
## 13917    2 65844 3.037483e-05
## 13918    2 65844 3.037483e-05
## 13919    2 65844 3.037483e-05
## 13920    2 65844 3.037483e-05
## 13921    2 65844 3.037483e-05
## 13922    2 65844 3.037483e-05
## 13923    2 65844 3.037483e-05
## 13924    2 65844 3.037483e-05
## 13925    2 65844 3.037483e-05
## 13926    2 65844 3.037483e-05
## 13927    2 65844 3.037483e-05
## 13928    2 65844 3.037483e-05
## 13929    2 65844 3.037483e-05
## 13930    2 65844 3.037483e-05
## 13931    2 65844 3.037483e-05
## 13932    2 65844 3.037483e-05
## 13933    2 65844 3.037483e-05
## 13934    2 65844 3.037483e-05
## 13935    2 65844 3.037483e-05
## 13936    2 65844 3.037483e-05
## 13937    2 65844 3.037483e-05
## 13938    2 65844 3.037483e-05
## 13939    2 65844 3.037483e-05
## 13940    2 65844 3.037483e-05
## 13941    2 65844 3.037483e-05
## 13942    2 65844 3.037483e-05
## 13943    2 65844 3.037483e-05
## 13944    2 65844 3.037483e-05
## 13945    2 65844 3.037483e-05
## 13946    2 65844 3.037483e-05
## 13947    2 65844 3.037483e-05
## 13948    2 65844 3.037483e-05
## 13949    2 65844 3.037483e-05
## 13950    2 65844 3.037483e-05
## 13951    2 65844 3.037483e-05
## 13952    2 65844 3.037483e-05
## 13953    2 65844 3.037483e-05
## 13954    2 65844 3.037483e-05
## 13955    2 65844 3.037483e-05
## 13956    2 65844 3.037483e-05
## 13957    2 65844 3.037483e-05
## 13958    2 65844 3.037483e-05
## 13959    2 65844 3.037483e-05
## 13960    2 65844 3.037483e-05
## 13961    2 65844 3.037483e-05
## 13962    2 65844 3.037483e-05
## 13963    2 65844 3.037483e-05
## 13964    2 65844 3.037483e-05
## 13965    2 65844 3.037483e-05
## 13966    2 65844 3.037483e-05
## 13967    2 65844 3.037483e-05
## 13968    2 65844 3.037483e-05
## 13969    2 65844 3.037483e-05
## 13970    2 65844 3.037483e-05
## 13971    2 65844 3.037483e-05
## 13972    2 65844 3.037483e-05
## 13973    2 65844 3.037483e-05
## 13974    2 65844 3.037483e-05
## 13975    2 65844 3.037483e-05
## 13976    2 65844 3.037483e-05
## 13977    2 65844 3.037483e-05
## 13978    2 65844 3.037483e-05
## 13979    2 65844 3.037483e-05
## 13980    2 65844 3.037483e-05
## 13981    2 65844 3.037483e-05
## 13982    2 65844 3.037483e-05
## 13983    2 65844 3.037483e-05
## 13984    2 65844 3.037483e-05
## 13985    2 65844 3.037483e-05
## 13986    2 65844 3.037483e-05
## 13987    2 65844 3.037483e-05
## 13988    2 65844 3.037483e-05
## 13989    2 65844 3.037483e-05
## 13990    2 65844 3.037483e-05
## 13991    2 65844 3.037483e-05
## 13992    2 65844 3.037483e-05
## 13993    2 65844 3.037483e-05
## 13994    2 65844 3.037483e-05
## 13995    2 65844 3.037483e-05
## 13996    2 65844 3.037483e-05
## 13997    2 65844 3.037483e-05
## 13998    2 65844 3.037483e-05
## 13999    2 65844 3.037483e-05
## 14000    2 65844 3.037483e-05
## 14001    2 65844 3.037483e-05
## 14002    2 65844 3.037483e-05
## 14003    2 65844 3.037483e-05
## 14004    2 65844 3.037483e-05
## 14005    2 65844 3.037483e-05
## 14006    2 65844 3.037483e-05
## 14007    2 65844 3.037483e-05
## 14008    2 65844 3.037483e-05
## 14009    2 65844 3.037483e-05
## 14010    2 65844 3.037483e-05
## 14011    2 65844 3.037483e-05
## 14012    2 65844 3.037483e-05
## 14013    2 65844 3.037483e-05
## 14014    2 65844 3.037483e-05
## 14015    2 65844 3.037483e-05
## 14016    2 65844 3.037483e-05
## 14017    2 65844 3.037483e-05
## 14018    2 65844 3.037483e-05
## 14019    2 65844 3.037483e-05
## 14020    2 65844 3.037483e-05
## 14021    2 65844 3.037483e-05
## 14022    2 65844 3.037483e-05
## 14023    2 65844 3.037483e-05
## 14024    2 65844 3.037483e-05
## 14025    2 65844 3.037483e-05
## 14026    2 65844 3.037483e-05
## 14027    2 65844 3.037483e-05
## 14028    2 65844 3.037483e-05
## 14029    2 65844 3.037483e-05
## 14030    2 65844 3.037483e-05
## 14031    2 65844 3.037483e-05
## 14032    2 65844 3.037483e-05
## 14033    2 65844 3.037483e-05
## 14034    2 65844 3.037483e-05
## 14035    2 65844 3.037483e-05
## 14036    2 65844 3.037483e-05
## 14037    2 65844 3.037483e-05
## 14038    2 65844 3.037483e-05
## 14039    2 65844 3.037483e-05
## 14040    2 65844 3.037483e-05
## 14041    2 65844 3.037483e-05
## 14042    2 65844 3.037483e-05
## 14043    2 65844 3.037483e-05
## 14044    2 65844 3.037483e-05
## 14045    2 65844 3.037483e-05
## 14046    2 65844 3.037483e-05
## 14047    2 65844 3.037483e-05
## 14048    2 65844 3.037483e-05
## 14049    2 65844 3.037483e-05
## 14050    2 65844 3.037483e-05
## 14051    2 65844 3.037483e-05
## 14052    2 65844 3.037483e-05
## 14053    2 65844 3.037483e-05
## 14054    2 65844 3.037483e-05
## 14055    2 65844 3.037483e-05
## 14056    2 65844 3.037483e-05
## 14057    2 65844 3.037483e-05
## 14058    2 65844 3.037483e-05
## 14059    2 65844 3.037483e-05
## 14060    2 65844 3.037483e-05
## 14061    2 65844 3.037483e-05
## 14062    2 65844 3.037483e-05
## 14063    2 65844 3.037483e-05
## 14064    2 65844 3.037483e-05
## 14065    2 65844 3.037483e-05
## 14066    2 65844 3.037483e-05
## 14067    2 65844 3.037483e-05
## 14068    2 65844 3.037483e-05
## 14069    2 65844 3.037483e-05
## 14070    2 65844 3.037483e-05
## 14071    2 65844 3.037483e-05
## 14072    2 65844 3.037483e-05
## 14073    2 65844 3.037483e-05
## 14074    2 65844 3.037483e-05
## 14075    2 65844 3.037483e-05
## 14076    2 65844 3.037483e-05
## 14077    2 65844 3.037483e-05
## 14078    2 65844 3.037483e-05
## 14079    2 65844 3.037483e-05
## 14080    2 65844 3.037483e-05
## 14081    2 65844 3.037483e-05
## 14082    2 65844 3.037483e-05
## 14083    2 65844 3.037483e-05
## 14084    2 65844 3.037483e-05
## 14085    2 65844 3.037483e-05
## 14086    2 65844 3.037483e-05
## 14087    2 65844 3.037483e-05
## 14088    2 65844 3.037483e-05
## 14089    2 65844 3.037483e-05
## 14090    2 65844 3.037483e-05
## 14091    2 65844 3.037483e-05
## 14092    2 65844 3.037483e-05
## 14093    2 65844 3.037483e-05
## 14094    2 65844 3.037483e-05
## 14095    2 65844 3.037483e-05
## 14096    2 65844 3.037483e-05
## 14097    2 65844 3.037483e-05
## 14098    2 65844 3.037483e-05
## 14099    2 65844 3.037483e-05
## 14100    2 65844 3.037483e-05
## 14101    2 65844 3.037483e-05
## 14102    2 65844 3.037483e-05
## 14103    2 65844 3.037483e-05
## 14104    2 65844 3.037483e-05
## 14105    2 65844 3.037483e-05
## 14106    2 65844 3.037483e-05
## 14107    2 65844 3.037483e-05
## 14108    2 65844 3.037483e-05
## 14109    2 65844 3.037483e-05
## 14110    2 65844 3.037483e-05
## 14111    2 65844 3.037483e-05
## 14112    2 65844 3.037483e-05
## 14113    2 65844 3.037483e-05
## 14114    2 65844 3.037483e-05
## 14115    2 65844 3.037483e-05
## 14116    2 65844 3.037483e-05
## 14117    2 65844 3.037483e-05
## 14118    2 65844 3.037483e-05
## 14119    2 65844 3.037483e-05
## 14120    2 65844 3.037483e-05
## 14121    2 65844 3.037483e-05
## 14122    2 65844 3.037483e-05
## 14123    2 65844 3.037483e-05
## 14124    2 65844 3.037483e-05
## 14125    2 65844 3.037483e-05
## 14126    2 65844 3.037483e-05
## 14127    2 65844 3.037483e-05
## 14128    2 65844 3.037483e-05
## 14129    2 65844 3.037483e-05
## 14130    2 65844 3.037483e-05
## 14131    2 65844 3.037483e-05
## 14132    2 65844 3.037483e-05
## 14133    2 65844 3.037483e-05
## 14134    2 65844 3.037483e-05
## 14135    2 65844 3.037483e-05
## 14136    2 65844 3.037483e-05
## 14137    2 65844 3.037483e-05
## 14138    2 65844 3.037483e-05
## 14139    2 65844 3.037483e-05
## 14140    2 65844 3.037483e-05
## 14141    2 65844 3.037483e-05
## 14142    2 65844 3.037483e-05
## 14143    2 65844 3.037483e-05
## 14144    2 65844 3.037483e-05
## 14145    2 65844 3.037483e-05
## 14146    2 65844 3.037483e-05
## 14147    2 65844 3.037483e-05
## 14148    2 65844 3.037483e-05
## 14149    2 65844 3.037483e-05
## 14150    2 65844 3.037483e-05
## 14151    2 65844 3.037483e-05
## 14152    2 65844 3.037483e-05
## 14153    2 65844 3.037483e-05
## 14154    2 65844 3.037483e-05
## 14155    2 65844 3.037483e-05
## 14156    2 65844 3.037483e-05
## 14157    2 65844 3.037483e-05
## 14158    2 65844 3.037483e-05
## 14159    2 65844 3.037483e-05
## 14160    2 65844 3.037483e-05
## 14161    2 65844 3.037483e-05
## 14162    2 65844 3.037483e-05
## 14163    2 65844 3.037483e-05
## 14164    2 65844 3.037483e-05
## 14165    2 65844 3.037483e-05
## 14166    2 65844 3.037483e-05
## 14167    2 65844 3.037483e-05
## 14168    2 65844 3.037483e-05
## 14169    2 65844 3.037483e-05
## 14170    2 65844 3.037483e-05
## 14171    2 65844 3.037483e-05
## 14172    2 65844 3.037483e-05
## 14173    2 65844 3.037483e-05
## 14174    2 65844 3.037483e-05
## 14175    2 65844 3.037483e-05
## 14176    2 65844 3.037483e-05
## 14177    2 65844 3.037483e-05
## 14178    2 65844 3.037483e-05
## 14179    2 65844 3.037483e-05
## 14180    2 65844 3.037483e-05
## 14181    2 65844 3.037483e-05
## 14182    2 65844 3.037483e-05
## 14183    2 65844 3.037483e-05
## 14184    2 65844 3.037483e-05
## 14185    2 65844 3.037483e-05
## 14186    2 65844 3.037483e-05
## 14187    2 65844 3.037483e-05
## 14188    2 65844 3.037483e-05
## 14189    2 65844 3.037483e-05
## 14190    2 65844 3.037483e-05
## 14191    2 65844 3.037483e-05
## 14192    2 65844 3.037483e-05
## 14193    2 65844 3.037483e-05
## 14194    2 65844 3.037483e-05
## 14195    2 65844 3.037483e-05
## 14196    2 65844 3.037483e-05
## 14197    2 65844 3.037483e-05
## 14198    2 65844 3.037483e-05
## 14199    2 65844 3.037483e-05
## 14200    2 65844 3.037483e-05
## 14201    2 65844 3.037483e-05
## 14202    2 65844 3.037483e-05
## 14203    2 65844 3.037483e-05
## 14204    2 65844 3.037483e-05
## 14205    2 65844 3.037483e-05
## 14206    2 65844 3.037483e-05
## 14207    2 65844 3.037483e-05
## 14208    2 65844 3.037483e-05
## 14209    2 65844 3.037483e-05
## 14210    2 65844 3.037483e-05
## 14211    2 65844 3.037483e-05
## 14212    2 65844 3.037483e-05
## 14213    2 65844 3.037483e-05
## 14214    2 65844 3.037483e-05
## 14215    2 65844 3.037483e-05
## 14216    2 65844 3.037483e-05
## 14217    2 65844 3.037483e-05
## 14218    2 65844 3.037483e-05
## 14219    2 65844 3.037483e-05
## 14220    2 65844 3.037483e-05
## 14221    2 65844 3.037483e-05
## 14222    2 65844 3.037483e-05
## 14223    2 65844 3.037483e-05
## 14224    2 65844 3.037483e-05
## 14225    2 65844 3.037483e-05
## 14226    2 65844 3.037483e-05
## 14227    2 65844 3.037483e-05
## 14228    2 65844 3.037483e-05
## 14229    2 65844 3.037483e-05
## 14230    2 65844 3.037483e-05
## 14231    2 65844 3.037483e-05
## 14232    2 65844 3.037483e-05
## 14233    2 65844 3.037483e-05
## 14234    2 65844 3.037483e-05
## 14235    2 65844 3.037483e-05
## 14236    2 65844 3.037483e-05
## 14237    2 65844 3.037483e-05
## 14238    2 65844 3.037483e-05
## 14239    2 65844 3.037483e-05
## 14240    2 65844 3.037483e-05
## 14241    2 65844 3.037483e-05
## 14242    2 65844 3.037483e-05
## 14243    2 65844 3.037483e-05
## 14244    2 65844 3.037483e-05
## 14245    2 65844 3.037483e-05
## 14246    2 65844 3.037483e-05
## 14247    2 65844 3.037483e-05
## 14248    2 65844 3.037483e-05
## 14249    2 65844 3.037483e-05
## 14250    2 65844 3.037483e-05
## 14251    2 65844 3.037483e-05
## 14252    2 65844 3.037483e-05
## 14253    2 65844 3.037483e-05
## 14254    2 65844 3.037483e-05
## 14255    2 65844 3.037483e-05
## 14256    2 65844 3.037483e-05
## 14257    2 65844 3.037483e-05
## 14258    2 65844 3.037483e-05
## 14259    2 65844 3.037483e-05
## 14260    2 65844 3.037483e-05
## 14261    2 65844 3.037483e-05
## 14262    2 65844 3.037483e-05
## 14263    2 65844 3.037483e-05
## 14264    2 65844 3.037483e-05
## 14265    2 65844 3.037483e-05
## 14266    2 65844 3.037483e-05
## 14267    2 65844 3.037483e-05
## 14268    2 65844 3.037483e-05
## 14269    2 65844 3.037483e-05
## 14270    2 65844 3.037483e-05
## 14271    2 65844 3.037483e-05
## 14272    2 65844 3.037483e-05
## 14273    2 65844 3.037483e-05
## 14274    2 65844 3.037483e-05
## 14275    2 65844 3.037483e-05
## 14276    2 65844 3.037483e-05
## 14277    2 65844 3.037483e-05
## 14278    2 65844 3.037483e-05
## 14279    2 65844 3.037483e-05
## 14280    2 65844 3.037483e-05
## 14281    2 65844 3.037483e-05
## 14282    2 65844 3.037483e-05
## 14283    2 65844 3.037483e-05
## 14284    2 65844 3.037483e-05
## 14285    2 65844 3.037483e-05
## 14286    2 65844 3.037483e-05
## 14287    2 65844 3.037483e-05
## 14288    2 65844 3.037483e-05
## 14289    2 65844 3.037483e-05
## 14290    2 65844 3.037483e-05
## 14291    2 65844 3.037483e-05
## 14292    2 65844 3.037483e-05
## 14293    2 65844 3.037483e-05
## 14294    2 65844 3.037483e-05
## 14295    2 65844 3.037483e-05
## 14296    2 65844 3.037483e-05
## 14297    2 65844 3.037483e-05
## 14298    2 65844 3.037483e-05
## 14299    2 65844 3.037483e-05
## 14300    2 65844 3.037483e-05
## 14301    2 65844 3.037483e-05
## 14302    2 65844 3.037483e-05
## 14303    2 65844 3.037483e-05
## 14304    2 65844 3.037483e-05
## 14305    2 65844 3.037483e-05
## 14306    2 65844 3.037483e-05
## 14307    2 65844 3.037483e-05
## 14308    2 65844 3.037483e-05
## 14309    2 65844 3.037483e-05
## 14310    2 65844 3.037483e-05
## 14311    2 65844 3.037483e-05
## 14312    2 65844 3.037483e-05
## 14313    2 65844 3.037483e-05
## 14314    2 65844 3.037483e-05
## 14315    2 65844 3.037483e-05
## 14316    2 65844 3.037483e-05
## 14317    2 65844 3.037483e-05
## 14318    2 65844 3.037483e-05
## 14319    2 65844 3.037483e-05
## 14320    2 65844 3.037483e-05
## 14321    2 65844 3.037483e-05
## 14322    2 65844 3.037483e-05
## 14323    2 65844 3.037483e-05
## 14324    2 65844 3.037483e-05
## 14325    2 65844 3.037483e-05
## 14326    2 65844 3.037483e-05
## 14327    2 65844 3.037483e-05
## 14328    2 65844 3.037483e-05
## 14329    2 65844 3.037483e-05
## 14330    2 65844 3.037483e-05
## 14331    2 65844 3.037483e-05
## 14332    2 65844 3.037483e-05
## 14333    2 65844 3.037483e-05
## 14334    2 65844 3.037483e-05
## 14335    2 65844 3.037483e-05
## 14336    2 65844 3.037483e-05
## 14337    2 65844 3.037483e-05
## 14338    2 65844 3.037483e-05
## 14339    2 65844 3.037483e-05
## 14340    2 65844 3.037483e-05
## 14341    2 65844 3.037483e-05
## 14342    2 65844 3.037483e-05
## 14343    2 65844 3.037483e-05
## 14344    2 65844 3.037483e-05
## 14345    2 65844 3.037483e-05
## 14346    2 65844 3.037483e-05
## 14347    2 65844 3.037483e-05
## 14348    2 65844 3.037483e-05
## 14349    2 65844 3.037483e-05
## 14350    2 65844 3.037483e-05
## 14351    2 65844 3.037483e-05
## 14352    2 65844 3.037483e-05
## 14353    2 65844 3.037483e-05
## 14354    2 65844 3.037483e-05
## 14355    2 65844 3.037483e-05
## 14356    2 65844 3.037483e-05
## 14357    2 65844 3.037483e-05
## 14358    2 65844 3.037483e-05
## 14359    2 65844 3.037483e-05
## 14360    2 65844 3.037483e-05
## 14361    2 65844 3.037483e-05
## 14362    2 65844 3.037483e-05
## 14363    2 65844 3.037483e-05
## 14364    2 65844 3.037483e-05
## 14365    2 65844 3.037483e-05
## 14366    2 65844 3.037483e-05
## 14367    2 65844 3.037483e-05
## 14368    2 65844 3.037483e-05
## 14369    2 65844 3.037483e-05
## 14370    2 65844 3.037483e-05
## 14371    2 65844 3.037483e-05
## 14372    2 65844 3.037483e-05
## 14373    2 65844 3.037483e-05
## 14374    2 65844 3.037483e-05
## 14375    2 65844 3.037483e-05
## 14376    2 65844 3.037483e-05
## 14377    2 65844 3.037483e-05
## 14378    2 65844 3.037483e-05
## 14379    2 65844 3.037483e-05
## 14380    2 65844 3.037483e-05
## 14381    2 65844 3.037483e-05
## 14382    2 65844 3.037483e-05
## 14383    2 65844 3.037483e-05
## 14384    2 65844 3.037483e-05
## 14385    2 65844 3.037483e-05
## 14386    2 65844 3.037483e-05
## 14387    2 65844 3.037483e-05
## 14388    2 65844 3.037483e-05
## 14389    2 65844 3.037483e-05
## 14390    2 65844 3.037483e-05
## 14391    2 65844 3.037483e-05
## 14392    2 65844 3.037483e-05
## 14393    2 65844 3.037483e-05
## 14394    2 65844 3.037483e-05
## 14395    2 65844 3.037483e-05
## 14396    2 65844 3.037483e-05
## 14397    2 65844 3.037483e-05
## 14398    2 65844 3.037483e-05
## 14399    2 65844 3.037483e-05
## 14400    2 65844 3.037483e-05
## 14401    2 65844 3.037483e-05
## 14402    2 65844 3.037483e-05
## 14403    2 65844 3.037483e-05
## 14404    2 65844 3.037483e-05
## 14405    2 65844 3.037483e-05
## 14406    2 65844 3.037483e-05
## 14407    2 65844 3.037483e-05
## 14408    2 65844 3.037483e-05
## 14409    2 65844 3.037483e-05
## 14410    2 65844 3.037483e-05
## 14411    2 65844 3.037483e-05
## 14412    2 65844 3.037483e-05
## 14413    2 65844 3.037483e-05
## 14414    2 65844 3.037483e-05
## 14415    2 65844 3.037483e-05
## 14416    2 65844 3.037483e-05
## 14417    2 65844 3.037483e-05
## 14418    2 65844 3.037483e-05
## 14419    2 65844 3.037483e-05
## 14420    2 65844 3.037483e-05
## 14421    2 65844 3.037483e-05
## 14422    2 65844 3.037483e-05
## 14423    2 65844 3.037483e-05
## 14424    2 65844 3.037483e-05
## 14425    2 65844 3.037483e-05
## 14426    2 65844 3.037483e-05
## 14427    2 65844 3.037483e-05
## 14428    2 65844 3.037483e-05
## 14429    2 65844 3.037483e-05
## 14430    2 65844 3.037483e-05
## 14431    2 65844 3.037483e-05
## 14432    2 65844 3.037483e-05
## 14433    2 65844 3.037483e-05
## 14434    2 65844 3.037483e-05
## 14435    2 65844 3.037483e-05
## 14436    2 65844 3.037483e-05
## 14437    2 65844 3.037483e-05
## 14438    2 65844 3.037483e-05
## 14439    2 65844 3.037483e-05
## 14440    2 65844 3.037483e-05
## 14441    2 65844 3.037483e-05
## 14442    2 65844 3.037483e-05
## 14443    2 65844 3.037483e-05
## 14444    2 65844 3.037483e-05
## 14445    2 65844 3.037483e-05
## 14446    2 65844 3.037483e-05
## 14447    2 65844 3.037483e-05
## 14448    2 65844 3.037483e-05
## 14449    2 65844 3.037483e-05
## 14450    2 65844 3.037483e-05
## 14451    2 65844 3.037483e-05
## 14452    2 65844 3.037483e-05
## 14453    2 65844 3.037483e-05
## 14454    2 65844 3.037483e-05
## 14455    2 65844 3.037483e-05
## 14456    2 65844 3.037483e-05
## 14457    2 65844 3.037483e-05
## 14458    2 65844 3.037483e-05
## 14459    2 65844 3.037483e-05
## 14460    2 65844 3.037483e-05
## 14461    2 65844 3.037483e-05
## 14462    2 65844 3.037483e-05
## 14463    2 65844 3.037483e-05
## 14464    2 65844 3.037483e-05
## 14465    2 65844 3.037483e-05
## 14466    2 65844 3.037483e-05
## 14467    2 65844 3.037483e-05
## 14468    2 65844 3.037483e-05
## 14469    2 65844 3.037483e-05
## 14470    2 65844 3.037483e-05
## 14471    2 65844 3.037483e-05
## 14472    2 65844 3.037483e-05
## 14473    2 65844 3.037483e-05
## 14474    2 65844 3.037483e-05
## 14475    2 65844 3.037483e-05
## 14476    2 65844 3.037483e-05
## 14477    2 65844 3.037483e-05
## 14478    2 65844 3.037483e-05
## 14479    2 65844 3.037483e-05
## 14480    2 65844 3.037483e-05
## 14481    2 65844 3.037483e-05
## 14482    2 65844 3.037483e-05
## 14483    2 65844 3.037483e-05
## 14484    2 65844 3.037483e-05
## 14485    2 65844 3.037483e-05
## 14486    2 65844 3.037483e-05
## 14487    2 65844 3.037483e-05
## 14488    2 65844 3.037483e-05
## 14489    2 65844 3.037483e-05
## 14490    2 65844 3.037483e-05
## 14491    2 65844 3.037483e-05
## 14492    2 65844 3.037483e-05
## 14493    2 65844 3.037483e-05
## 14494    2 65844 3.037483e-05
## 14495    2 65844 3.037483e-05
## 14496    2 65844 3.037483e-05
## 14497    2 65844 3.037483e-05
## 14498    2 65844 3.037483e-05
## 14499    2 65844 3.037483e-05
## 14500    2 65844 3.037483e-05
## 14501    2 65844 3.037483e-05
## 14502    2 65844 3.037483e-05
## 14503    2 65844 3.037483e-05
## 14504    2 65844 3.037483e-05
## 14505    2 65844 3.037483e-05
## 14506    2 65844 3.037483e-05
## 14507    2 65844 3.037483e-05
## 14508    2 65844 3.037483e-05
## 14509    2 65844 3.037483e-05
## 14510    2 65844 3.037483e-05
## 14511    2 65844 3.037483e-05
## 14512    2 65844 3.037483e-05
## 14513    2 65844 3.037483e-05
## 14514    2 65844 3.037483e-05
## 14515    2 65844 3.037483e-05
## 14516    2 65844 3.037483e-05
## 14517    2 65844 3.037483e-05
## 14518    2 65844 3.037483e-05
## 14519    2 65844 3.037483e-05
## 14520    2 65844 3.037483e-05
## 14521    2 65844 3.037483e-05
## 14522    2 65844 3.037483e-05
## 14523    2 65844 3.037483e-05
## 14524    2 65844 3.037483e-05
## 14525    2 65844 3.037483e-05
## 14526    2 65844 3.037483e-05
## 14527    2 65844 3.037483e-05
## 14528    2 65844 3.037483e-05
## 14529    2 65844 3.037483e-05
## 14530    2 65844 3.037483e-05
## 14531    2 65844 3.037483e-05
## 14532    2 65844 3.037483e-05
## 14533    2 65844 3.037483e-05
## 14534    2 65844 3.037483e-05
## 14535    2 65844 3.037483e-05
## 14536    2 65844 3.037483e-05
## 14537    2 65844 3.037483e-05
## 14538    2 65844 3.037483e-05
## 14539    2 65844 3.037483e-05
## 14540    2 65844 3.037483e-05
## 14541    2 65844 3.037483e-05
## 14542    2 65844 3.037483e-05
## 14543    2 65844 3.037483e-05
## 14544    2 65844 3.037483e-05
## 14545    2 65844 3.037483e-05
## 14546    2 65844 3.037483e-05
## 14547    2 65844 3.037483e-05
## 14548    2 65844 3.037483e-05
## 14549    2 65844 3.037483e-05
## 14550    2 65844 3.037483e-05
## 14551    2 65844 3.037483e-05
## 14552    2 65844 3.037483e-05
## 14553    2 65844 3.037483e-05
## 14554    2 65844 3.037483e-05
## 14555    2 65844 3.037483e-05
## 14556    2 65844 3.037483e-05
## 14557    2 65844 3.037483e-05
## 14558    2 65844 3.037483e-05
## 14559    2 65844 3.037483e-05
## 14560    2 65844 3.037483e-05
## 14561    2 65844 3.037483e-05
## 14562    2 65844 3.037483e-05
## 14563    2 65844 3.037483e-05
## 14564    2 65844 3.037483e-05
## 14565    2 65844 3.037483e-05
## 14566    2 65844 3.037483e-05
## 14567    2 65844 3.037483e-05
## 14568    2 65844 3.037483e-05
## 14569    2 65844 3.037483e-05
## 14570    2 65844 3.037483e-05
## 14571    2 65844 3.037483e-05
## 14572    2 65844 3.037483e-05
## 14573    2 65844 3.037483e-05
## 14574    2 65844 3.037483e-05
## 14575    2 65844 3.037483e-05
## 14576    2 65844 3.037483e-05
## 14577    2 65844 3.037483e-05
## 14578    2 65844 3.037483e-05
## 14579    2 65844 3.037483e-05
## 14580    2 65844 3.037483e-05
## 14581    2 65844 3.037483e-05
## 14582    2 65844 3.037483e-05
## 14583    2 65844 3.037483e-05
## 14584    2 65844 3.037483e-05
## 14585    2 65844 3.037483e-05
## 14586    2 65844 3.037483e-05
## 14587    2 65844 3.037483e-05
## 14588    2 65844 3.037483e-05
## 14589    2 65844 3.037483e-05
## 14590    2 65844 3.037483e-05
## 14591    2 65844 3.037483e-05
## 14592    2 65844 3.037483e-05
## 14593    2 65844 3.037483e-05
## 14594    2 65844 3.037483e-05
## 14595    2 65844 3.037483e-05
## 14596    2 65844 3.037483e-05
## 14597    2 65844 3.037483e-05
## 14598    2 65844 3.037483e-05
## 14599    2 65844 3.037483e-05
## 14600    2 65844 3.037483e-05
## 14601    2 65844 3.037483e-05
## 14602    2 65844 3.037483e-05
## 14603    2 65844 3.037483e-05
## 14604    2 65844 3.037483e-05
## 14605    2 65844 3.037483e-05
## 14606    2 65844 3.037483e-05
## 14607    2 65844 3.037483e-05
## 14608    2 65844 3.037483e-05
## 14609    2 65844 3.037483e-05
## 14610    2 65844 3.037483e-05
## 14611    2 65844 3.037483e-05
## 14612    2 65844 3.037483e-05
## 14613    2 65844 3.037483e-05
## 14614    2 65844 3.037483e-05
## 14615    2 65844 3.037483e-05
## 14616    2 65844 3.037483e-05
## 14617    2 65844 3.037483e-05
## 14618    2 65844 3.037483e-05
## 14619    2 65844 3.037483e-05
## 14620    2 65844 3.037483e-05
## 14621    2 65844 3.037483e-05
## 14622    2 65844 3.037483e-05
## 14623    2 65844 3.037483e-05
## 14624    2 65844 3.037483e-05
## 14625    2 65844 3.037483e-05
## 14626    2 65844 3.037483e-05
## 14627    2 65844 3.037483e-05
## 14628    2 65844 3.037483e-05
## 14629    2 65844 3.037483e-05
## 14630    2 65844 3.037483e-05
## 14631    2 65844 3.037483e-05
## 14632    2 65844 3.037483e-05
## 14633    2 65844 3.037483e-05
## 14634    2 65844 3.037483e-05
## 14635    2 65844 3.037483e-05
## 14636    2 65844 3.037483e-05
## 14637    2 65844 3.037483e-05
## 14638    2 65844 3.037483e-05
## 14639    2 65844 3.037483e-05
## 14640    2 65844 3.037483e-05
## 14641    2 65844 3.037483e-05
## 14642    2 65844 3.037483e-05
## 14643    2 65844 3.037483e-05
## 14644    2 65844 3.037483e-05
## 14645    2 65844 3.037483e-05
## 14646    2 65844 3.037483e-05
## 14647    2 65844 3.037483e-05
## 14648    2 65844 3.037483e-05
## 14649    2 65844 3.037483e-05
## 14650    2 65844 3.037483e-05
## 14651    2 65844 3.037483e-05
## 14652    2 65844 3.037483e-05
## 14653    2 65844 3.037483e-05
## 14654    2 65844 3.037483e-05
## 14655    2 65844 3.037483e-05
## 14656    2 65844 3.037483e-05
## 14657    2 65844 3.037483e-05
## 14658    2 65844 3.037483e-05
## 14659    2 65844 3.037483e-05
## 14660    2 65844 3.037483e-05
## 14661    2 65844 3.037483e-05
## 14662    2 65844 3.037483e-05
## 14663    2 65844 3.037483e-05
## 14664    2 65844 3.037483e-05
## 14665    2 65844 3.037483e-05
## 14666    2 65844 3.037483e-05
## 14667    2 65844 3.037483e-05
## 14668    2 65844 3.037483e-05
## 14669    2 65844 3.037483e-05
## 14670    2 65844 3.037483e-05
## 14671    2 65844 3.037483e-05
## 14672    2 65844 3.037483e-05
## 14673    2 65844 3.037483e-05
## 14674    2 65844 3.037483e-05
## 14675    2 65844 3.037483e-05
## 14676    2 65844 3.037483e-05
## 14677    2 65844 3.037483e-05
## 14678    2 65844 3.037483e-05
## 14679    2 65844 3.037483e-05
## 14680    2 65844 3.037483e-05
## 14681    2 65844 3.037483e-05
## 14682    2 65844 3.037483e-05
## 14683    2 65844 3.037483e-05
## 14684    2 65844 3.037483e-05
## 14685    2 65844 3.037483e-05
## 14686    2 65844 3.037483e-05
## 14687    2 65844 3.037483e-05
## 14688    2 65844 3.037483e-05
## 14689    2 65844 3.037483e-05
## 14690    2 65844 3.037483e-05
## 14691    2 65844 3.037483e-05
## 14692    2 65844 3.037483e-05
## 14693    2 65844 3.037483e-05
## 14694    2 65844 3.037483e-05
## 14695    2 65844 3.037483e-05
## 14696    2 65844 3.037483e-05
## 14697    2 65844 3.037483e-05
## 14698    2 65844 3.037483e-05
## 14699    2 65844 3.037483e-05
## 14700    2 65844 3.037483e-05
## 14701    2 65844 3.037483e-05
## 14702    2 65844 3.037483e-05
## 14703    2 65844 3.037483e-05
## 14704    2 65844 3.037483e-05
## 14705    2 65844 3.037483e-05
## 14706    2 65844 3.037483e-05
## 14707    2 65844 3.037483e-05
## 14708    2 65844 3.037483e-05
## 14709    2 65844 3.037483e-05
## 14710    2 65844 3.037483e-05
## 14711    2 65844 3.037483e-05
## 14712    2 65844 3.037483e-05
## 14713    2 65844 3.037483e-05
## 14714    2 65844 3.037483e-05
## 14715    2 65844 3.037483e-05
## 14716    2 65844 3.037483e-05
## 14717    2 65844 3.037483e-05
## 14718    2 65844 3.037483e-05
## 14719    2 65844 3.037483e-05
## 14720    2 65844 3.037483e-05
## 14721    2 65844 3.037483e-05
## 14722    2 65844 3.037483e-05
## 14723    2 65844 3.037483e-05
## 14724    2 65844 3.037483e-05
## 14725    2 65844 3.037483e-05
## 14726    2 65844 3.037483e-05
## 14727    2 65844 3.037483e-05
## 14728    2 65844 3.037483e-05
## 14729    2 65844 3.037483e-05
## 14730    2 65844 3.037483e-05
## 14731    2 65844 3.037483e-05
## 14732    2 65844 3.037483e-05
## 14733    2 65844 3.037483e-05
## 14734    2 65844 3.037483e-05
## 14735    2 65844 3.037483e-05
## 14736    2 65844 3.037483e-05
## 14737    2 65844 3.037483e-05
## 14738    2 65844 3.037483e-05
## 14739    2 65844 3.037483e-05
## 14740    2 65844 3.037483e-05
## 14741    2 65844 3.037483e-05
## 14742    2 65844 3.037483e-05
## 14743    2 65844 3.037483e-05
## 14744    2 65844 3.037483e-05
## 14745    2 65844 3.037483e-05
## 14746    2 65844 3.037483e-05
## 14747    2 65844 3.037483e-05
## 14748    2 65844 3.037483e-05
## 14749    2 65844 3.037483e-05
## 14750    2 65844 3.037483e-05
## 14751    2 65844 3.037483e-05
## 14752    2 65844 3.037483e-05
## 14753    2 65844 3.037483e-05
## 14754    2 65844 3.037483e-05
## 14755    2 65844 3.037483e-05
## 14756    2 65844 3.037483e-05
## 14757    2 65844 3.037483e-05
## 14758    2 65844 3.037483e-05
## 14759    2 65844 3.037483e-05
## 14760    2 65844 3.037483e-05
## 14761    2 65844 3.037483e-05
## 14762    2 65844 3.037483e-05
## 14763    2 65844 3.037483e-05
## 14764    2 65844 3.037483e-05
## 14765    2 65844 3.037483e-05
## 14766    2 65844 3.037483e-05
## 14767    2 65844 3.037483e-05
## 14768    2 65844 3.037483e-05
## 14769    2 65844 3.037483e-05
## 14770    2 65844 3.037483e-05
## 14771    2 65844 3.037483e-05
## 14772    2 65844 3.037483e-05
## 14773    2 65844 3.037483e-05
## 14774    2 65844 3.037483e-05
## 14775    2 65844 3.037483e-05
## 14776    2 65844 3.037483e-05
## 14777    2 65844 3.037483e-05
## 14778    2 65844 3.037483e-05
## 14779    2 65844 3.037483e-05
## 14780    2 65844 3.037483e-05
## 14781    2 65844 3.037483e-05
## 14782    2 65844 3.037483e-05
## 14783    2 65844 3.037483e-05
## 14784    2 65844 3.037483e-05
## 14785    2 65844 3.037483e-05
## 14786    2 65844 3.037483e-05
## 14787    2 65844 3.037483e-05
## 14788    2 65844 3.037483e-05
## 14789    2 65844 3.037483e-05
## 14790    2 65844 3.037483e-05
## 14791    2 65844 3.037483e-05
## 14792    2 65844 3.037483e-05
## 14793    2 65844 3.037483e-05
## 14794    2 65844 3.037483e-05
## 14795    2 65844 3.037483e-05
## 14796    2 65844 3.037483e-05
## 14797    2 65844 3.037483e-05
## 14798    2 65844 3.037483e-05
## 14799    2 65844 3.037483e-05
## 14800    2 65844 3.037483e-05
## 14801    2 65844 3.037483e-05
## 14802    2 65844 3.037483e-05
## 14803    2 65844 3.037483e-05
## 14804    2 65844 3.037483e-05
## 14805    2 65844 3.037483e-05
## 14806    2 65844 3.037483e-05
## 14807    2 65844 3.037483e-05
## 14808    2 65844 3.037483e-05
## 14809    2 65844 3.037483e-05
## 14810    2 65844 3.037483e-05
## 14811    2 65844 3.037483e-05
## 14812    2 65844 3.037483e-05
## 14813    2 65844 3.037483e-05
## 14814    2 65844 3.037483e-05
## 14815    2 65844 3.037483e-05
## 14816    2 65844 3.037483e-05
## 14817    2 65844 3.037483e-05
## 14818    2 65844 3.037483e-05
## 14819    2 65844 3.037483e-05
## 14820    2 65844 3.037483e-05
## 14821    2 65844 3.037483e-05
## 14822    2 65844 3.037483e-05
## 14823    2 65844 3.037483e-05
## 14824    2 65844 3.037483e-05
## 14825    2 65844 3.037483e-05
## 14826    2 65844 3.037483e-05
## 14827    2 65844 3.037483e-05
## 14828    2 65844 3.037483e-05
## 14829    2 65844 3.037483e-05
## 14830    2 65844 3.037483e-05
## 14831    2 65844 3.037483e-05
## 14832    2 65844 3.037483e-05
## 14833    2 65844 3.037483e-05
## 14834    2 65844 3.037483e-05
## 14835    2 65844 3.037483e-05
## 14836    2 65844 3.037483e-05
## 14837    2 65844 3.037483e-05
## 14838    2 65844 3.037483e-05
## 14839    2 65844 3.037483e-05
## 14840    2 65844 3.037483e-05
## 14841    2 65844 3.037483e-05
## 14842    2 65844 3.037483e-05
## 14843    2 65844 3.037483e-05
## 14844    2 65844 3.037483e-05
## 14845    2 65844 3.037483e-05
## 14846    2 65844 3.037483e-05
## 14847    2 65844 3.037483e-05
## 14848    2 65844 3.037483e-05
## 14849    2 65844 3.037483e-05
## 14850    2 65844 3.037483e-05
## 14851    2 65844 3.037483e-05
## 14852    2 65844 3.037483e-05
## 14853    2 65844 3.037483e-05
## 14854    2 65844 3.037483e-05
## 14855    2 65844 3.037483e-05
## 14856    2 65844 3.037483e-05
## 14857    2 65844 3.037483e-05
## 14858    2 65844 3.037483e-05
## 14859    2 65844 3.037483e-05
## 14860    2 65844 3.037483e-05
## 14861    2 65844 3.037483e-05
## 14862    2 65844 3.037483e-05
## 14863    2 65844 3.037483e-05
## 14864    2 65844 3.037483e-05
## 14865    2 65844 3.037483e-05
## 14866    2 65844 3.037483e-05
## 14867    2 65844 3.037483e-05
## 14868    2 65844 3.037483e-05
## 14869    2 65844 3.037483e-05
## 14870    2 65844 3.037483e-05
## 14871    2 65844 3.037483e-05
## 14872    2 65844 3.037483e-05
## 14873    2 65844 3.037483e-05
## 14874    2 65844 3.037483e-05
## 14875    2 65844 3.037483e-05
## 14876    2 65844 3.037483e-05
## 14877    2 65844 3.037483e-05
## 14878    2 65844 3.037483e-05
## 14879    2 65844 3.037483e-05
## 14880    2 65844 3.037483e-05
## 14881    2 65844 3.037483e-05
## 14882    2 65844 3.037483e-05
## 14883    2 65844 3.037483e-05
## 14884    2 65844 3.037483e-05
## 14885    2 65844 3.037483e-05
## 14886    2 65844 3.037483e-05
## 14887    2 65844 3.037483e-05
## 14888    2 65844 3.037483e-05
## 14889    2 65844 3.037483e-05
## 14890    2 65844 3.037483e-05
## 14891    2 65844 3.037483e-05
## 14892    2 65844 3.037483e-05
## 14893    2 65844 3.037483e-05
## 14894    2 65844 3.037483e-05
## 14895    2 65844 3.037483e-05
## 14896    2 65844 3.037483e-05
## 14897    2 65844 3.037483e-05
## 14898    2 65844 3.037483e-05
## 14899    2 65844 3.037483e-05
## 14900    2 65844 3.037483e-05
## 14901    2 65844 3.037483e-05
## 14902    2 65844 3.037483e-05
## 14903    2 65844 3.037483e-05
## 14904    2 65844 3.037483e-05
## 14905    2 65844 3.037483e-05
## 14906    2 65844 3.037483e-05
## 14907    2 65844 3.037483e-05
## 14908    2 65844 3.037483e-05
## 14909    2 65844 3.037483e-05
## 14910    2 65844 3.037483e-05
## 14911    2 65844 3.037483e-05
## 14912    2 65844 3.037483e-05
## 14913    2 65844 3.037483e-05
## 14914    2 65844 3.037483e-05
## 14915    2 65844 3.037483e-05
## 14916    2 65844 3.037483e-05
## 14917    2 65844 3.037483e-05
## 14918    2 65844 3.037483e-05
## 14919    2 65844 3.037483e-05
## 14920    2 65844 3.037483e-05
## 14921    2 65844 3.037483e-05
## 14922    2 65844 3.037483e-05
## 14923    2 65844 3.037483e-05
## 14924    2 65844 3.037483e-05
## 14925    2 65844 3.037483e-05
## 14926    2 65844 3.037483e-05
## 14927    2 65844 3.037483e-05
## 14928    2 65844 3.037483e-05
## 14929    2 65844 3.037483e-05
## 14930    2 65844 3.037483e-05
## 14931    2 65844 3.037483e-05
## 14932    2 65844 3.037483e-05
## 14933    2 65844 3.037483e-05
## 14934    2 65844 3.037483e-05
## 14935    2 65844 3.037483e-05
## 14936    2 65844 3.037483e-05
## 14937    2 65844 3.037483e-05
## 14938    2 65844 3.037483e-05
## 14939    2 65844 3.037483e-05
## 14940    2 65844 3.037483e-05
## 14941    2 65844 3.037483e-05
## 14942    2 65844 3.037483e-05
## 14943    2 65844 3.037483e-05
## 14944    2 65844 3.037483e-05
## 14945    2 65844 3.037483e-05
## 14946    2 65844 3.037483e-05
## 14947    2 65844 3.037483e-05
## 14948    2 65844 3.037483e-05
## 14949    2 65844 3.037483e-05
## 14950    2 65844 3.037483e-05
## 14951    2 65844 3.037483e-05
## 14952    2 65844 3.037483e-05
## 14953    2 65844 3.037483e-05
## 14954    2 65844 3.037483e-05
## 14955    2 65844 3.037483e-05
## 14956    2 65844 3.037483e-05
## 14957    2 65844 3.037483e-05
## 14958    2 65844 3.037483e-05
## 14959    2 65844 3.037483e-05
## 14960    2 65844 3.037483e-05
## 14961    2 65844 3.037483e-05
## 14962    2 65844 3.037483e-05
## 14963    2 65844 3.037483e-05
## 14964    2 65844 3.037483e-05
## 14965    2 65844 3.037483e-05
## 14966    2 65844 3.037483e-05
## 14967    2 65844 3.037483e-05
## 14968    2 65844 3.037483e-05
## 14969    2 65844 3.037483e-05
## 14970    2 65844 3.037483e-05
## 14971    2 65844 3.037483e-05
## 14972    2 65844 3.037483e-05
## 14973    2 65844 3.037483e-05
## 14974    2 65844 3.037483e-05
## 14975    2 65844 3.037483e-05
## 14976    2 65844 3.037483e-05
## 14977    2 65844 3.037483e-05
## 14978    2 65844 3.037483e-05
## 14979    2 65844 3.037483e-05
## 14980    2 65844 3.037483e-05
## 14981    2 65844 3.037483e-05
## 14982    2 65844 3.037483e-05
## 14983    2 65844 3.037483e-05
## 14984    2 65844 3.037483e-05
## 14985    2 65844 3.037483e-05
## 14986    2 65844 3.037483e-05
## 14987    2 65844 3.037483e-05
## 14988    2 65844 3.037483e-05
## 14989    2 65844 3.037483e-05
## 14990    2 65844 3.037483e-05
## 14991    2 65844 3.037483e-05
## 14992    2 65844 3.037483e-05
## 14993    2 65844 3.037483e-05
## 14994    2 65844 3.037483e-05
## 14995    2 65844 3.037483e-05
## 14996    2 65844 3.037483e-05
## 14997    2 65844 3.037483e-05
## 14998    2 65844 3.037483e-05
## 14999    2 65844 3.037483e-05
## 15000    2 65844 3.037483e-05
## 15001    2 65844 3.037483e-05
## 15002    2 65844 3.037483e-05
## 15003    2 65844 3.037483e-05
## 15004    2 65844 3.037483e-05
## 15005    2 65844 3.037483e-05
## 15006    2 65844 3.037483e-05
## 15007    2 65844 3.037483e-05
## 15008    2 65844 3.037483e-05
## 15009    2 65844 3.037483e-05
## 15010    2 65844 3.037483e-05
## 15011    2 65844 3.037483e-05
## 15012    2 65844 3.037483e-05
## 15013    2 65844 3.037483e-05
## 15014    2 65844 3.037483e-05
## 15015    2 65844 3.037483e-05
## 15016    2 65844 3.037483e-05
## 15017    2 65844 3.037483e-05
## 15018    2 65844 3.037483e-05
## 15019    2 65844 3.037483e-05
## 15020    2 65844 3.037483e-05
## 15021    2 65844 3.037483e-05
## 15022    2 65844 3.037483e-05
## 15023    2 65844 3.037483e-05
## 15024    2 65844 3.037483e-05
## 15025    2 65844 3.037483e-05
## 15026    2 65844 3.037483e-05
## 15027    2 65844 3.037483e-05
## 15028    2 65844 3.037483e-05
## 15029    2 65844 3.037483e-05
## 15030    2 65844 3.037483e-05
## 15031    2 65844 3.037483e-05
## 15032    2 65844 3.037483e-05
## 15033    2 65844 3.037483e-05
## 15034    2 65844 3.037483e-05
## 15035    2 65844 3.037483e-05
## 15036    2 65844 3.037483e-05
## 15037    2 65844 3.037483e-05
## 15038    2 65844 3.037483e-05
## 15039    2 65844 3.037483e-05
## 15040    2 65844 3.037483e-05
## 15041    2 65844 3.037483e-05
## 15042    2 65844 3.037483e-05
## 15043    2 65844 3.037483e-05
## 15044    2 65844 3.037483e-05
## 15045    2 65844 3.037483e-05
## 15046    2 65844 3.037483e-05
## 15047    2 65844 3.037483e-05
## 15048    2 65844 3.037483e-05
## 15049    2 65844 3.037483e-05
## 15050    2 65844 3.037483e-05
## 15051    2 65844 3.037483e-05
## 15052    2 65844 3.037483e-05
## 15053    2 65844 3.037483e-05
## 15054    2 65844 3.037483e-05
## 15055    2 65844 3.037483e-05
## 15056    2 65844 3.037483e-05
## 15057    2 65844 3.037483e-05
## 15058    2 65844 3.037483e-05
## 15059    2 65844 3.037483e-05
## 15060    2 65844 3.037483e-05
## 15061    2 65844 3.037483e-05
## 15062    2 65844 3.037483e-05
## 15063    2 65844 3.037483e-05
## 15064    2 65844 3.037483e-05
## 15065    2 65844 3.037483e-05
## 15066    2 65844 3.037483e-05
## 15067    2 65844 3.037483e-05
## 15068    2 65844 3.037483e-05
## 15069    2 65844 3.037483e-05
## 15070    2 65844 3.037483e-05
## 15071    2 65844 3.037483e-05
## 15072    2 65844 3.037483e-05
## 15073    2 65844 3.037483e-05
## 15074    2 65844 3.037483e-05
## 15075    2 65844 3.037483e-05
## 15076    2 65844 3.037483e-05
## 15077    2 65844 3.037483e-05
## 15078    2 65844 3.037483e-05
## 15079    2 65844 3.037483e-05
## 15080    2 65844 3.037483e-05
## 15081    2 65844 3.037483e-05
## 15082    2 65844 3.037483e-05
## 15083    2 65844 3.037483e-05
## 15084    2 65844 3.037483e-05
## 15085    2 65844 3.037483e-05
## 15086    2 65844 3.037483e-05
## 15087    2 65844 3.037483e-05
## 15088    2 65844 3.037483e-05
## 15089    2 65844 3.037483e-05
## 15090    2 65844 3.037483e-05
## 15091    2 65844 3.037483e-05
## 15092    2 65844 3.037483e-05
## 15093    2 65844 3.037483e-05
## 15094    2 65844 3.037483e-05
## 15095    2 65844 3.037483e-05
## 15096    2 65844 3.037483e-05
## 15097    2 65844 3.037483e-05
## 15098    2 65844 3.037483e-05
## 15099    2 65844 3.037483e-05
## 15100    2 65844 3.037483e-05
## 15101    2 65844 3.037483e-05
## 15102    2 65844 3.037483e-05
## 15103    2 65844 3.037483e-05
## 15104    2 65844 3.037483e-05
## 15105    2 65844 3.037483e-05
## 15106    2 65844 3.037483e-05
## 15107    2 65844 3.037483e-05
## 15108    2 65844 3.037483e-05
## 15109    2 65844 3.037483e-05
## 15110    2 65844 3.037483e-05
## 15111    2 65844 3.037483e-05
## 15112    2 65844 3.037483e-05
## 15113    2 65844 3.037483e-05
## 15114    2 65844 3.037483e-05
## 15115    2 65844 3.037483e-05
## 15116    2 65844 3.037483e-05
## 15117    2 65844 3.037483e-05
## 15118    2 65844 3.037483e-05
## 15119    2 65844 3.037483e-05
## 15120    2 65844 3.037483e-05
## 15121    2 65844 3.037483e-05
## 15122    2 65844 3.037483e-05
## 15123    2 65844 3.037483e-05
## 15124    2 65844 3.037483e-05
## 15125    2 65844 3.037483e-05
## 15126    2 65844 3.037483e-05
## 15127    2 65844 3.037483e-05
## 15128    2 65844 3.037483e-05
## 15129    2 65844 3.037483e-05
## 15130    2 65844 3.037483e-05
## 15131    2 65844 3.037483e-05
## 15132    2 65844 3.037483e-05
## 15133    2 65844 3.037483e-05
## 15134    2 65844 3.037483e-05
## 15135    2 65844 3.037483e-05
## 15136    2 65844 3.037483e-05
## 15137    2 65844 3.037483e-05
## 15138    2 65844 3.037483e-05
## 15139    2 65844 3.037483e-05
## 15140    2 65844 3.037483e-05
## 15141    2 65844 3.037483e-05
## 15142    2 65844 3.037483e-05
## 15143    2 65844 3.037483e-05
## 15144    2 65844 3.037483e-05
## 15145    2 65844 3.037483e-05
## 15146    2 65844 3.037483e-05
## 15147    2 65844 3.037483e-05
## 15148    2 65844 3.037483e-05
## 15149    2 65844 3.037483e-05
## 15150    2 65844 3.037483e-05
## 15151    2 65844 3.037483e-05
## 15152    2 65844 3.037483e-05
## 15153    2 65844 3.037483e-05
## 15154    2 65844 3.037483e-05
## 15155    2 65844 3.037483e-05
## 15156    2 65844 3.037483e-05
## 15157    2 65844 3.037483e-05
## 15158    2 65844 3.037483e-05
## 15159    2 65844 3.037483e-05
## 15160    2 65844 3.037483e-05
## 15161    2 65844 3.037483e-05
## 15162    2 65844 3.037483e-05
## 15163    2 65844 3.037483e-05
## 15164    2 65844 3.037483e-05
## 15165    2 65844 3.037483e-05
## 15166    2 65844 3.037483e-05
## 15167    2 65844 3.037483e-05
## 15168    2 65844 3.037483e-05
## 15169    2 65844 3.037483e-05
## 15170    2 65844 3.037483e-05
## 15171    2 65844 3.037483e-05
## 15172    2 65844 3.037483e-05
## 15173    2 65844 3.037483e-05
## 15174    2 65844 3.037483e-05
## 15175    2 65844 3.037483e-05
## 15176    2 65844 3.037483e-05
## 15177    2 65844 3.037483e-05
## 15178    2 65844 3.037483e-05
## 15179    2 65844 3.037483e-05
## 15180    2 65844 3.037483e-05
## 15181    2 65844 3.037483e-05
## 15182    2 65844 3.037483e-05
## 15183    2 65844 3.037483e-05
## 15184    2 65844 3.037483e-05
## 15185    2 65844 3.037483e-05
## 15186    2 65844 3.037483e-05
## 15187    2 65844 3.037483e-05
## 15188    2 65844 3.037483e-05
## 15189    2 65844 3.037483e-05
## 15190    2 65844 3.037483e-05
## 15191    2 65844 3.037483e-05
## 15192    2 65844 3.037483e-05
## 15193    2 65844 3.037483e-05
## 15194    2 65844 3.037483e-05
## 15195    2 65844 3.037483e-05
## 15196    2 65844 3.037483e-05
## 15197    2 65844 3.037483e-05
## 15198    2 65844 3.037483e-05
## 15199    2 65844 3.037483e-05
## 15200    2 65844 3.037483e-05
## 15201    2 65844 3.037483e-05
## 15202    2 65844 3.037483e-05
## 15203    2 65844 3.037483e-05
## 15204    2 65844 3.037483e-05
## 15205    2 65844 3.037483e-05
## 15206    2 65844 3.037483e-05
## 15207    2 65844 3.037483e-05
## 15208    2 65844 3.037483e-05
## 15209    2 65844 3.037483e-05
## 15210    2 65844 3.037483e-05
## 15211    2 65844 3.037483e-05
## 15212    2 65844 3.037483e-05
## 15213    2 65844 3.037483e-05
## 15214    2 65844 3.037483e-05
## 15215    2 65844 3.037483e-05
## 15216    2 65844 3.037483e-05
## 15217    2 65844 3.037483e-05
## 15218    2 65844 3.037483e-05
## 15219    2 65844 3.037483e-05
## 15220    2 65844 3.037483e-05
## 15221    2 65844 3.037483e-05
## 15222    2 65844 3.037483e-05
## 15223    2 65844 3.037483e-05
## 15224    2 65844 3.037483e-05
## 15225    2 65844 3.037483e-05
## 15226    2 65844 3.037483e-05
## 15227    2 65844 3.037483e-05
## 15228    2 65844 3.037483e-05
## 15229    2 65844 3.037483e-05
## 15230    2 65844 3.037483e-05
## 15231    2 65844 3.037483e-05
## 15232    2 65844 3.037483e-05
## 15233    2 65844 3.037483e-05
## 15234    2 65844 3.037483e-05
## 15235    2 65844 3.037483e-05
## 15236    2 65844 3.037483e-05
## 15237    2 65844 3.037483e-05
## 15238    2 65844 3.037483e-05
## 15239    2 65844 3.037483e-05
## 15240    2 65844 3.037483e-05
## 15241    2 65844 3.037483e-05
## 15242    2 65844 3.037483e-05
## 15243    2 65844 3.037483e-05
## 15244    2 65844 3.037483e-05
## 15245    2 65844 3.037483e-05
## 15246    2 65844 3.037483e-05
## 15247    2 65844 3.037483e-05
## 15248    2 65844 3.037483e-05
## 15249    2 65844 3.037483e-05
## 15250    2 65844 3.037483e-05
## 15251    2 65844 3.037483e-05
## 15252    2 65844 3.037483e-05
## 15253    2 65844 3.037483e-05
## 15254    2 65844 3.037483e-05
## 15255    2 65844 3.037483e-05
## 15256    2 65844 3.037483e-05
## 15257    2 65844 3.037483e-05
## 15258    2 65844 3.037483e-05
## 15259    2 65844 3.037483e-05
## 15260    2 65844 3.037483e-05
## 15261    2 65844 3.037483e-05
## 15262    2 65844 3.037483e-05
## 15263    2 65844 3.037483e-05
## 15264    2 65844 3.037483e-05
## 15265    2 65844 3.037483e-05
## 15266    2 65844 3.037483e-05
## 15267    2 65844 3.037483e-05
## 15268    2 65844 3.037483e-05
## 15269    2 65844 3.037483e-05
## 15270    2 65844 3.037483e-05
## 15271    2 65844 3.037483e-05
## 15272    2 65844 3.037483e-05
## 15273    2 65844 3.037483e-05
## 15274    2 65844 3.037483e-05
## 15275    2 65844 3.037483e-05
## 15276    2 65844 3.037483e-05
## 15277    2 65844 3.037483e-05
## 15278    2 65844 3.037483e-05
## 15279    2 65844 3.037483e-05
## 15280    2 65844 3.037483e-05
## 15281    2 65844 3.037483e-05
## 15282    2 65844 3.037483e-05
## 15283    2 65844 3.037483e-05
## 15284    2 65844 3.037483e-05
## 15285    2 65844 3.037483e-05
## 15286    2 65844 3.037483e-05
## 15287    2 65844 3.037483e-05
## 15288    2 65844 3.037483e-05
## 15289    2 65844 3.037483e-05
## 15290    2 65844 3.037483e-05
## 15291    2 65844 3.037483e-05
## 15292    2 65844 3.037483e-05
## 15293    2 65844 3.037483e-05
## 15294    2 65844 3.037483e-05
## 15295    2 65844 3.037483e-05
## 15296    2 65844 3.037483e-05
## 15297    2 65844 3.037483e-05
## 15298    2 65844 3.037483e-05
## 15299    2 65844 3.037483e-05
## 15300    2 65844 3.037483e-05
## 15301    2 65844 3.037483e-05
## 15302    2 65844 3.037483e-05
## 15303    2 65844 3.037483e-05
## 15304    2 65844 3.037483e-05
## 15305    2 65844 3.037483e-05
## 15306    2 65844 3.037483e-05
## 15307    2 65844 3.037483e-05
## 15308    2 65844 3.037483e-05
## 15309    2 65844 3.037483e-05
## 15310    2 65844 3.037483e-05
## 15311    2 65844 3.037483e-05
## 15312    2 65844 3.037483e-05
## 15313    2 65844 3.037483e-05
## 15314    2 65844 3.037483e-05
## 15315    2 65844 3.037483e-05
## 15316    2 65844 3.037483e-05
## 15317    2 65844 3.037483e-05
## 15318    2 65844 3.037483e-05
## 15319    2 65844 3.037483e-05
## 15320    2 65844 3.037483e-05
## 15321    2 65844 3.037483e-05
## 15322    2 65844 3.037483e-05
## 15323    2 65844 3.037483e-05
## 15324    2 65844 3.037483e-05
## 15325    2 65844 3.037483e-05
## 15326    2 65844 3.037483e-05
## 15327    2 65844 3.037483e-05
## 15328    2 65844 3.037483e-05
## 15329    2 65844 3.037483e-05
## 15330    2 65844 3.037483e-05
## 15331    2 65844 3.037483e-05
## 15332    2 65844 3.037483e-05
## 15333    2 65844 3.037483e-05
## 15334    2 65844 3.037483e-05
## 15335    2 65844 3.037483e-05
## 15336    2 65844 3.037483e-05
## 15337    2 65844 3.037483e-05
## 15338    2 65844 3.037483e-05
## 15339    2 65844 3.037483e-05
## 15340    2 65844 3.037483e-05
## 15341    2 65844 3.037483e-05
## 15342    2 65844 3.037483e-05
## 15343    2 65844 3.037483e-05
## 15344    2 65844 3.037483e-05
## 15345    2 65844 3.037483e-05
## 15346    2 65844 3.037483e-05
## 15347    2 65844 3.037483e-05
## 15348    2 65844 3.037483e-05
## 15349    2 65844 3.037483e-05
## 15350    2 65844 3.037483e-05
## 15351    2 65844 3.037483e-05
## 15352    2 65844 3.037483e-05
## 15353    2 65844 3.037483e-05
## 15354    2 65844 3.037483e-05
## 15355    2 65844 3.037483e-05
## 15356    2 65844 3.037483e-05
## 15357    2 65844 3.037483e-05
## 15358    2 65844 3.037483e-05
## 15359    2 65844 3.037483e-05
## 15360    2 65844 3.037483e-05
## 15361    2 65844 3.037483e-05
## 15362    2 65844 3.037483e-05
## 15363    2 65844 3.037483e-05
## 15364    2 65844 3.037483e-05
## 15365    2 65844 3.037483e-05
## 15366    2 65844 3.037483e-05
## 15367    2 65844 3.037483e-05
## 15368    2 65844 3.037483e-05
## 15369    2 65844 3.037483e-05
## 15370    2 65844 3.037483e-05
## 15371    2 65844 3.037483e-05
## 15372    2 65844 3.037483e-05
## 15373    2 65844 3.037483e-05
## 15374    2 65844 3.037483e-05
## 15375    2 65844 3.037483e-05
## 15376    2 65844 3.037483e-05
## 15377    2 65844 3.037483e-05
## 15378    2 65844 3.037483e-05
## 15379    2 65844 3.037483e-05
## 15380    2 65844 3.037483e-05
## 15381    2 65844 3.037483e-05
## 15382    2 65844 3.037483e-05
## 15383    2 65844 3.037483e-05
## 15384    2 65844 3.037483e-05
## 15385    2 65844 3.037483e-05
## 15386    2 65844 3.037483e-05
## 15387    2 65844 3.037483e-05
## 15388    2 65844 3.037483e-05
## 15389    2 65844 3.037483e-05
## 15390    2 65844 3.037483e-05
## 15391    2 65844 3.037483e-05
## 15392    2 65844 3.037483e-05
## 15393    2 65844 3.037483e-05
## 15394    2 65844 3.037483e-05
## 15395    2 65844 3.037483e-05
## 15396    2 65844 3.037483e-05
## 15397    2 65844 3.037483e-05
## 15398    2 65844 3.037483e-05
## 15399    2 65844 3.037483e-05
## 15400    2 65844 3.037483e-05
## 15401    2 65844 3.037483e-05
## 15402    2 65844 3.037483e-05
## 15403    2 65844 3.037483e-05
## 15404    2 65844 3.037483e-05
## 15405    2 65844 3.037483e-05
## 15406    2 65844 3.037483e-05
## 15407    2 65844 3.037483e-05
## 15408    2 65844 3.037483e-05
## 15409    2 65844 3.037483e-05
## 15410    2 65844 3.037483e-05
## 15411    2 65844 3.037483e-05
## 15412    2 65844 3.037483e-05
## 15413    2 65844 3.037483e-05
## 15414    2 65844 3.037483e-05
## 15415    2 65844 3.037483e-05
## 15416    2 65844 3.037483e-05
## 15417    2 65844 3.037483e-05
## 15418    2 65844 3.037483e-05
## 15419    2 65844 3.037483e-05
## 15420    2 65844 3.037483e-05
## 15421    2 65844 3.037483e-05
## 15422    2 65844 3.037483e-05
## 15423    2 65844 3.037483e-05
## 15424    2 65844 3.037483e-05
## 15425    2 65844 3.037483e-05
## 15426    2 65844 3.037483e-05
## 15427    2 65844 3.037483e-05
## 15428    2 65844 3.037483e-05
## 15429    2 65844 3.037483e-05
## 15430    2 65844 3.037483e-05
## 15431    2 65844 3.037483e-05
## 15432    2 65844 3.037483e-05
## 15433    2 65844 3.037483e-05
## 15434    2 65844 3.037483e-05
## 15435    2 65844 3.037483e-05
## 15436    2 65844 3.037483e-05
## 15437    2 65844 3.037483e-05
## 15438    2 65844 3.037483e-05
## 15439    2 65844 3.037483e-05
## 15440    2 65844 3.037483e-05
## 15441    2 65844 3.037483e-05
## 15442    2 65844 3.037483e-05
## 15443    2 65844 3.037483e-05
## 15444    2 65844 3.037483e-05
## 15445    2 65844 3.037483e-05
## 15446    2 65844 3.037483e-05
## 15447    2 65844 3.037483e-05
## 15448    2 65844 3.037483e-05
## 15449    2 65844 3.037483e-05
## 15450    2 65844 3.037483e-05
## 15451    2 65844 3.037483e-05
## 15452    2 65844 3.037483e-05
## 15453    2 65844 3.037483e-05
## 15454    2 65844 3.037483e-05
## 15455    2 65844 3.037483e-05
## 15456    2 65844 3.037483e-05
## 15457    2 65844 3.037483e-05
## 15458    2 65844 3.037483e-05
## 15459    2 65844 3.037483e-05
## 15460    2 65844 3.037483e-05
## 15461    2 65844 3.037483e-05
## 15462    2 65844 3.037483e-05
## 15463    2 65844 3.037483e-05
## 15464    2 65844 3.037483e-05
## 15465    2 65844 3.037483e-05
## 15466    2 65844 3.037483e-05
## 15467    2 65844 3.037483e-05
## 15468    2 65844 3.037483e-05
## 15469    2 65844 3.037483e-05
## 15470    2 65844 3.037483e-05
## 15471    2 65844 3.037483e-05
## 15472    2 65844 3.037483e-05
## 15473    2 65844 3.037483e-05
## 15474    2 65844 3.037483e-05
## 15475    2 65844 3.037483e-05
## 15476    2 65844 3.037483e-05
## 15477    2 65844 3.037483e-05
## 15478    2 65844 3.037483e-05
## 15479    2 65844 3.037483e-05
## 15480    2 65844 3.037483e-05
## 15481    2 65844 3.037483e-05
## 15482    2 65844 3.037483e-05
## 15483    2 65844 3.037483e-05
## 15484    2 65844 3.037483e-05
## 15485    2 65844 3.037483e-05
## 15486    2 65844 3.037483e-05
## 15487    2 65844 3.037483e-05
## 15488    2 65844 3.037483e-05
## 15489    2 65844 3.037483e-05
## 15490    2 65844 3.037483e-05
## 15491    2 65844 3.037483e-05
## 15492    2 65844 3.037483e-05
## 15493    2 65844 3.037483e-05
## 15494    2 65844 3.037483e-05
## 15495    2 65844 3.037483e-05
## 15496    2 65844 3.037483e-05
## 15497    2 65844 3.037483e-05
## 15498    2 65844 3.037483e-05
## 15499    2 65844 3.037483e-05
## 15500    2 65844 3.037483e-05
## 15501    2 65844 3.037483e-05
## 15502    2 65844 3.037483e-05
## 15503    2 65844 3.037483e-05
## 15504    2 65844 3.037483e-05
## 15505    2 65844 3.037483e-05
## 15506    2 65844 3.037483e-05
## 15507    2 65844 3.037483e-05
## 15508    2 65844 3.037483e-05
## 15509    2 65844 3.037483e-05
## 15510    2 65844 3.037483e-05
## 15511    2 65844 3.037483e-05
## 15512    2 65844 3.037483e-05
## 15513    2 65844 3.037483e-05
## 15514    2 65844 3.037483e-05
## 15515    2 65844 3.037483e-05
## 15516    2 65844 3.037483e-05
## 15517    2 65844 3.037483e-05
## 15518    2 65844 3.037483e-05
## 15519    2 65844 3.037483e-05
## 15520    2 65844 3.037483e-05
## 15521    2 65844 3.037483e-05
## 15522    2 65844 3.037483e-05
## 15523    2 65844 3.037483e-05
## 15524    2 65844 3.037483e-05
## 15525    2 65844 3.037483e-05
## 15526    2 65844 3.037483e-05
## 15527    2 65844 3.037483e-05
## 15528    2 65844 3.037483e-05
## 15529    2 65844 3.037483e-05
## 15530    2 65844 3.037483e-05
## 15531    2 65844 3.037483e-05
## 15532    2 65844 3.037483e-05
## 15533    2 65844 3.037483e-05
## 15534    2 65844 3.037483e-05
## 15535    2 65844 3.037483e-05
## 15536    2 65844 3.037483e-05
## 15537    2 65844 3.037483e-05
## 15538    2 65844 3.037483e-05
## 15539    2 65844 3.037483e-05
## 15540    2 65844 3.037483e-05
## 15541    2 65844 3.037483e-05
## 15542    2 65844 3.037483e-05
## 15543    2 65844 3.037483e-05
## 15544    2 65844 3.037483e-05
## 15545    2 65844 3.037483e-05
## 15546    2 65844 3.037483e-05
## 15547    2 65844 3.037483e-05
## 15548    2 65844 3.037483e-05
## 15549    2 65844 3.037483e-05
## 15550    2 65844 3.037483e-05
## 15551    2 65844 3.037483e-05
## 15552    2 65844 3.037483e-05
## 15553    2 65844 3.037483e-05
## 15554    2 65844 3.037483e-05
## 15555    2 65844 3.037483e-05
## 15556    2 65844 3.037483e-05
## 15557    2 65844 3.037483e-05
## 15558    2 65844 3.037483e-05
## 15559    2 65844 3.037483e-05
## 15560    2 65844 3.037483e-05
## 15561    2 65844 3.037483e-05
## 15562    2 65844 3.037483e-05
## 15563    2 65844 3.037483e-05
## 15564    2 65844 3.037483e-05
## 15565    2 65844 3.037483e-05
## 15566    2 65844 3.037483e-05
## 15567    2 65844 3.037483e-05
## 15568    2 65844 3.037483e-05
## 15569    2 65844 3.037483e-05
## 15570    2 65844 3.037483e-05
## 15571    2 65844 3.037483e-05
## 15572    2 65844 3.037483e-05
## 15573    2 65844 3.037483e-05
## 15574    2 65844 3.037483e-05
## 15575    2 65844 3.037483e-05
## 15576    2 65844 3.037483e-05
## 15577    2 65844 3.037483e-05
## 15578    2 65844 3.037483e-05
## 15579    2 65844 3.037483e-05
## 15580    2 65844 3.037483e-05
## 15581    2 65844 3.037483e-05
## 15582    2 65844 3.037483e-05
## 15583    2 65844 3.037483e-05
## 15584    2 65844 3.037483e-05
## 15585    2 65844 3.037483e-05
## 15586    2 65844 3.037483e-05
## 15587    2 65844 3.037483e-05
## 15588    2 65844 3.037483e-05
## 15589    2 65844 3.037483e-05
## 15590    2 65844 3.037483e-05
## 15591    2 65844 3.037483e-05
## 15592    2 65844 3.037483e-05
## 15593    2 65844 3.037483e-05
## 15594    2 65844 3.037483e-05
## 15595    2 65844 3.037483e-05
## 15596    2 65844 3.037483e-05
## 15597    2 65844 3.037483e-05
## 15598    2 65844 3.037483e-05
## 15599    2 65844 3.037483e-05
## 15600    2 65844 3.037483e-05
## 15601    2 65844 3.037483e-05
## 15602    2 65844 3.037483e-05
## 15603    2 65844 3.037483e-05
## 15604    2 65844 3.037483e-05
## 15605    2 65844 3.037483e-05
## 15606    2 65844 3.037483e-05
## 15607    2 65844 3.037483e-05
## 15608    2 65844 3.037483e-05
## 15609    2 65844 3.037483e-05
## 15610    2 65844 3.037483e-05
## 15611    2 65844 3.037483e-05
## 15612    2 65844 3.037483e-05
## 15613    2 65844 3.037483e-05
## 15614    2 65844 3.037483e-05
## 15615    2 65844 3.037483e-05
## 15616    2 65844 3.037483e-05
## 15617    2 65844 3.037483e-05
## 15618    2 65844 3.037483e-05
## 15619    2 65844 3.037483e-05
## 15620    2 65844 3.037483e-05
## 15621    2 65844 3.037483e-05
## 15622    2 65844 3.037483e-05
## 15623    2 65844 3.037483e-05
## 15624    2 65844 3.037483e-05
## 15625    2 65844 3.037483e-05
## 15626    2 65844 3.037483e-05
## 15627    2 65844 3.037483e-05
## 15628    2 65844 3.037483e-05
## 15629    2 65844 3.037483e-05
## 15630    2 65844 3.037483e-05
## 15631    2 65844 3.037483e-05
## 15632    2 65844 3.037483e-05
## 15633    2 65844 3.037483e-05
## 15634    2 65844 3.037483e-05
## 15635    2 65844 3.037483e-05
## 15636    2 65844 3.037483e-05
## 15637    2 65844 3.037483e-05
## 15638    2 65844 3.037483e-05
## 15639    2 65844 3.037483e-05
## 15640    2 65844 3.037483e-05
## 15641    2 65844 3.037483e-05
## 15642    2 65844 3.037483e-05
## 15643    2 65844 3.037483e-05
## 15644    2 65844 3.037483e-05
## 15645    2 65844 3.037483e-05
## 15646    2 65844 3.037483e-05
## 15647    2 65844 3.037483e-05
## 15648    2 65844 3.037483e-05
## 15649    2 65844 3.037483e-05
## 15650    2 65844 3.037483e-05
## 15651    2 65844 3.037483e-05
## 15652    2 65844 3.037483e-05
## 15653    2 65844 3.037483e-05
## 15654    2 65844 3.037483e-05
## 15655    2 65844 3.037483e-05
## 15656    2 65844 3.037483e-05
## 15657    2 65844 3.037483e-05
## 15658    2 65844 3.037483e-05
## 15659    2 65844 3.037483e-05
## 15660    2 65844 3.037483e-05
## 15661    2 65844 3.037483e-05
## 15662    2 65844 3.037483e-05
## 15663    2 65844 3.037483e-05
## 15664    2 65844 3.037483e-05
## 15665    2 65844 3.037483e-05
## 15666    2 65844 3.037483e-05
## 15667    2 65844 3.037483e-05
## 15668    2 65844 3.037483e-05
## 15669    2 65844 3.037483e-05
## 15670    2 65844 3.037483e-05
## 15671    2 65844 3.037483e-05
## 15672    2 65844 3.037483e-05
## 15673    2 65844 3.037483e-05
## 15674    2 65844 3.037483e-05
## 15675    2 65844 3.037483e-05
## 15676    2 65844 3.037483e-05
## 15677    2 65844 3.037483e-05
## 15678    2 65844 3.037483e-05
## 15679    2 65844 3.037483e-05
## 15680    2 65844 3.037483e-05
## 15681    2 65844 3.037483e-05
## 15682    2 65844 3.037483e-05
## 15683    2 65844 3.037483e-05
## 15684    2 65844 3.037483e-05
## 15685    2 65844 3.037483e-05
## 15686    2 65844 3.037483e-05
## 15687    2 65844 3.037483e-05
## 15688    2 65844 3.037483e-05
## 15689    2 65844 3.037483e-05
## 15690    2 65844 3.037483e-05
## 15691    2 65844 3.037483e-05
## 15692    2 65844 3.037483e-05
## 15693    2 65844 3.037483e-05
## 15694    2 65844 3.037483e-05
## 15695    2 65844 3.037483e-05
## 15696    2 65844 3.037483e-05
## 15697    2 65844 3.037483e-05
## 15698    2 65844 3.037483e-05
## 15699    2 65844 3.037483e-05
## 15700    2 65844 3.037483e-05
## 15701    2 65844 3.037483e-05
## 15702    2 65844 3.037483e-05
## 15703    2 65844 3.037483e-05
## 15704    2 65844 3.037483e-05
## 15705    2 65844 3.037483e-05
## 15706    2 65844 3.037483e-05
## 15707    2 65844 3.037483e-05
## 15708    2 65844 3.037483e-05
## 15709    2 65844 3.037483e-05
## 15710    2 65844 3.037483e-05
## 15711    2 65844 3.037483e-05
## 15712    2 65844 3.037483e-05
## 15713    2 65844 3.037483e-05
## 15714    2 65844 3.037483e-05
## 15715    2 65844 3.037483e-05
## 15716    2 65844 3.037483e-05
## 15717    2 65844 3.037483e-05
## 15718    2 65844 3.037483e-05
## 15719    2 65844 3.037483e-05
## 15720    2 65844 3.037483e-05
## 15721    2 65844 3.037483e-05
## 15722    2 65844 3.037483e-05
## 15723    2 65844 3.037483e-05
## 15724    2 65844 3.037483e-05
## 15725    2 65844 3.037483e-05
## 15726    2 65844 3.037483e-05
## 15727    2 65844 3.037483e-05
## 15728    2 65844 3.037483e-05
## 15729    2 65844 3.037483e-05
## 15730    2 65844 3.037483e-05
## 15731    2 65844 3.037483e-05
## 15732    2 65844 3.037483e-05
## 15733    2 65844 3.037483e-05
## 15734    2 65844 3.037483e-05
## 15735    2 55641 3.594472e-05
## 15736    2 55641 3.594472e-05
## 15737    2 55641 3.594472e-05
## 15738    2 55641 3.594472e-05
## 15739    2 55641 3.594472e-05
## 15740    2 55641 3.594472e-05
## 15741    2 55641 3.594472e-05
## 15742    2 55641 3.594472e-05
## 15743    2 55641 3.594472e-05
## 15744    2 55641 3.594472e-05
## 15745    2 55641 3.594472e-05
## 15746    2 55641 3.594472e-05
## 15747    2 55641 3.594472e-05
## 15748    2 55641 3.594472e-05
## 15749    2 55641 3.594472e-05
## 15750    2 55641 3.594472e-05
## 15751    2 55641 3.594472e-05
## 15752    2 55641 3.594472e-05
## 15753    2 55641 3.594472e-05
## 15754    2 55641 3.594472e-05
## 15755    2 55641 3.594472e-05
## 15756    2 55641 3.594472e-05
## 15757    2 55641 3.594472e-05
## 15758    2 55641 3.594472e-05
## 15759    2 55641 3.594472e-05
## 15760    2 55641 3.594472e-05
## 15761    2 55641 3.594472e-05
## 15762    2 55641 3.594472e-05
## 15763    2 55641 3.594472e-05
## 15764    2 55641 3.594472e-05
## 15765    2 55641 3.594472e-05
## 15766    2 55641 3.594472e-05
## 15767    2 55641 3.594472e-05
## 15768    2 55641 3.594472e-05
## 15769    2 55641 3.594472e-05
## 15770    2 55641 3.594472e-05
## 15771    2 55641 3.594472e-05
## 15772    2 55641 3.594472e-05
## 15773    2 55641 3.594472e-05
## 15774    2 55641 3.594472e-05
## 15775    2 55641 3.594472e-05
## 15776    2 55641 3.594472e-05
## 15777    2 55641 3.594472e-05
## 15778    2 55641 3.594472e-05
## 15779    2 55641 3.594472e-05
## 15780    2 55641 3.594472e-05
## 15781    2 55641 3.594472e-05
## 15782    2 55641 3.594472e-05
## 15783    2 55641 3.594472e-05
## 15784    2 55641 3.594472e-05
## 15785    2 55641 3.594472e-05
## 15786    2 55641 3.594472e-05
## 15787    2 55641 3.594472e-05
## 15788    2 55641 3.594472e-05
## 15789    2 55641 3.594472e-05
## 15790    2 55641 3.594472e-05
## 15791    2 55641 3.594472e-05
## 15792    2 55641 3.594472e-05
## 15793    2 55641 3.594472e-05
## 15794    2 55641 3.594472e-05
## 15795    2 55641 3.594472e-05
## 15796    2 55641 3.594472e-05
## 15797    2 55641 3.594472e-05
## 15798    2 55641 3.594472e-05
## 15799    2 55641 3.594472e-05
## 15800    2 55641 3.594472e-05
## 15801    2 55641 3.594472e-05
## 15802    2 55641 3.594472e-05
## 15803    2 55641 3.594472e-05
## 15804    2 55641 3.594472e-05
## 15805    2 55641 3.594472e-05
## 15806    2 55641 3.594472e-05
## 15807    2 55641 3.594472e-05
## 15808    2 55641 3.594472e-05
## 15809    2 55641 3.594472e-05
## 15810    2 55641 3.594472e-05
## 15811    2 55641 3.594472e-05
## 15812    2 55641 3.594472e-05
## 15813    2 55641 3.594472e-05
## 15814    2 55641 3.594472e-05
## 15815    2 55641 3.594472e-05
## 15816    2 55641 3.594472e-05
## 15817    2 55641 3.594472e-05
## 15818    2 55641 3.594472e-05
## 15819    2 55641 3.594472e-05
## 15820    2 55641 3.594472e-05
## 15821    2 55641 3.594472e-05
## 15822    2 55641 3.594472e-05
## 15823    2 55641 3.594472e-05
## 15824    2 55641 3.594472e-05
## 15825    2 55641 3.594472e-05
## 15826    2 55641 3.594472e-05
## 15827    2 55641 3.594472e-05
## 15828    2 55641 3.594472e-05
## 15829    2 55641 3.594472e-05
## 15830    2 55641 3.594472e-05
## 15831    2 55641 3.594472e-05
## 15832    2 55641 3.594472e-05
## 15833    2 55641 3.594472e-05
## 15834    2 55641 3.594472e-05
## 15835    2 55641 3.594472e-05
## 15836    2 55641 3.594472e-05
## 15837    2 55641 3.594472e-05
## 15838    2 55641 3.594472e-05
## 15839    2 55641 3.594472e-05
## 15840    2 55641 3.594472e-05
## 15841    2 55641 3.594472e-05
## 15842    2 55641 3.594472e-05
## 15843    2 55641 3.594472e-05
## 15844    2 55641 3.594472e-05
## 15845    2 55641 3.594472e-05
## 15846    2 55641 3.594472e-05
## 15847    2 55641 3.594472e-05
## 15848    2 55641 3.594472e-05
## 15849    2 55641 3.594472e-05
## 15850    2 55641 3.594472e-05
## 15851    2 55641 3.594472e-05
## 15852    2 55641 3.594472e-05
## 15853    2 55641 3.594472e-05
## 15854    2 55641 3.594472e-05
## 15855    2 55641 3.594472e-05
## 15856    2 55641 3.594472e-05
## 15857    2 55641 3.594472e-05
## 15858    2 55641 3.594472e-05
## 15859    2 55641 3.594472e-05
## 15860    2 55641 3.594472e-05
## 15861    2 55641 3.594472e-05
## 15862    2 55641 3.594472e-05
## 15863    2 55641 3.594472e-05
## 15864    2 55641 3.594472e-05
## 15865    2 55641 3.594472e-05
## 15866    2 55641 3.594472e-05
## 15867    2 55641 3.594472e-05
## 15868    2 55641 3.594472e-05
## 15869    2 55641 3.594472e-05
## 15870    2 55641 3.594472e-05
## 15871    2 55641 3.594472e-05
## 15872    2 55641 3.594472e-05
## 15873    2 55641 3.594472e-05
## 15874    2 55641 3.594472e-05
## 15875    2 55641 3.594472e-05
## 15876    2 55641 3.594472e-05
## 15877    2 55641 3.594472e-05
## 15878    2 55641 3.594472e-05
## 15879    2 55641 3.594472e-05
## 15880    2 55641 3.594472e-05
## 15881    2 55641 3.594472e-05
## 15882    2 55641 3.594472e-05
## 15883    2 55641 3.594472e-05
## 15884    2 55641 3.594472e-05
## 15885    2 55641 3.594472e-05
## 15886    2 55641 3.594472e-05
## 15887    2 55641 3.594472e-05
## 15888    2 55641 3.594472e-05
## 15889    2 55641 3.594472e-05
## 15890    2 55641 3.594472e-05
## 15891    2 55641 3.594472e-05
## 15892    2 55641 3.594472e-05
## 15893    2 55641 3.594472e-05
## 15894    2 55641 3.594472e-05
## 15895    2 55641 3.594472e-05
## 15896    2 55641 3.594472e-05
## 15897    2 55641 3.594472e-05
## 15898    2 55641 3.594472e-05
## 15899    2 55641 3.594472e-05
## 15900    2 55641 3.594472e-05
## 15901    2 55641 3.594472e-05
## 15902    2 55641 3.594472e-05
## 15903    2 55641 3.594472e-05
## 15904    2 55641 3.594472e-05
## 15905    2 55641 3.594472e-05
## 15906    2 55641 3.594472e-05
## 15907    2 55641 3.594472e-05
## 15908    2 55641 3.594472e-05
## 15909    2 55641 3.594472e-05
## 15910    2 55641 3.594472e-05
## 15911    2 55641 3.594472e-05
## 15912    2 55641 3.594472e-05
## 15913    2 55641 3.594472e-05
## 15914    2 55641 3.594472e-05
## 15915    2 55641 3.594472e-05
## 15916    2 55641 3.594472e-05
## 15917    2 55641 3.594472e-05
## 15918    2 55641 3.594472e-05
## 15919    2 55641 3.594472e-05
## 15920    2 55641 3.594472e-05
## 15921    2 55641 3.594472e-05
## 15922    2 55641 3.594472e-05
## 15923    2 55641 3.594472e-05
## 15924    2 55641 3.594472e-05
## 15925    2 55641 3.594472e-05
## 15926    2 55641 3.594472e-05
## 15927    2 55641 3.594472e-05
## 15928    2 55641 3.594472e-05
## 15929    2 55641 3.594472e-05
## 15930    2 55641 3.594472e-05
## 15931    2 55641 3.594472e-05
## 15932    2 55641 3.594472e-05
## 15933    2 55641 3.594472e-05
## 15934    2 55641 3.594472e-05
## 15935    2 55641 3.594472e-05
## 15936    2 55641 3.594472e-05
## 15937    2 55641 3.594472e-05
## 15938    2 55641 3.594472e-05
## 15939    2 55641 3.594472e-05
## 15940    2 55641 3.594472e-05
## 15941    2 55641 3.594472e-05
## 15942    2 55641 3.594472e-05
## 15943    2 55641 3.594472e-05
## 15944    2 55641 3.594472e-05
## 15945    2 55641 3.594472e-05
## 15946    2 55641 3.594472e-05
## 15947    2 55641 3.594472e-05
## 15948    2 55641 3.594472e-05
## 15949    2 55641 3.594472e-05
## 15950    2 55641 3.594472e-05
## 15951    2 55641 3.594472e-05
## 15952    2 55641 3.594472e-05
## 15953    2 55641 3.594472e-05
## 15954    2 55641 3.594472e-05
## 15955    2 55641 3.594472e-05
## 15956    2 55641 3.594472e-05
## 15957    2 55641 3.594472e-05
## 15958    2 55641 3.594472e-05
## 15959    2 55641 3.594472e-05
## 15960    2 55641 3.594472e-05
## 15961    2 55641 3.594472e-05
## 15962    2 55641 3.594472e-05
## 15963    2 55641 3.594472e-05
## 15964    2 55641 3.594472e-05
## 15965    2 55641 3.594472e-05
## 15966    2 55641 3.594472e-05
## 15967    2 55641 3.594472e-05
## 15968    2 55641 3.594472e-05
## 15969    2 55641 3.594472e-05
## 15970    2 55641 3.594472e-05
## 15971    2 55641 3.594472e-05
## 15972    2 55641 3.594472e-05
## 15973    2 55641 3.594472e-05
## 15974    2 55641 3.594472e-05
## 15975    2 55641 3.594472e-05
## 15976    2 55641 3.594472e-05
## 15977    2 55641 3.594472e-05
## 15978    2 55641 3.594472e-05
## 15979    2 55641 3.594472e-05
## 15980    2 55641 3.594472e-05
## 15981    2 55641 3.594472e-05
## 15982    2 55641 3.594472e-05
## 15983    2 55641 3.594472e-05
## 15984    2 55641 3.594472e-05
## 15985    2 55641 3.594472e-05
## 15986    2 55641 3.594472e-05
## 15987    2 55641 3.594472e-05
## 15988    2 55641 3.594472e-05
## 15989    2 55641 3.594472e-05
## 15990    2 55641 3.594472e-05
## 15991    2 55641 3.594472e-05
## 15992    2 55641 3.594472e-05
## 15993    2 55641 3.594472e-05
## 15994    2 55641 3.594472e-05
## 15995    2 55641 3.594472e-05
## 15996    2 55641 3.594472e-05
## 15997    2 55641 3.594472e-05
## 15998    2 55641 3.594472e-05
## 15999    2 55641 3.594472e-05
## 16000    2 55641 3.594472e-05
## 16001    2 55641 3.594472e-05
## 16002    2 55641 3.594472e-05
## 16003    2 55641 3.594472e-05
## 16004    2 55641 3.594472e-05
## 16005    2 55641 3.594472e-05
## 16006    2 55641 3.594472e-05
## 16007    2 55641 3.594472e-05
## 16008    2 55641 3.594472e-05
## 16009    2 55641 3.594472e-05
## 16010    2 55641 3.594472e-05
## 16011    2 55641 3.594472e-05
## 16012    2 55641 3.594472e-05
## 16013    2 55641 3.594472e-05
## 16014    2 55641 3.594472e-05
## 16015    2 55641 3.594472e-05
## 16016    2 55641 3.594472e-05
## 16017    2 55641 3.594472e-05
## 16018    2 55641 3.594472e-05
## 16019    2 55641 3.594472e-05
## 16020    2 55641 3.594472e-05
## 16021    2 55641 3.594472e-05
## 16022    2 55641 3.594472e-05
## 16023    2 55641 3.594472e-05
## 16024    2 55641 3.594472e-05
## 16025    2 55641 3.594472e-05
## 16026    2 55641 3.594472e-05
## 16027    2 55641 3.594472e-05
## 16028    2 55641 3.594472e-05
## 16029    2 55641 3.594472e-05
## 16030    2 55641 3.594472e-05
## 16031    2 55641 3.594472e-05
## 16032    2 55641 3.594472e-05
## 16033    2 55641 3.594472e-05
## 16034    2 55641 3.594472e-05
## 16035    2 55641 3.594472e-05
## 16036    2 55641 3.594472e-05
## 16037    2 55641 3.594472e-05
## 16038    2 55641 3.594472e-05
## 16039    2 55641 3.594472e-05
## 16040    2 55641 3.594472e-05
## 16041    2 55641 3.594472e-05
## 16042    2 55641 3.594472e-05
## 16043    2 55641 3.594472e-05
## 16044    2 55641 3.594472e-05
## 16045    2 55641 3.594472e-05
## 16046    2 55641 3.594472e-05
## 16047    2 55641 3.594472e-05
## 16048    2 55641 3.594472e-05
## 16049    2 55641 3.594472e-05
## 16050    2 55641 3.594472e-05
## 16051    2 55641 3.594472e-05
## 16052    2 55641 3.594472e-05
## 16053    2 55641 3.594472e-05
## 16054    2 55641 3.594472e-05
## 16055    2 55641 3.594472e-05
## 16056    2 55641 3.594472e-05
## 16057    2 55641 3.594472e-05
## 16058    2 55641 3.594472e-05
## 16059    2 55641 3.594472e-05
## 16060    2 55641 3.594472e-05
## 16061    2 55641 3.594472e-05
## 16062    2 55641 3.594472e-05
## 16063    2 55641 3.594472e-05
## 16064    2 55641 3.594472e-05
## 16065    2 55641 3.594472e-05
## 16066    2 55641 3.594472e-05
## 16067    2 55641 3.594472e-05
## 16068    2 55641 3.594472e-05
## 16069    2 55641 3.594472e-05
## 16070    2 55641 3.594472e-05
## 16071    2 55641 3.594472e-05
## 16072    2 55641 3.594472e-05
## 16073    2 55641 3.594472e-05
## 16074    2 55641 3.594472e-05
## 16075    2 55641 3.594472e-05
## 16076    2 55641 3.594472e-05
## 16077    2 55641 3.594472e-05
## 16078    2 55641 3.594472e-05
## 16079    2 55641 3.594472e-05
## 16080    2 55641 3.594472e-05
## 16081    2 55641 3.594472e-05
## 16082    2 55641 3.594472e-05
## 16083    2 55641 3.594472e-05
## 16084    2 55641 3.594472e-05
## 16085    2 55641 3.594472e-05
## 16086    2 55641 3.594472e-05
## 16087    2 55641 3.594472e-05
## 16088    2 55641 3.594472e-05
## 16089    2 55641 3.594472e-05
## 16090    2 55641 3.594472e-05
## 16091    2 55641 3.594472e-05
## 16092    2 55641 3.594472e-05
## 16093    2 55641 3.594472e-05
## 16094    2 55641 3.594472e-05
## 16095    2 55641 3.594472e-05
## 16096    2 55641 3.594472e-05
## 16097    2 55641 3.594472e-05
## 16098    2 55641 3.594472e-05
## 16099    2 55641 3.594472e-05
## 16100    2 55641 3.594472e-05
## 16101    2 55641 3.594472e-05
## 16102    2 55641 3.594472e-05
## 16103    2 55641 3.594472e-05
## 16104    2 55641 3.594472e-05
## 16105    2 55641 3.594472e-05
## 16106    2 55641 3.594472e-05
## 16107    2 55641 3.594472e-05
## 16108    2 55641 3.594472e-05
## 16109    2 55641 3.594472e-05
## 16110    2 55641 3.594472e-05
## 16111    2 55641 3.594472e-05
## 16112    2 55641 3.594472e-05
## 16113    2 55641 3.594472e-05
## 16114    2 55641 3.594472e-05
## 16115    2 55641 3.594472e-05
## 16116    2 55641 3.594472e-05
## 16117    2 55641 3.594472e-05
## 16118    2 55641 3.594472e-05
## 16119    2 55641 3.594472e-05
## 16120    2 55641 3.594472e-05
## 16121    2 55641 3.594472e-05
## 16122    2 55641 3.594472e-05
## 16123    2 55641 3.594472e-05
## 16124    2 55641 3.594472e-05
## 16125    2 55641 3.594472e-05
## 16126    2 55641 3.594472e-05
## 16127    2 55641 3.594472e-05
## 16128    2 55641 3.594472e-05
## 16129    2 55641 3.594472e-05
## 16130    2 55641 3.594472e-05
## 16131    2 55641 3.594472e-05
## 16132    2 55641 3.594472e-05
## 16133    2 55641 3.594472e-05
## 16134    2 55641 3.594472e-05
## 16135    2 55641 3.594472e-05
## 16136    2 55641 3.594472e-05
## 16137    2 55641 3.594472e-05
## 16138    2 55641 3.594472e-05
## 16139    2 55641 3.594472e-05
## 16140    2 55641 3.594472e-05
## 16141    2 55641 3.594472e-05
## 16142    2 55641 3.594472e-05
## 16143    2 55641 3.594472e-05
## 16144    2 55641 3.594472e-05
## 16145    2 55641 3.594472e-05
## 16146    2 55641 3.594472e-05
## 16147    2 55641 3.594472e-05
## 16148    2 55641 3.594472e-05
## 16149    2 55641 3.594472e-05
## 16150    2 55641 3.594472e-05
## 16151    2 55641 3.594472e-05
## 16152    2 55641 3.594472e-05
## 16153    2 55641 3.594472e-05
## 16154    2 55641 3.594472e-05
## 16155    2 55641 3.594472e-05
## 16156    2 55641 3.594472e-05
## 16157    2 55641 3.594472e-05
## 16158    2 55641 3.594472e-05
## 16159    2 55641 3.594472e-05
## 16160    2 55641 3.594472e-05
## 16161    2 55641 3.594472e-05
## 16162    2 55641 3.594472e-05
## 16163    2 55641 3.594472e-05
## 16164    2 55641 3.594472e-05
## 16165    2 55641 3.594472e-05
## 16166    2 55641 3.594472e-05
## 16167    2 55641 3.594472e-05
## 16168    2 55641 3.594472e-05
## 16169    2 55641 3.594472e-05
## 16170    2 55641 3.594472e-05
## 16171    2 55641 3.594472e-05
## 16172    2 55641 3.594472e-05
## 16173    2 55641 3.594472e-05
## 16174    2 55641 3.594472e-05
## 16175    2 55641 3.594472e-05
## 16176    2 55641 3.594472e-05
## 16177    2 55641 3.594472e-05
## 16178    2 55641 3.594472e-05
## 16179    2 55641 3.594472e-05
## 16180    2 55641 3.594472e-05
## 16181    2 55641 3.594472e-05
## 16182    2 55641 3.594472e-05
## 16183    2 55641 3.594472e-05
## 16184    2 55641 3.594472e-05
## 16185    2 55641 3.594472e-05
## 16186    2 55641 3.594472e-05
## 16187    2 55641 3.594472e-05
## 16188    2 55641 3.594472e-05
## 16189    2 55641 3.594472e-05
## 16190    2 55641 3.594472e-05
## 16191    2 55641 3.594472e-05
## 16192    2 55641 3.594472e-05
## 16193    2 55641 3.594472e-05
## 16194    2 55641 3.594472e-05
## 16195    2 55641 3.594472e-05
## 16196    2 55641 3.594472e-05
## 16197    2 55641 3.594472e-05
## 16198    2 55641 3.594472e-05
## 16199    2 55641 3.594472e-05
## 16200    2 55641 3.594472e-05
## 16201    2 55641 3.594472e-05
## 16202    2 55641 3.594472e-05
## 16203    2 55641 3.594472e-05
## 16204    2 55641 3.594472e-05
## 16205    2 55641 3.594472e-05
## 16206    2 55641 3.594472e-05
## 16207    2 55641 3.594472e-05
## 16208    2 55641 3.594472e-05
## 16209    2 55641 3.594472e-05
## 16210    2 55641 3.594472e-05
## 16211    2 55641 3.594472e-05
## 16212    2 55641 3.594472e-05
## 16213    2 55641 3.594472e-05
## 16214    2 55641 3.594472e-05
## 16215    2 55641 3.594472e-05
## 16216    2 55641 3.594472e-05
## 16217    2 55641 3.594472e-05
## 16218    2 55641 3.594472e-05
## 16219    2 55641 3.594472e-05
## 16220    2 55641 3.594472e-05
## 16221    2 55641 3.594472e-05
## 16222    2 55641 3.594472e-05
## 16223    2 55641 3.594472e-05
## 16224    2 55641 3.594472e-05
## 16225    2 55641 3.594472e-05
## 16226    2 55641 3.594472e-05
## 16227    2 55641 3.594472e-05
## 16228    2 55641 3.594472e-05
## 16229    2 55641 3.594472e-05
## 16230    2 55641 3.594472e-05
## 16231    2 55641 3.594472e-05
## 16232    2 55641 3.594472e-05
## 16233    2 55641 3.594472e-05
## 16234    2 55641 3.594472e-05
## 16235    2 55641 3.594472e-05
## 16236    2 55641 3.594472e-05
## 16237    2 55641 3.594472e-05
## 16238    2 55641 3.594472e-05
## 16239    2 55641 3.594472e-05
## 16240    2 55641 3.594472e-05
## 16241    2 55641 3.594472e-05
## 16242    2 55641 3.594472e-05
## 16243    2 55641 3.594472e-05
## 16244    2 55641 3.594472e-05
## 16245    2 55641 3.594472e-05
## 16246    2 55641 3.594472e-05
## 16247    2 55641 3.594472e-05
## 16248    2 55641 3.594472e-05
## 16249    2 55641 3.594472e-05
## 16250    2 55641 3.594472e-05
## 16251    2 55641 3.594472e-05
## 16252    2 55641 3.594472e-05
## 16253    2 55641 3.594472e-05
## 16254    2 55641 3.594472e-05
## 16255    2 55641 3.594472e-05
## 16256    2 55641 3.594472e-05
## 16257    2 55641 3.594472e-05
## 16258    2 55641 3.594472e-05
## 16259    2 55641 3.594472e-05
## 16260    2 55641 3.594472e-05
## 16261    2 55641 3.594472e-05
## 16262    2 55641 3.594472e-05
## 16263    2 55641 3.594472e-05
## 16264    2 55641 3.594472e-05
## 16265    2 55641 3.594472e-05
## 16266    2 55641 3.594472e-05
## 16267    2 55641 3.594472e-05
## 16268    2 55641 3.594472e-05
## 16269    2 55641 3.594472e-05
## 16270    2 55641 3.594472e-05
## 16271    2 55641 3.594472e-05
## 16272    2 55641 3.594472e-05
## 16273    2 55641 3.594472e-05
## 16274    2 55641 3.594472e-05
## 16275    2 55641 3.594472e-05
## 16276    2 55641 3.594472e-05
## 16277    2 55641 3.594472e-05
## 16278    2 55641 3.594472e-05
## 16279    2 55641 3.594472e-05
## 16280    2 55641 3.594472e-05
## 16281    2 55641 3.594472e-05
## 16282    2 55641 3.594472e-05
## 16283    2 55641 3.594472e-05
## 16284    2 55641 3.594472e-05
## 16285    2 55641 3.594472e-05
## 16286    2 55641 3.594472e-05
## 16287    2 55641 3.594472e-05
## 16288    2 55641 3.594472e-05
## 16289    2 55641 3.594472e-05
## 16290    2 55641 3.594472e-05
## 16291    2 55641 3.594472e-05
## 16292    2 55641 3.594472e-05
## 16293    2 55641 3.594472e-05
## 16294    2 55641 3.594472e-05
## 16295    2 55641 3.594472e-05
## 16296    2 55641 3.594472e-05
## 16297    2 55641 3.594472e-05
## 16298    2 55641 3.594472e-05
## 16299    2 55641 3.594472e-05
## 16300    2 55641 3.594472e-05
## 16301    2 55641 3.594472e-05
## 16302    2 55641 3.594472e-05
## 16303    2 55641 3.594472e-05
## 16304    2 55641 3.594472e-05
## 16305    2 55641 3.594472e-05
## 16306    2 55641 3.594472e-05
## 16307    2 55641 3.594472e-05
## 16308    2 55641 3.594472e-05
## 16309    2 55641 3.594472e-05
## 16310    2 55641 3.594472e-05
## 16311    2 55641 3.594472e-05
## 16312    2 55641 3.594472e-05
## 16313    2 55641 3.594472e-05
## 16314    2 55641 3.594472e-05
## 16315    2 55641 3.594472e-05
## 16316    2 55641 3.594472e-05
## 16317    2 55641 3.594472e-05
## 16318    2 55641 3.594472e-05
## 16319    2 55641 3.594472e-05
## 16320    2 55641 3.594472e-05
## 16321    2 55641 3.594472e-05
## 16322    2 55641 3.594472e-05
## 16323    2 55641 3.594472e-05
## 16324    2 55641 3.594472e-05
## 16325    2 55641 3.594472e-05
## 16326    2 55641 3.594472e-05
## 16327    2 55641 3.594472e-05
## 16328    2 55641 3.594472e-05
## 16329    2 55641 3.594472e-05
## 16330    2 55641 3.594472e-05
## 16331    2 55641 3.594472e-05
## 16332    2 55641 3.594472e-05
## 16333    2 55641 3.594472e-05
## 16334    2 55641 3.594472e-05
## 16335    2 55641 3.594472e-05
## 16336    2 55641 3.594472e-05
## 16337    2 55641 3.594472e-05
## 16338    2 55641 3.594472e-05
## 16339    2 55641 3.594472e-05
## 16340    2 55641 3.594472e-05
## 16341    2 55641 3.594472e-05
## 16342    2 55641 3.594472e-05
## 16343    2 55641 3.594472e-05
## 16344    2 55641 3.594472e-05
## 16345    2 55641 3.594472e-05
## 16346    2 55641 3.594472e-05
## 16347    2 55641 3.594472e-05
## 16348    2 55641 3.594472e-05
## 16349    2 55641 3.594472e-05
## 16350    2 55641 3.594472e-05
## 16351    2 55641 3.594472e-05
## 16352    2 55641 3.594472e-05
## 16353    2 55641 3.594472e-05
## 16354    2 55641 3.594472e-05
## 16355    2 55641 3.594472e-05
## 16356    2 55641 3.594472e-05
## 16357    2 55641 3.594472e-05
## 16358    2 55641 3.594472e-05
## 16359    2 55641 3.594472e-05
## 16360    2 55641 3.594472e-05
## 16361    2 55641 3.594472e-05
## 16362    2 55641 3.594472e-05
## 16363    2 55641 3.594472e-05
## 16364    2 55641 3.594472e-05
## 16365    2 55641 3.594472e-05
## 16366    2 55641 3.594472e-05
## 16367    2 55641 3.594472e-05
## 16368    2 55641 3.594472e-05
## 16369    2 55641 3.594472e-05
## 16370    2 55641 3.594472e-05
## 16371    2 55641 3.594472e-05
## 16372    2 55641 3.594472e-05
## 16373    2 55641 3.594472e-05
## 16374    2 55641 3.594472e-05
## 16375    2 55641 3.594472e-05
## 16376    2 55641 3.594472e-05
## 16377    2 55641 3.594472e-05
## 16378    2 55641 3.594472e-05
## 16379    2 55641 3.594472e-05
## 16380    2 55641 3.594472e-05
## 16381    2 55641 3.594472e-05
## 16382    2 55641 3.594472e-05
## 16383    2 55641 3.594472e-05
## 16384    2 55641 3.594472e-05
## 16385    2 55641 3.594472e-05
## 16386    2 55641 3.594472e-05
## 16387    2 55641 3.594472e-05
## 16388    2 55641 3.594472e-05
## 16389    2 55641 3.594472e-05
## 16390    2 55641 3.594472e-05
## 16391    2 55641 3.594472e-05
## 16392    2 55641 3.594472e-05
## 16393    2 55641 3.594472e-05
## 16394    2 55641 3.594472e-05
## 16395    2 55641 3.594472e-05
## 16396    2 55641 3.594472e-05
## 16397    2 55641 3.594472e-05
## 16398    2 55641 3.594472e-05
## 16399    2 55641 3.594472e-05
## 16400    2 55641 3.594472e-05
## 16401    2 55641 3.594472e-05
## 16402    2 55641 3.594472e-05
## 16403    2 55641 3.594472e-05
## 16404    2 55641 3.594472e-05
## 16405    2 55641 3.594472e-05
## 16406    2 55641 3.594472e-05
## 16407    2 55641 3.594472e-05
## 16408    2 55641 3.594472e-05
## 16409    2 55641 3.594472e-05
## 16410    2 55641 3.594472e-05
## 16411    2 55641 3.594472e-05
## 16412    2 55641 3.594472e-05
## 16413    2 55641 3.594472e-05
## 16414    2 55641 3.594472e-05
## 16415    2 55641 3.594472e-05
## 16416    2 55641 3.594472e-05
## 16417    2 55641 3.594472e-05
## 16418    2 55641 3.594472e-05
## 16419    2 55641 3.594472e-05
## 16420    2 55641 3.594472e-05
## 16421    2 55641 3.594472e-05
## 16422    2 55641 3.594472e-05
## 16423    2 55641 3.594472e-05
## 16424    2 55641 3.594472e-05
## 16425    2 55641 3.594472e-05
## 16426    2 55641 3.594472e-05
## 16427    2 55641 3.594472e-05
## 16428    2 55641 3.594472e-05
## 16429    2 55641 3.594472e-05
## 16430    2 55641 3.594472e-05
## 16431    2 55641 3.594472e-05
## 16432    2 55641 3.594472e-05
## 16433    2 55641 3.594472e-05
## 16434    2 55641 3.594472e-05
## 16435    2 55641 3.594472e-05
## 16436    2 55641 3.594472e-05
## 16437    2 55641 3.594472e-05
## 16438    2 55641 3.594472e-05
## 16439    2 55641 3.594472e-05
## 16440    2 55641 3.594472e-05
## 16441    2 55641 3.594472e-05
## 16442    2 55641 3.594472e-05
## 16443    2 55641 3.594472e-05
## 16444    2 55641 3.594472e-05
## 16445    2 55641 3.594472e-05
## 16446    2 55641 3.594472e-05
## 16447    2 55641 3.594472e-05
## 16448    2 55641 3.594472e-05
## 16449    2 55641 3.594472e-05
## 16450    2 55641 3.594472e-05
## 16451    2 55641 3.594472e-05
## 16452    2 55641 3.594472e-05
## 16453    2 55641 3.594472e-05
## 16454    2 55641 3.594472e-05
## 16455    2 55641 3.594472e-05
## 16456    2 55641 3.594472e-05
## 16457    2 55641 3.594472e-05
## 16458    2 55641 3.594472e-05
## 16459    2 55641 3.594472e-05
## 16460    2 55641 3.594472e-05
## 16461    2 55641 3.594472e-05
## 16462    2 55641 3.594472e-05
## 16463    2 55641 3.594472e-05
## 16464    2 55641 3.594472e-05
## 16465    2 55641 3.594472e-05
## 16466    2 55641 3.594472e-05
## 16467    2 55641 3.594472e-05
## 16468    2 55641 3.594472e-05
## 16469    2 55641 3.594472e-05
## 16470    2 55641 3.594472e-05
## 16471    2 55641 3.594472e-05
## 16472    2 55641 3.594472e-05
## 16473    2 55641 3.594472e-05
## 16474    2 55641 3.594472e-05
## 16475    2 55641 3.594472e-05
## 16476    2 55641 3.594472e-05
## 16477    2 55641 3.594472e-05
## 16478    2 55641 3.594472e-05
## 16479    2 55641 3.594472e-05
## 16480    2 55641 3.594472e-05
## 16481    2 55641 3.594472e-05
## 16482    2 55641 3.594472e-05
## 16483    2 55641 3.594472e-05
## 16484    2 55641 3.594472e-05
## 16485    2 55641 3.594472e-05
## 16486    2 55641 3.594472e-05
## 16487    2 55641 3.594472e-05
## 16488    2 55641 3.594472e-05
## 16489    2 55641 3.594472e-05
## 16490    2 55641 3.594472e-05
## 16491    2 55641 3.594472e-05
## 16492    2 55641 3.594472e-05
## 16493    2 55641 3.594472e-05
## 16494    2 55641 3.594472e-05
## 16495    2 55641 3.594472e-05
## 16496    2 55641 3.594472e-05
## 16497    2 55641 3.594472e-05
## 16498    2 55641 3.594472e-05
## 16499    2 55641 3.594472e-05
## 16500    2 55641 3.594472e-05
## 16501    2 55641 3.594472e-05
## 16502    2 55641 3.594472e-05
## 16503    2 55641 3.594472e-05
## 16504    2 55641 3.594472e-05
## 16505    2 55641 3.594472e-05
## 16506    2 55641 3.594472e-05
## 16507    2 55641 3.594472e-05
## 16508    2 55641 3.594472e-05
## 16509    2 55641 3.594472e-05
## 16510    2 55641 3.594472e-05
## 16511    2 55641 3.594472e-05
## 16512    2 55641 3.594472e-05
## 16513    2 55641 3.594472e-05
## 16514    2 55641 3.594472e-05
## 16515    2 55641 3.594472e-05
## 16516    2 55641 3.594472e-05
## 16517    2 55641 3.594472e-05
## 16518    2 55641 3.594472e-05
## 16519    2 55641 3.594472e-05
## 16520    2 55641 3.594472e-05
## 16521    2 55641 3.594472e-05
## 16522    2 55641 3.594472e-05
## 16523    2 55641 3.594472e-05
## 16524    2 55641 3.594472e-05
## 16525    2 55641 3.594472e-05
## 16526    2 55641 3.594472e-05
## 16527    2 55641 3.594472e-05
## 16528    2 55641 3.594472e-05
## 16529    2 55641 3.594472e-05
## 16530    2 55641 3.594472e-05
## 16531    2 55641 3.594472e-05
## 16532    2 55641 3.594472e-05
## 16533    2 55641 3.594472e-05
## 16534    2 55641 3.594472e-05
## 16535    2 55641 3.594472e-05
## 16536    2 55641 3.594472e-05
## 16537    2 55641 3.594472e-05
## 16538    2 55641 3.594472e-05
## 16539    2 55641 3.594472e-05
## 16540    2 55641 3.594472e-05
## 16541    2 55641 3.594472e-05
## 16542    2 55641 3.594472e-05
## 16543    2 55641 3.594472e-05
## 16544    2 55641 3.594472e-05
## 16545    2 55641 3.594472e-05
## 16546    2 55641 3.594472e-05
## 16547    2 55641 3.594472e-05
## 16548    2 55641 3.594472e-05
## 16549    2 55641 3.594472e-05
## 16550    2 55641 3.594472e-05
## 16551    2 55641 3.594472e-05
## 16552    2 55641 3.594472e-05
## 16553    2 55641 3.594472e-05
## 16554    2 55641 3.594472e-05
## 16555    2 55641 3.594472e-05
## 16556    2 55641 3.594472e-05
## 16557    2 55641 3.594472e-05
## 16558    2 55641 3.594472e-05
## 16559    2 55641 3.594472e-05
## 16560    2 55641 3.594472e-05
## 16561    2 55641 3.594472e-05
## 16562    2 55641 3.594472e-05
## 16563    2 55641 3.594472e-05
## 16564    2 55641 3.594472e-05
## 16565    2 55641 3.594472e-05
## 16566    2 55641 3.594472e-05
## 16567    2 55641 3.594472e-05
## 16568    2 55641 3.594472e-05
## 16569    2 55641 3.594472e-05
## 16570    2 55641 3.594472e-05
## 16571    2 55641 3.594472e-05
## 16572    2 55641 3.594472e-05
## 16573    2 55641 3.594472e-05
## 16574    2 55641 3.594472e-05
## 16575    2 55641 3.594472e-05
## 16576    2 55641 3.594472e-05
## 16577    2 55641 3.594472e-05
## 16578    2 55641 3.594472e-05
## 16579    2 55641 3.594472e-05
## 16580    2 55641 3.594472e-05
## 16581    2 55641 3.594472e-05
## 16582    2 55641 3.594472e-05
## 16583    2 55641 3.594472e-05
## 16584    2 55641 3.594472e-05
## 16585    2 55641 3.594472e-05
## 16586    2 55641 3.594472e-05
## 16587    2 55641 3.594472e-05
## 16588    2 55641 3.594472e-05
## 16589    2 55641 3.594472e-05
## 16590    2 55641 3.594472e-05
## 16591    2 55641 3.594472e-05
## 16592    2 55641 3.594472e-05
## 16593    2 55641 3.594472e-05
## 16594    2 55641 3.594472e-05
## 16595    2 55641 3.594472e-05
## 16596    2 55641 3.594472e-05
## 16597    2 55641 3.594472e-05
## 16598    2 55641 3.594472e-05
## 16599    2 55641 3.594472e-05
## 16600    2 55641 3.594472e-05
## 16601    2 55641 3.594472e-05
## 16602    2 55641 3.594472e-05
## 16603    2 55641 3.594472e-05
## 16604    2 55641 3.594472e-05
## 16605    2 55641 3.594472e-05
## 16606    2 55641 3.594472e-05
## 16607    2 55641 3.594472e-05
## 16608    2 55641 3.594472e-05
## 16609    2 55641 3.594472e-05
## 16610    2 55641 3.594472e-05
## 16611    2 55641 3.594472e-05
## 16612    2 55641 3.594472e-05
## 16613    2 55641 3.594472e-05
## 16614    2 55641 3.594472e-05
## 16615    2 55641 3.594472e-05
## 16616    2 55641 3.594472e-05
## 16617    2 55641 3.594472e-05
## 16618    2 55641 3.594472e-05
## 16619    2 55641 3.594472e-05
## 16620    2 55641 3.594472e-05
## 16621    2 55641 3.594472e-05
## 16622    2 55641 3.594472e-05
## 16623    2 55641 3.594472e-05
## 16624    2 55641 3.594472e-05
## 16625    2 55641 3.594472e-05
## 16626    2 55641 3.594472e-05
## 16627    2 55641 3.594472e-05
## 16628    2 55641 3.594472e-05
## 16629    2 55641 3.594472e-05
## 16630    2 55641 3.594472e-05
## 16631    2 55641 3.594472e-05
## 16632    2 55641 3.594472e-05
## 16633    2 55641 3.594472e-05
## 16634    2 55641 3.594472e-05
## 16635    2 55641 3.594472e-05
## 16636    2 55641 3.594472e-05
## 16637    2 55641 3.594472e-05
## 16638    2 55641 3.594472e-05
## 16639    2 55641 3.594472e-05
## 16640    2 55641 3.594472e-05
## 16641    2 55641 3.594472e-05
## 16642    2 55641 3.594472e-05
## 16643    2 55641 3.594472e-05
## 16644    2 55641 3.594472e-05
## 16645    2 55641 3.594472e-05
## 16646    2 55641 3.594472e-05
## 16647    2 55641 3.594472e-05
## 16648    2 55641 3.594472e-05
## 16649    2 55641 3.594472e-05
## 16650    2 55641 3.594472e-05
## 16651    2 55641 3.594472e-05
## 16652    2 55641 3.594472e-05
## 16653    2 55641 3.594472e-05
## 16654    2 55641 3.594472e-05
## 16655    2 55641 3.594472e-05
## 16656    2 55641 3.594472e-05
## 16657    2 55641 3.594472e-05
## 16658    2 55641 3.594472e-05
## 16659    2 55641 3.594472e-05
## 16660    2 55641 3.594472e-05
## 16661    2 55641 3.594472e-05
## 16662    2 55641 3.594472e-05
## 16663    2 55641 3.594472e-05
## 16664    2 55641 3.594472e-05
## 16665    2 55641 3.594472e-05
## 16666    2 55641 3.594472e-05
## 16667    2 55641 3.594472e-05
## 16668    2 55641 3.594472e-05
## 16669    2 55641 3.594472e-05
## 16670    2 55641 3.594472e-05
## 16671    2 55641 3.594472e-05
## 16672    2 55641 3.594472e-05
## 16673    2 55641 3.594472e-05
## 16674    2 55641 3.594472e-05
## 16675    2 55641 3.594472e-05
## 16676    2 55641 3.594472e-05
## 16677    2 55641 3.594472e-05
## 16678    2 55641 3.594472e-05
## 16679    2 55641 3.594472e-05
## 16680    2 55641 3.594472e-05
## 16681    2 55641 3.594472e-05
## 16682    2 55641 3.594472e-05
## 16683    2 55641 3.594472e-05
## 16684    2 55641 3.594472e-05
## 16685    2 55641 3.594472e-05
## 16686    2 55641 3.594472e-05
## 16687    2 55641 3.594472e-05
## 16688    2 55641 3.594472e-05
## 16689    2 55641 3.594472e-05
## 16690    2 55641 3.594472e-05
## 16691    2 55641 3.594472e-05
## 16692    2 55641 3.594472e-05
## 16693    2 55641 3.594472e-05
## 16694    2 55641 3.594472e-05
## 16695    2 55641 3.594472e-05
## 16696    2 55641 3.594472e-05
## 16697    2 55641 3.594472e-05
## 16698    2 55641 3.594472e-05
## 16699    2 55641 3.594472e-05
## 16700    2 55641 3.594472e-05
## 16701    2 55641 3.594472e-05
## 16702    2 55641 3.594472e-05
## 16703    2 55641 3.594472e-05
## 16704    2 55641 3.594472e-05
## 16705    2 55641 3.594472e-05
## 16706    2 55641 3.594472e-05
## 16707    2 55641 3.594472e-05
## 16708    2 55641 3.594472e-05
## 16709    2 55641 3.594472e-05
## 16710    2 55641 3.594472e-05
## 16711    2 55641 3.594472e-05
## 16712    2 55641 3.594472e-05
## 16713    2 55641 3.594472e-05
## 16714    2 55641 3.594472e-05
## 16715    2 55641 3.594472e-05
## 16716    2 55641 3.594472e-05
## 16717    2 55641 3.594472e-05
## 16718    2 55641 3.594472e-05
## 16719    2 55641 3.594472e-05
## 16720    2 55641 3.594472e-05
## 16721    2 55641 3.594472e-05
## 16722    2 55641 3.594472e-05
## 16723    2 55641 3.594472e-05
## 16724    2 55641 3.594472e-05
## 16725    2 55641 3.594472e-05
## 16726    2 55641 3.594472e-05
## 16727    2 55641 3.594472e-05
## 16728    2 55641 3.594472e-05
## 16729    2 55641 3.594472e-05
## 16730    2 55641 3.594472e-05
## 16731    2 55641 3.594472e-05
## 16732    2 55641 3.594472e-05
## 16733    2 55641 3.594472e-05
## 16734    2 55641 3.594472e-05
## 16735    2 55641 3.594472e-05
## 16736    2 55641 3.594472e-05
## 16737    2 55641 3.594472e-05
## 16738    2 55641 3.594472e-05
## 16739    2 55641 3.594472e-05
## 16740    2 55641 3.594472e-05
## 16741    2 55641 3.594472e-05
## 16742    2 55641 3.594472e-05
## 16743    2 55641 3.594472e-05
## 16744    2 55641 3.594472e-05
## 16745    2 55641 3.594472e-05
## 16746    2 55641 3.594472e-05
## 16747    2 55641 3.594472e-05
## 16748    2 55641 3.594472e-05
## 16749    2 55641 3.594472e-05
## 16750    2 55641 3.594472e-05
## 16751    2 55641 3.594472e-05
## 16752    2 55641 3.594472e-05
## 16753    2 55641 3.594472e-05
## 16754    2 55641 3.594472e-05
## 16755    2 55641 3.594472e-05
## 16756    2 55641 3.594472e-05
## 16757    2 55641 3.594472e-05
## 16758    2 55641 3.594472e-05
## 16759    2 55641 3.594472e-05
## 16760    2 55641 3.594472e-05
## 16761    2 55641 3.594472e-05
## 16762    2 55641 3.594472e-05
## 16763    2 55641 3.594472e-05
## 16764    2 55641 3.594472e-05
## 16765    2 55641 3.594472e-05
## 16766    2 55641 3.594472e-05
## 16767    2 55641 3.594472e-05
## 16768    2 55641 3.594472e-05
## 16769    2 55641 3.594472e-05
## 16770    2 55641 3.594472e-05
## 16771    2 55641 3.594472e-05
## 16772    2 55641 3.594472e-05
## 16773    2 55641 3.594472e-05
## 16774    2 55641 3.594472e-05
## 16775    2 55641 3.594472e-05
## 16776    2 55641 3.594472e-05
## 16777    2 55641 3.594472e-05
## 16778    2 55641 3.594472e-05
## 16779    2 55641 3.594472e-05
## 16780    2 55641 3.594472e-05
## 16781    2 55641 3.594472e-05
## 16782    2 55641 3.594472e-05
## 16783    2 55641 3.594472e-05
## 16784    2 55641 3.594472e-05
## 16785    2 55641 3.594472e-05
## 16786    2 55641 3.594472e-05
## 16787    2 55641 3.594472e-05
## 16788    2 55641 3.594472e-05
## 16789    2 55641 3.594472e-05
## 16790    2 55641 3.594472e-05
## 16791    2 55641 3.594472e-05
## 16792    2 55641 3.594472e-05
## 16793    2 55641 3.594472e-05
## 16794    2 55641 3.594472e-05
## 16795    2 55641 3.594472e-05
## 16796    2 55641 3.594472e-05
## 16797    2 55641 3.594472e-05
## 16798    2 55641 3.594472e-05
## 16799    2 55641 3.594472e-05
## 16800    2 55641 3.594472e-05
## 16801    2 55641 3.594472e-05
## 16802    2 55641 3.594472e-05
## 16803    2 55641 3.594472e-05
## 16804    2 55641 3.594472e-05
## 16805    2 55641 3.594472e-05
## 16806    2 55641 3.594472e-05
## 16807    2 55641 3.594472e-05
## 16808    2 55641 3.594472e-05
## 16809    2 55641 3.594472e-05
## 16810    2 55641 3.594472e-05
## 16811    2 55641 3.594472e-05
## 16812    2 55641 3.594472e-05
## 16813    2 55641 3.594472e-05
## 16814    2 55641 3.594472e-05
## 16815    2 55641 3.594472e-05
## 16816    2 55641 3.594472e-05
## 16817    2 55641 3.594472e-05
## 16818    2 55641 3.594472e-05
## 16819    2 55641 3.594472e-05
## 16820    2 55641 3.594472e-05
## 16821    2 55641 3.594472e-05
## 16822    2 55641 3.594472e-05
## 16823    2 55641 3.594472e-05
## 16824    2 55641 3.594472e-05
## 16825    2 55641 3.594472e-05
## 16826    2 55641 3.594472e-05
## 16827    2 55641 3.594472e-05
## 16828    2 55641 3.594472e-05
## 16829    2 55641 3.594472e-05
## 16830    2 55641 3.594472e-05
## 16831    2 55641 3.594472e-05
## 16832    2 55641 3.594472e-05
## 16833    2 55641 3.594472e-05
## 16834    2 55641 3.594472e-05
## 16835    2 55641 3.594472e-05
## 16836    2 55641 3.594472e-05
## 16837    2 55641 3.594472e-05
## 16838    2 55641 3.594472e-05
## 16839    2 55641 3.594472e-05
## 16840    2 55641 3.594472e-05
## 16841    2 55641 3.594472e-05
## 16842    2 55641 3.594472e-05
## 16843    2 55641 3.594472e-05
## 16844    2 55641 3.594472e-05
## 16845    2 55641 3.594472e-05
## 16846    2 55641 3.594472e-05
## 16847    2 55641 3.594472e-05
## 16848    2 55641 3.594472e-05
## 16849    2 55641 3.594472e-05
## 16850    2 55641 3.594472e-05
## 16851    2 55641 3.594472e-05
## 16852    2 55641 3.594472e-05
## 16853    2 55641 3.594472e-05
## 16854    2 55641 3.594472e-05
## 16855    2 55641 3.594472e-05
## 16856    2 55641 3.594472e-05
## 16857    2 55641 3.594472e-05
## 16858    2 55641 3.594472e-05
## 16859    2 55641 3.594472e-05
## 16860    2 55641 3.594472e-05
## 16861    2 55641 3.594472e-05
## 16862    2 55641 3.594472e-05
## 16863    2 55641 3.594472e-05
## 16864    2 55641 3.594472e-05
## 16865    2 55641 3.594472e-05
## 16866    2 55641 3.594472e-05
## 16867    2 55641 3.594472e-05
## 16868    2 55641 3.594472e-05
## 16869    2 55641 3.594472e-05
## 16870    2 55641 3.594472e-05
## 16871    2 55641 3.594472e-05
## 16872    2 55641 3.594472e-05
## 16873    2 55641 3.594472e-05
## 16874    2 55641 3.594472e-05
## 16875    2 55641 3.594472e-05
## 16876    2 55641 3.594472e-05
## 16877    2 55641 3.594472e-05
## 16878    2 55641 3.594472e-05
## 16879    2 55641 3.594472e-05
## 16880    2 55641 3.594472e-05
## 16881    2 55641 3.594472e-05
## 16882    2 55641 3.594472e-05
## 16883    2 55641 3.594472e-05
## 16884    2 55641 3.594472e-05
## 16885    2 55641 3.594472e-05
## 16886    2 55641 3.594472e-05
## 16887    2 55641 3.594472e-05
## 16888    2 55641 3.594472e-05
## 16889    2 55641 3.594472e-05
## 16890    2 55641 3.594472e-05
## 16891    2 55641 3.594472e-05
## 16892    2 55641 3.594472e-05
## 16893    2 55641 3.594472e-05
## 16894    2 55641 3.594472e-05
## 16895    2 55641 3.594472e-05
## 16896    2 55641 3.594472e-05
## 16897    2 55641 3.594472e-05
## 16898    2 55641 3.594472e-05
## 16899    2 55641 3.594472e-05
## 16900    2 55641 3.594472e-05
## 16901    2 55641 3.594472e-05
## 16902    2 55641 3.594472e-05
## 16903    2 55641 3.594472e-05
## 16904    2 55641 3.594472e-05
## 16905    2 55641 3.594472e-05
## 16906    2 55641 3.594472e-05
## 16907    2 55641 3.594472e-05
## 16908    2 55641 3.594472e-05
## 16909    2 55641 3.594472e-05
## 16910    2 55641 3.594472e-05
## 16911    2 55641 3.594472e-05
## 16912    2 55641 3.594472e-05
## 16913    2 55641 3.594472e-05
## 16914    2 55641 3.594472e-05
## 16915    2 55641 3.594472e-05
## 16916    2 55641 3.594472e-05
## 16917    2 55641 3.594472e-05
## 16918    2 55641 3.594472e-05
## 16919    2 55641 3.594472e-05
## 16920    2 55641 3.594472e-05
## 16921    2 55641 3.594472e-05
## 16922    2 55641 3.594472e-05
## 16923    2 55641 3.594472e-05
## 16924    2 55641 3.594472e-05
## 16925    2 55641 3.594472e-05
## 16926    2 55641 3.594472e-05
## 16927    2 55641 3.594472e-05
## 16928    2 55641 3.594472e-05
## 16929    2 55641 3.594472e-05
## 16930    2 55641 3.594472e-05
## 16931    2 55641 3.594472e-05
## 16932    2 55641 3.594472e-05
## 16933    2 55641 3.594472e-05
## 16934    2 55641 3.594472e-05
## 16935    2 55641 3.594472e-05
## 16936    2 55641 3.594472e-05
## 16937    2 55641 3.594472e-05
## 16938    2 55641 3.594472e-05
## 16939    2 55641 3.594472e-05
## 16940    2 55641 3.594472e-05
## 16941    2 55641 3.594472e-05
## 16942    2 55641 3.594472e-05
## 16943    2 55641 3.594472e-05
## 16944    2 55641 3.594472e-05
## 16945    2 55641 3.594472e-05
## 16946    2 55641 3.594472e-05
## 16947    2 55641 3.594472e-05
## 16948    2 55641 3.594472e-05
## 16949    2 55641 3.594472e-05
## 16950    2 55641 3.594472e-05
## 16951    2 55641 3.594472e-05
## 16952    2 55641 3.594472e-05
## 16953    2 55641 3.594472e-05
## 16954    2 55641 3.594472e-05
## 16955    2 55641 3.594472e-05
## 16956    2 55641 3.594472e-05
## 16957    2 55641 3.594472e-05
## 16958    2 55641 3.594472e-05
## 16959    2 55641 3.594472e-05
## 16960    2 55641 3.594472e-05
## 16961    2 55641 3.594472e-05
## 16962    2 55641 3.594472e-05
## 16963    2 55641 3.594472e-05
## 16964    2 55641 3.594472e-05
## 16965    2 55641 3.594472e-05
## 16966    2 55641 3.594472e-05
## 16967    2 55641 3.594472e-05
## 16968    2 55641 3.594472e-05
## 16969    2 55641 3.594472e-05
## 16970    2 55641 3.594472e-05
## 16971    2 55641 3.594472e-05
## 16972    2 55641 3.594472e-05
## 16973    2 55641 3.594472e-05
## 16974    2 55641 3.594472e-05
## 16975    2 55641 3.594472e-05
## 16976    2 55641 3.594472e-05
## 16977    2 55641 3.594472e-05
## 16978    2 55641 3.594472e-05
## 16979    2 55641 3.594472e-05
## 16980    2 55641 3.594472e-05
## 16981    2 55641 3.594472e-05
## 16982    2 55641 3.594472e-05
## 16983    2 55641 3.594472e-05
## 16984    2 55641 3.594472e-05
## 16985    2 55641 3.594472e-05
## 16986    2 55641 3.594472e-05
## 16987    2 55641 3.594472e-05
## 16988    2 55641 3.594472e-05
## 16989    2 55641 3.594472e-05
## 16990    2 55641 3.594472e-05
## 16991    2 55641 3.594472e-05
## 16992    2 55641 3.594472e-05
## 16993    2 55641 3.594472e-05
## 16994    2 55641 3.594472e-05
## 16995    2 55641 3.594472e-05
## 16996    2 55641 3.594472e-05
## 16997    2 55641 3.594472e-05
## 16998    2 55641 3.594472e-05
## 16999    2 55641 3.594472e-05
## 17000    2 55641 3.594472e-05
## 17001    2 55641 3.594472e-05
## 17002    2 55641 3.594472e-05
## 17003    2 55641 3.594472e-05
## 17004    2 55641 3.594472e-05
## 17005    2 55641 3.594472e-05
## 17006    2 55641 3.594472e-05
## 17007    2 55641 3.594472e-05
## 17008    2 55641 3.594472e-05
## 17009    2 55641 3.594472e-05
## 17010    2 55641 3.594472e-05
## 17011    2 55641 3.594472e-05
## 17012    2 55641 3.594472e-05
## 17013    2 55641 3.594472e-05
## 17014    2 55641 3.594472e-05
## 17015    2 55641 3.594472e-05
## 17016    2 55641 3.594472e-05
## 17017    2 55641 3.594472e-05
## 17018    2 55641 3.594472e-05
## 17019    2 55641 3.594472e-05
## 17020    2 55641 3.594472e-05
## 17021    2 55641 3.594472e-05
## 17022    2 55641 3.594472e-05
## 17023    2 55641 3.594472e-05
## 17024    2 55641 3.594472e-05
## 17025    2 55641 3.594472e-05
## 17026    2 55641 3.594472e-05
## 17027    2 55641 3.594472e-05
## 17028    2 55641 3.594472e-05
## 17029    2 55641 3.594472e-05
## 17030    2 55641 3.594472e-05
## 17031    2 55641 3.594472e-05
## 17032    2 55641 3.594472e-05
## 17033    2 55641 3.594472e-05
## 17034    2 55641 3.594472e-05
## 17035    2 55641 3.594472e-05
## 17036    2 55641 3.594472e-05
## 17037    2 55641 3.594472e-05
## 17038    2 55641 3.594472e-05
## 17039    2 55641 3.594472e-05
## 17040    2 55641 3.594472e-05
## 17041    2 55641 3.594472e-05
## 17042    2 55641 3.594472e-05
## 17043    2 55641 3.594472e-05
## 17044    2 55641 3.594472e-05
## 17045    2 55641 3.594472e-05
## 17046    2 55641 3.594472e-05
## 17047    2 55641 3.594472e-05
## 17048    2 55641 3.594472e-05
## 17049    2 55641 3.594472e-05
## 17050    2 55641 3.594472e-05
## 17051    2 55641 3.594472e-05
## 17052    2 55641 3.594472e-05
## 17053    2 55641 3.594472e-05
## 17054    2 55641 3.594472e-05
## 17055    2 55641 3.594472e-05
## 17056    2 55641 3.594472e-05
## 17057    2 55641 3.594472e-05
## 17058    2 55641 3.594472e-05
## 17059    2 55641 3.594472e-05
## 17060    2 55641 3.594472e-05
## 17061    2 55641 3.594472e-05
## 17062    2 55641 3.594472e-05
## 17063    2 55641 3.594472e-05
## 17064    2 55641 3.594472e-05
## 17065    2 55641 3.594472e-05
## 17066    2 55641 3.594472e-05
## 17067    2 55641 3.594472e-05
## 17068    2 55641 3.594472e-05
## 17069    2 55641 3.594472e-05
## 17070    2 55641 3.594472e-05
## 17071    2 55641 3.594472e-05
## 17072    2 55641 3.594472e-05
## 17073    2 55641 3.594472e-05
## 17074    2 55641 3.594472e-05
## 17075    2 55641 3.594472e-05
## 17076    2 55641 3.594472e-05
## 17077    2 55641 3.594472e-05
## 17078    2 55641 3.594472e-05
## 17079    2 55641 3.594472e-05
## 17080    2 55641 3.594472e-05
## 17081    2 55641 3.594472e-05
## 17082    2 55641 3.594472e-05
## 17083    2 55641 3.594472e-05
## 17084    2 55641 3.594472e-05
## 17085    2 55641 3.594472e-05
## 17086    2 55641 3.594472e-05
## 17087    2 55641 3.594472e-05
## 17088    2 55641 3.594472e-05
## 17089    2 55641 3.594472e-05
## 17090    2 55641 3.594472e-05
## 17091    2 55641 3.594472e-05
## 17092    2 55641 3.594472e-05
## 17093    2 55641 3.594472e-05
## 17094    2 55641 3.594472e-05
## 17095    2 55641 3.594472e-05
## 17096    2 55641 3.594472e-05
## 17097    2 55641 3.594472e-05
## 17098    2 55641 3.594472e-05
## 17099    2 55641 3.594472e-05
## 17100    2 55641 3.594472e-05
## 17101    2 55641 3.594472e-05
## 17102    2 55641 3.594472e-05
## 17103    2 55641 3.594472e-05
## 17104    2 55641 3.594472e-05
## 17105    2 55641 3.594472e-05
## 17106    2 55641 3.594472e-05
## 17107    2 55641 3.594472e-05
## 17108    2 55641 3.594472e-05
## 17109    2 55641 3.594472e-05
## 17110    2 55641 3.594472e-05
## 17111    2 55641 3.594472e-05
## 17112    2 55641 3.594472e-05
## 17113    2 55641 3.594472e-05
## 17114    2 55641 3.594472e-05
## 17115    2 55641 3.594472e-05
## 17116    2 55641 3.594472e-05
## 17117    2 55641 3.594472e-05
## 17118    2 55641 3.594472e-05
## 17119    2 55641 3.594472e-05
## 17120    2 55641 3.594472e-05
## 17121    2 55641 3.594472e-05
## 17122    2 55641 3.594472e-05
## 17123    2 55641 3.594472e-05
## 17124    2 55641 3.594472e-05
## 17125    2 55641 3.594472e-05
## 17126    2 55641 3.594472e-05
## 17127    2 55641 3.594472e-05
## 17128    2 55641 3.594472e-05
## 17129    2 55641 3.594472e-05
## 17130    2 55641 3.594472e-05
## 17131    2 55641 3.594472e-05
## 17132    2 55641 3.594472e-05
## 17133    2 55641 3.594472e-05
## 17134    2 55641 3.594472e-05
## 17135    2 55641 3.594472e-05
## 17136    2 55641 3.594472e-05
## 17137    2 55641 3.594472e-05
## 17138    2 55641 3.594472e-05
## 17139    2 55641 3.594472e-05
## 17140    2 55641 3.594472e-05
## 17141    2 55641 3.594472e-05
## 17142    2 55641 3.594472e-05
## 17143    2 55641 3.594472e-05
## 17144    2 55641 3.594472e-05
## 17145    2 55641 3.594472e-05
## 17146    2 55641 3.594472e-05
## 17147    2 55641 3.594472e-05
## 17148    2 55641 3.594472e-05
## 17149    2 55641 3.594472e-05
## 17150    2 55641 3.594472e-05
## 17151    2 55641 3.594472e-05
## 17152    2 55641 3.594472e-05
## 17153    2 55641 3.594472e-05
## 17154    2 55641 3.594472e-05
## 17155    2 55641 3.594472e-05
## 17156    2 55641 3.594472e-05
## 17157    2 55641 3.594472e-05
## 17158    2 55641 3.594472e-05
## 17159    2 55641 3.594472e-05
## 17160    2 55641 3.594472e-05
## 17161    2 55641 3.594472e-05
## 17162    2 55641 3.594472e-05
## 17163    2 55641 3.594472e-05
## 17164    2 55641 3.594472e-05
## 17165    2 55641 3.594472e-05
## 17166    2 55641 3.594472e-05
## 17167    2 55641 3.594472e-05
## 17168    2 55641 3.594472e-05
## 17169    2 55641 3.594472e-05
## 17170    2 55641 3.594472e-05
## 17171    2 55641 3.594472e-05
## 17172    2 55641 3.594472e-05
## 17173    2 55641 3.594472e-05
## 17174    2 55641 3.594472e-05
## 17175    2 55641 3.594472e-05
## 17176    2 55641 3.594472e-05
## 17177    2 55641 3.594472e-05
## 17178    2 55641 3.594472e-05
## 17179    2 55641 3.594472e-05
## 17180    2 55641 3.594472e-05
## 17181    2 55641 3.594472e-05
## 17182    2 55641 3.594472e-05
## 17183    2 55641 3.594472e-05
## 17184    2 55641 3.594472e-05
## 17185    2 55641 3.594472e-05
## 17186    2 55641 3.594472e-05
## 17187    2 55641 3.594472e-05
## 17188    2 55641 3.594472e-05
## 17189    2 55641 3.594472e-05
## 17190    2 55641 3.594472e-05
## 17191    2 55641 3.594472e-05
## 17192    2 55641 3.594472e-05
## 17193    2 55641 3.594472e-05
## 17194    2 55641 3.594472e-05
## 17195    2 55641 3.594472e-05
## 17196    2 55641 3.594472e-05
## 17197    2 55641 3.594472e-05
## 17198    2 55641 3.594472e-05
## 17199    2 55641 3.594472e-05
## 17200    2 55641 3.594472e-05
## 17201    2 55641 3.594472e-05
## 17202    2 55641 3.594472e-05
## 17203    2 55641 3.594472e-05
## 17204    2 55641 3.594472e-05
## 17205    2 55641 3.594472e-05
## 17206    2 55641 3.594472e-05
## 17207    2 55641 3.594472e-05
## 17208    2 55641 3.594472e-05
## 17209    2 55641 3.594472e-05
## 17210    2 55641 3.594472e-05
## 17211    2 55641 3.594472e-05
## 17212    2 55641 3.594472e-05
## 17213    2 55641 3.594472e-05
## 17214    2 55641 3.594472e-05
## 17215    2 55641 3.594472e-05
## 17216    2 55641 3.594472e-05
## 17217    2 55641 3.594472e-05
## 17218    2 55641 3.594472e-05
## 17219    2 55641 3.594472e-05
## 17220    2 55641 3.594472e-05
## 17221    2 55641 3.594472e-05
## 17222    2 55641 3.594472e-05
## 17223    2 55641 3.594472e-05
## 17224    2 55641 3.594472e-05
## 17225    2 55641 3.594472e-05
## 17226    2 55641 3.594472e-05
## 17227    2 55641 3.594472e-05
## 17228    2 55641 3.594472e-05
## 17229    2 55641 3.594472e-05
## 17230    2 55641 3.594472e-05
## 17231    2 55641 3.594472e-05
## 17232    2 55641 3.594472e-05
## 17233    2 55641 3.594472e-05
## 17234    2 55641 3.594472e-05
## 17235    2 55641 3.594472e-05
## 17236    2 55641 3.594472e-05
## 17237    2 55641 3.594472e-05
## 17238    2 55641 3.594472e-05
## 17239    2 55641 3.594472e-05
## 17240    2 55641 3.594472e-05
## 17241    2 55641 3.594472e-05
## 17242    2 55641 3.594472e-05
## 17243    2 55641 3.594472e-05
## 17244    2 55641 3.594472e-05
## 17245    2 55641 3.594472e-05
## 17246    2 55641 3.594472e-05
## 17247    2 55641 3.594472e-05
## 17248    2 55641 3.594472e-05
## 17249    2 55641 3.594472e-05
## 17250    2 55641 3.594472e-05
## 17251    2 55641 3.594472e-05
## 17252    2 55641 3.594472e-05
## 17253    2 55641 3.594472e-05
## 17254    2 55641 3.594472e-05
## 17255    2 55641 3.594472e-05
## 17256    2 55641 3.594472e-05
## 17257    2 55641 3.594472e-05
## 17258    2 55641 3.594472e-05
## 17259    2 55641 3.594472e-05
## 17260    2 55641 3.594472e-05
## 17261    2 55641 3.594472e-05
## 17262    2 55641 3.594472e-05
## 17263    2 55641 3.594472e-05
## 17264    2 55641 3.594472e-05
## 17265    2 55641 3.594472e-05
## 17266    2 55641 3.594472e-05
## 17267    2 55641 3.594472e-05
## 17268    2 55641 3.594472e-05
## 17269    2 55641 3.594472e-05
## 17270    2 55641 3.594472e-05
## 17271    2 55641 3.594472e-05
## 17272    2 55641 3.594472e-05
## 17273    2 55641 3.594472e-05
## 17274    2 55641 3.594472e-05
## 17275    2 55641 3.594472e-05
## 17276    2 55641 3.594472e-05
## 17277    2 55641 3.594472e-05
## 17278    2 55641 3.594472e-05
## 17279    2 55641 3.594472e-05
## 17280    2 55641 3.594472e-05
## 17281    2 55641 3.594472e-05
## 17282    2 55641 3.594472e-05
## 17283    2 55641 3.594472e-05
## 17284    2 55641 3.594472e-05
## 17285    2 55641 3.594472e-05
## 17286    2 55641 3.594472e-05
## 17287    2 55641 3.594472e-05
## 17288    2 55641 3.594472e-05
## 17289    2 55641 3.594472e-05
## 17290    2 55641 3.594472e-05
## 17291    2 55641 3.594472e-05
## 17292    2 55641 3.594472e-05
## 17293    2 55641 3.594472e-05
## 17294    2 55641 3.594472e-05
## 17295    2 55641 3.594472e-05
## 17296    2 55641 3.594472e-05
## 17297    2 55641 3.594472e-05
## 17298    2 55641 3.594472e-05
## 17299    2 55641 3.594472e-05
## 17300    2 55641 3.594472e-05
## 17301    2 55641 3.594472e-05
## 17302    2 55641 3.594472e-05
## 17303    2 55641 3.594472e-05
## 17304    2 55641 3.594472e-05
## 17305    2 55641 3.594472e-05
## 17306    2 55641 3.594472e-05
## 17307    2 55641 3.594472e-05
## 17308    2 55641 3.594472e-05
## 17309    2 55641 3.594472e-05
## 17310    2 55641 3.594472e-05
## 17311    2 55641 3.594472e-05
## 17312    2 55641 3.594472e-05
## 17313    2 55641 3.594472e-05
## 17314    2 55641 3.594472e-05
## 17315    2 55641 3.594472e-05
## 17316    2 55641 3.594472e-05
## 17317    2 55641 3.594472e-05
## 17318    2 55641 3.594472e-05
## 17319    2 55641 3.594472e-05
## 17320    2 55641 3.594472e-05
## 17321    2 55641 3.594472e-05
## 17322    2 55641 3.594472e-05
## 17323    2 55641 3.594472e-05
## 17324    2 55641 3.594472e-05
## 17325    2 55641 3.594472e-05
## 17326    2 55641 3.594472e-05
## 17327    2 55641 3.594472e-05
## 17328    2 55641 3.594472e-05
## 17329    2 55641 3.594472e-05
## 17330    2 55641 3.594472e-05
## 17331    2 55641 3.594472e-05
## 17332    2 55641 3.594472e-05
## 17333    2 55641 3.594472e-05
## 17334    2 55641 3.594472e-05
## 17335    2 55641 3.594472e-05
## 17336    2 55641 3.594472e-05
## 17337    2 55641 3.594472e-05
## 17338    2 55641 3.594472e-05
## 17339    2 55641 3.594472e-05
## 17340    2 55641 3.594472e-05
## 17341    2 55641 3.594472e-05
## 17342    2 55641 3.594472e-05
## 17343    2 55641 3.594472e-05
## 17344    2 55641 3.594472e-05
## 17345    2 55641 3.594472e-05
## 17346    2 55641 3.594472e-05
## 17347    2 55641 3.594472e-05
## 17348    2 55641 3.594472e-05
## 17349    2 55641 3.594472e-05
## 17350    2 55641 3.594472e-05
## 17351    2 55641 3.594472e-05
## 17352    2 55641 3.594472e-05
## 17353    2 55641 3.594472e-05
## 17354    2 55641 3.594472e-05
## 17355    2 55641 3.594472e-05
## 17356    2 55641 3.594472e-05
## 17357    2 55641 3.594472e-05
## 17358    2 55641 3.594472e-05
## 17359    2 55641 3.594472e-05
## 17360    2 55641 3.594472e-05
## 17361    2 55641 3.594472e-05
## 17362    2 55641 3.594472e-05
## 17363    2 55641 3.594472e-05
## 17364    2 55641 3.594472e-05
## 17365    2 55641 3.594472e-05
## 17366    2 55641 3.594472e-05
## 17367    2 55641 3.594472e-05
## 17368    2 55641 3.594472e-05
## 17369    2 55641 3.594472e-05
## 17370    2 55641 3.594472e-05
## 17371    2 55641 3.594472e-05
## 17372    2 55641 3.594472e-05
## 17373    2 55641 3.594472e-05
## 17374    2 55641 3.594472e-05
## 17375    2 55641 3.594472e-05
## 17376    2 55641 3.594472e-05
## 17377    2 55641 3.594472e-05
## 17378    2 55641 3.594472e-05
## 17379    2 55641 3.594472e-05
## 17380    2 55641 3.594472e-05
## 17381    2 55641 3.594472e-05
## 17382    2 55641 3.594472e-05
## 17383    2 55641 3.594472e-05
## 17384    2 55641 3.594472e-05
## 17385    2 55641 3.594472e-05
## 17386    2 55641 3.594472e-05
## 17387    2 55641 3.594472e-05
## 17388    2 55641 3.594472e-05
## 17389    2 55641 3.594472e-05
## 17390    2 55641 3.594472e-05
## 17391    2 55641 3.594472e-05
## 17392    2 55641 3.594472e-05
## 17393    2 55641 3.594472e-05
## 17394    2 55641 3.594472e-05
## 17395    2 55641 3.594472e-05
## 17396    2 55641 3.594472e-05
## 17397    2 55641 3.594472e-05
## 17398    2 55641 3.594472e-05
## 17399    2 55641 3.594472e-05
## 17400    2 55641 3.594472e-05
## 17401    2 55641 3.594472e-05
## 17402    2 55641 3.594472e-05
## 17403    2 55641 3.594472e-05
## 17404    2 55641 3.594472e-05
## 17405    2 55641 3.594472e-05
## 17406    2 55641 3.594472e-05
## 17407    2 55641 3.594472e-05
## 17408    2 55641 3.594472e-05
## 17409    2 55641 3.594472e-05
## 17410    2 55641 3.594472e-05
## 17411    2 55641 3.594472e-05
## 17412    2 55641 3.594472e-05
## 17413    2 55641 3.594472e-05
## 17414    2 55641 3.594472e-05
## 17415    2 55641 3.594472e-05
## 17416    2 55641 3.594472e-05
## 17417    2 55641 3.594472e-05
## 17418    2 55641 3.594472e-05
## 17419    2 55641 3.594472e-05
## 17420    2 55641 3.594472e-05
## 17421    2 55641 3.594472e-05
## 17422    2 55641 3.594472e-05
## 17423    2 55641 3.594472e-05
## 17424    2 55641 3.594472e-05
## 17425    2 55641 3.594472e-05
## 17426    2 55641 3.594472e-05
## 17427    2 55641 3.594472e-05
## 17428    2 55641 3.594472e-05
## 17429    2 55641 3.594472e-05
## 17430    2 55641 3.594472e-05
## 17431    2 55641 3.594472e-05
## 17432    2 55641 3.594472e-05
## 17433    2 55641 3.594472e-05
## 17434    2 55641 3.594472e-05
## 17435    2 55641 3.594472e-05
## 17436    2 55641 3.594472e-05
## 17437    2 55641 3.594472e-05
## 17438    2 55641 3.594472e-05
## 17439    2 55641 3.594472e-05
## 17440    2 55641 3.594472e-05
## 17441    2 55641 3.594472e-05
## 17442    2 55641 3.594472e-05
## 17443    2 55641 3.594472e-05
## 17444    2 55641 3.594472e-05
## 17445    2 55641 3.594472e-05
## 17446    2 55641 3.594472e-05
## 17447    2 55641 3.594472e-05
## 17448    2 55641 3.594472e-05
## 17449    2 55641 3.594472e-05
## 17450    2 55641 3.594472e-05
## 17451    2 55641 3.594472e-05
## 17452    2 55641 3.594472e-05
## 17453    2 55641 3.594472e-05
## 17454    2 55641 3.594472e-05
## 17455    2 55641 3.594472e-05
## 17456    2 55641 3.594472e-05
## 17457    2 55641 3.594472e-05
## 17458    2 55641 3.594472e-05
## 17459    2 55641 3.594472e-05
## 17460    2 55641 3.594472e-05
## 17461    2 55641 3.594472e-05
## 17462    2 55641 3.594472e-05
## 17463    2 55641 3.594472e-05
## 17464    2 55641 3.594472e-05
## 17465    2 55641 3.594472e-05
## 17466    2 55641 3.594472e-05
## 17467    2 55641 3.594472e-05
## 17468    2 55641 3.594472e-05
## 17469    2 55641 3.594472e-05
## 17470    2 55641 3.594472e-05
## 17471    2 55641 3.594472e-05
## 17472    2 55641 3.594472e-05
## 17473    2 55641 3.594472e-05
## 17474    2 55641 3.594472e-05
## 17475    2 55641 3.594472e-05
## 17476    2 55641 3.594472e-05
## 17477    2 55641 3.594472e-05
## 17478    2 55641 3.594472e-05
## 17479    2 55641 3.594472e-05
## 17480    2 55641 3.594472e-05
## 17481    2 55641 3.594472e-05
## 17482    2 55641 3.594472e-05
## 17483    2 55641 3.594472e-05
## 17484    2 55641 3.594472e-05
## 17485    2 55641 3.594472e-05
## 17486    2 55641 3.594472e-05
## 17487    2 55641 3.594472e-05
## 17488    2 55641 3.594472e-05
## 17489    2 55641 3.594472e-05
## 17490    2 55641 3.594472e-05
## 17491    2 55641 3.594472e-05
## 17492    2 55641 3.594472e-05
## 17493    2 55641 3.594472e-05
## 17494    2 55641 3.594472e-05
## 17495    2 55641 3.594472e-05
## 17496    2 55641 3.594472e-05
## 17497    2 55641 3.594472e-05
## 17498    2 55641 3.594472e-05
## 17499    2 55641 3.594472e-05
## 17500    2 55641 3.594472e-05
## 17501    2 55641 3.594472e-05
## 17502    2 55641 3.594472e-05
## 17503    2 55641 3.594472e-05
## 17504    2 55641 3.594472e-05
## 17505    2 55641 3.594472e-05
## 17506    2 55641 3.594472e-05
## 17507    2 55641 3.594472e-05
## 17508    2 55641 3.594472e-05
## 17509    2 55641 3.594472e-05
## 17510    2 55641 3.594472e-05
## 17511    2 55641 3.594472e-05
## 17512    2 55641 3.594472e-05
## 17513    2 55641 3.594472e-05
## 17514    2 55641 3.594472e-05
## 17515    2 55641 3.594472e-05
## 17516    2 55641 3.594472e-05
## 17517    2 55641 3.594472e-05
## 17518    2 55641 3.594472e-05
## 17519    2 55641 3.594472e-05
## 17520    2 55641 3.594472e-05
## 17521    2 55641 3.594472e-05
## 17522    2 55641 3.594472e-05
## 17523    2 55641 3.594472e-05
## 17524    2 55641 3.594472e-05
## 17525    2 55641 3.594472e-05
## 17526    2 55641 3.594472e-05
## 17527    2 55641 3.594472e-05
## 17528    2 55641 3.594472e-05
## 17529    2 55641 3.594472e-05
## 17530    2 55641 3.594472e-05
## 17531    2 55641 3.594472e-05
## 17532    2 55641 3.594472e-05
## 17533    2 55641 3.594472e-05
## 17534    2 55641 3.594472e-05
## 17535    2 55641 3.594472e-05
## 17536    2 55641 3.594472e-05
## 17537    2 55641 3.594472e-05
## 17538    2 55641 3.594472e-05
## 17539    2 55641 3.594472e-05
## 17540    2 55641 3.594472e-05
## 17541    2 55641 3.594472e-05
## 17542    2 55641 3.594472e-05
## 17543    2 55641 3.594472e-05
## 17544    2 55641 3.594472e-05
## 17545    2 55641 3.594472e-05
## 17546    2 55641 3.594472e-05
## 17547    2 55641 3.594472e-05
## 17548    2 55641 3.594472e-05
## 17549    2 55641 3.594472e-05
## 17550    2 55641 3.594472e-05
## 17551    2 55641 3.594472e-05
## 17552    2 55641 3.594472e-05
## 17553    2 55641 3.594472e-05
## 17554    2 55641 3.594472e-05
## 17555    2 55641 3.594472e-05
## 17556    2 55641 3.594472e-05
## 17557    2 55641 3.594472e-05
## 17558    2 55641 3.594472e-05
## 17559    2 55641 3.594472e-05
## 17560    2 55641 3.594472e-05
## 17561    2 55641 3.594472e-05
## 17562    2 55641 3.594472e-05
## 17563    2 55641 3.594472e-05
## 17564    2 55641 3.594472e-05
## 17565    2 55641 3.594472e-05
## 17566    2 55641 3.594472e-05
## 17567    2 55641 3.594472e-05
## 17568    2 55641 3.594472e-05
## 17569    2 55641 3.594472e-05
## 17570    2 55641 3.594472e-05
## 17571    2 55641 3.594472e-05
## 17572    2 55641 3.594472e-05
## 17573    2 55641 3.594472e-05
## 17574    2 55641 3.594472e-05
## 17575    2 55641 3.594472e-05
## 17576    2 55641 3.594472e-05
## 17577    2 55641 3.594472e-05
## 17578    2 55641 3.594472e-05
## 17579    2 55641 3.594472e-05
## 17580    2 55641 3.594472e-05
## 17581    2 55641 3.594472e-05
## 17582    2 55641 3.594472e-05
## 17583    2 55641 3.594472e-05
## 17584    2 55641 3.594472e-05
## 17585    2 55641 3.594472e-05
## 17586    2 55641 3.594472e-05
## 17587    2 55641 3.594472e-05
## 17588    2 55641 3.594472e-05
## 17589    2 55641 3.594472e-05
## 17590    2 55641 3.594472e-05
## 17591    2 55641 3.594472e-05
## 17592    2 55641 3.594472e-05
## 17593    2 55641 3.594472e-05
## 17594    2 55641 3.594472e-05
## 17595    2 55641 3.594472e-05
## 17596    2 55641 3.594472e-05
## 17597    2 55641 3.594472e-05
## 17598    2 55641 3.594472e-05
## 17599    2 55641 3.594472e-05
## 17600    2 55641 3.594472e-05
## 17601    2 55641 3.594472e-05
## 17602    2 55641 3.594472e-05
## 17603    2 55641 3.594472e-05
## 17604    2 55641 3.594472e-05
## 17605    2 55641 3.594472e-05
## 17606    2 55641 3.594472e-05
## 17607    2 55641 3.594472e-05
## 17608    2 55641 3.594472e-05
## 17609    2 55641 3.594472e-05
## 17610    2 55641 3.594472e-05
## 17611    2 55641 3.594472e-05
## 17612    2 55641 3.594472e-05
## 17613    2 55641 3.594472e-05
## 17614    2 55641 3.594472e-05
## 17615    2 55641 3.594472e-05
## 17616    2 55641 3.594472e-05
## 17617    2 55641 3.594472e-05
## 17618    2 55641 3.594472e-05
## 17619    2 55641 3.594472e-05
## 17620    2 55641 3.594472e-05
## 17621    2 55641 3.594472e-05
## 17622    2 55641 3.594472e-05
## 17623    2 55641 3.594472e-05
## 17624    2 55641 3.594472e-05
## 17625    2 55641 3.594472e-05
## 17626    2 55641 3.594472e-05
## 17627    2 55641 3.594472e-05
## 17628    2 55641 3.594472e-05
## 17629    2 55641 3.594472e-05
## 17630    2 55641 3.594472e-05
## 17631    2 55641 3.594472e-05
## 17632    2 55641 3.594472e-05
## 17633    2 55641 3.594472e-05
## 17634    2 55641 3.594472e-05
## 17635    2 55641 3.594472e-05
## 17636    2 55641 3.594472e-05
## 17637    2 55641 3.594472e-05
## 17638    2 55641 3.594472e-05
## 17639    2 55641 3.594472e-05
## 17640    2 55641 3.594472e-05
## 17641    2 55641 3.594472e-05
## 17642    2 55641 3.594472e-05
## 17643    2 55641 3.594472e-05
## 17644    2 55641 3.594472e-05
## 17645    2 55641 3.594472e-05
## 17646    2 55641 3.594472e-05
## 17647    2 55641 3.594472e-05
## 17648    2 55641 3.594472e-05
## 17649    2 55641 3.594472e-05
## 17650    2 55641 3.594472e-05
## 17651    2 55641 3.594472e-05
## 17652    2 55641 3.594472e-05
## 17653    2 55641 3.594472e-05
## 17654    2 55641 3.594472e-05
## 17655    2 55641 3.594472e-05
## 17656    2 55641 3.594472e-05
## 17657    2 55641 3.594472e-05
## 17658    2 55641 3.594472e-05
## 17659    2 55641 3.594472e-05
## 17660    2 55641 3.594472e-05
## 17661    2 55641 3.594472e-05
## 17662    2 55641 3.594472e-05
## 17663    2 55641 3.594472e-05
## 17664    2 55641 3.594472e-05
## 17665    2 55641 3.594472e-05
## 17666    2 55641 3.594472e-05
## 17667    2 55641 3.594472e-05
## 17668    2 55641 3.594472e-05
## 17669    2 55641 3.594472e-05
## 17670    2 55641 3.594472e-05
## 17671    2 55641 3.594472e-05
## 17672    2 55641 3.594472e-05
## 17673    2 55641 3.594472e-05
## 17674    2 55641 3.594472e-05
## 17675    2 55641 3.594472e-05
## 17676    2 55641 3.594472e-05
## 17677    2 55641 3.594472e-05
## 17678    2 55641 3.594472e-05
## 17679    2 55641 3.594472e-05
## 17680    2 55641 3.594472e-05
## 17681    2 55641 3.594472e-05
## 17682    2 55641 3.594472e-05
## 17683    2 55641 3.594472e-05
## 17684    2 55641 3.594472e-05
## 17685    2 55641 3.594472e-05
## 17686    2 55641 3.594472e-05
## 17687    2 55641 3.594472e-05
## 17688    2 55641 3.594472e-05
## 17689    2 55641 3.594472e-05
## 17690    2 55641 3.594472e-05
## 17691    2 55641 3.594472e-05
## 17692    2 55641 3.594472e-05
## 17693    2 55641 3.594472e-05
## 17694    2 55641 3.594472e-05
## 17695    2 55641 3.594472e-05
## 17696    2 55641 3.594472e-05
## 17697    2 55641 3.594472e-05
## 17698    2 55641 3.594472e-05
## 17699    2 55641 3.594472e-05
## 17700    2 55641 3.594472e-05
## 17701    2 55641 3.594472e-05
## 17702    2 55641 3.594472e-05
## 17703    2 55641 3.594472e-05
## 17704    2 55641 3.594472e-05
## 17705    2 55641 3.594472e-05
## 17706    2 55641 3.594472e-05
## 17707    2 55641 3.594472e-05
## 17708    2 55641 3.594472e-05
## 17709    2 55641 3.594472e-05
## 17710    2 55641 3.594472e-05
## 17711    2 55641 3.594472e-05
## 17712    2 55641 3.594472e-05
## 17713    2 55641 3.594472e-05
## 17714    2 55641 3.594472e-05
## 17715    2 55641 3.594472e-05
## 17716    2 55641 3.594472e-05
## 17717    2 55641 3.594472e-05
## 17718    2 55641 3.594472e-05
## 17719    2 55641 3.594472e-05
## 17720    2 55641 3.594472e-05
## 17721    2 55641 3.594472e-05
## 17722    2 55641 3.594472e-05
## 17723    2 55641 3.594472e-05
## 17724    2 55641 3.594472e-05
## 17725    2 55641 3.594472e-05
## 17726    2 55641 3.594472e-05
## 17727    2 55641 3.594472e-05
## 17728    2 55641 3.594472e-05
## 17729    2 55641 3.594472e-05
## 17730    2 55641 3.594472e-05
## 17731    2 55641 3.594472e-05
## 17732    2 55641 3.594472e-05
## 17733    2 55641 3.594472e-05
## 17734    2 55641 3.594472e-05
## 17735    2 55641 3.594472e-05
## 17736    2 55641 3.594472e-05
## 17737    2 55641 3.594472e-05
## 17738    2 55641 3.594472e-05
## 17739    2 55641 3.594472e-05
## 17740    2 55641 3.594472e-05
## 17741    2 55641 3.594472e-05
## 17742    2 55641 3.594472e-05
## 17743    2 55641 3.594472e-05
## 17744    2 55641 3.594472e-05
## 17745    2 55641 3.594472e-05
## 17746    2 55641 3.594472e-05
## 17747    2 55641 3.594472e-05
## 17748    2 55641 3.594472e-05
## 17749    2 55641 3.594472e-05
## 17750    2 55641 3.594472e-05
## 17751    2 55641 3.594472e-05
## 17752    2 55641 3.594472e-05
## 17753    2 55641 3.594472e-05
## 17754    2 55641 3.594472e-05
## 17755    2 55641 3.594472e-05
## 17756    2 55641 3.594472e-05
## 17757    2 55641 3.594472e-05
## 17758    2 55641 3.594472e-05
## 17759    2 55641 3.594472e-05
## 17760    2 55641 3.594472e-05
## 17761    2 55641 3.594472e-05
## 17762    2 55641 3.594472e-05
## 17763    2 55641 3.594472e-05
## 17764    2 55641 3.594472e-05
## 17765    2 55641 3.594472e-05
## 17766    2 55641 3.594472e-05
## 17767    2 55641 3.594472e-05
## 17768    2 55641 3.594472e-05
## 17769    2 55641 3.594472e-05
## 17770    2 55641 3.594472e-05
## 17771    2 55641 3.594472e-05
## 17772    2 55641 3.594472e-05
## 17773    2 55641 3.594472e-05
## 17774    2 55641 3.594472e-05
## 17775    2 55641 3.594472e-05
## 17776    2 55641 3.594472e-05
## 17777    2 55641 3.594472e-05
## 17778    2 55641 3.594472e-05
## 17779    2 55641 3.594472e-05
## 17780    2 55641 3.594472e-05
## 17781    2 55641 3.594472e-05
## 17782    2 55641 3.594472e-05
## 17783    2 55641 3.594472e-05
## 17784    2 55641 3.594472e-05
## 17785    2 55641 3.594472e-05
## 17786    2 55641 3.594472e-05
## 17787    2 55641 3.594472e-05
## 17788    2 55641 3.594472e-05
## 17789    2 55641 3.594472e-05
## 17790    2 55641 3.594472e-05
## 17791    2 55641 3.594472e-05
## 17792    2 55641 3.594472e-05
## 17793    2 55641 3.594472e-05
## 17794    2 55641 3.594472e-05
## 17795    2 55641 3.594472e-05
## 17796    2 55641 3.594472e-05
## 17797    2 55641 3.594472e-05
## 17798    2 55641 3.594472e-05
## 17799    2 55641 3.594472e-05
## 17800    2 55641 3.594472e-05
## 17801    2 55641 3.594472e-05
## 17802    2 55641 3.594472e-05
## 17803    2 55641 3.594472e-05
## 17804    2 55641 3.594472e-05
## 17805    2 55641 3.594472e-05
## 17806    2 55641 3.594472e-05
## 17807    2 55641 3.594472e-05
## 17808    2 55641 3.594472e-05
## 17809    2 55641 3.594472e-05
## 17810    2 55641 3.594472e-05
## 17811    2 55641 3.594472e-05
## 17812    2 55641 3.594472e-05
## 17813    2 55641 3.594472e-05
## 17814    2 55641 3.594472e-05
## 17815    2 55641 3.594472e-05
## 17816    2 55641 3.594472e-05
## 17817    2 55641 3.594472e-05
## 17818    2 55641 3.594472e-05
## 17819    2 55641 3.594472e-05
## 17820    2 55641 3.594472e-05
## 17821    2 55641 3.594472e-05
## 17822    2 55641 3.594472e-05
## 17823    2 55641 3.594472e-05
## 17824    2 55641 3.594472e-05
## 17825    2 55641 3.594472e-05
## 17826    2 55641 3.594472e-05
## 17827    2 55641 3.594472e-05
## 17828    2 55641 3.594472e-05
## 17829    2 55641 3.594472e-05
## 17830    2 55641 3.594472e-05
## 17831    2 55641 3.594472e-05
## 17832    2 55641 3.594472e-05
## 17833    2 55641 3.594472e-05
## 17834    2 55641 3.594472e-05
## 17835    2 55641 3.594472e-05
## 17836    2 55641 3.594472e-05
## 17837    2 55641 3.594472e-05
## 17838    2 55641 3.594472e-05
## 17839    2 55641 3.594472e-05
## 17840    2 55641 3.594472e-05
## 17841    2 55641 3.594472e-05
## 17842    2 55641 3.594472e-05
## 17843    2 55641 3.594472e-05
## 17844    2 55641 3.594472e-05
## 17845    2 55641 3.594472e-05
## 17846    2 55641 3.594472e-05
## 17847    2 55641 3.594472e-05
## 17848    2 55641 3.594472e-05
## 17849    2 55641 3.594472e-05
## 17850    2 55641 3.594472e-05
## 17851    2 55641 3.594472e-05
## 17852    2 55641 3.594472e-05
## 17853    2 55641 3.594472e-05
## 17854    2 55641 3.594472e-05
## 17855    2 55641 3.594472e-05
## 17856    2 55641 3.594472e-05
## 17857    2 55641 3.594472e-05
## 17858    2 55641 3.594472e-05
## 17859    2 55641 3.594472e-05
## 17860    2 55641 3.594472e-05
## 17861    2 55641 3.594472e-05
## 17862    2 55641 3.594472e-05
## 17863    2 55641 3.594472e-05
## 17864    2 55641 3.594472e-05
## 17865    2 55641 3.594472e-05
## 17866    2 55641 3.594472e-05
## 17867    2 55641 3.594472e-05
## 17868    2 55641 3.594472e-05
## 17869    2 55641 3.594472e-05
## 17870    2 55641 3.594472e-05
## 17871    2 55641 3.594472e-05
## 17872    2 55641 3.594472e-05
## 17873    2 55641 3.594472e-05
## 17874    2 55641 3.594472e-05
## 17875    2 55641 3.594472e-05
## 17876    2 55641 3.594472e-05
## 17877    2 55641 3.594472e-05
## 17878    2 55641 3.594472e-05
## 17879    2 55641 3.594472e-05
## 17880    2 55641 3.594472e-05
## 17881    2 55641 3.594472e-05
## 17882    2 55641 3.594472e-05
## 17883    2 55641 3.594472e-05
## 17884    2 55641 3.594472e-05
## 17885    2 55641 3.594472e-05
## 17886    2 55641 3.594472e-05
## 17887    2 55641 3.594472e-05
## 17888    2 55641 3.594472e-05
## 17889    2 55641 3.594472e-05
## 17890    2 55641 3.594472e-05
## 17891    2 55641 3.594472e-05
## 17892    2 55641 3.594472e-05
## 17893    2 55641 3.594472e-05
## 17894    2 55641 3.594472e-05
## 17895    2 55641 3.594472e-05
## 17896    2 55641 3.594472e-05
## 17897    2 55641 3.594472e-05
## 17898    2 55641 3.594472e-05
## 17899    2 55641 3.594472e-05
## 17900    2 55641 3.594472e-05
## 17901    2 55641 3.594472e-05
## 17902    2 55641 3.594472e-05
## 17903    1 66780 1.497454e-05
## 17904    1 66780 1.497454e-05
## 17905    1 66780 1.497454e-05
## 17906    1 66780 1.497454e-05
## 17907    1 66780 1.497454e-05
## 17908    1 66780 1.497454e-05
## 17909    1 66780 1.497454e-05
## 17910    1 66780 1.497454e-05
## 17911    1 66780 1.497454e-05
## 17912    1 66780 1.497454e-05
## 17913    1 66780 1.497454e-05
## 17914    1 66780 1.497454e-05
## 17915    1 66780 1.497454e-05
## 17916    1 66780 1.497454e-05
## 17917    1 66780 1.497454e-05
## 17918    1 66780 1.497454e-05
## 17919    1 66780 1.497454e-05
## 17920    1 66780 1.497454e-05
## 17921    1 66780 1.497454e-05
## 17922    1 66780 1.497454e-05
## 17923    1 66780 1.497454e-05
## 17924    1 66780 1.497454e-05
## 17925    1 66780 1.497454e-05
## 17926    1 66780 1.497454e-05
## 17927    1 66780 1.497454e-05
## 17928    1 66780 1.497454e-05
## 17929    1 66780 1.497454e-05
## 17930    1 66780 1.497454e-05
## 17931    1 66780 1.497454e-05
## 17932    1 66780 1.497454e-05
## 17933    1 66780 1.497454e-05
## 17934    1 66780 1.497454e-05
## 17935    1 66780 1.497454e-05
## 17936    1 66780 1.497454e-05
## 17937    1 66780 1.497454e-05
## 17938    1 66780 1.497454e-05
## 17939    1 66780 1.497454e-05
## 17940    1 66780 1.497454e-05
## 17941    1 66780 1.497454e-05
## 17942    1 66780 1.497454e-05
## 17943    1 66780 1.497454e-05
## 17944    1 66780 1.497454e-05
## 17945    1 66780 1.497454e-05
## 17946    1 66780 1.497454e-05
## 17947    1 66780 1.497454e-05
## 17948    1 66780 1.497454e-05
## 17949    1 66780 1.497454e-05
## 17950    1 66780 1.497454e-05
## 17951    1 66780 1.497454e-05
## 17952    1 66780 1.497454e-05
## 17953    1 66780 1.497454e-05
## 17954    1 66780 1.497454e-05
## 17955    1 66780 1.497454e-05
## 17956    1 66780 1.497454e-05
## 17957    1 66780 1.497454e-05
## 17958    1 66780 1.497454e-05
## 17959    1 66780 1.497454e-05
## 17960    1 66780 1.497454e-05
## 17961    1 66780 1.497454e-05
## 17962    1 66780 1.497454e-05
## 17963    1 66780 1.497454e-05
## 17964    1 66780 1.497454e-05
## 17965    1 66780 1.497454e-05
## 17966    1 66780 1.497454e-05
## 17967    1 66780 1.497454e-05
## 17968    1 66780 1.497454e-05
## 17969    1 66780 1.497454e-05
## 17970    1 66780 1.497454e-05
## 17971    1 66780 1.497454e-05
## 17972    1 66780 1.497454e-05
## 17973    1 66780 1.497454e-05
## 17974    1 66780 1.497454e-05
## 17975    1 66780 1.497454e-05
## 17976    1 66780 1.497454e-05
## 17977    1 66780 1.497454e-05
## 17978    1 66780 1.497454e-05
## 17979    1 66780 1.497454e-05
## 17980    1 66780 1.497454e-05
## 17981    1 66780 1.497454e-05
## 17982    1 66780 1.497454e-05
## 17983    1 66780 1.497454e-05
## 17984    1 66780 1.497454e-05
## 17985    1 66780 1.497454e-05
## 17986    1 66780 1.497454e-05
## 17987    1 66780 1.497454e-05
## 17988    1 66780 1.497454e-05
## 17989    1 66780 1.497454e-05
## 17990    1 66780 1.497454e-05
## 17991    1 66780 1.497454e-05
## 17992    1 66780 1.497454e-05
## 17993    1 66780 1.497454e-05
## 17994    1 66780 1.497454e-05
## 17995    1 66780 1.497454e-05
## 17996    1 66780 1.497454e-05
## 17997    1 66780 1.497454e-05
## 17998    1 66780 1.497454e-05
## 17999    1 66780 1.497454e-05
## 18000    1 66780 1.497454e-05
## 18001    1 66780 1.497454e-05
## 18002    1 66780 1.497454e-05
## 18003    1 66780 1.497454e-05
## 18004    1 66780 1.497454e-05
## 18005    1 66780 1.497454e-05
## 18006    1 66780 1.497454e-05
## 18007    1 66780 1.497454e-05
## 18008    1 66780 1.497454e-05
## 18009    1 66780 1.497454e-05
## 18010    1 66780 1.497454e-05
## 18011    1 66780 1.497454e-05
## 18012    1 66780 1.497454e-05
## 18013    1 66780 1.497454e-05
## 18014    1 66780 1.497454e-05
## 18015    1 66780 1.497454e-05
## 18016    1 66780 1.497454e-05
## 18017    1 66780 1.497454e-05
## 18018    1 66780 1.497454e-05
## 18019    1 66780 1.497454e-05
## 18020    1 66780 1.497454e-05
## 18021    1 66780 1.497454e-05
## 18022    1 66780 1.497454e-05
## 18023    1 66780 1.497454e-05
## 18024    1 66780 1.497454e-05
## 18025    1 66780 1.497454e-05
## 18026    1 66780 1.497454e-05
## 18027    1 66780 1.497454e-05
## 18028    1 66780 1.497454e-05
## 18029    1 66780 1.497454e-05
## 18030    1 66780 1.497454e-05
## 18031    1 66780 1.497454e-05
## 18032    1 66780 1.497454e-05
## 18033    1 66780 1.497454e-05
## 18034    1 66780 1.497454e-05
## 18035    1 66780 1.497454e-05
## 18036    1 66780 1.497454e-05
## 18037    1 66780 1.497454e-05
## 18038    1 66780 1.497454e-05
## 18039    1 66780 1.497454e-05
## 18040    1 66780 1.497454e-05
## 18041    1 66780 1.497454e-05
## 18042    1 66780 1.497454e-05
## 18043    1 66780 1.497454e-05
## 18044    1 66780 1.497454e-05
## 18045    1 66780 1.497454e-05
## 18046    1 66780 1.497454e-05
## 18047    1 66780 1.497454e-05
## 18048    1 66780 1.497454e-05
## 18049    1 66780 1.497454e-05
## 18050    1 66780 1.497454e-05
## 18051    1 66780 1.497454e-05
## 18052    1 66780 1.497454e-05
## 18053    1 66780 1.497454e-05
## 18054    1 66780 1.497454e-05
## 18055    1 66780 1.497454e-05
## 18056    1 66780 1.497454e-05
## 18057    1 66780 1.497454e-05
## 18058    1 66780 1.497454e-05
## 18059    1 66780 1.497454e-05
## 18060    1 66780 1.497454e-05
## 18061    1 66780 1.497454e-05
## 18062    1 66780 1.497454e-05
## 18063    1 66780 1.497454e-05
## 18064    1 66780 1.497454e-05
## 18065    1 66780 1.497454e-05
## 18066    1 66780 1.497454e-05
## 18067    1 66780 1.497454e-05
## 18068    1 66780 1.497454e-05
## 18069    1 66780 1.497454e-05
## 18070    1 66780 1.497454e-05
## 18071    1 66780 1.497454e-05
## 18072    1 66780 1.497454e-05
## 18073    1 66780 1.497454e-05
## 18074    1 66780 1.497454e-05
## 18075    1 66780 1.497454e-05
## 18076    1 66780 1.497454e-05
## 18077    1 66780 1.497454e-05
## 18078    1 66780 1.497454e-05
## 18079    1 66780 1.497454e-05
## 18080    1 66780 1.497454e-05
## 18081    1 66780 1.497454e-05
## 18082    1 66780 1.497454e-05
## 18083    1 66780 1.497454e-05
## 18084    1 66780 1.497454e-05
## 18085    1 66780 1.497454e-05
## 18086    1 66780 1.497454e-05
## 18087    1 66780 1.497454e-05
## 18088    1 66780 1.497454e-05
## 18089    1 66780 1.497454e-05
## 18090    1 66780 1.497454e-05
## 18091    1 66780 1.497454e-05
## 18092    1 66780 1.497454e-05
## 18093    1 66780 1.497454e-05
## 18094    1 66780 1.497454e-05
## 18095    1 66780 1.497454e-05
## 18096    1 66780 1.497454e-05
## 18097    1 66780 1.497454e-05
## 18098    1 66780 1.497454e-05
## 18099    1 66780 1.497454e-05
## 18100    1 66780 1.497454e-05
## 18101    1 66780 1.497454e-05
## 18102    1 66780 1.497454e-05
## 18103    1 66780 1.497454e-05
## 18104    1 66780 1.497454e-05
## 18105    1 66780 1.497454e-05
## 18106    1 66780 1.497454e-05
## 18107    1 66780 1.497454e-05
## 18108    1 66780 1.497454e-05
## 18109    1 66780 1.497454e-05
## 18110    1 66780 1.497454e-05
## 18111    1 66780 1.497454e-05
## 18112    1 66780 1.497454e-05
## 18113    1 66780 1.497454e-05
## 18114    1 66780 1.497454e-05
## 18115    1 66780 1.497454e-05
## 18116    1 66780 1.497454e-05
## 18117    1 66780 1.497454e-05
## 18118    1 66780 1.497454e-05
## 18119    1 66780 1.497454e-05
## 18120    1 66780 1.497454e-05
## 18121    1 66780 1.497454e-05
## 18122    1 66780 1.497454e-05
## 18123    1 66780 1.497454e-05
## 18124    1 66780 1.497454e-05
## 18125    1 66780 1.497454e-05
## 18126    1 66780 1.497454e-05
## 18127    1 66780 1.497454e-05
## 18128    1 66780 1.497454e-05
## 18129    1 66780 1.497454e-05
## 18130    1 66780 1.497454e-05
## 18131    1 66780 1.497454e-05
## 18132    1 66780 1.497454e-05
## 18133    1 66780 1.497454e-05
## 18134    1 66780 1.497454e-05
## 18135    1 66780 1.497454e-05
## 18136    1 66780 1.497454e-05
## 18137    1 66780 1.497454e-05
## 18138    1 66780 1.497454e-05
## 18139    1 66780 1.497454e-05
## 18140    1 66780 1.497454e-05
## 18141    1 66780 1.497454e-05
## 18142    1 66780 1.497454e-05
## 18143    1 66780 1.497454e-05
## 18144    1 66780 1.497454e-05
## 18145    1 66780 1.497454e-05
## 18146    1 66780 1.497454e-05
## 18147    1 66780 1.497454e-05
## 18148    1 66780 1.497454e-05
## 18149    1 66780 1.497454e-05
## 18150    1 66780 1.497454e-05
## 18151    1 66780 1.497454e-05
## 18152    1 66780 1.497454e-05
## 18153    1 66780 1.497454e-05
## 18154    1 66780 1.497454e-05
## 18155    1 66780 1.497454e-05
## 18156    1 66780 1.497454e-05
## 18157    1 66780 1.497454e-05
## 18158    1 66780 1.497454e-05
## 18159    1 66780 1.497454e-05
## 18160    1 66780 1.497454e-05
## 18161    1 66780 1.497454e-05
## 18162    1 66780 1.497454e-05
## 18163    1 66780 1.497454e-05
## 18164    1 66780 1.497454e-05
## 18165    1 66780 1.497454e-05
## 18166    1 66780 1.497454e-05
## 18167    1 66780 1.497454e-05
## 18168    1 66780 1.497454e-05
## 18169    1 66780 1.497454e-05
## 18170    1 66780 1.497454e-05
## 18171    1 66780 1.497454e-05
## 18172    1 66780 1.497454e-05
## 18173    1 66780 1.497454e-05
## 18174    1 66780 1.497454e-05
## 18175    1 66780 1.497454e-05
## 18176    1 66780 1.497454e-05
## 18177    1 66780 1.497454e-05
## 18178    1 66780 1.497454e-05
## 18179    1 66780 1.497454e-05
## 18180    1 66780 1.497454e-05
## 18181    1 66780 1.497454e-05
## 18182    1 66780 1.497454e-05
## 18183    1 66780 1.497454e-05
## 18184    1 66780 1.497454e-05
## 18185    1 66780 1.497454e-05
## 18186    1 66780 1.497454e-05
## 18187    1 66780 1.497454e-05
## 18188    1 66780 1.497454e-05
## 18189    1 66780 1.497454e-05
## 18190    1 66780 1.497454e-05
## 18191    1 66780 1.497454e-05
## 18192    1 66780 1.497454e-05
## 18193    1 66780 1.497454e-05
## 18194    1 66780 1.497454e-05
## 18195    1 66780 1.497454e-05
## 18196    1 66780 1.497454e-05
## 18197    1 66780 1.497454e-05
## 18198    1 66780 1.497454e-05
## 18199    1 66780 1.497454e-05
## 18200    1 66780 1.497454e-05
## 18201    1 66780 1.497454e-05
## 18202    1 66780 1.497454e-05
## 18203    1 66780 1.497454e-05
## 18204    1 66780 1.497454e-05
## 18205    1 66780 1.497454e-05
## 18206    1 66780 1.497454e-05
## 18207    1 66780 1.497454e-05
## 18208    1 66780 1.497454e-05
## 18209    1 66780 1.497454e-05
## 18210    1 66780 1.497454e-05
## 18211    1 66780 1.497454e-05
## 18212    1 66780 1.497454e-05
## 18213    1 66780 1.497454e-05
## 18214    1 66780 1.497454e-05
## 18215    1 66780 1.497454e-05
## 18216    1 66780 1.497454e-05
## 18217    1 66780 1.497454e-05
## 18218    1 66780 1.497454e-05
## 18219    1 66780 1.497454e-05
## 18220    1 66780 1.497454e-05
## 18221    1 66780 1.497454e-05
## 18222    1 66780 1.497454e-05
## 18223    1 66780 1.497454e-05
## 18224    1 66780 1.497454e-05
## 18225    1 66780 1.497454e-05
## 18226    1 66780 1.497454e-05
## 18227    1 66780 1.497454e-05
## 18228    1 66780 1.497454e-05
## 18229    1 66780 1.497454e-05
## 18230    1 66780 1.497454e-05
## 18231    1 66780 1.497454e-05
## 18232    1 66780 1.497454e-05
## 18233    1 66780 1.497454e-05
## 18234    1 66780 1.497454e-05
## 18235    1 66780 1.497454e-05
## 18236    1 66780 1.497454e-05
## 18237    1 66780 1.497454e-05
## 18238    1 66780 1.497454e-05
## 18239    1 66780 1.497454e-05
## 18240    1 66780 1.497454e-05
## 18241    1 66780 1.497454e-05
## 18242    1 66780 1.497454e-05
## 18243    1 66780 1.497454e-05
## 18244    1 66780 1.497454e-05
## 18245    1 66780 1.497454e-05
## 18246    1 66780 1.497454e-05
## 18247    1 66780 1.497454e-05
## 18248    1 66780 1.497454e-05
## 18249    1 66780 1.497454e-05
## 18250    1 66780 1.497454e-05
## 18251    1 66780 1.497454e-05
## 18252    1 66780 1.497454e-05
## 18253    1 66780 1.497454e-05
## 18254    1 66780 1.497454e-05
## 18255    1 66780 1.497454e-05
## 18256    1 66780 1.497454e-05
## 18257    1 66780 1.497454e-05
## 18258    1 66780 1.497454e-05
## 18259    1 66780 1.497454e-05
## 18260    1 66780 1.497454e-05
## 18261    1 66780 1.497454e-05
## 18262    1 66780 1.497454e-05
## 18263    1 66780 1.497454e-05
## 18264    1 66780 1.497454e-05
## 18265    1 66780 1.497454e-05
## 18266    1 66780 1.497454e-05
## 18267    1 66780 1.497454e-05
## 18268    1 66780 1.497454e-05
## 18269    1 66780 1.497454e-05
## 18270    1 66780 1.497454e-05
## 18271    1 66780 1.497454e-05
## 18272    1 66780 1.497454e-05
## 18273    1 66780 1.497454e-05
## 18274    1 66780 1.497454e-05
## 18275    1 66780 1.497454e-05
## 18276    1 66780 1.497454e-05
## 18277    1 66780 1.497454e-05
## 18278    1 66780 1.497454e-05
## 18279    1 66780 1.497454e-05
## 18280    1 66780 1.497454e-05
## 18281    1 66780 1.497454e-05
## 18282    1 66780 1.497454e-05
## 18283    1 66780 1.497454e-05
## 18284    1 66780 1.497454e-05
## 18285    1 66780 1.497454e-05
## 18286    1 66780 1.497454e-05
## 18287    1 66780 1.497454e-05
## 18288    1 66780 1.497454e-05
## 18289    1 66780 1.497454e-05
## 18290    1 66780 1.497454e-05
## 18291    1 66780 1.497454e-05
## 18292    1 66780 1.497454e-05
## 18293    1 66780 1.497454e-05
## 18294    1 66780 1.497454e-05
## 18295    1 66780 1.497454e-05
## 18296    1 66780 1.497454e-05
## 18297    1 66780 1.497454e-05
## 18298    1 66780 1.497454e-05
## 18299    1 66780 1.497454e-05
## 18300    1 66780 1.497454e-05
## 18301    1 66780 1.497454e-05
## 18302    1 66780 1.497454e-05
## 18303    1 66780 1.497454e-05
## 18304    1 66780 1.497454e-05
## 18305    1 66780 1.497454e-05
## 18306    1 66780 1.497454e-05
## 18307    1 66780 1.497454e-05
## 18308    1 66780 1.497454e-05
## 18309    1 66780 1.497454e-05
## 18310    1 66780 1.497454e-05
## 18311    1 66780 1.497454e-05
## 18312    1 66780 1.497454e-05
## 18313    1 66780 1.497454e-05
## 18314    1 66780 1.497454e-05
## 18315    1 66780 1.497454e-05
## 18316    1 66780 1.497454e-05
## 18317    1 66780 1.497454e-05
## 18318    1 66780 1.497454e-05
## 18319    1 66780 1.497454e-05
## 18320    1 66780 1.497454e-05
## 18321    1 66780 1.497454e-05
## 18322    1 66780 1.497454e-05
## 18323    1 66780 1.497454e-05
## 18324    1 66780 1.497454e-05
## 18325    1 66780 1.497454e-05
## 18326    1 66780 1.497454e-05
## 18327    1 66780 1.497454e-05
## 18328    1 66780 1.497454e-05
## 18329    1 66780 1.497454e-05
## 18330    1 66780 1.497454e-05
## 18331    1 66780 1.497454e-05
## 18332    1 66780 1.497454e-05
## 18333    1 66780 1.497454e-05
## 18334    1 66780 1.497454e-05
## 18335    1 66780 1.497454e-05
## 18336    1 66780 1.497454e-05
## 18337    1 66780 1.497454e-05
## 18338    1 66780 1.497454e-05
## 18339    1 66780 1.497454e-05
## 18340    1 66780 1.497454e-05
## 18341    1 66780 1.497454e-05
## 18342    1 66780 1.497454e-05
## 18343    1 66780 1.497454e-05
## 18344    1 66780 1.497454e-05
## 18345    1 66780 1.497454e-05
## 18346    1 66780 1.497454e-05
## 18347    1 66780 1.497454e-05
## 18348    1 66780 1.497454e-05
## 18349    1 66780 1.497454e-05
## 18350    1 66780 1.497454e-05
## 18351    1 66780 1.497454e-05
## 18352    1 66780 1.497454e-05
## 18353    1 66780 1.497454e-05
## 18354    1 66780 1.497454e-05
## 18355    1 66780 1.497454e-05
## 18356    1 66780 1.497454e-05
## 18357    1 66780 1.497454e-05
## 18358    1 66780 1.497454e-05
## 18359    1 66780 1.497454e-05
## 18360    1 66780 1.497454e-05
## 18361    1 66780 1.497454e-05
## 18362    1 66780 1.497454e-05
## 18363    1 66780 1.497454e-05
## 18364    1 66780 1.497454e-05
## 18365    1 66780 1.497454e-05
## 18366    1 66780 1.497454e-05
## 18367    1 66780 1.497454e-05
## 18368    1 66780 1.497454e-05
## 18369    1 66780 1.497454e-05
## 18370    1 66780 1.497454e-05
## 18371    1 66780 1.497454e-05
## 18372    1 66780 1.497454e-05
## 18373    1 66780 1.497454e-05
## 18374    1 66780 1.497454e-05
## 18375    1 66780 1.497454e-05
## 18376    1 66780 1.497454e-05
## 18377    1 66780 1.497454e-05
## 18378    1 66780 1.497454e-05
## 18379    1 66780 1.497454e-05
## 18380    1 66780 1.497454e-05
## 18381    1 66780 1.497454e-05
## 18382    1 66780 1.497454e-05
## 18383    1 66780 1.497454e-05
## 18384    1 66780 1.497454e-05
## 18385    1 66780 1.497454e-05
## 18386    1 66780 1.497454e-05
## 18387    1 66780 1.497454e-05
## 18388    1 66780 1.497454e-05
## 18389    1 66780 1.497454e-05
## 18390    1 66780 1.497454e-05
## 18391    1 66780 1.497454e-05
## 18392    1 66780 1.497454e-05
## 18393    1 66780 1.497454e-05
## 18394    1 66780 1.497454e-05
## 18395    1 66780 1.497454e-05
## 18396    1 66780 1.497454e-05
## 18397    1 66780 1.497454e-05
## 18398    1 66780 1.497454e-05
## 18399    1 66780 1.497454e-05
## 18400    1 66780 1.497454e-05
## 18401    1 66780 1.497454e-05
## 18402    1 66780 1.497454e-05
## 18403    1 66780 1.497454e-05
## 18404    1 66780 1.497454e-05
## 18405    1 66780 1.497454e-05
## 18406    1 66780 1.497454e-05
## 18407    1 66780 1.497454e-05
## 18408    1 66780 1.497454e-05
## 18409    1 66780 1.497454e-05
## 18410    1 66780 1.497454e-05
## 18411    1 66780 1.497454e-05
## 18412    1 66780 1.497454e-05
## 18413    1 66780 1.497454e-05
## 18414    1 66780 1.497454e-05
## 18415    1 66780 1.497454e-05
## 18416    1 66780 1.497454e-05
## 18417    1 66780 1.497454e-05
## 18418    1 66780 1.497454e-05
## 18419    1 66780 1.497454e-05
## 18420    1 66780 1.497454e-05
## 18421    1 66780 1.497454e-05
## 18422    1 66780 1.497454e-05
## 18423    1 66780 1.497454e-05
## 18424    1 66780 1.497454e-05
## 18425    1 66780 1.497454e-05
## 18426    1 66780 1.497454e-05
## 18427    1 66780 1.497454e-05
## 18428    1 66780 1.497454e-05
## 18429    1 66780 1.497454e-05
## 18430    1 66780 1.497454e-05
## 18431    1 66780 1.497454e-05
## 18432    1 66780 1.497454e-05
## 18433    1 66780 1.497454e-05
## 18434    1 66780 1.497454e-05
## 18435    1 66780 1.497454e-05
## 18436    1 66780 1.497454e-05
## 18437    1 66780 1.497454e-05
## 18438    1 66780 1.497454e-05
## 18439    1 66780 1.497454e-05
## 18440    1 66780 1.497454e-05
## 18441    1 66780 1.497454e-05
## 18442    1 66780 1.497454e-05
## 18443    1 66780 1.497454e-05
## 18444    1 66780 1.497454e-05
## 18445    1 66780 1.497454e-05
## 18446    1 66780 1.497454e-05
## 18447    1 66780 1.497454e-05
## 18448    1 66780 1.497454e-05
## 18449    1 66780 1.497454e-05
## 18450    1 66780 1.497454e-05
## 18451    1 66780 1.497454e-05
## 18452    1 66780 1.497454e-05
## 18453    1 66780 1.497454e-05
## 18454    1 66780 1.497454e-05
## 18455    1 66780 1.497454e-05
## 18456    1 66780 1.497454e-05
## 18457    1 66780 1.497454e-05
## 18458    1 66780 1.497454e-05
## 18459    1 66780 1.497454e-05
## 18460    1 66780 1.497454e-05
## 18461    1 66780 1.497454e-05
## 18462    1 66780 1.497454e-05
## 18463    1 66780 1.497454e-05
## 18464    1 66780 1.497454e-05
## 18465    1 66780 1.497454e-05
## 18466    1 66780 1.497454e-05
## 18467    1 66780 1.497454e-05
## 18468    1 66780 1.497454e-05
## 18469    1 66780 1.497454e-05
## 18470    1 66780 1.497454e-05
## 18471    1 66780 1.497454e-05
## 18472    1 66780 1.497454e-05
## 18473    1 66780 1.497454e-05
## 18474    1 66780 1.497454e-05
## 18475    1 66780 1.497454e-05
## 18476    1 66780 1.497454e-05
## 18477    1 66780 1.497454e-05
## 18478    1 66780 1.497454e-05
## 18479    1 66780 1.497454e-05
## 18480    1 66780 1.497454e-05
## 18481    1 66780 1.497454e-05
## 18482    1 66780 1.497454e-05
## 18483    1 66780 1.497454e-05
## 18484    1 66780 1.497454e-05
## 18485    1 66780 1.497454e-05
## 18486    1 66780 1.497454e-05
## 18487    1 66780 1.497454e-05
## 18488    1 66780 1.497454e-05
## 18489    1 66780 1.497454e-05
## 18490    1 66780 1.497454e-05
## 18491    1 66780 1.497454e-05
## 18492    1 66780 1.497454e-05
## 18493    1 66780 1.497454e-05
## 18494    1 66780 1.497454e-05
## 18495    1 66780 1.497454e-05
## 18496    1 66780 1.497454e-05
## 18497    1 66780 1.497454e-05
## 18498    1 66780 1.497454e-05
## 18499    1 66780 1.497454e-05
## 18500    1 66780 1.497454e-05
## 18501    1 66780 1.497454e-05
## 18502    1 66780 1.497454e-05
## 18503    1 66780 1.497454e-05
## 18504    1 66780 1.497454e-05
## 18505    1 66780 1.497454e-05
## 18506    1 66780 1.497454e-05
## 18507    1 66780 1.497454e-05
## 18508    1 66780 1.497454e-05
## 18509    1 66780 1.497454e-05
## 18510    1 66780 1.497454e-05
## 18511    1 66780 1.497454e-05
## 18512    1 66780 1.497454e-05
## 18513    1 66780 1.497454e-05
## 18514    1 66780 1.497454e-05
## 18515    1 66780 1.497454e-05
## 18516    1 66780 1.497454e-05
## 18517    1 66780 1.497454e-05
## 18518    1 66780 1.497454e-05
## 18519    1 66780 1.497454e-05
## 18520    1 66780 1.497454e-05
## 18521    1 66780 1.497454e-05
## 18522    1 66780 1.497454e-05
## 18523    1 66780 1.497454e-05
## 18524    1 66780 1.497454e-05
## 18525    1 66780 1.497454e-05
## 18526    1 66780 1.497454e-05
## 18527    1 66780 1.497454e-05
## 18528    1 66780 1.497454e-05
## 18529    1 66780 1.497454e-05
## 18530    1 66780 1.497454e-05
## 18531    1 66780 1.497454e-05
## 18532    1 66780 1.497454e-05
## 18533    1 66780 1.497454e-05
## 18534    1 66780 1.497454e-05
## 18535    1 66780 1.497454e-05
## 18536    1 66780 1.497454e-05
## 18537    1 66780 1.497454e-05
## 18538    1 66780 1.497454e-05
## 18539    1 66780 1.497454e-05
## 18540    1 66780 1.497454e-05
## 18541    1 66780 1.497454e-05
## 18542    1 66780 1.497454e-05
## 18543    1 66780 1.497454e-05
## 18544    1 66780 1.497454e-05
## 18545    1 66780 1.497454e-05
## 18546    1 66780 1.497454e-05
## 18547    1 66780 1.497454e-05
## 18548    1 66780 1.497454e-05
## 18549    1 66780 1.497454e-05
## 18550    1 66780 1.497454e-05
## 18551    1 66780 1.497454e-05
## 18552    1 66780 1.497454e-05
## 18553    1 66780 1.497454e-05
## 18554    1 66780 1.497454e-05
## 18555    1 66780 1.497454e-05
## 18556    1 66780 1.497454e-05
## 18557    1 66780 1.497454e-05
## 18558    1 66780 1.497454e-05
## 18559    1 66780 1.497454e-05
## 18560    1 66780 1.497454e-05
## 18561    1 66780 1.497454e-05
## 18562    1 66780 1.497454e-05
## 18563    1 66780 1.497454e-05
## 18564    1 66780 1.497454e-05
## 18565    1 66780 1.497454e-05
## 18566    1 66780 1.497454e-05
## 18567    1 66780 1.497454e-05
## 18568    1 66780 1.497454e-05
## 18569    1 66780 1.497454e-05
## 18570    1 66780 1.497454e-05
## 18571    1 66780 1.497454e-05
## 18572    1 66780 1.497454e-05
## 18573    1 66780 1.497454e-05
## 18574    1 66780 1.497454e-05
## 18575    1 66780 1.497454e-05
## 18576    1 66780 1.497454e-05
## 18577    1 66780 1.497454e-05
## 18578    1 66780 1.497454e-05
## 18579    1 66780 1.497454e-05
## 18580    1 66780 1.497454e-05
## 18581    1 66780 1.497454e-05
## 18582    1 66780 1.497454e-05
## 18583    1 66780 1.497454e-05
## 18584    1 66780 1.497454e-05
## 18585    1 66780 1.497454e-05
## 18586    1 66780 1.497454e-05
## 18587    1 66780 1.497454e-05
## 18588    1 66780 1.497454e-05
## 18589    1 66780 1.497454e-05
## 18590    1 66780 1.497454e-05
## 18591    1 66780 1.497454e-05
## 18592    1 66780 1.497454e-05
## 18593    1 66780 1.497454e-05
## 18594    1 66780 1.497454e-05
## 18595    1 66780 1.497454e-05
## 18596    1 66780 1.497454e-05
## 18597    1 66780 1.497454e-05
## 18598    1 66780 1.497454e-05
## 18599    1 66780 1.497454e-05
## 18600    1 66780 1.497454e-05
## 18601    1 66780 1.497454e-05
## 18602    1 66780 1.497454e-05
## 18603    1 66780 1.497454e-05
## 18604    1 66780 1.497454e-05
## 18605    1 66780 1.497454e-05
## 18606    1 66780 1.497454e-05
## 18607    1 66780 1.497454e-05
## 18608    1 66780 1.497454e-05
## 18609    1 66780 1.497454e-05
## 18610    1 66780 1.497454e-05
## 18611    1 66780 1.497454e-05
## 18612    1 66780 1.497454e-05
## 18613    1 66780 1.497454e-05
## 18614    1 66780 1.497454e-05
## 18615    1 66780 1.497454e-05
## 18616    1 66780 1.497454e-05
## 18617    1 66780 1.497454e-05
## 18618    1 66780 1.497454e-05
## 18619    1 66780 1.497454e-05
## 18620    1 66780 1.497454e-05
## 18621    1 66780 1.497454e-05
## 18622    1 66780 1.497454e-05
## 18623    1 66780 1.497454e-05
## 18624    1 66780 1.497454e-05
## 18625    1 66780 1.497454e-05
## 18626    1 66780 1.497454e-05
## 18627    1 66780 1.497454e-05
## 18628    1 66780 1.497454e-05
## 18629    1 66780 1.497454e-05
## 18630    1 66780 1.497454e-05
## 18631    1 66780 1.497454e-05
## 18632    1 66780 1.497454e-05
## 18633    1 66780 1.497454e-05
## 18634    1 66780 1.497454e-05
## 18635    1 66780 1.497454e-05
## 18636    1 66780 1.497454e-05
## 18637    1 66780 1.497454e-05
## 18638    1 66780 1.497454e-05
## 18639    1 66780 1.497454e-05
## 18640    1 66780 1.497454e-05
## 18641    1 66780 1.497454e-05
## 18642    1 66780 1.497454e-05
## 18643    1 66780 1.497454e-05
## 18644    1 66780 1.497454e-05
## 18645    1 66780 1.497454e-05
## 18646    1 66780 1.497454e-05
## 18647    1 66780 1.497454e-05
## 18648    1 66780 1.497454e-05
## 18649    1 66780 1.497454e-05
## 18650    1 66780 1.497454e-05
## 18651    1 66780 1.497454e-05
## 18652    1 66780 1.497454e-05
## 18653    1 66780 1.497454e-05
## 18654    1 66780 1.497454e-05
## 18655    1 66780 1.497454e-05
## 18656    1 66780 1.497454e-05
## 18657    1 66780 1.497454e-05
## 18658    1 66780 1.497454e-05
## 18659    1 66780 1.497454e-05
## 18660    1 66780 1.497454e-05
## 18661    1 66780 1.497454e-05
## 18662    1 66780 1.497454e-05
## 18663    1 66780 1.497454e-05
## 18664    1 66780 1.497454e-05
## 18665    1 66780 1.497454e-05
## 18666    1 66780 1.497454e-05
## 18667    1 66780 1.497454e-05
## 18668    1 66780 1.497454e-05
## 18669    1 66780 1.497454e-05
## 18670    1 66780 1.497454e-05
## 18671    1 66780 1.497454e-05
## 18672    1 66780 1.497454e-05
## 18673    1 66780 1.497454e-05
## 18674    1 66780 1.497454e-05
## 18675    1 66780 1.497454e-05
## 18676    1 66780 1.497454e-05
## 18677    1 66780 1.497454e-05
## 18678    1 66780 1.497454e-05
## 18679    1 66780 1.497454e-05
## 18680    1 66780 1.497454e-05
## 18681    1 66780 1.497454e-05
## 18682    1 66780 1.497454e-05
## 18683    1 66780 1.497454e-05
## 18684    1 66780 1.497454e-05
## 18685    1 66780 1.497454e-05
## 18686    1 66780 1.497454e-05
## 18687    1 66780 1.497454e-05
## 18688    1 66780 1.497454e-05
## 18689    1 66780 1.497454e-05
## 18690    1 66780 1.497454e-05
## 18691    1 66780 1.497454e-05
## 18692    1 66780 1.497454e-05
## 18693    1 66780 1.497454e-05
## 18694    1 66780 1.497454e-05
## 18695    1 66780 1.497454e-05
## 18696    1 66780 1.497454e-05
## 18697    1 66780 1.497454e-05
## 18698    1 66780 1.497454e-05
## 18699    1 66780 1.497454e-05
## 18700    1 66780 1.497454e-05
## 18701    1 66780 1.497454e-05
## 18702    1 66780 1.497454e-05
## 18703    1 66780 1.497454e-05
## 18704    1 66780 1.497454e-05
## 18705    1 66780 1.497454e-05
## 18706    1 66780 1.497454e-05
## 18707    1 66780 1.497454e-05
## 18708    1 66780 1.497454e-05
## 18709    1 66780 1.497454e-05
## 18710    1 66780 1.497454e-05
## 18711    1 66780 1.497454e-05
## 18712    1 66780 1.497454e-05
## 18713    1 66780 1.497454e-05
## 18714    1 66780 1.497454e-05
## 18715    1 66780 1.497454e-05
## 18716    1 66780 1.497454e-05
## 18717    1 66780 1.497454e-05
## 18718    1 66780 1.497454e-05
## 18719    1 66780 1.497454e-05
## 18720    1 66780 1.497454e-05
## 18721    1 66780 1.497454e-05
## 18722    1 66780 1.497454e-05
## 18723    1 66780 1.497454e-05
## 18724    1 66780 1.497454e-05
## 18725    1 66780 1.497454e-05
## 18726    1 66780 1.497454e-05
## 18727    1 66780 1.497454e-05
## 18728    1 66780 1.497454e-05
## 18729    1 66780 1.497454e-05
## 18730    1 66780 1.497454e-05
## 18731    1 66780 1.497454e-05
## 18732    1 66780 1.497454e-05
## 18733    1 66780 1.497454e-05
## 18734    1 66780 1.497454e-05
## 18735    1 66780 1.497454e-05
## 18736    1 66780 1.497454e-05
## 18737    1 66780 1.497454e-05
## 18738    1 66780 1.497454e-05
## 18739    1 66780 1.497454e-05
## 18740    1 66780 1.497454e-05
## 18741    1 66780 1.497454e-05
## 18742    1 66780 1.497454e-05
## 18743    1 66780 1.497454e-05
## 18744    1 66780 1.497454e-05
## 18745    1 66780 1.497454e-05
## 18746    1 66780 1.497454e-05
## 18747    1 66780 1.497454e-05
## 18748    1 66780 1.497454e-05
## 18749    1 66780 1.497454e-05
## 18750    1 66780 1.497454e-05
## 18751    1 66780 1.497454e-05
## 18752    1 66780 1.497454e-05
## 18753    1 66780 1.497454e-05
## 18754    1 66780 1.497454e-05
## 18755    1 66780 1.497454e-05
## 18756    1 66780 1.497454e-05
## 18757    1 66780 1.497454e-05
## 18758    1 66780 1.497454e-05
## 18759    1 66780 1.497454e-05
## 18760    1 66780 1.497454e-05
## 18761    1 66780 1.497454e-05
## 18762    1 66780 1.497454e-05
## 18763    1 66780 1.497454e-05
## 18764    1 66780 1.497454e-05
## 18765    1 66780 1.497454e-05
## 18766    1 66780 1.497454e-05
## 18767    1 66780 1.497454e-05
## 18768    1 66780 1.497454e-05
## 18769    1 66780 1.497454e-05
## 18770    1 66780 1.497454e-05
## 18771    1 66780 1.497454e-05
## 18772    1 66780 1.497454e-05
## 18773    1 66780 1.497454e-05
## 18774    1 66780 1.497454e-05
## 18775    1 66780 1.497454e-05
## 18776    1 66780 1.497454e-05
## 18777    1 66780 1.497454e-05
## 18778    1 66780 1.497454e-05
## 18779    1 66780 1.497454e-05
## 18780    1 66780 1.497454e-05
## 18781    1 66780 1.497454e-05
## 18782    1 66780 1.497454e-05
## 18783    1 66780 1.497454e-05
## 18784    1 66780 1.497454e-05
## 18785    1 66780 1.497454e-05
## 18786    1 66780 1.497454e-05
## 18787    1 66780 1.497454e-05
## 18788    1 66780 1.497454e-05
## 18789    1 66780 1.497454e-05
## 18790    1 66780 1.497454e-05
## 18791    1 66780 1.497454e-05
## 18792    1 66780 1.497454e-05
## 18793    1 66780 1.497454e-05
## 18794    1 66780 1.497454e-05
## 18795    1 66780 1.497454e-05
## 18796    1 66780 1.497454e-05
## 18797    1 66780 1.497454e-05
## 18798    1 66780 1.497454e-05
## 18799    1 66780 1.497454e-05
## 18800    1 66780 1.497454e-05
## 18801    1 66780 1.497454e-05
## 18802    1 66780 1.497454e-05
## 18803    1 66780 1.497454e-05
## 18804    1 66780 1.497454e-05
## 18805    1 66780 1.497454e-05
## 18806    1 66780 1.497454e-05
## 18807    1 66780 1.497454e-05
## 18808    1 66780 1.497454e-05
## 18809    1 66780 1.497454e-05
## 18810    1 66780 1.497454e-05
## 18811    1 66780 1.497454e-05
## 18812    1 66780 1.497454e-05
## 18813    1 66780 1.497454e-05
## 18814    1 66780 1.497454e-05
## 18815    1 66780 1.497454e-05
## 18816    1 66780 1.497454e-05
## 18817    1 66780 1.497454e-05
## 18818    1 66780 1.497454e-05
## 18819    1 66780 1.497454e-05
## 18820    1 66780 1.497454e-05
## 18821    1 66780 1.497454e-05
## 18822    1 66780 1.497454e-05
## 18823    1 66780 1.497454e-05
## 18824    1 66780 1.497454e-05
## 18825    1 66780 1.497454e-05
## 18826    1 66780 1.497454e-05
## 18827    1 66780 1.497454e-05
## 18828    1 66780 1.497454e-05
## 18829    1 66780 1.497454e-05
## 18830    1 66780 1.497454e-05
## 18831    1 66780 1.497454e-05
## 18832    1 66780 1.497454e-05
## 18833    1 66780 1.497454e-05
## 18834    1 66780 1.497454e-05
## 18835    1 66780 1.497454e-05
## 18836    1 66780 1.497454e-05
## 18837    1 66780 1.497454e-05
## 18838    1 66780 1.497454e-05
## 18839    1 66780 1.497454e-05
## 18840    1 66780 1.497454e-05
## 18841    1 66780 1.497454e-05
## 18842    1 66780 1.497454e-05
## 18843    1 66780 1.497454e-05
## 18844    1 66780 1.497454e-05
## 18845    1 66780 1.497454e-05
## 18846    1 66780 1.497454e-05
## 18847    1 66780 1.497454e-05
## 18848    1 66780 1.497454e-05
## 18849    1 66780 1.497454e-05
## 18850    1 66780 1.497454e-05
## 18851    1 66780 1.497454e-05
## 18852    1 66780 1.497454e-05
## 18853    1 66780 1.497454e-05
## 18854    1 66780 1.497454e-05
## 18855    1 66780 1.497454e-05
## 18856    1 66780 1.497454e-05
## 18857    1 66780 1.497454e-05
## 18858    1 66780 1.497454e-05
## 18859    1 66780 1.497454e-05
## 18860    1 66780 1.497454e-05
## 18861    1 66780 1.497454e-05
## 18862    1 66780 1.497454e-05
## 18863    1 66780 1.497454e-05
## 18864    1 66780 1.497454e-05
## 18865    1 66780 1.497454e-05
## 18866    1 66780 1.497454e-05
## 18867    1 66780 1.497454e-05
## 18868    1 66780 1.497454e-05
## 18869    1 66780 1.497454e-05
## 18870    1 66780 1.497454e-05
## 18871    1 66780 1.497454e-05
## 18872    1 66780 1.497454e-05
## 18873    1 66780 1.497454e-05
## 18874    1 66780 1.497454e-05
## 18875    1 66780 1.497454e-05
## 18876    1 66780 1.497454e-05
## 18877    1 66780 1.497454e-05
## 18878    1 66780 1.497454e-05
## 18879    1 66780 1.497454e-05
## 18880    1 66780 1.497454e-05
## 18881    1 66780 1.497454e-05
## 18882    1 66780 1.497454e-05
## 18883    1 66780 1.497454e-05
## 18884    1 66780 1.497454e-05
## 18885    1 66780 1.497454e-05
## 18886    1 66780 1.497454e-05
## 18887    1 66780 1.497454e-05
## 18888    1 66780 1.497454e-05
## 18889    1 66780 1.497454e-05
## 18890    1 66780 1.497454e-05
## 18891    1 66780 1.497454e-05
## 18892    1 66780 1.497454e-05
## 18893    1 66780 1.497454e-05
## 18894    1 66780 1.497454e-05
## 18895    1 66780 1.497454e-05
## 18896    1 66780 1.497454e-05
## 18897    1 66780 1.497454e-05
## 18898    1 66780 1.497454e-05
## 18899    1 66780 1.497454e-05
## 18900    1 66780 1.497454e-05
## 18901    1 66780 1.497454e-05
## 18902    1 66780 1.497454e-05
## 18903    1 66780 1.497454e-05
## 18904    1 66780 1.497454e-05
## 18905    1 66780 1.497454e-05
## 18906    1 66780 1.497454e-05
## 18907    1 66780 1.497454e-05
## 18908    1 66780 1.497454e-05
## 18909    1 66780 1.497454e-05
## 18910    1 66780 1.497454e-05
## 18911    1 66780 1.497454e-05
## 18912    1 66780 1.497454e-05
## 18913    1 66780 1.497454e-05
## 18914    1 66780 1.497454e-05
## 18915    1 66780 1.497454e-05
## 18916    1 66780 1.497454e-05
## 18917    1 66780 1.497454e-05
## 18918    1 66780 1.497454e-05
## 18919    1 66780 1.497454e-05
## 18920    1 66780 1.497454e-05
## 18921    1 66780 1.497454e-05
## 18922    1 66780 1.497454e-05
## 18923    1 66780 1.497454e-05
## 18924    1 66780 1.497454e-05
## 18925    1 66780 1.497454e-05
## 18926    1 66780 1.497454e-05
## 18927    1 66780 1.497454e-05
## 18928    1 66780 1.497454e-05
## 18929    1 66780 1.497454e-05
## 18930    1 66780 1.497454e-05
## 18931    1 66780 1.497454e-05
## 18932    1 66780 1.497454e-05
## 18933    1 66780 1.497454e-05
## 18934    1 66780 1.497454e-05
## 18935    1 66780 1.497454e-05
## 18936    1 66780 1.497454e-05
## 18937    1 66780 1.497454e-05
## 18938    1 66780 1.497454e-05
## 18939    1 66780 1.497454e-05
## 18940    1 66780 1.497454e-05
## 18941    1 66780 1.497454e-05
## 18942    1 66780 1.497454e-05
## 18943    1 66780 1.497454e-05
## 18944    1 66780 1.497454e-05
## 18945    1 66780 1.497454e-05
## 18946    1 66780 1.497454e-05
## 18947    1 66780 1.497454e-05
## 18948    1 66780 1.497454e-05
## 18949    1 66780 1.497454e-05
## 18950    1 66780 1.497454e-05
## 18951    1 66780 1.497454e-05
## 18952    1 66780 1.497454e-05
## 18953    1 66780 1.497454e-05
## 18954    1 66780 1.497454e-05
## 18955    1 66780 1.497454e-05
## 18956    1 66780 1.497454e-05
## 18957    1 66780 1.497454e-05
## 18958    1 66780 1.497454e-05
## 18959    1 66780 1.497454e-05
## 18960    1 66780 1.497454e-05
## 18961    1 66780 1.497454e-05
## 18962    1 66780 1.497454e-05
## 18963    1 66780 1.497454e-05
## 18964    1 66780 1.497454e-05
## 18965    1 66780 1.497454e-05
## 18966    1 66780 1.497454e-05
## 18967    1 66780 1.497454e-05
## 18968    1 66780 1.497454e-05
## 18969    1 66780 1.497454e-05
## 18970    1 66780 1.497454e-05
## 18971    1 66780 1.497454e-05
## 18972    1 66780 1.497454e-05
## 18973    1 66780 1.497454e-05
## 18974    1 66780 1.497454e-05
## 18975    1 66780 1.497454e-05
## 18976    1 66780 1.497454e-05
## 18977    1 66780 1.497454e-05
## 18978    1 66780 1.497454e-05
## 18979    1 66780 1.497454e-05
## 18980    1 66780 1.497454e-05
## 18981    1 66780 1.497454e-05
## 18982    1 66780 1.497454e-05
## 18983    1 66780 1.497454e-05
## 18984    1 66780 1.497454e-05
## 18985    1 66780 1.497454e-05
## 18986    1 66780 1.497454e-05
## 18987    1 66780 1.497454e-05
## 18988    1 66780 1.497454e-05
## 18989    1 66780 1.497454e-05
## 18990    1 66780 1.497454e-05
## 18991    1 66780 1.497454e-05
## 18992    1 66780 1.497454e-05
## 18993    1 66780 1.497454e-05
## 18994    1 66780 1.497454e-05
## 18995    1 66780 1.497454e-05
## 18996    1 66780 1.497454e-05
## 18997    1 66780 1.497454e-05
## 18998    1 66780 1.497454e-05
## 18999    1 66780 1.497454e-05
## 19000    1 66780 1.497454e-05
## 19001    1 66780 1.497454e-05
## 19002    1 66780 1.497454e-05
## 19003    1 66780 1.497454e-05
## 19004    1 66780 1.497454e-05
## 19005    1 66780 1.497454e-05
## 19006    1 66780 1.497454e-05
## 19007    1 66780 1.497454e-05
## 19008    1 66780 1.497454e-05
## 19009    1 66780 1.497454e-05
## 19010    1 66780 1.497454e-05
## 19011    1 66780 1.497454e-05
## 19012    1 66780 1.497454e-05
## 19013    1 66780 1.497454e-05
## 19014    1 66780 1.497454e-05
## 19015    1 66780 1.497454e-05
## 19016    1 66780 1.497454e-05
## 19017    1 66780 1.497454e-05
## 19018    1 66780 1.497454e-05
## 19019    1 66780 1.497454e-05
## 19020    1 66780 1.497454e-05
## 19021    1 66780 1.497454e-05
## 19022    1 66780 1.497454e-05
## 19023    1 66780 1.497454e-05
## 19024    1 66780 1.497454e-05
## 19025    1 66780 1.497454e-05
## 19026    1 66780 1.497454e-05
## 19027    1 66780 1.497454e-05
## 19028    1 66780 1.497454e-05
## 19029    1 66780 1.497454e-05
## 19030    1 66780 1.497454e-05
## 19031    1 66780 1.497454e-05
## 19032    1 66780 1.497454e-05
## 19033    1 66780 1.497454e-05
## 19034    1 66780 1.497454e-05
## 19035    1 66780 1.497454e-05
## 19036    1 66780 1.497454e-05
## 19037    1 66780 1.497454e-05
## 19038    1 66780 1.497454e-05
## 19039    1 66780 1.497454e-05
## 19040    1 66780 1.497454e-05
## 19041    1 66780 1.497454e-05
## 19042    1 66780 1.497454e-05
## 19043    1 66780 1.497454e-05
## 19044    1 66780 1.497454e-05
## 19045    1 66780 1.497454e-05
## 19046    1 66780 1.497454e-05
## 19047    1 66780 1.497454e-05
## 19048    1 66780 1.497454e-05
## 19049    1 66780 1.497454e-05
## 19050    1 66780 1.497454e-05
## 19051    1 66780 1.497454e-05
## 19052    1 66780 1.497454e-05
## 19053    1 66780 1.497454e-05
## 19054    1 66780 1.497454e-05
## 19055    1 66780 1.497454e-05
## 19056    1 66780 1.497454e-05
## 19057    1 66780 1.497454e-05
## 19058    1 66780 1.497454e-05
## 19059    1 66780 1.497454e-05
## 19060    1 66780 1.497454e-05
## 19061    1 66780 1.497454e-05
## 19062    1 66780 1.497454e-05
## 19063    1 66780 1.497454e-05
## 19064    1 66780 1.497454e-05
## 19065    1 66780 1.497454e-05
## 19066    1 66780 1.497454e-05
## 19067    1 66780 1.497454e-05
## 19068    1 66780 1.497454e-05
## 19069    1 66780 1.497454e-05
## 19070    1 66780 1.497454e-05
## 19071    1 66780 1.497454e-05
## 19072    1 66780 1.497454e-05
## 19073    1 66780 1.497454e-05
## 19074    1 66780 1.497454e-05
## 19075    1 66780 1.497454e-05
## 19076    1 66780 1.497454e-05
## 19077    1 66780 1.497454e-05
## 19078    1 66780 1.497454e-05
## 19079    1 66780 1.497454e-05
## 19080    1 66780 1.497454e-05
## 19081    1 66780 1.497454e-05
## 19082    1 66780 1.497454e-05
## 19083    1 66780 1.497454e-05
## 19084    1 66780 1.497454e-05
## 19085    1 66780 1.497454e-05
## 19086    1 66780 1.497454e-05
## 19087    1 66780 1.497454e-05
## 19088    1 66780 1.497454e-05
## 19089    1 66780 1.497454e-05
## 19090    1 66780 1.497454e-05
## 19091    1 66780 1.497454e-05
## 19092    1 66780 1.497454e-05
## 19093    1 66780 1.497454e-05
## 19094    1 66780 1.497454e-05
## 19095    1 66780 1.497454e-05
## 19096    1 66780 1.497454e-05
## 19097    1 66780 1.497454e-05
## 19098    1 66780 1.497454e-05
## 19099    1 66780 1.497454e-05
## 19100    1 66780 1.497454e-05
## 19101    1 66780 1.497454e-05
## 19102    1 66780 1.497454e-05
## 19103    1 66780 1.497454e-05
## 19104    1 66780 1.497454e-05
## 19105    1 66780 1.497454e-05
## 19106    1 66780 1.497454e-05
## 19107    1 66780 1.497454e-05
## 19108    1 66780 1.497454e-05
## 19109    1 66780 1.497454e-05
## 19110    1 66780 1.497454e-05
## 19111    1 66780 1.497454e-05
## 19112    1 66780 1.497454e-05
## 19113    1 66780 1.497454e-05
## 19114    1 66780 1.497454e-05
## 19115    1 66780 1.497454e-05
## 19116    1 66780 1.497454e-05
## 19117    1 66780 1.497454e-05
## 19118    1 66780 1.497454e-05
## 19119    1 66780 1.497454e-05
## 19120    1 66780 1.497454e-05
## 19121    1 66780 1.497454e-05
## 19122    1 66780 1.497454e-05
## 19123    1 66780 1.497454e-05
## 19124    1 66780 1.497454e-05
## 19125    1 66780 1.497454e-05
## 19126    1 66780 1.497454e-05
## 19127    1 66780 1.497454e-05
## 19128    1 66780 1.497454e-05
## 19129    1 66780 1.497454e-05
## 19130    1 66780 1.497454e-05
## 19131    1 66780 1.497454e-05
## 19132    1 66780 1.497454e-05
## 19133    1 66780 1.497454e-05
## 19134    1 66780 1.497454e-05
## 19135    1 66780 1.497454e-05
## 19136    1 66780 1.497454e-05
## 19137    1 66780 1.497454e-05
## 19138    1 66780 1.497454e-05
## 19139    1 66780 1.497454e-05
## 19140    1 66780 1.497454e-05
## 19141    1 66780 1.497454e-05
## 19142    1 66780 1.497454e-05
## 19143    1 66780 1.497454e-05
## 19144    1 66780 1.497454e-05
## 19145    1 66780 1.497454e-05
## 19146    1 66780 1.497454e-05
## 19147    1 66780 1.497454e-05
## 19148    1 66780 1.497454e-05
## 19149    1 66780 1.497454e-05
## 19150    1 66780 1.497454e-05
## 19151    1 66780 1.497454e-05
## 19152    1 66780 1.497454e-05
## 19153    1 66780 1.497454e-05
## 19154    1 66780 1.497454e-05
## 19155    1 66780 1.497454e-05
## 19156    1 66780 1.497454e-05
## 19157    1 66780 1.497454e-05
## 19158    1 66780 1.497454e-05
## 19159    1 66780 1.497454e-05
## 19160    1 66780 1.497454e-05
## 19161    1 66780 1.497454e-05
## 19162    1 66780 1.497454e-05
## 19163    1 66780 1.497454e-05
## 19164    1 66780 1.497454e-05
## 19165    1 66780 1.497454e-05
## 19166    1 66780 1.497454e-05
## 19167    1 66780 1.497454e-05
## 19168    1 66780 1.497454e-05
## 19169    1 66780 1.497454e-05
## 19170    1 66780 1.497454e-05
## 19171    1 66780 1.497454e-05
## 19172    1 66780 1.497454e-05
## 19173    1 66780 1.497454e-05
## 19174    1 66780 1.497454e-05
## 19175    1 66780 1.497454e-05
## 19176    1 66780 1.497454e-05
## 19177    1 66780 1.497454e-05
## 19178    1 66780 1.497454e-05
## 19179    1 66780 1.497454e-05
## 19180    1 66780 1.497454e-05
## 19181    1 66780 1.497454e-05
## 19182    1 66780 1.497454e-05
## 19183    1 66780 1.497454e-05
## 19184    1 66780 1.497454e-05
## 19185    1 66780 1.497454e-05
## 19186    1 66780 1.497454e-05
## 19187    1 66780 1.497454e-05
## 19188    1 66780 1.497454e-05
## 19189    1 66780 1.497454e-05
## 19190    1 66780 1.497454e-05
## 19191    1 66780 1.497454e-05
## 19192    1 66780 1.497454e-05
## 19193    1 66780 1.497454e-05
## 19194    1 66780 1.497454e-05
## 19195    1 66780 1.497454e-05
## 19196    1 66780 1.497454e-05
## 19197    1 66780 1.497454e-05
## 19198    1 66780 1.497454e-05
## 19199    1 66780 1.497454e-05
## 19200    1 66780 1.497454e-05
## 19201    1 66780 1.497454e-05
## 19202    1 66780 1.497454e-05
## 19203    1 66780 1.497454e-05
## 19204    1 66780 1.497454e-05
## 19205    1 66780 1.497454e-05
## 19206    1 66780 1.497454e-05
## 19207    1 66780 1.497454e-05
## 19208    1 66780 1.497454e-05
## 19209    1 66780 1.497454e-05
## 19210    1 66780 1.497454e-05
## 19211    1 66780 1.497454e-05
## 19212    1 66780 1.497454e-05
## 19213    1 66780 1.497454e-05
## 19214    1 66780 1.497454e-05
## 19215    1 66780 1.497454e-05
## 19216    1 66780 1.497454e-05
## 19217    1 66780 1.497454e-05
## 19218    1 66780 1.497454e-05
## 19219    1 66780 1.497454e-05
## 19220    1 66780 1.497454e-05
## 19221    1 66780 1.497454e-05
## 19222    1 66780 1.497454e-05
## 19223    1 66780 1.497454e-05
## 19224    1 66780 1.497454e-05
## 19225    1 66780 1.497454e-05
## 19226    1 66780 1.497454e-05
## 19227    1 66780 1.497454e-05
## 19228    1 66780 1.497454e-05
## 19229    1 66780 1.497454e-05
## 19230    1 66780 1.497454e-05
## 19231    1 66780 1.497454e-05
## 19232    1 66780 1.497454e-05
## 19233    1 66780 1.497454e-05
## 19234    1 66780 1.497454e-05
## 19235    1 66780 1.497454e-05
## 19236    1 66780 1.497454e-05
## 19237    1 66780 1.497454e-05
## 19238    1 66780 1.497454e-05
## 19239    1 66780 1.497454e-05
## 19240    1 66780 1.497454e-05
## 19241    1 66780 1.497454e-05
## 19242    1 66780 1.497454e-05
## 19243    1 66780 1.497454e-05
## 19244    1 66780 1.497454e-05
## 19245    1 66780 1.497454e-05
## 19246    1 66780 1.497454e-05
## 19247    1 66780 1.497454e-05
## 19248    1 66780 1.497454e-05
## 19249    1 66780 1.497454e-05
## 19250    1 66780 1.497454e-05
## 19251    1 66780 1.497454e-05
## 19252    1 66780 1.497454e-05
## 19253    1 66780 1.497454e-05
## 19254    1 66780 1.497454e-05
## 19255    1 66780 1.497454e-05
## 19256    1 66780 1.497454e-05
## 19257    1 66780 1.497454e-05
## 19258    1 66780 1.497454e-05
## 19259    1 66780 1.497454e-05
## 19260    1 66780 1.497454e-05
## 19261    1 66780 1.497454e-05
## 19262    1 66780 1.497454e-05
## 19263    1 66780 1.497454e-05
## 19264    1 66780 1.497454e-05
## 19265    1 66780 1.497454e-05
## 19266    1 66780 1.497454e-05
## 19267    1 66780 1.497454e-05
## 19268    1 66780 1.497454e-05
## 19269    1 66780 1.497454e-05
## 19270    1 66780 1.497454e-05
## 19271    1 66780 1.497454e-05
## 19272    1 66780 1.497454e-05
## 19273    1 66780 1.497454e-05
## 19274    1 66780 1.497454e-05
## 19275    1 66780 1.497454e-05
## 19276    1 66780 1.497454e-05
## 19277    1 66780 1.497454e-05
## 19278    1 66780 1.497454e-05
## 19279    1 66780 1.497454e-05
## 19280    1 66780 1.497454e-05
## 19281    1 66780 1.497454e-05
## 19282    1 66780 1.497454e-05
## 19283    1 66780 1.497454e-05
## 19284    1 66780 1.497454e-05
## 19285    1 66780 1.497454e-05
## 19286    1 66780 1.497454e-05
## 19287    1 66780 1.497454e-05
## 19288    1 66780 1.497454e-05
## 19289    1 66780 1.497454e-05
## 19290    1 66780 1.497454e-05
## 19291    1 66780 1.497454e-05
## 19292    1 66780 1.497454e-05
## 19293    1 66780 1.497454e-05
## 19294    1 66780 1.497454e-05
## 19295    1 66780 1.497454e-05
## 19296    1 66780 1.497454e-05
## 19297    1 66780 1.497454e-05
## 19298    1 66780 1.497454e-05
## 19299    1 66780 1.497454e-05
## 19300    1 66780 1.497454e-05
## 19301    1 66780 1.497454e-05
## 19302    1 66780 1.497454e-05
## 19303    1 66780 1.497454e-05
## 19304    1 66780 1.497454e-05
## 19305    1 66780 1.497454e-05
## 19306    1 66780 1.497454e-05
## 19307    1 66780 1.497454e-05
## 19308    1 66780 1.497454e-05
## 19309    1 66780 1.497454e-05
## 19310    1 66780 1.497454e-05
## 19311    1 66780 1.497454e-05
## 19312    1 66780 1.497454e-05
## 19313    1 66780 1.497454e-05
## 19314    1 66780 1.497454e-05
## 19315    1 66780 1.497454e-05
## 19316    1 66780 1.497454e-05
## 19317    1 66780 1.497454e-05
## 19318    1 66780 1.497454e-05
## 19319    1 66780 1.497454e-05
## 19320    1 66780 1.497454e-05
## 19321    1 66780 1.497454e-05
## 19322    1 66780 1.497454e-05
## 19323    1 66780 1.497454e-05
## 19324    1 66780 1.497454e-05
## 19325    1 66780 1.497454e-05
## 19326    1 66780 1.497454e-05
## 19327    1 66780 1.497454e-05
## 19328    1 66780 1.497454e-05
## 19329    1 66780 1.497454e-05
## 19330    1 66780 1.497454e-05
## 19331    1 66780 1.497454e-05
## 19332    1 66780 1.497454e-05
## 19333    1 66780 1.497454e-05
## 19334    1 66780 1.497454e-05
## 19335    1 66780 1.497454e-05
## 19336    1 66780 1.497454e-05
## 19337    1 66780 1.497454e-05
## 19338    1 66780 1.497454e-05
## 19339    1 66780 1.497454e-05
## 19340    1 66780 1.497454e-05
## 19341    1 66780 1.497454e-05
## 19342    1 66780 1.497454e-05
## 19343    1 66780 1.497454e-05
## 19344    1 66780 1.497454e-05
## 19345    1 66780 1.497454e-05
## 19346    1 66780 1.497454e-05
## 19347    1 66780 1.497454e-05
## 19348    1 66780 1.497454e-05
## 19349    1 66780 1.497454e-05
## 19350    1 66780 1.497454e-05
## 19351    1 66780 1.497454e-05
## 19352    1 66780 1.497454e-05
## 19353    1 66780 1.497454e-05
## 19354    1 66780 1.497454e-05
## 19355    1 66780 1.497454e-05
## 19356    1 66780 1.497454e-05
## 19357    1 66780 1.497454e-05
## 19358    1 66780 1.497454e-05
## 19359    1 66780 1.497454e-05
## 19360    1 66780 1.497454e-05
## 19361    1 66780 1.497454e-05
## 19362    1 66780 1.497454e-05
## 19363    1 66780 1.497454e-05
## 19364    1 66780 1.497454e-05
## 19365    1 66780 1.497454e-05
## 19366    1 66780 1.497454e-05
## 19367    1 66780 1.497454e-05
## 19368    1 66780 1.497454e-05
## 19369    1 66780 1.497454e-05
## 19370    1 66780 1.497454e-05
## 19371    1 66780 1.497454e-05
## 19372    1 66780 1.497454e-05
## 19373    1 66780 1.497454e-05
## 19374    1 66780 1.497454e-05
## 19375    1 66780 1.497454e-05
## 19376    1 66780 1.497454e-05
## 19377    1 66780 1.497454e-05
## 19378    1 66780 1.497454e-05
## 19379    1 66780 1.497454e-05
## 19380    1 66780 1.497454e-05
## 19381    1 66780 1.497454e-05
## 19382    1 66780 1.497454e-05
## 19383    1 66780 1.497454e-05
## 19384    1 66780 1.497454e-05
## 19385    1 66780 1.497454e-05
## 19386    1 66780 1.497454e-05
## 19387    1 66780 1.497454e-05
## 19388    1 66780 1.497454e-05
## 19389    1 66780 1.497454e-05
## 19390    1 66780 1.497454e-05
## 19391    1 66780 1.497454e-05
## 19392    1 66780 1.497454e-05
## 19393    1 66780 1.497454e-05
## 19394    1 66780 1.497454e-05
## 19395    1 66780 1.497454e-05
## 19396    1 66780 1.497454e-05
## 19397    1 66780 1.497454e-05
## 19398    1 66780 1.497454e-05
## 19399    1 66780 1.497454e-05
## 19400    1 66780 1.497454e-05
## 19401    1 66780 1.497454e-05
## 19402    1 66780 1.497454e-05
## 19403    1 66780 1.497454e-05
## 19404    1 66780 1.497454e-05
## 19405    1 66780 1.497454e-05
## 19406    1 66780 1.497454e-05
## 19407    1 66780 1.497454e-05
## 19408    1 66780 1.497454e-05
## 19409    1 66780 1.497454e-05
## 19410    1 66780 1.497454e-05
## 19411    1 66780 1.497454e-05
## 19412    1 66780 1.497454e-05
## 19413    1 66780 1.497454e-05
## 19414    1 66780 1.497454e-05
## 19415    1 66780 1.497454e-05
## 19416    1 66780 1.497454e-05
## 19417    1 66780 1.497454e-05
## 19418    1 66780 1.497454e-05
## 19419    1 66780 1.497454e-05
## 19420    1 66780 1.497454e-05
## 19421    1 66780 1.497454e-05
## 19422    1 66780 1.497454e-05
## 19423    1 66780 1.497454e-05
## 19424    1 66780 1.497454e-05
## 19425    1 66780 1.497454e-05
## 19426    1 66780 1.497454e-05
## 19427    1 66780 1.497454e-05
## 19428    1 66780 1.497454e-05
## 19429    1 66780 1.497454e-05
## 19430    1 66780 1.497454e-05
## 19431    1 66780 1.497454e-05
## 19432    1 66780 1.497454e-05
## 19433    1 66780 1.497454e-05
## 19434    1 66780 1.497454e-05
## 19435    1 66780 1.497454e-05
## 19436    1 66780 1.497454e-05
## 19437    1 66780 1.497454e-05
## 19438    1 66780 1.497454e-05
## 19439    1 66780 1.497454e-05
## 19440    1 66780 1.497454e-05
## 19441    1 66780 1.497454e-05
## 19442    1 66780 1.497454e-05
## 19443    1 66780 1.497454e-05
## 19444    1 66780 1.497454e-05
## 19445    1 66780 1.497454e-05
## 19446    1 66780 1.497454e-05
## 19447    1 66780 1.497454e-05
## 19448    1 66780 1.497454e-05
## 19449    1 66780 1.497454e-05
## 19450    1 66780 1.497454e-05
## 19451    1 66780 1.497454e-05
## 19452    1 66780 1.497454e-05
## 19453    1 66780 1.497454e-05
## 19454    1 66780 1.497454e-05
## 19455    1 66780 1.497454e-05
## 19456    1 66780 1.497454e-05
## 19457    1 66780 1.497454e-05
## 19458    1 66780 1.497454e-05
## 19459    1 66780 1.497454e-05
## 19460    1 66780 1.497454e-05
## 19461    1 66780 1.497454e-05
## 19462    1 66780 1.497454e-05
## 19463    1 66780 1.497454e-05
## 19464    1 66780 1.497454e-05
## 19465    1 66780 1.497454e-05
## 19466    1 66780 1.497454e-05
## 19467    1 66780 1.497454e-05
## 19468    1 66780 1.497454e-05
## 19469    1 66780 1.497454e-05
## 19470    1 66780 1.497454e-05
## 19471    1 66780 1.497454e-05
## 19472    1 66780 1.497454e-05
## 19473    1 66780 1.497454e-05
## 19474    1 66780 1.497454e-05
## 19475    1 66780 1.497454e-05
## 19476    1 66780 1.497454e-05
## 19477    1 66780 1.497454e-05
## 19478    1 66780 1.497454e-05
## 19479    1 66780 1.497454e-05
## 19480    1 66780 1.497454e-05
## 19481    1 66780 1.497454e-05
## 19482    1 66780 1.497454e-05
## 19483    1 66780 1.497454e-05
## 19484    1 66780 1.497454e-05
## 19485    1 66780 1.497454e-05
## 19486    1 66780 1.497454e-05
## 19487    1 66780 1.497454e-05
## 19488    1 66780 1.497454e-05
## 19489    1 66780 1.497454e-05
## 19490    1 66780 1.497454e-05
## 19491    1 66780 1.497454e-05
## 19492    1 66780 1.497454e-05
## 19493    1 66780 1.497454e-05
## 19494    1 66780 1.497454e-05
## 19495    1 66780 1.497454e-05
## 19496    1 66780 1.497454e-05
## 19497    1 66780 1.497454e-05
## 19498    1 66780 1.497454e-05
## 19499    1 66780 1.497454e-05
## 19500    1 66780 1.497454e-05
## 19501    1 66780 1.497454e-05
## 19502    1 66780 1.497454e-05
## 19503    1 66780 1.497454e-05
## 19504    1 66780 1.497454e-05
## 19505    1 66780 1.497454e-05
## 19506    1 66780 1.497454e-05
## 19507    1 66780 1.497454e-05
## 19508    1 66780 1.497454e-05
## 19509    1 66780 1.497454e-05
## 19510    1 66780 1.497454e-05
## 19511    1 66780 1.497454e-05
## 19512    1 66780 1.497454e-05
## 19513    1 66780 1.497454e-05
## 19514    1 66780 1.497454e-05
## 19515    1 66780 1.497454e-05
## 19516    1 66780 1.497454e-05
## 19517    1 66780 1.497454e-05
## 19518    1 66780 1.497454e-05
## 19519    1 66780 1.497454e-05
## 19520    1 66780 1.497454e-05
## 19521    1 66780 1.497454e-05
## 19522    1 66780 1.497454e-05
## 19523    1 66780 1.497454e-05
## 19524    1 66780 1.497454e-05
## 19525    1 66780 1.497454e-05
## 19526    1 66780 1.497454e-05
## 19527    1 66780 1.497454e-05
## 19528    1 66780 1.497454e-05
## 19529    1 66780 1.497454e-05
## 19530    1 66780 1.497454e-05
## 19531    1 66780 1.497454e-05
## 19532    1 66780 1.497454e-05
## 19533    1 66780 1.497454e-05
## 19534    1 66780 1.497454e-05
## 19535    1 66780 1.497454e-05
## 19536    1 66780 1.497454e-05
## 19537    1 66780 1.497454e-05
## 19538    1 66780 1.497454e-05
## 19539    1 66780 1.497454e-05
## 19540    1 66780 1.497454e-05
## 19541    1 66780 1.497454e-05
## 19542    1 66780 1.497454e-05
## 19543    1 66780 1.497454e-05
## 19544    1 66780 1.497454e-05
## 19545    1 66780 1.497454e-05
## 19546    1 66780 1.497454e-05
## 19547    1 66780 1.497454e-05
## 19548    1 66780 1.497454e-05
## 19549    1 66780 1.497454e-05
## 19550    1 66780 1.497454e-05
## 19551    1 66780 1.497454e-05
## 19552    1 66780 1.497454e-05
## 19553    1 66780 1.497454e-05
## 19554    1 66780 1.497454e-05
## 19555    1 66780 1.497454e-05
## 19556    1 66780 1.497454e-05
## 19557    1 66780 1.497454e-05
## 19558    1 66780 1.497454e-05
## 19559    1 66780 1.497454e-05
## 19560    1 66780 1.497454e-05
## 19561    1 66780 1.497454e-05
## 19562    1 66780 1.497454e-05
## 19563    1 66780 1.497454e-05
## 19564    1 66780 1.497454e-05
## 19565    1 66780 1.497454e-05
## 19566    1 66780 1.497454e-05
## 19567    1 66780 1.497454e-05
## 19568    1 66780 1.497454e-05
## 19569    1 66780 1.497454e-05
## 19570    1 66780 1.497454e-05
## 19571    1 66780 1.497454e-05
## 19572    1 66780 1.497454e-05
## 19573    1 66780 1.497454e-05
## 19574    1 66780 1.497454e-05
## 19575    1 66780 1.497454e-05
## 19576    1 66780 1.497454e-05
## 19577    1 66780 1.497454e-05
## 19578    1 66780 1.497454e-05
## 19579    1 66780 1.497454e-05
## 19580    1 66780 1.497454e-05
## 19581    1 66780 1.497454e-05
## 19582    1 66780 1.497454e-05
## 19583    1 66780 1.497454e-05
## 19584    1 66780 1.497454e-05
## 19585    1 66780 1.497454e-05
## 19586    1 66780 1.497454e-05
## 19587    1 66780 1.497454e-05
## 19588    1 66780 1.497454e-05
## 19589    1 66780 1.497454e-05
## 19590    1 66780 1.497454e-05
## 19591    1 66780 1.497454e-05
## 19592    1 66780 1.497454e-05
## 19593    1 66780 1.497454e-05
## 19594    1 66780 1.497454e-05
## 19595    1 66780 1.497454e-05
## 19596    1 66780 1.497454e-05
## 19597    1 66780 1.497454e-05
## 19598    1 66780 1.497454e-05
## 19599    1 66780 1.497454e-05
## 19600    1 66780 1.497454e-05
## 19601    1 66780 1.497454e-05
## 19602    1 66780 1.497454e-05
## 19603    1 66780 1.497454e-05
## 19604    1 66780 1.497454e-05
## 19605    1 66780 1.497454e-05
## 19606    1 66780 1.497454e-05
## 19607    1 66780 1.497454e-05
## 19608    1 66780 1.497454e-05
## 19609    1 66780 1.497454e-05
## 19610    1 66780 1.497454e-05
## 19611    1 66780 1.497454e-05
## 19612    1 66780 1.497454e-05
## 19613    1 66780 1.497454e-05
## 19614    1 66780 1.497454e-05
## 19615    1 66780 1.497454e-05
## 19616    1 66780 1.497454e-05
## 19617    1 66780 1.497454e-05
## 19618    1 66780 1.497454e-05
## 19619    1 66780 1.497454e-05
## 19620    1 66780 1.497454e-05
## 19621    1 66780 1.497454e-05
## 19622    1 66780 1.497454e-05
## 19623    1 66780 1.497454e-05
## 19624    1 66780 1.497454e-05
## 19625    1 66780 1.497454e-05
## 19626    1 66780 1.497454e-05
## 19627    1 66780 1.497454e-05
## 19628    1 66780 1.497454e-05
## 19629    1 66780 1.497454e-05
## 19630    1 66780 1.497454e-05
## 19631    1 66780 1.497454e-05
## 19632    1 66780 1.497454e-05
## 19633    1 66780 1.497454e-05
## 19634    1 66780 1.497454e-05
## 19635    1 66780 1.497454e-05
## 19636    1 66780 1.497454e-05
## 19637    1 66780 1.497454e-05
## 19638    1 66780 1.497454e-05
## 19639    1 66780 1.497454e-05
## 19640    1 66780 1.497454e-05
## 19641    1 66780 1.497454e-05
## 19642    1 66780 1.497454e-05
## 19643    1 66780 1.497454e-05
## 19644    1 66780 1.497454e-05
## 19645    1 66780 1.497454e-05
## 19646    1 66780 1.497454e-05
## 19647    1 66780 1.497454e-05
## 19648    1 66780 1.497454e-05
## 19649    1 66780 1.497454e-05
## 19650    1 66780 1.497454e-05
## 19651    1 66780 1.497454e-05
## 19652    1 66780 1.497454e-05
## 19653    1 66780 1.497454e-05
## 19654    1 66780 1.497454e-05
## 19655    1 66780 1.497454e-05
## 19656    1 66780 1.497454e-05
## 19657    1 66780 1.497454e-05
## 19658    1 66780 1.497454e-05
## 19659    1 66780 1.497454e-05
## 19660    1 66780 1.497454e-05
## 19661    1 66780 1.497454e-05
## 19662    1 66780 1.497454e-05
## 19663    1 66780 1.497454e-05
## 19664    1 66780 1.497454e-05
## 19665    1 66780 1.497454e-05
## 19666    1 66780 1.497454e-05
## 19667    1 66780 1.497454e-05
## 19668    1 66780 1.497454e-05
## 19669    1 66780 1.497454e-05
## 19670    1 66780 1.497454e-05
## 19671    1 66780 1.497454e-05
## 19672    1 66780 1.497454e-05
## 19673    1 66780 1.497454e-05
## 19674    1 66780 1.497454e-05
## 19675    1 66780 1.497454e-05
## 19676    1 66780 1.497454e-05
## 19677    1 66780 1.497454e-05
## 19678    1 66780 1.497454e-05
## 19679    1 66780 1.497454e-05
## 19680    1 66780 1.497454e-05
## 19681    1 66780 1.497454e-05
## 19682    1 66780 1.497454e-05
## 19683    1 66780 1.497454e-05
## 19684    1 66780 1.497454e-05
## 19685    1 66780 1.497454e-05
## 19686    1 66780 1.497454e-05
## 19687    1 66780 1.497454e-05
## 19688    1 66780 1.497454e-05
## 19689    1 66780 1.497454e-05
## 19690    1 66780 1.497454e-05
## 19691    1 66780 1.497454e-05
## 19692    1 66780 1.497454e-05
## 19693    1 66780 1.497454e-05
## 19694    1 66780 1.497454e-05
## 19695    1 66780 1.497454e-05
## 19696    1 66780 1.497454e-05
## 19697    1 66780 1.497454e-05
## 19698    1 66780 1.497454e-05
## 19699    1 66780 1.497454e-05
## 19700    1 66780 1.497454e-05
## 19701    1 66780 1.497454e-05
## 19702    1 66780 1.497454e-05
## 19703    1 66780 1.497454e-05
## 19704    1 66780 1.497454e-05
## 19705    1 66780 1.497454e-05
## 19706    1 66780 1.497454e-05
## 19707    1 66780 1.497454e-05
## 19708    1 66780 1.497454e-05
## 19709    1 66780 1.497454e-05
## 19710    1 66780 1.497454e-05
## 19711    1 66780 1.497454e-05
## 19712    1 66780 1.497454e-05
## 19713    1 66780 1.497454e-05
## 19714    1 66780 1.497454e-05
## 19715    1 66780 1.497454e-05
## 19716    1 66780 1.497454e-05
## 19717    1 66780 1.497454e-05
## 19718    1 66780 1.497454e-05
## 19719    1 66780 1.497454e-05
## 19720    1 66780 1.497454e-05
## 19721    1 66780 1.497454e-05
## 19722    1 66780 1.497454e-05
## 19723    1 66780 1.497454e-05
## 19724    1 66780 1.497454e-05
## 19725    1 66780 1.497454e-05
## 19726    1 66780 1.497454e-05
## 19727    1 66780 1.497454e-05
## 19728    1 66780 1.497454e-05
## 19729    1 66780 1.497454e-05
## 19730    1 66780 1.497454e-05
## 19731    1 66780 1.497454e-05
## 19732    1 66780 1.497454e-05
## 19733    1 66780 1.497454e-05
## 19734    1 66780 1.497454e-05
## 19735    1 66780 1.497454e-05
## 19736    1 66780 1.497454e-05
## 19737    1 66780 1.497454e-05
## 19738    1 66780 1.497454e-05
## 19739    1 66780 1.497454e-05
## 19740    1 66780 1.497454e-05
## 19741    1 66780 1.497454e-05
## 19742    1 66780 1.497454e-05
## 19743    1 66780 1.497454e-05
## 19744    1 66780 1.497454e-05
## 19745    1 66780 1.497454e-05
## 19746    1 66780 1.497454e-05
## 19747    1 66780 1.497454e-05
## 19748    1 66780 1.497454e-05
## 19749    1 66780 1.497454e-05
## 19750    1 66780 1.497454e-05
## 19751    1 66780 1.497454e-05
## 19752    1 66780 1.497454e-05
## 19753    1 66780 1.497454e-05
## 19754    1 66780 1.497454e-05
## 19755    1 66780 1.497454e-05
## 19756    1 66780 1.497454e-05
## 19757    1 66780 1.497454e-05
## 19758    1 66780 1.497454e-05
## 19759    1 66780 1.497454e-05
## 19760    1 66780 1.497454e-05
## 19761    1 66780 1.497454e-05
## 19762    1 66780 1.497454e-05
## 19763    1 66780 1.497454e-05
## 19764    1 66780 1.497454e-05
## 19765    1 66780 1.497454e-05
## 19766    1 66780 1.497454e-05
## 19767    1 66780 1.497454e-05
## 19768    1 66780 1.497454e-05
## 19769    1 66780 1.497454e-05
## 19770    1 66780 1.497454e-05
## 19771    1 66780 1.497454e-05
## 19772    1 66780 1.497454e-05
## 19773    1 66780 1.497454e-05
## 19774    1 66780 1.497454e-05
## 19775    1 66780 1.497454e-05
## 19776    1 66780 1.497454e-05
## 19777    1 66780 1.497454e-05
## 19778    1 66780 1.497454e-05
## 19779    1 66780 1.497454e-05
## 19780    1 66780 1.497454e-05
## 19781    1 66780 1.497454e-05
## 19782    1 66780 1.497454e-05
## 19783    1 66780 1.497454e-05
## 19784    1 66780 1.497454e-05
## 19785    1 66780 1.497454e-05
## 19786    1 66780 1.497454e-05
## 19787    1 66780 1.497454e-05
## 19788    1 66780 1.497454e-05
## 19789    1 66780 1.497454e-05
## 19790    1 66780 1.497454e-05
## 19791    1 66780 1.497454e-05
## 19792    1 66780 1.497454e-05
## 19793    1 66780 1.497454e-05
## 19794    1 66780 1.497454e-05
## 19795    1 66780 1.497454e-05
## 19796    1 66780 1.497454e-05
## 19797    1 66780 1.497454e-05
## 19798    1 66780 1.497454e-05
## 19799    1 66780 1.497454e-05
## 19800    1 66780 1.497454e-05
## 19801    1 66780 1.497454e-05
## 19802    1 66780 1.497454e-05
## 19803    1 66780 1.497454e-05
## 19804    1 66780 1.497454e-05
## 19805    1 66780 1.497454e-05
## 19806    1 66780 1.497454e-05
## 19807    1 66780 1.497454e-05
## 19808    1 66780 1.497454e-05
## 19809    1 66780 1.497454e-05
## 19810    1 66780 1.497454e-05
## 19811    1 66780 1.497454e-05
## 19812    1 66780 1.497454e-05
## 19813    1 66780 1.497454e-05
## 19814    1 66780 1.497454e-05
## 19815    1 66780 1.497454e-05
## 19816    1 66780 1.497454e-05
## 19817    1 66780 1.497454e-05
## 19818    1 66780 1.497454e-05
## 19819    1 66780 1.497454e-05
## 19820    1 66780 1.497454e-05
## 19821    1 66780 1.497454e-05
## 19822    1 66780 1.497454e-05
## 19823    1 66780 1.497454e-05
## 19824    1 66780 1.497454e-05
## 19825    1 66780 1.497454e-05
## 19826    1 66780 1.497454e-05
## 19827    1 66780 1.497454e-05
## 19828    1 66780 1.497454e-05
## 19829    1 66780 1.497454e-05
## 19830    1 66780 1.497454e-05
## 19831    1 66780 1.497454e-05
## 19832    1 66780 1.497454e-05
## 19833    1 66780 1.497454e-05
## 19834    1 66780 1.497454e-05
## 19835    1 66780 1.497454e-05
## 19836    1 66780 1.497454e-05
## 19837    1 66780 1.497454e-05
## 19838    1 66780 1.497454e-05
## 19839    1 66780 1.497454e-05
## 19840    1 66780 1.497454e-05
## 19841    1 66780 1.497454e-05
## 19842    1 66780 1.497454e-05
## 19843    1 66780 1.497454e-05
## 19844    1 66780 1.497454e-05
## 19845    1 66780 1.497454e-05
## 19846    1 66780 1.497454e-05
## 19847    1 66780 1.497454e-05
## 19848    1 66780 1.497454e-05
## 19849    1 66780 1.497454e-05
## 19850    1 66780 1.497454e-05
## 19851    1 66780 1.497454e-05
## 19852    1 66780 1.497454e-05
## 19853    1 66780 1.497454e-05
## 19854    1 66780 1.497454e-05
## 19855    1 66780 1.497454e-05
## 19856    1 66780 1.497454e-05
## 19857    1 66780 1.497454e-05
## 19858    1 66780 1.497454e-05
## 19859    1 66780 1.497454e-05
## 19860    1 66780 1.497454e-05
## 19861    1 66780 1.497454e-05
## 19862    1 66780 1.497454e-05
## 19863    1 66780 1.497454e-05
## 19864    1 66780 1.497454e-05
## 19865    1 66780 1.497454e-05
## 19866    1 66780 1.497454e-05
## 19867    1 66780 1.497454e-05
## 19868    1 66780 1.497454e-05
## 19869    1 66780 1.497454e-05
## 19870    1 66780 1.497454e-05
## 19871    1 66780 1.497454e-05
## 19872    1 66780 1.497454e-05
## 19873    1 66780 1.497454e-05
## 19874    1 66780 1.497454e-05
## 19875    1 66780 1.497454e-05
## 19876    1 66780 1.497454e-05
## 19877    1 66780 1.497454e-05
## 19878    1 66780 1.497454e-05
## 19879    1 66780 1.497454e-05
## 19880    1 66780 1.497454e-05
## 19881    1 66780 1.497454e-05
## 19882    1 66780 1.497454e-05
## 19883    1 66780 1.497454e-05
## 19884    1 66780 1.497454e-05
## 19885    1 66780 1.497454e-05
## 19886    1 66780 1.497454e-05
## 19887    1 66780 1.497454e-05
## 19888    1 66780 1.497454e-05
## 19889    1 66780 1.497454e-05
## 19890    1 66780 1.497454e-05
## 19891    1 66780 1.497454e-05
## 19892    1 66780 1.497454e-05
## 19893    1 66780 1.497454e-05
## 19894    1 66780 1.497454e-05
## 19895    1 66780 1.497454e-05
## 19896    1 66780 1.497454e-05
## 19897    1 66780 1.497454e-05
## 19898    1 66780 1.497454e-05
## 19899    1 66780 1.497454e-05
## 19900    1 66780 1.497454e-05
## 19901    1 66780 1.497454e-05
## 19902    1 66780 1.497454e-05
## 19903    1 66780 1.497454e-05
## 19904    1 66780 1.497454e-05
## 19905    1 66780 1.497454e-05
## 19906    1 66780 1.497454e-05
## 19907    1 66780 1.497454e-05
## 19908    1 66780 1.497454e-05
## 19909    1 66780 1.497454e-05
## 19910    1 66780 1.497454e-05
## 19911    1 66780 1.497454e-05
## 19912    1 66780 1.497454e-05
## 19913    1 66780 1.497454e-05
## 19914    1 66780 1.497454e-05
## 19915    1 66780 1.497454e-05
## 19916    1 66780 1.497454e-05
## 19917    1 66780 1.497454e-05
## 19918    1 66780 1.497454e-05
## 19919    1 66780 1.497454e-05
## 19920    1 66780 1.497454e-05
## 19921    1 66780 1.497454e-05
## 19922    1 66780 1.497454e-05
## 19923    1 66780 1.497454e-05
## 19924    1 66780 1.497454e-05
## 19925    1 66780 1.497454e-05
## 19926    1 66780 1.497454e-05
## 19927    1 66780 1.497454e-05
## 19928    1 66780 1.497454e-05
## 19929    1 66780 1.497454e-05
## 19930    1 66780 1.497454e-05
## 19931    1 66780 1.497454e-05
## 19932    1 66780 1.497454e-05
## 19933    1 66780 1.497454e-05
## 19934    1 66780 1.497454e-05
## 19935    1 66780 1.497454e-05
## 19936    1 66780 1.497454e-05
## 19937    1 66780 1.497454e-05
## 19938    1 66780 1.497454e-05
## 19939    1 66780 1.497454e-05
## 19940    1 66780 1.497454e-05
## 19941    1 66780 1.497454e-05
## 19942    1 66780 1.497454e-05
## 19943    1 66780 1.497454e-05
## 19944    1 66780 1.497454e-05
## 19945    1 66780 1.497454e-05
## 19946    1 66780 1.497454e-05
## 19947    1 66780 1.497454e-05
## 19948    1 66780 1.497454e-05
## 19949    1 66780 1.497454e-05
## 19950    1 66780 1.497454e-05
## 19951    1 66780 1.497454e-05
## 19952    1 66780 1.497454e-05
## 19953    1 66780 1.497454e-05
## 19954    1 66780 1.497454e-05
## 19955    1 66780 1.497454e-05
## 19956    1 66780 1.497454e-05
## 19957    1 66780 1.497454e-05
## 19958    1 66780 1.497454e-05
## 19959    1 66780 1.497454e-05
## 19960    1 66780 1.497454e-05
## 19961    1 66780 1.497454e-05
## 19962    1 66780 1.497454e-05
## 19963    1 66780 1.497454e-05
## 19964    1 66780 1.497454e-05
## 19965    1 66780 1.497454e-05
## 19966    1 66780 1.497454e-05
## 19967    1 66780 1.497454e-05
## 19968    1 66780 1.497454e-05
## 19969    1 66780 1.497454e-05
## 19970    1 66780 1.497454e-05
## 19971    1 66780 1.497454e-05
## 19972    1 66780 1.497454e-05
## 19973    1 66780 1.497454e-05
## 19974    1 66780 1.497454e-05
## 19975    1 66780 1.497454e-05
## 19976    1 66780 1.497454e-05
## 19977    1 66780 1.497454e-05
## 19978    1 66780 1.497454e-05
## 19979    1 66780 1.497454e-05
## 19980    1 66780 1.497454e-05
## 19981    1 66780 1.497454e-05
## 19982    1 66780 1.497454e-05
## 19983    1 66780 1.497454e-05
## 19984    1 66780 1.497454e-05
## 19985    1 66780 1.497454e-05
## 19986    1 66780 1.497454e-05
## 19987    1 66780 1.497454e-05
## 19988    1 66780 1.497454e-05
## 19989    1 66780 1.497454e-05
## 19990    1 66780 1.497454e-05
## 19991    1 66780 1.497454e-05
## 19992    1 66780 1.497454e-05
## 19993    1 66780 1.497454e-05
## 19994    1 66780 1.497454e-05
## 19995    1 66780 1.497454e-05
## 19996    1 66780 1.497454e-05
## 19997    1 66780 1.497454e-05
## 19998    1 66780 1.497454e-05
## 19999    1 66780 1.497454e-05
##  [ reached 'max' / getOption("max.print") -- omitted 41509 rows ]

Let’s look at the word frequencies for the GB COVID data.

frequencyGB <- tidy_tweetsGB %>%
  count(year, word, sort = TRUE) %>%
  left_join(tidy_tweetsGB %>%
              count(year, name = "total")) %>%
  dplyr::mutate(freq = n/total) 
## Joining, by = "year"
frequencyGB
##        year
## 1     y2020
## 2     y2021
## 3     y2020
## 4     y2020
## 5     y2021
## 6     y2022
## 7     y2020
## 8     y2021
## 9     y2021
## 10    y2021
## 11    y2022
## 12    y2020
## 13    y2021
## 14    y2021
## 15    y2020
## 16    y2021
## 17    y2020
## 18    y2020
## 19    y2020
## 20    y2021
## 21    y2020
## 22    y2021
## 23    y2020
## 24    y2020
## 25    y2022
## 26    y2020
## 27    y2021
## 28    y2021
## 29    y2021
## 30    y2021
## 31    y2021
## 32    y2021
## 33    y2020
## 34    y2021
## 35    y2020
## 36    y2021
## 37    y2021
## 38    y2020
## 39    y2020
## 40    y2020
## 41    y2020
## 42    y2020
## 43    y2021
## 44    y2021
## 45    y2021
## 46    y2020
## 47    y2020
## 48    y2020
## 49    y2020
## 50    y2021
## 51    y2020
## 52    y2020
## 53    y2020
## 54    y2021
## 55    y2022
## 56    y2020
## 57    y2021
## 58    y2021
## 59    y2020
## 60    y2021
## 61    y2020
## 62    y2021
## 63    y2020
## 64    y2021
## 65    y2021
## 66    y2021
## 67    y2020
## 68    y2021
## 69    y2020
## 70    y2020
## 71    y2020
## 72    y2021
## 73    y2021
## 74    y2020
## 75    y2020
## 76    y2021
## 77    y2020
## 78    y2020
## 79    y2020
## 80    y2020
## 81    y2020
## 82    y2020
## 83    y2021
## 84    y2021
## 85    y2020
## 86    y2020
## 87    y2021
## 88    y2020
## 89    y2020
## 90    y2020
## 91    y2020
## 92    y2020
## 93    y2021
## 94    y2021
## 95    y2020
## 96    y2020
## 97    y2021
## 98    y2022
## 99    y2020
## 100   y2021
## 101   y2020
## 102   y2021
## 103   y2021
## 104   y2021
## 105   y2020
## 106   y2021
## 107   y2021
## 108   y2021
## 109   y2021
## 110   y2021
## 111   y2020
## 112   y2020
## 113   y2020
## 114   y2021
## 115   y2020
## 116   y2020
## 117   y2020
## 118   y2021
## 119   y2020
## 120   y2021
## 121   y2021
## 122   y2020
## 123   y2020
## 124   y2021
## 125   y2020
## 126   y2020
## 127   y2020
## 128   y2021
## 129   y2022
## 130   y2021
## 131   y2021
## 132   y2020
## 133   y2020
## 134   y2021
## 135   y2021
## 136   y2020
## 137   y2020
## 138   y2020
## 139   y2021
## 140   y2020
## 141   y2020
## 142   y2021
## 143   y2021
## 144   y2021
## 145   y2021
## 146   y2020
## 147   y2021
## 148   y2020
## 149   y2020
## 150   y2020
## 151   y2021
## 152   y2021
## 153   y2020
## 154   y2020
## 155   y2021
## 156   y2021
## 157   y2020
## 158   y2020
## 159   y2020
## 160   y2020
## 161   y2022
## 162   y2022
## 163   y2020
## 164   y2021
## 165   y2021
## 166   y2020
## 167   y2020
## 168   y2020
## 169   y2020
## 170   y2021
## 171   y2020
## 172   y2020
## 173   y2020
## 174   y2021
## 175   y2021
## 176   y2021
## 177   y2021
## 178   y2022
## 179   y2020
## 180   y2020
## 181   y2021
## 182   y2022
## 183   y2020
## 184   y2020
## 185   y2020
## 186   y2020
## 187   y2021
## 188   y2021
## 189   y2021
## 190   y2020
## 191   y2020
## 192   y2020
## 193   y2020
## 194   y2020
## 195   y2020
## 196   y2020
## 197   y2020
## 198   y2021
## 199   y2021
## 200   y2022
## 201   y2020
## 202   y2020
## 203   y2020
## 204   y2021
## 205   y2020
## 206   y2020
## 207   y2020
## 208   y2020
## 209   y2020
## 210   y2021
## 211   y2021
## 212   y2021
## 213   y2020
## 214   y2020
## 215   y2020
## 216   y2020
## 217   y2020
## 218   y2020
## 219   y2020
## 220   y2021
## 221   y2021
## 222   y2021
## 223   y2021
## 224   y2022
## 225   y2020
## 226   y2020
## 227   y2020
## 228   y2020
## 229   y2020
## 230   y2022
## 231   y2020
## 232   y2020
## 233   y2020
## 234   y2020
## 235   y2020
## 236   y2020
## 237   y2020
## 238   y2020
## 239   y2020
## 240   y2021
## 241   y2022
## 242   y2020
## 243   y2020
## 244   y2020
## 245   y2020
## 246   y2020
## 247   y2020
## 248   y2021
## 249   y2021
## 250   y2021
## 251   y2021
## 252   y2021
## 253   y2022
## 254   y2022
## 255   y2020
## 256   y2020
## 257   y2020
## 258   y2020
## 259   y2020
## 260   y2020
## 261   y2021
## 262   y2021
## 263   y2021
## 264   y2021
## 265   y2021
## 266   y2021
## 267   y2022
## 268   y2022
## 269   y2020
## 270   y2020
## 271   y2020
## 272   y2020
## 273   y2020
## 274   y2020
## 275   y2020
## 276   y2020
## 277   y2020
## 278   y2021
## 279   y2021
## 280   y2021
## 281   y2021
## 282   y2021
## 283   y2020
## 284   y2020
## 285   y2020
## 286   y2020
## 287   y2021
## 288   y2021
## 289   y2021
## 290   y2021
## 291   y2020
## 292   y2020
## 293   y2020
## 294   y2020
## 295   y2020
## 296   y2020
## 297   y2020
## 298   y2020
## 299   y2020
## 300   y2020
## 301   y2020
## 302   y2021
## 303   y2021
## 304   y2021
## 305   y2021
## 306   y2021
## 307   y2022
## 308   y2022
## 309   y2020
## 310   y2020
## 311   y2020
## 312   y2020
## 313   y2020
## 314   y2020
## 315   y2020
## 316   y2020
## 317   y2020
## 318   y2021
## 319   y2021
## 320   y2021
## 321   y2021
## 322   y2021
## 323   y2021
## 324   y2021
## 325   y2021
## 326   y2022
## 327   y2020
## 328   y2020
## 329   y2020
## 330   y2020
## 331   y2020
## 332   y2020
## 333   y2021
## 334   y2021
## 335   y2021
## 336   y2021
## 337   y2022
## 338   y2020
## 339   y2020
## 340   y2020
## 341   y2020
## 342   y2020
## 343   y2020
## 344   y2020
## 345   y2020
## 346   y2020
## 347   y2020
## 348   y2021
## 349   y2021
## 350   y2021
## 351   y2021
## 352   y2021
## 353   y2022
## 354   y2020
## 355   y2020
## 356   y2020
## 357   y2020
## 358   y2020
## 359   y2020
## 360   y2020
## 361   y2021
## 362   y2021
## 363   y2021
## 364   y2021
## 365   y2022
## 366   y2020
## 367   y2020
## 368   y2020
## 369   y2020
## 370   y2020
## 371   y2020
## 372   y2020
## 373   y2021
## 374   y2021
## 375   y2021
## 376   y2021
## 377   y2022
## 378   y2022
## 379   y2020
## 380   y2020
## 381   y2020
## 382   y2020
## 383   y2020
## 384   y2020
## 385   y2020
## 386   y2021
## 387   y2021
## 388   y2021
## 389   y2021
## 390   y2021
## 391   y2021
## 392   y2022
## 393   y2020
## 394   y2020
## 395   y2020
## 396   y2020
## 397   y2020
## 398   y2020
## 399   y2020
## 400   y2020
## 401   y2020
## 402   y2020
## 403   y2021
## 404   y2021
## 405   y2021
## 406   y2021
## 407   y2021
## 408   y2020
## 409   y2020
## 410   y2020
## 411   y2020
## 412   y2020
## 413   y2020
## 414   y2020
## 415   y2020
## 416   y2020
## 417   y2020
## 418   y2020
## 419   y2021
## 420   y2021
## 421   y2021
## 422   y2021
## 423   y2021
## 424   y2022
## 425   y2020
## 426   y2020
## 427   y2020
## 428   y2020
## 429   y2020
## 430   y2020
## 431   y2020
## 432   y2020
## 433   y2020
## 434   y2020
## 435   y2020
## 436   y2020
## 437   y2020
## 438   y2020
## 439   y2020
## 440   y2020
## 441   y2020
## 442   y2020
## 443   y2020
## 444   y2020
## 445   y2020
## 446   y2021
## 447   y2021
## 448   y2021
## 449   y2021
## 450   y2021
## 451   y2021
## 452   y2021
## 453   y2022
## 454   y2022
## 455   y2020
## 456   y2020
## 457   y2020
## 458   y2020
## 459   y2020
## 460   y2020
## 461   y2020
## 462   y2020
## 463   y2020
## 464   y2020
## 465   y2020
## 466   y2020
## 467   y2021
## 468   y2021
## 469   y2021
## 470   y2021
## 471   y2021
## 472   y2021
## 473   y2021
## 474   y2021
## 475   y2021
## 476   y2021
## 477   y2021
## 478   y2021
## 479   y2021
## 480   y2022
## 481   y2022
## 482   y2020
## 483   y2020
## 484   y2020
## 485   y2020
## 486   y2020
## 487   y2020
## 488   y2020
## 489   y2020
## 490   y2020
## 491   y2020
## 492   y2020
## 493   y2020
## 494   y2020
## 495   y2020
## 496   y2020
## 497   y2020
## 498   y2020
## 499   y2021
## 500   y2021
## 501   y2021
## 502   y2021
## 503   y2021
## 504   y2021
## 505   y2021
## 506   y2021
## 507   y2021
## 508   y2021
## 509   y2021
## 510   y2022
## 511   y2022
## 512   y2020
## 513   y2020
## 514   y2020
## 515   y2020
## 516   y2020
## 517   y2020
## 518   y2020
## 519   y2020
## 520   y2020
## 521   y2020
## 522   y2021
## 523   y2021
## 524   y2021
## 525   y2021
## 526   y2021
## 527   y2021
## 528   y2021
## 529   y2021
## 530   y2021
## 531   y2021
## 532   y2022
## 533   y2020
## 534   y2020
## 535   y2020
## 536   y2020
## 537   y2020
## 538   y2020
## 539   y2020
## 540   y2020
## 541   y2020
## 542   y2020
## 543   y2020
## 544   y2020
## 545   y2020
## 546   y2020
## 547   y2020
## 548   y2020
## 549   y2020
## 550   y2020
## 551   y2020
## 552   y2020
## 553   y2020
## 554   y2021
## 555   y2021
## 556   y2021
## 557   y2021
## 558   y2021
## 559   y2021
## 560   y2021
## 561   y2021
## 562   y2021
## 563   y2021
## 564   y2021
## 565   y2021
## 566   y2021
## 567   y2021
## 568   y2022
## 569   y2022
## 570   y2022
## 571   y2020
## 572   y2020
## 573   y2020
## 574   y2020
## 575   y2020
## 576   y2020
## 577   y2020
## 578   y2020
## 579   y2020
## 580   y2020
## 581   y2020
## 582   y2020
## 583   y2020
## 584   y2020
## 585   y2020
## 586   y2020
## 587   y2020
## 588   y2020
## 589   y2020
## 590   y2020
## 591   y2020
## 592   y2020
## 593   y2020
## 594   y2020
## 595   y2020
## 596   y2020
## 597   y2021
## 598   y2021
## 599   y2021
## 600   y2021
## 601   y2021
## 602   y2021
## 603   y2021
## 604   y2021
## 605   y2021
## 606   y2021
## 607   y2021
## 608   y2021
## 609   y2021
## 610   y2021
## 611   y2021
## 612   y2021
## 613   y2021
## 614   y2021
## 615   y2021
## 616   y2021
## 617   y2022
## 618   y2022
## 619   y2022
## 620   y2022
## 621   y2022
## 622   y2022
## 623   y2020
## 624   y2020
## 625   y2020
## 626   y2020
## 627   y2020
## 628   y2020
## 629   y2020
## 630   y2020
## 631   y2020
## 632   y2020
## 633   y2020
## 634   y2020
## 635   y2020
## 636   y2020
## 637   y2021
## 638   y2021
## 639   y2021
## 640   y2021
## 641   y2021
## 642   y2021
## 643   y2021
## 644   y2021
## 645   y2021
## 646   y2021
## 647   y2021
## 648   y2022
## 649   y2022
## 650   y2022
## 651   y2022
## 652   y2022
## 653   y2020
## 654   y2020
## 655   y2020
## 656   y2020
## 657   y2020
## 658   y2020
## 659   y2020
## 660   y2020
## 661   y2020
## 662   y2020
## 663   y2020
## 664   y2020
## 665   y2020
## 666   y2020
## 667   y2020
## 668   y2020
## 669   y2020
## 670   y2020
## 671   y2020
## 672   y2020
## 673   y2020
## 674   y2020
## 675   y2020
## 676   y2020
## 677   y2020
## 678   y2020
## 679   y2021
## 680   y2021
## 681   y2021
## 682   y2021
## 683   y2021
## 684   y2021
## 685   y2021
## 686   y2021
## 687   y2021
## 688   y2022
## 689   y2022
## 690   y2022
## 691   y2022
## 692   y2020
## 693   y2020
## 694   y2020
## 695   y2020
## 696   y2020
## 697   y2020
## 698   y2020
## 699   y2020
## 700   y2020
## 701   y2020
## 702   y2020
## 703   y2020
## 704   y2020
## 705   y2020
## 706   y2020
## 707   y2020
## 708   y2020
## 709   y2020
## 710   y2020
## 711   y2020
## 712   y2020
## 713   y2020
## 714   y2021
## 715   y2021
## 716   y2021
## 717   y2021
## 718   y2021
## 719   y2021
## 720   y2021
## 721   y2021
## 722   y2021
## 723   y2021
## 724   y2021
## 725   y2021
## 726   y2021
## 727   y2021
## 728   y2021
## 729   y2021
## 730   y2022
## 731   y2022
## 732   y2022
## 733   y2022
## 734   y2020
## 735   y2020
## 736   y2020
## 737   y2020
## 738   y2020
## 739   y2020
## 740   y2020
## 741   y2020
## 742   y2020
## 743   y2020
## 744   y2020
## 745   y2020
## 746   y2020
## 747   y2020
## 748   y2020
## 749   y2020
## 750   y2020
## 751   y2020
## 752   y2020
## 753   y2020
## 754   y2020
## 755   y2020
## 756   y2020
## 757   y2020
## 758   y2020
## 759   y2020
## 760   y2020
## 761   y2020
## 762   y2020
## 763   y2020
## 764   y2020
## 765   y2020
## 766   y2021
## 767   y2021
## 768   y2021
## 769   y2021
## 770   y2021
## 771   y2021
## 772   y2021
## 773   y2021
## 774   y2021
## 775   y2021
## 776   y2021
## 777   y2021
## 778   y2021
## 779   y2021
## 780   y2021
## 781   y2021
## 782   y2021
## 783   y2021
## 784   y2021
## 785   y2021
## 786   y2021
## 787   y2021
## 788   y2022
## 789   y2022
## 790   y2022
## 791   y2020
## 792   y2020
## 793   y2020
## 794   y2020
## 795   y2020
## 796   y2020
## 797   y2020
## 798   y2020
## 799   y2020
## 800   y2020
## 801   y2020
## 802   y2020
## 803   y2020
## 804   y2020
## 805   y2020
## 806   y2020
## 807   y2020
## 808   y2020
## 809   y2020
## 810   y2020
## 811   y2020
## 812   y2020
## 813   y2020
## 814   y2020
## 815   y2020
## 816   y2020
## 817   y2020
## 818   y2020
## 819   y2020
## 820   y2020
## 821   y2020
## 822   y2020
## 823   y2020
## 824   y2020
## 825   y2020
## 826   y2020
## 827   y2020
## 828   y2021
## 829   y2021
## 830   y2021
## 831   y2021
## 832   y2021
## 833   y2021
## 834   y2021
## 835   y2021
## 836   y2021
## 837   y2021
## 838   y2021
## 839   y2021
## 840   y2021
## 841   y2021
## 842   y2021
## 843   y2021
## 844   y2021
## 845   y2021
## 846   y2021
## 847   y2021
## 848   y2021
## 849   y2021
## 850   y2021
## 851   y2021
## 852   y2021
## 853   y2021
## 854   y2021
## 855   y2021
## 856   y2021
## 857   y2021
## 858   y2021
## 859   y2021
## 860   y2020
## 861   y2020
## 862   y2020
## 863   y2020
## 864   y2020
## 865   y2020
## 866   y2020
## 867   y2020
## 868   y2020
## 869   y2020
## 870   y2020
## 871   y2020
## 872   y2020
## 873   y2020
## 874   y2020
## 875   y2020
## 876   y2020
## 877   y2020
## 878   y2020
## 879   y2020
## 880   y2020
## 881   y2020
## 882   y2020
## 883   y2020
## 884   y2020
## 885   y2020
## 886   y2020
## 887   y2020
## 888   y2020
## 889   y2020
## 890   y2020
## 891   y2021
## 892   y2021
## 893   y2021
## 894   y2021
## 895   y2021
## 896   y2021
## 897   y2021
## 898   y2021
## 899   y2021
## 900   y2021
## 901   y2021
## 902   y2021
## 903   y2021
## 904   y2021
## 905   y2021
## 906   y2021
## 907   y2021
## 908   y2021
## 909   y2021
## 910   y2021
## 911   y2021
## 912   y2021
## 913   y2021
## 914   y2021
## 915   y2021
## 916   y2021
## 917   y2021
## 918   y2021
## 919   y2021
## 920   y2022
## 921   y2022
## 922   y2022
## 923   y2022
## 924   y2022
## 925   y2022
## 926   y2020
## 927   y2020
## 928   y2020
## 929   y2020
## 930   y2020
## 931   y2020
## 932   y2020
## 933   y2020
## 934   y2020
## 935   y2020
## 936   y2020
## 937   y2020
## 938   y2020
## 939   y2020
## 940   y2020
## 941   y2020
## 942   y2020
## 943   y2020
## 944   y2020
## 945   y2020
## 946   y2020
## 947   y2020
## 948   y2020
## 949   y2020
## 950   y2020
## 951   y2020
## 952   y2020
## 953   y2021
## 954   y2021
## 955   y2021
## 956   y2021
## 957   y2021
## 958   y2021
## 959   y2021
## 960   y2021
## 961   y2021
## 962   y2021
## 963   y2021
## 964   y2021
## 965   y2021
## 966   y2021
## 967   y2021
## 968   y2021
## 969   y2021
## 970   y2021
## 971   y2021
## 972   y2021
## 973   y2021
## 974   y2021
## 975   y2021
## 976   y2021
## 977   y2021
## 978   y2021
## 979   y2022
## 980   y2022
## 981   y2022
## 982   y2020
## 983   y2020
## 984   y2020
## 985   y2020
## 986   y2020
## 987   y2020
## 988   y2020
## 989   y2020
## 990   y2020
## 991   y2020
## 992   y2020
## 993   y2020
## 994   y2020
## 995   y2020
## 996   y2020
## 997   y2020
## 998   y2020
## 999   y2020
## 1000  y2020
## 1001  y2020
## 1002  y2020
## 1003  y2020
## 1004  y2020
## 1005  y2020
## 1006  y2020
## 1007  y2020
## 1008  y2021
## 1009  y2021
## 1010  y2021
## 1011  y2021
## 1012  y2021
## 1013  y2021
## 1014  y2021
## 1015  y2021
## 1016  y2021
## 1017  y2021
## 1018  y2021
## 1019  y2021
## 1020  y2021
## 1021  y2021
## 1022  y2021
## 1023  y2021
## 1024  y2021
## 1025  y2021
## 1026  y2021
## 1027  y2021
## 1028  y2021
## 1029  y2021
## 1030  y2021
## 1031  y2021
## 1032  y2021
## 1033  y2021
## 1034  y2021
## 1035  y2021
## 1036  y2021
## 1037  y2022
## 1038  y2022
## 1039  y2020
## 1040  y2020
## 1041  y2020
## 1042  y2020
## 1043  y2020
## 1044  y2020
## 1045  y2020
## 1046  y2020
## 1047  y2020
## 1048  y2020
## 1049  y2020
## 1050  y2020
## 1051  y2020
## 1052  y2020
## 1053  y2020
## 1054  y2020
## 1055  y2020
## 1056  y2020
## 1057  y2020
## 1058  y2020
## 1059  y2020
## 1060  y2020
## 1061  y2020
## 1062  y2020
## 1063  y2020
## 1064  y2020
## 1065  y2020
## 1066  y2020
## 1067  y2020
## 1068  y2020
## 1069  y2020
## 1070  y2020
## 1071  y2020
## 1072  y2020
## 1073  y2020
## 1074  y2020
## 1075  y2020
## 1076  y2020
## 1077  y2020
## 1078  y2020
## 1079  y2020
## 1080  y2020
## 1081  y2020
## 1082  y2020
## 1083  y2020
## 1084  y2020
## 1085  y2020
## 1086  y2020
## 1087  y2020
## 1088  y2021
## 1089  y2021
## 1090  y2021
## 1091  y2021
## 1092  y2021
## 1093  y2021
## 1094  y2021
## 1095  y2021
## 1096  y2021
## 1097  y2021
## 1098  y2021
## 1099  y2021
## 1100  y2021
## 1101  y2021
## 1102  y2021
## 1103  y2021
## 1104  y2021
## 1105  y2021
## 1106  y2021
## 1107  y2021
## 1108  y2021
## 1109  y2021
## 1110  y2021
## 1111  y2021
## 1112  y2021
## 1113  y2021
## 1114  y2021
## 1115  y2022
## 1116  y2022
## 1117  y2022
## 1118  y2022
## 1119  y2022
## 1120  y2022
## 1121  y2022
## 1122  y2022
## 1123  y2020
## 1124  y2020
## 1125  y2020
## 1126  y2020
## 1127  y2020
## 1128  y2020
## 1129  y2020
## 1130  y2020
## 1131  y2020
## 1132  y2020
## 1133  y2020
## 1134  y2020
## 1135  y2020
## 1136  y2020
## 1137  y2020
## 1138  y2020
## 1139  y2020
## 1140  y2020
## 1141  y2020
## 1142  y2020
## 1143  y2020
## 1144  y2020
## 1145  y2020
## 1146  y2020
## 1147  y2020
## 1148  y2020
## 1149  y2020
## 1150  y2020
## 1151  y2020
## 1152  y2020
## 1153  y2020
## 1154  y2020
## 1155  y2020
## 1156  y2020
## 1157  y2020
## 1158  y2020
## 1159  y2020
## 1160  y2020
## 1161  y2020
## 1162  y2020
## 1163  y2020
## 1164  y2020
## 1165  y2020
## 1166  y2020
## 1167  y2020
## 1168  y2020
## 1169  y2020
## 1170  y2020
## 1171  y2020
## 1172  y2021
## 1173  y2021
## 1174  y2021
## 1175  y2021
## 1176  y2021
## 1177  y2021
## 1178  y2021
## 1179  y2021
## 1180  y2021
## 1181  y2021
## 1182  y2021
## 1183  y2021
## 1184  y2021
## 1185  y2021
## 1186  y2021
## 1187  y2021
## 1188  y2021
## 1189  y2021
## 1190  y2021
## 1191  y2021
## 1192  y2021
## 1193  y2021
## 1194  y2021
## 1195  y2021
## 1196  y2021
## 1197  y2021
## 1198  y2021
## 1199  y2021
## 1200  y2021
## 1201  y2021
## 1202  y2021
## 1203  y2021
## 1204  y2021
## 1205  y2021
## 1206  y2021
## 1207  y2021
## 1208  y2021
## 1209  y2021
## 1210  y2021
## 1211  y2021
## 1212  y2022
## 1213  y2022
## 1214  y2022
## 1215  y2022
## 1216  y2022
## 1217  y2022
## 1218  y2022
## 1219  y2022
## 1220  y2022
## 1221  y2020
## 1222  y2020
## 1223  y2020
## 1224  y2020
## 1225  y2020
## 1226  y2020
## 1227  y2020
## 1228  y2020
## 1229  y2020
## 1230  y2020
## 1231  y2020
## 1232  y2020
## 1233  y2020
## 1234  y2020
## 1235  y2020
## 1236  y2020
## 1237  y2020
## 1238  y2020
## 1239  y2020
## 1240  y2020
## 1241  y2020
## 1242  y2020
## 1243  y2020
## 1244  y2020
## 1245  y2020
## 1246  y2020
## 1247  y2020
## 1248  y2020
## 1249  y2020
## 1250  y2020
## 1251  y2020
## 1252  y2020
## 1253  y2020
## 1254  y2020
## 1255  y2020
## 1256  y2020
## 1257  y2020
## 1258  y2020
## 1259  y2020
## 1260  y2020
## 1261  y2020
## 1262  y2020
## 1263  y2020
## 1264  y2020
## 1265  y2020
## 1266  y2020
## 1267  y2020
## 1268  y2020
## 1269  y2020
## 1270  y2020
## 1271  y2020
## 1272  y2020
## 1273  y2020
## 1274  y2020
## 1275  y2020
## 1276  y2020
## 1277  y2020
## 1278  y2020
## 1279  y2020
## 1280  y2020
## 1281  y2020
## 1282  y2020
## 1283  y2020
## 1284  y2020
## 1285  y2020
## 1286  y2020
## 1287  y2020
## 1288  y2020
## 1289  y2020
## 1290  y2020
## 1291  y2020
## 1292  y2021
## 1293  y2021
## 1294  y2021
## 1295  y2021
## 1296  y2021
## 1297  y2021
## 1298  y2021
## 1299  y2021
## 1300  y2021
## 1301  y2021
## 1302  y2021
## 1303  y2021
## 1304  y2021
## 1305  y2021
## 1306  y2021
## 1307  y2021
## 1308  y2021
## 1309  y2021
## 1310  y2021
## 1311  y2021
## 1312  y2021
## 1313  y2021
## 1314  y2021
## 1315  y2021
## 1316  y2021
## 1317  y2021
## 1318  y2021
## 1319  y2021
## 1320  y2021
## 1321  y2021
## 1322  y2021
## 1323  y2021
## 1324  y2021
## 1325  y2021
## 1326  y2021
## 1327  y2021
## 1328  y2021
## 1329  y2021
## 1330  y2021
## 1331  y2021
## 1332  y2021
## 1333  y2021
## 1334  y2021
## 1335  y2021
## 1336  y2021
## 1337  y2021
## 1338  y2021
## 1339  y2021
## 1340  y2021
## 1341  y2021
## 1342  y2021
## 1343  y2021
## 1344  y2021
## 1345  y2021
## 1346  y2022
## 1347  y2022
## 1348  y2022
## 1349  y2022
## 1350  y2022
## 1351  y2022
## 1352  y2022
## 1353  y2022
## 1354  y2022
## 1355  y2022
## 1356  y2020
## 1357  y2020
## 1358  y2020
## 1359  y2020
## 1360  y2020
## 1361  y2020
## 1362  y2020
## 1363  y2020
## 1364  y2020
## 1365  y2020
## 1366  y2020
## 1367  y2020
## 1368  y2020
## 1369  y2020
## 1370  y2020
## 1371  y2020
## 1372  y2020
## 1373  y2020
## 1374  y2020
## 1375  y2020
## 1376  y2020
## 1377  y2020
## 1378  y2020
## 1379  y2020
## 1380  y2020
## 1381  y2020
## 1382  y2020
## 1383  y2020
## 1384  y2020
## 1385  y2020
## 1386  y2020
## 1387  y2020
## 1388  y2020
## 1389  y2020
## 1390  y2020
## 1391  y2020
## 1392  y2020
## 1393  y2020
## 1394  y2020
## 1395  y2020
## 1396  y2020
## 1397  y2020
## 1398  y2020
## 1399  y2020
## 1400  y2020
## 1401  y2020
## 1402  y2020
## 1403  y2020
## 1404  y2020
## 1405  y2020
## 1406  y2020
## 1407  y2020
## 1408  y2020
## 1409  y2020
## 1410  y2020
## 1411  y2020
## 1412  y2020
## 1413  y2020
## 1414  y2020
## 1415  y2021
## 1416  y2021
## 1417  y2021
## 1418  y2021
## 1419  y2021
## 1420  y2021
## 1421  y2021
## 1422  y2021
## 1423  y2021
## 1424  y2021
## 1425  y2021
## 1426  y2021
## 1427  y2021
## 1428  y2021
## 1429  y2021
## 1430  y2021
## 1431  y2021
## 1432  y2021
## 1433  y2021
## 1434  y2021
## 1435  y2021
## 1436  y2021
## 1437  y2021
## 1438  y2021
## 1439  y2021
## 1440  y2021
## 1441  y2021
## 1442  y2021
## 1443  y2021
## 1444  y2021
## 1445  y2021
## 1446  y2021
## 1447  y2021
## 1448  y2021
## 1449  y2021
## 1450  y2021
## 1451  y2021
## 1452  y2021
## 1453  y2021
## 1454  y2021
## 1455  y2021
## 1456  y2021
## 1457  y2021
## 1458  y2021
## 1459  y2021
## 1460  y2021
## 1461  y2021
## 1462  y2021
## 1463  y2022
## 1464  y2022
## 1465  y2022
## 1466  y2022
## 1467  y2022
## 1468  y2022
## 1469  y2022
## 1470  y2022
## 1471  y2020
## 1472  y2020
## 1473  y2020
## 1474  y2020
## 1475  y2020
## 1476  y2020
## 1477  y2020
## 1478  y2020
## 1479  y2020
## 1480  y2020
## 1481  y2020
## 1482  y2020
## 1483  y2020
## 1484  y2020
## 1485  y2020
## 1486  y2020
## 1487  y2020
## 1488  y2020
## 1489  y2020
## 1490  y2020
## 1491  y2020
## 1492  y2020
## 1493  y2020
## 1494  y2020
## 1495  y2020
## 1496  y2020
## 1497  y2020
## 1498  y2020
## 1499  y2020
## 1500  y2020
## 1501  y2020
## 1502  y2020
## 1503  y2020
## 1504  y2020
## 1505  y2020
## 1506  y2020
## 1507  y2020
## 1508  y2020
## 1509  y2020
## 1510  y2020
## 1511  y2020
## 1512  y2020
## 1513  y2020
## 1514  y2020
## 1515  y2020
## 1516  y2020
## 1517  y2020
## 1518  y2020
## 1519  y2020
## 1520  y2020
## 1521  y2020
## 1522  y2020
## 1523  y2020
## 1524  y2020
## 1525  y2020
## 1526  y2020
## 1527  y2020
## 1528  y2020
## 1529  y2020
## 1530  y2020
## 1531  y2020
## 1532  y2020
## 1533  y2020
## 1534  y2020
## 1535  y2020
## 1536  y2020
## 1537  y2020
## 1538  y2020
## 1539  y2020
## 1540  y2020
## 1541  y2020
## 1542  y2020
## 1543  y2020
## 1544  y2020
## 1545  y2020
## 1546  y2021
## 1547  y2021
## 1548  y2021
## 1549  y2021
## 1550  y2021
## 1551  y2021
## 1552  y2021
## 1553  y2021
## 1554  y2021
## 1555  y2021
## 1556  y2021
## 1557  y2021
## 1558  y2021
## 1559  y2021
## 1560  y2021
## 1561  y2021
## 1562  y2021
## 1563  y2021
## 1564  y2021
## 1565  y2021
## 1566  y2021
## 1567  y2021
## 1568  y2021
## 1569  y2021
## 1570  y2021
## 1571  y2021
## 1572  y2021
## 1573  y2021
## 1574  y2021
## 1575  y2021
## 1576  y2021
## 1577  y2021
## 1578  y2021
## 1579  y2021
## 1580  y2021
## 1581  y2021
## 1582  y2021
## 1583  y2021
## 1584  y2021
## 1585  y2021
## 1586  y2021
## 1587  y2021
## 1588  y2021
## 1589  y2021
## 1590  y2021
## 1591  y2021
## 1592  y2021
## 1593  y2021
## 1594  y2021
## 1595  y2022
## 1596  y2022
## 1597  y2022
## 1598  y2022
## 1599  y2022
## 1600  y2022
## 1601  y2022
## 1602  y2022
## 1603  y2022
## 1604  y2022
## 1605  y2022
## 1606  y2022
## 1607  y2022
## 1608  y2022
## 1609  y2022
## 1610  y2022
## 1611  y2022
## 1612  y2022
## 1613  y2022
## 1614  y2020
## 1615  y2020
## 1616  y2020
## 1617  y2020
## 1618  y2020
## 1619  y2020
## 1620  y2020
## 1621  y2020
## 1622  y2020
## 1623  y2020
## 1624  y2020
## 1625  y2020
## 1626  y2020
## 1627  y2020
## 1628  y2020
## 1629  y2020
## 1630  y2020
## 1631  y2020
## 1632  y2020
## 1633  y2020
## 1634  y2020
## 1635  y2020
## 1636  y2020
## 1637  y2020
## 1638  y2020
## 1639  y2020
## 1640  y2020
## 1641  y2020
## 1642  y2020
## 1643  y2020
## 1644  y2020
## 1645  y2020
## 1646  y2020
## 1647  y2020
## 1648  y2020
## 1649  y2020
## 1650  y2020
## 1651  y2020
## 1652  y2020
## 1653  y2020
## 1654  y2020
## 1655  y2020
## 1656  y2020
## 1657  y2020
## 1658  y2020
## 1659  y2020
## 1660  y2020
## 1661  y2020
## 1662  y2020
## 1663  y2020
## 1664  y2020
## 1665  y2020
## 1666  y2020
## 1667  y2020
## 1668  y2020
## 1669  y2020
## 1670  y2020
## 1671  y2020
## 1672  y2020
## 1673  y2020
## 1674  y2020
## 1675  y2020
## 1676  y2020
## 1677  y2020
## 1678  y2020
## 1679  y2020
## 1680  y2020
## 1681  y2020
## 1682  y2020
## 1683  y2020
## 1684  y2020
## 1685  y2020
## 1686  y2020
## 1687  y2020
## 1688  y2020
## 1689  y2020
## 1690  y2020
## 1691  y2020
## 1692  y2020
## 1693  y2020
## 1694  y2020
## 1695  y2020
## 1696  y2020
## 1697  y2020
## 1698  y2020
## 1699  y2020
## 1700  y2020
## 1701  y2020
## 1702  y2020
## 1703  y2020
## 1704  y2021
## 1705  y2021
## 1706  y2021
## 1707  y2021
## 1708  y2021
## 1709  y2021
## 1710  y2021
## 1711  y2021
## 1712  y2021
## 1713  y2021
## 1714  y2021
## 1715  y2021
## 1716  y2021
## 1717  y2021
## 1718  y2021
## 1719  y2021
## 1720  y2021
## 1721  y2021
## 1722  y2021
## 1723  y2021
## 1724  y2021
## 1725  y2021
## 1726  y2021
## 1727  y2021
## 1728  y2021
## 1729  y2021
## 1730  y2021
## 1731  y2021
## 1732  y2021
## 1733  y2021
## 1734  y2021
## 1735  y2021
## 1736  y2021
## 1737  y2021
## 1738  y2021
## 1739  y2021
## 1740  y2021
## 1741  y2021
## 1742  y2021
## 1743  y2021
## 1744  y2021
## 1745  y2021
## 1746  y2021
## 1747  y2021
## 1748  y2021
## 1749  y2021
## 1750  y2021
## 1751  y2021
## 1752  y2021
## 1753  y2021
## 1754  y2021
## 1755  y2021
## 1756  y2021
## 1757  y2021
## 1758  y2021
## 1759  y2021
## 1760  y2021
## 1761  y2021
## 1762  y2021
## 1763  y2021
## 1764  y2021
## 1765  y2021
## 1766  y2022
## 1767  y2022
## 1768  y2022
## 1769  y2022
## 1770  y2022
## 1771  y2022
## 1772  y2022
## 1773  y2022
## 1774  y2022
## 1775  y2022
## 1776  y2022
## 1777  y2020
## 1778  y2020
## 1779  y2020
## 1780  y2020
## 1781  y2020
## 1782  y2020
## 1783  y2020
## 1784  y2020
## 1785  y2020
## 1786  y2020
## 1787  y2020
## 1788  y2020
## 1789  y2020
## 1790  y2020
## 1791  y2020
## 1792  y2020
## 1793  y2020
## 1794  y2020
## 1795  y2020
## 1796  y2020
## 1797  y2020
## 1798  y2020
## 1799  y2020
## 1800  y2020
## 1801  y2020
## 1802  y2020
## 1803  y2020
## 1804  y2020
## 1805  y2020
## 1806  y2020
## 1807  y2020
## 1808  y2020
## 1809  y2020
## 1810  y2020
## 1811  y2020
## 1812  y2020
## 1813  y2020
## 1814  y2020
## 1815  y2020
## 1816  y2020
## 1817  y2020
## 1818  y2020
## 1819  y2020
## 1820  y2020
## 1821  y2020
## 1822  y2020
## 1823  y2020
## 1824  y2020
## 1825  y2020
## 1826  y2020
## 1827  y2020
## 1828  y2020
## 1829  y2020
## 1830  y2020
## 1831  y2020
## 1832  y2020
## 1833  y2020
## 1834  y2020
## 1835  y2020
## 1836  y2020
## 1837  y2020
## 1838  y2020
## 1839  y2020
## 1840  y2020
## 1841  y2020
## 1842  y2020
## 1843  y2020
## 1844  y2020
## 1845  y2020
## 1846  y2020
## 1847  y2020
## 1848  y2020
## 1849  y2020
## 1850  y2020
## 1851  y2020
## 1852  y2020
## 1853  y2020
## 1854  y2020
## 1855  y2020
## 1856  y2020
## 1857  y2020
## 1858  y2020
## 1859  y2020
## 1860  y2020
## 1861  y2020
## 1862  y2020
## 1863  y2020
## 1864  y2021
## 1865  y2021
## 1866  y2021
## 1867  y2021
## 1868  y2021
## 1869  y2021
## 1870  y2021
## 1871  y2021
## 1872  y2021
## 1873  y2021
## 1874  y2021
## 1875  y2021
## 1876  y2021
## 1877  y2021
## 1878  y2021
## 1879  y2021
## 1880  y2021
## 1881  y2021
## 1882  y2021
## 1883  y2021
## 1884  y2021
## 1885  y2021
## 1886  y2021
## 1887  y2021
## 1888  y2021
## 1889  y2021
## 1890  y2021
## 1891  y2021
## 1892  y2021
## 1893  y2021
## 1894  y2021
## 1895  y2021
## 1896  y2021
## 1897  y2021
## 1898  y2021
## 1899  y2021
## 1900  y2021
## 1901  y2021
## 1902  y2021
## 1903  y2021
## 1904  y2021
## 1905  y2021
## 1906  y2021
## 1907  y2021
## 1908  y2021
## 1909  y2021
## 1910  y2021
## 1911  y2021
## 1912  y2021
## 1913  y2021
## 1914  y2021
## 1915  y2021
## 1916  y2021
## 1917  y2021
## 1918  y2021
## 1919  y2021
## 1920  y2021
## 1921  y2021
## 1922  y2021
## 1923  y2021
## 1924  y2021
## 1925  y2021
## 1926  y2021
## 1927  y2022
## 1928  y2022
## 1929  y2022
## 1930  y2022
## 1931  y2022
## 1932  y2022
## 1933  y2022
## 1934  y2022
## 1935  y2022
## 1936  y2022
## 1937  y2022
## 1938  y2022
## 1939  y2022
## 1940  y2022
## 1941  y2022
## 1942  y2022
## 1943  y2022
## 1944  y2022
## 1945  y2022
## 1946  y2022
## 1947  y2020
## 1948  y2020
## 1949  y2020
## 1950  y2020
## 1951  y2020
## 1952  y2020
## 1953  y2020
## 1954  y2020
## 1955  y2020
## 1956  y2020
## 1957  y2020
## 1958  y2020
## 1959  y2020
## 1960  y2020
## 1961  y2020
## 1962  y2020
## 1963  y2020
## 1964  y2020
## 1965  y2020
## 1966  y2020
## 1967  y2020
## 1968  y2020
## 1969  y2020
## 1970  y2020
## 1971  y2020
## 1972  y2020
## 1973  y2020
## 1974  y2020
## 1975  y2020
## 1976  y2020
## 1977  y2020
## 1978  y2020
## 1979  y2020
## 1980  y2020
## 1981  y2020
## 1982  y2020
## 1983  y2020
## 1984  y2020
## 1985  y2020
## 1986  y2020
## 1987  y2020
## 1988  y2020
## 1989  y2020
## 1990  y2020
## 1991  y2020
## 1992  y2020
## 1993  y2020
## 1994  y2020
## 1995  y2020
## 1996  y2020
## 1997  y2020
## 1998  y2020
## 1999  y2020
## 2000  y2020
## 2001  y2020
## 2002  y2020
## 2003  y2020
## 2004  y2020
## 2005  y2020
## 2006  y2020
## 2007  y2020
## 2008  y2020
## 2009  y2020
## 2010  y2020
## 2011  y2020
## 2012  y2020
## 2013  y2020
## 2014  y2020
## 2015  y2020
## 2016  y2020
## 2017  y2020
## 2018  y2020
## 2019  y2020
## 2020  y2020
## 2021  y2020
## 2022  y2020
## 2023  y2020
## 2024  y2020
## 2025  y2020
## 2026  y2020
## 2027  y2020
## 2028  y2020
## 2029  y2020
## 2030  y2020
## 2031  y2020
## 2032  y2020
## 2033  y2020
## 2034  y2020
## 2035  y2020
## 2036  y2020
## 2037  y2020
## 2038  y2020
## 2039  y2020
## 2040  y2020
## 2041  y2020
## 2042  y2020
## 2043  y2020
## 2044  y2020
## 2045  y2020
## 2046  y2020
## 2047  y2020
## 2048  y2020
## 2049  y2020
## 2050  y2020
## 2051  y2020
## 2052  y2020
## 2053  y2020
## 2054  y2020
## 2055  y2020
## 2056  y2020
## 2057  y2020
## 2058  y2020
## 2059  y2020
## 2060  y2020
## 2061  y2020
## 2062  y2020
## 2063  y2020
## 2064  y2020
## 2065  y2020
## 2066  y2020
## 2067  y2020
## 2068  y2020
## 2069  y2020
## 2070  y2020
## 2071  y2020
## 2072  y2020
## 2073  y2020
## 2074  y2020
## 2075  y2020
## 2076  y2020
## 2077  y2020
## 2078  y2021
## 2079  y2021
## 2080  y2021
## 2081  y2021
## 2082  y2021
## 2083  y2021
## 2084  y2021
## 2085  y2021
## 2086  y2021
## 2087  y2021
## 2088  y2021
## 2089  y2021
## 2090  y2021
## 2091  y2021
## 2092  y2021
## 2093  y2021
## 2094  y2021
## 2095  y2021
## 2096  y2021
## 2097  y2021
## 2098  y2021
## 2099  y2021
## 2100  y2021
## 2101  y2021
## 2102  y2021
## 2103  y2021
## 2104  y2021
## 2105  y2021
## 2106  y2021
## 2107  y2021
## 2108  y2021
## 2109  y2021
## 2110  y2021
## 2111  y2021
## 2112  y2021
## 2113  y2021
## 2114  y2021
## 2115  y2021
## 2116  y2021
## 2117  y2021
## 2118  y2021
## 2119  y2021
## 2120  y2021
## 2121  y2021
## 2122  y2021
## 2123  y2021
## 2124  y2021
## 2125  y2021
## 2126  y2021
## 2127  y2021
## 2128  y2021
## 2129  y2021
## 2130  y2021
## 2131  y2021
## 2132  y2021
## 2133  y2021
## 2134  y2021
## 2135  y2021
## 2136  y2021
## 2137  y2021
## 2138  y2021
## 2139  y2021
## 2140  y2021
## 2141  y2021
## 2142  y2021
## 2143  y2021
## 2144  y2021
## 2145  y2021
## 2146  y2021
## 2147  y2021
## 2148  y2021
## 2149  y2021
## 2150  y2021
## 2151  y2021
## 2152  y2021
## 2153  y2021
## 2154  y2021
## 2155  y2021
## 2156  y2021
## 2157  y2021
## 2158  y2021
## 2159  y2021
## 2160  y2021
## 2161  y2021
## 2162  y2021
## 2163  y2021
## 2164  y2021
## 2165  y2021
## 2166  y2021
## 2167  y2021
## 2168  y2021
## 2169  y2021
## 2170  y2021
## 2171  y2022
## 2172  y2022
## 2173  y2022
## 2174  y2022
## 2175  y2022
## 2176  y2022
## 2177  y2022
## 2178  y2022
## 2179  y2022
## 2180  y2022
## 2181  y2022
## 2182  y2022
## 2183  y2022
## 2184  y2022
## 2185  y2022
## 2186  y2022
## 2187  y2022
## 2188  y2022
## 2189  y2022
## 2190  y2022
## 2191  y2022
## 2192  y2022
## 2193  y2022
## 2194  y2022
## 2195  y2022
## 2196  y2022
## 2197  y2020
## 2198  y2020
## 2199  y2020
## 2200  y2020
## 2201  y2020
## 2202  y2020
## 2203  y2020
## 2204  y2020
## 2205  y2020
## 2206  y2020
## 2207  y2020
## 2208  y2020
## 2209  y2020
## 2210  y2020
## 2211  y2020
## 2212  y2020
## 2213  y2020
## 2214  y2020
## 2215  y2020
## 2216  y2020
## 2217  y2020
## 2218  y2020
## 2219  y2020
## 2220  y2020
## 2221  y2020
## 2222  y2020
## 2223  y2020
## 2224  y2020
## 2225  y2020
## 2226  y2020
## 2227  y2020
## 2228  y2020
## 2229  y2020
## 2230  y2020
## 2231  y2020
## 2232  y2020
## 2233  y2020
## 2234  y2020
## 2235  y2020
## 2236  y2020
## 2237  y2020
## 2238  y2020
## 2239  y2020
## 2240  y2020
## 2241  y2020
## 2242  y2020
## 2243  y2020
## 2244  y2020
## 2245  y2020
## 2246  y2020
## 2247  y2020
## 2248  y2020
## 2249  y2020
## 2250  y2020
## 2251  y2020
## 2252  y2020
## 2253  y2020
## 2254  y2020
## 2255  y2020
## 2256  y2020
## 2257  y2020
## 2258  y2020
## 2259  y2020
## 2260  y2020
## 2261  y2020
## 2262  y2020
## 2263  y2020
## 2264  y2020
## 2265  y2020
## 2266  y2020
## 2267  y2020
## 2268  y2020
## 2269  y2020
## 2270  y2020
## 2271  y2020
## 2272  y2020
## 2273  y2020
## 2274  y2020
## 2275  y2020
## 2276  y2020
## 2277  y2020
## 2278  y2020
## 2279  y2020
## 2280  y2020
## 2281  y2020
## 2282  y2020
## 2283  y2020
## 2284  y2020
## 2285  y2020
## 2286  y2020
## 2287  y2020
## 2288  y2020
## 2289  y2020
## 2290  y2020
## 2291  y2020
## 2292  y2020
## 2293  y2020
## 2294  y2020
## 2295  y2020
## 2296  y2020
## 2297  y2020
## 2298  y2020
## 2299  y2020
## 2300  y2020
## 2301  y2020
## 2302  y2020
## 2303  y2020
## 2304  y2020
## 2305  y2020
## 2306  y2020
## 2307  y2020
## 2308  y2020
## 2309  y2020
## 2310  y2020
## 2311  y2020
## 2312  y2020
## 2313  y2020
## 2314  y2020
## 2315  y2020
## 2316  y2020
## 2317  y2020
## 2318  y2020
## 2319  y2020
## 2320  y2020
## 2321  y2020
## 2322  y2020
## 2323  y2020
## 2324  y2020
## 2325  y2020
## 2326  y2020
## 2327  y2021
## 2328  y2021
## 2329  y2021
## 2330  y2021
## 2331  y2021
## 2332  y2021
## 2333  y2021
## 2334  y2021
## 2335  y2021
## 2336  y2021
## 2337  y2021
## 2338  y2021
## 2339  y2021
## 2340  y2021
## 2341  y2021
## 2342  y2021
## 2343  y2021
## 2344  y2021
## 2345  y2021
## 2346  y2021
## 2347  y2021
## 2348  y2021
## 2349  y2021
## 2350  y2021
## 2351  y2021
## 2352  y2021
## 2353  y2021
## 2354  y2021
## 2355  y2021
## 2356  y2021
## 2357  y2021
## 2358  y2021
## 2359  y2021
## 2360  y2021
## 2361  y2021
## 2362  y2021
## 2363  y2021
## 2364  y2021
## 2365  y2021
## 2366  y2021
## 2367  y2021
## 2368  y2021
## 2369  y2021
## 2370  y2021
## 2371  y2021
## 2372  y2021
## 2373  y2021
## 2374  y2021
## 2375  y2021
## 2376  y2021
## 2377  y2021
## 2378  y2021
## 2379  y2021
## 2380  y2021
## 2381  y2021
## 2382  y2021
## 2383  y2021
## 2384  y2021
## 2385  y2021
## 2386  y2021
## 2387  y2021
## 2388  y2021
## 2389  y2021
## 2390  y2021
## 2391  y2021
## 2392  y2021
## 2393  y2021
## 2394  y2021
## 2395  y2021
## 2396  y2021
## 2397  y2021
## 2398  y2021
## 2399  y2021
## 2400  y2021
## 2401  y2021
## 2402  y2021
## 2403  y2021
## 2404  y2021
## 2405  y2021
## 2406  y2021
## 2407  y2021
## 2408  y2021
## 2409  y2021
## 2410  y2021
## 2411  y2021
## 2412  y2021
## 2413  y2021
## 2414  y2021
## 2415  y2021
## 2416  y2021
## 2417  y2021
## 2418  y2021
## 2419  y2021
## 2420  y2021
## 2421  y2021
## 2422  y2021
## 2423  y2021
## 2424  y2021
## 2425  y2021
## 2426  y2022
## 2427  y2022
## 2428  y2022
## 2429  y2022
## 2430  y2022
## 2431  y2022
## 2432  y2022
## 2433  y2022
## 2434  y2022
## 2435  y2022
## 2436  y2022
## 2437  y2022
## 2438  y2022
## 2439  y2022
## 2440  y2022
## 2441  y2022
## 2442  y2022
## 2443  y2022
## 2444  y2022
## 2445  y2022
## 2446  y2022
## 2447  y2022
## 2448  y2022
## 2449  y2022
## 2450  y2022
## 2451  y2022
## 2452  y2022
## 2453  y2022
## 2454  y2022
## 2455  y2022
## 2456  y2022
## 2457  y2022
## 2458  y2022
## 2459  y2022
## 2460  y2022
## 2461  y2022
## 2462  y2022
## 2463  y2022
## 2464  y2022
## 2465  y2022
## 2466  y2022
## 2467  y2022
## 2468  y2020
## 2469  y2020
## 2470  y2020
## 2471  y2020
## 2472  y2020
## 2473  y2020
## 2474  y2020
## 2475  y2020
## 2476  y2020
## 2477  y2020
## 2478  y2020
## 2479  y2020
## 2480  y2020
## 2481  y2020
## 2482  y2020
## 2483  y2020
## 2484  y2020
## 2485  y2020
## 2486  y2020
## 2487  y2020
## 2488  y2020
## 2489  y2020
## 2490  y2020
## 2491  y2020
## 2492  y2020
## 2493  y2020
## 2494  y2020
## 2495  y2020
## 2496  y2020
## 2497  y2020
## 2498  y2020
## 2499  y2020
## 2500  y2020
## 2501  y2020
## 2502  y2020
## 2503  y2020
## 2504  y2020
## 2505  y2020
## 2506  y2020
## 2507  y2020
## 2508  y2020
## 2509  y2020
## 2510  y2020
## 2511  y2020
## 2512  y2020
## 2513  y2020
## 2514  y2020
## 2515  y2020
## 2516  y2020
## 2517  y2020
## 2518  y2020
## 2519  y2020
## 2520  y2020
## 2521  y2020
## 2522  y2020
## 2523  y2020
## 2524  y2020
## 2525  y2020
## 2526  y2020
## 2527  y2020
## 2528  y2020
## 2529  y2020
## 2530  y2020
## 2531  y2020
## 2532  y2020
## 2533  y2020
## 2534  y2020
## 2535  y2020
## 2536  y2020
## 2537  y2020
## 2538  y2020
## 2539  y2020
## 2540  y2020
## 2541  y2020
## 2542  y2020
## 2543  y2020
## 2544  y2020
## 2545  y2020
## 2546  y2020
## 2547  y2020
## 2548  y2020
## 2549  y2020
## 2550  y2020
## 2551  y2020
## 2552  y2020
## 2553  y2020
## 2554  y2020
## 2555  y2020
## 2556  y2020
## 2557  y2020
## 2558  y2020
## 2559  y2020
## 2560  y2020
## 2561  y2020
## 2562  y2020
## 2563  y2020
## 2564  y2020
## 2565  y2020
## 2566  y2020
## 2567  y2020
## 2568  y2020
## 2569  y2020
## 2570  y2020
## 2571  y2020
## 2572  y2020
## 2573  y2020
## 2574  y2020
## 2575  y2020
## 2576  y2020
## 2577  y2020
## 2578  y2020
## 2579  y2020
## 2580  y2020
## 2581  y2020
## 2582  y2020
## 2583  y2020
## 2584  y2020
## 2585  y2020
## 2586  y2020
## 2587  y2020
## 2588  y2020
## 2589  y2020
## 2590  y2020
## 2591  y2020
## 2592  y2020
## 2593  y2020
## 2594  y2020
## 2595  y2020
## 2596  y2020
## 2597  y2020
## 2598  y2020
## 2599  y2020
## 2600  y2020
## 2601  y2020
## 2602  y2020
## 2603  y2020
## 2604  y2020
## 2605  y2020
## 2606  y2020
## 2607  y2020
## 2608  y2020
## 2609  y2020
## 2610  y2020
## 2611  y2020
## 2612  y2020
## 2613  y2020
## 2614  y2020
## 2615  y2020
## 2616  y2020
## 2617  y2020
## 2618  y2020
## 2619  y2020
## 2620  y2020
## 2621  y2020
## 2622  y2020
## 2623  y2020
## 2624  y2020
## 2625  y2020
## 2626  y2020
## 2627  y2020
## 2628  y2020
## 2629  y2020
## 2630  y2020
## 2631  y2020
## 2632  y2020
## 2633  y2020
## 2634  y2020
## 2635  y2020
## 2636  y2020
## 2637  y2020
## 2638  y2020
## 2639  y2020
## 2640  y2020
## 2641  y2020
## 2642  y2020
## 2643  y2020
## 2644  y2020
## 2645  y2020
## 2646  y2020
## 2647  y2020
## 2648  y2020
## 2649  y2020
## 2650  y2020
## 2651  y2020
## 2652  y2020
## 2653  y2020
## 2654  y2020
## 2655  y2020
## 2656  y2020
## 2657  y2020
## 2658  y2021
## 2659  y2021
## 2660  y2021
## 2661  y2021
## 2662  y2021
## 2663  y2021
## 2664  y2021
## 2665  y2021
## 2666  y2021
## 2667  y2021
## 2668  y2021
## 2669  y2021
## 2670  y2021
## 2671  y2021
## 2672  y2021
## 2673  y2021
## 2674  y2021
## 2675  y2021
## 2676  y2021
## 2677  y2021
## 2678  y2021
## 2679  y2021
## 2680  y2021
## 2681  y2021
## 2682  y2021
## 2683  y2021
## 2684  y2021
## 2685  y2021
## 2686  y2021
## 2687  y2021
## 2688  y2021
## 2689  y2021
## 2690  y2021
## 2691  y2021
## 2692  y2021
## 2693  y2021
## 2694  y2021
## 2695  y2021
## 2696  y2021
## 2697  y2021
## 2698  y2021
## 2699  y2021
## 2700  y2021
## 2701  y2021
## 2702  y2021
## 2703  y2021
## 2704  y2021
## 2705  y2021
## 2706  y2021
## 2707  y2021
## 2708  y2021
## 2709  y2021
## 2710  y2021
## 2711  y2021
## 2712  y2021
## 2713  y2021
## 2714  y2021
## 2715  y2021
## 2716  y2021
## 2717  y2021
## 2718  y2021
## 2719  y2021
## 2720  y2021
## 2721  y2021
## 2722  y2021
## 2723  y2021
## 2724  y2021
## 2725  y2021
## 2726  y2021
## 2727  y2021
## 2728  y2021
## 2729  y2021
## 2730  y2021
## 2731  y2021
## 2732  y2021
## 2733  y2021
## 2734  y2021
## 2735  y2021
## 2736  y2021
## 2737  y2021
## 2738  y2021
## 2739  y2021
## 2740  y2021
## 2741  y2021
## 2742  y2021
## 2743  y2021
## 2744  y2021
## 2745  y2021
## 2746  y2021
## 2747  y2021
## 2748  y2021
## 2749  y2021
## 2750  y2021
## 2751  y2021
## 2752  y2021
## 2753  y2021
## 2754  y2021
## 2755  y2021
## 2756  y2021
## 2757  y2021
## 2758  y2021
## 2759  y2021
## 2760  y2021
## 2761  y2021
## 2762  y2021
## 2763  y2021
## 2764  y2021
## 2765  y2021
## 2766  y2021
## 2767  y2021
## 2768  y2021
## 2769  y2021
## 2770  y2021
## 2771  y2021
## 2772  y2021
## 2773  y2021
## 2774  y2021
## 2775  y2021
## 2776  y2021
## 2777  y2022
## 2778  y2022
## 2779  y2022
## 2780  y2022
## 2781  y2022
## 2782  y2022
## 2783  y2022
## 2784  y2022
## 2785  y2022
## 2786  y2022
## 2787  y2022
## 2788  y2022
## 2789  y2022
## 2790  y2022
## 2791  y2022
## 2792  y2022
## 2793  y2022
## 2794  y2022
## 2795  y2022
## 2796  y2022
## 2797  y2022
## 2798  y2022
## 2799  y2022
## 2800  y2022
## 2801  y2022
## 2802  y2022
## 2803  y2022
## 2804  y2022
## 2805  y2022
## 2806  y2022
## 2807  y2022
## 2808  y2022
## 2809  y2022
## 2810  y2022
## 2811  y2022
## 2812  y2022
## 2813  y2022
## 2814  y2022
## 2815  y2022
## 2816  y2022
## 2817  y2022
## 2818  y2022
## 2819  y2022
## 2820  y2022
## 2821  y2022
## 2822  y2022
## 2823  y2022
## 2824  y2020
## 2825  y2020
## 2826  y2020
## 2827  y2020
## 2828  y2020
## 2829  y2020
## 2830  y2020
## 2831  y2020
## 2832  y2020
## 2833  y2020
## 2834  y2020
## 2835  y2020
## 2836  y2020
## 2837  y2020
## 2838  y2020
## 2839  y2020
## 2840  y2020
## 2841  y2020
## 2842  y2020
## 2843  y2020
## 2844  y2020
## 2845  y2020
## 2846  y2020
## 2847  y2020
## 2848  y2020
## 2849  y2020
## 2850  y2020
## 2851  y2020
## 2852  y2020
## 2853  y2020
## 2854  y2020
## 2855  y2020
## 2856  y2020
## 2857  y2020
## 2858  y2020
## 2859  y2020
## 2860  y2020
## 2861  y2020
## 2862  y2020
## 2863  y2020
## 2864  y2020
## 2865  y2020
## 2866  y2020
## 2867  y2020
## 2868  y2020
## 2869  y2020
## 2870  y2020
## 2871  y2020
## 2872  y2020
## 2873  y2020
## 2874  y2020
## 2875  y2020
## 2876  y2020
## 2877  y2020
## 2878  y2020
## 2879  y2020
## 2880  y2020
## 2881  y2020
## 2882  y2020
## 2883  y2020
## 2884  y2020
## 2885  y2020
## 2886  y2020
## 2887  y2020
## 2888  y2020
## 2889  y2020
## 2890  y2020
## 2891  y2020
## 2892  y2020
## 2893  y2020
## 2894  y2020
## 2895  y2020
## 2896  y2020
## 2897  y2020
## 2898  y2020
## 2899  y2020
## 2900  y2020
## 2901  y2020
## 2902  y2020
## 2903  y2020
## 2904  y2020
## 2905  y2020
## 2906  y2020
## 2907  y2020
## 2908  y2020
## 2909  y2020
## 2910  y2020
## 2911  y2020
## 2912  y2020
## 2913  y2020
## 2914  y2020
## 2915  y2020
## 2916  y2020
## 2917  y2020
## 2918  y2020
## 2919  y2020
## 2920  y2020
## 2921  y2020
## 2922  y2020
## 2923  y2020
## 2924  y2020
## 2925  y2020
## 2926  y2020
## 2927  y2020
## 2928  y2020
## 2929  y2020
## 2930  y2020
## 2931  y2020
## 2932  y2020
## 2933  y2020
## 2934  y2020
## 2935  y2020
## 2936  y2020
## 2937  y2020
## 2938  y2020
## 2939  y2020
## 2940  y2020
## 2941  y2020
## 2942  y2020
## 2943  y2020
## 2944  y2020
## 2945  y2020
## 2946  y2020
## 2947  y2020
## 2948  y2020
## 2949  y2020
## 2950  y2020
## 2951  y2020
## 2952  y2020
## 2953  y2020
## 2954  y2020
## 2955  y2020
## 2956  y2020
## 2957  y2020
## 2958  y2020
## 2959  y2020
## 2960  y2020
## 2961  y2020
## 2962  y2020
## 2963  y2020
## 2964  y2020
## 2965  y2020
## 2966  y2020
## 2967  y2020
## 2968  y2020
## 2969  y2020
## 2970  y2020
## 2971  y2020
## 2972  y2020
## 2973  y2020
## 2974  y2020
## 2975  y2020
## 2976  y2020
## 2977  y2020
## 2978  y2020
## 2979  y2020
## 2980  y2020
## 2981  y2020
## 2982  y2020
## 2983  y2020
## 2984  y2020
## 2985  y2020
## 2986  y2020
## 2987  y2020
## 2988  y2020
## 2989  y2020
## 2990  y2020
## 2991  y2020
## 2992  y2020
## 2993  y2020
## 2994  y2020
## 2995  y2020
## 2996  y2020
## 2997  y2020
## 2998  y2020
## 2999  y2020
## 3000  y2020
## 3001  y2020
## 3002  y2020
## 3003  y2020
## 3004  y2020
## 3005  y2020
## 3006  y2020
## 3007  y2020
## 3008  y2020
## 3009  y2020
## 3010  y2020
## 3011  y2020
## 3012  y2020
## 3013  y2020
## 3014  y2020
## 3015  y2020
## 3016  y2020
## 3017  y2020
## 3018  y2020
## 3019  y2020
## 3020  y2020
## 3021  y2020
## 3022  y2020
## 3023  y2020
## 3024  y2020
## 3025  y2020
## 3026  y2020
## 3027  y2020
## 3028  y2020
## 3029  y2021
## 3030  y2021
## 3031  y2021
## 3032  y2021
## 3033  y2021
## 3034  y2021
## 3035  y2021
## 3036  y2021
## 3037  y2021
## 3038  y2021
## 3039  y2021
## 3040  y2021
## 3041  y2021
## 3042  y2021
## 3043  y2021
## 3044  y2021
## 3045  y2021
## 3046  y2021
## 3047  y2021
## 3048  y2021
## 3049  y2021
## 3050  y2021
## 3051  y2021
## 3052  y2021
## 3053  y2021
## 3054  y2021
## 3055  y2021
## 3056  y2021
## 3057  y2021
## 3058  y2021
## 3059  y2021
## 3060  y2021
## 3061  y2021
## 3062  y2021
## 3063  y2021
## 3064  y2021
## 3065  y2021
## 3066  y2021
## 3067  y2021
## 3068  y2021
## 3069  y2021
## 3070  y2021
## 3071  y2021
## 3072  y2021
## 3073  y2021
## 3074  y2021
## 3075  y2021
## 3076  y2021
## 3077  y2021
## 3078  y2021
## 3079  y2021
## 3080  y2021
## 3081  y2021
## 3082  y2021
## 3083  y2021
## 3084  y2021
## 3085  y2021
## 3086  y2021
## 3087  y2021
## 3088  y2021
## 3089  y2021
## 3090  y2021
## 3091  y2021
## 3092  y2021
## 3093  y2021
## 3094  y2021
## 3095  y2021
## 3096  y2021
## 3097  y2021
## 3098  y2021
## 3099  y2021
## 3100  y2021
## 3101  y2021
## 3102  y2021
## 3103  y2021
## 3104  y2021
## 3105  y2021
## 3106  y2021
## 3107  y2021
## 3108  y2021
## 3109  y2021
## 3110  y2021
## 3111  y2021
## 3112  y2021
## 3113  y2021
## 3114  y2021
## 3115  y2021
## 3116  y2021
## 3117  y2021
## 3118  y2021
## 3119  y2021
## 3120  y2021
## 3121  y2021
## 3122  y2021
## 3123  y2021
## 3124  y2021
## 3125  y2021
## 3126  y2021
## 3127  y2021
## 3128  y2021
## 3129  y2021
## 3130  y2021
## 3131  y2021
## 3132  y2021
## 3133  y2021
## 3134  y2021
## 3135  y2021
## 3136  y2021
## 3137  y2021
## 3138  y2021
## 3139  y2021
## 3140  y2021
## 3141  y2021
## 3142  y2021
## 3143  y2021
## 3144  y2021
## 3145  y2021
## 3146  y2021
## 3147  y2021
## 3148  y2021
## 3149  y2021
## 3150  y2021
## 3151  y2021
## 3152  y2021
## 3153  y2021
## 3154  y2021
## 3155  y2021
## 3156  y2021
## 3157  y2021
## 3158  y2021
## 3159  y2021
## 3160  y2021
## 3161  y2021
## 3162  y2021
## 3163  y2021
## 3164  y2021
## 3165  y2021
## 3166  y2021
## 3167  y2021
## 3168  y2021
## 3169  y2021
## 3170  y2021
## 3171  y2021
## 3172  y2021
## 3173  y2021
## 3174  y2021
## 3175  y2021
## 3176  y2021
## 3177  y2021
## 3178  y2021
## 3179  y2021
## 3180  y2021
## 3181  y2021
## 3182  y2021
## 3183  y2021
## 3184  y2021
## 3185  y2021
## 3186  y2021
## 3187  y2021
## 3188  y2021
## 3189  y2021
## 3190  y2021
## 3191  y2022
## 3192  y2022
## 3193  y2022
## 3194  y2022
## 3195  y2022
## 3196  y2022
## 3197  y2022
## 3198  y2022
## 3199  y2022
## 3200  y2022
## 3201  y2022
## 3202  y2022
## 3203  y2022
## 3204  y2022
## 3205  y2022
## 3206  y2022
## 3207  y2022
## 3208  y2022
## 3209  y2022
## 3210  y2022
## 3211  y2022
## 3212  y2022
## 3213  y2022
## 3214  y2022
## 3215  y2022
## 3216  y2022
## 3217  y2022
## 3218  y2022
## 3219  y2022
## 3220  y2022
## 3221  y2022
## 3222  y2022
## 3223  y2022
## 3224  y2022
## 3225  y2022
## 3226  y2022
## 3227  y2022
## 3228  y2022
## 3229  y2022
## 3230  y2022
## 3231  y2022
## 3232  y2022
## 3233  y2022
## 3234  y2022
## 3235  y2022
## 3236  y2022
## 3237  y2022
## 3238  y2022
## 3239  y2022
## 3240  y2022
## 3241  y2022
## 3242  y2022
## 3243  y2022
## 3244  y2022
## 3245  y2022
## 3246  y2022
## 3247  y2022
## 3248  y2022
## 3249  y2020
## 3250  y2020
## 3251  y2020
## 3252  y2020
## 3253  y2020
## 3254  y2020
## 3255  y2020
## 3256  y2020
## 3257  y2020
## 3258  y2020
## 3259  y2020
## 3260  y2020
## 3261  y2020
## 3262  y2020
## 3263  y2020
## 3264  y2020
## 3265  y2020
## 3266  y2020
## 3267  y2020
## 3268  y2020
## 3269  y2020
## 3270  y2020
## 3271  y2020
## 3272  y2020
## 3273  y2020
## 3274  y2020
## 3275  y2020
## 3276  y2020
## 3277  y2020
## 3278  y2020
## 3279  y2020
## 3280  y2020
## 3281  y2020
## 3282  y2020
## 3283  y2020
## 3284  y2020
## 3285  y2020
## 3286  y2020
## 3287  y2020
## 3288  y2020
## 3289  y2020
## 3290  y2020
## 3291  y2020
## 3292  y2020
## 3293  y2020
## 3294  y2020
## 3295  y2020
## 3296  y2020
## 3297  y2020
## 3298  y2020
## 3299  y2020
## 3300  y2020
## 3301  y2020
## 3302  y2020
## 3303  y2020
## 3304  y2020
## 3305  y2020
## 3306  y2020
## 3307  y2020
## 3308  y2020
## 3309  y2020
## 3310  y2020
## 3311  y2020
## 3312  y2020
## 3313  y2020
## 3314  y2020
## 3315  y2020
## 3316  y2020
## 3317  y2020
## 3318  y2020
## 3319  y2020
## 3320  y2020
## 3321  y2020
## 3322  y2020
## 3323  y2020
## 3324  y2020
## 3325  y2020
## 3326  y2020
## 3327  y2020
## 3328  y2020
## 3329  y2020
## 3330  y2020
## 3331  y2020
## 3332  y2020
## 3333  y2020
## 3334  y2020
## 3335  y2020
## 3336  y2020
## 3337  y2020
## 3338  y2020
## 3339  y2020
## 3340  y2020
## 3341  y2020
## 3342  y2020
## 3343  y2020
## 3344  y2020
## 3345  y2020
## 3346  y2020
## 3347  y2020
## 3348  y2020
## 3349  y2020
## 3350  y2020
## 3351  y2020
## 3352  y2020
## 3353  y2020
## 3354  y2020
## 3355  y2020
## 3356  y2020
## 3357  y2020
## 3358  y2020
## 3359  y2020
## 3360  y2020
## 3361  y2020
## 3362  y2020
## 3363  y2020
## 3364  y2020
## 3365  y2020
## 3366  y2020
## 3367  y2020
## 3368  y2020
## 3369  y2020
## 3370  y2020
## 3371  y2020
## 3372  y2020
## 3373  y2020
## 3374  y2020
## 3375  y2020
## 3376  y2020
## 3377  y2020
## 3378  y2020
## 3379  y2020
## 3380  y2020
## 3381  y2020
## 3382  y2020
## 3383  y2020
## 3384  y2020
## 3385  y2020
## 3386  y2020
## 3387  y2020
## 3388  y2020
## 3389  y2020
## 3390  y2020
## 3391  y2020
## 3392  y2020
## 3393  y2020
## 3394  y2020
## 3395  y2020
## 3396  y2020
## 3397  y2020
## 3398  y2020
## 3399  y2020
## 3400  y2020
## 3401  y2020
## 3402  y2020
## 3403  y2020
## 3404  y2020
## 3405  y2020
## 3406  y2020
## 3407  y2020
## 3408  y2020
## 3409  y2020
## 3410  y2020
## 3411  y2020
## 3412  y2020
## 3413  y2020
## 3414  y2020
## 3415  y2020
## 3416  y2020
## 3417  y2020
## 3418  y2020
## 3419  y2020
## 3420  y2020
## 3421  y2020
## 3422  y2020
## 3423  y2020
## 3424  y2020
## 3425  y2020
## 3426  y2020
## 3427  y2020
## 3428  y2020
## 3429  y2020
## 3430  y2020
## 3431  y2020
## 3432  y2020
## 3433  y2020
## 3434  y2020
## 3435  y2020
## 3436  y2020
## 3437  y2020
## 3438  y2020
## 3439  y2020
## 3440  y2020
## 3441  y2020
## 3442  y2020
## 3443  y2020
## 3444  y2020
## 3445  y2020
## 3446  y2020
## 3447  y2020
## 3448  y2020
## 3449  y2020
## 3450  y2020
## 3451  y2020
## 3452  y2020
## 3453  y2020
## 3454  y2020
## 3455  y2020
## 3456  y2020
## 3457  y2020
## 3458  y2020
## 3459  y2020
## 3460  y2020
## 3461  y2020
## 3462  y2020
## 3463  y2020
## 3464  y2020
## 3465  y2020
## 3466  y2020
## 3467  y2020
## 3468  y2020
## 3469  y2020
## 3470  y2020
## 3471  y2020
## 3472  y2020
## 3473  y2020
## 3474  y2020
## 3475  y2020
## 3476  y2020
## 3477  y2020
## 3478  y2020
## 3479  y2020
## 3480  y2020
## 3481  y2020
## 3482  y2020
## 3483  y2020
## 3484  y2020
## 3485  y2020
## 3486  y2020
## 3487  y2020
## 3488  y2020
## 3489  y2020
## 3490  y2020
## 3491  y2020
## 3492  y2020
## 3493  y2020
## 3494  y2020
## 3495  y2020
## 3496  y2020
## 3497  y2020
## 3498  y2020
## 3499  y2020
## 3500  y2020
## 3501  y2020
## 3502  y2020
## 3503  y2020
## 3504  y2020
## 3505  y2020
## 3506  y2020
## 3507  y2020
## 3508  y2020
## 3509  y2020
## 3510  y2020
## 3511  y2020
## 3512  y2020
## 3513  y2020
## 3514  y2020
## 3515  y2020
## 3516  y2020
## 3517  y2020
## 3518  y2020
## 3519  y2020
## 3520  y2020
## 3521  y2020
## 3522  y2021
## 3523  y2021
## 3524  y2021
## 3525  y2021
## 3526  y2021
## 3527  y2021
## 3528  y2021
## 3529  y2021
## 3530  y2021
## 3531  y2021
## 3532  y2021
## 3533  y2021
## 3534  y2021
## 3535  y2021
## 3536  y2021
## 3537  y2021
## 3538  y2021
## 3539  y2021
## 3540  y2021
## 3541  y2021
## 3542  y2021
## 3543  y2021
## 3544  y2021
## 3545  y2021
## 3546  y2021
## 3547  y2021
## 3548  y2021
## 3549  y2021
## 3550  y2021
## 3551  y2021
## 3552  y2021
## 3553  y2021
## 3554  y2021
## 3555  y2021
## 3556  y2021
## 3557  y2021
## 3558  y2021
## 3559  y2021
## 3560  y2021
## 3561  y2021
## 3562  y2021
## 3563  y2021
## 3564  y2021
## 3565  y2021
## 3566  y2021
## 3567  y2021
## 3568  y2021
## 3569  y2021
## 3570  y2021
## 3571  y2021
## 3572  y2021
## 3573  y2021
## 3574  y2021
## 3575  y2021
## 3576  y2021
## 3577  y2021
## 3578  y2021
## 3579  y2021
## 3580  y2021
## 3581  y2021
## 3582  y2021
## 3583  y2021
## 3584  y2021
## 3585  y2021
## 3586  y2021
## 3587  y2021
## 3588  y2021
## 3589  y2021
## 3590  y2021
## 3591  y2021
## 3592  y2021
## 3593  y2021
## 3594  y2021
## 3595  y2021
## 3596  y2021
## 3597  y2021
## 3598  y2021
## 3599  y2021
## 3600  y2021
## 3601  y2021
## 3602  y2021
## 3603  y2021
## 3604  y2021
## 3605  y2021
## 3606  y2021
## 3607  y2021
## 3608  y2021
## 3609  y2021
## 3610  y2021
## 3611  y2021
## 3612  y2021
## 3613  y2021
## 3614  y2021
## 3615  y2021
## 3616  y2021
## 3617  y2021
## 3618  y2021
## 3619  y2021
## 3620  y2021
## 3621  y2021
## 3622  y2021
## 3623  y2021
## 3624  y2021
## 3625  y2021
## 3626  y2021
## 3627  y2021
## 3628  y2021
## 3629  y2021
## 3630  y2021
## 3631  y2021
## 3632  y2021
## 3633  y2021
## 3634  y2021
## 3635  y2021
## 3636  y2021
## 3637  y2021
## 3638  y2021
## 3639  y2021
## 3640  y2021
## 3641  y2021
## 3642  y2021
## 3643  y2021
## 3644  y2021
## 3645  y2021
## 3646  y2021
## 3647  y2021
## 3648  y2021
## 3649  y2021
## 3650  y2021
## 3651  y2021
## 3652  y2021
## 3653  y2021
## 3654  y2021
## 3655  y2021
## 3656  y2021
## 3657  y2021
## 3658  y2021
## 3659  y2021
## 3660  y2021
## 3661  y2021
## 3662  y2021
## 3663  y2021
## 3664  y2021
## 3665  y2021
## 3666  y2021
## 3667  y2021
## 3668  y2021
## 3669  y2021
## 3670  y2021
## 3671  y2021
## 3672  y2021
## 3673  y2021
## 3674  y2021
## 3675  y2021
## 3676  y2021
## 3677  y2021
## 3678  y2021
## 3679  y2021
## 3680  y2021
## 3681  y2021
## 3682  y2021
## 3683  y2021
## 3684  y2021
## 3685  y2021
## 3686  y2021
## 3687  y2021
## 3688  y2021
## 3689  y2021
## 3690  y2021
## 3691  y2021
## 3692  y2021
## 3693  y2021
## 3694  y2021
## 3695  y2021
## 3696  y2021
## 3697  y2021
## 3698  y2021
## 3699  y2021
## 3700  y2021
## 3701  y2021
## 3702  y2021
## 3703  y2021
## 3704  y2021
## 3705  y2021
## 3706  y2021
## 3707  y2021
## 3708  y2021
## 3709  y2021
## 3710  y2021
## 3711  y2021
## 3712  y2021
## 3713  y2021
## 3714  y2021
## 3715  y2021
## 3716  y2021
## 3717  y2021
## 3718  y2021
## 3719  y2021
## 3720  y2021
## 3721  y2021
## 3722  y2021
## 3723  y2021
## 3724  y2021
## 3725  y2021
## 3726  y2021
## 3727  y2021
## 3728  y2021
## 3729  y2021
## 3730  y2021
## 3731  y2021
## 3732  y2021
## 3733  y2021
## 3734  y2021
## 3735  y2021
## 3736  y2021
## 3737  y2021
## 3738  y2021
## 3739  y2021
## 3740  y2021
## 3741  y2021
## 3742  y2021
## 3743  y2021
## 3744  y2021
## 3745  y2021
## 3746  y2021
## 3747  y2021
## 3748  y2021
## 3749  y2021
## 3750  y2021
## 3751  y2021
## 3752  y2021
## 3753  y2022
## 3754  y2022
## 3755  y2022
## 3756  y2022
## 3757  y2022
## 3758  y2022
## 3759  y2022
## 3760  y2022
## 3761  y2022
## 3762  y2022
## 3763  y2022
## 3764  y2022
## 3765  y2022
## 3766  y2022
## 3767  y2022
## 3768  y2022
## 3769  y2022
## 3770  y2022
## 3771  y2022
## 3772  y2022
## 3773  y2022
## 3774  y2022
## 3775  y2022
## 3776  y2022
## 3777  y2022
## 3778  y2022
## 3779  y2022
## 3780  y2022
## 3781  y2022
## 3782  y2022
## 3783  y2022
## 3784  y2022
## 3785  y2022
## 3786  y2022
## 3787  y2022
## 3788  y2022
## 3789  y2022
## 3790  y2022
## 3791  y2022
## 3792  y2022
## 3793  y2022
## 3794  y2022
## 3795  y2022
## 3796  y2022
## 3797  y2022
## 3798  y2022
## 3799  y2022
## 3800  y2022
## 3801  y2022
## 3802  y2022
## 3803  y2022
## 3804  y2022
## 3805  y2022
## 3806  y2022
## 3807  y2022
## 3808  y2022
## 3809  y2022
## 3810  y2022
## 3811  y2022
## 3812  y2022
## 3813  y2022
## 3814  y2022
## 3815  y2022
## 3816  y2022
## 3817  y2022
## 3818  y2022
## 3819  y2022
## 3820  y2022
## 3821  y2022
## 3822  y2022
## 3823  y2022
## 3824  y2022
## 3825  y2022
## 3826  y2022
## 3827  y2022
## 3828  y2022
## 3829  y2022
## 3830  y2022
## 3831  y2022
## 3832  y2022
## 3833  y2022
## 3834  y2022
## 3835  y2022
## 3836  y2022
## 3837  y2022
## 3838  y2020
## 3839  y2020
## 3840  y2020
## 3841  y2020
## 3842  y2020
## 3843  y2020
## 3844  y2020
## 3845  y2020
## 3846  y2020
## 3847  y2020
## 3848  y2020
## 3849  y2020
## 3850  y2020
## 3851  y2020
## 3852  y2020
## 3853  y2020
## 3854  y2020
## 3855  y2020
## 3856  y2020
## 3857  y2020
## 3858  y2020
## 3859  y2020
## 3860  y2020
## 3861  y2020
## 3862  y2020
## 3863  y2020
## 3864  y2020
## 3865  y2020
## 3866  y2020
## 3867  y2020
## 3868  y2020
## 3869  y2020
## 3870  y2020
## 3871  y2020
## 3872  y2020
## 3873  y2020
## 3874  y2020
## 3875  y2020
## 3876  y2020
## 3877  y2020
## 3878  y2020
## 3879  y2020
## 3880  y2020
## 3881  y2020
## 3882  y2020
## 3883  y2020
## 3884  y2020
## 3885  y2020
## 3886  y2020
## 3887  y2020
## 3888  y2020
## 3889  y2020
## 3890  y2020
## 3891  y2020
## 3892  y2020
## 3893  y2020
## 3894  y2020
## 3895  y2020
## 3896  y2020
## 3897  y2020
## 3898  y2020
## 3899  y2020
## 3900  y2020
## 3901  y2020
## 3902  y2020
## 3903  y2020
## 3904  y2020
## 3905  y2020
## 3906  y2020
## 3907  y2020
## 3908  y2020
## 3909  y2020
## 3910  y2020
## 3911  y2020
## 3912  y2020
## 3913  y2020
## 3914  y2020
## 3915  y2020
## 3916  y2020
## 3917  y2020
## 3918  y2020
## 3919  y2020
## 3920  y2020
## 3921  y2020
## 3922  y2020
## 3923  y2020
## 3924  y2020
## 3925  y2020
## 3926  y2020
## 3927  y2020
## 3928  y2020
## 3929  y2020
## 3930  y2020
## 3931  y2020
## 3932  y2020
## 3933  y2020
## 3934  y2020
## 3935  y2020
## 3936  y2020
## 3937  y2020
## 3938  y2020
## 3939  y2020
## 3940  y2020
## 3941  y2020
## 3942  y2020
## 3943  y2020
## 3944  y2020
## 3945  y2020
## 3946  y2020
## 3947  y2020
## 3948  y2020
## 3949  y2020
## 3950  y2020
## 3951  y2020
## 3952  y2020
## 3953  y2020
## 3954  y2020
## 3955  y2020
## 3956  y2020
## 3957  y2020
## 3958  y2020
## 3959  y2020
## 3960  y2020
## 3961  y2020
## 3962  y2020
## 3963  y2020
## 3964  y2020
## 3965  y2020
## 3966  y2020
## 3967  y2020
## 3968  y2020
## 3969  y2020
## 3970  y2020
## 3971  y2020
## 3972  y2020
## 3973  y2020
## 3974  y2020
## 3975  y2020
## 3976  y2020
## 3977  y2020
## 3978  y2020
## 3979  y2020
## 3980  y2020
## 3981  y2020
## 3982  y2020
## 3983  y2020
## 3984  y2020
## 3985  y2020
## 3986  y2020
## 3987  y2020
## 3988  y2020
## 3989  y2020
## 3990  y2020
## 3991  y2020
## 3992  y2020
## 3993  y2020
## 3994  y2020
## 3995  y2020
## 3996  y2020
## 3997  y2020
## 3998  y2020
## 3999  y2020
## 4000  y2020
## 4001  y2020
## 4002  y2020
## 4003  y2020
## 4004  y2020
## 4005  y2020
## 4006  y2020
## 4007  y2020
## 4008  y2020
## 4009  y2020
## 4010  y2020
## 4011  y2020
## 4012  y2020
## 4013  y2020
## 4014  y2020
## 4015  y2020
## 4016  y2020
## 4017  y2020
## 4018  y2020
## 4019  y2020
## 4020  y2020
## 4021  y2020
## 4022  y2020
## 4023  y2020
## 4024  y2020
## 4025  y2020
## 4026  y2020
## 4027  y2020
## 4028  y2020
## 4029  y2020
## 4030  y2020
## 4031  y2020
## 4032  y2020
## 4033  y2020
## 4034  y2020
## 4035  y2020
## 4036  y2020
## 4037  y2020
## 4038  y2020
## 4039  y2020
## 4040  y2020
## 4041  y2020
## 4042  y2020
## 4043  y2020
## 4044  y2020
## 4045  y2020
## 4046  y2020
## 4047  y2020
## 4048  y2020
## 4049  y2020
## 4050  y2020
## 4051  y2020
## 4052  y2020
## 4053  y2020
## 4054  y2020
## 4055  y2020
## 4056  y2020
## 4057  y2020
## 4058  y2020
## 4059  y2020
## 4060  y2020
## 4061  y2020
## 4062  y2020
## 4063  y2020
## 4064  y2020
## 4065  y2020
## 4066  y2020
## 4067  y2020
## 4068  y2020
## 4069  y2020
## 4070  y2020
## 4071  y2020
## 4072  y2020
## 4073  y2020
## 4074  y2020
## 4075  y2020
## 4076  y2020
## 4077  y2020
## 4078  y2020
## 4079  y2020
## 4080  y2020
## 4081  y2020
## 4082  y2020
## 4083  y2020
## 4084  y2020
## 4085  y2020
## 4086  y2020
## 4087  y2020
## 4088  y2020
## 4089  y2020
## 4090  y2020
## 4091  y2020
## 4092  y2020
## 4093  y2020
## 4094  y2020
## 4095  y2020
## 4096  y2020
## 4097  y2020
## 4098  y2020
## 4099  y2020
## 4100  y2020
## 4101  y2020
## 4102  y2020
## 4103  y2020
## 4104  y2020
## 4105  y2020
## 4106  y2020
## 4107  y2020
## 4108  y2020
## 4109  y2020
## 4110  y2020
## 4111  y2020
## 4112  y2020
## 4113  y2020
## 4114  y2020
## 4115  y2020
## 4116  y2020
## 4117  y2020
## 4118  y2020
## 4119  y2020
## 4120  y2020
## 4121  y2020
## 4122  y2020
## 4123  y2020
## 4124  y2020
## 4125  y2020
## 4126  y2020
## 4127  y2020
## 4128  y2020
## 4129  y2020
## 4130  y2020
## 4131  y2020
## 4132  y2020
## 4133  y2020
## 4134  y2020
## 4135  y2020
## 4136  y2020
## 4137  y2020
## 4138  y2020
## 4139  y2020
## 4140  y2020
## 4141  y2020
## 4142  y2020
## 4143  y2020
## 4144  y2020
## 4145  y2020
## 4146  y2020
## 4147  y2020
## 4148  y2020
## 4149  y2020
## 4150  y2020
## 4151  y2020
## 4152  y2020
## 4153  y2020
## 4154  y2020
## 4155  y2020
## 4156  y2020
## 4157  y2020
## 4158  y2020
## 4159  y2020
## 4160  y2020
## 4161  y2020
## 4162  y2020
## 4163  y2020
## 4164  y2020
## 4165  y2020
## 4166  y2020
## 4167  y2020
## 4168  y2020
## 4169  y2020
## 4170  y2020
## 4171  y2020
## 4172  y2020
## 4173  y2020
## 4174  y2020
## 4175  y2020
## 4176  y2020
## 4177  y2020
## 4178  y2020
## 4179  y2020
## 4180  y2020
## 4181  y2020
## 4182  y2020
## 4183  y2020
## 4184  y2020
## 4185  y2020
## 4186  y2020
## 4187  y2020
## 4188  y2020
## 4189  y2020
## 4190  y2020
## 4191  y2020
## 4192  y2020
## 4193  y2020
## 4194  y2020
## 4195  y2020
## 4196  y2020
## 4197  y2020
## 4198  y2020
## 4199  y2020
## 4200  y2020
## 4201  y2020
## 4202  y2020
## 4203  y2020
## 4204  y2020
## 4205  y2020
## 4206  y2020
## 4207  y2020
## 4208  y2020
## 4209  y2020
## 4210  y2020
## 4211  y2020
## 4212  y2020
## 4213  y2020
## 4214  y2020
## 4215  y2020
## 4216  y2020
## 4217  y2020
## 4218  y2020
## 4219  y2020
## 4220  y2020
## 4221  y2020
## 4222  y2020
## 4223  y2020
## 4224  y2020
## 4225  y2020
## 4226  y2020
## 4227  y2020
## 4228  y2020
## 4229  y2020
## 4230  y2020
## 4231  y2020
## 4232  y2020
## 4233  y2020
## 4234  y2020
## 4235  y2020
## 4236  y2020
## 4237  y2020
## 4238  y2020
## 4239  y2020
## 4240  y2021
## 4241  y2021
## 4242  y2021
## 4243  y2021
## 4244  y2021
## 4245  y2021
## 4246  y2021
## 4247  y2021
## 4248  y2021
## 4249  y2021
## 4250  y2021
## 4251  y2021
## 4252  y2021
## 4253  y2021
## 4254  y2021
## 4255  y2021
## 4256  y2021
## 4257  y2021
## 4258  y2021
## 4259  y2021
## 4260  y2021
## 4261  y2021
## 4262  y2021
## 4263  y2021
## 4264  y2021
## 4265  y2021
## 4266  y2021
## 4267  y2021
## 4268  y2021
## 4269  y2021
## 4270  y2021
## 4271  y2021
## 4272  y2021
## 4273  y2021
## 4274  y2021
## 4275  y2021
## 4276  y2021
## 4277  y2021
## 4278  y2021
## 4279  y2021
## 4280  y2021
## 4281  y2021
## 4282  y2021
## 4283  y2021
## 4284  y2021
## 4285  y2021
## 4286  y2021
## 4287  y2021
## 4288  y2021
## 4289  y2021
## 4290  y2021
## 4291  y2021
## 4292  y2021
## 4293  y2021
## 4294  y2021
## 4295  y2021
## 4296  y2021
## 4297  y2021
## 4298  y2021
## 4299  y2021
## 4300  y2021
## 4301  y2021
## 4302  y2021
## 4303  y2021
## 4304  y2021
## 4305  y2021
## 4306  y2021
## 4307  y2021
## 4308  y2021
## 4309  y2021
## 4310  y2021
## 4311  y2021
## 4312  y2021
## 4313  y2021
## 4314  y2021
## 4315  y2021
## 4316  y2021
## 4317  y2021
## 4318  y2021
## 4319  y2021
## 4320  y2021
## 4321  y2021
## 4322  y2021
## 4323  y2021
## 4324  y2021
## 4325  y2021
## 4326  y2021
## 4327  y2021
## 4328  y2021
## 4329  y2021
## 4330  y2021
## 4331  y2021
## 4332  y2021
## 4333  y2021
## 4334  y2021
## 4335  y2021
## 4336  y2021
## 4337  y2021
## 4338  y2021
## 4339  y2021
## 4340  y2021
## 4341  y2021
## 4342  y2021
## 4343  y2021
## 4344  y2021
## 4345  y2021
## 4346  y2021
## 4347  y2021
## 4348  y2021
## 4349  y2021
## 4350  y2021
## 4351  y2021
## 4352  y2021
## 4353  y2021
## 4354  y2021
## 4355  y2021
## 4356  y2021
## 4357  y2021
## 4358  y2021
## 4359  y2021
## 4360  y2021
## 4361  y2021
## 4362  y2021
## 4363  y2021
## 4364  y2021
## 4365  y2021
## 4366  y2021
## 4367  y2021
## 4368  y2021
## 4369  y2021
## 4370  y2021
## 4371  y2021
## 4372  y2021
## 4373  y2021
## 4374  y2021
## 4375  y2021
## 4376  y2021
## 4377  y2021
## 4378  y2021
## 4379  y2021
## 4380  y2021
## 4381  y2021
## 4382  y2021
## 4383  y2021
## 4384  y2021
## 4385  y2021
## 4386  y2021
## 4387  y2021
## 4388  y2021
## 4389  y2021
## 4390  y2021
## 4391  y2021
## 4392  y2021
## 4393  y2021
## 4394  y2021
## 4395  y2021
## 4396  y2021
## 4397  y2021
## 4398  y2021
## 4399  y2021
## 4400  y2021
## 4401  y2021
## 4402  y2021
## 4403  y2021
## 4404  y2021
## 4405  y2021
## 4406  y2021
## 4407  y2021
## 4408  y2021
## 4409  y2021
## 4410  y2021
## 4411  y2021
## 4412  y2021
## 4413  y2021
## 4414  y2021
## 4415  y2021
## 4416  y2021
## 4417  y2021
## 4418  y2021
## 4419  y2021
## 4420  y2021
## 4421  y2021
## 4422  y2021
## 4423  y2021
## 4424  y2021
## 4425  y2021
## 4426  y2021
## 4427  y2021
## 4428  y2021
## 4429  y2021
## 4430  y2021
## 4431  y2021
## 4432  y2021
## 4433  y2021
## 4434  y2021
## 4435  y2021
## 4436  y2021
## 4437  y2021
## 4438  y2021
## 4439  y2021
## 4440  y2021
## 4441  y2021
## 4442  y2021
## 4443  y2021
## 4444  y2021
## 4445  y2021
## 4446  y2021
## 4447  y2021
## 4448  y2021
## 4449  y2021
## 4450  y2021
## 4451  y2021
## 4452  y2021
## 4453  y2021
## 4454  y2021
## 4455  y2021
## 4456  y2021
## 4457  y2021
## 4458  y2021
## 4459  y2021
## 4460  y2021
## 4461  y2021
## 4462  y2021
## 4463  y2021
## 4464  y2021
## 4465  y2021
## 4466  y2021
## 4467  y2021
## 4468  y2021
## 4469  y2021
## 4470  y2021
## 4471  y2021
## 4472  y2021
## 4473  y2021
## 4474  y2021
## 4475  y2021
## 4476  y2021
## 4477  y2021
## 4478  y2021
## 4479  y2021
## 4480  y2021
## 4481  y2021
## 4482  y2021
## 4483  y2021
## 4484  y2021
## 4485  y2021
## 4486  y2021
## 4487  y2021
## 4488  y2021
## 4489  y2021
## 4490  y2021
## 4491  y2021
## 4492  y2021
## 4493  y2021
## 4494  y2021
## 4495  y2021
## 4496  y2021
## 4497  y2021
## 4498  y2021
## 4499  y2021
## 4500  y2021
## 4501  y2021
## 4502  y2021
## 4503  y2021
## 4504  y2021
## 4505  y2021
## 4506  y2021
## 4507  y2021
## 4508  y2021
## 4509  y2021
## 4510  y2021
## 4511  y2021
## 4512  y2021
## 4513  y2021
## 4514  y2021
## 4515  y2021
## 4516  y2021
## 4517  y2021
## 4518  y2021
## 4519  y2021
## 4520  y2021
## 4521  y2021
## 4522  y2021
## 4523  y2021
## 4524  y2021
## 4525  y2021
## 4526  y2021
## 4527  y2021
## 4528  y2021
## 4529  y2021
## 4530  y2021
## 4531  y2021
## 4532  y2021
## 4533  y2021
## 4534  y2021
## 4535  y2021
## 4536  y2021
## 4537  y2021
## 4538  y2021
## 4539  y2021
## 4540  y2021
## 4541  y2021
## 4542  y2021
## 4543  y2021
## 4544  y2021
## 4545  y2021
## 4546  y2021
## 4547  y2021
## 4548  y2021
## 4549  y2021
## 4550  y2021
## 4551  y2021
## 4552  y2021
## 4553  y2021
## 4554  y2021
## 4555  y2021
## 4556  y2021
## 4557  y2021
## 4558  y2021
## 4559  y2021
## 4560  y2021
## 4561  y2021
## 4562  y2021
## 4563  y2021
## 4564  y2021
## 4565  y2021
## 4566  y2022
## 4567  y2022
## 4568  y2022
## 4569  y2022
## 4570  y2022
## 4571  y2022
## 4572  y2022
## 4573  y2022
## 4574  y2022
## 4575  y2022
## 4576  y2022
## 4577  y2022
## 4578  y2022
## 4579  y2022
## 4580  y2022
## 4581  y2022
## 4582  y2022
## 4583  y2022
## 4584  y2022
## 4585  y2022
## 4586  y2022
## 4587  y2022
## 4588  y2022
## 4589  y2022
## 4590  y2022
## 4591  y2022
## 4592  y2022
## 4593  y2022
## 4594  y2022
## 4595  y2022
## 4596  y2022
## 4597  y2022
## 4598  y2022
## 4599  y2022
## 4600  y2022
## 4601  y2022
## 4602  y2022
## 4603  y2022
## 4604  y2022
## 4605  y2022
## 4606  y2022
## 4607  y2022
## 4608  y2022
## 4609  y2022
## 4610  y2022
## 4611  y2022
## 4612  y2022
## 4613  y2022
## 4614  y2022
## 4615  y2022
## 4616  y2022
## 4617  y2022
## 4618  y2022
## 4619  y2022
## 4620  y2022
## 4621  y2022
## 4622  y2022
## 4623  y2022
## 4624  y2022
## 4625  y2022
## 4626  y2022
## 4627  y2022
## 4628  y2022
## 4629  y2022
## 4630  y2022
## 4631  y2022
## 4632  y2022
## 4633  y2022
## 4634  y2022
## 4635  y2022
## 4636  y2022
## 4637  y2022
## 4638  y2022
## 4639  y2022
## 4640  y2022
## 4641  y2022
## 4642  y2022
## 4643  y2022
## 4644  y2022
## 4645  y2022
## 4646  y2022
## 4647  y2022
## 4648  y2022
## 4649  y2022
## 4650  y2022
## 4651  y2022
## 4652  y2022
## 4653  y2022
## 4654  y2022
## 4655  y2022
## 4656  y2022
## 4657  y2022
## 4658  y2022
## 4659  y2022
## 4660  y2022
## 4661  y2022
## 4662  y2022
## 4663  y2022
## 4664  y2022
## 4665  y2022
## 4666  y2022
## 4667  y2022
## 4668  y2022
## 4669  y2022
## 4670  y2022
## 4671  y2022
## 4672  y2022
## 4673  y2022
## 4674  y2022
## 4675  y2022
## 4676  y2022
## 4677  y2022
## 4678  y2022
## 4679  y2022
## 4680  y2022
## 4681  y2022
## 4682  y2022
## 4683  y2022
## 4684  y2022
## 4685  y2022
## 4686  y2022
## 4687  y2022
## 4688  y2022
## 4689  y2022
## 4690  y2022
## 4691  y2022
## 4692  y2022
## 4693  y2022
## 4694  y2022
## 4695  y2022
## 4696  y2022
## 4697  y2022
## 4698  y2022
## 4699  y2022
## 4700  y2022
## 4701  y2022
## 4702  y2022
## 4703  y2022
## 4704  y2022
## 4705  y2022
## 4706  y2022
## 4707  y2022
## 4708  y2022
## 4709  y2022
## 4710  y2022
## 4711  y2022
## 4712  y2022
## 4713  y2022
## 4714  y2022
## 4715  y2022
## 4716  y2022
## 4717  y2022
## 4718  y2022
## 4719  y2022
## 4720  y2022
## 4721  y2022
## 4722  y2022
## 4723  y2022
## 4724  y2022
## 4725  y2022
## 4726  y2022
## 4727  y2022
## 4728  y2022
## 4729  y2022
## 4730  y2022
## 4731  y2022
## 4732  y2022
## 4733  y2022
## 4734  y2022
## 4735  y2022
## 4736  y2022
## 4737  y2022
## 4738  y2022
## 4739  y2022
## 4740  y2022
## 4741  y2022
## 4742  y2022
## 4743  y2022
## 4744  y2022
## 4745  y2022
## 4746  y2022
## 4747  y2022
## 4748  y2022
## 4749  y2022
## 4750  y2022
## 4751  y2022
## 4752  y2022
## 4753  y2022
## 4754  y2020
## 4755  y2020
## 4756  y2020
## 4757  y2020
## 4758  y2020
## 4759  y2020
## 4760  y2020
## 4761  y2020
## 4762  y2020
## 4763  y2020
## 4764  y2020
## 4765  y2020
## 4766  y2020
## 4767  y2020
## 4768  y2020
## 4769  y2020
## 4770  y2020
## 4771  y2020
## 4772  y2020
## 4773  y2020
## 4774  y2020
## 4775  y2020
## 4776  y2020
## 4777  y2020
## 4778  y2020
## 4779  y2020
## 4780  y2020
## 4781  y2020
## 4782  y2020
## 4783  y2020
## 4784  y2020
## 4785  y2020
## 4786  y2020
## 4787  y2020
## 4788  y2020
## 4789  y2020
## 4790  y2020
## 4791  y2020
## 4792  y2020
## 4793  y2020
## 4794  y2020
## 4795  y2020
## 4796  y2020
## 4797  y2020
## 4798  y2020
## 4799  y2020
## 4800  y2020
## 4801  y2020
## 4802  y2020
## 4803  y2020
## 4804  y2020
## 4805  y2020
## 4806  y2020
## 4807  y2020
## 4808  y2020
## 4809  y2020
## 4810  y2020
## 4811  y2020
## 4812  y2020
## 4813  y2020
## 4814  y2020
## 4815  y2020
## 4816  y2020
## 4817  y2020
## 4818  y2020
## 4819  y2020
## 4820  y2020
## 4821  y2020
## 4822  y2020
## 4823  y2020
## 4824  y2020
## 4825  y2020
## 4826  y2020
## 4827  y2020
## 4828  y2020
## 4829  y2020
## 4830  y2020
## 4831  y2020
## 4832  y2020
## 4833  y2020
## 4834  y2020
## 4835  y2020
## 4836  y2020
## 4837  y2020
## 4838  y2020
## 4839  y2020
## 4840  y2020
## 4841  y2020
## 4842  y2020
## 4843  y2020
## 4844  y2020
## 4845  y2020
## 4846  y2020
## 4847  y2020
## 4848  y2020
## 4849  y2020
## 4850  y2020
## 4851  y2020
## 4852  y2020
## 4853  y2020
## 4854  y2020
## 4855  y2020
## 4856  y2020
## 4857  y2020
## 4858  y2020
## 4859  y2020
## 4860  y2020
## 4861  y2020
## 4862  y2020
## 4863  y2020
## 4864  y2020
## 4865  y2020
## 4866  y2020
## 4867  y2020
## 4868  y2020
## 4869  y2020
## 4870  y2020
## 4871  y2020
## 4872  y2020
## 4873  y2020
## 4874  y2020
## 4875  y2020
## 4876  y2020
## 4877  y2020
## 4878  y2020
## 4879  y2020
## 4880  y2020
## 4881  y2020
## 4882  y2020
## 4883  y2020
## 4884  y2020
## 4885  y2020
## 4886  y2020
## 4887  y2020
## 4888  y2020
## 4889  y2020
## 4890  y2020
## 4891  y2020
## 4892  y2020
## 4893  y2020
## 4894  y2020
## 4895  y2020
## 4896  y2020
## 4897  y2020
## 4898  y2020
## 4899  y2020
## 4900  y2020
## 4901  y2020
## 4902  y2020
## 4903  y2020
## 4904  y2020
## 4905  y2020
## 4906  y2020
## 4907  y2020
## 4908  y2020
## 4909  y2020
## 4910  y2020
## 4911  y2020
## 4912  y2020
## 4913  y2020
## 4914  y2020
## 4915  y2020
## 4916  y2020
## 4917  y2020
## 4918  y2020
## 4919  y2020
## 4920  y2020
## 4921  y2020
## 4922  y2020
## 4923  y2020
## 4924  y2020
## 4925  y2020
## 4926  y2020
## 4927  y2020
## 4928  y2020
## 4929  y2020
## 4930  y2020
## 4931  y2020
## 4932  y2020
## 4933  y2020
## 4934  y2020
## 4935  y2020
## 4936  y2020
## 4937  y2020
## 4938  y2020
## 4939  y2020
## 4940  y2020
## 4941  y2020
## 4942  y2020
## 4943  y2020
## 4944  y2020
## 4945  y2020
## 4946  y2020
## 4947  y2020
## 4948  y2020
## 4949  y2020
## 4950  y2020
## 4951  y2020
## 4952  y2020
## 4953  y2020
## 4954  y2020
## 4955  y2020
## 4956  y2020
## 4957  y2020
## 4958  y2020
## 4959  y2020
## 4960  y2020
## 4961  y2020
## 4962  y2020
## 4963  y2020
## 4964  y2020
## 4965  y2020
## 4966  y2020
## 4967  y2020
## 4968  y2020
## 4969  y2020
## 4970  y2020
## 4971  y2020
## 4972  y2020
## 4973  y2020
## 4974  y2020
## 4975  y2020
## 4976  y2020
## 4977  y2020
## 4978  y2020
## 4979  y2020
## 4980  y2020
## 4981  y2020
## 4982  y2020
## 4983  y2020
## 4984  y2020
## 4985  y2020
## 4986  y2020
## 4987  y2020
## 4988  y2020
## 4989  y2020
## 4990  y2020
## 4991  y2020
## 4992  y2020
## 4993  y2020
## 4994  y2020
## 4995  y2020
## 4996  y2020
## 4997  y2020
## 4998  y2020
## 4999  y2020
## 5000  y2020
## 5001  y2020
## 5002  y2020
## 5003  y2020
## 5004  y2020
## 5005  y2020
## 5006  y2020
## 5007  y2020
## 5008  y2020
## 5009  y2020
## 5010  y2020
## 5011  y2020
## 5012  y2020
## 5013  y2020
## 5014  y2020
## 5015  y2020
## 5016  y2020
## 5017  y2020
## 5018  y2020
## 5019  y2020
## 5020  y2020
## 5021  y2020
## 5022  y2020
## 5023  y2020
## 5024  y2020
## 5025  y2020
## 5026  y2020
## 5027  y2020
## 5028  y2020
## 5029  y2020
## 5030  y2020
## 5031  y2020
## 5032  y2020
## 5033  y2020
## 5034  y2020
## 5035  y2020
## 5036  y2020
## 5037  y2020
## 5038  y2020
## 5039  y2020
## 5040  y2020
## 5041  y2020
## 5042  y2020
## 5043  y2020
## 5044  y2020
## 5045  y2020
## 5046  y2020
## 5047  y2020
## 5048  y2020
## 5049  y2020
## 5050  y2020
## 5051  y2020
## 5052  y2020
## 5053  y2020
## 5054  y2020
## 5055  y2020
## 5056  y2020
## 5057  y2020
## 5058  y2020
## 5059  y2020
## 5060  y2020
## 5061  y2020
## 5062  y2020
## 5063  y2020
## 5064  y2020
## 5065  y2020
## 5066  y2020
## 5067  y2020
## 5068  y2020
## 5069  y2020
## 5070  y2020
## 5071  y2020
## 5072  y2020
## 5073  y2020
## 5074  y2020
## 5075  y2020
## 5076  y2020
## 5077  y2020
## 5078  y2020
## 5079  y2020
## 5080  y2020
## 5081  y2020
## 5082  y2020
## 5083  y2020
## 5084  y2020
## 5085  y2020
## 5086  y2020
## 5087  y2020
## 5088  y2020
## 5089  y2020
## 5090  y2020
## 5091  y2020
## 5092  y2020
## 5093  y2020
## 5094  y2020
## 5095  y2020
## 5096  y2020
## 5097  y2020
## 5098  y2020
## 5099  y2020
## 5100  y2020
## 5101  y2020
## 5102  y2020
## 5103  y2020
## 5104  y2020
## 5105  y2020
## 5106  y2020
## 5107  y2020
## 5108  y2020
## 5109  y2020
## 5110  y2020
## 5111  y2020
## 5112  y2020
## 5113  y2020
## 5114  y2020
## 5115  y2020
## 5116  y2020
## 5117  y2020
## 5118  y2020
## 5119  y2020
## 5120  y2020
## 5121  y2020
## 5122  y2020
## 5123  y2020
## 5124  y2020
## 5125  y2020
## 5126  y2020
## 5127  y2020
## 5128  y2020
## 5129  y2020
## 5130  y2020
## 5131  y2020
## 5132  y2020
## 5133  y2020
## 5134  y2020
## 5135  y2020
## 5136  y2020
## 5137  y2020
## 5138  y2020
## 5139  y2020
## 5140  y2020
## 5141  y2020
## 5142  y2020
## 5143  y2020
## 5144  y2020
## 5145  y2020
## 5146  y2020
## 5147  y2020
## 5148  y2020
## 5149  y2020
## 5150  y2020
## 5151  y2020
## 5152  y2020
## 5153  y2020
## 5154  y2020
## 5155  y2020
## 5156  y2020
## 5157  y2020
## 5158  y2020
## 5159  y2020
## 5160  y2020
## 5161  y2020
## 5162  y2020
## 5163  y2020
## 5164  y2020
## 5165  y2020
## 5166  y2020
## 5167  y2020
## 5168  y2020
## 5169  y2020
## 5170  y2020
## 5171  y2020
## 5172  y2020
## 5173  y2020
## 5174  y2020
## 5175  y2020
## 5176  y2020
## 5177  y2020
## 5178  y2020
## 5179  y2020
## 5180  y2020
## 5181  y2020
## 5182  y2020
## 5183  y2020
## 5184  y2020
## 5185  y2020
## 5186  y2020
## 5187  y2020
## 5188  y2020
## 5189  y2020
## 5190  y2020
## 5191  y2020
## 5192  y2020
## 5193  y2020
## 5194  y2020
## 5195  y2020
## 5196  y2020
## 5197  y2020
## 5198  y2020
## 5199  y2020
## 5200  y2020
## 5201  y2020
## 5202  y2020
## 5203  y2020
## 5204  y2020
## 5205  y2020
## 5206  y2020
## 5207  y2020
## 5208  y2020
## 5209  y2020
## 5210  y2020
## 5211  y2020
## 5212  y2020
## 5213  y2020
## 5214  y2020
## 5215  y2020
## 5216  y2020
## 5217  y2020
## 5218  y2020
## 5219  y2020
## 5220  y2020
## 5221  y2020
## 5222  y2020
## 5223  y2020
## 5224  y2020
## 5225  y2020
## 5226  y2020
## 5227  y2020
## 5228  y2020
## 5229  y2020
## 5230  y2020
## 5231  y2020
## 5232  y2020
## 5233  y2020
## 5234  y2020
## 5235  y2020
## 5236  y2020
## 5237  y2020
## 5238  y2020
## 5239  y2020
## 5240  y2020
## 5241  y2020
## 5242  y2020
## 5243  y2020
## 5244  y2020
## 5245  y2020
## 5246  y2020
## 5247  y2020
## 5248  y2020
## 5249  y2020
## 5250  y2020
## 5251  y2020
## 5252  y2020
## 5253  y2020
## 5254  y2020
## 5255  y2020
## 5256  y2020
## 5257  y2020
## 5258  y2020
## 5259  y2020
## 5260  y2020
## 5261  y2020
## 5262  y2020
## 5263  y2020
## 5264  y2020
## 5265  y2020
## 5266  y2020
## 5267  y2020
## 5268  y2020
## 5269  y2020
## 5270  y2020
## 5271  y2020
## 5272  y2020
## 5273  y2020
## 5274  y2020
## 5275  y2020
## 5276  y2020
## 5277  y2020
## 5278  y2020
## 5279  y2020
## 5280  y2020
## 5281  y2020
## 5282  y2020
## 5283  y2020
## 5284  y2020
## 5285  y2020
## 5286  y2020
## 5287  y2020
## 5288  y2020
## 5289  y2020
## 5290  y2020
## 5291  y2020
## 5292  y2020
## 5293  y2020
## 5294  y2020
## 5295  y2020
## 5296  y2020
## 5297  y2020
## 5298  y2020
## 5299  y2020
## 5300  y2020
## 5301  y2020
## 5302  y2020
## 5303  y2020
## 5304  y2020
## 5305  y2020
## 5306  y2020
## 5307  y2020
## 5308  y2020
## 5309  y2020
## 5310  y2020
## 5311  y2020
## 5312  y2020
## 5313  y2020
## 5314  y2020
## 5315  y2020
## 5316  y2020
## 5317  y2020
## 5318  y2020
## 5319  y2020
## 5320  y2020
## 5321  y2020
## 5322  y2020
## 5323  y2020
## 5324  y2020
## 5325  y2020
## 5326  y2020
## 5327  y2020
## 5328  y2020
## 5329  y2020
## 5330  y2020
## 5331  y2020
## 5332  y2020
## 5333  y2020
## 5334  y2020
## 5335  y2020
## 5336  y2020
## 5337  y2020
## 5338  y2020
## 5339  y2020
## 5340  y2020
## 5341  y2020
## 5342  y2020
## 5343  y2020
## 5344  y2020
## 5345  y2020
## 5346  y2020
## 5347  y2020
## 5348  y2020
## 5349  y2020
## 5350  y2020
## 5351  y2020
## 5352  y2020
## 5353  y2020
## 5354  y2020
## 5355  y2020
## 5356  y2020
## 5357  y2020
## 5358  y2020
## 5359  y2020
## 5360  y2020
## 5361  y2020
## 5362  y2020
## 5363  y2020
## 5364  y2020
## 5365  y2020
## 5366  y2020
## 5367  y2020
## 5368  y2020
## 5369  y2020
## 5370  y2020
## 5371  y2020
## 5372  y2020
## 5373  y2020
## 5374  y2021
## 5375  y2021
## 5376  y2021
## 5377  y2021
## 5378  y2021
## 5379  y2021
## 5380  y2021
## 5381  y2021
## 5382  y2021
## 5383  y2021
## 5384  y2021
## 5385  y2021
## 5386  y2021
## 5387  y2021
## 5388  y2021
## 5389  y2021
## 5390  y2021
## 5391  y2021
## 5392  y2021
## 5393  y2021
## 5394  y2021
## 5395  y2021
## 5396  y2021
## 5397  y2021
## 5398  y2021
## 5399  y2021
## 5400  y2021
## 5401  y2021
## 5402  y2021
## 5403  y2021
## 5404  y2021
## 5405  y2021
## 5406  y2021
## 5407  y2021
## 5408  y2021
## 5409  y2021
## 5410  y2021
## 5411  y2021
## 5412  y2021
## 5413  y2021
## 5414  y2021
## 5415  y2021
## 5416  y2021
## 5417  y2021
## 5418  y2021
## 5419  y2021
## 5420  y2021
## 5421  y2021
## 5422  y2021
## 5423  y2021
## 5424  y2021
## 5425  y2021
## 5426  y2021
## 5427  y2021
## 5428  y2021
## 5429  y2021
## 5430  y2021
## 5431  y2021
## 5432  y2021
## 5433  y2021
## 5434  y2021
## 5435  y2021
## 5436  y2021
## 5437  y2021
## 5438  y2021
## 5439  y2021
## 5440  y2021
## 5441  y2021
## 5442  y2021
## 5443  y2021
## 5444  y2021
## 5445  y2021
## 5446  y2021
## 5447  y2021
## 5448  y2021
## 5449  y2021
## 5450  y2021
## 5451  y2021
## 5452  y2021
## 5453  y2021
## 5454  y2021
## 5455  y2021
## 5456  y2021
## 5457  y2021
## 5458  y2021
## 5459  y2021
## 5460  y2021
## 5461  y2021
## 5462  y2021
## 5463  y2021
## 5464  y2021
## 5465  y2021
## 5466  y2021
## 5467  y2021
## 5468  y2021
## 5469  y2021
## 5470  y2021
## 5471  y2021
## 5472  y2021
## 5473  y2021
## 5474  y2021
## 5475  y2021
## 5476  y2021
## 5477  y2021
## 5478  y2021
## 5479  y2021
## 5480  y2021
## 5481  y2021
## 5482  y2021
## 5483  y2021
## 5484  y2021
## 5485  y2021
## 5486  y2021
## 5487  y2021
## 5488  y2021
## 5489  y2021
## 5490  y2021
## 5491  y2021
## 5492  y2021
## 5493  y2021
## 5494  y2021
## 5495  y2021
## 5496  y2021
## 5497  y2021
## 5498  y2021
## 5499  y2021
## 5500  y2021
## 5501  y2021
## 5502  y2021
## 5503  y2021
## 5504  y2021
## 5505  y2021
## 5506  y2021
## 5507  y2021
## 5508  y2021
## 5509  y2021
## 5510  y2021
## 5511  y2021
## 5512  y2021
## 5513  y2021
## 5514  y2021
## 5515  y2021
## 5516  y2021
## 5517  y2021
## 5518  y2021
## 5519  y2021
## 5520  y2021
## 5521  y2021
## 5522  y2021
## 5523  y2021
## 5524  y2021
## 5525  y2021
## 5526  y2021
## 5527  y2021
## 5528  y2021
## 5529  y2021
## 5530  y2021
## 5531  y2021
## 5532  y2021
## 5533  y2021
## 5534  y2021
## 5535  y2021
## 5536  y2021
## 5537  y2021
## 5538  y2021
## 5539  y2021
## 5540  y2021
## 5541  y2021
## 5542  y2021
## 5543  y2021
## 5544  y2021
## 5545  y2021
## 5546  y2021
## 5547  y2021
## 5548  y2021
## 5549  y2021
## 5550  y2021
## 5551  y2021
## 5552  y2021
## 5553  y2021
## 5554  y2021
## 5555  y2021
## 5556  y2021
## 5557  y2021
## 5558  y2021
## 5559  y2021
## 5560  y2021
## 5561  y2021
## 5562  y2021
## 5563  y2021
## 5564  y2021
## 5565  y2021
## 5566  y2021
## 5567  y2021
## 5568  y2021
## 5569  y2021
## 5570  y2021
## 5571  y2021
## 5572  y2021
## 5573  y2021
## 5574  y2021
## 5575  y2021
## 5576  y2021
## 5577  y2021
## 5578  y2021
## 5579  y2021
## 5580  y2021
## 5581  y2021
## 5582  y2021
## 5583  y2021
## 5584  y2021
## 5585  y2021
## 5586  y2021
## 5587  y2021
## 5588  y2021
## 5589  y2021
## 5590  y2021
## 5591  y2021
## 5592  y2021
## 5593  y2021
## 5594  y2021
## 5595  y2021
## 5596  y2021
## 5597  y2021
## 5598  y2021
## 5599  y2021
## 5600  y2021
## 5601  y2021
## 5602  y2021
## 5603  y2021
## 5604  y2021
## 5605  y2021
## 5606  y2021
## 5607  y2021
## 5608  y2021
## 5609  y2021
## 5610  y2021
## 5611  y2021
## 5612  y2021
## 5613  y2021
## 5614  y2021
## 5615  y2021
## 5616  y2021
## 5617  y2021
## 5618  y2021
## 5619  y2021
## 5620  y2021
## 5621  y2021
## 5622  y2021
## 5623  y2021
## 5624  y2021
## 5625  y2021
## 5626  y2021
## 5627  y2021
## 5628  y2021
## 5629  y2021
## 5630  y2021
## 5631  y2021
## 5632  y2021
## 5633  y2021
## 5634  y2021
## 5635  y2021
## 5636  y2021
## 5637  y2021
## 5638  y2021
## 5639  y2021
## 5640  y2021
## 5641  y2021
## 5642  y2021
## 5643  y2021
## 5644  y2021
## 5645  y2021
## 5646  y2021
## 5647  y2021
## 5648  y2021
## 5649  y2021
## 5650  y2021
## 5651  y2021
## 5652  y2021
## 5653  y2021
## 5654  y2021
## 5655  y2021
## 5656  y2021
## 5657  y2021
## 5658  y2021
## 5659  y2021
## 5660  y2021
## 5661  y2021
## 5662  y2021
## 5663  y2021
## 5664  y2021
## 5665  y2021
## 5666  y2021
## 5667  y2021
## 5668  y2021
## 5669  y2021
## 5670  y2021
## 5671  y2021
## 5672  y2021
## 5673  y2021
## 5674  y2021
## 5675  y2021
## 5676  y2021
## 5677  y2021
## 5678  y2021
## 5679  y2021
## 5680  y2021
## 5681  y2021
## 5682  y2021
## 5683  y2021
## 5684  y2021
## 5685  y2021
## 5686  y2021
## 5687  y2021
## 5688  y2021
## 5689  y2021
## 5690  y2021
## 5691  y2021
## 5692  y2021
## 5693  y2021
## 5694  y2021
## 5695  y2021
## 5696  y2021
## 5697  y2021
## 5698  y2021
## 5699  y2021
## 5700  y2021
## 5701  y2021
## 5702  y2021
## 5703  y2021
## 5704  y2021
## 5705  y2021
## 5706  y2021
## 5707  y2021
## 5708  y2021
## 5709  y2021
## 5710  y2021
## 5711  y2021
## 5712  y2021
## 5713  y2021
## 5714  y2021
## 5715  y2021
## 5716  y2021
## 5717  y2021
## 5718  y2021
## 5719  y2021
## 5720  y2021
## 5721  y2021
## 5722  y2021
## 5723  y2021
## 5724  y2021
## 5725  y2021
## 5726  y2021
## 5727  y2021
## 5728  y2021
## 5729  y2021
## 5730  y2021
## 5731  y2021
## 5732  y2021
## 5733  y2021
## 5734  y2021
## 5735  y2021
## 5736  y2021
## 5737  y2021
## 5738  y2021
## 5739  y2021
## 5740  y2021
## 5741  y2021
## 5742  y2021
## 5743  y2021
## 5744  y2021
## 5745  y2021
## 5746  y2021
## 5747  y2021
## 5748  y2021
## 5749  y2021
## 5750  y2021
## 5751  y2021
## 5752  y2021
## 5753  y2021
## 5754  y2021
## 5755  y2021
## 5756  y2021
## 5757  y2021
## 5758  y2021
## 5759  y2021
## 5760  y2021
## 5761  y2021
## 5762  y2021
## 5763  y2021
## 5764  y2021
## 5765  y2021
## 5766  y2021
## 5767  y2021
## 5768  y2021
## 5769  y2021
## 5770  y2021
## 5771  y2021
## 5772  y2021
## 5773  y2021
## 5774  y2021
## 5775  y2021
## 5776  y2021
## 5777  y2021
## 5778  y2021
## 5779  y2021
## 5780  y2021
## 5781  y2021
## 5782  y2021
## 5783  y2021
## 5784  y2021
## 5785  y2021
## 5786  y2021
## 5787  y2021
## 5788  y2021
## 5789  y2021
## 5790  y2021
## 5791  y2021
## 5792  y2021
## 5793  y2021
## 5794  y2021
## 5795  y2021
## 5796  y2021
## 5797  y2021
## 5798  y2021
## 5799  y2021
## 5800  y2021
## 5801  y2021
## 5802  y2021
## 5803  y2021
## 5804  y2021
## 5805  y2021
## 5806  y2021
## 5807  y2021
## 5808  y2021
## 5809  y2021
## 5810  y2021
## 5811  y2021
## 5812  y2021
## 5813  y2021
## 5814  y2021
## 5815  y2021
## 5816  y2021
## 5817  y2021
## 5818  y2021
## 5819  y2021
## 5820  y2021
## 5821  y2021
## 5822  y2021
## 5823  y2021
## 5824  y2021
## 5825  y2021
## 5826  y2021
## 5827  y2021
## 5828  y2021
## 5829  y2021
## 5830  y2021
## 5831  y2021
## 5832  y2021
## 5833  y2021
## 5834  y2021
## 5835  y2021
## 5836  y2021
## 5837  y2021
## 5838  y2021
## 5839  y2021
## 5840  y2021
## 5841  y2021
## 5842  y2022
## 5843  y2022
## 5844  y2022
## 5845  y2022
## 5846  y2022
## 5847  y2022
## 5848  y2022
## 5849  y2022
## 5850  y2022
## 5851  y2022
## 5852  y2022
## 5853  y2022
## 5854  y2022
## 5855  y2022
## 5856  y2022
## 5857  y2022
## 5858  y2022
## 5859  y2022
## 5860  y2022
## 5861  y2022
## 5862  y2022
## 5863  y2022
## 5864  y2022
## 5865  y2022
## 5866  y2022
## 5867  y2022
## 5868  y2022
## 5869  y2022
## 5870  y2022
## 5871  y2022
## 5872  y2022
## 5873  y2022
## 5874  y2022
## 5875  y2022
## 5876  y2022
## 5877  y2022
## 5878  y2022
## 5879  y2022
## 5880  y2022
## 5881  y2022
## 5882  y2022
## 5883  y2022
## 5884  y2022
## 5885  y2022
## 5886  y2022
## 5887  y2022
## 5888  y2022
## 5889  y2022
## 5890  y2022
## 5891  y2022
## 5892  y2022
## 5893  y2022
## 5894  y2022
## 5895  y2022
## 5896  y2022
## 5897  y2022
## 5898  y2022
## 5899  y2022
## 5900  y2022
## 5901  y2022
## 5902  y2022
## 5903  y2022
## 5904  y2022
## 5905  y2022
## 5906  y2022
## 5907  y2022
## 5908  y2022
## 5909  y2022
## 5910  y2022
## 5911  y2022
## 5912  y2022
## 5913  y2022
## 5914  y2022
## 5915  y2022
## 5916  y2022
## 5917  y2022
## 5918  y2022
## 5919  y2022
## 5920  y2022
## 5921  y2022
## 5922  y2022
## 5923  y2022
## 5924  y2022
## 5925  y2022
## 5926  y2022
## 5927  y2022
## 5928  y2022
## 5929  y2022
## 5930  y2022
## 5931  y2022
## 5932  y2022
## 5933  y2022
## 5934  y2022
## 5935  y2022
## 5936  y2022
## 5937  y2022
## 5938  y2022
## 5939  y2022
## 5940  y2022
## 5941  y2022
## 5942  y2022
## 5943  y2022
## 5944  y2022
## 5945  y2022
## 5946  y2022
## 5947  y2022
## 5948  y2022
## 5949  y2022
## 5950  y2022
## 5951  y2022
## 5952  y2022
## 5953  y2022
## 5954  y2022
## 5955  y2022
## 5956  y2022
## 5957  y2022
## 5958  y2022
## 5959  y2022
## 5960  y2022
## 5961  y2022
## 5962  y2022
## 5963  y2022
## 5964  y2022
## 5965  y2022
## 5966  y2022
## 5967  y2022
## 5968  y2022
## 5969  y2022
## 5970  y2022
## 5971  y2022
## 5972  y2022
## 5973  y2022
## 5974  y2022
## 5975  y2022
## 5976  y2022
## 5977  y2022
## 5978  y2022
## 5979  y2022
## 5980  y2022
## 5981  y2022
## 5982  y2022
## 5983  y2022
## 5984  y2022
## 5985  y2022
## 5986  y2022
## 5987  y2022
## 5988  y2022
## 5989  y2022
## 5990  y2022
## 5991  y2022
## 5992  y2022
## 5993  y2022
## 5994  y2022
## 5995  y2022
## 5996  y2022
## 5997  y2022
## 5998  y2022
## 5999  y2022
## 6000  y2022
## 6001  y2022
## 6002  y2022
## 6003  y2022
## 6004  y2022
## 6005  y2022
## 6006  y2022
## 6007  y2022
## 6008  y2022
## 6009  y2022
## 6010  y2022
## 6011  y2022
## 6012  y2022
## 6013  y2022
## 6014  y2022
## 6015  y2022
## 6016  y2022
## 6017  y2022
## 6018  y2022
## 6019  y2022
## 6020  y2022
## 6021  y2022
## 6022  y2022
## 6023  y2022
## 6024  y2022
## 6025  y2022
## 6026  y2022
## 6027  y2022
## 6028  y2022
## 6029  y2022
## 6030  y2022
## 6031  y2022
## 6032  y2022
## 6033  y2022
## 6034  y2022
## 6035  y2022
## 6036  y2022
## 6037  y2022
## 6038  y2022
## 6039  y2022
## 6040  y2022
## 6041  y2022
## 6042  y2022
## 6043  y2022
## 6044  y2022
## 6045  y2022
## 6046  y2022
## 6047  y2022
## 6048  y2022
## 6049  y2022
## 6050  y2022
## 6051  y2022
## 6052  y2022
## 6053  y2022
## 6054  y2022
## 6055  y2022
## 6056  y2022
## 6057  y2022
## 6058  y2022
## 6059  y2022
## 6060  y2022
## 6061  y2022
## 6062  y2022
## 6063  y2022
## 6064  y2022
## 6065  y2022
## 6066  y2022
## 6067  y2022
## 6068  y2022
## 6069  y2022
## 6070  y2022
## 6071  y2022
## 6072  y2022
## 6073  y2022
## 6074  y2022
## 6075  y2022
## 6076  y2022
## 6077  y2020
## 6078  y2020
## 6079  y2020
## 6080  y2020
## 6081  y2020
## 6082  y2020
## 6083  y2020
## 6084  y2020
## 6085  y2020
## 6086  y2020
## 6087  y2020
## 6088  y2020
## 6089  y2020
## 6090  y2020
## 6091  y2020
## 6092  y2020
## 6093  y2020
## 6094  y2020
## 6095  y2020
## 6096  y2020
## 6097  y2020
## 6098  y2020
## 6099  y2020
## 6100  y2020
## 6101  y2020
## 6102  y2020
## 6103  y2020
## 6104  y2020
## 6105  y2020
## 6106  y2020
## 6107  y2020
## 6108  y2020
## 6109  y2020
## 6110  y2020
## 6111  y2020
## 6112  y2020
## 6113  y2020
## 6114  y2020
## 6115  y2020
## 6116  y2020
## 6117  y2020
## 6118  y2020
## 6119  y2020
## 6120  y2020
## 6121  y2020
## 6122  y2020
## 6123  y2020
## 6124  y2020
## 6125  y2020
## 6126  y2020
## 6127  y2020
## 6128  y2020
## 6129  y2020
## 6130  y2020
## 6131  y2020
## 6132  y2020
## 6133  y2020
## 6134  y2020
## 6135  y2020
## 6136  y2020
## 6137  y2020
## 6138  y2020
## 6139  y2020
## 6140  y2020
## 6141  y2020
## 6142  y2020
## 6143  y2020
## 6144  y2020
## 6145  y2020
## 6146  y2020
## 6147  y2020
## 6148  y2020
## 6149  y2020
## 6150  y2020
## 6151  y2020
## 6152  y2020
## 6153  y2020
## 6154  y2020
## 6155  y2020
## 6156  y2020
## 6157  y2020
## 6158  y2020
## 6159  y2020
## 6160  y2020
## 6161  y2020
## 6162  y2020
## 6163  y2020
## 6164  y2020
## 6165  y2020
## 6166  y2020
## 6167  y2020
## 6168  y2020
## 6169  y2020
## 6170  y2020
## 6171  y2020
## 6172  y2020
## 6173  y2020
## 6174  y2020
## 6175  y2020
## 6176  y2020
## 6177  y2020
## 6178  y2020
## 6179  y2020
## 6180  y2020
## 6181  y2020
## 6182  y2020
## 6183  y2020
## 6184  y2020
## 6185  y2020
## 6186  y2020
## 6187  y2020
## 6188  y2020
## 6189  y2020
## 6190  y2020
## 6191  y2020
## 6192  y2020
## 6193  y2020
## 6194  y2020
## 6195  y2020
## 6196  y2020
## 6197  y2020
## 6198  y2020
## 6199  y2020
## 6200  y2020
## 6201  y2020
## 6202  y2020
## 6203  y2020
## 6204  y2020
## 6205  y2020
## 6206  y2020
## 6207  y2020
## 6208  y2020
## 6209  y2020
## 6210  y2020
## 6211  y2020
## 6212  y2020
## 6213  y2020
## 6214  y2020
## 6215  y2020
## 6216  y2020
## 6217  y2020
## 6218  y2020
## 6219  y2020
## 6220  y2020
## 6221  y2020
## 6222  y2020
## 6223  y2020
## 6224  y2020
## 6225  y2020
## 6226  y2020
## 6227  y2020
## 6228  y2020
## 6229  y2020
## 6230  y2020
## 6231  y2020
## 6232  y2020
## 6233  y2020
## 6234  y2020
## 6235  y2020
## 6236  y2020
## 6237  y2020
## 6238  y2020
## 6239  y2020
## 6240  y2020
## 6241  y2020
## 6242  y2020
## 6243  y2020
## 6244  y2020
## 6245  y2020
## 6246  y2020
## 6247  y2020
## 6248  y2020
## 6249  y2020
## 6250  y2020
## 6251  y2020
## 6252  y2020
## 6253  y2020
## 6254  y2020
## 6255  y2020
## 6256  y2020
## 6257  y2020
## 6258  y2020
## 6259  y2020
## 6260  y2020
## 6261  y2020
## 6262  y2020
## 6263  y2020
## 6264  y2020
## 6265  y2020
## 6266  y2020
## 6267  y2020
## 6268  y2020
## 6269  y2020
## 6270  y2020
## 6271  y2020
## 6272  y2020
## 6273  y2020
## 6274  y2020
## 6275  y2020
## 6276  y2020
## 6277  y2020
## 6278  y2020
## 6279  y2020
## 6280  y2020
## 6281  y2020
## 6282  y2020
## 6283  y2020
## 6284  y2020
## 6285  y2020
## 6286  y2020
## 6287  y2020
## 6288  y2020
## 6289  y2020
## 6290  y2020
## 6291  y2020
## 6292  y2020
## 6293  y2020
## 6294  y2020
## 6295  y2020
## 6296  y2020
## 6297  y2020
## 6298  y2020
## 6299  y2020
## 6300  y2020
## 6301  y2020
## 6302  y2020
## 6303  y2020
## 6304  y2020
## 6305  y2020
## 6306  y2020
## 6307  y2020
## 6308  y2020
## 6309  y2020
## 6310  y2020
## 6311  y2020
## 6312  y2020
## 6313  y2020
## 6314  y2020
## 6315  y2020
## 6316  y2020
## 6317  y2020
## 6318  y2020
## 6319  y2020
## 6320  y2020
## 6321  y2020
## 6322  y2020
## 6323  y2020
## 6324  y2020
## 6325  y2020
## 6326  y2020
## 6327  y2020
## 6328  y2020
## 6329  y2020
## 6330  y2020
## 6331  y2020
## 6332  y2020
## 6333  y2020
## 6334  y2020
## 6335  y2020
## 6336  y2020
## 6337  y2020
## 6338  y2020
## 6339  y2020
## 6340  y2020
## 6341  y2020
## 6342  y2020
## 6343  y2020
## 6344  y2020
## 6345  y2020
## 6346  y2020
## 6347  y2020
## 6348  y2020
## 6349  y2020
## 6350  y2020
## 6351  y2020
## 6352  y2020
## 6353  y2020
## 6354  y2020
## 6355  y2020
## 6356  y2020
## 6357  y2020
## 6358  y2020
## 6359  y2020
## 6360  y2020
## 6361  y2020
## 6362  y2020
## 6363  y2020
## 6364  y2020
## 6365  y2020
## 6366  y2020
## 6367  y2020
## 6368  y2020
## 6369  y2020
## 6370  y2020
## 6371  y2020
## 6372  y2020
## 6373  y2020
## 6374  y2020
## 6375  y2020
## 6376  y2020
## 6377  y2020
## 6378  y2020
## 6379  y2020
## 6380  y2020
## 6381  y2020
## 6382  y2020
## 6383  y2020
## 6384  y2020
## 6385  y2020
## 6386  y2020
## 6387  y2020
## 6388  y2020
## 6389  y2020
## 6390  y2020
## 6391  y2020
## 6392  y2020
## 6393  y2020
## 6394  y2020
## 6395  y2020
## 6396  y2020
## 6397  y2020
## 6398  y2020
## 6399  y2020
## 6400  y2020
## 6401  y2020
## 6402  y2020
## 6403  y2020
## 6404  y2020
## 6405  y2020
## 6406  y2020
## 6407  y2020
## 6408  y2020
## 6409  y2020
## 6410  y2020
## 6411  y2020
## 6412  y2020
## 6413  y2020
## 6414  y2020
## 6415  y2020
## 6416  y2020
## 6417  y2020
## 6418  y2020
## 6419  y2020
## 6420  y2020
## 6421  y2020
## 6422  y2020
## 6423  y2020
## 6424  y2020
## 6425  y2020
## 6426  y2020
## 6427  y2020
## 6428  y2020
## 6429  y2020
## 6430  y2020
## 6431  y2020
## 6432  y2020
## 6433  y2020
## 6434  y2020
## 6435  y2020
## 6436  y2020
## 6437  y2020
## 6438  y2020
## 6439  y2020
## 6440  y2020
## 6441  y2020
## 6442  y2020
## 6443  y2020
## 6444  y2020
## 6445  y2020
## 6446  y2020
## 6447  y2020
## 6448  y2020
## 6449  y2020
## 6450  y2020
## 6451  y2020
## 6452  y2020
## 6453  y2020
## 6454  y2020
## 6455  y2020
## 6456  y2020
## 6457  y2020
## 6458  y2020
## 6459  y2020
## 6460  y2020
## 6461  y2020
## 6462  y2020
## 6463  y2020
## 6464  y2020
## 6465  y2020
## 6466  y2020
## 6467  y2020
## 6468  y2020
## 6469  y2020
## 6470  y2020
## 6471  y2020
## 6472  y2020
## 6473  y2020
## 6474  y2020
## 6475  y2020
## 6476  y2020
## 6477  y2020
## 6478  y2020
## 6479  y2020
## 6480  y2020
## 6481  y2020
## 6482  y2020
## 6483  y2020
## 6484  y2020
## 6485  y2020
## 6486  y2020
## 6487  y2020
## 6488  y2020
## 6489  y2020
## 6490  y2020
## 6491  y2020
## 6492  y2020
## 6493  y2020
## 6494  y2020
## 6495  y2020
## 6496  y2020
## 6497  y2020
## 6498  y2020
## 6499  y2020
## 6500  y2020
## 6501  y2020
## 6502  y2020
## 6503  y2020
## 6504  y2020
## 6505  y2020
## 6506  y2020
## 6507  y2020
## 6508  y2020
## 6509  y2020
## 6510  y2020
## 6511  y2020
## 6512  y2020
## 6513  y2020
## 6514  y2020
## 6515  y2020
## 6516  y2020
## 6517  y2020
## 6518  y2020
## 6519  y2020
## 6520  y2020
## 6521  y2020
## 6522  y2020
## 6523  y2020
## 6524  y2020
## 6525  y2020
## 6526  y2020
## 6527  y2020
## 6528  y2020
## 6529  y2020
## 6530  y2020
## 6531  y2020
## 6532  y2020
## 6533  y2020
## 6534  y2020
## 6535  y2020
## 6536  y2020
## 6537  y2020
## 6538  y2020
## 6539  y2020
## 6540  y2020
## 6541  y2020
## 6542  y2020
## 6543  y2020
## 6544  y2020
## 6545  y2020
## 6546  y2020
## 6547  y2020
## 6548  y2020
## 6549  y2020
## 6550  y2020
## 6551  y2020
## 6552  y2020
## 6553  y2020
## 6554  y2020
## 6555  y2020
## 6556  y2020
## 6557  y2020
## 6558  y2020
## 6559  y2020
## 6560  y2020
## 6561  y2020
## 6562  y2020
## 6563  y2020
## 6564  y2020
## 6565  y2020
## 6566  y2020
## 6567  y2020
## 6568  y2020
## 6569  y2020
## 6570  y2020
## 6571  y2020
## 6572  y2020
## 6573  y2020
## 6574  y2020
## 6575  y2020
## 6576  y2020
## 6577  y2020
## 6578  y2020
## 6579  y2020
## 6580  y2020
## 6581  y2020
## 6582  y2020
## 6583  y2020
## 6584  y2020
## 6585  y2020
## 6586  y2020
## 6587  y2020
## 6588  y2020
## 6589  y2020
## 6590  y2020
## 6591  y2020
## 6592  y2020
## 6593  y2020
## 6594  y2020
## 6595  y2020
## 6596  y2020
## 6597  y2020
## 6598  y2020
## 6599  y2020
## 6600  y2020
## 6601  y2020
## 6602  y2020
## 6603  y2020
## 6604  y2020
## 6605  y2020
## 6606  y2020
## 6607  y2020
## 6608  y2020
## 6609  y2020
## 6610  y2020
## 6611  y2020
## 6612  y2020
## 6613  y2020
## 6614  y2020
## 6615  y2020
## 6616  y2020
## 6617  y2020
## 6618  y2020
## 6619  y2020
## 6620  y2020
## 6621  y2020
## 6622  y2020
## 6623  y2020
## 6624  y2020
## 6625  y2020
## 6626  y2020
## 6627  y2020
## 6628  y2020
## 6629  y2020
## 6630  y2020
## 6631  y2020
## 6632  y2020
## 6633  y2020
## 6634  y2020
## 6635  y2020
## 6636  y2020
## 6637  y2020
## 6638  y2020
## 6639  y2020
## 6640  y2020
## 6641  y2020
## 6642  y2020
## 6643  y2020
## 6644  y2020
## 6645  y2020
## 6646  y2020
## 6647  y2020
## 6648  y2020
## 6649  y2020
## 6650  y2020
## 6651  y2020
## 6652  y2020
## 6653  y2020
## 6654  y2020
## 6655  y2020
## 6656  y2020
## 6657  y2020
## 6658  y2020
## 6659  y2020
## 6660  y2020
## 6661  y2020
## 6662  y2020
## 6663  y2020
## 6664  y2020
## 6665  y2020
## 6666  y2020
## 6667  y2020
## 6668  y2020
## 6669  y2020
## 6670  y2020
## 6671  y2020
## 6672  y2020
## 6673  y2020
## 6674  y2020
## 6675  y2020
## 6676  y2020
## 6677  y2020
## 6678  y2020
## 6679  y2020
## 6680  y2020
## 6681  y2020
## 6682  y2020
## 6683  y2020
## 6684  y2020
## 6685  y2020
## 6686  y2020
## 6687  y2020
## 6688  y2020
## 6689  y2020
## 6690  y2020
## 6691  y2020
## 6692  y2020
## 6693  y2020
## 6694  y2020
## 6695  y2020
## 6696  y2020
## 6697  y2020
## 6698  y2020
## 6699  y2020
## 6700  y2020
## 6701  y2020
## 6702  y2020
## 6703  y2020
## 6704  y2020
## 6705  y2020
## 6706  y2020
## 6707  y2020
## 6708  y2020
## 6709  y2020
## 6710  y2020
## 6711  y2020
## 6712  y2020
## 6713  y2020
## 6714  y2020
## 6715  y2020
## 6716  y2020
## 6717  y2020
## 6718  y2020
## 6719  y2020
## 6720  y2020
## 6721  y2020
## 6722  y2020
## 6723  y2020
## 6724  y2020
## 6725  y2020
## 6726  y2020
## 6727  y2020
## 6728  y2020
## 6729  y2020
## 6730  y2020
## 6731  y2020
## 6732  y2020
## 6733  y2020
## 6734  y2020
## 6735  y2020
## 6736  y2020
## 6737  y2020
## 6738  y2020
## 6739  y2020
## 6740  y2020
## 6741  y2020
## 6742  y2020
## 6743  y2020
## 6744  y2020
## 6745  y2020
## 6746  y2020
## 6747  y2020
## 6748  y2020
## 6749  y2020
## 6750  y2020
## 6751  y2020
## 6752  y2020
## 6753  y2020
## 6754  y2020
## 6755  y2020
## 6756  y2020
## 6757  y2020
## 6758  y2020
## 6759  y2020
## 6760  y2020
## 6761  y2020
## 6762  y2020
## 6763  y2020
## 6764  y2020
## 6765  y2020
## 6766  y2020
## 6767  y2020
## 6768  y2020
## 6769  y2020
## 6770  y2020
## 6771  y2020
## 6772  y2020
## 6773  y2020
## 6774  y2020
## 6775  y2020
## 6776  y2020
## 6777  y2020
## 6778  y2020
## 6779  y2020
## 6780  y2020
## 6781  y2020
## 6782  y2020
## 6783  y2020
## 6784  y2020
## 6785  y2020
## 6786  y2020
## 6787  y2020
## 6788  y2020
## 6789  y2020
## 6790  y2020
## 6791  y2020
## 6792  y2020
## 6793  y2020
## 6794  y2020
## 6795  y2020
## 6796  y2020
## 6797  y2020
## 6798  y2020
## 6799  y2020
## 6800  y2020
## 6801  y2020
## 6802  y2020
## 6803  y2020
## 6804  y2020
## 6805  y2020
## 6806  y2020
## 6807  y2020
## 6808  y2020
## 6809  y2020
## 6810  y2020
## 6811  y2020
## 6812  y2020
## 6813  y2020
## 6814  y2020
## 6815  y2020
## 6816  y2020
## 6817  y2020
## 6818  y2020
## 6819  y2020
## 6820  y2020
## 6821  y2020
## 6822  y2020
## 6823  y2020
## 6824  y2020
## 6825  y2020
## 6826  y2020
## 6827  y2020
## 6828  y2020
## 6829  y2020
## 6830  y2020
## 6831  y2020
## 6832  y2020
## 6833  y2020
## 6834  y2020
## 6835  y2020
## 6836  y2020
## 6837  y2020
## 6838  y2020
## 6839  y2020
## 6840  y2020
## 6841  y2020
## 6842  y2020
## 6843  y2020
## 6844  y2020
## 6845  y2020
## 6846  y2020
## 6847  y2020
## 6848  y2020
## 6849  y2020
## 6850  y2020
## 6851  y2020
## 6852  y2020
## 6853  y2020
## 6854  y2020
## 6855  y2020
## 6856  y2020
## 6857  y2020
## 6858  y2020
## 6859  y2020
## 6860  y2020
## 6861  y2020
## 6862  y2020
## 6863  y2020
## 6864  y2020
## 6865  y2020
## 6866  y2020
## 6867  y2020
## 6868  y2020
## 6869  y2020
## 6870  y2020
## 6871  y2020
## 6872  y2020
## 6873  y2020
## 6874  y2020
## 6875  y2020
## 6876  y2020
## 6877  y2020
## 6878  y2020
## 6879  y2020
## 6880  y2020
## 6881  y2020
## 6882  y2020
## 6883  y2020
## 6884  y2020
## 6885  y2020
## 6886  y2020
## 6887  y2020
## 6888  y2020
## 6889  y2020
## 6890  y2020
## 6891  y2020
## 6892  y2020
## 6893  y2020
## 6894  y2020
## 6895  y2020
## 6896  y2020
## 6897  y2020
## 6898  y2020
## 6899  y2020
## 6900  y2020
## 6901  y2020
## 6902  y2020
## 6903  y2020
## 6904  y2020
## 6905  y2020
## 6906  y2020
## 6907  y2020
## 6908  y2020
## 6909  y2020
## 6910  y2020
## 6911  y2020
## 6912  y2020
## 6913  y2020
## 6914  y2020
## 6915  y2020
## 6916  y2020
## 6917  y2020
## 6918  y2020
## 6919  y2020
## 6920  y2020
## 6921  y2020
## 6922  y2020
## 6923  y2020
## 6924  y2020
## 6925  y2020
## 6926  y2020
## 6927  y2020
## 6928  y2020
## 6929  y2020
## 6930  y2020
## 6931  y2020
## 6932  y2020
## 6933  y2020
## 6934  y2020
## 6935  y2020
## 6936  y2020
## 6937  y2020
## 6938  y2020
## 6939  y2020
## 6940  y2020
## 6941  y2020
## 6942  y2020
## 6943  y2020
## 6944  y2020
## 6945  y2020
## 6946  y2020
## 6947  y2020
## 6948  y2020
## 6949  y2020
## 6950  y2020
## 6951  y2020
## 6952  y2020
## 6953  y2020
## 6954  y2020
## 6955  y2020
## 6956  y2020
## 6957  y2020
## 6958  y2020
## 6959  y2020
## 6960  y2020
## 6961  y2020
## 6962  y2020
## 6963  y2020
## 6964  y2020
## 6965  y2020
## 6966  y2020
## 6967  y2020
## 6968  y2020
## 6969  y2020
## 6970  y2020
## 6971  y2020
## 6972  y2020
## 6973  y2020
## 6974  y2020
## 6975  y2020
## 6976  y2020
## 6977  y2020
## 6978  y2020
## 6979  y2020
## 6980  y2020
## 6981  y2020
## 6982  y2020
## 6983  y2020
## 6984  y2020
## 6985  y2020
## 6986  y2020
## 6987  y2020
## 6988  y2020
## 6989  y2020
## 6990  y2020
## 6991  y2020
## 6992  y2020
## 6993  y2020
## 6994  y2020
## 6995  y2020
## 6996  y2020
## 6997  y2020
## 6998  y2020
## 6999  y2020
## 7000  y2020
## 7001  y2020
## 7002  y2020
## 7003  y2020
## 7004  y2020
## 7005  y2020
## 7006  y2020
## 7007  y2020
## 7008  y2020
## 7009  y2020
## 7010  y2020
## 7011  y2020
## 7012  y2020
## 7013  y2020
## 7014  y2020
## 7015  y2020
## 7016  y2020
## 7017  y2020
## 7018  y2020
## 7019  y2020
## 7020  y2020
## 7021  y2020
## 7022  y2020
## 7023  y2020
## 7024  y2020
## 7025  y2020
## 7026  y2020
## 7027  y2020
## 7028  y2020
## 7029  y2020
## 7030  y2020
## 7031  y2020
## 7032  y2020
## 7033  y2020
## 7034  y2020
## 7035  y2020
## 7036  y2020
## 7037  y2020
## 7038  y2020
## 7039  y2020
## 7040  y2020
## 7041  y2020
## 7042  y2020
## 7043  y2020
## 7044  y2020
## 7045  y2020
## 7046  y2020
## 7047  y2020
## 7048  y2020
## 7049  y2020
## 7050  y2020
## 7051  y2020
## 7052  y2020
## 7053  y2020
## 7054  y2020
## 7055  y2020
## 7056  y2020
## 7057  y2020
## 7058  y2020
## 7059  y2020
## 7060  y2020
## 7061  y2020
## 7062  y2020
## 7063  y2020
## 7064  y2020
## 7065  y2020
## 7066  y2020
## 7067  y2020
## 7068  y2020
## 7069  y2020
## 7070  y2020
## 7071  y2020
## 7072  y2020
## 7073  y2020
## 7074  y2020
## 7075  y2020
## 7076  y2020
## 7077  y2020
## 7078  y2020
## 7079  y2020
## 7080  y2020
## 7081  y2020
## 7082  y2020
## 7083  y2020
## 7084  y2020
## 7085  y2020
## 7086  y2020
## 7087  y2020
## 7088  y2020
## 7089  y2020
## 7090  y2020
## 7091  y2020
## 7092  y2020
## 7093  y2020
## 7094  y2020
## 7095  y2020
## 7096  y2020
## 7097  y2020
## 7098  y2020
## 7099  y2020
## 7100  y2020
## 7101  y2020
## 7102  y2020
## 7103  y2020
## 7104  y2020
## 7105  y2020
## 7106  y2020
## 7107  y2020
## 7108  y2020
## 7109  y2020
## 7110  y2020
## 7111  y2020
## 7112  y2020
## 7113  y2020
## 7114  y2020
## 7115  y2020
## 7116  y2020
## 7117  y2020
## 7118  y2020
## 7119  y2020
## 7120  y2020
## 7121  y2020
## 7122  y2020
## 7123  y2020
## 7124  y2020
## 7125  y2020
## 7126  y2020
## 7127  y2020
## 7128  y2020
## 7129  y2020
## 7130  y2020
## 7131  y2020
## 7132  y2020
## 7133  y2020
## 7134  y2020
## 7135  y2020
## 7136  y2021
## 7137  y2021
## 7138  y2021
## 7139  y2021
## 7140  y2021
## 7141  y2021
## 7142  y2021
## 7143  y2021
## 7144  y2021
## 7145  y2021
## 7146  y2021
## 7147  y2021
## 7148  y2021
## 7149  y2021
## 7150  y2021
## 7151  y2021
## 7152  y2021
## 7153  y2021
## 7154  y2021
## 7155  y2021
## 7156  y2021
## 7157  y2021
## 7158  y2021
## 7159  y2021
## 7160  y2021
## 7161  y2021
## 7162  y2021
## 7163  y2021
## 7164  y2021
## 7165  y2021
## 7166  y2021
## 7167  y2021
## 7168  y2021
## 7169  y2021
## 7170  y2021
## 7171  y2021
## 7172  y2021
## 7173  y2021
## 7174  y2021
## 7175  y2021
## 7176  y2021
## 7177  y2021
## 7178  y2021
## 7179  y2021
## 7180  y2021
## 7181  y2021
## 7182  y2021
## 7183  y2021
## 7184  y2021
## 7185  y2021
## 7186  y2021
## 7187  y2021
## 7188  y2021
## 7189  y2021
## 7190  y2021
## 7191  y2021
## 7192  y2021
## 7193  y2021
## 7194  y2021
## 7195  y2021
## 7196  y2021
## 7197  y2021
## 7198  y2021
## 7199  y2021
## 7200  y2021
## 7201  y2021
## 7202  y2021
## 7203  y2021
## 7204  y2021
## 7205  y2021
## 7206  y2021
## 7207  y2021
## 7208  y2021
## 7209  y2021
## 7210  y2021
## 7211  y2021
## 7212  y2021
## 7213  y2021
## 7214  y2021
## 7215  y2021
## 7216  y2021
## 7217  y2021
## 7218  y2021
## 7219  y2021
## 7220  y2021
## 7221  y2021
## 7222  y2021
## 7223  y2021
## 7224  y2021
## 7225  y2021
## 7226  y2021
## 7227  y2021
## 7228  y2021
## 7229  y2021
## 7230  y2021
## 7231  y2021
## 7232  y2021
## 7233  y2021
## 7234  y2021
## 7235  y2021
## 7236  y2021
## 7237  y2021
## 7238  y2021
## 7239  y2021
## 7240  y2021
## 7241  y2021
## 7242  y2021
## 7243  y2021
## 7244  y2021
## 7245  y2021
## 7246  y2021
## 7247  y2021
## 7248  y2021
## 7249  y2021
## 7250  y2021
## 7251  y2021
## 7252  y2021
## 7253  y2021
## 7254  y2021
## 7255  y2021
## 7256  y2021
## 7257  y2021
## 7258  y2021
## 7259  y2021
## 7260  y2021
## 7261  y2021
## 7262  y2021
## 7263  y2021
## 7264  y2021
## 7265  y2021
## 7266  y2021
## 7267  y2021
## 7268  y2021
## 7269  y2021
## 7270  y2021
## 7271  y2021
## 7272  y2021
## 7273  y2021
## 7274  y2021
## 7275  y2021
## 7276  y2021
## 7277  y2021
## 7278  y2021
## 7279  y2021
## 7280  y2021
## 7281  y2021
## 7282  y2021
## 7283  y2021
## 7284  y2021
## 7285  y2021
## 7286  y2021
## 7287  y2021
## 7288  y2021
## 7289  y2021
## 7290  y2021
## 7291  y2021
## 7292  y2021
## 7293  y2021
## 7294  y2021
## 7295  y2021
## 7296  y2021
## 7297  y2021
## 7298  y2021
## 7299  y2021
## 7300  y2021
## 7301  y2021
## 7302  y2021
## 7303  y2021
## 7304  y2021
## 7305  y2021
## 7306  y2021
## 7307  y2021
## 7308  y2021
## 7309  y2021
## 7310  y2021
## 7311  y2021
## 7312  y2021
## 7313  y2021
## 7314  y2021
## 7315  y2021
## 7316  y2021
## 7317  y2021
## 7318  y2021
## 7319  y2021
## 7320  y2021
## 7321  y2021
## 7322  y2021
## 7323  y2021
## 7324  y2021
## 7325  y2021
## 7326  y2021
## 7327  y2021
## 7328  y2021
## 7329  y2021
## 7330  y2021
## 7331  y2021
## 7332  y2021
## 7333  y2021
## 7334  y2021
## 7335  y2021
## 7336  y2021
## 7337  y2021
## 7338  y2021
## 7339  y2021
## 7340  y2021
## 7341  y2021
## 7342  y2021
## 7343  y2021
## 7344  y2021
## 7345  y2021
## 7346  y2021
## 7347  y2021
## 7348  y2021
## 7349  y2021
## 7350  y2021
## 7351  y2021
## 7352  y2021
## 7353  y2021
## 7354  y2021
## 7355  y2021
## 7356  y2021
## 7357  y2021
## 7358  y2021
## 7359  y2021
## 7360  y2021
## 7361  y2021
## 7362  y2021
## 7363  y2021
## 7364  y2021
## 7365  y2021
## 7366  y2021
## 7367  y2021
## 7368  y2021
## 7369  y2021
## 7370  y2021
## 7371  y2021
## 7372  y2021
## 7373  y2021
## 7374  y2021
## 7375  y2021
## 7376  y2021
## 7377  y2021
## 7378  y2021
## 7379  y2021
## 7380  y2021
## 7381  y2021
## 7382  y2021
## 7383  y2021
## 7384  y2021
## 7385  y2021
## 7386  y2021
## 7387  y2021
## 7388  y2021
## 7389  y2021
## 7390  y2021
## 7391  y2021
## 7392  y2021
## 7393  y2021
## 7394  y2021
## 7395  y2021
## 7396  y2021
## 7397  y2021
## 7398  y2021
## 7399  y2021
## 7400  y2021
## 7401  y2021
## 7402  y2021
## 7403  y2021
## 7404  y2021
## 7405  y2021
## 7406  y2021
## 7407  y2021
## 7408  y2021
## 7409  y2021
## 7410  y2021
## 7411  y2021
## 7412  y2021
## 7413  y2021
## 7414  y2021
## 7415  y2021
## 7416  y2021
## 7417  y2021
## 7418  y2021
## 7419  y2021
## 7420  y2021
## 7421  y2021
## 7422  y2021
## 7423  y2021
## 7424  y2021
## 7425  y2021
## 7426  y2021
## 7427  y2021
## 7428  y2021
## 7429  y2021
## 7430  y2021
## 7431  y2021
## 7432  y2021
## 7433  y2021
## 7434  y2021
## 7435  y2021
## 7436  y2021
## 7437  y2021
## 7438  y2021
## 7439  y2021
## 7440  y2021
## 7441  y2021
## 7442  y2021
## 7443  y2021
## 7444  y2021
## 7445  y2021
## 7446  y2021
## 7447  y2021
## 7448  y2021
## 7449  y2021
## 7450  y2021
## 7451  y2021
## 7452  y2021
## 7453  y2021
## 7454  y2021
## 7455  y2021
## 7456  y2021
## 7457  y2021
## 7458  y2021
## 7459  y2021
## 7460  y2021
## 7461  y2021
## 7462  y2021
## 7463  y2021
## 7464  y2021
## 7465  y2021
## 7466  y2021
## 7467  y2021
## 7468  y2021
## 7469  y2021
## 7470  y2021
## 7471  y2021
## 7472  y2021
## 7473  y2021
## 7474  y2021
## 7475  y2021
## 7476  y2021
## 7477  y2021
## 7478  y2021
## 7479  y2021
## 7480  y2021
## 7481  y2021
## 7482  y2021
## 7483  y2021
## 7484  y2021
## 7485  y2021
## 7486  y2021
## 7487  y2021
## 7488  y2021
## 7489  y2021
## 7490  y2021
## 7491  y2021
## 7492  y2021
## 7493  y2021
## 7494  y2021
## 7495  y2021
## 7496  y2021
## 7497  y2021
## 7498  y2021
## 7499  y2021
## 7500  y2021
## 7501  y2021
## 7502  y2021
## 7503  y2021
## 7504  y2021
## 7505  y2021
## 7506  y2021
## 7507  y2021
## 7508  y2021
## 7509  y2021
## 7510  y2021
## 7511  y2021
## 7512  y2021
## 7513  y2021
## 7514  y2021
## 7515  y2021
## 7516  y2021
## 7517  y2021
## 7518  y2021
## 7519  y2021
## 7520  y2021
## 7521  y2021
## 7522  y2021
## 7523  y2021
## 7524  y2021
## 7525  y2021
## 7526  y2021
## 7527  y2021
## 7528  y2021
## 7529  y2021
## 7530  y2021
## 7531  y2021
## 7532  y2021
## 7533  y2021
## 7534  y2021
## 7535  y2021
## 7536  y2021
## 7537  y2021
## 7538  y2021
## 7539  y2021
## 7540  y2021
## 7541  y2021
## 7542  y2021
## 7543  y2021
## 7544  y2021
## 7545  y2021
## 7546  y2021
## 7547  y2021
## 7548  y2021
## 7549  y2021
## 7550  y2021
## 7551  y2021
## 7552  y2021
## 7553  y2021
## 7554  y2021
## 7555  y2021
## 7556  y2021
## 7557  y2021
## 7558  y2021
## 7559  y2021
## 7560  y2021
## 7561  y2021
## 7562  y2021
## 7563  y2021
## 7564  y2021
## 7565  y2021
## 7566  y2021
## 7567  y2021
## 7568  y2021
## 7569  y2021
## 7570  y2021
## 7571  y2021
## 7572  y2021
## 7573  y2021
## 7574  y2021
## 7575  y2021
## 7576  y2021
## 7577  y2021
## 7578  y2021
## 7579  y2021
## 7580  y2021
## 7581  y2021
## 7582  y2021
## 7583  y2021
## 7584  y2021
## 7585  y2021
## 7586  y2021
## 7587  y2021
## 7588  y2021
## 7589  y2021
## 7590  y2021
## 7591  y2021
## 7592  y2021
## 7593  y2021
## 7594  y2021
## 7595  y2021
## 7596  y2021
## 7597  y2021
## 7598  y2021
## 7599  y2021
## 7600  y2021
## 7601  y2021
## 7602  y2021
## 7603  y2021
## 7604  y2021
## 7605  y2021
## 7606  y2021
## 7607  y2021
## 7608  y2021
## 7609  y2021
## 7610  y2021
## 7611  y2021
## 7612  y2021
## 7613  y2021
## 7614  y2021
## 7615  y2021
## 7616  y2021
## 7617  y2021
## 7618  y2021
## 7619  y2021
## 7620  y2021
## 7621  y2021
## 7622  y2021
## 7623  y2021
## 7624  y2021
## 7625  y2021
## 7626  y2021
## 7627  y2021
## 7628  y2021
## 7629  y2021
## 7630  y2021
## 7631  y2021
## 7632  y2021
## 7633  y2021
## 7634  y2021
## 7635  y2021
## 7636  y2021
## 7637  y2021
## 7638  y2021
## 7639  y2021
## 7640  y2021
## 7641  y2021
## 7642  y2021
## 7643  y2021
## 7644  y2021
## 7645  y2021
## 7646  y2021
## 7647  y2021
## 7648  y2021
## 7649  y2021
## 7650  y2021
## 7651  y2021
## 7652  y2021
## 7653  y2021
## 7654  y2021
## 7655  y2021
## 7656  y2021
## 7657  y2021
## 7658  y2021
## 7659  y2021
## 7660  y2021
## 7661  y2021
## 7662  y2021
## 7663  y2021
## 7664  y2021
## 7665  y2021
## 7666  y2021
## 7667  y2021
## 7668  y2021
## 7669  y2021
## 7670  y2021
## 7671  y2021
## 7672  y2021
## 7673  y2021
## 7674  y2021
## 7675  y2021
## 7676  y2021
## 7677  y2021
## 7678  y2021
## 7679  y2021
## 7680  y2021
## 7681  y2021
## 7682  y2021
## 7683  y2021
## 7684  y2021
## 7685  y2021
## 7686  y2021
## 7687  y2021
## 7688  y2021
## 7689  y2021
## 7690  y2021
## 7691  y2021
## 7692  y2021
## 7693  y2021
## 7694  y2021
## 7695  y2021
## 7696  y2021
## 7697  y2021
## 7698  y2021
## 7699  y2021
## 7700  y2021
## 7701  y2021
## 7702  y2021
## 7703  y2021
## 7704  y2021
## 7705  y2021
## 7706  y2021
## 7707  y2021
## 7708  y2021
## 7709  y2021
## 7710  y2021
## 7711  y2021
## 7712  y2021
## 7713  y2021
## 7714  y2021
## 7715  y2021
## 7716  y2021
## 7717  y2021
## 7718  y2021
## 7719  y2021
## 7720  y2021
## 7721  y2021
## 7722  y2021
## 7723  y2021
## 7724  y2021
## 7725  y2021
## 7726  y2021
## 7727  y2021
## 7728  y2021
## 7729  y2021
## 7730  y2021
## 7731  y2021
## 7732  y2021
## 7733  y2021
## 7734  y2021
## 7735  y2021
## 7736  y2021
## 7737  y2021
## 7738  y2021
## 7739  y2021
## 7740  y2021
## 7741  y2021
## 7742  y2021
## 7743  y2021
## 7744  y2021
## 7745  y2021
## 7746  y2021
## 7747  y2021
## 7748  y2021
## 7749  y2021
## 7750  y2021
## 7751  y2021
## 7752  y2021
## 7753  y2021
## 7754  y2021
## 7755  y2021
## 7756  y2021
## 7757  y2021
## 7758  y2021
## 7759  y2021
## 7760  y2021
## 7761  y2021
## 7762  y2021
## 7763  y2021
## 7764  y2021
## 7765  y2021
## 7766  y2021
## 7767  y2021
## 7768  y2021
## 7769  y2021
## 7770  y2021
## 7771  y2021
## 7772  y2021
## 7773  y2021
## 7774  y2021
## 7775  y2021
## 7776  y2021
## 7777  y2021
## 7778  y2021
## 7779  y2021
## 7780  y2021
## 7781  y2021
## 7782  y2021
## 7783  y2021
## 7784  y2021
## 7785  y2021
## 7786  y2021
## 7787  y2021
## 7788  y2021
## 7789  y2021
## 7790  y2021
## 7791  y2021
## 7792  y2021
## 7793  y2021
## 7794  y2021
## 7795  y2021
## 7796  y2021
## 7797  y2021
## 7798  y2021
## 7799  y2021
## 7800  y2021
## 7801  y2021
## 7802  y2021
## 7803  y2021
## 7804  y2021
## 7805  y2021
## 7806  y2021
## 7807  y2021
## 7808  y2021
## 7809  y2021
## 7810  y2021
## 7811  y2021
## 7812  y2021
## 7813  y2021
## 7814  y2021
## 7815  y2021
## 7816  y2021
## 7817  y2021
## 7818  y2021
## 7819  y2021
## 7820  y2021
## 7821  y2021
## 7822  y2021
## 7823  y2021
## 7824  y2021
## 7825  y2021
## 7826  y2021
## 7827  y2021
## 7828  y2021
## 7829  y2021
## 7830  y2021
## 7831  y2021
## 7832  y2021
## 7833  y2021
## 7834  y2021
## 7835  y2021
## 7836  y2021
## 7837  y2021
## 7838  y2021
## 7839  y2021
## 7840  y2021
## 7841  y2021
## 7842  y2021
## 7843  y2021
## 7844  y2021
## 7845  y2021
## 7846  y2021
## 7847  y2021
## 7848  y2021
## 7849  y2021
## 7850  y2021
## 7851  y2021
## 7852  y2021
## 7853  y2021
## 7854  y2021
## 7855  y2021
## 7856  y2021
## 7857  y2021
## 7858  y2021
## 7859  y2021
## 7860  y2021
## 7861  y2021
## 7862  y2021
## 7863  y2021
## 7864  y2021
## 7865  y2021
## 7866  y2021
## 7867  y2021
## 7868  y2021
## 7869  y2021
## 7870  y2021
## 7871  y2021
## 7872  y2021
## 7873  y2021
## 7874  y2021
## 7875  y2021
## 7876  y2021
## 7877  y2021
## 7878  y2021
## 7879  y2021
## 7880  y2021
## 7881  y2021
## 7882  y2021
## 7883  y2021
## 7884  y2021
## 7885  y2021
## 7886  y2021
## 7887  y2021
## 7888  y2021
## 7889  y2021
## 7890  y2021
## 7891  y2021
## 7892  y2021
## 7893  y2021
## 7894  y2021
## 7895  y2021
## 7896  y2021
## 7897  y2021
## 7898  y2021
## 7899  y2021
## 7900  y2021
## 7901  y2021
## 7902  y2021
## 7903  y2021
## 7904  y2021
## 7905  y2021
## 7906  y2021
## 7907  y2021
## 7908  y2021
## 7909  y2021
## 7910  y2021
## 7911  y2021
## 7912  y2021
## 7913  y2021
## 7914  y2021
## 7915  y2021
## 7916  y2021
## 7917  y2021
## 7918  y2021
## 7919  y2021
## 7920  y2021
## 7921  y2021
## 7922  y2021
## 7923  y2021
## 7924  y2021
## 7925  y2021
## 7926  y2021
## 7927  y2021
## 7928  y2021
## 7929  y2021
## 7930  y2021
## 7931  y2021
## 7932  y2021
## 7933  y2021
## 7934  y2021
## 7935  y2021
## 7936  y2021
## 7937  y2021
## 7938  y2021
## 7939  y2021
## 7940  y2021
## 7941  y2021
## 7942  y2021
## 7943  y2021
## 7944  y2021
## 7945  y2021
## 7946  y2021
## 7947  y2021
## 7948  y2021
## 7949  y2021
## 7950  y2021
## 7951  y2021
## 7952  y2021
## 7953  y2021
## 7954  y2021
## 7955  y2021
## 7956  y2021
## 7957  y2021
## 7958  y2022
## 7959  y2022
## 7960  y2022
## 7961  y2022
## 7962  y2022
## 7963  y2022
## 7964  y2022
## 7965  y2022
## 7966  y2022
## 7967  y2022
## 7968  y2022
## 7969  y2022
## 7970  y2022
## 7971  y2022
## 7972  y2022
## 7973  y2022
## 7974  y2022
## 7975  y2022
## 7976  y2022
## 7977  y2022
## 7978  y2022
## 7979  y2022
## 7980  y2022
## 7981  y2022
## 7982  y2022
## 7983  y2022
## 7984  y2022
## 7985  y2022
## 7986  y2022
## 7987  y2022
## 7988  y2022
## 7989  y2022
## 7990  y2022
## 7991  y2022
## 7992  y2022
## 7993  y2022
## 7994  y2022
## 7995  y2022
## 7996  y2022
## 7997  y2022
## 7998  y2022
## 7999  y2022
## 8000  y2022
## 8001  y2022
## 8002  y2022
## 8003  y2022
## 8004  y2022
## 8005  y2022
## 8006  y2022
## 8007  y2022
## 8008  y2022
## 8009  y2022
## 8010  y2022
## 8011  y2022
## 8012  y2022
## 8013  y2022
## 8014  y2022
## 8015  y2022
## 8016  y2022
## 8017  y2022
## 8018  y2022
## 8019  y2022
## 8020  y2022
## 8021  y2022
## 8022  y2022
## 8023  y2022
## 8024  y2022
## 8025  y2022
## 8026  y2022
## 8027  y2022
## 8028  y2022
## 8029  y2022
## 8030  y2022
## 8031  y2022
## 8032  y2022
## 8033  y2022
## 8034  y2022
## 8035  y2022
## 8036  y2022
## 8037  y2022
## 8038  y2022
## 8039  y2022
## 8040  y2022
## 8041  y2022
## 8042  y2022
## 8043  y2022
## 8044  y2022
## 8045  y2022
## 8046  y2022
## 8047  y2022
## 8048  y2022
## 8049  y2022
## 8050  y2022
## 8051  y2022
## 8052  y2022
## 8053  y2022
## 8054  y2022
## 8055  y2022
## 8056  y2022
## 8057  y2022
## 8058  y2022
## 8059  y2022
## 8060  y2022
## 8061  y2022
## 8062  y2022
## 8063  y2022
## 8064  y2022
## 8065  y2022
## 8066  y2022
## 8067  y2022
## 8068  y2022
## 8069  y2022
## 8070  y2022
## 8071  y2022
## 8072  y2022
## 8073  y2022
## 8074  y2022
## 8075  y2022
## 8076  y2022
## 8077  y2022
## 8078  y2022
## 8079  y2022
## 8080  y2022
## 8081  y2022
## 8082  y2022
## 8083  y2022
## 8084  y2022
## 8085  y2022
## 8086  y2022
## 8087  y2022
## 8088  y2022
## 8089  y2022
## 8090  y2022
## 8091  y2022
## 8092  y2022
## 8093  y2022
## 8094  y2022
## 8095  y2022
## 8096  y2022
## 8097  y2022
## 8098  y2022
## 8099  y2022
## 8100  y2022
## 8101  y2022
## 8102  y2022
## 8103  y2022
## 8104  y2022
## 8105  y2022
## 8106  y2022
## 8107  y2022
## 8108  y2022
## 8109  y2022
## 8110  y2022
## 8111  y2022
## 8112  y2022
## 8113  y2022
## 8114  y2022
## 8115  y2022
## 8116  y2022
## 8117  y2022
## 8118  y2022
## 8119  y2022
## 8120  y2022
## 8121  y2022
## 8122  y2022
## 8123  y2022
## 8124  y2022
## 8125  y2022
## 8126  y2022
## 8127  y2022
## 8128  y2022
## 8129  y2022
## 8130  y2022
## 8131  y2022
## 8132  y2022
## 8133  y2022
## 8134  y2022
## 8135  y2022
## 8136  y2022
## 8137  y2022
## 8138  y2022
## 8139  y2022
## 8140  y2022
## 8141  y2022
## 8142  y2022
## 8143  y2022
## 8144  y2022
## 8145  y2022
## 8146  y2022
## 8147  y2022
## 8148  y2022
## 8149  y2022
## 8150  y2022
## 8151  y2022
## 8152  y2022
## 8153  y2022
## 8154  y2022
## 8155  y2022
## 8156  y2022
## 8157  y2022
## 8158  y2022
## 8159  y2022
## 8160  y2022
## 8161  y2022
## 8162  y2022
## 8163  y2022
## 8164  y2022
## 8165  y2022
## 8166  y2022
## 8167  y2022
## 8168  y2022
## 8169  y2022
## 8170  y2022
## 8171  y2022
## 8172  y2022
## 8173  y2022
## 8174  y2022
## 8175  y2022
## 8176  y2022
## 8177  y2022
## 8178  y2022
## 8179  y2022
## 8180  y2022
## 8181  y2022
## 8182  y2022
## 8183  y2022
## 8184  y2022
## 8185  y2022
## 8186  y2022
## 8187  y2022
## 8188  y2022
## 8189  y2022
## 8190  y2022
## 8191  y2022
## 8192  y2022
## 8193  y2022
## 8194  y2022
## 8195  y2022
## 8196  y2022
## 8197  y2022
## 8198  y2022
## 8199  y2022
## 8200  y2022
## 8201  y2022
## 8202  y2022
## 8203  y2022
## 8204  y2022
## 8205  y2022
## 8206  y2022
## 8207  y2022
## 8208  y2022
## 8209  y2022
## 8210  y2022
## 8211  y2022
## 8212  y2022
## 8213  y2022
## 8214  y2022
## 8215  y2022
## 8216  y2022
## 8217  y2022
## 8218  y2022
## 8219  y2022
## 8220  y2022
## 8221  y2022
## 8222  y2022
## 8223  y2022
## 8224  y2022
## 8225  y2022
## 8226  y2022
## 8227  y2022
## 8228  y2022
## 8229  y2022
## 8230  y2022
## 8231  y2022
## 8232  y2022
## 8233  y2022
## 8234  y2022
## 8235  y2022
## 8236  y2022
## 8237  y2022
## 8238  y2022
## 8239  y2022
## 8240  y2022
## 8241  y2022
## 8242  y2022
## 8243  y2022
## 8244  y2022
## 8245  y2022
## 8246  y2022
## 8247  y2022
## 8248  y2022
## 8249  y2022
## 8250  y2022
## 8251  y2022
## 8252  y2022
## 8253  y2022
## 8254  y2022
## 8255  y2022
## 8256  y2022
## 8257  y2022
## 8258  y2022
## 8259  y2022
## 8260  y2022
## 8261  y2022
## 8262  y2022
## 8263  y2022
## 8264  y2022
## 8265  y2022
## 8266  y2022
## 8267  y2022
## 8268  y2022
## 8269  y2022
## 8270  y2022
## 8271  y2022
## 8272  y2022
## 8273  y2022
## 8274  y2022
## 8275  y2022
## 8276  y2022
## 8277  y2022
## 8278  y2022
## 8279  y2022
## 8280  y2022
## 8281  y2022
## 8282  y2022
## 8283  y2022
## 8284  y2022
## 8285  y2022
## 8286  y2022
## 8287  y2022
## 8288  y2022
## 8289  y2022
## 8290  y2022
## 8291  y2022
## 8292  y2022
## 8293  y2022
## 8294  y2022
## 8295  y2022
## 8296  y2022
## 8297  y2022
## 8298  y2022
## 8299  y2022
## 8300  y2022
## 8301  y2022
## 8302  y2022
## 8303  y2022
## 8304  y2022
## 8305  y2022
## 8306  y2022
## 8307  y2022
## 8308  y2022
## 8309  y2022
## 8310  y2022
## 8311  y2022
## 8312  y2022
## 8313  y2022
## 8314  y2022
## 8315  y2022
## 8316  y2022
## 8317  y2022
## 8318  y2022
## 8319  y2022
## 8320  y2022
## 8321  y2022
## 8322  y2022
## 8323  y2022
## 8324  y2022
## 8325  y2022
## 8326  y2022
## 8327  y2022
## 8328  y2022
## 8329  y2022
## 8330  y2022
## 8331  y2022
## 8332  y2022
## 8333  y2022
## 8334  y2022
## 8335  y2022
## 8336  y2022
## 8337  y2022
## 8338  y2020
## 8339  y2020
## 8340  y2020
## 8341  y2020
## 8342  y2020
## 8343  y2020
## 8344  y2020
## 8345  y2020
## 8346  y2020
## 8347  y2020
## 8348  y2020
## 8349  y2020
## 8350  y2020
## 8351  y2020
## 8352  y2020
## 8353  y2020
## 8354  y2020
## 8355  y2020
## 8356  y2020
## 8357  y2020
## 8358  y2020
## 8359  y2020
## 8360  y2020
## 8361  y2020
## 8362  y2020
## 8363  y2020
## 8364  y2020
## 8365  y2020
## 8366  y2020
## 8367  y2020
## 8368  y2020
## 8369  y2020
## 8370  y2020
## 8371  y2020
## 8372  y2020
## 8373  y2020
## 8374  y2020
## 8375  y2020
## 8376  y2020
## 8377  y2020
## 8378  y2020
## 8379  y2020
## 8380  y2020
## 8381  y2020
## 8382  y2020
## 8383  y2020
## 8384  y2020
## 8385  y2020
## 8386  y2020
## 8387  y2020
## 8388  y2020
## 8389  y2020
## 8390  y2020
## 8391  y2020
## 8392  y2020
## 8393  y2020
## 8394  y2020
## 8395  y2020
## 8396  y2020
## 8397  y2020
## 8398  y2020
## 8399  y2020
## 8400  y2020
## 8401  y2020
## 8402  y2020
## 8403  y2020
## 8404  y2020
## 8405  y2020
## 8406  y2020
## 8407  y2020
## 8408  y2020
## 8409  y2020
## 8410  y2020
## 8411  y2020
## 8412  y2020
## 8413  y2020
## 8414  y2020
## 8415  y2020
## 8416  y2020
## 8417  y2020
## 8418  y2020
## 8419  y2020
## 8420  y2020
## 8421  y2020
## 8422  y2020
## 8423  y2020
## 8424  y2020
## 8425  y2020
## 8426  y2020
## 8427  y2020
## 8428  y2020
## 8429  y2020
## 8430  y2020
## 8431  y2020
## 8432  y2020
## 8433  y2020
## 8434  y2020
## 8435  y2020
## 8436  y2020
## 8437  y2020
## 8438  y2020
## 8439  y2020
## 8440  y2020
## 8441  y2020
## 8442  y2020
## 8443  y2020
## 8444  y2020
## 8445  y2020
## 8446  y2020
## 8447  y2020
## 8448  y2020
## 8449  y2020
## 8450  y2020
## 8451  y2020
## 8452  y2020
## 8453  y2020
## 8454  y2020
## 8455  y2020
## 8456  y2020
## 8457  y2020
## 8458  y2020
## 8459  y2020
## 8460  y2020
## 8461  y2020
## 8462  y2020
## 8463  y2020
## 8464  y2020
## 8465  y2020
## 8466  y2020
## 8467  y2020
## 8468  y2020
## 8469  y2020
## 8470  y2020
## 8471  y2020
## 8472  y2020
## 8473  y2020
## 8474  y2020
## 8475  y2020
## 8476  y2020
## 8477  y2020
## 8478  y2020
## 8479  y2020
## 8480  y2020
## 8481  y2020
## 8482  y2020
## 8483  y2020
## 8484  y2020
## 8485  y2020
## 8486  y2020
## 8487  y2020
## 8488  y2020
## 8489  y2020
## 8490  y2020
## 8491  y2020
## 8492  y2020
## 8493  y2020
## 8494  y2020
## 8495  y2020
## 8496  y2020
## 8497  y2020
## 8498  y2020
## 8499  y2020
## 8500  y2020
## 8501  y2020
## 8502  y2020
## 8503  y2020
## 8504  y2020
## 8505  y2020
## 8506  y2020
## 8507  y2020
## 8508  y2020
## 8509  y2020
## 8510  y2020
## 8511  y2020
## 8512  y2020
## 8513  y2020
## 8514  y2020
## 8515  y2020
## 8516  y2020
## 8517  y2020
## 8518  y2020
## 8519  y2020
## 8520  y2020
## 8521  y2020
## 8522  y2020
## 8523  y2020
## 8524  y2020
## 8525  y2020
## 8526  y2020
## 8527  y2020
## 8528  y2020
## 8529  y2020
## 8530  y2020
## 8531  y2020
## 8532  y2020
## 8533  y2020
## 8534  y2020
## 8535  y2020
## 8536  y2020
## 8537  y2020
## 8538  y2020
## 8539  y2020
## 8540  y2020
## 8541  y2020
## 8542  y2020
## 8543  y2020
## 8544  y2020
## 8545  y2020
## 8546  y2020
## 8547  y2020
## 8548  y2020
## 8549  y2020
## 8550  y2020
## 8551  y2020
## 8552  y2020
## 8553  y2020
## 8554  y2020
## 8555  y2020
## 8556  y2020
## 8557  y2020
## 8558  y2020
## 8559  y2020
## 8560  y2020
## 8561  y2020
## 8562  y2020
## 8563  y2020
## 8564  y2020
## 8565  y2020
## 8566  y2020
## 8567  y2020
## 8568  y2020
## 8569  y2020
## 8570  y2020
## 8571  y2020
## 8572  y2020
## 8573  y2020
## 8574  y2020
## 8575  y2020
## 8576  y2020
## 8577  y2020
## 8578  y2020
## 8579  y2020
## 8580  y2020
## 8581  y2020
## 8582  y2020
## 8583  y2020
## 8584  y2020
## 8585  y2020
## 8586  y2020
## 8587  y2020
## 8588  y2020
## 8589  y2020
## 8590  y2020
## 8591  y2020
## 8592  y2020
## 8593  y2020
## 8594  y2020
## 8595  y2020
## 8596  y2020
## 8597  y2020
## 8598  y2020
## 8599  y2020
## 8600  y2020
## 8601  y2020
## 8602  y2020
## 8603  y2020
## 8604  y2020
## 8605  y2020
## 8606  y2020
## 8607  y2020
## 8608  y2020
## 8609  y2020
## 8610  y2020
## 8611  y2020
## 8612  y2020
## 8613  y2020
## 8614  y2020
## 8615  y2020
## 8616  y2020
## 8617  y2020
## 8618  y2020
## 8619  y2020
## 8620  y2020
## 8621  y2020
## 8622  y2020
## 8623  y2020
## 8624  y2020
## 8625  y2020
## 8626  y2020
## 8627  y2020
## 8628  y2020
## 8629  y2020
## 8630  y2020
## 8631  y2020
## 8632  y2020
## 8633  y2020
## 8634  y2020
## 8635  y2020
## 8636  y2020
## 8637  y2020
## 8638  y2020
## 8639  y2020
## 8640  y2020
## 8641  y2020
## 8642  y2020
## 8643  y2020
## 8644  y2020
## 8645  y2020
## 8646  y2020
## 8647  y2020
## 8648  y2020
## 8649  y2020
## 8650  y2020
## 8651  y2020
## 8652  y2020
## 8653  y2020
## 8654  y2020
## 8655  y2020
## 8656  y2020
## 8657  y2020
## 8658  y2020
## 8659  y2020
## 8660  y2020
## 8661  y2020
## 8662  y2020
## 8663  y2020
## 8664  y2020
## 8665  y2020
## 8666  y2020
## 8667  y2020
## 8668  y2020
## 8669  y2020
## 8670  y2020
## 8671  y2020
## 8672  y2020
## 8673  y2020
## 8674  y2020
## 8675  y2020
## 8676  y2020
## 8677  y2020
## 8678  y2020
## 8679  y2020
## 8680  y2020
## 8681  y2020
## 8682  y2020
## 8683  y2020
## 8684  y2020
## 8685  y2020
## 8686  y2020
## 8687  y2020
## 8688  y2020
## 8689  y2020
## 8690  y2020
## 8691  y2020
## 8692  y2020
## 8693  y2020
## 8694  y2020
## 8695  y2020
## 8696  y2020
## 8697  y2020
## 8698  y2020
## 8699  y2020
## 8700  y2020
## 8701  y2020
## 8702  y2020
## 8703  y2020
## 8704  y2020
## 8705  y2020
## 8706  y2020
## 8707  y2020
## 8708  y2020
## 8709  y2020
## 8710  y2020
## 8711  y2020
## 8712  y2020
## 8713  y2020
## 8714  y2020
## 8715  y2020
## 8716  y2020
## 8717  y2020
## 8718  y2020
## 8719  y2020
## 8720  y2020
## 8721  y2020
## 8722  y2020
## 8723  y2020
## 8724  y2020
## 8725  y2020
## 8726  y2020
## 8727  y2020
## 8728  y2020
## 8729  y2020
## 8730  y2020
## 8731  y2020
## 8732  y2020
## 8733  y2020
## 8734  y2020
## 8735  y2020
## 8736  y2020
## 8737  y2020
## 8738  y2020
## 8739  y2020
## 8740  y2020
## 8741  y2020
## 8742  y2020
## 8743  y2020
## 8744  y2020
## 8745  y2020
## 8746  y2020
## 8747  y2020
## 8748  y2020
## 8749  y2020
## 8750  y2020
## 8751  y2020
## 8752  y2020
## 8753  y2020
## 8754  y2020
## 8755  y2020
## 8756  y2020
## 8757  y2020
## 8758  y2020
## 8759  y2020
## 8760  y2020
## 8761  y2020
## 8762  y2020
## 8763  y2020
## 8764  y2020
## 8765  y2020
## 8766  y2020
## 8767  y2020
## 8768  y2020
## 8769  y2020
## 8770  y2020
## 8771  y2020
## 8772  y2020
## 8773  y2020
## 8774  y2020
## 8775  y2020
## 8776  y2020
## 8777  y2020
## 8778  y2020
## 8779  y2020
## 8780  y2020
## 8781  y2020
## 8782  y2020
## 8783  y2020
## 8784  y2020
## 8785  y2020
## 8786  y2020
## 8787  y2020
## 8788  y2020
## 8789  y2020
## 8790  y2020
## 8791  y2020
## 8792  y2020
## 8793  y2020
## 8794  y2020
## 8795  y2020
## 8796  y2020
## 8797  y2020
## 8798  y2020
## 8799  y2020
## 8800  y2020
## 8801  y2020
## 8802  y2020
## 8803  y2020
## 8804  y2020
## 8805  y2020
## 8806  y2020
## 8807  y2020
## 8808  y2020
## 8809  y2020
## 8810  y2020
## 8811  y2020
## 8812  y2020
## 8813  y2020
## 8814  y2020
## 8815  y2020
## 8816  y2020
## 8817  y2020
## 8818  y2020
## 8819  y2020
## 8820  y2020
## 8821  y2020
## 8822  y2020
## 8823  y2020
## 8824  y2020
## 8825  y2020
## 8826  y2020
## 8827  y2020
## 8828  y2020
## 8829  y2020
## 8830  y2020
## 8831  y2020
## 8832  y2020
## 8833  y2020
## 8834  y2020
## 8835  y2020
## 8836  y2020
## 8837  y2020
## 8838  y2020
## 8839  y2020
## 8840  y2020
## 8841  y2020
## 8842  y2020
## 8843  y2020
## 8844  y2020
## 8845  y2020
## 8846  y2020
## 8847  y2020
## 8848  y2020
## 8849  y2020
## 8850  y2020
## 8851  y2020
## 8852  y2020
## 8853  y2020
## 8854  y2020
## 8855  y2020
## 8856  y2020
## 8857  y2020
## 8858  y2020
## 8859  y2020
## 8860  y2020
## 8861  y2020
## 8862  y2020
## 8863  y2020
## 8864  y2020
## 8865  y2020
## 8866  y2020
## 8867  y2020
## 8868  y2020
## 8869  y2020
## 8870  y2020
## 8871  y2020
## 8872  y2020
## 8873  y2020
## 8874  y2020
## 8875  y2020
## 8876  y2020
## 8877  y2020
## 8878  y2020
## 8879  y2020
## 8880  y2020
## 8881  y2020
## 8882  y2020
## 8883  y2020
## 8884  y2020
## 8885  y2020
## 8886  y2020
## 8887  y2020
## 8888  y2020
## 8889  y2020
## 8890  y2020
## 8891  y2020
## 8892  y2020
## 8893  y2020
## 8894  y2020
## 8895  y2020
## 8896  y2020
## 8897  y2020
## 8898  y2020
## 8899  y2020
## 8900  y2020
## 8901  y2020
## 8902  y2020
## 8903  y2020
## 8904  y2020
## 8905  y2020
## 8906  y2020
## 8907  y2020
## 8908  y2020
## 8909  y2020
## 8910  y2020
## 8911  y2020
## 8912  y2020
## 8913  y2020
## 8914  y2020
## 8915  y2020
## 8916  y2020
## 8917  y2020
## 8918  y2020
## 8919  y2020
## 8920  y2020
## 8921  y2020
## 8922  y2020
## 8923  y2020
## 8924  y2020
## 8925  y2020
## 8926  y2020
## 8927  y2020
## 8928  y2020
## 8929  y2020
## 8930  y2020
## 8931  y2020
## 8932  y2020
## 8933  y2020
## 8934  y2020
## 8935  y2020
## 8936  y2020
## 8937  y2020
## 8938  y2020
## 8939  y2020
## 8940  y2020
## 8941  y2020
## 8942  y2020
## 8943  y2020
## 8944  y2020
## 8945  y2020
## 8946  y2020
## 8947  y2020
## 8948  y2020
## 8949  y2020
## 8950  y2020
## 8951  y2020
## 8952  y2020
## 8953  y2020
## 8954  y2020
## 8955  y2020
## 8956  y2020
## 8957  y2020
## 8958  y2020
## 8959  y2020
## 8960  y2020
## 8961  y2020
## 8962  y2020
## 8963  y2020
## 8964  y2020
## 8965  y2020
## 8966  y2020
## 8967  y2020
## 8968  y2020
## 8969  y2020
## 8970  y2020
## 8971  y2020
## 8972  y2020
## 8973  y2020
## 8974  y2020
## 8975  y2020
## 8976  y2020
## 8977  y2020
## 8978  y2020
## 8979  y2020
## 8980  y2020
## 8981  y2020
## 8982  y2020
## 8983  y2020
## 8984  y2020
## 8985  y2020
## 8986  y2020
## 8987  y2020
## 8988  y2020
## 8989  y2020
## 8990  y2020
## 8991  y2020
## 8992  y2020
## 8993  y2020
## 8994  y2020
## 8995  y2020
## 8996  y2020
## 8997  y2020
## 8998  y2020
## 8999  y2020
## 9000  y2020
## 9001  y2020
## 9002  y2020
## 9003  y2020
## 9004  y2020
## 9005  y2020
## 9006  y2020
## 9007  y2020
## 9008  y2020
## 9009  y2020
## 9010  y2020
## 9011  y2020
## 9012  y2020
## 9013  y2020
## 9014  y2020
## 9015  y2020
## 9016  y2020
## 9017  y2020
## 9018  y2020
## 9019  y2020
## 9020  y2020
## 9021  y2020
## 9022  y2020
## 9023  y2020
## 9024  y2020
## 9025  y2020
## 9026  y2020
## 9027  y2020
## 9028  y2020
## 9029  y2020
## 9030  y2020
## 9031  y2020
## 9032  y2020
## 9033  y2020
## 9034  y2020
## 9035  y2020
## 9036  y2020
## 9037  y2020
## 9038  y2020
## 9039  y2020
## 9040  y2020
## 9041  y2020
## 9042  y2020
## 9043  y2020
## 9044  y2020
## 9045  y2020
## 9046  y2020
## 9047  y2020
## 9048  y2020
## 9049  y2020
## 9050  y2020
## 9051  y2020
## 9052  y2020
## 9053  y2020
## 9054  y2020
## 9055  y2020
## 9056  y2020
## 9057  y2020
## 9058  y2020
## 9059  y2020
## 9060  y2020
## 9061  y2020
## 9062  y2020
## 9063  y2020
## 9064  y2020
## 9065  y2020
## 9066  y2020
## 9067  y2020
## 9068  y2020
## 9069  y2020
## 9070  y2020
## 9071  y2020
## 9072  y2020
## 9073  y2020
## 9074  y2020
## 9075  y2020
## 9076  y2020
## 9077  y2020
## 9078  y2020
## 9079  y2020
## 9080  y2020
## 9081  y2020
## 9082  y2020
## 9083  y2020
## 9084  y2020
## 9085  y2020
## 9086  y2020
## 9087  y2020
## 9088  y2020
## 9089  y2020
## 9090  y2020
## 9091  y2020
## 9092  y2020
## 9093  y2020
## 9094  y2020
## 9095  y2020
## 9096  y2020
## 9097  y2020
## 9098  y2020
## 9099  y2020
## 9100  y2020
## 9101  y2020
## 9102  y2020
## 9103  y2020
## 9104  y2020
## 9105  y2020
## 9106  y2020
## 9107  y2020
## 9108  y2020
## 9109  y2020
## 9110  y2020
## 9111  y2020
## 9112  y2020
## 9113  y2020
## 9114  y2020
## 9115  y2020
## 9116  y2020
## 9117  y2020
## 9118  y2020
## 9119  y2020
## 9120  y2020
## 9121  y2020
## 9122  y2020
## 9123  y2020
## 9124  y2020
## 9125  y2020
## 9126  y2020
## 9127  y2020
## 9128  y2020
## 9129  y2020
## 9130  y2020
## 9131  y2020
## 9132  y2020
## 9133  y2020
## 9134  y2020
## 9135  y2020
## 9136  y2020
## 9137  y2020
## 9138  y2020
## 9139  y2020
## 9140  y2020
## 9141  y2020
## 9142  y2020
## 9143  y2020
## 9144  y2020
## 9145  y2020
## 9146  y2020
## 9147  y2020
## 9148  y2020
## 9149  y2020
## 9150  y2020
## 9151  y2020
## 9152  y2020
## 9153  y2020
## 9154  y2020
## 9155  y2020
## 9156  y2020
## 9157  y2020
## 9158  y2020
## 9159  y2020
## 9160  y2020
## 9161  y2020
## 9162  y2020
## 9163  y2020
## 9164  y2020
## 9165  y2020
## 9166  y2020
## 9167  y2020
## 9168  y2020
## 9169  y2020
## 9170  y2020
## 9171  y2020
## 9172  y2020
## 9173  y2020
## 9174  y2020
## 9175  y2020
## 9176  y2020
## 9177  y2020
## 9178  y2020
## 9179  y2020
## 9180  y2020
## 9181  y2020
## 9182  y2020
## 9183  y2020
## 9184  y2020
## 9185  y2020
## 9186  y2020
## 9187  y2020
## 9188  y2020
## 9189  y2020
## 9190  y2020
## 9191  y2020
## 9192  y2020
## 9193  y2020
## 9194  y2020
## 9195  y2020
## 9196  y2020
## 9197  y2020
## 9198  y2020
## 9199  y2020
## 9200  y2020
## 9201  y2020
## 9202  y2020
## 9203  y2020
## 9204  y2020
## 9205  y2020
## 9206  y2020
## 9207  y2020
## 9208  y2020
## 9209  y2020
## 9210  y2020
## 9211  y2020
## 9212  y2020
## 9213  y2020
## 9214  y2020
## 9215  y2020
## 9216  y2020
## 9217  y2020
## 9218  y2020
## 9219  y2020
## 9220  y2020
## 9221  y2020
## 9222  y2020
## 9223  y2020
## 9224  y2020
## 9225  y2020
## 9226  y2020
## 9227  y2020
## 9228  y2020
## 9229  y2020
## 9230  y2020
## 9231  y2020
## 9232  y2020
## 9233  y2020
## 9234  y2020
## 9235  y2020
## 9236  y2020
## 9237  y2020
## 9238  y2020
## 9239  y2020
## 9240  y2020
## 9241  y2020
## 9242  y2020
## 9243  y2020
## 9244  y2020
## 9245  y2020
## 9246  y2020
## 9247  y2020
## 9248  y2020
## 9249  y2020
## 9250  y2020
## 9251  y2020
## 9252  y2020
## 9253  y2020
## 9254  y2020
## 9255  y2020
## 9256  y2020
## 9257  y2020
## 9258  y2020
## 9259  y2020
## 9260  y2020
## 9261  y2020
## 9262  y2020
## 9263  y2020
## 9264  y2020
## 9265  y2020
## 9266  y2020
## 9267  y2020
## 9268  y2020
## 9269  y2020
## 9270  y2020
## 9271  y2020
## 9272  y2020
## 9273  y2020
## 9274  y2020
## 9275  y2020
## 9276  y2020
## 9277  y2020
## 9278  y2020
## 9279  y2020
## 9280  y2020
## 9281  y2020
## 9282  y2020
## 9283  y2020
## 9284  y2020
## 9285  y2020
## 9286  y2020
## 9287  y2020
## 9288  y2020
## 9289  y2020
## 9290  y2020
## 9291  y2020
## 9292  y2020
## 9293  y2020
## 9294  y2020
## 9295  y2020
## 9296  y2020
## 9297  y2020
## 9298  y2020
## 9299  y2020
## 9300  y2020
## 9301  y2020
## 9302  y2020
## 9303  y2020
## 9304  y2020
## 9305  y2020
## 9306  y2020
## 9307  y2020
## 9308  y2020
## 9309  y2020
## 9310  y2020
## 9311  y2020
## 9312  y2020
## 9313  y2020
## 9314  y2020
## 9315  y2020
## 9316  y2020
## 9317  y2020
## 9318  y2020
## 9319  y2020
## 9320  y2020
## 9321  y2020
## 9322  y2020
## 9323  y2020
## 9324  y2020
## 9325  y2020
## 9326  y2020
## 9327  y2020
## 9328  y2020
## 9329  y2020
## 9330  y2020
## 9331  y2020
## 9332  y2020
## 9333  y2020
## 9334  y2020
## 9335  y2020
## 9336  y2020
## 9337  y2020
## 9338  y2020
## 9339  y2020
## 9340  y2020
## 9341  y2020
## 9342  y2020
## 9343  y2020
## 9344  y2020
## 9345  y2020
## 9346  y2020
## 9347  y2020
## 9348  y2020
## 9349  y2020
## 9350  y2020
## 9351  y2020
## 9352  y2020
## 9353  y2020
## 9354  y2020
## 9355  y2020
## 9356  y2020
## 9357  y2020
## 9358  y2020
## 9359  y2020
## 9360  y2020
## 9361  y2020
## 9362  y2020
## 9363  y2020
## 9364  y2020
## 9365  y2020
## 9366  y2020
## 9367  y2020
## 9368  y2020
## 9369  y2020
## 9370  y2020
## 9371  y2020
## 9372  y2020
## 9373  y2020
## 9374  y2020
## 9375  y2020
## 9376  y2020
## 9377  y2020
## 9378  y2020
## 9379  y2020
## 9380  y2020
## 9381  y2020
## 9382  y2020
## 9383  y2020
## 9384  y2020
## 9385  y2020
## 9386  y2020
## 9387  y2020
## 9388  y2020
## 9389  y2020
## 9390  y2020
## 9391  y2020
## 9392  y2020
## 9393  y2020
## 9394  y2020
## 9395  y2020
## 9396  y2020
## 9397  y2020
## 9398  y2020
## 9399  y2020
## 9400  y2020
## 9401  y2020
## 9402  y2020
## 9403  y2020
## 9404  y2020
## 9405  y2020
## 9406  y2020
## 9407  y2020
## 9408  y2020
## 9409  y2020
## 9410  y2020
## 9411  y2020
## 9412  y2020
## 9413  y2020
## 9414  y2020
## 9415  y2020
## 9416  y2020
## 9417  y2020
## 9418  y2020
## 9419  y2020
## 9420  y2020
## 9421  y2020
## 9422  y2020
## 9423  y2020
## 9424  y2020
## 9425  y2020
## 9426  y2020
## 9427  y2020
## 9428  y2020
## 9429  y2020
## 9430  y2020
## 9431  y2020
## 9432  y2020
## 9433  y2020
## 9434  y2020
## 9435  y2020
## 9436  y2020
## 9437  y2020
## 9438  y2020
## 9439  y2020
## 9440  y2020
## 9441  y2020
## 9442  y2020
## 9443  y2020
## 9444  y2020
## 9445  y2020
## 9446  y2020
## 9447  y2020
## 9448  y2020
## 9449  y2020
## 9450  y2020
## 9451  y2020
## 9452  y2020
## 9453  y2020
## 9454  y2020
## 9455  y2020
## 9456  y2020
## 9457  y2020
## 9458  y2020
## 9459  y2020
## 9460  y2020
## 9461  y2020
## 9462  y2020
## 9463  y2020
## 9464  y2020
## 9465  y2020
## 9466  y2020
## 9467  y2020
## 9468  y2020
## 9469  y2020
## 9470  y2020
## 9471  y2020
## 9472  y2020
## 9473  y2020
## 9474  y2020
## 9475  y2020
## 9476  y2020
## 9477  y2020
## 9478  y2020
## 9479  y2020
## 9480  y2020
## 9481  y2020
## 9482  y2020
## 9483  y2020
## 9484  y2020
## 9485  y2020
## 9486  y2020
## 9487  y2020
## 9488  y2020
## 9489  y2020
## 9490  y2020
## 9491  y2020
## 9492  y2020
## 9493  y2020
## 9494  y2020
## 9495  y2020
## 9496  y2020
## 9497  y2020
## 9498  y2020
## 9499  y2020
## 9500  y2020
## 9501  y2020
## 9502  y2020
## 9503  y2020
## 9504  y2020
## 9505  y2020
## 9506  y2020
## 9507  y2020
## 9508  y2020
## 9509  y2020
## 9510  y2020
## 9511  y2020
## 9512  y2020
## 9513  y2020
## 9514  y2020
## 9515  y2020
## 9516  y2020
## 9517  y2020
## 9518  y2020
## 9519  y2020
## 9520  y2020
## 9521  y2020
## 9522  y2020
## 9523  y2020
## 9524  y2020
## 9525  y2020
## 9526  y2020
## 9527  y2020
## 9528  y2020
## 9529  y2020
## 9530  y2020
## 9531  y2020
## 9532  y2020
## 9533  y2020
## 9534  y2020
## 9535  y2020
## 9536  y2020
## 9537  y2020
## 9538  y2020
## 9539  y2020
## 9540  y2020
## 9541  y2020
## 9542  y2020
## 9543  y2020
## 9544  y2020
## 9545  y2020
## 9546  y2020
## 9547  y2020
## 9548  y2020
## 9549  y2020
## 9550  y2020
## 9551  y2020
## 9552  y2020
## 9553  y2020
## 9554  y2020
## 9555  y2020
## 9556  y2020
## 9557  y2020
## 9558  y2020
## 9559  y2020
## 9560  y2020
## 9561  y2020
## 9562  y2020
## 9563  y2020
## 9564  y2020
## 9565  y2020
## 9566  y2020
## 9567  y2020
## 9568  y2020
## 9569  y2020
## 9570  y2020
## 9571  y2020
## 9572  y2020
## 9573  y2020
## 9574  y2020
## 9575  y2020
## 9576  y2020
## 9577  y2020
## 9578  y2020
## 9579  y2020
## 9580  y2020
## 9581  y2020
## 9582  y2020
## 9583  y2020
## 9584  y2020
## 9585  y2020
## 9586  y2020
## 9587  y2020
## 9588  y2020
## 9589  y2020
## 9590  y2020
## 9591  y2020
## 9592  y2020
## 9593  y2020
## 9594  y2020
## 9595  y2020
## 9596  y2020
## 9597  y2020
## 9598  y2020
## 9599  y2020
## 9600  y2020
## 9601  y2020
## 9602  y2020
## 9603  y2020
## 9604  y2020
## 9605  y2020
## 9606  y2020
## 9607  y2020
## 9608  y2020
## 9609  y2020
## 9610  y2020
## 9611  y2020
## 9612  y2020
## 9613  y2020
## 9614  y2020
## 9615  y2020
## 9616  y2020
## 9617  y2020
## 9618  y2020
## 9619  y2020
## 9620  y2020
## 9621  y2020
## 9622  y2020
## 9623  y2020
## 9624  y2020
## 9625  y2020
## 9626  y2020
## 9627  y2020
## 9628  y2020
## 9629  y2020
## 9630  y2020
## 9631  y2020
## 9632  y2020
## 9633  y2020
## 9634  y2020
## 9635  y2020
## 9636  y2020
## 9637  y2020
## 9638  y2020
## 9639  y2020
## 9640  y2020
## 9641  y2020
## 9642  y2020
## 9643  y2020
## 9644  y2020
## 9645  y2020
## 9646  y2020
## 9647  y2020
## 9648  y2020
## 9649  y2020
## 9650  y2020
## 9651  y2020
## 9652  y2020
## 9653  y2020
## 9654  y2020
## 9655  y2020
## 9656  y2020
## 9657  y2020
## 9658  y2020
## 9659  y2020
## 9660  y2020
## 9661  y2020
## 9662  y2020
## 9663  y2020
## 9664  y2020
## 9665  y2020
## 9666  y2020
## 9667  y2020
## 9668  y2020
## 9669  y2020
## 9670  y2020
## 9671  y2020
## 9672  y2020
## 9673  y2020
## 9674  y2020
## 9675  y2020
## 9676  y2020
## 9677  y2020
## 9678  y2020
## 9679  y2020
## 9680  y2020
## 9681  y2020
## 9682  y2020
## 9683  y2020
## 9684  y2020
## 9685  y2020
## 9686  y2020
## 9687  y2020
## 9688  y2020
## 9689  y2020
## 9690  y2020
## 9691  y2020
## 9692  y2020
## 9693  y2020
## 9694  y2020
## 9695  y2020
## 9696  y2020
## 9697  y2020
## 9698  y2020
## 9699  y2020
## 9700  y2020
## 9701  y2020
## 9702  y2020
## 9703  y2020
## 9704  y2020
## 9705  y2020
## 9706  y2020
## 9707  y2020
## 9708  y2020
## 9709  y2020
## 9710  y2020
## 9711  y2020
## 9712  y2020
## 9713  y2020
## 9714  y2020
## 9715  y2020
## 9716  y2020
## 9717  y2020
## 9718  y2020
## 9719  y2020
## 9720  y2020
## 9721  y2020
## 9722  y2020
## 9723  y2020
## 9724  y2020
## 9725  y2020
## 9726  y2020
## 9727  y2020
## 9728  y2020
## 9729  y2020
## 9730  y2020
## 9731  y2020
## 9732  y2020
## 9733  y2020
## 9734  y2020
## 9735  y2020
## 9736  y2020
## 9737  y2020
## 9738  y2020
## 9739  y2020
## 9740  y2020
## 9741  y2020
## 9742  y2020
## 9743  y2020
## 9744  y2020
## 9745  y2020
## 9746  y2020
## 9747  y2020
## 9748  y2020
## 9749  y2020
## 9750  y2020
## 9751  y2020
## 9752  y2020
## 9753  y2020
## 9754  y2020
## 9755  y2020
## 9756  y2020
## 9757  y2020
## 9758  y2020
## 9759  y2020
## 9760  y2020
## 9761  y2020
## 9762  y2020
## 9763  y2020
## 9764  y2020
## 9765  y2020
## 9766  y2020
## 9767  y2020
## 9768  y2020
## 9769  y2020
## 9770  y2020
## 9771  y2020
## 9772  y2020
## 9773  y2020
## 9774  y2020
## 9775  y2020
## 9776  y2020
## 9777  y2020
## 9778  y2020
## 9779  y2020
## 9780  y2020
## 9781  y2020
## 9782  y2020
## 9783  y2020
## 9784  y2020
## 9785  y2020
## 9786  y2020
## 9787  y2020
## 9788  y2020
## 9789  y2020
## 9790  y2020
## 9791  y2020
## 9792  y2020
## 9793  y2020
## 9794  y2020
## 9795  y2020
## 9796  y2020
## 9797  y2020
## 9798  y2020
## 9799  y2020
## 9800  y2020
## 9801  y2020
## 9802  y2020
## 9803  y2020
## 9804  y2020
## 9805  y2020
## 9806  y2020
## 9807  y2020
## 9808  y2020
## 9809  y2020
## 9810  y2020
## 9811  y2020
## 9812  y2020
## 9813  y2020
## 9814  y2020
## 9815  y2020
## 9816  y2020
## 9817  y2020
## 9818  y2020
## 9819  y2020
## 9820  y2020
## 9821  y2020
## 9822  y2020
## 9823  y2020
## 9824  y2020
## 9825  y2020
## 9826  y2020
## 9827  y2020
## 9828  y2020
## 9829  y2020
## 9830  y2020
## 9831  y2020
## 9832  y2020
## 9833  y2020
## 9834  y2020
## 9835  y2020
## 9836  y2020
## 9837  y2020
## 9838  y2020
## 9839  y2020
## 9840  y2020
## 9841  y2020
## 9842  y2020
## 9843  y2020
## 9844  y2020
## 9845  y2020
## 9846  y2020
## 9847  y2020
## 9848  y2020
## 9849  y2020
## 9850  y2020
## 9851  y2020
## 9852  y2020
## 9853  y2020
## 9854  y2020
## 9855  y2020
## 9856  y2020
## 9857  y2020
## 9858  y2020
## 9859  y2020
## 9860  y2020
## 9861  y2020
## 9862  y2020
## 9863  y2020
## 9864  y2020
## 9865  y2020
## 9866  y2020
## 9867  y2020
## 9868  y2020
## 9869  y2020
## 9870  y2020
## 9871  y2020
## 9872  y2020
## 9873  y2020
## 9874  y2020
## 9875  y2020
## 9876  y2020
## 9877  y2020
## 9878  y2020
## 9879  y2020
## 9880  y2020
## 9881  y2020
## 9882  y2020
## 9883  y2020
## 9884  y2020
## 9885  y2020
## 9886  y2020
## 9887  y2020
## 9888  y2020
## 9889  y2020
## 9890  y2020
## 9891  y2020
## 9892  y2020
## 9893  y2020
## 9894  y2020
## 9895  y2020
## 9896  y2020
## 9897  y2020
## 9898  y2020
## 9899  y2020
## 9900  y2020
## 9901  y2020
## 9902  y2020
## 9903  y2020
## 9904  y2020
## 9905  y2020
## 9906  y2020
## 9907  y2020
## 9908  y2020
## 9909  y2020
## 9910  y2020
## 9911  y2020
## 9912  y2020
## 9913  y2020
## 9914  y2020
## 9915  y2020
## 9916  y2020
## 9917  y2020
## 9918  y2020
## 9919  y2020
## 9920  y2020
## 9921  y2020
## 9922  y2020
## 9923  y2020
## 9924  y2020
## 9925  y2020
## 9926  y2020
## 9927  y2020
## 9928  y2020
## 9929  y2020
## 9930  y2020
## 9931  y2020
## 9932  y2020
## 9933  y2020
## 9934  y2020
## 9935  y2020
## 9936  y2020
## 9937  y2020
## 9938  y2020
## 9939  y2020
## 9940  y2020
## 9941  y2020
## 9942  y2020
## 9943  y2020
## 9944  y2020
## 9945  y2020
## 9946  y2020
## 9947  y2020
## 9948  y2020
## 9949  y2020
## 9950  y2020
## 9951  y2020
## 9952  y2020
## 9953  y2020
## 9954  y2020
## 9955  y2020
## 9956  y2020
## 9957  y2020
## 9958  y2020
## 9959  y2020
## 9960  y2020
## 9961  y2020
## 9962  y2020
## 9963  y2020
## 9964  y2020
## 9965  y2020
## 9966  y2020
## 9967  y2020
## 9968  y2020
## 9969  y2020
## 9970  y2020
## 9971  y2020
## 9972  y2020
## 9973  y2020
## 9974  y2020
## 9975  y2020
## 9976  y2020
## 9977  y2020
## 9978  y2020
## 9979  y2020
## 9980  y2020
## 9981  y2020
## 9982  y2020
## 9983  y2020
## 9984  y2020
## 9985  y2020
## 9986  y2020
## 9987  y2020
## 9988  y2020
## 9989  y2020
## 9990  y2020
## 9991  y2020
## 9992  y2020
## 9993  y2020
## 9994  y2020
## 9995  y2020
## 9996  y2020
## 9997  y2020
## 9998  y2020
## 9999  y2020
## 10000 y2020
## 10001 y2020
## 10002 y2020
## 10003 y2020
## 10004 y2020
## 10005 y2020
## 10006 y2020
## 10007 y2020
## 10008 y2020
## 10009 y2020
## 10010 y2020
## 10011 y2020
## 10012 y2020
## 10013 y2020
## 10014 y2020
## 10015 y2020
## 10016 y2020
## 10017 y2020
## 10018 y2020
## 10019 y2020
## 10020 y2020
## 10021 y2020
## 10022 y2020
## 10023 y2020
## 10024 y2020
## 10025 y2020
## 10026 y2020
## 10027 y2020
## 10028 y2020
## 10029 y2020
## 10030 y2020
## 10031 y2020
## 10032 y2020
## 10033 y2020
## 10034 y2020
## 10035 y2020
## 10036 y2020
## 10037 y2020
## 10038 y2020
## 10039 y2020
## 10040 y2020
## 10041 y2020
## 10042 y2020
## 10043 y2020
## 10044 y2020
## 10045 y2020
## 10046 y2020
## 10047 y2020
## 10048 y2020
## 10049 y2020
## 10050 y2020
## 10051 y2020
## 10052 y2020
## 10053 y2020
## 10054 y2020
## 10055 y2020
## 10056 y2020
## 10057 y2020
## 10058 y2020
## 10059 y2020
## 10060 y2020
## 10061 y2020
## 10062 y2020
## 10063 y2020
## 10064 y2020
## 10065 y2020
## 10066 y2020
## 10067 y2020
## 10068 y2020
## 10069 y2020
## 10070 y2020
## 10071 y2020
## 10072 y2020
## 10073 y2020
## 10074 y2020
## 10075 y2020
## 10076 y2020
## 10077 y2020
## 10078 y2020
## 10079 y2020
## 10080 y2020
## 10081 y2020
## 10082 y2020
## 10083 y2020
## 10084 y2020
## 10085 y2020
## 10086 y2020
## 10087 y2020
## 10088 y2020
## 10089 y2020
## 10090 y2020
## 10091 y2020
## 10092 y2020
## 10093 y2020
## 10094 y2020
## 10095 y2020
## 10096 y2020
## 10097 y2020
## 10098 y2020
## 10099 y2020
## 10100 y2020
## 10101 y2020
## 10102 y2020
## 10103 y2020
## 10104 y2020
## 10105 y2020
## 10106 y2020
## 10107 y2020
## 10108 y2020
## 10109 y2020
## 10110 y2020
## 10111 y2020
## 10112 y2020
## 10113 y2020
## 10114 y2020
## 10115 y2020
## 10116 y2020
## 10117 y2020
## 10118 y2020
## 10119 y2020
## 10120 y2020
## 10121 y2020
## 10122 y2020
## 10123 y2020
## 10124 y2020
## 10125 y2020
## 10126 y2020
## 10127 y2020
## 10128 y2020
## 10129 y2020
## 10130 y2020
## 10131 y2020
## 10132 y2020
## 10133 y2020
## 10134 y2020
## 10135 y2020
## 10136 y2020
## 10137 y2020
## 10138 y2020
## 10139 y2020
## 10140 y2020
## 10141 y2020
## 10142 y2020
## 10143 y2020
## 10144 y2020
## 10145 y2020
## 10146 y2020
## 10147 y2020
## 10148 y2020
## 10149 y2020
## 10150 y2020
## 10151 y2020
## 10152 y2020
## 10153 y2020
## 10154 y2020
## 10155 y2020
## 10156 y2020
## 10157 y2020
## 10158 y2020
## 10159 y2020
## 10160 y2020
## 10161 y2020
## 10162 y2020
## 10163 y2020
## 10164 y2020
## 10165 y2020
## 10166 y2020
## 10167 y2020
## 10168 y2020
## 10169 y2020
## 10170 y2020
## 10171 y2020
## 10172 y2020
## 10173 y2020
## 10174 y2020
## 10175 y2020
## 10176 y2020
## 10177 y2020
## 10178 y2020
## 10179 y2020
## 10180 y2020
## 10181 y2020
## 10182 y2020
## 10183 y2020
## 10184 y2020
## 10185 y2020
## 10186 y2020
## 10187 y2020
## 10188 y2020
## 10189 y2020
## 10190 y2020
## 10191 y2020
## 10192 y2020
## 10193 y2020
## 10194 y2020
## 10195 y2020
## 10196 y2020
## 10197 y2020
## 10198 y2020
## 10199 y2020
## 10200 y2020
## 10201 y2020
## 10202 y2020
## 10203 y2020
## 10204 y2020
## 10205 y2020
## 10206 y2020
## 10207 y2020
## 10208 y2020
## 10209 y2020
## 10210 y2020
## 10211 y2020
## 10212 y2020
## 10213 y2020
## 10214 y2020
## 10215 y2020
## 10216 y2020
## 10217 y2020
## 10218 y2020
## 10219 y2020
## 10220 y2020
## 10221 y2020
## 10222 y2020
## 10223 y2020
## 10224 y2020
## 10225 y2020
## 10226 y2020
## 10227 y2020
## 10228 y2020
## 10229 y2020
## 10230 y2020
## 10231 y2020
## 10232 y2020
## 10233 y2020
## 10234 y2020
## 10235 y2020
## 10236 y2020
## 10237 y2020
## 10238 y2020
## 10239 y2020
## 10240 y2020
## 10241 y2020
## 10242 y2020
## 10243 y2020
## 10244 y2020
## 10245 y2020
## 10246 y2020
## 10247 y2020
## 10248 y2020
## 10249 y2020
## 10250 y2020
## 10251 y2020
## 10252 y2020
## 10253 y2020
## 10254 y2020
## 10255 y2020
## 10256 y2020
## 10257 y2020
## 10258 y2020
## 10259 y2020
## 10260 y2020
## 10261 y2020
## 10262 y2020
## 10263 y2020
## 10264 y2020
## 10265 y2020
## 10266 y2020
## 10267 y2020
## 10268 y2020
## 10269 y2020
## 10270 y2020
## 10271 y2020
## 10272 y2020
## 10273 y2020
## 10274 y2020
## 10275 y2020
## 10276 y2020
## 10277 y2020
## 10278 y2020
## 10279 y2020
## 10280 y2020
## 10281 y2020
## 10282 y2020
## 10283 y2020
## 10284 y2020
## 10285 y2020
## 10286 y2020
## 10287 y2020
## 10288 y2020
## 10289 y2020
## 10290 y2020
## 10291 y2020
## 10292 y2020
## 10293 y2020
## 10294 y2020
## 10295 y2020
## 10296 y2020
## 10297 y2020
## 10298 y2020
## 10299 y2020
## 10300 y2020
## 10301 y2020
## 10302 y2020
## 10303 y2020
## 10304 y2020
## 10305 y2020
## 10306 y2020
## 10307 y2020
## 10308 y2020
## 10309 y2020
## 10310 y2020
## 10311 y2020
## 10312 y2020
## 10313 y2020
## 10314 y2020
## 10315 y2020
## 10316 y2020
## 10317 y2020
## 10318 y2020
## 10319 y2020
## 10320 y2020
## 10321 y2020
## 10322 y2020
## 10323 y2020
## 10324 y2020
## 10325 y2020
## 10326 y2020
## 10327 y2020
## 10328 y2020
## 10329 y2020
## 10330 y2020
## 10331 y2020
## 10332 y2020
## 10333 y2020
## 10334 y2020
## 10335 y2020
## 10336 y2020
## 10337 y2020
## 10338 y2020
## 10339 y2020
## 10340 y2020
## 10341 y2020
## 10342 y2020
## 10343 y2020
## 10344 y2020
## 10345 y2020
## 10346 y2020
## 10347 y2020
## 10348 y2020
## 10349 y2020
## 10350 y2020
## 10351 y2020
## 10352 y2020
## 10353 y2020
## 10354 y2020
## 10355 y2020
## 10356 y2020
## 10357 y2020
## 10358 y2020
## 10359 y2020
## 10360 y2020
## 10361 y2020
## 10362 y2020
## 10363 y2020
## 10364 y2020
## 10365 y2020
## 10366 y2020
## 10367 y2020
## 10368 y2020
## 10369 y2020
## 10370 y2020
## 10371 y2020
## 10372 y2020
## 10373 y2020
## 10374 y2020
## 10375 y2020
## 10376 y2020
## 10377 y2020
## 10378 y2020
## 10379 y2020
## 10380 y2020
## 10381 y2020
## 10382 y2020
## 10383 y2020
## 10384 y2020
## 10385 y2020
## 10386 y2020
## 10387 y2020
## 10388 y2020
## 10389 y2020
## 10390 y2020
## 10391 y2020
## 10392 y2020
## 10393 y2020
## 10394 y2020
## 10395 y2020
## 10396 y2020
## 10397 y2020
## 10398 y2020
## 10399 y2020
## 10400 y2020
## 10401 y2020
## 10402 y2020
## 10403 y2020
## 10404 y2020
## 10405 y2020
## 10406 y2020
## 10407 y2020
## 10408 y2020
## 10409 y2020
## 10410 y2020
## 10411 y2020
## 10412 y2020
## 10413 y2020
## 10414 y2020
## 10415 y2020
## 10416 y2020
## 10417 y2020
## 10418 y2020
## 10419 y2020
## 10420 y2020
## 10421 y2020
## 10422 y2020
## 10423 y2020
## 10424 y2020
## 10425 y2020
## 10426 y2020
## 10427 y2020
## 10428 y2020
## 10429 y2020
## 10430 y2020
## 10431 y2020
## 10432 y2020
## 10433 y2020
## 10434 y2020
## 10435 y2020
## 10436 y2020
## 10437 y2020
## 10438 y2020
## 10439 y2020
## 10440 y2020
## 10441 y2020
## 10442 y2020
## 10443 y2020
## 10444 y2020
## 10445 y2020
## 10446 y2020
## 10447 y2020
## 10448 y2020
## 10449 y2020
## 10450 y2020
## 10451 y2020
## 10452 y2020
## 10453 y2020
## 10454 y2020
## 10455 y2020
## 10456 y2020
## 10457 y2020
## 10458 y2020
## 10459 y2020
## 10460 y2020
## 10461 y2020
## 10462 y2020
## 10463 y2020
## 10464 y2020
## 10465 y2020
## 10466 y2020
## 10467 y2020
## 10468 y2020
## 10469 y2020
## 10470 y2020
## 10471 y2020
## 10472 y2020
## 10473 y2020
## 10474 y2020
## 10475 y2020
## 10476 y2020
## 10477 y2020
## 10478 y2020
## 10479 y2020
## 10480 y2020
## 10481 y2020
## 10482 y2020
## 10483 y2020
## 10484 y2020
## 10485 y2020
## 10486 y2020
## 10487 y2020
## 10488 y2020
## 10489 y2020
## 10490 y2020
## 10491 y2020
## 10492 y2020
## 10493 y2020
## 10494 y2020
## 10495 y2020
## 10496 y2020
## 10497 y2020
## 10498 y2020
## 10499 y2020
## 10500 y2020
## 10501 y2020
## 10502 y2020
## 10503 y2020
## 10504 y2020
## 10505 y2020
## 10506 y2020
## 10507 y2020
## 10508 y2020
## 10509 y2020
## 10510 y2020
## 10511 y2020
## 10512 y2020
## 10513 y2020
## 10514 y2020
## 10515 y2020
## 10516 y2020
## 10517 y2020
## 10518 y2020
## 10519 y2020
## 10520 y2020
## 10521 y2020
## 10522 y2020
## 10523 y2020
## 10524 y2020
## 10525 y2020
## 10526 y2020
## 10527 y2020
## 10528 y2020
## 10529 y2020
## 10530 y2020
## 10531 y2020
## 10532 y2020
## 10533 y2020
## 10534 y2020
## 10535 y2020
## 10536 y2020
## 10537 y2020
## 10538 y2020
## 10539 y2020
## 10540 y2020
## 10541 y2020
## 10542 y2020
## 10543 y2020
## 10544 y2020
## 10545 y2020
## 10546 y2020
## 10547 y2020
## 10548 y2020
## 10549 y2020
## 10550 y2020
## 10551 y2020
## 10552 y2020
## 10553 y2020
## 10554 y2020
## 10555 y2020
## 10556 y2020
## 10557 y2020
## 10558 y2020
## 10559 y2020
## 10560 y2020
## 10561 y2020
## 10562 y2020
## 10563 y2020
## 10564 y2020
## 10565 y2020
## 10566 y2020
## 10567 y2020
## 10568 y2020
## 10569 y2020
## 10570 y2020
## 10571 y2020
## 10572 y2020
## 10573 y2020
## 10574 y2020
## 10575 y2020
## 10576 y2020
## 10577 y2020
## 10578 y2020
## 10579 y2020
## 10580 y2020
## 10581 y2020
## 10582 y2020
## 10583 y2020
## 10584 y2020
## 10585 y2020
## 10586 y2020
## 10587 y2020
## 10588 y2020
## 10589 y2020
## 10590 y2020
## 10591 y2020
## 10592 y2020
## 10593 y2020
## 10594 y2020
## 10595 y2020
## 10596 y2020
## 10597 y2020
## 10598 y2020
## 10599 y2020
## 10600 y2020
## 10601 y2020
## 10602 y2020
## 10603 y2020
## 10604 y2020
## 10605 y2020
## 10606 y2020
## 10607 y2020
## 10608 y2020
## 10609 y2020
## 10610 y2020
## 10611 y2020
## 10612 y2020
## 10613 y2020
## 10614 y2020
## 10615 y2020
## 10616 y2020
## 10617 y2020
## 10618 y2020
## 10619 y2020
## 10620 y2020
## 10621 y2020
## 10622 y2020
## 10623 y2020
## 10624 y2020
## 10625 y2020
## 10626 y2020
## 10627 y2020
## 10628 y2020
## 10629 y2020
## 10630 y2020
## 10631 y2020
## 10632 y2020
## 10633 y2020
## 10634 y2020
## 10635 y2020
## 10636 y2020
## 10637 y2020
## 10638 y2020
## 10639 y2020
## 10640 y2020
## 10641 y2020
## 10642 y2020
## 10643 y2020
## 10644 y2020
## 10645 y2020
## 10646 y2020
## 10647 y2020
## 10648 y2020
## 10649 y2020
## 10650 y2020
## 10651 y2020
## 10652 y2020
## 10653 y2020
## 10654 y2020
## 10655 y2020
## 10656 y2020
## 10657 y2020
## 10658 y2020
## 10659 y2020
## 10660 y2020
## 10661 y2020
## 10662 y2020
## 10663 y2020
## 10664 y2020
## 10665 y2020
## 10666 y2020
## 10667 y2020
## 10668 y2020
## 10669 y2020
## 10670 y2020
## 10671 y2020
## 10672 y2020
## 10673 y2020
## 10674 y2020
## 10675 y2020
## 10676 y2020
## 10677 y2020
## 10678 y2020
## 10679 y2020
## 10680 y2020
## 10681 y2020
## 10682 y2020
## 10683 y2020
## 10684 y2020
## 10685 y2020
## 10686 y2020
## 10687 y2020
## 10688 y2020
## 10689 y2020
## 10690 y2020
## 10691 y2020
## 10692 y2020
## 10693 y2020
## 10694 y2020
## 10695 y2020
## 10696 y2020
## 10697 y2020
## 10698 y2020
## 10699 y2020
## 10700 y2020
## 10701 y2020
## 10702 y2020
## 10703 y2020
## 10704 y2020
## 10705 y2020
## 10706 y2020
## 10707 y2020
## 10708 y2020
## 10709 y2020
## 10710 y2020
## 10711 y2020
## 10712 y2020
## 10713 y2020
## 10714 y2020
## 10715 y2020
## 10716 y2020
## 10717 y2020
## 10718 y2020
## 10719 y2020
## 10720 y2020
## 10721 y2020
## 10722 y2020
## 10723 y2020
## 10724 y2020
## 10725 y2020
## 10726 y2020
## 10727 y2020
## 10728 y2020
## 10729 y2020
## 10730 y2020
## 10731 y2020
## 10732 y2020
## 10733 y2020
## 10734 y2020
## 10735 y2020
## 10736 y2020
## 10737 y2020
## 10738 y2020
## 10739 y2020
## 10740 y2020
## 10741 y2020
## 10742 y2020
## 10743 y2020
## 10744 y2020
## 10745 y2020
## 10746 y2020
## 10747 y2020
## 10748 y2020
## 10749 y2020
## 10750 y2020
## 10751 y2020
## 10752 y2020
## 10753 y2020
## 10754 y2020
## 10755 y2020
## 10756 y2020
## 10757 y2020
## 10758 y2020
## 10759 y2020
## 10760 y2020
## 10761 y2020
## 10762 y2020
## 10763 y2020
## 10764 y2020
## 10765 y2020
## 10766 y2020
## 10767 y2020
## 10768 y2020
## 10769 y2020
## 10770 y2020
## 10771 y2020
## 10772 y2020
## 10773 y2020
## 10774 y2020
## 10775 y2020
## 10776 y2020
## 10777 y2020
## 10778 y2020
## 10779 y2020
## 10780 y2020
## 10781 y2020
## 10782 y2020
## 10783 y2020
## 10784 y2020
## 10785 y2020
## 10786 y2020
## 10787 y2020
## 10788 y2020
## 10789 y2020
## 10790 y2020
## 10791 y2020
## 10792 y2020
## 10793 y2020
## 10794 y2020
## 10795 y2020
## 10796 y2020
## 10797 y2020
## 10798 y2020
## 10799 y2020
## 10800 y2020
## 10801 y2020
## 10802 y2020
## 10803 y2020
## 10804 y2020
## 10805 y2020
## 10806 y2020
## 10807 y2020
## 10808 y2020
## 10809 y2020
## 10810 y2020
## 10811 y2020
## 10812 y2020
## 10813 y2020
## 10814 y2020
## 10815 y2020
## 10816 y2020
## 10817 y2020
## 10818 y2020
## 10819 y2020
## 10820 y2020
## 10821 y2020
## 10822 y2020
## 10823 y2020
## 10824 y2020
## 10825 y2020
## 10826 y2020
## 10827 y2020
## 10828 y2020
## 10829 y2020
## 10830 y2020
## 10831 y2020
## 10832 y2020
## 10833 y2020
## 10834 y2020
## 10835 y2020
## 10836 y2020
## 10837 y2020
## 10838 y2020
## 10839 y2020
## 10840 y2020
## 10841 y2020
## 10842 y2020
## 10843 y2020
## 10844 y2020
## 10845 y2020
## 10846 y2021
## 10847 y2021
## 10848 y2021
## 10849 y2021
## 10850 y2021
## 10851 y2021
## 10852 y2021
## 10853 y2021
## 10854 y2021
## 10855 y2021
## 10856 y2021
## 10857 y2021
## 10858 y2021
## 10859 y2021
## 10860 y2021
## 10861 y2021
## 10862 y2021
## 10863 y2021
## 10864 y2021
## 10865 y2021
## 10866 y2021
## 10867 y2021
## 10868 y2021
## 10869 y2021
## 10870 y2021
## 10871 y2021
## 10872 y2021
## 10873 y2021
## 10874 y2021
## 10875 y2021
## 10876 y2021
## 10877 y2021
## 10878 y2021
## 10879 y2021
## 10880 y2021
## 10881 y2021
## 10882 y2021
## 10883 y2021
## 10884 y2021
## 10885 y2021
## 10886 y2021
## 10887 y2021
## 10888 y2021
## 10889 y2021
## 10890 y2021
## 10891 y2021
## 10892 y2021
## 10893 y2021
## 10894 y2021
## 10895 y2021
## 10896 y2021
## 10897 y2021
## 10898 y2021
## 10899 y2021
## 10900 y2021
## 10901 y2021
## 10902 y2021
## 10903 y2021
## 10904 y2021
## 10905 y2021
## 10906 y2021
## 10907 y2021
## 10908 y2021
## 10909 y2021
## 10910 y2021
## 10911 y2021
## 10912 y2021
## 10913 y2021
## 10914 y2021
## 10915 y2021
## 10916 y2021
## 10917 y2021
## 10918 y2021
## 10919 y2021
## 10920 y2021
## 10921 y2021
## 10922 y2021
## 10923 y2021
## 10924 y2021
## 10925 y2021
## 10926 y2021
## 10927 y2021
## 10928 y2021
## 10929 y2021
## 10930 y2021
## 10931 y2021
## 10932 y2021
## 10933 y2021
## 10934 y2021
## 10935 y2021
## 10936 y2021
## 10937 y2021
## 10938 y2021
## 10939 y2021
## 10940 y2021
## 10941 y2021
## 10942 y2021
## 10943 y2021
## 10944 y2021
## 10945 y2021
## 10946 y2021
## 10947 y2021
## 10948 y2021
## 10949 y2021
## 10950 y2021
## 10951 y2021
## 10952 y2021
## 10953 y2021
## 10954 y2021
## 10955 y2021
## 10956 y2021
## 10957 y2021
## 10958 y2021
## 10959 y2021
## 10960 y2021
## 10961 y2021
## 10962 y2021
## 10963 y2021
## 10964 y2021
## 10965 y2021
## 10966 y2021
## 10967 y2021
## 10968 y2021
## 10969 y2021
## 10970 y2021
## 10971 y2021
## 10972 y2021
## 10973 y2021
## 10974 y2021
## 10975 y2021
## 10976 y2021
## 10977 y2021
## 10978 y2021
## 10979 y2021
## 10980 y2021
## 10981 y2021
## 10982 y2021
## 10983 y2021
## 10984 y2021
## 10985 y2021
## 10986 y2021
## 10987 y2021
## 10988 y2021
## 10989 y2021
## 10990 y2021
## 10991 y2021
## 10992 y2021
## 10993 y2021
## 10994 y2021
## 10995 y2021
## 10996 y2021
## 10997 y2021
## 10998 y2021
## 10999 y2021
## 11000 y2021
## 11001 y2021
## 11002 y2021
## 11003 y2021
## 11004 y2021
## 11005 y2021
## 11006 y2021
## 11007 y2021
## 11008 y2021
## 11009 y2021
## 11010 y2021
## 11011 y2021
## 11012 y2021
## 11013 y2021
## 11014 y2021
## 11015 y2021
## 11016 y2021
## 11017 y2021
## 11018 y2021
## 11019 y2021
## 11020 y2021
## 11021 y2021
## 11022 y2021
## 11023 y2021
## 11024 y2021
## 11025 y2021
## 11026 y2021
## 11027 y2021
## 11028 y2021
## 11029 y2021
## 11030 y2021
## 11031 y2021
## 11032 y2021
## 11033 y2021
## 11034 y2021
## 11035 y2021
## 11036 y2021
## 11037 y2021
## 11038 y2021
## 11039 y2021
## 11040 y2021
## 11041 y2021
## 11042 y2021
## 11043 y2021
## 11044 y2021
## 11045 y2021
## 11046 y2021
## 11047 y2021
## 11048 y2021
## 11049 y2021
## 11050 y2021
## 11051 y2021
## 11052 y2021
## 11053 y2021
## 11054 y2021
## 11055 y2021
## 11056 y2021
## 11057 y2021
## 11058 y2021
## 11059 y2021
## 11060 y2021
## 11061 y2021
## 11062 y2021
## 11063 y2021
## 11064 y2021
## 11065 y2021
## 11066 y2021
## 11067 y2021
## 11068 y2021
## 11069 y2021
## 11070 y2021
## 11071 y2021
## 11072 y2021
## 11073 y2021
## 11074 y2021
## 11075 y2021
## 11076 y2021
## 11077 y2021
## 11078 y2021
## 11079 y2021
## 11080 y2021
## 11081 y2021
## 11082 y2021
## 11083 y2021
## 11084 y2021
## 11085 y2021
## 11086 y2021
## 11087 y2021
## 11088 y2021
## 11089 y2021
## 11090 y2021
## 11091 y2021
## 11092 y2021
## 11093 y2021
## 11094 y2021
## 11095 y2021
## 11096 y2021
## 11097 y2021
## 11098 y2021
## 11099 y2021
## 11100 y2021
## 11101 y2021
## 11102 y2021
## 11103 y2021
## 11104 y2021
## 11105 y2021
## 11106 y2021
## 11107 y2021
## 11108 y2021
## 11109 y2021
## 11110 y2021
## 11111 y2021
## 11112 y2021
## 11113 y2021
## 11114 y2021
## 11115 y2021
## 11116 y2021
## 11117 y2021
## 11118 y2021
## 11119 y2021
## 11120 y2021
## 11121 y2021
## 11122 y2021
## 11123 y2021
## 11124 y2021
## 11125 y2021
## 11126 y2021
## 11127 y2021
## 11128 y2021
## 11129 y2021
## 11130 y2021
## 11131 y2021
## 11132 y2021
## 11133 y2021
## 11134 y2021
## 11135 y2021
## 11136 y2021
## 11137 y2021
## 11138 y2021
## 11139 y2021
## 11140 y2021
## 11141 y2021
## 11142 y2021
## 11143 y2021
## 11144 y2021
## 11145 y2021
## 11146 y2021
## 11147 y2021
## 11148 y2021
## 11149 y2021
## 11150 y2021
## 11151 y2021
## 11152 y2021
## 11153 y2021
## 11154 y2021
## 11155 y2021
## 11156 y2021
## 11157 y2021
## 11158 y2021
## 11159 y2021
## 11160 y2021
## 11161 y2021
## 11162 y2021
## 11163 y2021
## 11164 y2021
## 11165 y2021
## 11166 y2021
## 11167 y2021
## 11168 y2021
## 11169 y2021
## 11170 y2021
## 11171 y2021
## 11172 y2021
## 11173 y2021
## 11174 y2021
## 11175 y2021
## 11176 y2021
## 11177 y2021
## 11178 y2021
## 11179 y2021
## 11180 y2021
## 11181 y2021
## 11182 y2021
## 11183 y2021
## 11184 y2021
## 11185 y2021
## 11186 y2021
## 11187 y2021
## 11188 y2021
## 11189 y2021
## 11190 y2021
## 11191 y2021
## 11192 y2021
## 11193 y2021
## 11194 y2021
## 11195 y2021
## 11196 y2021
## 11197 y2021
## 11198 y2021
## 11199 y2021
## 11200 y2021
## 11201 y2021
## 11202 y2021
## 11203 y2021
## 11204 y2021
## 11205 y2021
## 11206 y2021
## 11207 y2021
## 11208 y2021
## 11209 y2021
## 11210 y2021
## 11211 y2021
## 11212 y2021
## 11213 y2021
## 11214 y2021
## 11215 y2021
## 11216 y2021
## 11217 y2021
## 11218 y2021
## 11219 y2021
## 11220 y2021
## 11221 y2021
## 11222 y2021
## 11223 y2021
## 11224 y2021
## 11225 y2021
## 11226 y2021
## 11227 y2021
## 11228 y2021
## 11229 y2021
## 11230 y2021
## 11231 y2021
## 11232 y2021
## 11233 y2021
## 11234 y2021
## 11235 y2021
## 11236 y2021
## 11237 y2021
## 11238 y2021
## 11239 y2021
## 11240 y2021
## 11241 y2021
## 11242 y2021
## 11243 y2021
## 11244 y2021
## 11245 y2021
## 11246 y2021
## 11247 y2021
## 11248 y2021
## 11249 y2021
## 11250 y2021
## 11251 y2021
## 11252 y2021
## 11253 y2021
## 11254 y2021
## 11255 y2021
## 11256 y2021
## 11257 y2021
## 11258 y2021
## 11259 y2021
## 11260 y2021
## 11261 y2021
## 11262 y2021
## 11263 y2021
## 11264 y2021
## 11265 y2021
## 11266 y2021
## 11267 y2021
## 11268 y2021
## 11269 y2021
## 11270 y2021
## 11271 y2021
## 11272 y2021
## 11273 y2021
## 11274 y2021
## 11275 y2021
## 11276 y2021
## 11277 y2021
## 11278 y2021
## 11279 y2021
## 11280 y2021
## 11281 y2021
## 11282 y2021
## 11283 y2021
## 11284 y2021
## 11285 y2021
## 11286 y2021
## 11287 y2021
## 11288 y2021
## 11289 y2021
## 11290 y2021
## 11291 y2021
## 11292 y2021
## 11293 y2021
## 11294 y2021
## 11295 y2021
## 11296 y2021
## 11297 y2021
## 11298 y2021
## 11299 y2021
## 11300 y2021
## 11301 y2021
## 11302 y2021
## 11303 y2021
## 11304 y2021
## 11305 y2021
## 11306 y2021
## 11307 y2021
## 11308 y2021
## 11309 y2021
## 11310 y2021
## 11311 y2021
## 11312 y2021
## 11313 y2021
## 11314 y2021
## 11315 y2021
## 11316 y2021
## 11317 y2021
## 11318 y2021
## 11319 y2021
## 11320 y2021
## 11321 y2021
## 11322 y2021
## 11323 y2021
## 11324 y2021
## 11325 y2021
## 11326 y2021
## 11327 y2021
## 11328 y2021
## 11329 y2021
## 11330 y2021
## 11331 y2021
## 11332 y2021
## 11333 y2021
## 11334 y2021
## 11335 y2021
## 11336 y2021
## 11337 y2021
## 11338 y2021
## 11339 y2021
## 11340 y2021
## 11341 y2021
## 11342 y2021
## 11343 y2021
## 11344 y2021
## 11345 y2021
## 11346 y2021
## 11347 y2021
## 11348 y2021
## 11349 y2021
## 11350 y2021
## 11351 y2021
## 11352 y2021
## 11353 y2021
## 11354 y2021
## 11355 y2021
## 11356 y2021
## 11357 y2021
## 11358 y2021
## 11359 y2021
## 11360 y2021
## 11361 y2021
## 11362 y2021
## 11363 y2021
## 11364 y2021
## 11365 y2021
## 11366 y2021
## 11367 y2021
## 11368 y2021
## 11369 y2021
## 11370 y2021
## 11371 y2021
## 11372 y2021
## 11373 y2021
## 11374 y2021
## 11375 y2021
## 11376 y2021
## 11377 y2021
## 11378 y2021
## 11379 y2021
## 11380 y2021
## 11381 y2021
## 11382 y2021
## 11383 y2021
## 11384 y2021
## 11385 y2021
## 11386 y2021
## 11387 y2021
## 11388 y2021
## 11389 y2021
## 11390 y2021
## 11391 y2021
## 11392 y2021
## 11393 y2021
## 11394 y2021
## 11395 y2021
## 11396 y2021
## 11397 y2021
## 11398 y2021
## 11399 y2021
## 11400 y2021
## 11401 y2021
## 11402 y2021
## 11403 y2021
## 11404 y2021
## 11405 y2021
## 11406 y2021
## 11407 y2021
## 11408 y2021
## 11409 y2021
## 11410 y2021
## 11411 y2021
## 11412 y2021
## 11413 y2021
## 11414 y2021
## 11415 y2021
## 11416 y2021
## 11417 y2021
## 11418 y2021
## 11419 y2021
## 11420 y2021
## 11421 y2021
## 11422 y2021
## 11423 y2021
## 11424 y2021
## 11425 y2021
## 11426 y2021
## 11427 y2021
## 11428 y2021
## 11429 y2021
## 11430 y2021
## 11431 y2021
## 11432 y2021
## 11433 y2021
## 11434 y2021
## 11435 y2021
## 11436 y2021
## 11437 y2021
## 11438 y2021
## 11439 y2021
## 11440 y2021
## 11441 y2021
## 11442 y2021
## 11443 y2021
## 11444 y2021
## 11445 y2021
## 11446 y2021
## 11447 y2021
## 11448 y2021
## 11449 y2021
## 11450 y2021
## 11451 y2021
## 11452 y2021
## 11453 y2021
## 11454 y2021
## 11455 y2021
## 11456 y2021
## 11457 y2021
## 11458 y2021
## 11459 y2021
## 11460 y2021
## 11461 y2021
## 11462 y2021
## 11463 y2021
## 11464 y2021
## 11465 y2021
## 11466 y2021
## 11467 y2021
## 11468 y2021
## 11469 y2021
## 11470 y2021
## 11471 y2021
## 11472 y2021
## 11473 y2021
## 11474 y2021
## 11475 y2021
## 11476 y2021
## 11477 y2021
## 11478 y2021
## 11479 y2021
## 11480 y2021
## 11481 y2021
## 11482 y2021
## 11483 y2021
## 11484 y2021
## 11485 y2021
## 11486 y2021
## 11487 y2021
## 11488 y2021
## 11489 y2021
## 11490 y2021
## 11491 y2021
## 11492 y2021
## 11493 y2021
## 11494 y2021
## 11495 y2021
## 11496 y2021
## 11497 y2021
## 11498 y2021
## 11499 y2021
## 11500 y2021
## 11501 y2021
## 11502 y2021
## 11503 y2021
## 11504 y2021
## 11505 y2021
## 11506 y2021
## 11507 y2021
## 11508 y2021
## 11509 y2021
## 11510 y2021
## 11511 y2021
## 11512 y2021
## 11513 y2021
## 11514 y2021
## 11515 y2021
## 11516 y2021
## 11517 y2021
## 11518 y2021
## 11519 y2021
## 11520 y2021
## 11521 y2021
## 11522 y2021
## 11523 y2021
## 11524 y2021
## 11525 y2021
## 11526 y2021
## 11527 y2021
## 11528 y2021
## 11529 y2021
## 11530 y2021
## 11531 y2021
## 11532 y2021
## 11533 y2021
## 11534 y2021
## 11535 y2021
## 11536 y2021
## 11537 y2021
## 11538 y2021
## 11539 y2021
## 11540 y2021
## 11541 y2021
## 11542 y2021
## 11543 y2021
## 11544 y2021
## 11545 y2021
## 11546 y2021
## 11547 y2021
## 11548 y2021
## 11549 y2021
## 11550 y2021
## 11551 y2021
## 11552 y2021
## 11553 y2021
## 11554 y2021
## 11555 y2021
## 11556 y2021
## 11557 y2021
## 11558 y2021
## 11559 y2021
## 11560 y2021
## 11561 y2021
## 11562 y2021
## 11563 y2021
## 11564 y2021
## 11565 y2021
## 11566 y2021
## 11567 y2021
## 11568 y2021
## 11569 y2021
## 11570 y2021
## 11571 y2021
## 11572 y2021
## 11573 y2021
## 11574 y2021
## 11575 y2021
## 11576 y2021
## 11577 y2021
## 11578 y2021
## 11579 y2021
## 11580 y2021
## 11581 y2021
## 11582 y2021
## 11583 y2021
## 11584 y2021
## 11585 y2021
## 11586 y2021
## 11587 y2021
## 11588 y2021
## 11589 y2021
## 11590 y2021
## 11591 y2021
## 11592 y2021
## 11593 y2021
## 11594 y2021
## 11595 y2021
## 11596 y2021
## 11597 y2021
## 11598 y2021
## 11599 y2021
## 11600 y2021
## 11601 y2021
## 11602 y2021
## 11603 y2021
## 11604 y2021
## 11605 y2021
## 11606 y2021
## 11607 y2021
## 11608 y2021
## 11609 y2021
## 11610 y2021
## 11611 y2021
## 11612 y2021
## 11613 y2021
## 11614 y2021
## 11615 y2021
## 11616 y2021
## 11617 y2021
## 11618 y2021
## 11619 y2021
## 11620 y2021
## 11621 y2021
## 11622 y2021
## 11623 y2021
## 11624 y2021
## 11625 y2021
## 11626 y2021
## 11627 y2021
## 11628 y2021
## 11629 y2021
## 11630 y2021
## 11631 y2021
## 11632 y2021
## 11633 y2021
## 11634 y2021
## 11635 y2021
## 11636 y2021
## 11637 y2021
## 11638 y2021
## 11639 y2021
## 11640 y2021
## 11641 y2021
## 11642 y2021
## 11643 y2021
## 11644 y2021
## 11645 y2021
## 11646 y2021
## 11647 y2021
## 11648 y2021
## 11649 y2021
## 11650 y2021
## 11651 y2021
## 11652 y2021
## 11653 y2021
## 11654 y2021
## 11655 y2021
## 11656 y2021
## 11657 y2021
## 11658 y2021
## 11659 y2021
## 11660 y2021
## 11661 y2021
## 11662 y2021
## 11663 y2021
## 11664 y2021
## 11665 y2021
## 11666 y2021
## 11667 y2021
## 11668 y2021
## 11669 y2021
## 11670 y2021
## 11671 y2021
## 11672 y2021
## 11673 y2021
## 11674 y2021
## 11675 y2021
## 11676 y2021
## 11677 y2021
## 11678 y2021
## 11679 y2021
## 11680 y2021
## 11681 y2021
## 11682 y2021
## 11683 y2021
## 11684 y2021
## 11685 y2021
## 11686 y2021
## 11687 y2021
## 11688 y2021
## 11689 y2021
## 11690 y2021
## 11691 y2021
## 11692 y2021
## 11693 y2021
## 11694 y2021
## 11695 y2021
## 11696 y2021
## 11697 y2021
## 11698 y2021
## 11699 y2021
## 11700 y2021
## 11701 y2021
## 11702 y2021
## 11703 y2021
## 11704 y2021
## 11705 y2021
## 11706 y2021
## 11707 y2021
## 11708 y2021
## 11709 y2021
## 11710 y2021
## 11711 y2021
## 11712 y2021
## 11713 y2021
## 11714 y2021
## 11715 y2021
## 11716 y2021
## 11717 y2021
## 11718 y2021
## 11719 y2021
## 11720 y2021
## 11721 y2021
## 11722 y2021
## 11723 y2021
## 11724 y2021
## 11725 y2021
## 11726 y2021
## 11727 y2021
## 11728 y2021
## 11729 y2021
## 11730 y2021
## 11731 y2021
## 11732 y2021
## 11733 y2021
## 11734 y2021
## 11735 y2021
## 11736 y2021
## 11737 y2021
## 11738 y2021
## 11739 y2021
## 11740 y2021
## 11741 y2021
## 11742 y2021
## 11743 y2021
## 11744 y2021
## 11745 y2021
## 11746 y2021
## 11747 y2021
## 11748 y2021
## 11749 y2021
## 11750 y2021
## 11751 y2021
## 11752 y2021
## 11753 y2021
## 11754 y2021
## 11755 y2021
## 11756 y2021
## 11757 y2021
## 11758 y2021
## 11759 y2021
## 11760 y2021
## 11761 y2021
## 11762 y2021
## 11763 y2021
## 11764 y2021
## 11765 y2021
## 11766 y2021
## 11767 y2021
## 11768 y2021
## 11769 y2021
## 11770 y2021
## 11771 y2021
## 11772 y2021
## 11773 y2021
## 11774 y2021
## 11775 y2021
## 11776 y2021
## 11777 y2021
## 11778 y2021
## 11779 y2021
## 11780 y2021
## 11781 y2021
## 11782 y2021
## 11783 y2021
## 11784 y2021
## 11785 y2021
## 11786 y2021
## 11787 y2021
## 11788 y2021
## 11789 y2021
## 11790 y2021
## 11791 y2021
## 11792 y2021
## 11793 y2021
## 11794 y2021
## 11795 y2021
## 11796 y2021
## 11797 y2021
## 11798 y2021
## 11799 y2021
## 11800 y2021
## 11801 y2021
## 11802 y2021
## 11803 y2021
## 11804 y2021
## 11805 y2021
## 11806 y2021
## 11807 y2021
## 11808 y2021
## 11809 y2021
## 11810 y2021
## 11811 y2021
## 11812 y2021
## 11813 y2021
## 11814 y2021
## 11815 y2021
## 11816 y2021
## 11817 y2021
## 11818 y2021
## 11819 y2021
## 11820 y2021
## 11821 y2021
## 11822 y2021
## 11823 y2021
## 11824 y2021
## 11825 y2021
## 11826 y2021
## 11827 y2021
## 11828 y2021
## 11829 y2021
## 11830 y2021
## 11831 y2021
## 11832 y2021
## 11833 y2021
## 11834 y2021
## 11835 y2021
## 11836 y2021
## 11837 y2021
## 11838 y2021
## 11839 y2021
## 11840 y2021
## 11841 y2021
## 11842 y2021
## 11843 y2021
## 11844 y2021
## 11845 y2021
## 11846 y2021
## 11847 y2021
## 11848 y2021
## 11849 y2021
## 11850 y2021
## 11851 y2021
## 11852 y2021
## 11853 y2021
## 11854 y2021
## 11855 y2021
## 11856 y2021
## 11857 y2021
## 11858 y2021
## 11859 y2021
## 11860 y2021
## 11861 y2021
## 11862 y2021
## 11863 y2021
## 11864 y2021
## 11865 y2021
## 11866 y2021
## 11867 y2021
## 11868 y2021
## 11869 y2021
## 11870 y2021
## 11871 y2021
## 11872 y2021
## 11873 y2021
## 11874 y2021
## 11875 y2021
## 11876 y2021
## 11877 y2021
## 11878 y2021
## 11879 y2021
## 11880 y2021
## 11881 y2021
## 11882 y2021
## 11883 y2021
## 11884 y2021
## 11885 y2021
## 11886 y2021
## 11887 y2021
## 11888 y2021
## 11889 y2021
## 11890 y2021
## 11891 y2021
## 11892 y2021
## 11893 y2021
## 11894 y2021
## 11895 y2021
## 11896 y2021
## 11897 y2021
## 11898 y2021
## 11899 y2021
## 11900 y2021
## 11901 y2021
## 11902 y2021
## 11903 y2021
## 11904 y2021
## 11905 y2021
## 11906 y2021
## 11907 y2021
## 11908 y2021
## 11909 y2021
## 11910 y2021
## 11911 y2021
## 11912 y2021
## 11913 y2021
## 11914 y2021
## 11915 y2021
## 11916 y2021
## 11917 y2021
## 11918 y2021
## 11919 y2021
## 11920 y2021
## 11921 y2021
## 11922 y2021
## 11923 y2021
## 11924 y2021
## 11925 y2021
## 11926 y2021
## 11927 y2021
## 11928 y2021
## 11929 y2021
## 11930 y2021
## 11931 y2021
## 11932 y2021
## 11933 y2021
## 11934 y2021
## 11935 y2021
## 11936 y2021
## 11937 y2021
## 11938 y2021
## 11939 y2021
## 11940 y2021
## 11941 y2021
## 11942 y2021
## 11943 y2021
## 11944 y2021
## 11945 y2021
## 11946 y2021
## 11947 y2021
## 11948 y2021
## 11949 y2021
## 11950 y2021
## 11951 y2021
## 11952 y2021
## 11953 y2021
## 11954 y2021
## 11955 y2021
## 11956 y2021
## 11957 y2021
## 11958 y2021
## 11959 y2021
## 11960 y2021
## 11961 y2021
## 11962 y2021
## 11963 y2021
## 11964 y2021
## 11965 y2021
## 11966 y2021
## 11967 y2021
## 11968 y2021
## 11969 y2021
## 11970 y2021
## 11971 y2021
## 11972 y2021
## 11973 y2021
## 11974 y2021
## 11975 y2021
## 11976 y2021
## 11977 y2021
## 11978 y2021
## 11979 y2021
## 11980 y2021
## 11981 y2021
## 11982 y2021
## 11983 y2021
## 11984 y2021
## 11985 y2021
## 11986 y2021
## 11987 y2021
## 11988 y2021
## 11989 y2021
## 11990 y2021
## 11991 y2021
## 11992 y2021
## 11993 y2021
## 11994 y2021
## 11995 y2021
## 11996 y2021
## 11997 y2021
## 11998 y2021
## 11999 y2021
## 12000 y2021
## 12001 y2021
## 12002 y2021
## 12003 y2021
## 12004 y2021
## 12005 y2021
## 12006 y2021
## 12007 y2021
## 12008 y2021
## 12009 y2021
## 12010 y2021
## 12011 y2021
## 12012 y2021
## 12013 y2021
## 12014 y2021
## 12015 y2021
## 12016 y2021
## 12017 y2021
## 12018 y2021
## 12019 y2021
## 12020 y2021
## 12021 y2021
## 12022 y2021
## 12023 y2021
## 12024 y2021
## 12025 y2021
## 12026 y2021
## 12027 y2021
## 12028 y2021
## 12029 y2021
## 12030 y2021
## 12031 y2021
## 12032 y2021
## 12033 y2021
## 12034 y2021
## 12035 y2021
## 12036 y2021
## 12037 y2021
## 12038 y2021
## 12039 y2021
## 12040 y2021
## 12041 y2021
## 12042 y2021
## 12043 y2021
## 12044 y2021
## 12045 y2021
## 12046 y2021
## 12047 y2021
## 12048 y2021
## 12049 y2021
## 12050 y2021
## 12051 y2021
## 12052 y2021
## 12053 y2021
## 12054 y2021
## 12055 y2021
## 12056 y2021
## 12057 y2021
## 12058 y2021
## 12059 y2021
## 12060 y2021
## 12061 y2021
## 12062 y2021
## 12063 y2021
## 12064 y2021
## 12065 y2021
## 12066 y2021
## 12067 y2021
## 12068 y2021
## 12069 y2021
## 12070 y2021
## 12071 y2021
## 12072 y2021
## 12073 y2021
## 12074 y2021
## 12075 y2021
## 12076 y2021
## 12077 y2021
## 12078 y2021
## 12079 y2021
## 12080 y2021
## 12081 y2021
## 12082 y2021
## 12083 y2021
## 12084 y2021
## 12085 y2021
## 12086 y2021
## 12087 y2021
## 12088 y2021
## 12089 y2021
## 12090 y2021
## 12091 y2021
## 12092 y2021
## 12093 y2021
## 12094 y2021
## 12095 y2021
## 12096 y2021
## 12097 y2021
## 12098 y2021
## 12099 y2021
## 12100 y2021
## 12101 y2021
## 12102 y2021
## 12103 y2021
## 12104 y2021
## 12105 y2021
## 12106 y2021
## 12107 y2021
## 12108 y2021
## 12109 y2021
## 12110 y2021
## 12111 y2021
## 12112 y2021
## 12113 y2021
## 12114 y2021
## 12115 y2021
## 12116 y2021
## 12117 y2021
## 12118 y2021
## 12119 y2021
## 12120 y2021
## 12121 y2021
## 12122 y2021
## 12123 y2021
## 12124 y2021
## 12125 y2021
## 12126 y2021
## 12127 y2021
## 12128 y2021
## 12129 y2021
## 12130 y2021
## 12131 y2021
## 12132 y2021
## 12133 y2021
## 12134 y2021
## 12135 y2021
## 12136 y2021
## 12137 y2021
## 12138 y2021
## 12139 y2021
## 12140 y2021
## 12141 y2021
## 12142 y2021
## 12143 y2021
## 12144 y2021
## 12145 y2021
## 12146 y2021
## 12147 y2021
## 12148 y2021
## 12149 y2021
## 12150 y2021
## 12151 y2021
## 12152 y2021
## 12153 y2021
## 12154 y2021
## 12155 y2021
## 12156 y2021
## 12157 y2021
## 12158 y2021
## 12159 y2021
## 12160 y2021
## 12161 y2021
## 12162 y2021
## 12163 y2021
## 12164 y2021
## 12165 y2021
## 12166 y2021
## 12167 y2021
## 12168 y2021
## 12169 y2021
## 12170 y2021
## 12171 y2021
## 12172 y2021
## 12173 y2021
## 12174 y2021
## 12175 y2021
## 12176 y2021
## 12177 y2021
## 12178 y2021
## 12179 y2021
## 12180 y2021
## 12181 y2021
## 12182 y2021
## 12183 y2021
## 12184 y2021
## 12185 y2021
## 12186 y2021
## 12187 y2021
## 12188 y2021
## 12189 y2021
## 12190 y2021
## 12191 y2021
## 12192 y2021
## 12193 y2021
## 12194 y2021
## 12195 y2021
## 12196 y2021
## 12197 y2021
## 12198 y2021
## 12199 y2021
## 12200 y2021
## 12201 y2021
## 12202 y2021
## 12203 y2021
## 12204 y2021
## 12205 y2021
## 12206 y2021
## 12207 y2021
## 12208 y2021
## 12209 y2021
## 12210 y2021
## 12211 y2021
## 12212 y2021
## 12213 y2021
## 12214 y2021
## 12215 y2021
## 12216 y2021
## 12217 y2021
## 12218 y2021
## 12219 y2021
## 12220 y2021
## 12221 y2021
## 12222 y2021
## 12223 y2021
## 12224 y2021
## 12225 y2021
## 12226 y2021
## 12227 y2021
## 12228 y2021
## 12229 y2021
## 12230 y2021
## 12231 y2021
## 12232 y2021
## 12233 y2021
## 12234 y2021
## 12235 y2021
## 12236 y2021
## 12237 y2021
## 12238 y2021
## 12239 y2021
## 12240 y2021
## 12241 y2021
## 12242 y2021
## 12243 y2021
## 12244 y2021
## 12245 y2021
## 12246 y2021
## 12247 y2021
## 12248 y2021
## 12249 y2021
## 12250 y2021
## 12251 y2021
## 12252 y2021
## 12253 y2021
## 12254 y2021
## 12255 y2021
## 12256 y2021
## 12257 y2021
## 12258 y2021
## 12259 y2021
## 12260 y2021
## 12261 y2021
## 12262 y2021
## 12263 y2021
## 12264 y2021
## 12265 y2021
## 12266 y2021
## 12267 y2021
## 12268 y2021
## 12269 y2021
## 12270 y2021
## 12271 y2021
## 12272 y2021
## 12273 y2021
## 12274 y2021
## 12275 y2021
## 12276 y2021
## 12277 y2021
## 12278 y2021
## 12279 y2021
## 12280 y2021
## 12281 y2021
## 12282 y2021
## 12283 y2021
## 12284 y2021
## 12285 y2021
## 12286 y2021
## 12287 y2021
## 12288 y2021
## 12289 y2021
## 12290 y2021
## 12291 y2021
## 12292 y2021
## 12293 y2021
## 12294 y2021
## 12295 y2021
## 12296 y2021
## 12297 y2021
## 12298 y2021
## 12299 y2021
## 12300 y2021
## 12301 y2021
## 12302 y2021
## 12303 y2021
## 12304 y2021
## 12305 y2021
## 12306 y2021
## 12307 y2021
## 12308 y2021
## 12309 y2021
## 12310 y2021
## 12311 y2021
## 12312 y2021
## 12313 y2021
## 12314 y2021
## 12315 y2021
## 12316 y2021
## 12317 y2021
## 12318 y2021
## 12319 y2021
## 12320 y2021
## 12321 y2021
## 12322 y2021
## 12323 y2021
## 12324 y2021
## 12325 y2021
## 12326 y2021
## 12327 y2021
## 12328 y2021
## 12329 y2021
## 12330 y2021
## 12331 y2021
## 12332 y2021
## 12333 y2021
## 12334 y2021
## 12335 y2021
## 12336 y2021
## 12337 y2021
## 12338 y2021
## 12339 y2021
## 12340 y2021
## 12341 y2021
## 12342 y2021
## 12343 y2021
## 12344 y2021
## 12345 y2021
## 12346 y2021
## 12347 y2021
## 12348 y2021
## 12349 y2021
## 12350 y2021
## 12351 y2021
## 12352 y2021
## 12353 y2021
## 12354 y2021
## 12355 y2021
## 12356 y2021
## 12357 y2021
## 12358 y2021
## 12359 y2021
## 12360 y2021
## 12361 y2021
## 12362 y2021
## 12363 y2021
## 12364 y2021
## 12365 y2021
## 12366 y2021
## 12367 y2021
## 12368 y2021
## 12369 y2021
## 12370 y2021
## 12371 y2021
## 12372 y2021
## 12373 y2021
## 12374 y2021
## 12375 y2021
## 12376 y2021
## 12377 y2021
## 12378 y2021
## 12379 y2021
## 12380 y2021
## 12381 y2021
## 12382 y2021
## 12383 y2021
## 12384 y2021
## 12385 y2021
## 12386 y2021
## 12387 y2021
## 12388 y2021
## 12389 y2021
## 12390 y2021
## 12391 y2021
## 12392 y2021
## 12393 y2021
## 12394 y2021
## 12395 y2021
## 12396 y2021
## 12397 y2021
## 12398 y2021
## 12399 y2021
## 12400 y2021
## 12401 y2021
## 12402 y2021
## 12403 y2021
## 12404 y2021
## 12405 y2021
## 12406 y2021
## 12407 y2021
## 12408 y2021
## 12409 y2021
## 12410 y2021
## 12411 y2021
## 12412 y2021
## 12413 y2021
## 12414 y2021
## 12415 y2021
## 12416 y2021
## 12417 y2021
## 12418 y2021
## 12419 y2021
## 12420 y2021
## 12421 y2021
## 12422 y2021
## 12423 y2021
## 12424 y2021
## 12425 y2021
## 12426 y2021
## 12427 y2021
## 12428 y2021
## 12429 y2021
## 12430 y2021
## 12431 y2021
## 12432 y2021
## 12433 y2021
## 12434 y2021
## 12435 y2021
## 12436 y2021
## 12437 y2021
## 12438 y2021
## 12439 y2021
## 12440 y2021
## 12441 y2021
## 12442 y2021
## 12443 y2021
## 12444 y2021
## 12445 y2021
## 12446 y2021
## 12447 y2021
## 12448 y2021
## 12449 y2021
## 12450 y2021
## 12451 y2021
## 12452 y2021
## 12453 y2021
## 12454 y2021
## 12455 y2021
## 12456 y2021
## 12457 y2021
## 12458 y2021
## 12459 y2021
## 12460 y2021
## 12461 y2021
## 12462 y2021
## 12463 y2021
## 12464 y2021
## 12465 y2021
## 12466 y2021
## 12467 y2021
## 12468 y2021
## 12469 y2021
## 12470 y2021
## 12471 y2021
## 12472 y2021
## 12473 y2021
## 12474 y2021
## 12475 y2021
## 12476 y2021
## 12477 y2021
## 12478 y2021
## 12479 y2021
## 12480 y2021
## 12481 y2021
## 12482 y2021
## 12483 y2021
## 12484 y2021
## 12485 y2021
## 12486 y2021
## 12487 y2021
## 12488 y2021
## 12489 y2021
## 12490 y2021
## 12491 y2021
## 12492 y2021
## 12493 y2021
## 12494 y2021
## 12495 y2021
## 12496 y2021
## 12497 y2021
## 12498 y2021
## 12499 y2021
## 12500 y2021
## 12501 y2021
## 12502 y2021
## 12503 y2021
## 12504 y2021
## 12505 y2021
## 12506 y2021
## 12507 y2021
## 12508 y2021
## 12509 y2021
## 12510 y2021
## 12511 y2021
## 12512 y2021
## 12513 y2021
## 12514 y2021
## 12515 y2021
## 12516 y2021
## 12517 y2021
## 12518 y2021
## 12519 y2021
## 12520 y2021
## 12521 y2021
## 12522 y2021
## 12523 y2021
## 12524 y2021
## 12525 y2021
## 12526 y2021
## 12527 y2021
## 12528 y2021
## 12529 y2021
## 12530 y2021
## 12531 y2021
## 12532 y2021
## 12533 y2021
## 12534 y2021
## 12535 y2021
## 12536 y2021
## 12537 y2021
## 12538 y2021
## 12539 y2021
## 12540 y2021
## 12541 y2021
## 12542 y2021
## 12543 y2021
## 12544 y2021
## 12545 y2021
## 12546 y2021
## 12547 y2021
## 12548 y2021
## 12549 y2021
## 12550 y2021
## 12551 y2021
## 12552 y2021
## 12553 y2021
## 12554 y2021
## 12555 y2021
## 12556 y2021
## 12557 y2021
## 12558 y2021
## 12559 y2021
## 12560 y2021
## 12561 y2021
## 12562 y2021
## 12563 y2021
## 12564 y2021
## 12565 y2021
## 12566 y2021
## 12567 y2021
## 12568 y2021
## 12569 y2021
## 12570 y2021
## 12571 y2021
## 12572 y2021
## 12573 y2021
## 12574 y2021
## 12575 y2021
## 12576 y2021
## 12577 y2021
## 12578 y2021
## 12579 y2021
## 12580 y2021
## 12581 y2021
## 12582 y2021
## 12583 y2021
## 12584 y2021
## 12585 y2021
## 12586 y2021
## 12587 y2021
## 12588 y2021
## 12589 y2021
## 12590 y2021
## 12591 y2021
## 12592 y2021
## 12593 y2021
## 12594 y2021
## 12595 y2021
## 12596 y2021
## 12597 y2021
## 12598 y2021
## 12599 y2021
## 12600 y2021
## 12601 y2021
## 12602 y2021
## 12603 y2021
## 12604 y2021
## 12605 y2021
## 12606 y2021
## 12607 y2021
## 12608 y2021
## 12609 y2021
## 12610 y2021
## 12611 y2021
## 12612 y2021
## 12613 y2021
## 12614 y2021
## 12615 y2021
## 12616 y2021
## 12617 y2021
## 12618 y2021
## 12619 y2021
## 12620 y2021
## 12621 y2021
## 12622 y2021
## 12623 y2021
## 12624 y2021
## 12625 y2021
## 12626 y2021
## 12627 y2021
## 12628 y2021
## 12629 y2021
## 12630 y2021
## 12631 y2021
## 12632 y2021
## 12633 y2021
## 12634 y2021
## 12635 y2021
## 12636 y2021
## 12637 y2021
## 12638 y2021
## 12639 y2021
## 12640 y2021
## 12641 y2021
## 12642 y2021
## 12643 y2021
## 12644 y2021
## 12645 y2021
## 12646 y2021
## 12647 y2021
## 12648 y2021
## 12649 y2021
## 12650 y2021
## 12651 y2021
## 12652 y2021
## 12653 y2021
## 12654 y2021
## 12655 y2021
## 12656 y2021
## 12657 y2021
## 12658 y2021
## 12659 y2021
## 12660 y2021
## 12661 y2021
## 12662 y2021
## 12663 y2021
## 12664 y2021
## 12665 y2021
## 12666 y2021
## 12667 y2021
## 12668 y2021
## 12669 y2021
## 12670 y2021
## 12671 y2021
## 12672 y2021
## 12673 y2021
## 12674 y2021
## 12675 y2021
## 12676 y2021
## 12677 y2021
## 12678 y2021
## 12679 y2021
## 12680 y2021
## 12681 y2021
## 12682 y2021
## 12683 y2021
## 12684 y2021
## 12685 y2021
## 12686 y2021
## 12687 y2021
## 12688 y2021
## 12689 y2021
## 12690 y2021
## 12691 y2021
## 12692 y2021
## 12693 y2021
## 12694 y2021
## 12695 y2021
## 12696 y2021
## 12697 y2021
## 12698 y2021
## 12699 y2021
## 12700 y2021
## 12701 y2021
## 12702 y2021
## 12703 y2021
## 12704 y2021
## 12705 y2021
## 12706 y2021
## 12707 y2021
## 12708 y2021
## 12709 y2021
## 12710 y2021
## 12711 y2021
## 12712 y2021
## 12713 y2021
## 12714 y2021
## 12715 y2021
## 12716 y2021
## 12717 y2021
## 12718 y2021
## 12719 y2021
## 12720 y2021
## 12721 y2021
## 12722 y2021
## 12723 y2021
## 12724 y2021
## 12725 y2021
## 12726 y2021
## 12727 y2021
## 12728 y2021
## 12729 y2021
## 12730 y2021
## 12731 y2021
## 12732 y2021
## 12733 y2021
## 12734 y2021
## 12735 y2021
## 12736 y2021
## 12737 y2021
## 12738 y2021
## 12739 y2021
## 12740 y2021
## 12741 y2021
## 12742 y2022
## 12743 y2022
## 12744 y2022
## 12745 y2022
## 12746 y2022
## 12747 y2022
## 12748 y2022
## 12749 y2022
## 12750 y2022
## 12751 y2022
## 12752 y2022
## 12753 y2022
## 12754 y2022
## 12755 y2022
## 12756 y2022
## 12757 y2022
## 12758 y2022
## 12759 y2022
## 12760 y2022
## 12761 y2022
## 12762 y2022
## 12763 y2022
## 12764 y2022
## 12765 y2022
## 12766 y2022
## 12767 y2022
## 12768 y2022
## 12769 y2022
## 12770 y2022
## 12771 y2022
## 12772 y2022
## 12773 y2022
## 12774 y2022
## 12775 y2022
## 12776 y2022
## 12777 y2022
## 12778 y2022
## 12779 y2022
## 12780 y2022
## 12781 y2022
## 12782 y2022
## 12783 y2022
## 12784 y2022
## 12785 y2022
## 12786 y2022
## 12787 y2022
## 12788 y2022
## 12789 y2022
## 12790 y2022
## 12791 y2022
## 12792 y2022
## 12793 y2022
## 12794 y2022
## 12795 y2022
## 12796 y2022
## 12797 y2022
## 12798 y2022
## 12799 y2022
## 12800 y2022
## 12801 y2022
## 12802 y2022
## 12803 y2022
## 12804 y2022
## 12805 y2022
## 12806 y2022
## 12807 y2022
## 12808 y2022
## 12809 y2022
## 12810 y2022
## 12811 y2022
## 12812 y2022
## 12813 y2022
## 12814 y2022
## 12815 y2022
## 12816 y2022
## 12817 y2022
## 12818 y2022
## 12819 y2022
## 12820 y2022
## 12821 y2022
## 12822 y2022
## 12823 y2022
## 12824 y2022
## 12825 y2022
## 12826 y2022
## 12827 y2022
## 12828 y2022
## 12829 y2022
## 12830 y2022
## 12831 y2022
## 12832 y2022
## 12833 y2022
## 12834 y2022
## 12835 y2022
## 12836 y2022
## 12837 y2022
## 12838 y2022
## 12839 y2022
## 12840 y2022
## 12841 y2022
## 12842 y2022
## 12843 y2022
## 12844 y2022
## 12845 y2022
## 12846 y2022
## 12847 y2022
## 12848 y2022
## 12849 y2022
## 12850 y2022
## 12851 y2022
## 12852 y2022
## 12853 y2022
## 12854 y2022
## 12855 y2022
## 12856 y2022
## 12857 y2022
## 12858 y2022
## 12859 y2022
## 12860 y2022
## 12861 y2022
## 12862 y2022
## 12863 y2022
## 12864 y2022
## 12865 y2022
## 12866 y2022
## 12867 y2022
## 12868 y2022
## 12869 y2022
## 12870 y2022
## 12871 y2022
## 12872 y2022
## 12873 y2022
## 12874 y2022
## 12875 y2022
## 12876 y2022
## 12877 y2022
## 12878 y2022
## 12879 y2022
## 12880 y2022
## 12881 y2022
## 12882 y2022
## 12883 y2022
## 12884 y2022
## 12885 y2022
## 12886 y2022
## 12887 y2022
## 12888 y2022
## 12889 y2022
## 12890 y2022
## 12891 y2022
## 12892 y2022
## 12893 y2022
## 12894 y2022
## 12895 y2022
## 12896 y2022
## 12897 y2022
## 12898 y2022
## 12899 y2022
## 12900 y2022
## 12901 y2022
## 12902 y2022
## 12903 y2022
## 12904 y2022
## 12905 y2022
## 12906 y2022
## 12907 y2022
## 12908 y2022
## 12909 y2022
## 12910 y2022
## 12911 y2022
## 12912 y2022
## 12913 y2022
## 12914 y2022
## 12915 y2022
## 12916 y2022
## 12917 y2022
## 12918 y2022
## 12919 y2022
## 12920 y2022
## 12921 y2022
## 12922 y2022
## 12923 y2022
## 12924 y2022
## 12925 y2022
## 12926 y2022
## 12927 y2022
## 12928 y2022
## 12929 y2022
## 12930 y2022
## 12931 y2022
## 12932 y2022
## 12933 y2022
## 12934 y2022
## 12935 y2022
## 12936 y2022
## 12937 y2022
## 12938 y2022
## 12939 y2022
## 12940 y2022
## 12941 y2022
## 12942 y2022
## 12943 y2022
## 12944 y2022
## 12945 y2022
## 12946 y2022
## 12947 y2022
## 12948 y2022
## 12949 y2022
## 12950 y2022
## 12951 y2022
## 12952 y2022
## 12953 y2022
## 12954 y2022
## 12955 y2022
## 12956 y2022
## 12957 y2022
## 12958 y2022
## 12959 y2022
## 12960 y2022
## 12961 y2022
## 12962 y2022
## 12963 y2022
## 12964 y2022
## 12965 y2022
## 12966 y2022
## 12967 y2022
## 12968 y2022
## 12969 y2022
## 12970 y2022
## 12971 y2022
## 12972 y2022
## 12973 y2022
## 12974 y2022
## 12975 y2022
## 12976 y2022
## 12977 y2022
## 12978 y2022
## 12979 y2022
## 12980 y2022
## 12981 y2022
## 12982 y2022
## 12983 y2022
## 12984 y2022
## 12985 y2022
## 12986 y2022
## 12987 y2022
## 12988 y2022
## 12989 y2022
## 12990 y2022
## 12991 y2022
## 12992 y2022
## 12993 y2022
## 12994 y2022
## 12995 y2022
## 12996 y2022
## 12997 y2022
## 12998 y2022
## 12999 y2022
## 13000 y2022
## 13001 y2022
## 13002 y2022
## 13003 y2022
## 13004 y2022
## 13005 y2022
## 13006 y2022
## 13007 y2022
## 13008 y2022
## 13009 y2022
## 13010 y2022
## 13011 y2022
## 13012 y2022
## 13013 y2022
## 13014 y2022
## 13015 y2022
## 13016 y2022
## 13017 y2022
## 13018 y2022
## 13019 y2022
## 13020 y2022
## 13021 y2022
## 13022 y2022
## 13023 y2022
## 13024 y2022
## 13025 y2022
## 13026 y2022
## 13027 y2022
## 13028 y2022
## 13029 y2022
## 13030 y2022
## 13031 y2022
## 13032 y2022
## 13033 y2022
## 13034 y2022
## 13035 y2022
## 13036 y2022
## 13037 y2022
## 13038 y2022
## 13039 y2022
## 13040 y2022
## 13041 y2022
## 13042 y2022
## 13043 y2022
## 13044 y2022
## 13045 y2022
## 13046 y2022
## 13047 y2022
## 13048 y2022
## 13049 y2022
## 13050 y2022
## 13051 y2022
## 13052 y2022
## 13053 y2022
## 13054 y2022
## 13055 y2022
## 13056 y2022
## 13057 y2022
## 13058 y2022
## 13059 y2022
## 13060 y2022
## 13061 y2022
## 13062 y2022
## 13063 y2022
## 13064 y2022
## 13065 y2022
## 13066 y2022
## 13067 y2022
## 13068 y2022
## 13069 y2022
## 13070 y2022
## 13071 y2022
## 13072 y2022
## 13073 y2022
## 13074 y2022
## 13075 y2022
## 13076 y2022
## 13077 y2022
## 13078 y2022
## 13079 y2022
## 13080 y2022
## 13081 y2022
## 13082 y2022
## 13083 y2022
## 13084 y2022
## 13085 y2022
## 13086 y2022
## 13087 y2022
## 13088 y2022
## 13089 y2022
## 13090 y2022
## 13091 y2022
## 13092 y2022
## 13093 y2022
## 13094 y2022
## 13095 y2022
## 13096 y2022
## 13097 y2022
## 13098 y2022
## 13099 y2022
## 13100 y2022
## 13101 y2022
## 13102 y2022
## 13103 y2022
## 13104 y2022
## 13105 y2022
## 13106 y2022
## 13107 y2022
## 13108 y2022
## 13109 y2022
## 13110 y2022
## 13111 y2022
## 13112 y2022
## 13113 y2022
## 13114 y2022
## 13115 y2022
## 13116 y2022
## 13117 y2022
## 13118 y2022
## 13119 y2022
## 13120 y2022
## 13121 y2022
## 13122 y2022
## 13123 y2022
## 13124 y2022
## 13125 y2022
## 13126 y2022
## 13127 y2022
## 13128 y2022
## 13129 y2022
## 13130 y2022
## 13131 y2022
## 13132 y2022
## 13133 y2022
## 13134 y2022
## 13135 y2022
## 13136 y2022
## 13137 y2022
## 13138 y2022
## 13139 y2022
## 13140 y2022
## 13141 y2022
## 13142 y2022
## 13143 y2022
## 13144 y2022
## 13145 y2022
## 13146 y2022
## 13147 y2022
## 13148 y2022
## 13149 y2022
## 13150 y2022
## 13151 y2022
## 13152 y2022
## 13153 y2022
## 13154 y2022
## 13155 y2022
## 13156 y2022
## 13157 y2022
## 13158 y2022
## 13159 y2022
## 13160 y2022
## 13161 y2022
## 13162 y2022
## 13163 y2022
## 13164 y2022
## 13165 y2022
## 13166 y2022
## 13167 y2022
## 13168 y2022
## 13169 y2022
## 13170 y2022
## 13171 y2022
## 13172 y2022
## 13173 y2022
## 13174 y2022
## 13175 y2022
## 13176 y2022
## 13177 y2022
## 13178 y2022
## 13179 y2022
## 13180 y2022
## 13181 y2022
## 13182 y2022
## 13183 y2022
## 13184 y2022
## 13185 y2022
## 13186 y2022
## 13187 y2022
## 13188 y2022
## 13189 y2022
## 13190 y2022
## 13191 y2022
## 13192 y2022
## 13193 y2022
## 13194 y2022
## 13195 y2022
## 13196 y2022
## 13197 y2022
## 13198 y2022
## 13199 y2022
## 13200 y2022
## 13201 y2022
## 13202 y2022
## 13203 y2022
## 13204 y2022
## 13205 y2022
## 13206 y2022
## 13207 y2022
## 13208 y2022
## 13209 y2022
## 13210 y2022
## 13211 y2022
## 13212 y2022
## 13213 y2022
## 13214 y2022
## 13215 y2022
## 13216 y2022
## 13217 y2022
## 13218 y2022
## 13219 y2022
## 13220 y2022
## 13221 y2022
## 13222 y2022
## 13223 y2022
## 13224 y2022
## 13225 y2022
## 13226 y2022
## 13227 y2022
## 13228 y2022
## 13229 y2022
## 13230 y2022
## 13231 y2022
## 13232 y2022
## 13233 y2022
## 13234 y2022
## 13235 y2022
## 13236 y2022
## 13237 y2022
## 13238 y2022
## 13239 y2022
## 13240 y2022
## 13241 y2022
## 13242 y2022
## 13243 y2022
## 13244 y2022
## 13245 y2022
## 13246 y2022
## 13247 y2022
## 13248 y2022
## 13249 y2022
## 13250 y2022
## 13251 y2022
## 13252 y2022
## 13253 y2022
## 13254 y2022
## 13255 y2022
## 13256 y2022
## 13257 y2022
## 13258 y2022
## 13259 y2022
## 13260 y2022
## 13261 y2022
## 13262 y2022
## 13263 y2022
## 13264 y2022
## 13265 y2022
## 13266 y2022
## 13267 y2022
## 13268 y2022
## 13269 y2022
## 13270 y2022
## 13271 y2022
## 13272 y2022
## 13273 y2022
## 13274 y2022
## 13275 y2022
## 13276 y2022
## 13277 y2022
## 13278 y2022
## 13279 y2022
## 13280 y2022
## 13281 y2022
## 13282 y2022
## 13283 y2022
## 13284 y2022
## 13285 y2022
## 13286 y2022
## 13287 y2022
## 13288 y2022
## 13289 y2022
## 13290 y2022
## 13291 y2022
## 13292 y2022
## 13293 y2022
## 13294 y2022
## 13295 y2022
## 13296 y2022
## 13297 y2022
## 13298 y2022
## 13299 y2022
## 13300 y2022
## 13301 y2022
## 13302 y2022
## 13303 y2022
## 13304 y2022
## 13305 y2022
## 13306 y2022
## 13307 y2022
## 13308 y2022
## 13309 y2022
## 13310 y2022
## 13311 y2022
## 13312 y2022
## 13313 y2022
## 13314 y2022
## 13315 y2022
## 13316 y2022
## 13317 y2022
## 13318 y2022
## 13319 y2022
## 13320 y2022
## 13321 y2022
## 13322 y2022
## 13323 y2022
## 13324 y2022
## 13325 y2022
## 13326 y2022
## 13327 y2022
## 13328 y2022
## 13329 y2022
## 13330 y2022
## 13331 y2022
## 13332 y2022
## 13333 y2022
## 13334 y2022
## 13335 y2022
## 13336 y2022
## 13337 y2022
## 13338 y2022
## 13339 y2022
## 13340 y2022
## 13341 y2022
## 13342 y2022
## 13343 y2022
## 13344 y2022
## 13345 y2022
## 13346 y2022
## 13347 y2022
## 13348 y2022
## 13349 y2022
## 13350 y2022
## 13351 y2022
## 13352 y2022
## 13353 y2022
## 13354 y2022
## 13355 y2022
## 13356 y2022
## 13357 y2022
## 13358 y2022
## 13359 y2022
## 13360 y2022
## 13361 y2022
## 13362 y2022
## 13363 y2022
## 13364 y2022
## 13365 y2022
## 13366 y2022
## 13367 y2022
## 13368 y2022
## 13369 y2022
## 13370 y2022
## 13371 y2022
## 13372 y2022
## 13373 y2022
## 13374 y2022
## 13375 y2022
## 13376 y2022
## 13377 y2022
## 13378 y2022
## 13379 y2022
## 13380 y2022
## 13381 y2022
## 13382 y2022
## 13383 y2022
## 13384 y2022
## 13385 y2022
## 13386 y2022
## 13387 y2022
## 13388 y2022
## 13389 y2022
## 13390 y2022
## 13391 y2022
## 13392 y2022
## 13393 y2022
## 13394 y2022
## 13395 y2022
## 13396 y2022
## 13397 y2022
## 13398 y2022
## 13399 y2022
## 13400 y2022
## 13401 y2022
## 13402 y2022
## 13403 y2022
## 13404 y2022
## 13405 y2022
## 13406 y2022
## 13407 y2022
## 13408 y2022
## 13409 y2022
## 13410 y2022
## 13411 y2022
## 13412 y2022
## 13413 y2022
## 13414 y2022
## 13415 y2022
## 13416 y2022
## 13417 y2022
## 13418 y2022
## 13419 y2022
## 13420 y2022
## 13421 y2022
## 13422 y2022
## 13423 y2022
## 13424 y2022
## 13425 y2022
## 13426 y2022
## 13427 y2022
## 13428 y2022
## 13429 y2022
## 13430 y2022
## 13431 y2022
## 13432 y2022
## 13433 y2022
## 13434 y2022
## 13435 y2022
## 13436 y2022
## 13437 y2022
## 13438 y2022
## 13439 y2022
## 13440 y2022
## 13441 y2022
## 13442 y2022
## 13443 y2022
## 13444 y2022
## 13445 y2022
## 13446 y2022
## 13447 y2022
## 13448 y2022
## 13449 y2022
## 13450 y2022
## 13451 y2022
## 13452 y2022
## 13453 y2022
## 13454 y2022
## 13455 y2022
## 13456 y2022
## 13457 y2022
## 13458 y2022
## 13459 y2022
## 13460 y2022
## 13461 y2022
## 13462 y2022
## 13463 y2022
## 13464 y2022
## 13465 y2022
## 13466 y2022
## 13467 y2022
## 13468 y2022
## 13469 y2022
## 13470 y2022
## 13471 y2022
## 13472 y2022
## 13473 y2022
## 13474 y2022
## 13475 y2022
## 13476 y2022
## 13477 y2022
## 13478 y2022
## 13479 y2022
## 13480 y2022
## 13481 y2022
## 13482 y2022
## 13483 y2022
## 13484 y2022
## 13485 y2022
## 13486 y2022
## 13487 y2022
## 13488 y2022
## 13489 y2022
## 13490 y2022
## 13491 y2022
## 13492 y2022
## 13493 y2022
## 13494 y2022
## 13495 y2022
## 13496 y2022
## 13497 y2022
## 13498 y2022
## 13499 y2022
## 13500 y2022
## 13501 y2022
## 13502 y2022
## 13503 y2022
## 13504 y2022
## 13505 y2022
## 13506 y2022
## 13507 y2022
## 13508 y2022
## 13509 y2022
## 13510 y2022
## 13511 y2022
## 13512 y2022
## 13513 y2022
## 13514 y2022
## 13515 y2022
## 13516 y2022
## 13517 y2022
## 13518 y2022
## 13519 y2022
## 13520 y2022
## 13521 y2022
## 13522 y2022
## 13523 y2022
## 13524 y2022
## 13525 y2022
## 13526 y2022
## 13527 y2022
## 13528 y2022
## 13529 y2022
## 13530 y2022
## 13531 y2022
## 13532 y2022
## 13533 y2022
## 13534 y2022
## 13535 y2022
## 13536 y2022
## 13537 y2022
## 13538 y2022
## 13539 y2022
## 13540 y2022
## 13541 y2022
## 13542 y2022
## 13543 y2022
## 13544 y2022
## 13545 y2022
## 13546 y2022
## 13547 y2022
## 13548 y2022
## 13549 y2022
## 13550 y2022
## 13551 y2022
## 13552 y2022
## 13553 y2022
## 13554 y2022
## 13555 y2022
## 13556 y2022
## 13557 y2022
## 13558 y2022
## 13559 y2022
## 13560 y2022
## 13561 y2022
## 13562 y2022
## 13563 y2022
## 13564 y2022
## 13565 y2022
## 13566 y2022
## 13567 y2022
## 13568 y2022
## 13569 y2022
## 13570 y2022
## 13571 y2022
## 13572 y2022
## 13573 y2022
## 13574 y2022
## 13575 y2022
## 13576 y2022
## 13577 y2022
## 13578 y2022
## 13579 y2022
## 13580 y2022
## 13581 y2022
## 13582 y2022
## 13583 y2022
## 13584 y2022
## 13585 y2022
## 13586 y2022
## 13587 y2022
## 13588 y2022
## 13589 y2022
## 13590 y2022
## 13591 y2022
## 13592 y2022
## 13593 y2022
## 13594 y2022
## 13595 y2022
## 13596 y2022
## 13597 y2022
## 13598 y2022
## 13599 y2022
## 13600 y2022
## 13601 y2022
## 13602 y2022
## 13603 y2022
## 13604 y2022
## 13605 y2022
## 13606 y2022
## 13607 y2022
## 13608 y2022
## 13609 y2022
## 13610 y2022
## 13611 y2022
## 13612 y2020
## 13613 y2020
## 13614 y2020
## 13615 y2020
## 13616 y2020
## 13617 y2020
## 13618 y2020
## 13619 y2020
## 13620 y2020
## 13621 y2020
## 13622 y2020
## 13623 y2020
## 13624 y2020
## 13625 y2020
## 13626 y2020
## 13627 y2020
## 13628 y2020
## 13629 y2020
## 13630 y2020
## 13631 y2020
## 13632 y2020
## 13633 y2020
## 13634 y2020
## 13635 y2020
## 13636 y2020
## 13637 y2020
## 13638 y2020
## 13639 y2020
## 13640 y2020
## 13641 y2020
## 13642 y2020
## 13643 y2020
## 13644 y2020
## 13645 y2020
## 13646 y2020
## 13647 y2020
## 13648 y2020
## 13649 y2020
## 13650 y2020
## 13651 y2020
## 13652 y2020
## 13653 y2020
## 13654 y2020
## 13655 y2020
## 13656 y2020
## 13657 y2020
## 13658 y2020
## 13659 y2020
## 13660 y2020
## 13661 y2020
## 13662 y2020
## 13663 y2020
## 13664 y2020
## 13665 y2020
## 13666 y2020
## 13667 y2020
## 13668 y2020
## 13669 y2020
## 13670 y2020
## 13671 y2020
## 13672 y2020
## 13673 y2020
## 13674 y2020
## 13675 y2020
## 13676 y2020
## 13677 y2020
## 13678 y2020
## 13679 y2020
## 13680 y2020
## 13681 y2020
## 13682 y2020
## 13683 y2020
## 13684 y2020
## 13685 y2020
## 13686 y2020
## 13687 y2020
## 13688 y2020
## 13689 y2020
## 13690 y2020
## 13691 y2020
## 13692 y2020
## 13693 y2020
## 13694 y2020
## 13695 y2020
## 13696 y2020
## 13697 y2020
## 13698 y2020
## 13699 y2020
## 13700 y2020
## 13701 y2020
## 13702 y2020
## 13703 y2020
## 13704 y2020
## 13705 y2020
## 13706 y2020
## 13707 y2020
## 13708 y2020
## 13709 y2020
## 13710 y2020
## 13711 y2020
## 13712 y2020
## 13713 y2020
## 13714 y2020
## 13715 y2020
## 13716 y2020
## 13717 y2020
## 13718 y2020
## 13719 y2020
## 13720 y2020
## 13721 y2020
## 13722 y2020
## 13723 y2020
## 13724 y2020
## 13725 y2020
## 13726 y2020
## 13727 y2020
## 13728 y2020
## 13729 y2020
## 13730 y2020
## 13731 y2020
## 13732 y2020
## 13733 y2020
## 13734 y2020
## 13735 y2020
## 13736 y2020
## 13737 y2020
## 13738 y2020
## 13739 y2020
## 13740 y2020
## 13741 y2020
## 13742 y2020
## 13743 y2020
## 13744 y2020
## 13745 y2020
## 13746 y2020
## 13747 y2020
## 13748 y2020
## 13749 y2020
## 13750 y2020
## 13751 y2020
## 13752 y2020
## 13753 y2020
## 13754 y2020
## 13755 y2020
## 13756 y2020
## 13757 y2020
## 13758 y2020
## 13759 y2020
## 13760 y2020
## 13761 y2020
## 13762 y2020
## 13763 y2020
## 13764 y2020
## 13765 y2020
## 13766 y2020
## 13767 y2020
## 13768 y2020
## 13769 y2020
## 13770 y2020
## 13771 y2020
## 13772 y2020
## 13773 y2020
## 13774 y2020
## 13775 y2020
## 13776 y2020
## 13777 y2020
## 13778 y2020
## 13779 y2020
## 13780 y2020
## 13781 y2020
## 13782 y2020
## 13783 y2020
## 13784 y2020
## 13785 y2020
## 13786 y2020
## 13787 y2020
## 13788 y2020
## 13789 y2020
## 13790 y2020
## 13791 y2020
## 13792 y2020
## 13793 y2020
## 13794 y2020
## 13795 y2020
## 13796 y2020
## 13797 y2020
## 13798 y2020
## 13799 y2020
## 13800 y2020
## 13801 y2020
## 13802 y2020
## 13803 y2020
## 13804 y2020
## 13805 y2020
## 13806 y2020
## 13807 y2020
## 13808 y2020
## 13809 y2020
## 13810 y2020
## 13811 y2020
## 13812 y2020
## 13813 y2020
## 13814 y2020
## 13815 y2020
## 13816 y2020
## 13817 y2020
## 13818 y2020
## 13819 y2020
## 13820 y2020
## 13821 y2020
## 13822 y2020
## 13823 y2020
## 13824 y2020
## 13825 y2020
## 13826 y2020
## 13827 y2020
## 13828 y2020
## 13829 y2020
## 13830 y2020
## 13831 y2020
## 13832 y2020
## 13833 y2020
## 13834 y2020
## 13835 y2020
## 13836 y2020
## 13837 y2020
## 13838 y2020
## 13839 y2020
## 13840 y2020
## 13841 y2020
## 13842 y2020
## 13843 y2020
## 13844 y2020
## 13845 y2020
## 13846 y2020
## 13847 y2020
## 13848 y2020
## 13849 y2020
## 13850 y2020
## 13851 y2020
## 13852 y2020
## 13853 y2020
## 13854 y2020
## 13855 y2020
## 13856 y2020
## 13857 y2020
## 13858 y2020
## 13859 y2020
## 13860 y2020
## 13861 y2020
## 13862 y2020
## 13863 y2020
## 13864 y2020
## 13865 y2020
## 13866 y2020
## 13867 y2020
## 13868 y2020
## 13869 y2020
## 13870 y2020
## 13871 y2020
## 13872 y2020
## 13873 y2020
## 13874 y2020
## 13875 y2020
## 13876 y2020
## 13877 y2020
## 13878 y2020
## 13879 y2020
## 13880 y2020
## 13881 y2020
## 13882 y2020
## 13883 y2020
## 13884 y2020
## 13885 y2020
## 13886 y2020
## 13887 y2020
## 13888 y2020
## 13889 y2020
## 13890 y2020
## 13891 y2020
## 13892 y2020
## 13893 y2020
## 13894 y2020
## 13895 y2020
## 13896 y2020
## 13897 y2020
## 13898 y2020
## 13899 y2020
## 13900 y2020
## 13901 y2020
## 13902 y2020
## 13903 y2020
## 13904 y2020
## 13905 y2020
## 13906 y2020
## 13907 y2020
## 13908 y2020
## 13909 y2020
## 13910 y2020
## 13911 y2020
## 13912 y2020
## 13913 y2020
## 13914 y2020
## 13915 y2020
## 13916 y2020
## 13917 y2020
## 13918 y2020
## 13919 y2020
## 13920 y2020
## 13921 y2020
## 13922 y2020
## 13923 y2020
## 13924 y2020
## 13925 y2020
## 13926 y2020
## 13927 y2020
## 13928 y2020
## 13929 y2020
## 13930 y2020
## 13931 y2020
## 13932 y2020
## 13933 y2020
## 13934 y2020
## 13935 y2020
## 13936 y2020
## 13937 y2020
## 13938 y2020
## 13939 y2020
## 13940 y2020
## 13941 y2020
## 13942 y2020
## 13943 y2020
## 13944 y2020
## 13945 y2020
## 13946 y2020
## 13947 y2020
## 13948 y2020
## 13949 y2020
## 13950 y2020
## 13951 y2020
## 13952 y2020
## 13953 y2020
## 13954 y2020
## 13955 y2020
## 13956 y2020
## 13957 y2020
## 13958 y2020
## 13959 y2020
## 13960 y2020
## 13961 y2020
## 13962 y2020
## 13963 y2020
## 13964 y2020
## 13965 y2020
## 13966 y2020
## 13967 y2020
## 13968 y2020
## 13969 y2020
## 13970 y2020
## 13971 y2020
## 13972 y2020
## 13973 y2020
## 13974 y2020
## 13975 y2020
## 13976 y2020
## 13977 y2020
## 13978 y2020
## 13979 y2020
## 13980 y2020
## 13981 y2020
## 13982 y2020
## 13983 y2020
## 13984 y2020
## 13985 y2020
## 13986 y2020
## 13987 y2020
## 13988 y2020
## 13989 y2020
## 13990 y2020
## 13991 y2020
## 13992 y2020
## 13993 y2020
## 13994 y2020
## 13995 y2020
## 13996 y2020
## 13997 y2020
## 13998 y2020
## 13999 y2020
## 14000 y2020
## 14001 y2020
## 14002 y2020
## 14003 y2020
## 14004 y2020
## 14005 y2020
## 14006 y2020
## 14007 y2020
## 14008 y2020
## 14009 y2020
## 14010 y2020
## 14011 y2020
## 14012 y2020
## 14013 y2020
## 14014 y2020
## 14015 y2020
## 14016 y2020
## 14017 y2020
## 14018 y2020
## 14019 y2020
## 14020 y2020
## 14021 y2020
## 14022 y2020
## 14023 y2020
## 14024 y2020
## 14025 y2020
## 14026 y2020
## 14027 y2020
## 14028 y2020
## 14029 y2020
## 14030 y2020
## 14031 y2020
## 14032 y2020
## 14033 y2020
## 14034 y2020
## 14035 y2020
## 14036 y2020
## 14037 y2020
## 14038 y2020
## 14039 y2020
## 14040 y2020
## 14041 y2020
## 14042 y2020
## 14043 y2020
## 14044 y2020
## 14045 y2020
## 14046 y2020
## 14047 y2020
## 14048 y2020
## 14049 y2020
## 14050 y2020
## 14051 y2020
## 14052 y2020
## 14053 y2020
## 14054 y2020
## 14055 y2020
## 14056 y2020
## 14057 y2020
## 14058 y2020
## 14059 y2020
## 14060 y2020
## 14061 y2020
## 14062 y2020
## 14063 y2020
## 14064 y2020
## 14065 y2020
## 14066 y2020
## 14067 y2020
## 14068 y2020
## 14069 y2020
## 14070 y2020
## 14071 y2020
## 14072 y2020
## 14073 y2020
## 14074 y2020
## 14075 y2020
## 14076 y2020
## 14077 y2020
## 14078 y2020
## 14079 y2020
## 14080 y2020
## 14081 y2020
## 14082 y2020
## 14083 y2020
## 14084 y2020
## 14085 y2020
## 14086 y2020
## 14087 y2020
## 14088 y2020
## 14089 y2020
## 14090 y2020
## 14091 y2020
## 14092 y2020
## 14093 y2020
## 14094 y2020
## 14095 y2020
## 14096 y2020
## 14097 y2020
## 14098 y2020
## 14099 y2020
## 14100 y2020
## 14101 y2020
## 14102 y2020
## 14103 y2020
## 14104 y2020
## 14105 y2020
## 14106 y2020
## 14107 y2020
## 14108 y2020
## 14109 y2020
## 14110 y2020
## 14111 y2020
## 14112 y2020
## 14113 y2020
## 14114 y2020
## 14115 y2020
## 14116 y2020
## 14117 y2020
## 14118 y2020
## 14119 y2020
## 14120 y2020
## 14121 y2020
## 14122 y2020
## 14123 y2020
## 14124 y2020
## 14125 y2020
## 14126 y2020
## 14127 y2020
## 14128 y2020
## 14129 y2020
## 14130 y2020
## 14131 y2020
## 14132 y2020
## 14133 y2020
## 14134 y2020
## 14135 y2020
## 14136 y2020
## 14137 y2020
## 14138 y2020
## 14139 y2020
## 14140 y2020
## 14141 y2020
## 14142 y2020
## 14143 y2020
## 14144 y2020
## 14145 y2020
## 14146 y2020
## 14147 y2020
## 14148 y2020
## 14149 y2020
## 14150 y2020
## 14151 y2020
## 14152 y2020
## 14153 y2020
## 14154 y2020
## 14155 y2020
## 14156 y2020
## 14157 y2020
## 14158 y2020
## 14159 y2020
## 14160 y2020
## 14161 y2020
## 14162 y2020
## 14163 y2020
## 14164 y2020
## 14165 y2020
## 14166 y2020
## 14167 y2020
## 14168 y2020
## 14169 y2020
## 14170 y2020
## 14171 y2020
## 14172 y2020
## 14173 y2020
## 14174 y2020
## 14175 y2020
## 14176 y2020
## 14177 y2020
## 14178 y2020
## 14179 y2020
## 14180 y2020
## 14181 y2020
## 14182 y2020
## 14183 y2020
## 14184 y2020
## 14185 y2020
## 14186 y2020
## 14187 y2020
## 14188 y2020
## 14189 y2020
## 14190 y2020
## 14191 y2020
## 14192 y2020
## 14193 y2020
## 14194 y2020
## 14195 y2020
## 14196 y2020
## 14197 y2020
## 14198 y2020
## 14199 y2020
## 14200 y2020
## 14201 y2020
## 14202 y2020
## 14203 y2020
## 14204 y2020
## 14205 y2020
## 14206 y2020
## 14207 y2020
## 14208 y2020
## 14209 y2020
## 14210 y2020
## 14211 y2020
## 14212 y2020
## 14213 y2020
## 14214 y2020
## 14215 y2020
## 14216 y2020
## 14217 y2020
## 14218 y2020
## 14219 y2020
## 14220 y2020
## 14221 y2020
## 14222 y2020
## 14223 y2020
## 14224 y2020
## 14225 y2020
## 14226 y2020
## 14227 y2020
## 14228 y2020
## 14229 y2020
## 14230 y2020
## 14231 y2020
## 14232 y2020
## 14233 y2020
## 14234 y2020
## 14235 y2020
## 14236 y2020
## 14237 y2020
## 14238 y2020
## 14239 y2020
## 14240 y2020
## 14241 y2020
## 14242 y2020
## 14243 y2020
## 14244 y2020
## 14245 y2020
## 14246 y2020
## 14247 y2020
## 14248 y2020
## 14249 y2020
## 14250 y2020
## 14251 y2020
## 14252 y2020
## 14253 y2020
## 14254 y2020
## 14255 y2020
## 14256 y2020
## 14257 y2020
## 14258 y2020
## 14259 y2020
## 14260 y2020
## 14261 y2020
## 14262 y2020
## 14263 y2020
## 14264 y2020
## 14265 y2020
## 14266 y2020
## 14267 y2020
## 14268 y2020
## 14269 y2020
## 14270 y2020
## 14271 y2020
## 14272 y2020
## 14273 y2020
## 14274 y2020
## 14275 y2020
## 14276 y2020
## 14277 y2020
## 14278 y2020
## 14279 y2020
## 14280 y2020
## 14281 y2020
## 14282 y2020
## 14283 y2020
## 14284 y2020
## 14285 y2020
## 14286 y2020
## 14287 y2020
## 14288 y2020
## 14289 y2020
## 14290 y2020
## 14291 y2020
## 14292 y2020
## 14293 y2020
## 14294 y2020
## 14295 y2020
## 14296 y2020
## 14297 y2020
## 14298 y2020
## 14299 y2020
## 14300 y2020
## 14301 y2020
## 14302 y2020
## 14303 y2020
## 14304 y2020
## 14305 y2020
## 14306 y2020
## 14307 y2020
## 14308 y2020
## 14309 y2020
## 14310 y2020
## 14311 y2020
## 14312 y2020
## 14313 y2020
## 14314 y2020
## 14315 y2020
## 14316 y2020
## 14317 y2020
## 14318 y2020
## 14319 y2020
## 14320 y2020
## 14321 y2020
## 14322 y2020
## 14323 y2020
## 14324 y2020
## 14325 y2020
## 14326 y2020
## 14327 y2020
## 14328 y2020
## 14329 y2020
## 14330 y2020
## 14331 y2020
## 14332 y2020
## 14333 y2020
## 14334 y2020
## 14335 y2020
## 14336 y2020
## 14337 y2020
## 14338 y2020
## 14339 y2020
## 14340 y2020
## 14341 y2020
## 14342 y2020
## 14343 y2020
## 14344 y2020
## 14345 y2020
## 14346 y2020
## 14347 y2020
## 14348 y2020
## 14349 y2020
## 14350 y2020
## 14351 y2020
## 14352 y2020
## 14353 y2020
## 14354 y2020
## 14355 y2020
## 14356 y2020
## 14357 y2020
## 14358 y2020
## 14359 y2020
## 14360 y2020
## 14361 y2020
## 14362 y2020
## 14363 y2020
## 14364 y2020
## 14365 y2020
## 14366 y2020
## 14367 y2020
## 14368 y2020
## 14369 y2020
## 14370 y2020
## 14371 y2020
## 14372 y2020
## 14373 y2020
## 14374 y2020
## 14375 y2020
## 14376 y2020
## 14377 y2020
## 14378 y2020
## 14379 y2020
## 14380 y2020
## 14381 y2020
## 14382 y2020
## 14383 y2020
## 14384 y2020
## 14385 y2020
## 14386 y2020
## 14387 y2020
## 14388 y2020
## 14389 y2020
## 14390 y2020
## 14391 y2020
## 14392 y2020
## 14393 y2020
## 14394 y2020
## 14395 y2020
## 14396 y2020
## 14397 y2020
## 14398 y2020
## 14399 y2020
## 14400 y2020
## 14401 y2020
## 14402 y2020
## 14403 y2020
## 14404 y2020
## 14405 y2020
## 14406 y2020
## 14407 y2020
## 14408 y2020
## 14409 y2020
## 14410 y2020
## 14411 y2020
## 14412 y2020
## 14413 y2020
## 14414 y2020
## 14415 y2020
## 14416 y2020
## 14417 y2020
## 14418 y2020
## 14419 y2020
## 14420 y2020
## 14421 y2020
## 14422 y2020
## 14423 y2020
## 14424 y2020
## 14425 y2020
## 14426 y2020
## 14427 y2020
## 14428 y2020
## 14429 y2020
## 14430 y2020
## 14431 y2020
## 14432 y2020
## 14433 y2020
## 14434 y2020
## 14435 y2020
## 14436 y2020
## 14437 y2020
## 14438 y2020
## 14439 y2020
## 14440 y2020
## 14441 y2020
## 14442 y2020
## 14443 y2020
## 14444 y2020
## 14445 y2020
## 14446 y2020
## 14447 y2020
## 14448 y2020
## 14449 y2020
## 14450 y2020
## 14451 y2020
## 14452 y2020
## 14453 y2020
## 14454 y2020
## 14455 y2020
## 14456 y2020
## 14457 y2020
## 14458 y2020
## 14459 y2020
## 14460 y2020
## 14461 y2020
## 14462 y2020
## 14463 y2020
## 14464 y2020
## 14465 y2020
## 14466 y2020
## 14467 y2020
## 14468 y2020
## 14469 y2020
## 14470 y2020
## 14471 y2020
## 14472 y2020
## 14473 y2020
## 14474 y2020
## 14475 y2020
## 14476 y2020
## 14477 y2020
## 14478 y2020
## 14479 y2020
## 14480 y2020
## 14481 y2020
## 14482 y2020
## 14483 y2020
## 14484 y2020
## 14485 y2020
## 14486 y2020
## 14487 y2020
## 14488 y2020
## 14489 y2020
## 14490 y2020
## 14491 y2020
## 14492 y2020
## 14493 y2020
## 14494 y2020
## 14495 y2020
## 14496 y2020
## 14497 y2020
## 14498 y2020
## 14499 y2020
## 14500 y2020
## 14501 y2020
## 14502 y2020
## 14503 y2020
## 14504 y2020
## 14505 y2020
## 14506 y2020
## 14507 y2020
## 14508 y2020
## 14509 y2020
## 14510 y2020
## 14511 y2020
## 14512 y2020
## 14513 y2020
## 14514 y2020
## 14515 y2020
## 14516 y2020
## 14517 y2020
## 14518 y2020
## 14519 y2020
## 14520 y2020
## 14521 y2020
## 14522 y2020
## 14523 y2020
## 14524 y2020
## 14525 y2020
## 14526 y2020
## 14527 y2020
## 14528 y2020
## 14529 y2020
## 14530 y2020
## 14531 y2020
## 14532 y2020
## 14533 y2020
## 14534 y2020
## 14535 y2020
## 14536 y2020
## 14537 y2020
## 14538 y2020
## 14539 y2020
## 14540 y2020
## 14541 y2020
## 14542 y2020
## 14543 y2020
## 14544 y2020
## 14545 y2020
## 14546 y2020
## 14547 y2020
## 14548 y2020
## 14549 y2020
## 14550 y2020
## 14551 y2020
## 14552 y2020
## 14553 y2020
## 14554 y2020
## 14555 y2020
## 14556 y2020
## 14557 y2020
## 14558 y2020
## 14559 y2020
## 14560 y2020
## 14561 y2020
## 14562 y2020
## 14563 y2020
## 14564 y2020
## 14565 y2020
## 14566 y2020
## 14567 y2020
## 14568 y2020
## 14569 y2020
## 14570 y2020
## 14571 y2020
## 14572 y2020
## 14573 y2020
## 14574 y2020
## 14575 y2020
## 14576 y2020
## 14577 y2020
## 14578 y2020
## 14579 y2020
## 14580 y2020
## 14581 y2020
## 14582 y2020
## 14583 y2020
## 14584 y2020
## 14585 y2020
## 14586 y2020
## 14587 y2020
## 14588 y2020
## 14589 y2020
## 14590 y2020
## 14591 y2020
## 14592 y2020
## 14593 y2020
## 14594 y2020
## 14595 y2020
## 14596 y2020
## 14597 y2020
## 14598 y2020
## 14599 y2020
## 14600 y2020
## 14601 y2020
## 14602 y2020
## 14603 y2020
## 14604 y2020
## 14605 y2020
## 14606 y2020
## 14607 y2020
## 14608 y2020
## 14609 y2020
## 14610 y2020
## 14611 y2020
## 14612 y2020
## 14613 y2020
## 14614 y2020
## 14615 y2020
## 14616 y2020
## 14617 y2020
## 14618 y2020
## 14619 y2020
## 14620 y2020
## 14621 y2020
## 14622 y2020
## 14623 y2020
## 14624 y2020
## 14625 y2020
## 14626 y2020
## 14627 y2020
## 14628 y2020
## 14629 y2020
## 14630 y2020
## 14631 y2020
## 14632 y2020
## 14633 y2020
## 14634 y2020
## 14635 y2020
## 14636 y2020
## 14637 y2020
## 14638 y2020
## 14639 y2020
## 14640 y2020
## 14641 y2020
## 14642 y2020
## 14643 y2020
## 14644 y2020
## 14645 y2020
## 14646 y2020
## 14647 y2020
## 14648 y2020
## 14649 y2020
## 14650 y2020
## 14651 y2020
## 14652 y2020
## 14653 y2020
## 14654 y2020
## 14655 y2020
## 14656 y2020
## 14657 y2020
## 14658 y2020
## 14659 y2020
## 14660 y2020
## 14661 y2020
## 14662 y2020
## 14663 y2020
## 14664 y2020
## 14665 y2020
## 14666 y2020
## 14667 y2020
## 14668 y2020
## 14669 y2020
## 14670 y2020
## 14671 y2020
## 14672 y2020
## 14673 y2020
## 14674 y2020
## 14675 y2020
## 14676 y2020
## 14677 y2020
## 14678 y2020
## 14679 y2020
## 14680 y2020
## 14681 y2020
## 14682 y2020
## 14683 y2020
## 14684 y2020
## 14685 y2020
## 14686 y2020
## 14687 y2020
## 14688 y2020
## 14689 y2020
## 14690 y2020
## 14691 y2020
## 14692 y2020
## 14693 y2020
## 14694 y2020
## 14695 y2020
## 14696 y2020
## 14697 y2020
## 14698 y2020
## 14699 y2020
## 14700 y2020
## 14701 y2020
## 14702 y2020
## 14703 y2020
## 14704 y2020
## 14705 y2020
## 14706 y2020
## 14707 y2020
## 14708 y2020
## 14709 y2020
## 14710 y2020
## 14711 y2020
## 14712 y2020
## 14713 y2020
## 14714 y2020
## 14715 y2020
## 14716 y2020
## 14717 y2020
## 14718 y2020
## 14719 y2020
## 14720 y2020
## 14721 y2020
## 14722 y2020
## 14723 y2020
## 14724 y2020
## 14725 y2020
## 14726 y2020
## 14727 y2020
## 14728 y2020
## 14729 y2020
## 14730 y2020
## 14731 y2020
## 14732 y2020
## 14733 y2020
## 14734 y2020
## 14735 y2020
## 14736 y2020
## 14737 y2020
## 14738 y2020
## 14739 y2020
## 14740 y2020
## 14741 y2020
## 14742 y2020
## 14743 y2020
## 14744 y2020
## 14745 y2020
## 14746 y2020
## 14747 y2020
## 14748 y2020
## 14749 y2020
## 14750 y2020
## 14751 y2020
## 14752 y2020
## 14753 y2020
## 14754 y2020
## 14755 y2020
## 14756 y2020
## 14757 y2020
## 14758 y2020
## 14759 y2020
## 14760 y2020
## 14761 y2020
## 14762 y2020
## 14763 y2020
## 14764 y2020
## 14765 y2020
## 14766 y2020
## 14767 y2020
## 14768 y2020
## 14769 y2020
## 14770 y2020
## 14771 y2020
## 14772 y2020
## 14773 y2020
## 14774 y2020
## 14775 y2020
## 14776 y2020
## 14777 y2020
## 14778 y2020
## 14779 y2020
## 14780 y2020
## 14781 y2020
## 14782 y2020
## 14783 y2020
## 14784 y2020
## 14785 y2020
## 14786 y2020
## 14787 y2020
## 14788 y2020
## 14789 y2020
## 14790 y2020
## 14791 y2020
## 14792 y2020
## 14793 y2020
## 14794 y2020
## 14795 y2020
## 14796 y2020
## 14797 y2020
## 14798 y2020
## 14799 y2020
## 14800 y2020
## 14801 y2020
## 14802 y2020
## 14803 y2020
## 14804 y2020
## 14805 y2020
## 14806 y2020
## 14807 y2020
## 14808 y2020
## 14809 y2020
## 14810 y2020
## 14811 y2020
## 14812 y2020
## 14813 y2020
## 14814 y2020
## 14815 y2020
## 14816 y2020
## 14817 y2020
## 14818 y2020
## 14819 y2020
## 14820 y2020
## 14821 y2020
## 14822 y2020
## 14823 y2020
## 14824 y2020
## 14825 y2020
## 14826 y2020
## 14827 y2020
## 14828 y2020
## 14829 y2020
## 14830 y2020
## 14831 y2020
## 14832 y2020
## 14833 y2020
## 14834 y2020
## 14835 y2020
## 14836 y2020
## 14837 y2020
## 14838 y2020
## 14839 y2020
## 14840 y2020
## 14841 y2020
## 14842 y2020
## 14843 y2020
## 14844 y2020
## 14845 y2020
## 14846 y2020
## 14847 y2020
## 14848 y2020
## 14849 y2020
## 14850 y2020
## 14851 y2020
## 14852 y2020
## 14853 y2020
## 14854 y2020
## 14855 y2020
## 14856 y2020
## 14857 y2020
## 14858 y2020
## 14859 y2020
## 14860 y2020
## 14861 y2020
## 14862 y2020
## 14863 y2020
## 14864 y2020
## 14865 y2020
## 14866 y2020
## 14867 y2020
## 14868 y2020
## 14869 y2020
## 14870 y2020
## 14871 y2020
## 14872 y2020
## 14873 y2020
## 14874 y2020
## 14875 y2020
## 14876 y2020
## 14877 y2020
## 14878 y2020
## 14879 y2020
## 14880 y2020
## 14881 y2020
## 14882 y2020
## 14883 y2020
## 14884 y2020
## 14885 y2020
## 14886 y2020
## 14887 y2020
## 14888 y2020
## 14889 y2020
## 14890 y2020
## 14891 y2020
## 14892 y2020
## 14893 y2020
## 14894 y2020
## 14895 y2020
## 14896 y2020
## 14897 y2020
## 14898 y2020
## 14899 y2020
## 14900 y2020
## 14901 y2020
## 14902 y2020
## 14903 y2020
## 14904 y2020
## 14905 y2020
## 14906 y2020
## 14907 y2020
## 14908 y2020
## 14909 y2020
## 14910 y2020
## 14911 y2020
## 14912 y2020
## 14913 y2020
## 14914 y2020
## 14915 y2020
## 14916 y2020
## 14917 y2020
## 14918 y2020
## 14919 y2020
## 14920 y2020
## 14921 y2020
## 14922 y2020
## 14923 y2020
## 14924 y2020
## 14925 y2020
## 14926 y2020
## 14927 y2020
## 14928 y2020
## 14929 y2020
## 14930 y2020
## 14931 y2020
## 14932 y2020
## 14933 y2020
## 14934 y2020
## 14935 y2020
## 14936 y2020
## 14937 y2020
## 14938 y2020
## 14939 y2020
## 14940 y2020
## 14941 y2020
## 14942 y2020
## 14943 y2020
## 14944 y2020
## 14945 y2020
## 14946 y2020
## 14947 y2020
## 14948 y2020
## 14949 y2020
## 14950 y2020
## 14951 y2020
## 14952 y2020
## 14953 y2020
## 14954 y2020
## 14955 y2020
## 14956 y2020
## 14957 y2020
## 14958 y2020
## 14959 y2020
## 14960 y2020
## 14961 y2020
## 14962 y2020
## 14963 y2020
## 14964 y2020
## 14965 y2020
## 14966 y2020
## 14967 y2020
## 14968 y2020
## 14969 y2020
## 14970 y2020
## 14971 y2020
## 14972 y2020
## 14973 y2020
## 14974 y2020
## 14975 y2020
## 14976 y2020
## 14977 y2020
## 14978 y2020
## 14979 y2020
## 14980 y2020
## 14981 y2020
## 14982 y2020
## 14983 y2020
## 14984 y2020
## 14985 y2020
## 14986 y2020
## 14987 y2020
## 14988 y2020
## 14989 y2020
## 14990 y2020
## 14991 y2020
## 14992 y2020
## 14993 y2020
## 14994 y2020
## 14995 y2020
## 14996 y2020
## 14997 y2020
## 14998 y2020
## 14999 y2020
## 15000 y2020
## 15001 y2020
## 15002 y2020
## 15003 y2020
## 15004 y2020
## 15005 y2020
## 15006 y2020
## 15007 y2020
## 15008 y2020
## 15009 y2020
## 15010 y2020
## 15011 y2020
## 15012 y2020
## 15013 y2020
## 15014 y2020
## 15015 y2020
## 15016 y2020
## 15017 y2020
## 15018 y2020
## 15019 y2020
## 15020 y2020
## 15021 y2020
## 15022 y2020
## 15023 y2020
## 15024 y2020
## 15025 y2020
## 15026 y2020
## 15027 y2020
## 15028 y2020
## 15029 y2020
## 15030 y2020
## 15031 y2020
## 15032 y2020
## 15033 y2020
## 15034 y2020
## 15035 y2020
## 15036 y2020
## 15037 y2020
## 15038 y2020
## 15039 y2020
## 15040 y2020
## 15041 y2020
## 15042 y2020
## 15043 y2020
## 15044 y2020
## 15045 y2020
## 15046 y2020
## 15047 y2020
## 15048 y2020
## 15049 y2020
## 15050 y2020
## 15051 y2020
## 15052 y2020
## 15053 y2020
## 15054 y2020
## 15055 y2020
## 15056 y2020
## 15057 y2020
## 15058 y2020
## 15059 y2020
## 15060 y2020
## 15061 y2020
## 15062 y2020
## 15063 y2020
## 15064 y2020
## 15065 y2020
## 15066 y2020
## 15067 y2020
## 15068 y2020
## 15069 y2020
## 15070 y2020
## 15071 y2020
## 15072 y2020
## 15073 y2020
## 15074 y2020
## 15075 y2020
## 15076 y2020
## 15077 y2020
## 15078 y2020
## 15079 y2020
## 15080 y2020
## 15081 y2020
## 15082 y2020
## 15083 y2020
## 15084 y2020
## 15085 y2020
## 15086 y2020
## 15087 y2020
## 15088 y2020
## 15089 y2020
## 15090 y2020
## 15091 y2020
## 15092 y2020
## 15093 y2020
## 15094 y2020
## 15095 y2020
## 15096 y2020
## 15097 y2020
## 15098 y2020
## 15099 y2020
## 15100 y2020
## 15101 y2020
## 15102 y2020
## 15103 y2020
## 15104 y2020
## 15105 y2020
## 15106 y2020
## 15107 y2020
## 15108 y2020
## 15109 y2020
## 15110 y2020
## 15111 y2020
## 15112 y2020
## 15113 y2020
## 15114 y2020
## 15115 y2020
## 15116 y2020
## 15117 y2020
## 15118 y2020
## 15119 y2020
## 15120 y2020
## 15121 y2020
## 15122 y2020
## 15123 y2020
## 15124 y2020
## 15125 y2020
## 15126 y2020
## 15127 y2020
## 15128 y2020
## 15129 y2020
## 15130 y2020
## 15131 y2020
## 15132 y2020
## 15133 y2020
## 15134 y2020
## 15135 y2020
## 15136 y2020
## 15137 y2020
## 15138 y2020
## 15139 y2020
## 15140 y2020
## 15141 y2020
## 15142 y2020
## 15143 y2020
## 15144 y2020
## 15145 y2020
## 15146 y2020
## 15147 y2020
## 15148 y2020
## 15149 y2020
## 15150 y2020
## 15151 y2020
## 15152 y2020
## 15153 y2020
## 15154 y2020
## 15155 y2020
## 15156 y2020
## 15157 y2020
## 15158 y2020
## 15159 y2020
## 15160 y2020
## 15161 y2020
## 15162 y2020
## 15163 y2020
## 15164 y2020
## 15165 y2020
## 15166 y2020
## 15167 y2020
## 15168 y2020
## 15169 y2020
## 15170 y2020
## 15171 y2020
## 15172 y2020
## 15173 y2020
## 15174 y2020
## 15175 y2020
## 15176 y2020
## 15177 y2020
## 15178 y2020
## 15179 y2020
## 15180 y2020
## 15181 y2020
## 15182 y2020
## 15183 y2020
## 15184 y2020
## 15185 y2020
## 15186 y2020
## 15187 y2020
## 15188 y2020
## 15189 y2020
## 15190 y2020
## 15191 y2020
## 15192 y2020
## 15193 y2020
## 15194 y2020
## 15195 y2020
## 15196 y2020
## 15197 y2020
## 15198 y2020
## 15199 y2020
## 15200 y2020
## 15201 y2020
## 15202 y2020
## 15203 y2020
## 15204 y2020
## 15205 y2020
## 15206 y2020
## 15207 y2020
## 15208 y2020
## 15209 y2020
## 15210 y2020
## 15211 y2020
## 15212 y2020
## 15213 y2020
## 15214 y2020
## 15215 y2020
## 15216 y2020
## 15217 y2020
## 15218 y2020
## 15219 y2020
## 15220 y2020
## 15221 y2020
## 15222 y2020
## 15223 y2020
## 15224 y2020
## 15225 y2020
## 15226 y2020
## 15227 y2020
## 15228 y2020
## 15229 y2020
## 15230 y2020
## 15231 y2020
## 15232 y2020
## 15233 y2020
## 15234 y2020
## 15235 y2020
## 15236 y2020
## 15237 y2020
## 15238 y2020
## 15239 y2020
## 15240 y2020
## 15241 y2020
## 15242 y2020
## 15243 y2020
## 15244 y2020
## 15245 y2020
## 15246 y2020
## 15247 y2020
## 15248 y2020
## 15249 y2020
## 15250 y2020
## 15251 y2020
## 15252 y2020
## 15253 y2020
## 15254 y2020
## 15255 y2020
## 15256 y2020
## 15257 y2020
## 15258 y2020
## 15259 y2020
## 15260 y2020
## 15261 y2020
## 15262 y2020
## 15263 y2020
## 15264 y2020
## 15265 y2020
## 15266 y2020
## 15267 y2020
## 15268 y2020
## 15269 y2020
## 15270 y2020
## 15271 y2020
## 15272 y2020
## 15273 y2020
## 15274 y2020
## 15275 y2020
## 15276 y2020
## 15277 y2020
## 15278 y2020
## 15279 y2020
## 15280 y2020
## 15281 y2020
## 15282 y2020
## 15283 y2020
## 15284 y2020
## 15285 y2020
## 15286 y2020
## 15287 y2020
## 15288 y2020
## 15289 y2020
## 15290 y2020
## 15291 y2020
## 15292 y2020
## 15293 y2020
## 15294 y2020
## 15295 y2020
## 15296 y2020
## 15297 y2020
## 15298 y2020
## 15299 y2020
## 15300 y2020
## 15301 y2020
## 15302 y2020
## 15303 y2020
## 15304 y2020
## 15305 y2020
## 15306 y2020
## 15307 y2020
## 15308 y2020
## 15309 y2020
## 15310 y2020
## 15311 y2020
## 15312 y2020
## 15313 y2020
## 15314 y2020
## 15315 y2020
## 15316 y2020
## 15317 y2020
## 15318 y2020
## 15319 y2020
## 15320 y2020
## 15321 y2020
## 15322 y2020
## 15323 y2020
## 15324 y2020
## 15325 y2020
## 15326 y2020
## 15327 y2020
## 15328 y2020
## 15329 y2020
## 15330 y2020
## 15331 y2020
## 15332 y2020
## 15333 y2020
## 15334 y2020
## 15335 y2020
## 15336 y2020
## 15337 y2020
## 15338 y2020
## 15339 y2020
## 15340 y2020
## 15341 y2020
## 15342 y2020
## 15343 y2020
## 15344 y2020
## 15345 y2020
## 15346 y2020
## 15347 y2020
## 15348 y2020
## 15349 y2020
## 15350 y2020
## 15351 y2020
## 15352 y2020
## 15353 y2020
## 15354 y2020
## 15355 y2020
## 15356 y2020
## 15357 y2020
## 15358 y2020
## 15359 y2020
## 15360 y2020
## 15361 y2020
## 15362 y2020
## 15363 y2020
## 15364 y2020
## 15365 y2020
## 15366 y2020
## 15367 y2020
## 15368 y2020
## 15369 y2020
## 15370 y2020
## 15371 y2020
## 15372 y2020
## 15373 y2020
## 15374 y2020
## 15375 y2020
## 15376 y2020
## 15377 y2020
## 15378 y2020
## 15379 y2020
## 15380 y2020
## 15381 y2020
## 15382 y2020
## 15383 y2020
## 15384 y2020
## 15385 y2020
## 15386 y2020
## 15387 y2020
## 15388 y2020
## 15389 y2020
## 15390 y2020
## 15391 y2020
## 15392 y2020
## 15393 y2020
## 15394 y2020
## 15395 y2020
## 15396 y2020
## 15397 y2020
## 15398 y2020
## 15399 y2020
## 15400 y2020
## 15401 y2020
## 15402 y2020
## 15403 y2020
## 15404 y2020
## 15405 y2020
## 15406 y2020
## 15407 y2020
## 15408 y2020
## 15409 y2020
## 15410 y2020
## 15411 y2020
## 15412 y2020
## 15413 y2020
## 15414 y2020
## 15415 y2020
## 15416 y2020
## 15417 y2020
## 15418 y2020
## 15419 y2020
## 15420 y2020
## 15421 y2020
## 15422 y2020
## 15423 y2020
## 15424 y2020
## 15425 y2020
## 15426 y2020
## 15427 y2020
## 15428 y2020
## 15429 y2020
## 15430 y2020
## 15431 y2020
## 15432 y2020
## 15433 y2020
## 15434 y2020
## 15435 y2020
## 15436 y2020
## 15437 y2020
## 15438 y2020
## 15439 y2020
## 15440 y2020
## 15441 y2020
## 15442 y2020
## 15443 y2020
## 15444 y2020
## 15445 y2020
## 15446 y2020
## 15447 y2020
## 15448 y2020
## 15449 y2020
## 15450 y2020
## 15451 y2020
## 15452 y2020
## 15453 y2020
## 15454 y2020
## 15455 y2020
## 15456 y2020
## 15457 y2020
## 15458 y2020
## 15459 y2020
## 15460 y2020
## 15461 y2020
## 15462 y2020
## 15463 y2020
## 15464 y2020
## 15465 y2020
## 15466 y2020
## 15467 y2020
## 15468 y2020
## 15469 y2020
## 15470 y2020
## 15471 y2020
## 15472 y2020
## 15473 y2020
## 15474 y2020
## 15475 y2020
## 15476 y2020
## 15477 y2020
## 15478 y2020
## 15479 y2020
## 15480 y2020
## 15481 y2020
## 15482 y2020
## 15483 y2020
## 15484 y2020
## 15485 y2020
## 15486 y2020
## 15487 y2020
## 15488 y2020
## 15489 y2020
## 15490 y2020
## 15491 y2020
## 15492 y2020
## 15493 y2020
## 15494 y2020
## 15495 y2020
## 15496 y2020
## 15497 y2020
## 15498 y2020
## 15499 y2020
## 15500 y2020
## 15501 y2020
## 15502 y2020
## 15503 y2020
## 15504 y2020
## 15505 y2020
## 15506 y2020
## 15507 y2020
## 15508 y2020
## 15509 y2020
## 15510 y2020
## 15511 y2020
## 15512 y2020
## 15513 y2020
## 15514 y2020
## 15515 y2020
## 15516 y2020
## 15517 y2020
## 15518 y2020
## 15519 y2020
## 15520 y2020
## 15521 y2020
## 15522 y2020
## 15523 y2020
## 15524 y2020
## 15525 y2020
## 15526 y2020
## 15527 y2020
## 15528 y2020
## 15529 y2020
## 15530 y2020
## 15531 y2020
## 15532 y2020
## 15533 y2020
## 15534 y2020
## 15535 y2020
## 15536 y2020
## 15537 y2020
## 15538 y2020
## 15539 y2020
## 15540 y2020
## 15541 y2020
## 15542 y2020
## 15543 y2020
## 15544 y2020
## 15545 y2020
## 15546 y2020
## 15547 y2020
## 15548 y2020
## 15549 y2020
## 15550 y2020
## 15551 y2020
## 15552 y2020
## 15553 y2020
## 15554 y2020
## 15555 y2020
## 15556 y2020
## 15557 y2020
## 15558 y2020
## 15559 y2020
## 15560 y2020
## 15561 y2020
## 15562 y2020
## 15563 y2020
## 15564 y2020
## 15565 y2020
## 15566 y2020
## 15567 y2020
## 15568 y2020
## 15569 y2020
## 15570 y2020
## 15571 y2020
## 15572 y2020
## 15573 y2020
## 15574 y2020
## 15575 y2020
## 15576 y2020
## 15577 y2020
## 15578 y2020
## 15579 y2020
## 15580 y2020
## 15581 y2020
## 15582 y2020
## 15583 y2020
## 15584 y2020
## 15585 y2020
## 15586 y2020
## 15587 y2020
## 15588 y2020
## 15589 y2020
## 15590 y2020
## 15591 y2020
## 15592 y2020
## 15593 y2020
## 15594 y2020
## 15595 y2020
## 15596 y2020
## 15597 y2020
## 15598 y2020
## 15599 y2020
## 15600 y2020
## 15601 y2020
## 15602 y2020
## 15603 y2020
## 15604 y2020
## 15605 y2020
## 15606 y2020
## 15607 y2020
## 15608 y2020
## 15609 y2020
## 15610 y2020
## 15611 y2020
## 15612 y2020
## 15613 y2020
## 15614 y2020
## 15615 y2020
## 15616 y2020
## 15617 y2020
## 15618 y2020
## 15619 y2020
## 15620 y2020
## 15621 y2020
## 15622 y2020
## 15623 y2020
## 15624 y2020
## 15625 y2020
## 15626 y2020
## 15627 y2020
## 15628 y2020
## 15629 y2020
## 15630 y2020
## 15631 y2020
## 15632 y2020
## 15633 y2020
## 15634 y2020
## 15635 y2020
## 15636 y2020
## 15637 y2020
## 15638 y2020
## 15639 y2020
## 15640 y2020
## 15641 y2020
## 15642 y2020
## 15643 y2020
## 15644 y2020
## 15645 y2020
## 15646 y2020
## 15647 y2020
## 15648 y2020
## 15649 y2020
## 15650 y2020
## 15651 y2020
## 15652 y2020
## 15653 y2020
## 15654 y2020
## 15655 y2020
## 15656 y2020
## 15657 y2020
## 15658 y2020
## 15659 y2020
## 15660 y2020
## 15661 y2020
## 15662 y2020
## 15663 y2020
## 15664 y2020
## 15665 y2020
## 15666 y2020
## 15667 y2020
## 15668 y2020
## 15669 y2020
## 15670 y2020
## 15671 y2020
## 15672 y2020
## 15673 y2020
## 15674 y2020
## 15675 y2020
## 15676 y2020
## 15677 y2020
## 15678 y2020
## 15679 y2020
## 15680 y2020
## 15681 y2020
## 15682 y2020
## 15683 y2020
## 15684 y2020
## 15685 y2020
## 15686 y2020
## 15687 y2020
## 15688 y2020
## 15689 y2020
## 15690 y2020
## 15691 y2020
## 15692 y2020
## 15693 y2020
## 15694 y2020
## 15695 y2020
## 15696 y2020
## 15697 y2020
## 15698 y2020
## 15699 y2020
## 15700 y2020
## 15701 y2020
## 15702 y2020
## 15703 y2020
## 15704 y2020
## 15705 y2020
## 15706 y2020
## 15707 y2020
## 15708 y2020
## 15709 y2020
## 15710 y2020
## 15711 y2020
## 15712 y2020
## 15713 y2020
## 15714 y2020
## 15715 y2020
## 15716 y2020
## 15717 y2020
## 15718 y2020
## 15719 y2020
## 15720 y2020
## 15721 y2020
## 15722 y2020
## 15723 y2020
## 15724 y2020
## 15725 y2020
## 15726 y2020
## 15727 y2020
## 15728 y2020
## 15729 y2020
## 15730 y2020
## 15731 y2020
## 15732 y2020
## 15733 y2020
## 15734 y2020
## 15735 y2020
## 15736 y2020
## 15737 y2020
## 15738 y2020
## 15739 y2020
## 15740 y2020
## 15741 y2020
## 15742 y2020
## 15743 y2020
## 15744 y2020
## 15745 y2020
## 15746 y2020
## 15747 y2020
## 15748 y2020
## 15749 y2020
## 15750 y2020
## 15751 y2020
## 15752 y2020
## 15753 y2020
## 15754 y2020
## 15755 y2020
## 15756 y2020
## 15757 y2020
## 15758 y2020
## 15759 y2020
## 15760 y2020
## 15761 y2020
## 15762 y2020
## 15763 y2020
## 15764 y2020
## 15765 y2020
## 15766 y2020
## 15767 y2020
## 15768 y2020
## 15769 y2020
## 15770 y2020
## 15771 y2020
## 15772 y2020
## 15773 y2020
## 15774 y2020
## 15775 y2020
## 15776 y2020
## 15777 y2020
## 15778 y2020
## 15779 y2020
## 15780 y2020
## 15781 y2020
## 15782 y2020
## 15783 y2020
## 15784 y2020
## 15785 y2020
## 15786 y2020
## 15787 y2020
## 15788 y2020
## 15789 y2020
## 15790 y2020
## 15791 y2020
## 15792 y2020
## 15793 y2020
## 15794 y2020
## 15795 y2020
## 15796 y2020
## 15797 y2020
## 15798 y2020
## 15799 y2020
## 15800 y2020
## 15801 y2020
## 15802 y2020
## 15803 y2020
## 15804 y2020
## 15805 y2020
## 15806 y2020
## 15807 y2020
## 15808 y2020
## 15809 y2020
## 15810 y2020
## 15811 y2020
## 15812 y2020
## 15813 y2020
## 15814 y2020
## 15815 y2020
## 15816 y2020
## 15817 y2020
## 15818 y2020
## 15819 y2020
## 15820 y2020
## 15821 y2020
## 15822 y2020
## 15823 y2020
## 15824 y2020
## 15825 y2020
## 15826 y2020
## 15827 y2020
## 15828 y2020
## 15829 y2020
## 15830 y2020
## 15831 y2020
## 15832 y2020
## 15833 y2020
## 15834 y2020
## 15835 y2020
## 15836 y2020
## 15837 y2020
## 15838 y2020
## 15839 y2020
## 15840 y2020
## 15841 y2020
## 15842 y2020
## 15843 y2020
## 15844 y2020
## 15845 y2020
## 15846 y2020
## 15847 y2020
## 15848 y2020
## 15849 y2020
## 15850 y2020
## 15851 y2020
## 15852 y2020
## 15853 y2020
## 15854 y2020
## 15855 y2020
## 15856 y2020
## 15857 y2020
## 15858 y2020
## 15859 y2020
## 15860 y2020
## 15861 y2020
## 15862 y2020
## 15863 y2020
## 15864 y2020
## 15865 y2020
## 15866 y2020
## 15867 y2020
## 15868 y2020
## 15869 y2020
## 15870 y2020
## 15871 y2020
## 15872 y2020
## 15873 y2020
## 15874 y2020
## 15875 y2020
## 15876 y2020
## 15877 y2020
## 15878 y2020
## 15879 y2020
## 15880 y2020
## 15881 y2020
## 15882 y2020
## 15883 y2020
## 15884 y2020
## 15885 y2020
## 15886 y2020
## 15887 y2020
## 15888 y2020
## 15889 y2020
## 15890 y2020
## 15891 y2020
## 15892 y2020
## 15893 y2020
## 15894 y2020
## 15895 y2020
## 15896 y2020
## 15897 y2020
## 15898 y2020
## 15899 y2020
## 15900 y2020
## 15901 y2020
## 15902 y2020
## 15903 y2020
## 15904 y2020
## 15905 y2020
## 15906 y2020
## 15907 y2020
## 15908 y2020
## 15909 y2020
## 15910 y2020
## 15911 y2020
## 15912 y2020
## 15913 y2020
## 15914 y2020
## 15915 y2020
## 15916 y2020
## 15917 y2020
## 15918 y2020
## 15919 y2020
## 15920 y2020
## 15921 y2020
## 15922 y2020
## 15923 y2020
## 15924 y2020
## 15925 y2020
## 15926 y2020
## 15927 y2020
## 15928 y2020
## 15929 y2020
## 15930 y2020
## 15931 y2020
## 15932 y2020
## 15933 y2020
## 15934 y2020
## 15935 y2020
## 15936 y2020
## 15937 y2020
## 15938 y2020
## 15939 y2020
## 15940 y2020
## 15941 y2020
## 15942 y2020
## 15943 y2020
## 15944 y2020
## 15945 y2020
## 15946 y2020
## 15947 y2020
## 15948 y2020
## 15949 y2020
## 15950 y2020
## 15951 y2020
## 15952 y2020
## 15953 y2020
## 15954 y2020
## 15955 y2020
## 15956 y2020
## 15957 y2020
## 15958 y2020
## 15959 y2020
## 15960 y2020
## 15961 y2020
## 15962 y2020
## 15963 y2020
## 15964 y2020
## 15965 y2020
## 15966 y2020
## 15967 y2020
## 15968 y2020
## 15969 y2020
## 15970 y2020
## 15971 y2020
## 15972 y2020
## 15973 y2020
## 15974 y2020
## 15975 y2020
## 15976 y2020
## 15977 y2020
## 15978 y2020
## 15979 y2020
## 15980 y2020
## 15981 y2020
## 15982 y2020
## 15983 y2020
## 15984 y2020
## 15985 y2020
## 15986 y2020
## 15987 y2020
## 15988 y2020
## 15989 y2020
## 15990 y2020
## 15991 y2020
## 15992 y2020
## 15993 y2020
## 15994 y2020
## 15995 y2020
## 15996 y2020
## 15997 y2020
## 15998 y2020
## 15999 y2020
## 16000 y2020
## 16001 y2020
## 16002 y2020
## 16003 y2020
## 16004 y2020
## 16005 y2020
## 16006 y2020
## 16007 y2020
## 16008 y2020
## 16009 y2020
## 16010 y2020
## 16011 y2020
## 16012 y2020
## 16013 y2020
## 16014 y2020
## 16015 y2020
## 16016 y2020
## 16017 y2020
## 16018 y2020
## 16019 y2020
## 16020 y2020
## 16021 y2020
## 16022 y2020
## 16023 y2020
## 16024 y2020
## 16025 y2020
## 16026 y2020
## 16027 y2020
## 16028 y2020
## 16029 y2020
## 16030 y2020
## 16031 y2020
## 16032 y2020
## 16033 y2020
## 16034 y2020
## 16035 y2020
## 16036 y2020
## 16037 y2020
## 16038 y2020
## 16039 y2020
## 16040 y2020
## 16041 y2020
## 16042 y2020
## 16043 y2020
## 16044 y2020
## 16045 y2020
## 16046 y2020
## 16047 y2020
## 16048 y2020
## 16049 y2020
## 16050 y2020
## 16051 y2020
## 16052 y2020
## 16053 y2020
## 16054 y2020
## 16055 y2020
## 16056 y2020
## 16057 y2020
## 16058 y2020
## 16059 y2020
## 16060 y2020
## 16061 y2020
## 16062 y2020
## 16063 y2020
## 16064 y2020
## 16065 y2020
## 16066 y2020
## 16067 y2020
## 16068 y2020
## 16069 y2020
## 16070 y2020
## 16071 y2020
## 16072 y2020
## 16073 y2020
## 16074 y2020
## 16075 y2020
## 16076 y2020
## 16077 y2020
## 16078 y2020
## 16079 y2020
## 16080 y2020
## 16081 y2020
## 16082 y2020
## 16083 y2020
## 16084 y2020
## 16085 y2020
## 16086 y2020
## 16087 y2020
## 16088 y2020
## 16089 y2020
## 16090 y2020
## 16091 y2020
## 16092 y2020
## 16093 y2020
## 16094 y2020
## 16095 y2020
## 16096 y2020
## 16097 y2020
## 16098 y2020
## 16099 y2020
## 16100 y2020
## 16101 y2020
## 16102 y2020
## 16103 y2020
## 16104 y2020
## 16105 y2020
## 16106 y2020
## 16107 y2020
## 16108 y2020
## 16109 y2020
## 16110 y2020
## 16111 y2020
## 16112 y2020
## 16113 y2020
## 16114 y2020
## 16115 y2020
## 16116 y2020
## 16117 y2020
## 16118 y2020
## 16119 y2020
## 16120 y2020
## 16121 y2020
## 16122 y2020
## 16123 y2020
## 16124 y2020
## 16125 y2020
## 16126 y2020
## 16127 y2020
## 16128 y2020
## 16129 y2020
## 16130 y2020
## 16131 y2020
## 16132 y2020
## 16133 y2020
## 16134 y2020
## 16135 y2020
## 16136 y2020
## 16137 y2020
## 16138 y2020
## 16139 y2020
## 16140 y2020
## 16141 y2020
## 16142 y2020
## 16143 y2020
## 16144 y2020
## 16145 y2020
## 16146 y2020
## 16147 y2020
## 16148 y2020
## 16149 y2020
## 16150 y2020
## 16151 y2020
## 16152 y2020
## 16153 y2020
## 16154 y2020
## 16155 y2020
## 16156 y2020
## 16157 y2020
## 16158 y2020
## 16159 y2020
## 16160 y2020
## 16161 y2020
## 16162 y2020
## 16163 y2020
## 16164 y2020
## 16165 y2020
## 16166 y2020
## 16167 y2020
## 16168 y2020
## 16169 y2020
## 16170 y2020
## 16171 y2020
## 16172 y2020
## 16173 y2020
## 16174 y2020
## 16175 y2020
## 16176 y2020
## 16177 y2020
## 16178 y2020
## 16179 y2020
## 16180 y2020
## 16181 y2020
## 16182 y2020
## 16183 y2020
## 16184 y2020
## 16185 y2020
## 16186 y2020
## 16187 y2020
## 16188 y2020
## 16189 y2020
## 16190 y2020
## 16191 y2020
## 16192 y2020
## 16193 y2020
## 16194 y2020
## 16195 y2020
## 16196 y2020
## 16197 y2020
## 16198 y2020
## 16199 y2020
## 16200 y2020
## 16201 y2020
## 16202 y2020
## 16203 y2020
## 16204 y2020
## 16205 y2020
## 16206 y2020
## 16207 y2020
## 16208 y2020
## 16209 y2020
## 16210 y2020
## 16211 y2020
## 16212 y2020
## 16213 y2020
## 16214 y2020
## 16215 y2020
## 16216 y2020
## 16217 y2020
## 16218 y2020
## 16219 y2020
## 16220 y2020
## 16221 y2020
## 16222 y2020
## 16223 y2020
## 16224 y2020
## 16225 y2020
## 16226 y2020
## 16227 y2020
## 16228 y2020
## 16229 y2020
## 16230 y2020
## 16231 y2020
## 16232 y2020
## 16233 y2020
## 16234 y2020
## 16235 y2020
## 16236 y2020
## 16237 y2020
## 16238 y2020
## 16239 y2020
## 16240 y2020
## 16241 y2020
## 16242 y2020
## 16243 y2020
## 16244 y2020
## 16245 y2020
## 16246 y2020
## 16247 y2020
## 16248 y2020
## 16249 y2020
## 16250 y2020
## 16251 y2020
## 16252 y2020
## 16253 y2020
## 16254 y2020
## 16255 y2020
## 16256 y2020
## 16257 y2020
## 16258 y2020
## 16259 y2020
## 16260 y2020
## 16261 y2020
## 16262 y2020
## 16263 y2020
## 16264 y2020
## 16265 y2020
## 16266 y2020
## 16267 y2020
## 16268 y2020
## 16269 y2020
## 16270 y2020
## 16271 y2020
## 16272 y2020
## 16273 y2020
## 16274 y2020
## 16275 y2020
## 16276 y2020
## 16277 y2020
## 16278 y2020
## 16279 y2020
## 16280 y2020
## 16281 y2020
## 16282 y2020
## 16283 y2020
## 16284 y2020
## 16285 y2020
## 16286 y2020
## 16287 y2020
## 16288 y2020
## 16289 y2020
## 16290 y2020
## 16291 y2020
## 16292 y2020
## 16293 y2020
## 16294 y2020
## 16295 y2020
## 16296 y2020
## 16297 y2020
## 16298 y2020
## 16299 y2020
## 16300 y2020
## 16301 y2020
## 16302 y2020
## 16303 y2020
## 16304 y2020
## 16305 y2020
## 16306 y2020
## 16307 y2020
## 16308 y2020
## 16309 y2020
## 16310 y2020
## 16311 y2020
## 16312 y2020
## 16313 y2020
## 16314 y2020
## 16315 y2020
## 16316 y2020
## 16317 y2020
## 16318 y2020
## 16319 y2020
## 16320 y2020
## 16321 y2020
## 16322 y2020
## 16323 y2020
## 16324 y2020
## 16325 y2020
## 16326 y2020
## 16327 y2020
## 16328 y2020
## 16329 y2020
## 16330 y2020
## 16331 y2020
## 16332 y2020
## 16333 y2020
## 16334 y2020
## 16335 y2020
## 16336 y2020
## 16337 y2020
## 16338 y2020
## 16339 y2020
## 16340 y2020
## 16341 y2020
## 16342 y2020
## 16343 y2020
## 16344 y2020
## 16345 y2020
## 16346 y2020
## 16347 y2020
## 16348 y2020
## 16349 y2020
## 16350 y2020
## 16351 y2020
## 16352 y2020
## 16353 y2020
## 16354 y2020
## 16355 y2020
## 16356 y2020
## 16357 y2020
## 16358 y2020
## 16359 y2020
## 16360 y2020
## 16361 y2020
## 16362 y2020
## 16363 y2020
## 16364 y2020
## 16365 y2020
## 16366 y2020
## 16367 y2020
## 16368 y2020
## 16369 y2020
## 16370 y2020
## 16371 y2020
## 16372 y2020
## 16373 y2020
## 16374 y2020
## 16375 y2020
## 16376 y2020
## 16377 y2020
## 16378 y2020
## 16379 y2020
## 16380 y2020
## 16381 y2020
## 16382 y2020
## 16383 y2020
## 16384 y2020
## 16385 y2020
## 16386 y2020
## 16387 y2020
## 16388 y2020
## 16389 y2020
## 16390 y2020
## 16391 y2020
## 16392 y2020
## 16393 y2020
## 16394 y2020
## 16395 y2020
## 16396 y2020
## 16397 y2020
## 16398 y2020
## 16399 y2020
## 16400 y2020
## 16401 y2020
## 16402 y2020
## 16403 y2020
## 16404 y2020
## 16405 y2020
## 16406 y2020
## 16407 y2020
## 16408 y2020
## 16409 y2020
## 16410 y2020
## 16411 y2020
## 16412 y2020
## 16413 y2020
## 16414 y2020
## 16415 y2020
## 16416 y2020
## 16417 y2020
## 16418 y2020
## 16419 y2020
## 16420 y2020
## 16421 y2020
## 16422 y2020
## 16423 y2020
## 16424 y2020
## 16425 y2020
## 16426 y2020
## 16427 y2020
## 16428 y2020
## 16429 y2020
## 16430 y2020
## 16431 y2020
## 16432 y2020
## 16433 y2020
## 16434 y2020
## 16435 y2020
## 16436 y2020
## 16437 y2020
## 16438 y2020
## 16439 y2020
## 16440 y2020
## 16441 y2020
## 16442 y2020
## 16443 y2020
## 16444 y2020
## 16445 y2020
## 16446 y2020
## 16447 y2020
## 16448 y2020
## 16449 y2020
## 16450 y2020
## 16451 y2020
## 16452 y2020
## 16453 y2020
## 16454 y2020
## 16455 y2020
## 16456 y2020
## 16457 y2020
## 16458 y2020
## 16459 y2020
## 16460 y2020
## 16461 y2020
## 16462 y2020
## 16463 y2020
## 16464 y2020
## 16465 y2020
## 16466 y2020
## 16467 y2020
## 16468 y2020
## 16469 y2020
## 16470 y2020
## 16471 y2020
## 16472 y2020
## 16473 y2020
## 16474 y2020
## 16475 y2020
## 16476 y2020
## 16477 y2020
## 16478 y2020
## 16479 y2020
## 16480 y2020
## 16481 y2020
## 16482 y2020
## 16483 y2020
## 16484 y2020
## 16485 y2020
## 16486 y2020
## 16487 y2020
## 16488 y2020
## 16489 y2020
## 16490 y2020
## 16491 y2020
## 16492 y2020
## 16493 y2020
## 16494 y2020
## 16495 y2020
## 16496 y2020
## 16497 y2020
## 16498 y2020
## 16499 y2020
## 16500 y2020
## 16501 y2020
## 16502 y2020
## 16503 y2020
## 16504 y2020
## 16505 y2020
## 16506 y2020
## 16507 y2020
## 16508 y2020
## 16509 y2020
## 16510 y2020
## 16511 y2020
## 16512 y2020
## 16513 y2020
## 16514 y2020
## 16515 y2020
## 16516 y2020
## 16517 y2020
## 16518 y2020
## 16519 y2020
## 16520 y2020
## 16521 y2020
## 16522 y2020
## 16523 y2020
## 16524 y2020
## 16525 y2020
## 16526 y2020
## 16527 y2020
## 16528 y2020
## 16529 y2020
## 16530 y2020
## 16531 y2020
## 16532 y2020
## 16533 y2020
## 16534 y2020
## 16535 y2020
## 16536 y2020
## 16537 y2020
## 16538 y2020
## 16539 y2020
## 16540 y2020
## 16541 y2020
## 16542 y2020
## 16543 y2020
## 16544 y2020
## 16545 y2020
## 16546 y2020
## 16547 y2020
## 16548 y2020
## 16549 y2020
## 16550 y2020
## 16551 y2020
## 16552 y2020
## 16553 y2020
## 16554 y2020
## 16555 y2020
## 16556 y2020
## 16557 y2020
## 16558 y2020
## 16559 y2020
## 16560 y2020
## 16561 y2020
## 16562 y2020
## 16563 y2020
## 16564 y2020
## 16565 y2020
## 16566 y2020
## 16567 y2020
## 16568 y2020
## 16569 y2020
## 16570 y2020
## 16571 y2020
## 16572 y2020
## 16573 y2020
## 16574 y2020
## 16575 y2020
## 16576 y2020
## 16577 y2020
## 16578 y2020
## 16579 y2020
## 16580 y2020
## 16581 y2020
## 16582 y2020
## 16583 y2020
## 16584 y2020
## 16585 y2020
## 16586 y2020
## 16587 y2020
## 16588 y2020
## 16589 y2020
## 16590 y2020
## 16591 y2020
## 16592 y2020
## 16593 y2020
## 16594 y2020
## 16595 y2020
## 16596 y2020
## 16597 y2020
## 16598 y2020
## 16599 y2020
## 16600 y2020
## 16601 y2020
## 16602 y2020
## 16603 y2020
## 16604 y2020
## 16605 y2020
## 16606 y2020
## 16607 y2020
## 16608 y2020
## 16609 y2020
## 16610 y2020
## 16611 y2020
## 16612 y2020
## 16613 y2020
## 16614 y2020
## 16615 y2020
## 16616 y2020
## 16617 y2020
## 16618 y2020
## 16619 y2020
## 16620 y2020
## 16621 y2020
## 16622 y2020
## 16623 y2020
## 16624 y2020
## 16625 y2020
## 16626 y2020
## 16627 y2020
## 16628 y2020
## 16629 y2020
## 16630 y2020
## 16631 y2020
## 16632 y2020
## 16633 y2020
## 16634 y2020
## 16635 y2020
## 16636 y2020
## 16637 y2020
## 16638 y2020
## 16639 y2020
## 16640 y2020
## 16641 y2020
## 16642 y2020
## 16643 y2020
## 16644 y2020
## 16645 y2020
## 16646 y2020
## 16647 y2020
## 16648 y2020
## 16649 y2020
## 16650 y2020
## 16651 y2020
## 16652 y2020
## 16653 y2020
## 16654 y2020
## 16655 y2020
## 16656 y2020
## 16657 y2020
## 16658 y2020
## 16659 y2020
## 16660 y2020
## 16661 y2020
## 16662 y2020
## 16663 y2020
## 16664 y2020
## 16665 y2020
## 16666 y2020
## 16667 y2020
## 16668 y2020
## 16669 y2020
## 16670 y2020
## 16671 y2020
## 16672 y2020
## 16673 y2020
## 16674 y2020
## 16675 y2020
## 16676 y2020
## 16677 y2020
## 16678 y2020
## 16679 y2020
## 16680 y2020
## 16681 y2020
## 16682 y2020
## 16683 y2020
## 16684 y2020
## 16685 y2020
## 16686 y2020
## 16687 y2020
## 16688 y2020
## 16689 y2020
## 16690 y2020
## 16691 y2020
## 16692 y2020
## 16693 y2020
## 16694 y2020
## 16695 y2020
## 16696 y2020
## 16697 y2020
## 16698 y2020
## 16699 y2020
## 16700 y2020
## 16701 y2020
## 16702 y2020
## 16703 y2020
## 16704 y2020
## 16705 y2020
## 16706 y2020
## 16707 y2020
## 16708 y2020
## 16709 y2020
## 16710 y2020
## 16711 y2020
## 16712 y2020
## 16713 y2020
## 16714 y2020
## 16715 y2020
## 16716 y2020
## 16717 y2020
## 16718 y2020
## 16719 y2020
## 16720 y2020
## 16721 y2020
## 16722 y2020
## 16723 y2020
## 16724 y2020
## 16725 y2020
## 16726 y2020
## 16727 y2020
## 16728 y2020
## 16729 y2020
## 16730 y2020
## 16731 y2020
## 16732 y2020
## 16733 y2020
## 16734 y2020
## 16735 y2020
## 16736 y2020
## 16737 y2020
## 16738 y2020
## 16739 y2020
## 16740 y2020
## 16741 y2020
## 16742 y2020
## 16743 y2020
## 16744 y2020
## 16745 y2020
## 16746 y2020
## 16747 y2020
## 16748 y2020
## 16749 y2020
## 16750 y2020
## 16751 y2020
## 16752 y2020
## 16753 y2020
## 16754 y2020
## 16755 y2020
## 16756 y2020
## 16757 y2020
## 16758 y2020
## 16759 y2020
## 16760 y2020
## 16761 y2020
## 16762 y2020
## 16763 y2020
## 16764 y2020
## 16765 y2020
## 16766 y2020
## 16767 y2020
## 16768 y2020
## 16769 y2020
## 16770 y2020
## 16771 y2020
## 16772 y2020
## 16773 y2020
## 16774 y2020
## 16775 y2020
## 16776 y2020
## 16777 y2020
## 16778 y2020
## 16779 y2020
## 16780 y2020
## 16781 y2020
## 16782 y2020
## 16783 y2020
## 16784 y2020
## 16785 y2020
## 16786 y2020
## 16787 y2020
## 16788 y2020
## 16789 y2020
## 16790 y2020
## 16791 y2020
## 16792 y2020
## 16793 y2020
## 16794 y2020
## 16795 y2020
## 16796 y2020
## 16797 y2020
## 16798 y2020
## 16799 y2020
## 16800 y2020
## 16801 y2020
## 16802 y2020
## 16803 y2020
## 16804 y2020
## 16805 y2020
## 16806 y2020
## 16807 y2020
## 16808 y2020
## 16809 y2020
## 16810 y2020
## 16811 y2020
## 16812 y2020
## 16813 y2020
## 16814 y2020
## 16815 y2020
## 16816 y2020
## 16817 y2020
## 16818 y2020
## 16819 y2020
## 16820 y2020
## 16821 y2020
## 16822 y2020
## 16823 y2020
## 16824 y2020
## 16825 y2020
## 16826 y2020
## 16827 y2020
## 16828 y2020
## 16829 y2020
## 16830 y2020
## 16831 y2020
## 16832 y2020
## 16833 y2020
## 16834 y2020
## 16835 y2020
## 16836 y2020
## 16837 y2020
## 16838 y2020
## 16839 y2020
## 16840 y2020
## 16841 y2020
## 16842 y2020
## 16843 y2020
## 16844 y2020
## 16845 y2020
## 16846 y2020
## 16847 y2020
## 16848 y2020
## 16849 y2020
## 16850 y2020
## 16851 y2020
## 16852 y2020
## 16853 y2020
## 16854 y2020
## 16855 y2020
## 16856 y2020
## 16857 y2020
## 16858 y2020
## 16859 y2020
## 16860 y2020
## 16861 y2020
## 16862 y2020
## 16863 y2020
## 16864 y2020
## 16865 y2020
## 16866 y2020
## 16867 y2020
## 16868 y2020
## 16869 y2020
## 16870 y2020
## 16871 y2020
## 16872 y2020
## 16873 y2020
## 16874 y2020
## 16875 y2020
## 16876 y2020
## 16877 y2020
## 16878 y2020
## 16879 y2020
## 16880 y2020
## 16881 y2020
## 16882 y2020
## 16883 y2020
## 16884 y2020
## 16885 y2020
## 16886 y2020
## 16887 y2020
## 16888 y2020
## 16889 y2020
## 16890 y2020
## 16891 y2020
## 16892 y2020
## 16893 y2020
## 16894 y2020
## 16895 y2020
## 16896 y2020
## 16897 y2020
## 16898 y2020
## 16899 y2020
## 16900 y2020
## 16901 y2020
## 16902 y2020
## 16903 y2020
## 16904 y2020
## 16905 y2020
## 16906 y2020
## 16907 y2020
## 16908 y2020
## 16909 y2020
## 16910 y2020
## 16911 y2020
## 16912 y2020
## 16913 y2020
## 16914 y2020
## 16915 y2020
## 16916 y2020
## 16917 y2020
## 16918 y2020
## 16919 y2020
## 16920 y2020
## 16921 y2020
## 16922 y2020
## 16923 y2020
## 16924 y2020
## 16925 y2020
## 16926 y2020
## 16927 y2020
## 16928 y2020
## 16929 y2020
## 16930 y2020
## 16931 y2020
## 16932 y2020
## 16933 y2020
## 16934 y2020
## 16935 y2020
## 16936 y2020
## 16937 y2020
## 16938 y2020
## 16939 y2020
## 16940 y2020
## 16941 y2020
## 16942 y2020
## 16943 y2020
## 16944 y2020
## 16945 y2020
## 16946 y2020
## 16947 y2020
## 16948 y2020
## 16949 y2020
## 16950 y2020
## 16951 y2020
## 16952 y2020
## 16953 y2020
## 16954 y2020
## 16955 y2020
## 16956 y2020
## 16957 y2020
## 16958 y2020
## 16959 y2020
## 16960 y2020
## 16961 y2020
## 16962 y2020
## 16963 y2020
## 16964 y2020
## 16965 y2020
## 16966 y2020
## 16967 y2020
## 16968 y2020
## 16969 y2020
## 16970 y2020
## 16971 y2020
## 16972 y2020
## 16973 y2020
## 16974 y2020
## 16975 y2020
## 16976 y2020
## 16977 y2020
## 16978 y2020
## 16979 y2020
## 16980 y2020
## 16981 y2020
## 16982 y2020
## 16983 y2020
## 16984 y2020
## 16985 y2020
## 16986 y2020
## 16987 y2020
## 16988 y2020
## 16989 y2020
## 16990 y2020
## 16991 y2020
## 16992 y2020
## 16993 y2020
## 16994 y2020
## 16995 y2020
## 16996 y2020
## 16997 y2020
## 16998 y2020
## 16999 y2020
## 17000 y2020
## 17001 y2020
## 17002 y2020
## 17003 y2020
## 17004 y2020
## 17005 y2020
## 17006 y2020
## 17007 y2020
## 17008 y2020
## 17009 y2020
## 17010 y2020
## 17011 y2020
## 17012 y2020
## 17013 y2020
## 17014 y2020
## 17015 y2020
## 17016 y2020
## 17017 y2020
## 17018 y2020
## 17019 y2020
## 17020 y2020
## 17021 y2020
## 17022 y2020
## 17023 y2020
## 17024 y2020
## 17025 y2020
## 17026 y2020
## 17027 y2020
## 17028 y2020
## 17029 y2020
## 17030 y2020
## 17031 y2020
## 17032 y2020
## 17033 y2020
## 17034 y2020
## 17035 y2020
## 17036 y2020
## 17037 y2020
## 17038 y2020
## 17039 y2020
## 17040 y2020
## 17041 y2020
## 17042 y2020
## 17043 y2020
## 17044 y2020
## 17045 y2020
## 17046 y2020
## 17047 y2020
## 17048 y2020
## 17049 y2020
## 17050 y2020
## 17051 y2020
## 17052 y2020
## 17053 y2020
## 17054 y2020
## 17055 y2020
## 17056 y2020
## 17057 y2020
## 17058 y2020
## 17059 y2020
## 17060 y2020
## 17061 y2020
## 17062 y2020
## 17063 y2020
## 17064 y2020
## 17065 y2020
## 17066 y2020
## 17067 y2020
## 17068 y2020
## 17069 y2020
## 17070 y2020
## 17071 y2020
## 17072 y2020
## 17073 y2020
## 17074 y2020
## 17075 y2020
## 17076 y2020
## 17077 y2020
## 17078 y2020
## 17079 y2020
## 17080 y2020
## 17081 y2020
## 17082 y2020
## 17083 y2020
## 17084 y2020
## 17085 y2020
## 17086 y2020
## 17087 y2020
## 17088 y2020
## 17089 y2020
## 17090 y2020
## 17091 y2020
## 17092 y2020
## 17093 y2020
## 17094 y2020
## 17095 y2020
## 17096 y2020
## 17097 y2020
## 17098 y2020
## 17099 y2020
## 17100 y2020
## 17101 y2020
## 17102 y2020
## 17103 y2020
## 17104 y2020
## 17105 y2020
## 17106 y2020
## 17107 y2020
## 17108 y2020
## 17109 y2020
## 17110 y2020
## 17111 y2020
## 17112 y2020
## 17113 y2020
## 17114 y2020
## 17115 y2020
## 17116 y2020
## 17117 y2020
## 17118 y2020
## 17119 y2020
## 17120 y2020
## 17121 y2020
## 17122 y2020
## 17123 y2020
## 17124 y2020
## 17125 y2020
## 17126 y2020
## 17127 y2020
## 17128 y2020
## 17129 y2020
## 17130 y2020
## 17131 y2020
## 17132 y2020
## 17133 y2020
## 17134 y2020
## 17135 y2020
## 17136 y2020
## 17137 y2020
## 17138 y2020
## 17139 y2020
## 17140 y2020
## 17141 y2020
## 17142 y2020
## 17143 y2020
## 17144 y2020
## 17145 y2020
## 17146 y2020
## 17147 y2020
## 17148 y2020
## 17149 y2020
## 17150 y2020
## 17151 y2020
## 17152 y2020
## 17153 y2020
## 17154 y2020
## 17155 y2020
## 17156 y2020
## 17157 y2020
## 17158 y2020
## 17159 y2020
## 17160 y2020
## 17161 y2020
## 17162 y2020
## 17163 y2020
## 17164 y2020
## 17165 y2020
## 17166 y2020
## 17167 y2020
## 17168 y2020
## 17169 y2020
## 17170 y2020
## 17171 y2020
## 17172 y2020
## 17173 y2020
## 17174 y2020
## 17175 y2020
## 17176 y2020
## 17177 y2020
## 17178 y2020
## 17179 y2020
## 17180 y2020
## 17181 y2020
## 17182 y2020
## 17183 y2020
## 17184 y2020
## 17185 y2020
## 17186 y2020
## 17187 y2020
## 17188 y2020
## 17189 y2020
## 17190 y2020
## 17191 y2020
## 17192 y2020
## 17193 y2020
## 17194 y2020
## 17195 y2020
## 17196 y2020
## 17197 y2020
## 17198 y2020
## 17199 y2020
## 17200 y2020
## 17201 y2020
## 17202 y2020
## 17203 y2020
## 17204 y2020
## 17205 y2020
## 17206 y2020
## 17207 y2020
## 17208 y2020
## 17209 y2020
## 17210 y2020
## 17211 y2020
## 17212 y2020
## 17213 y2020
## 17214 y2020
## 17215 y2020
## 17216 y2020
## 17217 y2020
## 17218 y2020
## 17219 y2020
## 17220 y2020
## 17221 y2020
## 17222 y2020
## 17223 y2020
## 17224 y2020
## 17225 y2020
## 17226 y2020
## 17227 y2020
## 17228 y2020
## 17229 y2020
## 17230 y2020
## 17231 y2020
## 17232 y2020
## 17233 y2020
## 17234 y2020
## 17235 y2020
## 17236 y2020
## 17237 y2020
## 17238 y2020
## 17239 y2020
## 17240 y2020
## 17241 y2020
## 17242 y2020
## 17243 y2020
## 17244 y2020
## 17245 y2020
## 17246 y2020
## 17247 y2020
## 17248 y2020
## 17249 y2020
## 17250 y2020
## 17251 y2020
## 17252 y2020
## 17253 y2020
## 17254 y2020
## 17255 y2020
## 17256 y2020
## 17257 y2020
## 17258 y2020
## 17259 y2020
## 17260 y2020
## 17261 y2020
## 17262 y2020
## 17263 y2020
## 17264 y2020
## 17265 y2020
## 17266 y2020
## 17267 y2020
## 17268 y2020
## 17269 y2020
## 17270 y2020
## 17271 y2020
## 17272 y2020
## 17273 y2020
## 17274 y2020
## 17275 y2020
## 17276 y2020
## 17277 y2020
## 17278 y2020
## 17279 y2020
## 17280 y2020
## 17281 y2020
## 17282 y2020
## 17283 y2020
## 17284 y2020
## 17285 y2020
## 17286 y2020
## 17287 y2020
## 17288 y2020
## 17289 y2020
## 17290 y2020
## 17291 y2020
## 17292 y2020
## 17293 y2020
## 17294 y2020
## 17295 y2020
## 17296 y2020
## 17297 y2020
## 17298 y2020
## 17299 y2020
## 17300 y2020
## 17301 y2020
## 17302 y2020
## 17303 y2020
## 17304 y2020
## 17305 y2020
## 17306 y2020
## 17307 y2020
## 17308 y2020
## 17309 y2020
## 17310 y2020
## 17311 y2020
## 17312 y2020
## 17313 y2020
## 17314 y2020
## 17315 y2020
## 17316 y2020
## 17317 y2020
## 17318 y2020
## 17319 y2020
## 17320 y2020
## 17321 y2020
## 17322 y2020
## 17323 y2020
## 17324 y2020
## 17325 y2020
## 17326 y2020
## 17327 y2020
## 17328 y2020
## 17329 y2020
## 17330 y2020
## 17331 y2020
## 17332 y2020
## 17333 y2020
## 17334 y2020
## 17335 y2020
## 17336 y2020
## 17337 y2020
## 17338 y2020
## 17339 y2020
## 17340 y2020
## 17341 y2020
## 17342 y2020
## 17343 y2020
## 17344 y2020
## 17345 y2020
## 17346 y2020
## 17347 y2020
## 17348 y2020
## 17349 y2020
## 17350 y2020
## 17351 y2020
## 17352 y2020
## 17353 y2020
## 17354 y2020
## 17355 y2020
## 17356 y2020
## 17357 y2020
## 17358 y2020
## 17359 y2020
## 17360 y2020
## 17361 y2020
## 17362 y2020
## 17363 y2020
## 17364 y2020
## 17365 y2020
## 17366 y2020
## 17367 y2020
## 17368 y2020
## 17369 y2020
## 17370 y2020
## 17371 y2020
## 17372 y2020
## 17373 y2020
## 17374 y2020
## 17375 y2020
## 17376 y2020
## 17377 y2020
## 17378 y2020
## 17379 y2020
## 17380 y2020
## 17381 y2020
## 17382 y2020
## 17383 y2020
## 17384 y2020
## 17385 y2020
## 17386 y2020
## 17387 y2020
## 17388 y2020
## 17389 y2020
## 17390 y2020
## 17391 y2020
## 17392 y2020
## 17393 y2020
## 17394 y2020
## 17395 y2020
## 17396 y2020
## 17397 y2020
## 17398 y2020
## 17399 y2020
## 17400 y2020
## 17401 y2020
## 17402 y2020
## 17403 y2020
## 17404 y2020
## 17405 y2020
## 17406 y2020
## 17407 y2020
## 17408 y2020
## 17409 y2020
## 17410 y2020
## 17411 y2020
## 17412 y2020
## 17413 y2020
## 17414 y2020
## 17415 y2020
## 17416 y2020
## 17417 y2020
## 17418 y2020
## 17419 y2020
## 17420 y2020
## 17421 y2020
## 17422 y2020
## 17423 y2020
## 17424 y2020
## 17425 y2020
## 17426 y2020
## 17427 y2020
## 17428 y2020
## 17429 y2020
## 17430 y2020
## 17431 y2020
## 17432 y2020
## 17433 y2020
## 17434 y2020
## 17435 y2020
## 17436 y2020
## 17437 y2020
## 17438 y2020
## 17439 y2020
## 17440 y2020
## 17441 y2020
## 17442 y2020
## 17443 y2020
## 17444 y2020
## 17445 y2020
## 17446 y2020
## 17447 y2020
## 17448 y2020
## 17449 y2020
## 17450 y2020
## 17451 y2020
## 17452 y2020
## 17453 y2020
## 17454 y2020
## 17455 y2020
## 17456 y2020
## 17457 y2020
## 17458 y2020
## 17459 y2020
## 17460 y2020
## 17461 y2020
## 17462 y2020
## 17463 y2020
## 17464 y2020
## 17465 y2020
## 17466 y2020
## 17467 y2020
## 17468 y2020
## 17469 y2020
## 17470 y2020
## 17471 y2020
## 17472 y2020
## 17473 y2020
## 17474 y2020
## 17475 y2020
## 17476 y2020
## 17477 y2020
## 17478 y2020
## 17479 y2020
## 17480 y2020
## 17481 y2020
## 17482 y2020
## 17483 y2020
## 17484 y2020
## 17485 y2020
## 17486 y2020
## 17487 y2020
## 17488 y2020
## 17489 y2020
## 17490 y2020
## 17491 y2020
## 17492 y2020
## 17493 y2020
## 17494 y2020
## 17495 y2020
## 17496 y2020
## 17497 y2020
## 17498 y2020
## 17499 y2020
## 17500 y2020
## 17501 y2020
## 17502 y2020
## 17503 y2020
## 17504 y2020
## 17505 y2020
## 17506 y2020
## 17507 y2020
## 17508 y2020
## 17509 y2020
## 17510 y2020
## 17511 y2020
## 17512 y2020
## 17513 y2020
## 17514 y2020
## 17515 y2020
## 17516 y2020
## 17517 y2020
## 17518 y2020
## 17519 y2020
## 17520 y2020
## 17521 y2020
## 17522 y2020
## 17523 y2020
## 17524 y2020
## 17525 y2020
## 17526 y2020
## 17527 y2020
## 17528 y2020
## 17529 y2020
## 17530 y2020
## 17531 y2020
## 17532 y2020
## 17533 y2020
## 17534 y2020
## 17535 y2020
## 17536 y2020
## 17537 y2020
## 17538 y2020
## 17539 y2020
## 17540 y2020
## 17541 y2020
## 17542 y2020
## 17543 y2020
## 17544 y2020
## 17545 y2020
## 17546 y2020
## 17547 y2020
## 17548 y2020
## 17549 y2020
## 17550 y2020
## 17551 y2020
## 17552 y2020
## 17553 y2020
## 17554 y2020
## 17555 y2020
## 17556 y2020
## 17557 y2020
## 17558 y2020
## 17559 y2020
## 17560 y2020
## 17561 y2020
## 17562 y2020
## 17563 y2020
## 17564 y2020
## 17565 y2020
## 17566 y2020
## 17567 y2020
## 17568 y2020
## 17569 y2020
## 17570 y2020
## 17571 y2020
## 17572 y2020
## 17573 y2020
## 17574 y2020
## 17575 y2020
## 17576 y2020
## 17577 y2020
## 17578 y2020
## 17579 y2020
## 17580 y2020
## 17581 y2020
## 17582 y2020
## 17583 y2020
## 17584 y2020
## 17585 y2020
## 17586 y2020
## 17587 y2020
## 17588 y2020
## 17589 y2020
## 17590 y2020
## 17591 y2020
## 17592 y2020
## 17593 y2020
## 17594 y2020
## 17595 y2020
## 17596 y2020
## 17597 y2020
## 17598 y2020
## 17599 y2020
## 17600 y2020
## 17601 y2020
## 17602 y2020
## 17603 y2020
## 17604 y2020
## 17605 y2020
## 17606 y2020
## 17607 y2020
## 17608 y2020
## 17609 y2020
## 17610 y2020
## 17611 y2020
## 17612 y2020
## 17613 y2020
## 17614 y2020
## 17615 y2020
## 17616 y2020
## 17617 y2020
## 17618 y2020
## 17619 y2020
## 17620 y2020
## 17621 y2020
## 17622 y2020
## 17623 y2020
## 17624 y2020
## 17625 y2020
## 17626 y2020
## 17627 y2020
## 17628 y2020
## 17629 y2020
## 17630 y2020
## 17631 y2020
## 17632 y2020
## 17633 y2020
## 17634 y2020
## 17635 y2020
## 17636 y2020
## 17637 y2020
## 17638 y2020
## 17639 y2020
## 17640 y2020
## 17641 y2020
## 17642 y2020
## 17643 y2020
## 17644 y2020
## 17645 y2020
## 17646 y2020
## 17647 y2020
## 17648 y2020
## 17649 y2020
## 17650 y2020
## 17651 y2020
## 17652 y2020
## 17653 y2020
## 17654 y2020
## 17655 y2020
## 17656 y2020
## 17657 y2020
## 17658 y2020
## 17659 y2020
## 17660 y2020
## 17661 y2020
## 17662 y2020
## 17663 y2020
## 17664 y2020
## 17665 y2020
## 17666 y2020
## 17667 y2020
## 17668 y2020
## 17669 y2020
## 17670 y2020
## 17671 y2020
## 17672 y2020
## 17673 y2020
## 17674 y2020
## 17675 y2020
## 17676 y2020
## 17677 y2020
## 17678 y2020
## 17679 y2020
## 17680 y2020
## 17681 y2020
## 17682 y2020
## 17683 y2020
## 17684 y2020
## 17685 y2020
## 17686 y2020
## 17687 y2020
## 17688 y2020
## 17689 y2020
## 17690 y2020
## 17691 y2020
## 17692 y2020
## 17693 y2020
## 17694 y2020
## 17695 y2020
## 17696 y2020
## 17697 y2020
## 17698 y2020
## 17699 y2020
## 17700 y2020
## 17701 y2020
## 17702 y2020
## 17703 y2020
## 17704 y2020
## 17705 y2020
## 17706 y2020
## 17707 y2020
## 17708 y2020
## 17709 y2020
## 17710 y2020
## 17711 y2020
## 17712 y2020
## 17713 y2020
## 17714 y2020
## 17715 y2020
## 17716 y2020
## 17717 y2020
## 17718 y2020
## 17719 y2020
## 17720 y2020
## 17721 y2020
## 17722 y2020
## 17723 y2020
## 17724 y2020
## 17725 y2020
## 17726 y2020
## 17727 y2020
## 17728 y2020
## 17729 y2020
## 17730 y2020
## 17731 y2020
## 17732 y2020
## 17733 y2020
## 17734 y2020
## 17735 y2020
## 17736 y2020
## 17737 y2020
## 17738 y2020
## 17739 y2020
## 17740 y2020
## 17741 y2020
## 17742 y2020
## 17743 y2020
## 17744 y2020
## 17745 y2020
## 17746 y2020
## 17747 y2020
## 17748 y2020
## 17749 y2020
## 17750 y2020
## 17751 y2020
## 17752 y2020
## 17753 y2020
## 17754 y2020
## 17755 y2020
## 17756 y2020
## 17757 y2020
## 17758 y2020
## 17759 y2020
## 17760 y2020
## 17761 y2020
## 17762 y2020
## 17763 y2020
## 17764 y2020
## 17765 y2020
## 17766 y2020
## 17767 y2020
## 17768 y2020
## 17769 y2020
## 17770 y2020
## 17771 y2020
## 17772 y2020
## 17773 y2020
## 17774 y2020
## 17775 y2020
## 17776 y2020
## 17777 y2020
## 17778 y2020
## 17779 y2020
## 17780 y2020
## 17781 y2020
## 17782 y2020
## 17783 y2020
## 17784 y2020
## 17785 y2020
## 17786 y2020
## 17787 y2020
## 17788 y2020
## 17789 y2020
## 17790 y2020
## 17791 y2020
## 17792 y2020
## 17793 y2020
## 17794 y2020
## 17795 y2020
## 17796 y2020
## 17797 y2020
## 17798 y2020
## 17799 y2020
## 17800 y2020
## 17801 y2020
## 17802 y2020
## 17803 y2020
## 17804 y2020
## 17805 y2020
## 17806 y2020
## 17807 y2020
## 17808 y2020
## 17809 y2020
## 17810 y2020
## 17811 y2020
## 17812 y2020
## 17813 y2020
## 17814 y2020
## 17815 y2020
## 17816 y2020
## 17817 y2020
## 17818 y2020
## 17819 y2020
## 17820 y2020
## 17821 y2020
## 17822 y2020
## 17823 y2020
## 17824 y2020
## 17825 y2020
## 17826 y2020
## 17827 y2020
## 17828 y2020
## 17829 y2020
## 17830 y2020
## 17831 y2020
## 17832 y2020
## 17833 y2020
## 17834 y2020
## 17835 y2020
## 17836 y2020
## 17837 y2020
## 17838 y2020
## 17839 y2020
## 17840 y2020
## 17841 y2020
## 17842 y2020
## 17843 y2020
## 17844 y2020
## 17845 y2020
## 17846 y2020
## 17847 y2020
## 17848 y2020
## 17849 y2020
## 17850 y2020
## 17851 y2020
## 17852 y2020
## 17853 y2020
## 17854 y2020
## 17855 y2020
## 17856 y2020
## 17857 y2020
## 17858 y2020
## 17859 y2020
## 17860 y2020
## 17861 y2020
## 17862 y2020
## 17863 y2020
## 17864 y2020
## 17865 y2020
## 17866 y2020
## 17867 y2020
## 17868 y2020
## 17869 y2020
## 17870 y2020
## 17871 y2020
## 17872 y2020
## 17873 y2020
## 17874 y2020
## 17875 y2020
## 17876 y2020
## 17877 y2020
## 17878 y2020
## 17879 y2020
## 17880 y2020
## 17881 y2020
## 17882 y2020
## 17883 y2020
## 17884 y2020
## 17885 y2020
## 17886 y2020
## 17887 y2020
## 17888 y2020
## 17889 y2020
## 17890 y2020
## 17891 y2020
## 17892 y2020
## 17893 y2020
## 17894 y2020
## 17895 y2020
## 17896 y2020
## 17897 y2020
## 17898 y2020
## 17899 y2020
## 17900 y2020
## 17901 y2020
## 17902 y2020
## 17903 y2020
## 17904 y2020
## 17905 y2020
## 17906 y2020
## 17907 y2020
## 17908 y2020
## 17909 y2020
## 17910 y2020
## 17911 y2020
## 17912 y2020
## 17913 y2020
## 17914 y2020
## 17915 y2020
## 17916 y2020
## 17917 y2020
## 17918 y2020
## 17919 y2020
## 17920 y2020
## 17921 y2020
## 17922 y2020
## 17923 y2020
## 17924 y2020
## 17925 y2020
## 17926 y2020
## 17927 y2020
## 17928 y2020
## 17929 y2020
## 17930 y2020
## 17931 y2020
## 17932 y2020
## 17933 y2020
## 17934 y2020
## 17935 y2020
## 17936 y2020
## 17937 y2020
## 17938 y2020
## 17939 y2020
## 17940 y2020
## 17941 y2020
## 17942 y2020
## 17943 y2020
## 17944 y2020
## 17945 y2020
## 17946 y2020
## 17947 y2020
## 17948 y2020
## 17949 y2020
## 17950 y2020
## 17951 y2020
## 17952 y2020
## 17953 y2020
## 17954 y2020
## 17955 y2020
## 17956 y2020
## 17957 y2020
## 17958 y2020
## 17959 y2020
## 17960 y2020
## 17961 y2020
## 17962 y2020
## 17963 y2020
## 17964 y2020
## 17965 y2020
## 17966 y2020
## 17967 y2020
## 17968 y2020
## 17969 y2020
## 17970 y2020
## 17971 y2020
## 17972 y2020
## 17973 y2020
## 17974 y2020
## 17975 y2020
## 17976 y2020
## 17977 y2020
## 17978 y2020
## 17979 y2020
## 17980 y2020
## 17981 y2020
## 17982 y2020
## 17983 y2020
## 17984 y2020
## 17985 y2020
## 17986 y2020
## 17987 y2020
## 17988 y2020
## 17989 y2020
## 17990 y2020
## 17991 y2020
## 17992 y2020
## 17993 y2020
## 17994 y2020
## 17995 y2020
## 17996 y2020
## 17997 y2020
## 17998 y2020
## 17999 y2020
## 18000 y2020
## 18001 y2020
## 18002 y2020
## 18003 y2020
## 18004 y2020
## 18005 y2020
## 18006 y2020
## 18007 y2020
## 18008 y2020
## 18009 y2020
## 18010 y2020
## 18011 y2020
## 18012 y2020
## 18013 y2020
## 18014 y2020
## 18015 y2020
## 18016 y2020
## 18017 y2020
## 18018 y2020
## 18019 y2020
## 18020 y2020
## 18021 y2020
## 18022 y2020
## 18023 y2020
## 18024 y2020
## 18025 y2020
## 18026 y2020
## 18027 y2020
## 18028 y2020
## 18029 y2020
## 18030 y2020
## 18031 y2020
## 18032 y2020
## 18033 y2020
## 18034 y2020
## 18035 y2020
## 18036 y2020
## 18037 y2020
## 18038 y2020
## 18039 y2020
## 18040 y2020
## 18041 y2020
## 18042 y2020
## 18043 y2020
## 18044 y2020
## 18045 y2020
## 18046 y2020
## 18047 y2020
## 18048 y2020
## 18049 y2020
## 18050 y2020
## 18051 y2020
## 18052 y2020
## 18053 y2020
## 18054 y2020
## 18055 y2020
## 18056 y2020
## 18057 y2020
## 18058 y2020
## 18059 y2020
## 18060 y2020
## 18061 y2020
## 18062 y2020
## 18063 y2020
## 18064 y2020
## 18065 y2020
## 18066 y2020
## 18067 y2020
## 18068 y2020
## 18069 y2020
## 18070 y2020
## 18071 y2020
## 18072 y2020
## 18073 y2020
## 18074 y2020
## 18075 y2020
## 18076 y2020
## 18077 y2020
## 18078 y2020
## 18079 y2020
## 18080 y2020
## 18081 y2020
## 18082 y2020
## 18083 y2020
## 18084 y2020
## 18085 y2020
## 18086 y2020
## 18087 y2020
## 18088 y2020
## 18089 y2020
## 18090 y2020
## 18091 y2020
## 18092 y2020
## 18093 y2020
## 18094 y2020
## 18095 y2020
## 18096 y2020
## 18097 y2020
## 18098 y2020
## 18099 y2020
## 18100 y2020
## 18101 y2020
## 18102 y2020
## 18103 y2020
## 18104 y2020
## 18105 y2020
## 18106 y2020
## 18107 y2020
## 18108 y2020
## 18109 y2020
## 18110 y2020
## 18111 y2020
## 18112 y2020
## 18113 y2020
## 18114 y2020
## 18115 y2020
## 18116 y2020
## 18117 y2020
## 18118 y2020
## 18119 y2020
## 18120 y2020
## 18121 y2020
## 18122 y2020
## 18123 y2020
## 18124 y2020
## 18125 y2020
## 18126 y2020
## 18127 y2020
## 18128 y2020
## 18129 y2020
## 18130 y2020
## 18131 y2020
## 18132 y2020
## 18133 y2020
## 18134 y2020
## 18135 y2020
## 18136 y2020
## 18137 y2020
## 18138 y2020
## 18139 y2020
## 18140 y2020
## 18141 y2020
## 18142 y2020
## 18143 y2020
## 18144 y2020
## 18145 y2020
## 18146 y2020
## 18147 y2020
## 18148 y2020
## 18149 y2020
## 18150 y2020
## 18151 y2020
## 18152 y2020
## 18153 y2020
## 18154 y2020
## 18155 y2020
## 18156 y2020
## 18157 y2020
## 18158 y2020
## 18159 y2020
## 18160 y2020
## 18161 y2020
## 18162 y2020
## 18163 y2020
## 18164 y2020
## 18165 y2020
## 18166 y2020
## 18167 y2020
## 18168 y2020
## 18169 y2020
## 18170 y2020
## 18171 y2020
## 18172 y2020
## 18173 y2020
## 18174 y2020
## 18175 y2020
## 18176 y2020
## 18177 y2020
## 18178 y2020
## 18179 y2020
## 18180 y2020
## 18181 y2020
## 18182 y2020
## 18183 y2020
## 18184 y2020
## 18185 y2020
## 18186 y2020
## 18187 y2020
## 18188 y2020
## 18189 y2020
## 18190 y2020
## 18191 y2020
## 18192 y2020
## 18193 y2020
## 18194 y2020
## 18195 y2020
## 18196 y2020
## 18197 y2020
## 18198 y2020
## 18199 y2020
## 18200 y2020
## 18201 y2020
## 18202 y2020
## 18203 y2020
## 18204 y2020
## 18205 y2020
## 18206 y2020
## 18207 y2020
## 18208 y2020
## 18209 y2020
## 18210 y2020
## 18211 y2020
## 18212 y2020
## 18213 y2020
## 18214 y2020
## 18215 y2020
## 18216 y2020
## 18217 y2020
## 18218 y2020
## 18219 y2020
## 18220 y2020
## 18221 y2020
## 18222 y2020
## 18223 y2020
## 18224 y2020
## 18225 y2020
## 18226 y2020
## 18227 y2020
## 18228 y2020
## 18229 y2020
## 18230 y2020
## 18231 y2020
## 18232 y2020
## 18233 y2020
## 18234 y2020
## 18235 y2020
## 18236 y2020
## 18237 y2020
## 18238 y2020
## 18239 y2020
## 18240 y2020
## 18241 y2020
## 18242 y2020
## 18243 y2020
## 18244 y2020
## 18245 y2020
## 18246 y2020
## 18247 y2020
## 18248 y2020
## 18249 y2020
## 18250 y2020
## 18251 y2020
## 18252 y2020
## 18253 y2020
## 18254 y2020
## 18255 y2020
## 18256 y2020
## 18257 y2020
## 18258 y2020
## 18259 y2020
## 18260 y2020
## 18261 y2020
## 18262 y2020
## 18263 y2020
## 18264 y2020
## 18265 y2020
## 18266 y2020
## 18267 y2020
## 18268 y2020
## 18269 y2020
## 18270 y2020
## 18271 y2020
## 18272 y2020
## 18273 y2020
## 18274 y2020
## 18275 y2020
## 18276 y2020
## 18277 y2020
## 18278 y2020
## 18279 y2020
## 18280 y2020
## 18281 y2020
## 18282 y2020
## 18283 y2020
## 18284 y2020
## 18285 y2020
## 18286 y2020
## 18287 y2020
## 18288 y2020
## 18289 y2020
## 18290 y2020
## 18291 y2020
## 18292 y2020
## 18293 y2020
## 18294 y2020
## 18295 y2020
## 18296 y2020
## 18297 y2020
## 18298 y2020
## 18299 y2020
## 18300 y2020
## 18301 y2020
## 18302 y2020
## 18303 y2020
## 18304 y2020
## 18305 y2020
## 18306 y2020
## 18307 y2020
## 18308 y2020
## 18309 y2020
## 18310 y2020
## 18311 y2020
## 18312 y2020
## 18313 y2020
## 18314 y2020
## 18315 y2020
## 18316 y2020
## 18317 y2020
## 18318 y2020
## 18319 y2020
## 18320 y2020
## 18321 y2020
## 18322 y2020
## 18323 y2020
## 18324 y2020
## 18325 y2020
## 18326 y2020
## 18327 y2020
## 18328 y2020
## 18329 y2020
## 18330 y2020
## 18331 y2020
## 18332 y2020
## 18333 y2020
## 18334 y2020
## 18335 y2020
## 18336 y2020
## 18337 y2020
## 18338 y2020
## 18339 y2020
## 18340 y2020
## 18341 y2020
## 18342 y2020
## 18343 y2020
## 18344 y2020
## 18345 y2020
## 18346 y2020
## 18347 y2020
## 18348 y2020
## 18349 y2020
## 18350 y2020
## 18351 y2020
## 18352 y2020
## 18353 y2020
## 18354 y2020
## 18355 y2020
## 18356 y2020
## 18357 y2020
## 18358 y2020
## 18359 y2020
## 18360 y2020
## 18361 y2020
## 18362 y2020
## 18363 y2020
## 18364 y2020
## 18365 y2020
## 18366 y2020
## 18367 y2020
## 18368 y2020
## 18369 y2020
## 18370 y2020
## 18371 y2020
## 18372 y2020
## 18373 y2020
## 18374 y2020
## 18375 y2020
## 18376 y2020
## 18377 y2020
## 18378 y2020
## 18379 y2020
## 18380 y2020
## 18381 y2020
## 18382 y2020
## 18383 y2020
## 18384 y2020
## 18385 y2020
## 18386 y2020
## 18387 y2020
## 18388 y2020
## 18389 y2020
## 18390 y2020
## 18391 y2020
## 18392 y2020
## 18393 y2020
## 18394 y2020
## 18395 y2020
## 18396 y2020
## 18397 y2020
## 18398 y2020
## 18399 y2020
## 18400 y2020
## 18401 y2020
## 18402 y2020
## 18403 y2020
## 18404 y2020
## 18405 y2020
## 18406 y2020
## 18407 y2020
## 18408 y2020
## 18409 y2020
## 18410 y2020
## 18411 y2020
## 18412 y2020
## 18413 y2020
## 18414 y2020
## 18415 y2020
## 18416 y2020
## 18417 y2020
## 18418 y2020
## 18419 y2020
## 18420 y2020
## 18421 y2020
## 18422 y2020
## 18423 y2020
## 18424 y2020
## 18425 y2020
## 18426 y2020
## 18427 y2020
## 18428 y2020
## 18429 y2020
## 18430 y2020
## 18431 y2020
## 18432 y2020
## 18433 y2020
## 18434 y2020
## 18435 y2020
## 18436 y2020
## 18437 y2020
## 18438 y2020
## 18439 y2020
## 18440 y2020
## 18441 y2020
## 18442 y2020
## 18443 y2020
## 18444 y2020
## 18445 y2020
## 18446 y2020
## 18447 y2020
## 18448 y2020
## 18449 y2020
## 18450 y2020
## 18451 y2020
## 18452 y2020
## 18453 y2020
## 18454 y2020
## 18455 y2020
## 18456 y2020
## 18457 y2020
## 18458 y2020
## 18459 y2020
## 18460 y2020
## 18461 y2020
## 18462 y2020
## 18463 y2020
## 18464 y2020
## 18465 y2020
## 18466 y2020
## 18467 y2020
## 18468 y2020
## 18469 y2020
## 18470 y2020
## 18471 y2020
## 18472 y2020
## 18473 y2020
## 18474 y2020
## 18475 y2020
## 18476 y2020
## 18477 y2020
## 18478 y2020
## 18479 y2020
## 18480 y2020
## 18481 y2020
## 18482 y2020
## 18483 y2020
## 18484 y2020
## 18485 y2020
## 18486 y2020
## 18487 y2020
## 18488 y2020
## 18489 y2020
## 18490 y2020
## 18491 y2020
## 18492 y2020
## 18493 y2020
## 18494 y2020
## 18495 y2020
## 18496 y2020
## 18497 y2020
## 18498 y2020
## 18499 y2020
## 18500 y2020
## 18501 y2020
## 18502 y2020
## 18503 y2020
## 18504 y2020
## 18505 y2020
## 18506 y2020
## 18507 y2020
## 18508 y2020
## 18509 y2020
## 18510 y2020
## 18511 y2020
## 18512 y2020
## 18513 y2020
## 18514 y2020
## 18515 y2020
## 18516 y2020
## 18517 y2020
## 18518 y2020
## 18519 y2020
## 18520 y2020
## 18521 y2020
## 18522 y2020
## 18523 y2020
## 18524 y2020
## 18525 y2020
## 18526 y2020
## 18527 y2020
## 18528 y2020
## 18529 y2020
## 18530 y2020
## 18531 y2020
## 18532 y2020
## 18533 y2020
## 18534 y2020
## 18535 y2020
## 18536 y2020
## 18537 y2020
## 18538 y2020
## 18539 y2020
## 18540 y2020
## 18541 y2020
## 18542 y2020
## 18543 y2020
## 18544 y2020
## 18545 y2020
## 18546 y2020
## 18547 y2020
## 18548 y2020
## 18549 y2020
## 18550 y2020
## 18551 y2020
## 18552 y2020
## 18553 y2020
## 18554 y2020
## 18555 y2020
## 18556 y2020
## 18557 y2020
## 18558 y2020
## 18559 y2020
## 18560 y2020
## 18561 y2020
## 18562 y2020
## 18563 y2020
## 18564 y2020
## 18565 y2020
## 18566 y2020
## 18567 y2020
## 18568 y2020
## 18569 y2020
## 18570 y2020
## 18571 y2020
## 18572 y2020
## 18573 y2020
## 18574 y2020
## 18575 y2020
## 18576 y2020
## 18577 y2020
## 18578 y2020
## 18579 y2020
## 18580 y2020
## 18581 y2020
## 18582 y2020
## 18583 y2020
## 18584 y2020
## 18585 y2020
## 18586 y2020
## 18587 y2020
## 18588 y2020
## 18589 y2020
## 18590 y2020
## 18591 y2020
## 18592 y2020
## 18593 y2020
## 18594 y2020
## 18595 y2020
## 18596 y2020
## 18597 y2020
## 18598 y2020
## 18599 y2020
## 18600 y2020
## 18601 y2020
## 18602 y2020
## 18603 y2020
## 18604 y2020
## 18605 y2020
## 18606 y2020
## 18607 y2020
## 18608 y2020
## 18609 y2020
## 18610 y2020
## 18611 y2020
## 18612 y2020
## 18613 y2020
## 18614 y2020
## 18615 y2020
## 18616 y2020
## 18617 y2020
## 18618 y2020
## 18619 y2020
## 18620 y2020
## 18621 y2020
## 18622 y2020
## 18623 y2020
## 18624 y2020
## 18625 y2020
## 18626 y2020
## 18627 y2020
## 18628 y2020
## 18629 y2020
## 18630 y2020
## 18631 y2020
## 18632 y2020
## 18633 y2020
## 18634 y2020
## 18635 y2020
## 18636 y2020
## 18637 y2020
## 18638 y2020
## 18639 y2020
## 18640 y2020
## 18641 y2020
## 18642 y2020
## 18643 y2020
## 18644 y2020
## 18645 y2020
## 18646 y2020
## 18647 y2020
## 18648 y2020
## 18649 y2020
## 18650 y2020
## 18651 y2020
## 18652 y2020
## 18653 y2020
## 18654 y2020
## 18655 y2020
## 18656 y2020
## 18657 y2020
## 18658 y2020
## 18659 y2020
## 18660 y2020
## 18661 y2020
## 18662 y2020
## 18663 y2020
## 18664 y2020
## 18665 y2020
## 18666 y2020
## 18667 y2020
## 18668 y2020
## 18669 y2020
## 18670 y2020
## 18671 y2020
## 18672 y2020
## 18673 y2020
## 18674 y2020
## 18675 y2020
## 18676 y2020
## 18677 y2020
## 18678 y2020
## 18679 y2020
## 18680 y2020
## 18681 y2020
## 18682 y2020
## 18683 y2020
## 18684 y2020
## 18685 y2020
## 18686 y2020
## 18687 y2020
## 18688 y2020
## 18689 y2020
## 18690 y2020
## 18691 y2020
## 18692 y2020
## 18693 y2020
## 18694 y2020
## 18695 y2020
## 18696 y2020
## 18697 y2020
## 18698 y2020
## 18699 y2020
## 18700 y2020
## 18701 y2020
## 18702 y2020
## 18703 y2020
## 18704 y2020
## 18705 y2020
## 18706 y2020
## 18707 y2020
## 18708 y2020
## 18709 y2020
## 18710 y2020
## 18711 y2020
## 18712 y2020
## 18713 y2020
## 18714 y2020
## 18715 y2020
## 18716 y2020
## 18717 y2020
## 18718 y2020
## 18719 y2020
## 18720 y2020
## 18721 y2020
## 18722 y2020
## 18723 y2020
## 18724 y2020
## 18725 y2020
## 18726 y2020
## 18727 y2020
## 18728 y2020
## 18729 y2020
## 18730 y2020
## 18731 y2020
## 18732 y2020
## 18733 y2020
## 18734 y2020
## 18735 y2020
## 18736 y2020
## 18737 y2020
## 18738 y2020
## 18739 y2020
## 18740 y2020
## 18741 y2020
## 18742 y2020
## 18743 y2020
## 18744 y2020
## 18745 y2020
## 18746 y2020
## 18747 y2020
## 18748 y2020
## 18749 y2020
## 18750 y2020
## 18751 y2020
## 18752 y2020
## 18753 y2020
## 18754 y2020
## 18755 y2020
## 18756 y2020
## 18757 y2020
## 18758 y2020
## 18759 y2020
## 18760 y2020
## 18761 y2020
## 18762 y2020
## 18763 y2020
## 18764 y2020
## 18765 y2020
## 18766 y2020
## 18767 y2020
## 18768 y2020
## 18769 y2020
## 18770 y2020
## 18771 y2020
## 18772 y2020
## 18773 y2020
## 18774 y2020
## 18775 y2020
## 18776 y2020
## 18777 y2020
## 18778 y2020
## 18779 y2020
## 18780 y2020
## 18781 y2020
## 18782 y2020
## 18783 y2020
## 18784 y2020
## 18785 y2020
## 18786 y2020
## 18787 y2020
## 18788 y2020
## 18789 y2020
## 18790 y2020
## 18791 y2020
## 18792 y2020
## 18793 y2020
## 18794 y2020
## 18795 y2020
## 18796 y2020
## 18797 y2020
## 18798 y2020
## 18799 y2020
## 18800 y2020
## 18801 y2020
## 18802 y2020
## 18803 y2020
## 18804 y2020
## 18805 y2020
## 18806 y2020
## 18807 y2020
## 18808 y2020
## 18809 y2020
## 18810 y2020
## 18811 y2020
## 18812 y2020
## 18813 y2020
## 18814 y2020
## 18815 y2020
## 18816 y2020
## 18817 y2020
## 18818 y2020
## 18819 y2020
## 18820 y2020
## 18821 y2020
## 18822 y2020
## 18823 y2020
## 18824 y2020
## 18825 y2020
## 18826 y2020
## 18827 y2020
## 18828 y2020
## 18829 y2020
## 18830 y2020
## 18831 y2020
## 18832 y2020
## 18833 y2020
## 18834 y2020
## 18835 y2020
## 18836 y2020
## 18837 y2020
## 18838 y2020
## 18839 y2020
## 18840 y2020
## 18841 y2020
## 18842 y2020
## 18843 y2020
## 18844 y2020
## 18845 y2020
## 18846 y2020
## 18847 y2020
## 18848 y2020
## 18849 y2020
## 18850 y2020
## 18851 y2020
## 18852 y2020
## 18853 y2020
## 18854 y2020
## 18855 y2020
## 18856 y2020
## 18857 y2020
## 18858 y2020
## 18859 y2020
## 18860 y2020
## 18861 y2020
## 18862 y2020
## 18863 y2020
## 18864 y2020
## 18865 y2020
## 18866 y2020
## 18867 y2020
## 18868 y2020
## 18869 y2020
## 18870 y2020
## 18871 y2020
## 18872 y2020
## 18873 y2020
## 18874 y2020
## 18875 y2020
## 18876 y2020
## 18877 y2020
## 18878 y2020
## 18879 y2020
## 18880 y2020
## 18881 y2020
## 18882 y2020
## 18883 y2020
## 18884 y2020
## 18885 y2020
## 18886 y2020
## 18887 y2020
## 18888 y2020
## 18889 y2020
## 18890 y2020
## 18891 y2020
## 18892 y2020
## 18893 y2020
## 18894 y2020
## 18895 y2020
## 18896 y2020
## 18897 y2020
## 18898 y2020
## 18899 y2020
## 18900 y2020
## 18901 y2020
## 18902 y2020
## 18903 y2020
## 18904 y2020
## 18905 y2020
## 18906 y2020
## 18907 y2020
## 18908 y2020
## 18909 y2020
## 18910 y2020
## 18911 y2020
## 18912 y2020
## 18913 y2020
## 18914 y2020
## 18915 y2020
## 18916 y2020
## 18917 y2020
## 18918 y2020
## 18919 y2020
## 18920 y2020
## 18921 y2020
## 18922 y2020
## 18923 y2020
## 18924 y2020
## 18925 y2020
## 18926 y2020
## 18927 y2020
## 18928 y2020
## 18929 y2020
## 18930 y2020
## 18931 y2020
## 18932 y2020
## 18933 y2020
## 18934 y2020
## 18935 y2020
## 18936 y2020
## 18937 y2020
## 18938 y2020
## 18939 y2020
## 18940 y2020
## 18941 y2020
## 18942 y2020
## 18943 y2020
## 18944 y2020
## 18945 y2020
## 18946 y2020
## 18947 y2020
## 18948 y2020
## 18949 y2020
## 18950 y2020
## 18951 y2020
## 18952 y2020
## 18953 y2020
## 18954 y2020
## 18955 y2020
## 18956 y2020
## 18957 y2020
## 18958 y2020
## 18959 y2020
## 18960 y2020
## 18961 y2020
## 18962 y2020
## 18963 y2020
## 18964 y2020
## 18965 y2020
## 18966 y2020
## 18967 y2020
## 18968 y2020
## 18969 y2020
## 18970 y2020
## 18971 y2020
## 18972 y2020
## 18973 y2020
## 18974 y2020
## 18975 y2020
## 18976 y2020
## 18977 y2020
## 18978 y2020
## 18979 y2020
## 18980 y2020
## 18981 y2020
## 18982 y2020
## 18983 y2020
## 18984 y2020
## 18985 y2020
## 18986 y2020
## 18987 y2020
## 18988 y2020
## 18989 y2020
## 18990 y2020
## 18991 y2020
## 18992 y2020
## 18993 y2020
## 18994 y2020
## 18995 y2020
## 18996 y2020
## 18997 y2020
## 18998 y2020
## 18999 y2020
## 19000 y2020
## 19001 y2020
## 19002 y2020
## 19003 y2020
## 19004 y2020
## 19005 y2020
## 19006 y2020
## 19007 y2020
## 19008 y2020
## 19009 y2020
## 19010 y2020
## 19011 y2020
## 19012 y2020
## 19013 y2020
## 19014 y2020
## 19015 y2020
## 19016 y2020
## 19017 y2020
## 19018 y2020
## 19019 y2020
## 19020 y2020
## 19021 y2020
## 19022 y2020
## 19023 y2020
## 19024 y2020
## 19025 y2020
## 19026 y2020
## 19027 y2020
## 19028 y2020
## 19029 y2020
## 19030 y2020
## 19031 y2020
## 19032 y2020
## 19033 y2020
## 19034 y2020
## 19035 y2020
## 19036 y2020
## 19037 y2020
## 19038 y2020
## 19039 y2020
## 19040 y2020
## 19041 y2020
## 19042 y2020
## 19043 y2020
## 19044 y2020
## 19045 y2020
## 19046 y2020
## 19047 y2020
## 19048 y2020
## 19049 y2020
## 19050 y2020
## 19051 y2020
## 19052 y2020
## 19053 y2020
## 19054 y2020
## 19055 y2020
## 19056 y2020
## 19057 y2020
## 19058 y2020
## 19059 y2020
## 19060 y2020
## 19061 y2020
## 19062 y2020
## 19063 y2020
## 19064 y2020
## 19065 y2020
## 19066 y2020
## 19067 y2020
## 19068 y2020
## 19069 y2020
## 19070 y2020
## 19071 y2020
## 19072 y2020
## 19073 y2020
## 19074 y2020
## 19075 y2020
## 19076 y2020
## 19077 y2020
## 19078 y2020
## 19079 y2020
## 19080 y2020
## 19081 y2020
## 19082 y2020
## 19083 y2020
## 19084 y2020
## 19085 y2020
## 19086 y2020
## 19087 y2020
## 19088 y2020
## 19089 y2020
## 19090 y2020
## 19091 y2020
## 19092 y2020
## 19093 y2020
## 19094 y2020
## 19095 y2020
## 19096 y2020
## 19097 y2020
## 19098 y2020
## 19099 y2020
## 19100 y2020
## 19101 y2020
## 19102 y2020
## 19103 y2020
## 19104 y2020
## 19105 y2020
## 19106 y2020
## 19107 y2020
## 19108 y2020
## 19109 y2020
## 19110 y2020
## 19111 y2020
## 19112 y2020
## 19113 y2020
## 19114 y2020
## 19115 y2020
## 19116 y2020
## 19117 y2020
## 19118 y2020
## 19119 y2020
## 19120 y2020
## 19121 y2020
## 19122 y2020
## 19123 y2020
## 19124 y2020
## 19125 y2020
## 19126 y2020
## 19127 y2020
## 19128 y2020
## 19129 y2020
## 19130 y2020
## 19131 y2020
## 19132 y2020
## 19133 y2020
## 19134 y2020
## 19135 y2020
## 19136 y2020
## 19137 y2020
## 19138 y2020
## 19139 y2020
## 19140 y2020
## 19141 y2020
## 19142 y2020
## 19143 y2020
## 19144 y2020
## 19145 y2020
## 19146 y2020
## 19147 y2020
## 19148 y2020
## 19149 y2020
## 19150 y2020
## 19151 y2020
## 19152 y2020
## 19153 y2020
## 19154 y2020
## 19155 y2020
## 19156 y2020
## 19157 y2020
## 19158 y2020
## 19159 y2020
## 19160 y2020
## 19161 y2020
## 19162 y2020
## 19163 y2020
## 19164 y2020
## 19165 y2020
## 19166 y2020
## 19167 y2020
## 19168 y2020
## 19169 y2020
## 19170 y2020
## 19171 y2020
## 19172 y2020
## 19173 y2020
## 19174 y2020
## 19175 y2020
## 19176 y2020
## 19177 y2020
## 19178 y2020
## 19179 y2020
## 19180 y2020
## 19181 y2020
## 19182 y2020
## 19183 y2020
## 19184 y2020
## 19185 y2020
## 19186 y2020
## 19187 y2020
## 19188 y2020
## 19189 y2020
## 19190 y2020
## 19191 y2020
## 19192 y2020
## 19193 y2020
## 19194 y2020
## 19195 y2020
## 19196 y2020
## 19197 y2020
## 19198 y2020
## 19199 y2020
## 19200 y2020
## 19201 y2020
## 19202 y2020
## 19203 y2020
## 19204 y2020
## 19205 y2020
## 19206 y2020
## 19207 y2020
## 19208 y2020
## 19209 y2020
## 19210 y2020
## 19211 y2020
## 19212 y2020
## 19213 y2020
## 19214 y2020
## 19215 y2020
## 19216 y2020
## 19217 y2020
## 19218 y2020
## 19219 y2020
## 19220 y2020
## 19221 y2020
## 19222 y2020
## 19223 y2020
## 19224 y2020
## 19225 y2020
## 19226 y2020
## 19227 y2020
## 19228 y2020
## 19229 y2020
## 19230 y2020
## 19231 y2020
## 19232 y2020
## 19233 y2020
## 19234 y2020
## 19235 y2020
## 19236 y2020
## 19237 y2020
## 19238 y2020
## 19239 y2020
## 19240 y2020
## 19241 y2020
## 19242 y2020
## 19243 y2020
## 19244 y2020
## 19245 y2020
## 19246 y2020
## 19247 y2020
## 19248 y2020
## 19249 y2020
## 19250 y2020
## 19251 y2020
## 19252 y2020
## 19253 y2020
## 19254 y2020
## 19255 y2020
## 19256 y2020
## 19257 y2020
## 19258 y2020
## 19259 y2020
## 19260 y2020
## 19261 y2020
## 19262 y2020
## 19263 y2020
## 19264 y2020
## 19265 y2020
## 19266 y2020
## 19267 y2020
## 19268 y2020
## 19269 y2020
## 19270 y2020
## 19271 y2020
## 19272 y2020
## 19273 y2020
## 19274 y2020
## 19275 y2020
## 19276 y2020
## 19277 y2020
## 19278 y2020
## 19279 y2020
## 19280 y2020
## 19281 y2020
## 19282 y2020
## 19283 y2020
## 19284 y2020
## 19285 y2020
## 19286 y2020
## 19287 y2020
## 19288 y2020
## 19289 y2020
## 19290 y2020
## 19291 y2020
## 19292 y2020
## 19293 y2020
## 19294 y2020
## 19295 y2020
## 19296 y2020
## 19297 y2020
## 19298 y2020
## 19299 y2020
## 19300 y2020
## 19301 y2020
## 19302 y2020
## 19303 y2020
## 19304 y2020
## 19305 y2020
## 19306 y2020
## 19307 y2020
## 19308 y2020
## 19309 y2020
## 19310 y2020
## 19311 y2020
## 19312 y2020
## 19313 y2020
## 19314 y2020
## 19315 y2020
## 19316 y2020
## 19317 y2020
## 19318 y2020
## 19319 y2020
## 19320 y2020
## 19321 y2020
## 19322 y2020
## 19323 y2020
## 19324 y2020
## 19325 y2020
## 19326 y2020
## 19327 y2020
## 19328 y2020
## 19329 y2020
## 19330 y2020
## 19331 y2020
## 19332 y2020
## 19333 y2020
## 19334 y2020
## 19335 y2020
## 19336 y2020
## 19337 y2020
## 19338 y2020
## 19339 y2020
## 19340 y2020
## 19341 y2020
## 19342 y2020
## 19343 y2020
## 19344 y2020
## 19345 y2020
## 19346 y2020
## 19347 y2020
## 19348 y2020
## 19349 y2020
## 19350 y2020
## 19351 y2020
## 19352 y2020
## 19353 y2020
## 19354 y2020
## 19355 y2020
## 19356 y2020
## 19357 y2020
## 19358 y2020
## 19359 y2020
## 19360 y2020
## 19361 y2020
## 19362 y2020
## 19363 y2020
## 19364 y2020
## 19365 y2020
## 19366 y2020
## 19367 y2020
## 19368 y2020
## 19369 y2020
## 19370 y2020
## 19371 y2020
## 19372 y2020
## 19373 y2020
## 19374 y2020
## 19375 y2020
## 19376 y2020
## 19377 y2020
## 19378 y2020
## 19379 y2020
## 19380 y2020
## 19381 y2020
## 19382 y2020
## 19383 y2020
## 19384 y2020
## 19385 y2020
## 19386 y2020
## 19387 y2020
## 19388 y2020
## 19389 y2020
## 19390 y2020
## 19391 y2020
## 19392 y2020
## 19393 y2020
## 19394 y2020
## 19395 y2020
## 19396 y2020
## 19397 y2020
## 19398 y2020
## 19399 y2020
## 19400 y2020
## 19401 y2020
## 19402 y2020
## 19403 y2020
## 19404 y2020
## 19405 y2020
## 19406 y2020
## 19407 y2020
## 19408 y2020
## 19409 y2020
## 19410 y2020
## 19411 y2020
## 19412 y2020
## 19413 y2020
## 19414 y2020
## 19415 y2020
## 19416 y2020
## 19417 y2020
## 19418 y2020
## 19419 y2020
## 19420 y2020
## 19421 y2020
## 19422 y2020
## 19423 y2020
## 19424 y2020
## 19425 y2020
## 19426 y2020
## 19427 y2020
## 19428 y2020
## 19429 y2020
## 19430 y2020
## 19431 y2020
## 19432 y2020
## 19433 y2020
## 19434 y2020
## 19435 y2020
## 19436 y2020
## 19437 y2020
## 19438 y2020
## 19439 y2020
## 19440 y2020
## 19441 y2020
## 19442 y2020
## 19443 y2020
## 19444 y2020
## 19445 y2020
## 19446 y2020
## 19447 y2020
## 19448 y2020
## 19449 y2020
## 19450 y2020
## 19451 y2020
## 19452 y2020
## 19453 y2020
## 19454 y2020
## 19455 y2020
## 19456 y2020
## 19457 y2020
## 19458 y2020
## 19459 y2020
## 19460 y2020
## 19461 y2020
## 19462 y2020
## 19463 y2020
## 19464 y2020
## 19465 y2020
## 19466 y2020
## 19467 y2020
## 19468 y2020
## 19469 y2020
## 19470 y2020
## 19471 y2020
## 19472 y2020
## 19473 y2020
## 19474 y2020
## 19475 y2020
## 19476 y2020
## 19477 y2020
## 19478 y2020
## 19479 y2020
## 19480 y2020
## 19481 y2020
## 19482 y2020
## 19483 y2020
## 19484 y2020
## 19485 y2020
## 19486 y2020
## 19487 y2020
## 19488 y2020
## 19489 y2020
## 19490 y2020
## 19491 y2020
## 19492 y2020
## 19493 y2020
## 19494 y2020
## 19495 y2020
## 19496 y2020
## 19497 y2020
## 19498 y2020
## 19499 y2020
## 19500 y2020
## 19501 y2020
## 19502 y2020
## 19503 y2020
## 19504 y2020
## 19505 y2020
## 19506 y2020
## 19507 y2020
## 19508 y2020
## 19509 y2020
## 19510 y2020
## 19511 y2020
## 19512 y2020
## 19513 y2020
## 19514 y2020
## 19515 y2020
## 19516 y2020
## 19517 y2020
## 19518 y2020
## 19519 y2020
## 19520 y2020
## 19521 y2020
## 19522 y2020
## 19523 y2020
## 19524 y2020
## 19525 y2020
## 19526 y2020
## 19527 y2020
## 19528 y2020
## 19529 y2020
## 19530 y2020
## 19531 y2020
## 19532 y2020
## 19533 y2020
## 19534 y2020
## 19535 y2020
## 19536 y2020
## 19537 y2020
## 19538 y2020
## 19539 y2020
## 19540 y2020
## 19541 y2020
## 19542 y2020
## 19543 y2020
## 19544 y2020
## 19545 y2020
## 19546 y2020
## 19547 y2020
## 19548 y2020
## 19549 y2020
## 19550 y2020
## 19551 y2020
## 19552 y2020
## 19553 y2020
## 19554 y2020
## 19555 y2020
## 19556 y2020
## 19557 y2020
## 19558 y2020
## 19559 y2020
## 19560 y2020
## 19561 y2020
## 19562 y2020
## 19563 y2020
## 19564 y2020
## 19565 y2020
## 19566 y2020
## 19567 y2020
## 19568 y2020
## 19569 y2020
## 19570 y2020
## 19571 y2020
## 19572 y2020
## 19573 y2020
## 19574 y2020
## 19575 y2020
## 19576 y2020
## 19577 y2020
## 19578 y2020
## 19579 y2020
## 19580 y2020
## 19581 y2020
## 19582 y2020
## 19583 y2020
## 19584 y2020
## 19585 y2020
## 19586 y2020
## 19587 y2020
## 19588 y2020
## 19589 y2020
## 19590 y2020
## 19591 y2020
## 19592 y2020
## 19593 y2020
## 19594 y2020
## 19595 y2020
## 19596 y2020
## 19597 y2020
## 19598 y2020
## 19599 y2020
## 19600 y2020
## 19601 y2020
## 19602 y2020
## 19603 y2020
## 19604 y2020
## 19605 y2020
## 19606 y2020
## 19607 y2020
## 19608 y2020
## 19609 y2020
## 19610 y2020
## 19611 y2020
## 19612 y2020
## 19613 y2020
## 19614 y2020
## 19615 y2020
## 19616 y2020
## 19617 y2020
## 19618 y2020
## 19619 y2020
## 19620 y2020
## 19621 y2020
## 19622 y2020
## 19623 y2020
## 19624 y2020
## 19625 y2020
## 19626 y2020
## 19627 y2020
## 19628 y2020
## 19629 y2020
## 19630 y2020
## 19631 y2020
## 19632 y2020
## 19633 y2020
## 19634 y2020
## 19635 y2020
## 19636 y2020
## 19637 y2020
## 19638 y2020
## 19639 y2020
## 19640 y2020
## 19641 y2020
## 19642 y2020
## 19643 y2020
## 19644 y2020
## 19645 y2020
## 19646 y2020
## 19647 y2020
## 19648 y2020
## 19649 y2020
## 19650 y2020
## 19651 y2020
## 19652 y2020
## 19653 y2020
## 19654 y2020
## 19655 y2020
## 19656 y2020
## 19657 y2020
## 19658 y2020
## 19659 y2020
## 19660 y2020
## 19661 y2020
## 19662 y2020
## 19663 y2020
## 19664 y2020
## 19665 y2020
## 19666 y2020
## 19667 y2020
## 19668 y2020
## 19669 y2020
## 19670 y2020
## 19671 y2020
## 19672 y2020
## 19673 y2020
## 19674 y2020
## 19675 y2020
## 19676 y2020
## 19677 y2020
## 19678 y2020
## 19679 y2020
## 19680 y2020
## 19681 y2020
## 19682 y2020
## 19683 y2020
## 19684 y2020
## 19685 y2020
## 19686 y2020
## 19687 y2020
## 19688 y2020
## 19689 y2020
## 19690 y2020
## 19691 y2020
## 19692 y2020
## 19693 y2020
## 19694 y2020
## 19695 y2020
## 19696 y2020
## 19697 y2020
## 19698 y2020
## 19699 y2020
## 19700 y2020
## 19701 y2020
## 19702 y2020
## 19703 y2020
## 19704 y2020
## 19705 y2020
## 19706 y2020
## 19707 y2020
## 19708 y2020
## 19709 y2020
## 19710 y2020
## 19711 y2020
## 19712 y2020
## 19713 y2020
## 19714 y2020
## 19715 y2020
## 19716 y2020
## 19717 y2020
## 19718 y2020
## 19719 y2020
## 19720 y2020
## 19721 y2020
## 19722 y2020
## 19723 y2020
## 19724 y2020
## 19725 y2020
## 19726 y2020
## 19727 y2020
## 19728 y2020
## 19729 y2020
## 19730 y2020
## 19731 y2020
## 19732 y2020
## 19733 y2020
## 19734 y2020
## 19735 y2020
## 19736 y2020
## 19737 y2020
## 19738 y2020
## 19739 y2020
## 19740 y2020
## 19741 y2020
## 19742 y2020
## 19743 y2020
## 19744 y2020
## 19745 y2020
## 19746 y2020
## 19747 y2020
## 19748 y2020
## 19749 y2020
## 19750 y2020
## 19751 y2020
## 19752 y2020
## 19753 y2020
## 19754 y2020
## 19755 y2020
## 19756 y2020
## 19757 y2020
## 19758 y2020
## 19759 y2020
## 19760 y2020
## 19761 y2020
## 19762 y2020
## 19763 y2020
## 19764 y2020
## 19765 y2020
## 19766 y2020
## 19767 y2020
## 19768 y2020
## 19769 y2020
## 19770 y2020
## 19771 y2020
## 19772 y2020
## 19773 y2020
## 19774 y2020
## 19775 y2020
## 19776 y2020
## 19777 y2020
## 19778 y2020
## 19779 y2020
## 19780 y2020
## 19781 y2020
## 19782 y2020
## 19783 y2020
## 19784 y2020
## 19785 y2020
## 19786 y2020
## 19787 y2020
## 19788 y2020
## 19789 y2020
## 19790 y2020
## 19791 y2020
## 19792 y2020
## 19793 y2020
## 19794 y2020
## 19795 y2020
## 19796 y2020
## 19797 y2020
## 19798 y2020
## 19799 y2020
## 19800 y2020
## 19801 y2020
## 19802 y2020
## 19803 y2020
## 19804 y2020
## 19805 y2020
## 19806 y2020
## 19807 y2020
## 19808 y2020
## 19809 y2020
## 19810 y2020
## 19811 y2020
## 19812 y2020
## 19813 y2020
## 19814 y2020
## 19815 y2020
## 19816 y2020
## 19817 y2020
## 19818 y2020
## 19819 y2020
## 19820 y2020
## 19821 y2020
## 19822 y2020
## 19823 y2020
## 19824 y2020
## 19825 y2020
## 19826 y2020
## 19827 y2020
## 19828 y2020
## 19829 y2020
## 19830 y2020
## 19831 y2020
## 19832 y2020
## 19833 y2020
## 19834 y2020
## 19835 y2020
## 19836 y2020
## 19837 y2020
## 19838 y2020
## 19839 y2020
## 19840 y2020
## 19841 y2020
## 19842 y2020
## 19843 y2020
## 19844 y2020
## 19845 y2020
## 19846 y2020
## 19847 y2020
## 19848 y2020
## 19849 y2020
## 19850 y2020
## 19851 y2020
## 19852 y2020
## 19853 y2020
## 19854 y2020
## 19855 y2020
## 19856 y2020
## 19857 y2020
## 19858 y2020
## 19859 y2020
## 19860 y2020
## 19861 y2020
## 19862 y2020
## 19863 y2020
## 19864 y2020
## 19865 y2020
## 19866 y2020
## 19867 y2020
## 19868 y2020
## 19869 y2020
## 19870 y2020
## 19871 y2020
## 19872 y2020
## 19873 y2020
## 19874 y2020
## 19875 y2020
## 19876 y2020
## 19877 y2020
## 19878 y2020
## 19879 y2020
## 19880 y2020
## 19881 y2020
## 19882 y2020
## 19883 y2020
## 19884 y2020
## 19885 y2020
## 19886 y2020
## 19887 y2020
## 19888 y2020
## 19889 y2020
## 19890 y2020
## 19891 y2020
## 19892 y2020
## 19893 y2020
## 19894 y2020
## 19895 y2020
## 19896 y2020
## 19897 y2020
## 19898 y2020
## 19899 y2020
## 19900 y2020
## 19901 y2020
## 19902 y2020
## 19903 y2020
## 19904 y2020
## 19905 y2020
## 19906 y2020
## 19907 y2020
## 19908 y2020
## 19909 y2020
## 19910 y2020
## 19911 y2020
## 19912 y2020
## 19913 y2020
## 19914 y2020
## 19915 y2020
## 19916 y2020
## 19917 y2020
## 19918 y2020
## 19919 y2020
## 19920 y2020
## 19921 y2020
## 19922 y2020
## 19923 y2020
## 19924 y2020
## 19925 y2020
## 19926 y2020
## 19927 y2020
## 19928 y2020
## 19929 y2020
## 19930 y2020
## 19931 y2020
## 19932 y2020
## 19933 y2020
## 19934 y2020
## 19935 y2020
## 19936 y2020
## 19937 y2020
## 19938 y2020
## 19939 y2020
## 19940 y2020
## 19941 y2020
## 19942 y2020
## 19943 y2020
## 19944 y2020
## 19945 y2020
## 19946 y2020
## 19947 y2020
## 19948 y2020
## 19949 y2020
## 19950 y2020
## 19951 y2020
## 19952 y2020
## 19953 y2020
## 19954 y2020
## 19955 y2020
## 19956 y2020
## 19957 y2020
## 19958 y2020
## 19959 y2020
## 19960 y2020
## 19961 y2020
## 19962 y2020
## 19963 y2020
## 19964 y2020
## 19965 y2020
## 19966 y2020
## 19967 y2020
## 19968 y2020
## 19969 y2020
## 19970 y2020
## 19971 y2020
## 19972 y2020
## 19973 y2020
## 19974 y2020
## 19975 y2020
## 19976 y2020
## 19977 y2020
## 19978 y2020
## 19979 y2020
## 19980 y2020
## 19981 y2020
## 19982 y2020
## 19983 y2020
## 19984 y2020
## 19985 y2020
## 19986 y2020
## 19987 y2020
## 19988 y2020
## 19989 y2020
## 19990 y2020
## 19991 y2020
## 19992 y2020
## 19993 y2020
## 19994 y2020
## 19995 y2020
## 19996 y2020
## 19997 y2020
## 19998 y2020
## 19999 y2020
##                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              word
## 1                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         covid19
## 2                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         covid19
## 3                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #covid19
## 4                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           covid
## 5                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           covid
## 6                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         covid19
## 7                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          people
## 8                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #covid19
## 9                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          people
## 10                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vaccine
## 11                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #covid19
## 12                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             uk
## 13                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             uk
## 14                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vaccination
## 15                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deaths
## 16                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lockdown
## 17                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pandemic
## 18                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lockdown
## 19                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     government
## 20                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       petition
## 21                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            due
## 22                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          staff
## 23                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           time
## 24                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        support
## 25                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          covid
## 26                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           it�s
## 27                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         school
## 28                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           news
## 29                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         health
## 30                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           time
## 31                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     government
## 32                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deaths
## 33                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       petition
## 34                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            day
## 35                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #coronavirus
## 36                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            due
## 37                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            nhs
## 38                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         social
## 39                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crisis
## 40                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         health
## 41                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            day
## 42                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    coronavirus
## 43                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pandemic
## 44                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           safe
## 45                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           home
## 46                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @borisjohnson
## 47                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          death
## 48                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          world
## 49                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         impact
## 50                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           it�s
## 51                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           care
## 52                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           week
## 53                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            nhs
## 54                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prioritise
## 55                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         people
## 56                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lives
## 57                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        support
## 58                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           test
## 59                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       response
## 60                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       positive
## 61                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bame
## 62                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          virus
## 63                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         public
## 64                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          daily
## 65                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        england
## 66                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vaccines
## 67                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          don�t
## 68                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           stay
## 69                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           risk
## 70                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           home
## 71                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           news
## 72                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hospital
## 73                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         london
## 74                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           test
## 75                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          virus
## 76                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       teachers
## 77                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     distancing
## 78                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hope
## 79                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         months
## 80                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           june
## 81                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          staff
## 82                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           safe
## 83                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    coronavirus
## 84                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        testing
## 85                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         london
## 86                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        country
## 87                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           care
## 88                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           post
## 89                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sign
## 90                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spread
## 91                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       positive
## 92                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           died
## 93                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      childcare
## 94                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       patients
## 95                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          black
## 96                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          weeks
## 97                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           days
## 98                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vaccine
## 99                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           days
## 100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      children
## 101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          read
## 102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         world
## 103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         death
## 104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       schools
## 105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           i�m
## 106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @borisjohnson
## 107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        public
## 108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          read
## 109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  restrictions
## 110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          risk
## 111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        police
## 112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        report
## 113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          life
## 114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rules
## 115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     community
## 116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        taking
## 117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          team
## 118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          week
## 119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      protests
## 120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         don�t
## 121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        update
## 122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boris
## 123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brexit
## 124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       january
## 125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #lockdown
## 126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         local
## 127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       protest
## 128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          team
## 129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      positive
## 130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hope
## 131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       johnson
## 132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      patients
## 133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        update
## 134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      national
## 135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spread
## 136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       economy
## 137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stay
## 138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wave
## 139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        police
## 140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          live
## 141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         worst
## 142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #lockdown
## 143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boris
## 144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      received
## 145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sign
## 146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       service
## 147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       workers
## 148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        change
## 149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hospital
## 150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tested
## 151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     community
## 152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           i�m
## 153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      scotland
## 154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stop
## 155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bbc
## 156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  vaccinations
## 157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         can�t
## 158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          join
## 159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        school
## 160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       testing
## 161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          news
## 162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            uk
## 163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            de
## 164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #coronavirus
## 165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tested
## 166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      business
## 167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        matter
## 168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  restrictions
## 169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   governments
## 170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      services
## 171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        family
## 172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recovery
## 173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          toll
## 174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dose
## 175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         major
## 176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        months
## 177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tests
## 178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          test
## 179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         money
## 180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         proud
## 181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @updayuk
## 182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           day
## 183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       england
## 184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          free
## 185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         homes
## 186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rules
## 187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          died
## 188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        family
## 189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stop
## 190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hard
## 191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           job
## 192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        racism
## 193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     situation
## 194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amazing
## 195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         daily
## 196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grant
## 197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      research
## 198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         happy
## 199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         local
## 200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pandemic
## 201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       current
## 202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           die
## 203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          i�ve
## 204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       country
## 205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cummings
## 206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forward
## 207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        future
## 208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lot
## 209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         total
## 210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          life
## 211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      scotland
## 212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         total
## 213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       article
## 214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          deal
## 215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          feel
## 216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        global
## 217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      handling
## 218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        signed
## 219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         times
## 220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #covid
## 221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        centre
## 222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          data
## 223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       records
## 224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nhs
## 225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      families
## 226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          food
## 227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          link
## 228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          paid
## 229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      symptoms
## 230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        health
## 231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ukchange
## 232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      affected
## 233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          left
## 234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thousands
## 235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @piersmorgan
## 236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        coming
## 237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     including
## 238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         march
## 239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ready
## 240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vulnerable
## 241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       omicron
## 242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        advice
## 243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fight
## 244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      guidance
## 245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        issues
## 246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pm
## 247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         start
## 248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #nhs
## 249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     programme
## 250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       protect
## 251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      symptoms
## 252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        united
## 253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           due
## 254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tests
## 255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         blame
## 256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    businesses
## 257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            la
## 258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        online
## 259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       schools
## 260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         share
## 261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covid19uk
## 262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          feel
## 263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   information
## 264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jab
## 265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lost
## 266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      negative
## 267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    government
## 268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          time
## 269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          call
## 270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      economic
## 271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            en
## 272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       figures
## 273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       friends
## 274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          govt
## 275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         masks
## 276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    protesting
## 277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        you�re
## 278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      declared
## 279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        follow
## 280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hospitals
## 281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        social
## 282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       variant
## 283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     confirmed
## 284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     countries
## 285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         media
## 286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      negative
## 287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         close
## 288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      incident
## 289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lives
## 290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          real
## 291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       allowed
## 292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   communities
## 293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      continue
## 294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dominic
## 295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       johnson
## 296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         makes
## 297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       million
## 298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       morning
## 299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rate
## 300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        travel
## 301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        whilst
## 302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crisis
## 303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      guidance
## 304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          i�ve
## 305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      response
## 306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wales
## 307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          days
## 308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          it�s
## 309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @matthancock
## 310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ago
## 311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      children
## 312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hit
## 313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hours
## 314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     infection
## 315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   information
## 316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      services
## 317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    understand
## 318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ukchange
## 319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          call
## 320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       contact
## 321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          free
## 322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        online
## 323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        taking
## 324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         times
## 325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vaccinated
## 326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vaccinated
## 327                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #blacklivesmatter
## 328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         house
## 329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lost
## 330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    parliament
## 331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      strategy
## 332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       workers
## 333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        impact
## 334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     infection
## 335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       million
## 336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         weeks
## 337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vaccines
## 338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bit
## 339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       inquiry
## 340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      outbreak
## 341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       protect
## 342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        scheme
## 343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         study
## 344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        that�s
## 345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        united
## 346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wales
## 347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     yesterday
## 348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      continue
## 349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           flu
## 350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          link
## 351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rollout
## 352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         start
## 353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   vaccination
## 354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          data
## 355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          love
## 356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          plan
## 357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ppe
## 358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tests
## 359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         watch
## 360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         worse
## 361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fight
## 362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hard
## 363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       service
## 364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         visit
## 365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boris
## 366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       doesn�t
## 367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    leadership
## 368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mass
## 369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        person
## 370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          race
## 371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scientists
## 372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       webinar
## 373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amazing
## 374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kingdom
## 375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          post
## 376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        safety
## 377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pcr
## 378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          week
## 379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        demand
## 380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        follow
## 381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         happy
## 382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hiv
## 383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         light
## 384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      measures
## 385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wait
## 386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            de
## 387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         masks
## 388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      measures
## 389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rapid
## 390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     situation
## 391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         worse
## 392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       testing
## 393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        closed
## 394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          club
## 395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       council
## 396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         found
## 397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pay
## 398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        return
## 399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    supporting
## 400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        system
## 401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          told
## 402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       weekend
## 403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #vaccine
## 404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brexit
## 405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          live
## 406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mask
## 407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       website
## 408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      covid19�
## 409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doctor
## 410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ensure
## 411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fantastic
## 412                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9ityeqvi4f
## 413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kingdom
## 414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       medical
## 415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    protesters
## 416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        safety
## 417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vaccine
## 418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vulnerable
## 419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       control
## 420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     countries
## 421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        person
## 422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rate
## 423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          toll
## 424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         virus
## 425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @updayuk
## 426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #stayalert
## 427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         agree
## 428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      antibody
## 429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     benefited
## 430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         catch
## 431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        centre
## 432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         check
## 433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         close
## 434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        europe
## 435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    experience
## 436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       helping
## 437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        market
## 438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        normal
## 439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        oneoff
## 440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      question
## 441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        result
## 442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        survey
## 443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      thinking
## 444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      violence
## 445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       website
## 446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @matthancock
## 447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bit
## 448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         china
## 449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sky
## 450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  transmission
## 451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wait
## 452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wrong
## 453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #omicron
## 454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         women
## 455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #corona
## 456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #staysafe
## 457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        access
## 458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bbc
## 459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           blm
## 460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hear
## 461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         isn�t
## 462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        monday
## 463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       provide
## 464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       started
## 465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         we�re
## 466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       zealand
## 467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        advice
## 468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         check
## 469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     christmas
## 470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       current
## 471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ensure
## 472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       friends
## 473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      increase
## 474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          list
## 475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lot
## 476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      minister
## 477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pfizer
## 478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rates
## 479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       receive
## 480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hospital
## 481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        public
## 482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #borisjohnson
## 483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chance
## 484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          city
## 485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      evidence
## 486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         leave
## 487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          park
## 488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         plans
## 489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        racist
## 490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rates
## 491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       related
## 492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       results
## 493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         round
## 494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       science
## 495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spike
## 496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           top
## 497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     treatment
## 498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         we�ve
## 499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bpsmithuk
## 500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  announcement
## 501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           app
## 502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      business
## 503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     confirmed
## 504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       figures
## 505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         march
## 506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mental
## 507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nurses
## 508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        report
## 509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wear
## 510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        deaths
## 511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          home
## 512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    absolutely
## 513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       changed
## 514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     condition
## 515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       contact
## 516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fucking
## 517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mental
## 518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          real
## 519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        season
## 520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     spreading
## 521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      training
## 522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         doses
## 523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          food
## 524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     frontline
## 525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hands
## 526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hear
## 527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           job
## 528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     overwhelm
## 529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reported
## 530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       results
## 531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           set
## 532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rate
## 533                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #socialdistancing
## 534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        action
## 535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        answer
## 536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     brilliant
## 537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        called
## 538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        damage
## 539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   freelancers
## 540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      happened
## 541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          head
## 542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hospitals
## 543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         issue
## 544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          paye
## 545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reopening
## 546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sad
## 547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sector
## 548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shop
## 549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          view
## 550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wear
## 551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         won�t
## 552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wrong
## 553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �no
## 554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ambulance
## 555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         can�t
## 556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      evidence
## 557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fire
## 558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    guidelines
## 559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hours
## 560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           key
## 561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          play
## 562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      priority
## 563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      question
## 564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      threaten
## 565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           top
## 566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    university
## 567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         watch
## 568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @borisjohnson
## 569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #covid
## 570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         daily
## 571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @38degrees
## 572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @skynews
## 573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #covid
## 574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covid19uk
## 575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           2nd
## 576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ahead
## 577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bad
## 578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       calling
## 579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    completely
## 580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       control
## 581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         event
## 582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     excellent
## 583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     financial
## 584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          july
## 585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lovely
## 586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          move
## 587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       putting
## 588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      remember
## 589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reopen
## 590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        resign
## 591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          role
## 592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shame
## 593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tax
## 594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tory
## 595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         video
## 596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         visit
## 597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #stayhome
## 598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #staysafe
## 599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        access
## 600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      breaking
## 601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          club
## 602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           die
## 603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dying
## 604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      families
## 605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forward
## 606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          govt
## 607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        issues
## 608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        period
## 609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         share
## 610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         south
## 611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     statement
## 612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      students
## 613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tomorrow
## 614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trump
## 615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    understand
## 616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         we�re
## 617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amazing
## 618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       booster
## 619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      patients
## 620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         staff
## 621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       variant
## 622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         weeks
## 623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rishisunak
## 624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f602>
## 625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       british
## 626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           car
## 627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       company
## 628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       digital
## 629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        donate
## 630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fuck
## 631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hands
## 632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        living
## 633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         night
## 634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          play
## 635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         story
## 636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          talk
## 637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           1st
## 638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       allowed
## 639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bad
## 640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        coming
## 641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      critical
## 642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         found
## 643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          love
## 644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         media
## 645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        monday
## 646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        result
## 647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          true
## 648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      children
## 649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   coronavirus
## 650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         death
## 651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lateral
## 652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        months
## 653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @keirstarmer
## 654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @youtube
## 655                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #covid<u+30fc>19
## 656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       disease
## 657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       effects
## 658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         email
## 659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     emergency
## 660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       funding
## 661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    guidelines
## 662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          huge
## 663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   independent
## 664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      industry
## 665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ireland
## 666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       keeping
## 667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           key
## 668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         let�s
## 669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         level
## 670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          poor
## 671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    population
## 672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         press
## 673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reason
## 674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recourse
## 675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   responsible
## 676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shown
## 677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stupid
## 678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tonight
## 679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       article
## 680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aware
## 681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        market
## 682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       morning
## 683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      research
## 684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     spreading
## 685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         teams
## 686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       waiting
## 687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     yesterday
## 688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          life
## 689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  restrictions
## 690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          safe
## 691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         world
## 692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @bbcnews
## 693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          book
## 694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    challenges
## 695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        couple
## 696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     difficult
## 697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      equality
## 698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hancock
## 699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       haven�t
## 700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        idiots
## 701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          late
## 702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mask
## 703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      minister
## 704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         month
## 705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mp
## 706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      national
## 707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         north
## 708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       patient
## 709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     published
## 710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         scrap
## 711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        suffer
## 712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tomorrow
## 713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        what�s
## 714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       british
## 715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cancelled
## 716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       council
## 717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      delivery
## 718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     essential
## 719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hancock
## 720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         heart
## 721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          huge
## 722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jan
## 723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         night
## 724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          plan
## 725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         proud
## 726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          save
## 727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         study
## 728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        winter
## 729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        you�re
## 730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dose
## 731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       johnson
## 732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       million
## 733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      symptoms
## 734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #nrpf
## 735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         apply
## 736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bring
## 737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      complete
## 738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decision
## 739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       details
## 740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      distance
## 741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dying
## 742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     education
## 743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            el
## 744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         extra
## 745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fighting
## 746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        funds�
## 747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       healthy
## 748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         heart
## 749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       message
## 750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       missing
## 751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        moment
## 752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nation
## 753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         piece
## 754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         quits
## 755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        record
## 756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refusal
## 757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     responses
## 758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sadly
## 759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      students
## 760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tb
## 761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       there�s
## 762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          visa
## 763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    volunteers
## 764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          west
## 765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         white
## 766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   appointment
## 767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      approach
## 768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          book
## 769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        closed
## 770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         delay
## 771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       details
## 772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    distancing
## 773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     emergency
## 774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          join
## 775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         let�s
## 776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        oxford
## 777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       players
## 778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       provide
## 779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recorded
## 780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      remember
## 781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rest
## 782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           run
## 783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       started
## 784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        strain
## 785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tier
## 786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        travel
## 787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          west
## 788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #nhs
## 789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       support
## 790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tested
## 791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #art
## 792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           air
## 793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         based
## 794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bubble
## 795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       climate
## 796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dead
## 797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      domestic
## 798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     essential
## 799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      football
## 800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        forget
## 801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fun
## 802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fund
## 803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    gatherings
## 804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          half
## 805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hand
## 806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        happen
## 807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hold
## 808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       holiday
## 809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          info
## 810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     isolation
## 811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         major
## 812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         means
## 813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        period
## 814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recorded
## 815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rest
## 816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        single
## 817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         south
## 818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stand
## 819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        surely
## 820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       talking
## 821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          term
## 822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         touch
## 823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trump
## 824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       victims
## 825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       virtual
## 826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          walk
## 827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wellbeing
## 828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #uk
## 829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cancer
## 830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        caught
## 831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          city
## 832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    colleagues
## 833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     education
## 834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       effects
## 835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       feeling
## 836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       finally
## 837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          game
## 838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       helping
## 839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hold
## 840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          info
## 841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kids
## 842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          late
## 843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        league
## 844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         level
## 845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        living
## 846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       medical
## 847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         money
## 848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          page
## 849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          paid
## 850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    population
## 851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         queen
## 852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    responders
## 853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        return
## 854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rise
## 855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shut
## 856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    supporting
## 857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        surely
## 858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        system
## 859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        that�s
## 860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       america
## 861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         avoid
## 862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         break
## 863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      breaking
## 864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brings
## 865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     challenge
## 866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         china
## 867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    difference
## 868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        events
## 869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       finally
## 870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         front
## 871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gym
## 872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          he�s
## 873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           i�d
## 874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        listen
## 875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lots
## 876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         loved
## 877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       massive
## 878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          meet
## 879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      northern
## 880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   opportunity
## 881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        policy
## 882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     programme
## 883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     questions
## 884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sharing
## 885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shit
## 886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stopped
## 887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       streets
## 888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       warning
## 889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wearing
## 890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         worth
## 891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @piersmorgan
## 892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #covidvaccine
## 893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+2705>
## 894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         april
## 895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        change
## 896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cold
## 897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          date
## 898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        didn�t
## 899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       doesn�t
## 900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          east
## 901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        effect
## 902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            en
## 903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    experience
## 904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fake
## 905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      football
## 906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    healthcare
## 907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         house
## 908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          khan
## 909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        moment
## 910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prime
## 911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prince
## 912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reports
## 913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       running
## 914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sadiq
## 915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sense
## 916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        single
## 917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          told
## 918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trust
## 919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �the
## 920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          flow
## 921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     infection
## 922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       january
## 923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rates
## 924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        school
## 925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         study
## 926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mailonline
## 927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #coronavirusuk
## 928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       account
## 929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cabinet
## 930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cancelled
## 931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     completed
## 932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     customers
## 933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          date
## 934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        didn�t
## 935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    discussing
## 936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       earlier
## 937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        effect
## 938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       experts
## 939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       feeling
## 940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        friend
## 941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           god
## 942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         human
## 943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      infected
## 944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kids
## 945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         photo
## 946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prevent
## 947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       running
## 948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         short
## 949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       special
## 950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       waiting
## 951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      watching
## 952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �the
## 953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @govuk
## 954                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @nicolasturgeon
## 955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #lockdown3
## 956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ahead
## 957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     announced
## 958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         based
## 959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      capacity
## 960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       centres
## 961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      expected
## 962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fantastic
## 963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         isn�t
## 964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         means
## 965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        normal
## 966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          past
## 967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         plans
## 968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pm
## 969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     political
## 970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       putting
## 971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reason
## 972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sadly
## 973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       student
## 974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sunday
## 975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tonight
## 976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tweet
## 977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    volunteers
## 978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wearing
## 979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          east
## 980                                                                                                                                                                                                                                                                                                                                                                                                                                                                             oxfordastrazeneca
## 981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         start
## 982                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @nicolasturgeon
## 983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           add
## 984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      approach
## 985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cancer
## 986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chat
## 987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      contract
## 988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        create
## 989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         drive
## 990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ethnic
## 991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          guys
## 992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        here�s
## 993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          idea
## 994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        killed
## 995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          matt
## 996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mind
## 997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      official
## 998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         power
## 999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         raise
## 1000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     received
## 1001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          run
## 1002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         save
## 1003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       summer
## 1004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    transport
## 1005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trust
## 1006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        we�ll
## 1007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        women
## 1008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bbcnews
## 1009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f914>
## 1010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          act
## 1011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        agree
## 1012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 asymptomatic
## 1013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     briefing
## 1014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       called
## 1015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deliver
## 1016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    difficult
## 1017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       doctor
## 1018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      drivers
## 1019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    effective
## 1020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       giving
## 1021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  governments
## 1022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lack
## 1023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         left
## 1024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    liverpool
## 1025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lockdowns
## 1026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mass
## 1027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nation
## 1028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        north
## 1029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nurse
## 1030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     outbreak
## 1031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       passed
## 1032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prevent
## 1033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       record
## 1034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      regular
## 1035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sick
## 1036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        worth
## 1037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bad
## 1038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        masks
## 1039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #nhs
## 1040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      actions
## 1041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         blog
## 1042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     campaign
## 1043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       caught
## 1044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   colleagues
## 1045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    companies
## 1046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conditions
## 1047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      created
## 1048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       defend
## 1049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     delivery
## 1050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  environment
## 1051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       expect
## 1052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       failed
## 1053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          flu
## 1054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       friday
## 1055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       garden
## 1056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    gathering
## 1057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    happening
## 1058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ignore
## 1059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lack
## 1060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lessons
## 1061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         line
## 1062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     majority
## 1063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      matters
## 1064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ni
## 1065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nice
## 1066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                organisations
## 1067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        party
## 1068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   protestors
## 1069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quickly
## 1070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recently
## 1071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    residents
## 1072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      respect
## 1073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       review
## 1074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rule
## 1075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       safely
## 1076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         send
## 1077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      society
## 1078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spent
## 1079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     starting
## 1080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       statue
## 1081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      statues
## 1082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   struggling
## 1083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    suffering
## 1084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        teams
## 1085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tories
## 1086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        truth
## 1087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        words
## 1088                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @10downingstreet
## 1089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          2nd
## 1090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       attend
## 1091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bus
## 1092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chance
## 1093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     complete
## 1094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cost
## 1095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     decision
## 1096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fit
## 1097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       friend
## 1098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   infections
## 1099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ireland
## 1100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           la
## 1101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      meeting
## 1102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mum
## 1103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     northern
## 1104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        offer
## 1105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       philip
## 1106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    questions
## 1107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    receiving
## 1108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      related
## 1109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       season
## 1110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         site
## 1111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      staying
## 1112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ward
## 1113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        won�t
## 1114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        words
## 1115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         care
## 1116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         data
## 1117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           de
## 1118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       family
## 1119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hours
## 1120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          i�m
## 1121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     minister
## 1122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         risk
## 1123                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #dailybriefings
## 1124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #ideas
## 1125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #thoughts
## 1126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f914>
## 1127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+2705>
## 1128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         15th
## 1129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      britain
## 1130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         busy
## 1131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      charity
## 1132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        class
## 1133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clubs
## 1134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dealing
## 1135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  development
## 1136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           eu
## 1137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       george
## 1138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gov
## 1139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    household
## 1140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  individuals
## 1141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        italy
## 1142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        learn
## 1143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       levels
## 1144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lies
## 1145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lock
## 1146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          low
## 1147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nursing
## 1148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       office
## 1149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ongoing
## 1150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         page
## 1151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       paying
## 1152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      private
## 1153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   quarantine
## 1154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recent
## 1155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recover
## 1156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       remain
## 1157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reported
## 1158                                                                                                                                                                                                                                                                                                                                                                                                                                                                               responsibility
## 1159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    returning
## 1160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        seiss
## 1161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          set
## 1162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          son
## 1163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        space
## 1164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        takes
## 1165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     teachers
## 1166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         town
## 1167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trade
## 1168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trial
## 1169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      twitter
## 1170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wake
## 1171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ward
## 1172                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #covidvaccination
## 1173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      britain
## 1174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       caused
## 1175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   completely
## 1176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conditions
## 1177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dangerous
## 1178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      doctors
## 1179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           el
## 1180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           eu
## 1181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        front
## 1182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       future
## 1183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         he�s
## 1184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hit
## 1185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         idea
## 1186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    including
## 1187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    increased
## 1188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                international
## 1189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      keeping
## 1190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leaders
## 1191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       listen
## 1192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mind
## 1193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mp
## 1194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         note
## 1195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       passes
## 1196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ppe
## 1197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  regulations
## 1198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       remain
## 1199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      require
## 1200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   scientists
## 1201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   struggling
## 1202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       summer
## 1203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      totally
## 1204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    transport
## 1205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      twitter
## 1206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         view
## 1207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      viruses
## 1208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wave
## 1209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       whilst
## 1210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    wonderful
## 1211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        worst
## 1212                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #forthemany<u+0001f308>
## 1213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #trending
## 1214                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #twitter<u+2611><u+fe0f>
## 1215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        don�t
## 1216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       honour
## 1217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      imagine
## 1218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      receive
## 1219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sky
## 1220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     variants
## 1221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jamesloyart
## 1222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #alone
## 1223                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #artinlockdown
## 1224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #bame
## 1225                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #contemporaryart
## 1226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #open
## 1227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #post
## 1228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #text
## 1229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     absolute
## 1230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          act
## 1231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    alongside
## 1232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blood
## 1233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     catching
## 1234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        child
## 1235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    colleague
## 1236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cost
## 1237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     criminal
## 1238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cure
## 1239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   delivering
## 1240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     election
## 1241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        enjoy
## 1242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fall
## 1243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fans
## 1244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fear
## 1245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        floyd
## 1246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         form
## 1247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       giving
## 1248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         glad
## 1249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       helped
## 1250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hey
## 1251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      history
## 1252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     immunity
## 1253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      include
## 1254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     included
## 1255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     increase
## 1256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                international
## 1257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jobs
## 1258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kits
## 1259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lead
## 1260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leaders
## 1261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       letter
## 1262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       linked
## 1263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      managed
## 1264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      meeting
## 1265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        miles
## 1266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     millions
## 1267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       missed
## 1268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nurse
## 1269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parents
## 1270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         past
## 1271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     practice
## 1272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    providing
## 1273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      realise
## 1274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reduce
## 1275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rights
## 1276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        risks
## 1277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     saturday
## 1278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   scientific
## 1279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     scottish
## 1280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      session
## 1281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shocking
## 1282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sky
## 1283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     solution
## 1284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sort
## 1285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           st
## 1286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stuff
## 1287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         true
## 1288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                understanding
## 1289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        views
## 1290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vote
## 1291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       you�ve
## 1292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @juliahb1
## 1293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @skynews
## 1294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f44d>
## 1295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f489>
## 1296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     affected
## 1297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          age
## 1298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         amid
## 1299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   antibodies
## 1300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      antigen
## 1301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blood
## 1302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bring
## 1303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   businesses
## 1304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     catching
## 1305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cure
## 1306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dad
## 1307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     daughter
## 1308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deal
## 1309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     december
## 1310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      disease
## 1311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doubt
## 1312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dr
## 1313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        email
## 1314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       europe
## 1315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    financial
## 1316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       friday
## 1317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fuck
## 1318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       happen
## 1319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hiv
## 1320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hoax
## 1321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hour
## 1322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    isolation
## 1323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     learning
## 1324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      message
## 1325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      minutes
## 1326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     offering
## 1327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       policy
## 1328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    postponed
## 1329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        press
## 1330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pretty
## 1331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      primary
## 1332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recently
## 1333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    residents
## 1334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       safely
## 1335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     saturday
## 1336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         scam
## 1337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     scottish
## 1338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         send
## 1339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sites
## 1340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        space
## 1341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       street
## 1342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tory
## 1343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vaccinate
## 1344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        warns
## 1345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wash
## 1346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #lockdown
## 1347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bbc
## 1348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         died
## 1349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     immunity
## 1350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    interview
## 1351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jab
## 1352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jan
## 1353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     lockdown
## 1354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   protection
## 1355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       united
## 1356                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @conservatives
## 1357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @sadiqkhan
## 1358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @scotgov
## 1359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #drawings
## 1360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #sketch
## 1361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #space
## 1362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f447>
## 1363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f64f>
## 1364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         amid
## 1365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   apparently
## 1366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arts
## 1367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    behaviour
## 1368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brought
## 1369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       caused
## 1370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  certificate
## 1371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                circumstances
## 1372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       colour
## 1373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cut
## 1374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      discuss
## 1375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      doctors
## 1376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         east
## 1377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         easy
## 1378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      evening
## 1379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       excuse
## 1380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       father
## 1381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fine
## 1382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        focus
## 1383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         held
## 1384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   incredible
## 1385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   infections
## 1386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     involved
## 1387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         i�ll
## 1388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kill
## 1389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leading
## 1390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         list
## 1391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    listening
## 1392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mortality
## 1393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     observer
## 1394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     physical
## 1395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     planning
## 1396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    political
## 1397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pre
## 1398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pretty
## 1399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      process
## 1400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      project
## 1401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       relief
## 1402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reports
## 1403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        riots
## 1404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rises
## 1405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  selfisolate
## 1406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       series
## 1407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sharma
## 1408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        speak
## 1409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      they�re
## 1410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         till
## 1411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      today�s
## 1412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tuesday
## 1413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tweet
## 1414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vital
## 1415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @keirstarmer
## 1416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @youtube
## 1417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #lockdown2021
## 1418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ago
## 1419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        avoid
## 1420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        begin
## 1421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         body
## 1422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        calls
## 1423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     compared
## 1424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conspiracy
## 1425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        david
## 1426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      earlier
## 1427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       expect
## 1428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    extremely
## 1429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fucking
## 1430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         head
## 1431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     infected
## 1432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    introduce
## 1433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        issue
## 1434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         line
## 1435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         move
## 1436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       notice
## 1437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      offered
## 1438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       office
## 1439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     official
## 1440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      patient
## 1441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pay
## 1442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        phone
## 1443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    president
## 1444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    published
## 1445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recovery
## 1446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reduce
## 1447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refund
## 1448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   registered
## 1449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rt
## 1450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rule
## 1451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shops
## 1452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      special
## 1453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thread
## 1454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tough
## 1455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         town
## 1456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        track
## 1457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    treatment
## 1458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      updated
## 1459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      updates
## 1460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  vaccinating
## 1461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        video
## 1462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        we�ve
## 1463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ago
## 1464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    community
## 1465                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/osmqsfe7ra
## 1466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    isolation
## 1467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mask
## 1468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      medical
## 1469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         play
## 1470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rules
## 1471                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @profkarolsikora
## 1472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #blm
## 1473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #paper
## 1474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ppe
## 1475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f44f>
## 1476                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+2764><u+fe0f>
## 1477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     admitted
## 1478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    afternoon
## 1479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          age
## 1480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aim
## 1481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  appointment
## 1482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        asian
## 1483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attention
## 1484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       booked
## 1485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      causing
## 1486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cleaning
## 1487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      clients
## 1488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       clinic
## 1489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     clinical
## 1490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    concerned
## 1491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conspiracy
## 1492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     couldn�t
## 1493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dangerous
## 1494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       debate
## 1495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          del
## 1496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   discussion
## 1497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         door
## 1498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dr
## 1499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    extremely
## 1500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       facing
## 1501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     finished
## 1502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         game
## 1503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 government�s
## 1504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        green
## 1505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      handled
## 1506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   healthcare
## 1507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        heard
## 1508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     humanity
## 1509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hundreds
## 1510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      illegal
## 1511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       immune
## 1512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 incompetence
## 1513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  incompetent
## 1514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    increased
## 1515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      killing
## 1516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       labour
## 1517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         loss
## 1518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   management
## 1519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    maternity
## 1520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mention
## 1521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       moving
## 1522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        music
## 1523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      officer
## 1524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        paper
## 1525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pass
## 1526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         peak
## 1527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     personal
## 1528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        piers
## 1529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      players
## 1530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          por
## 1531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  precautions
## 1532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    president
## 1533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     relevant
## 1534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     required
## 1535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     scrapped
## 1536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shared
## 1537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shops
## 1538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sport
## 1539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       street
## 1540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      totally
## 1541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   transition
## 1542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        treat
## 1543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tv
## 1544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                unprecedented
## 1545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      updates
## 1546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @nhsuk
## 1547                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #coronavirusuk
## 1548                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #covid19vaccine
## 1549                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #cypruscoronavirus
## 1550                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #nationallockdown
## 1551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #pandemic
## 1552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       action
## 1553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     analysis
## 1554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     approved
## 1555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       battle
## 1556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blame
## 1557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       booked
## 1558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        break
## 1559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     campaign
## 1560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        catch
## 1561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      concern
## 1562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     concerns
## 1563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contracted
## 1564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      correct
## 1565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    customers
## 1566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dead
## 1567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dies
## 1568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   difference
## 1569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        drive
## 1570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      evening
## 1571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         form
## 1572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         glad
## 1573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       global
## 1574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         guys
## 1575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hand
## 1576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      healthy
## 1577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       immune
## 1578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      include
## 1579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          law
## 1580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lots
## 1581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        makes
## 1582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mortality
## 1583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      opinion
## 1584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   pharmacies
## 1585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      premier
## 1586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pressure
## 1587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reality
## 1588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ridiculous
## 1589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         roll
## 1590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sir
## 1591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          son
## 1592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   statistics
## 1593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      there�s
## 1594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thinking
## 1595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bbcnews
## 1596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #borisjohnson
## 1597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         call
## 1598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      central
## 1599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      country
## 1600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          flu
## 1601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       france
## 1602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     guidance
## 1603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   infections
## 1604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          job
## 1605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       london
## 1606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pay
## 1607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         read
## 1608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       social
## 1609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stay
## 1610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         team
## 1611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    treatment
## 1612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 unvaccinated
## 1613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       update
## 1614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #black
## 1615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #mentalhealth
## 1616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #pandemic
## 1617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #uk
## 1618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #words
## 1619                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f1ec><u+0001f1e7>
## 1620                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f937><u+200d><u+2642><u+fe0f>
## 1621                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+27a1><u+fe0f>
## 1622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+2b50>
## 1623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          1st
## 1624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     activity
## 1625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   additional
## 1626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        angry
## 1627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          app
## 1628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          art
## 1629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   assessment
## 1630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     attended
## 1631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attending
## 1632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        awful
## 1633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        basic
## 1634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beaches
## 1635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    beautiful
## 1636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   birmingham
## 1637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brazil
## 1638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     briefing
## 1639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    charities
## 1640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     citizens
## 1641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     compared
## 1642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conference
## 1643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    continues
## 1644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     creative
## 1645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     declared
## 1646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deliver
## 1647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disgusting
## 1648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        drops
## 1649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ealing
## 1650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    effective
## 1651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      elderly
## 1652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        enter
## 1653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     everyday
## 1654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  experiences
## 1655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fair
## 1656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fake
## 1657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       figure
## 1658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fire
## 1659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        folks
## 1660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     furlough
## 1661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        guess
## 1662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      imposed
## 1663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        india
## 1664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          law
## 1665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       league
## 1666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     learning
## 1667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lied
## 1668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      limited
## 1669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lower
## 1670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     offering
## 1671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     officers
## 1672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pages
## 1673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  politicians
## 1674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pressure
## 1675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prime
## 1676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        range
## 1677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reality
## 1678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refund
## 1679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      release
## 1680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rioting
## 1681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rise
## 1682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          row
## 1683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sat
## 1684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shut
## 1685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    stockpile
## 1686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        store
## 1687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       strong
## 1688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      surgery
## 1689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thread
## 1690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thursday
## 1691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       todays
## 1692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trace
## 1693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        track
## 1694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 transmission
## 1695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          uks
## 1696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   university
## 1697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  unnecessary
## 1698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          usa
## 1699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        usual
## 1700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        voted
## 1701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wasn�t
## 1702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       window
## 1703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     �covid19
## 1704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #stayathome
## 1705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f499>
## 1706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f637>
## 1707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     absolute
## 1708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      account
## 1709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alert
## 1710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        apply
## 1711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   challenges
## 1712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chief
## 1713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     citizens
## 1714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      company
## 1715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  contracting
## 1716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dear
## 1717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deniers
## 1718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     distance
## 1719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      economy
## 1720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        empty
## 1721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      english
## 1722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      experts
## 1723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fa
## 1724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fear
## 1725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     grateful
## 1726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     handling
## 1727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       helped
## 1728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hub
## 1729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   incredibly
## 1730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  individuals
## 1731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     involved
## 1732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jabs
## 1733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       leader
## 1734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leave
## 1735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       levels
## 1736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    listening
## 1737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lovely
## 1738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          low
## 1739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   manchester
## 1740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mayor
## 1741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     midwives
## 1742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nice
## 1743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parents
## 1744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     personal
## 1745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       plasma
## 1746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        queue
## 1747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ready
## 1748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      respect
## 1749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         role
## 1750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sad
## 1751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sarscov2
## 1752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        scale
## 1753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       severe
## 1754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shop
## 1755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shot
## 1756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  significant
## 1757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       source
## 1758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stopped
## 1759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     strategy
## 1760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stupid
## 1761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         text
## 1762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        touch
## 1763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tougher
## 1764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wife
## 1765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      worried
## 1766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sajidjavid
## 1767                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @washingtonpost
## 1768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #coronavirus
## 1769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       follow
## 1770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         free
## 1771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    hospitals
## 1772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jabs
## 1773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       result
## 1774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spread
## 1775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        times
## 1776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         west
## 1777                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @10downingstreet
## 1778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @lbc
## 1779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #anaesthesia
## 1780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #anesthesia
## 1781                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #anesthesiology
## 1782                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #frontlineheroes
## 1783                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #inthistogether
## 1784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #london
## 1785                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f64f><u+0001f3fb>
## 1786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f9a0>
## 1787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          4th
## 1788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       actual
## 1789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        adapt
## 1790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      address
## 1791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        admit
## 1792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aid
## 1793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anxiety
## 1794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       attack
## 1795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       battle
## 1796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        beach
## 1797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         beat
## 1798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bigger
## 1799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     building
## 1800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bunch
## 1801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       carers
## 1802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    celebrate
## 1803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        click
## 1804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     comments
## 1805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      concern
## 1806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cover
## 1807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       credit
## 1808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  devastating
## 1809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    developed
## 1810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     devolved
## 1811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dog
## 1812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       double
## 1813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       entire
## 1814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           es
## 1815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      explain
## 1816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     facebook
## 1817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fault
## 1818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      helpful
## 1819                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hydroxychloroquine
## 1820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      imagine
## 1821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      insight
## 1822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      joining
## 1823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      justice
## 1824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       leader
## 1825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        legal
## 1826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          los
## 1827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         main
## 1828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          met
## 1829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       middle
## 1830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   minorities
## 1831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     minority
## 1832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mums
## 1833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         oecd
## 1834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        offer
## 1835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                opportunities
## 1836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      partner
## 1837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   personally
## 1838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  perspective
## 1839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        phase
## 1840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      picture
## 1841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pleased
## 1842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   protecting
## 1843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   protection
## 1844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recovered
## 1845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     register
## 1846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     revealed
## 1847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        royal
## 1848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        scary
## 1849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shopping
## 1850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shouldn�t
## 1851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sick
## 1852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sports
## 1853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      student
## 1854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    supported
## 1855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   supporters
## 1856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       threat
## 1857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   treatments
## 1858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       urgent
## 1859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    wednesday
## 1860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       who�ve
## 1861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    wonderful
## 1862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    wondering
## 1863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         zoom
## 1864                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @realdonaldtrump
## 1865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f9a0>
## 1866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       active
## 1867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          add
## 1868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        awful
## 1869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bank
## 1870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brother
## 1871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       carers
## 1872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      central
## 1873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    challenge
## 1874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        child
## 1875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        click
## 1876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       common
## 1877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    companies
## 1878                                                                                                                                                                                                                                                                                                                                                                                                                                                                              congratulations
## 1879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        event
## 1880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exempt
## 1881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     exercise
## 1882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exist
## 1883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exposed
## 1884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        extra
## 1885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fees
## 1886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fighting
## 1887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fines
## 1888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         flow
## 1889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        focus
## 1890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fresh
## 1891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gay
## 1892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gp
## 1893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       here�s
## 1894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     industry
## 1895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      isolate
## 1896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         joke
## 1897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lateral
## 1898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        loved
## 1899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lucky
## 1900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mark
## 1901                                                                                                                                                                                                                                                                                                                                                                                                                                                                            oxfordastrazeneca
## 1902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pcr
## 1903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   protecting
## 1904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    providing
## 1905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     relevant
## 1906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    resources
## 1907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rising
## 1908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        royal
## 1909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      science
## 1910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sector
## 1911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shit
## 1912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        smell
## 1913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           st
## 1914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     starting
## 1915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        story
## 1916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       strong
## 1917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         talk
## 1918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tuition
## 1919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tweets
## 1920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 universities
## 1921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     urgently
## 1922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     watching
## 1923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    wednesday
## 1924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       weekly
## 1925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          win
## 1926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         word
## 1927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @ft
## 1928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @piersmorgan
## 1929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   antibodies
## 1930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brexit
## 1931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cold
## 1932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    confirmed
## 1933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hope
## 1934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       impact
## 1935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    isolating
## 1936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         i�ve
## 1937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lft
## 1938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lives
## 1939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        media
## 1940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      morning
## 1941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     negative
## 1942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        north
## 1943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      protect
## 1944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       report
## 1945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reported
## 1946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      website
## 1947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @devisridhar
## 1948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @hmrcgovuk
## 1949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @who
## 1950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #business
## 1951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #community
## 1952                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #maternitypetition
## 1953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f499>
## 1954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f621>
## 1955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     allowing
## 1956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     analysis
## 1957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     announce
## 1958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    announced
## 1959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   antibodies
## 1960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      average
## 1961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       banned
## 1962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        basis
## 1963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     benefits
## 1964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      biggest
## 1965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     birthday
## 1966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       border
## 1967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        calls
## 1968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       castle
## 1969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      channel
## 1970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       claims
## 1971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    committee
## 1972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   completing
## 1973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          con
## 1974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    continued
## 1975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   continuing
## 1976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  contracting
## 1977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 conversation
## 1978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     councils
## 1979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     covering
## 1980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      culture
## 1981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      demands
## 1982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disaster
## 1983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disgrace
## 1984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  disgraceful
## 1985                                                                                                                                                                                                                                                                                                                                                                                                                                                                             disproportionate
## 1986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         drug
## 1987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       easing
## 1988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      edition
## 1989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     exciting
## 1990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    extension
## 1991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eye
## 1992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         eyes
## 1993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      failure
## 1994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fast
## 1995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        feels
## 1996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       flight
## 1997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forces
## 1998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        helps
## 1999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         herd
## 2000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      holding
## 2001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hygiene
## 2002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     impacted
## 2003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   importance
## 2004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       income
## 2005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      isolate
## 2006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         john
## 2007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       killer
## 2008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         king
## 2009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       launch
## 2010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          led
## 2011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    liverpool
## 2012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        loads
## 2013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lol
## 2014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lucky
## 2015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     managing
## 2016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   manchester
## 2017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         note
## 2018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nz
## 2019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        obama
## 2020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    operating
## 2021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       papers
## 2022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     peaceful
## 2023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     people�s
## 2024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       planet
## 2025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      podcast
## 2026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      posters
## 2027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    potential
## 2028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  potentially
## 2029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pray
## 2030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pride
## 2031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    provision
## 2032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pubs
## 2033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         push
## 2034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reading
## 2035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      receive
## 2036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        relax
## 2037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      remains
## 2038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      respond
## 2039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scientist
## 2040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    secretary
## 2041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       secure
## 2042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sending
## 2043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sense
## 2044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       severe
## 2045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  significant
## 2046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       simple
## 2047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         site
## 2048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          snp
## 2049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     socially
## 2050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    solutions
## 2051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       source
## 2052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spanish
## 2053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     speaking
## 2054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stage
## 2055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   statistics
## 2056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     straight
## 2057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         swab
## 2058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     systemic
## 2059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        terms
## 2060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        thugs
## 2061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          uk�
## 2062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      updated
## 2063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     visiting
## 2064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    volunteer
## 2065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          war
## 2066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wash
## 2067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         weak
## 2068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      weather
## 2069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wife
## 2070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wildlife
## 2071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          win
## 2072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    worldwide
## 2073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      worried
## 2074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wouldn�t
## 2075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wow
## 2076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      written
## 2077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           yn
## 2078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cmoengland
## 2079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nadhimzahawi
## 2080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @scotgov
## 2081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #covidiots
## 2082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #lockdownuk
## 2083                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #socialdistancing
## 2084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f64f>
## 2085                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+2764><u+fe0f>
## 2086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         24hr
## 2087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   absolutely
## 2088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   additional
## 2089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 administered
## 2090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         army
## 2091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    beginning
## 2092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brilliant
## 2093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         busy
## 2094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      calling
## 2095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          car
## 2096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      changed
## 2097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      clients
## 2098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       clinic
## 2099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    completed
## 2100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confirm
## 2101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    delivered
## 2102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     devolved
## 2103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     director
## 2104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     download
## 2105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     efficacy
## 2106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      efforts
## 2107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        enter
## 2108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        false
## 2109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fine
## 2110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fund
## 2111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         half
## 2112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    happening
## 2113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        homes
## 2114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        human
## 2115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      illness
## 2116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          itu
## 2117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         i�ll
## 2118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jobs
## 2119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         john
## 2120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       killed
## 2121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kits
## 2122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lead
## 2123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lessons
## 2124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        light
## 2125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mail
## 2126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mentioned
## 2127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     messages
## 2128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        miles
## 2129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mine
## 2130                                                                                                                                                                                                                                                                                                                                                                                                                                                                               misinformation
## 2131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        month
## 2132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        party
## 2133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         poor
## 2134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     possibly
## 2135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      poverty
## 2136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     practice
## 2137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      private
## 2138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 professional
## 2139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                professionals
## 2140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   protection
## 2141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    protocols
## 2142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pupils
## 2143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quickly
## 2144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reading
## 2145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      realise
## 2146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recent
## 2147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  recommended
## 2148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reduced
## 2149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     required
## 2150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rolled
## 2151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shown
## 2152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      similar
## 2153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       simply
## 2154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          snp
## 2155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        speed
## 2156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spent
## 2157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      starmer
## 2158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stick
## 2159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    suffering
## 2160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        super
## 2161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tackle
## 2162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        takes
## 2163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         term
## 2164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trace
## 2165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     training
## 2166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       trials
## 2167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trip
## 2168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vote
## 2169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         walk
## 2170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      weekend
## 2171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bpsmithuk
## 2172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @who
## 2173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #covidvaccine
## 2174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #nhscrisis
## 2175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         book
## 2176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      british
## 2177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cure
## 2178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        delta
## 2179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      disease
## 2180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       doctor
## 2181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      england
## 2182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         feel
## 2183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      figures
## 2184                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/u8w7voujp8
## 2185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      illness
## 2186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    liverpool
## 2187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     measures
## 2188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     question
## 2189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       record
## 2190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     response
## 2191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rise
## 2192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      schools
## 2193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      science
## 2194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       severe
## 2195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stop
## 2196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         told
## 2197                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @aloksharmardg
## 2198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @guardian
## 2199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #pmqs
## 2200                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #washyourhands
## 2201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f60a>
## 2202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f614>
## 2203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f622>
## 2204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f637>
## 2205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        abuse
## 2206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       accept
## 2207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      achieve
## 2208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       active
## 2209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alok
## 2210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amount
## 2211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      answers
## 2212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        april
## 2213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   background
## 2214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ban
## 2215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         beer
## 2216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       behalf
## 2217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bma
## 2218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     capacity
## 2219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        carry
## 2220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cash
## 2221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       charge
## 2222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        claim
## 2223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     concerns
## 2224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      content
## 2225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     critical
## 2226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cross
## 2227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crowds
## 2228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     customer
## 2229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     daughter
## 2230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deadly
## 2231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decided
## 2232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    decisions
## 2233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      develop
## 2234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        diein
## 2235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     director
## 2236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disparity
## 2237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      driving
## 2238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      efforts
## 2239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      english
## 2240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     epidemic
## 2241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      episode
## 2242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       excess
## 2243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      excited
## 2244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     expected
## 2245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       expert
## 2246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fatalities
## 2247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     february
## 2248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fit
## 2249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       france
## 2250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    frontline
## 2251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      germany
## 2252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 highlighting
## 2253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hot
## 2254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      husband
## 2255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      illness
## 2256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 inequalities
## 2257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   innovation
## 2258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         isle
## 2259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    isolating
## 2260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     johnsons
## 2261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         joke
## 2262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      journey
## 2263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lab
## 2264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     launched
## 2265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      learned
## 2266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  legislation
## 2267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lie
## 2268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       locked
## 2269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       looked
## 2270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lying
## 2271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       manage
## 2272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meals
## 2273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      michael
## 2274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mine
## 2275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ministers
## 2276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      minutes
## 2277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        model
## 2278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        moved
## 2279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     movement
## 2280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mps
## 2281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nightmare
## 2282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      opinion
## 2283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 organisation
## 2284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    organised
## 2285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     original
## 2286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       owners
## 2287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       passed
## 2288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       passes
## 2289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peace
## 2290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      perfect
## 2291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        phone
## 2292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pick
## 2293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     policies
## 2294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      popular
## 2295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      poverty
## 2296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     previous
## 2297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 professional
## 2298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quick
## 2299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reasons
## 2300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    relatives
## 2301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     released
## 2302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reminder
## 2303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      request
## 2304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    resources
## 2305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      richard
## 2306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       scenes
## 2307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      selfish
## 2308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        serve
## 2309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      signing
## 2310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        signs
## 2311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         slow
## 2312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       speech
## 2313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spoke
## 2314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         step
## 2315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      studies
## 2316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                thegreenparty
## 2317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      they�ve
## 2318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tickets
## 2319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         uk�s
## 2320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    virusfree
## 2321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       warned
## 2322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wedding
## 2323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        woman
## 2324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         word
## 2325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �extend
## 2326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �we
## 2327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bbcbreaking
## 2328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @devisridhar
## 2329                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @publichealthw
## 2330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #london
## 2331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #vaccination
## 2332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #wearamask
## 2333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f447>
## 2334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f622>
## 2335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          4th
## 2336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       actual
## 2337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adults
## 2338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          air
## 2339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    announces
## 2340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     antibody
## 2341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anymore
## 2342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      appears
## 2343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aren�t
## 2344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      average
## 2345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        black
## 2346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     breaches
## 2347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      careful
## 2348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      carried
## 2349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     changing
## 2350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clubs
## 2351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    decisions
## 2352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    delighted
## 2353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         duty
## 2354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eat
## 2355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     economic
## 2356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    efficient
## 2357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       entire
## 2358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        entry
## 2359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      excited
## 2360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fast
## 2361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       father
## 2362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     february
## 2363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fined
## 2364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       flight
## 2365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      flights
## 2366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        folks
## 2367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        games
## 2368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      glasgow
## 2369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hasn�t
## 2370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      haven�t
## 2371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      heating
## 2372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      helpful
## 2373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      history
## 2374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      holiday
## 2375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       honest
## 2376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          icu
## 2377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     included
## 2378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 incompetence
## 2379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    isolating
## 2380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          i�d
## 2381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        learn
## 2382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         loss
## 2383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mad
## 2384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      massive
## 2385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         meet
## 2386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mild
## 2387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     millions
## 2388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         miss
## 2389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mps
## 2390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     multiple
## 2391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     officers
## 2392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    organised
## 2393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      outdoor
## 2394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    partially
## 2395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     partners
## 2396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      peoples
## 2397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pleased
## 2398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     politics
## 2399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prayers
## 2400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prof
## 2401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   recovering
## 2402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reducing
## 2403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     register
## 2404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     released
## 2405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rip
## 2406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        round
## 2407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     schedule
## 2408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      selfish
## 2409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shame
## 2410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shielding
## 2411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        short
## 2412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sister
## 2413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stand
## 2414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         step
## 2415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stopping
## 2416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tax
## 2417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    thousands
## 2418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       threat
## 2419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          uks
## 2420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          war
## 2421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       what�s
## 2422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        woman
## 2423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         xmas
## 2424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       you�ve
## 2425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         zoom
## 2426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jeremycorbyn
## 2427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @joebiden
## 2428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @nhsuk
## 2429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     absolute
## 2430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    australia
## 2431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       change
## 2432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       common
## 2433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    countries
## 2434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crew
## 2435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crisis
## 2436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     critical
## 2437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      doesn�t
## 2438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      feeling
## 2439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      forward
## 2440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         game
## 2441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    grinstead
## 2442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        happy
## 2443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       immune
## 2444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    including
## 2445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kids
## 2446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           la
## 2447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         line
## 2448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         live
## 2449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        local
## 2450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lost
## 2451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         love
## 2452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        month
## 2453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       online
## 2454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pm
## 2455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prime
## 2456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     research
## 2457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       safety
## 2458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     services
## 2459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tennis
## 2460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          top
## 2461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        total
## 2462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trust
## 2463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   university
## 2464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      updated
## 2465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      updates
## 2466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wearing
## 2467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       whilst
## 2468                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @campbellclaret
## 2469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @covid19uk
## 2470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @gmb
## 2471                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jacobreesmogg
## 2472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @metrouk
## 2473                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @realdonaldtrump
## 2474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #acabose
## 2475                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #artdengroundmoviment
## 2476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #bcnlegends
## 2477                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #blacklivesmatteruk
## 2478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #blegends
## 2479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #charity
## 2480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #cuarentena
## 2481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #desescalada
## 2482                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #kpmgbudgetinsights
## 2483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #lockdown2020
## 2484                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #salvationarmy�s
## 2485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #sheilding
## 2486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #stayinghome
## 2487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #stayingsafe
## 2488                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #staysafeeveryone
## 2489                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #urbangraffitisbcn
## 2490                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #workingfromhome
## 2491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4be>
## 2492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f609>
## 2493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f644>
## 2494                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+24c8><u+24c0><u+24ce>
## 2495                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+24c9><u+24ba><u+24b8><u+24bd>
## 2496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           2m
## 2497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      abraham
## 2498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   acceptable
## 2499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  acknowledge
## 2500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adults
## 2501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    advantage
## 2502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      airport
## 2503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  appreciated
## 2504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aren�t
## 2505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arrested
## 2506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    authority
## 2507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aware
## 2508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    basically
## 2509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    beginning
## 2510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       belief
## 2511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      benefit
## 2512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bloody
## 2513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        boost
## 2514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bristol
## 2515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        build
## 2516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          buy
## 2517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  challenging
## 2518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chief
## 2519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    childcare
## 2520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       choice
## 2521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       choose
## 2522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clean
## 2523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      clearer
## 2524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       combat
## 2525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     combined
## 2526                                                                                                                                                                                                                                                                                                                                                                                                                                                                              congratulations
## 2527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contracted
## 2528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       corona
## 2529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cough
## 2530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        count
## 2531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     coverage
## 2532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crowd
## 2533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cycle
## 2534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       danger
## 2535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dear
## 2536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       decade
## 2537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    delivered
## 2538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       design
## 2539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                discretionary
## 2540                                                                                                                                                                                                                                                                                                                                                                                                                                                                           disproportionately
## 2541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      donated
## 2542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     donating
## 2543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doors
## 2544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     download
## 2545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         drop
## 2546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        eased
## 2547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emails
## 2548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    emotional
## 2549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     employed
## 2550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exact
## 2551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       expose
## 2552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       extend
## 2553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fabulous
## 2554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        false
## 2555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     festival
## 2556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fines
## 2557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        force
## 2558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forced
## 2559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    forgotten
## 2560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        funds
## 2561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        games
## 2562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        grasp
## 2563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       growth
## 2564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          guy
## 2565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  hardworking
## 2566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hate
## 2567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       highly
## 2568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     holidays
## 2569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ideas
## 2570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      impacts
## 2571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     includes
## 2572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   initiative
## 2573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     innocent
## 2574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       inside
## 2575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    interview
## 2576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       island
## 2577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    knowledge
## 2578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    landscape
## 2579                                                                                                                                                                                                                                                                                                                                                                                                                                                                               littlemaggie53
## 2580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mark
## 2581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mate
## 2582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mayor
## 2583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meant
## 2584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mentioned
## 2585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         miss
## 2586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mob
## 2587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mum
## 2588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       murder
## 2589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          m�s
## 2590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nasty
## 2591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nature
## 2592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   negligence
## 2593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nurses
## 2594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ons
## 2595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       oxford
## 2596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        panel
## 2597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  participate
## 2598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  partnership
## 2599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   passengers
## 2600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      planned
## 2601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       played
## 2602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pls
## 2603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     politics
## 2604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     position
## 2605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      posting
## 2606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    postponed
## 2607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     powerful
## 2608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   previously
## 2609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     priority
## 2610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    privilege
## 2611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prof
## 2612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quality
## 2613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      raising
## 2614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reflect
## 2615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  regulations
## 2616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     returned
## 2617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         road
## 2618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        safer
## 2619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sake
## 2620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sales
## 2621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sex
## 2622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shambles
## 2623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        smell
## 2624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   solidarity
## 2625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spaces
## 2626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spain
## 2627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    standards
## 2628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    statement
## 2629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stats
## 2630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stock
## 2631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stores
## 2632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stories
## 2633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      strange
## 2634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stronger
## 2635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      success
## 2636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suggest
## 2637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   suggesting
## 2638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sunday
## 2639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suppose
## 2640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    surprised
## 2641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  susceptible
## 2642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        taste
## 2643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     teaching
## 2644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      telling
## 2645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tells
## 2646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  temporarily
## 2647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 testandtrace
## 2648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       timely
## 2649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        topic
## 2650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tough
## 2651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    virtually
## 2652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vision
## 2653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     visitors
## 2654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 volunteering
## 2655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        water
## 2656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       weekly
## 2657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �i
## 2658                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @conservatives
## 2659                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @everydoctoruk
## 2660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @gmb
## 2661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @lbc
## 2662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mailonline
## 2663                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mayoroflondon
## 2664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nhsengland
## 2665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @pritipatel
## 2666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @sadiqkhan
## 2667                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @toisportsnews
## 2668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #borisjohnson
## 2669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #scotland
## 2670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4be>
## 2671                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+24c8><u+24c0><u+24ce>
## 2672                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+24c9><u+24ba><u+24b8><u+24bd>
## 2673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          80s
## 2674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       accept
## 2675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   admissions
## 2676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        admit
## 2677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       africa
## 2678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     approval
## 2679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  astrazeneca
## 2680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       banned
## 2681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         beds
## 2682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brings
## 2683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       broken
## 2684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     building
## 2685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chris
## 2686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                circumstances
## 2687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      closure
## 2688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      college
## 2689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       combat
## 2690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conference
## 2691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   constantly
## 2692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cup
## 2693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cut
## 2694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deadly
## 2695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dec
## 2696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decided
## 2697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dementia
## 2698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deserve
## 2699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  devastating
## 2700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     directly
## 2701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      discuss
## 2702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       donate
## 2703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         door
## 2704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    employees
## 2705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    excellent
## 2706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       expert
## 2707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fair
## 2708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        final
## 2709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      germany
## 2710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          god
## 2711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 government�s
## 2712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        green
## 2713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        heard
## 2714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        helps
## 2715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hey
## 2716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   impossible
## 2717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       income
## 2718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         isle
## 2719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kit
## 2720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      learned
## 2721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       letter
## 2722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        links
## 2723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lock
## 2724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          los
## 2725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mandatory
## 2726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         matt
## 2727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       matter
## 2728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meant
## 2729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       minute
## 2730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mixing
## 2731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        modus
## 2732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       moving
## 2733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 notification
## 2734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nursing
## 2735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      officer
## 2736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  opportunity
## 2737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     original
## 2738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        paper
## 2739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         para
## 2740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         park
## 2741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       paying
## 2742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     penipuan
## 2743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   personally
## 2744                                                                                                                                                                                                                                                                                                                                                                                                                                                                               pfizerbiontech
## 2745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    protected
## 2746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     receives
## 2747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reporting
## 2748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       review
## 2749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         road
## 2750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        scary
## 2751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       scheme
## 2752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   scientific
## 2753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           se
## 2754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stats
## 2755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suggests
## 2756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  supermarket
## 2757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       supply
## 2758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        surge
## 2759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tells
## 2760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      they�re
## 2761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trade
## 2762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tragic
## 2763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trial
## 2764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        truth
## 2765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   underlying
## 2766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        urges
## 2767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        users
## 2768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     variants
## 2769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      village
## 2770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vital
## 2771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    volunteer
## 2772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         warn
## 2773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    wondering
## 2774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       worker
## 2775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           xx
## 2776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        youth
## 2777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #coronaupdate
## 2778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #covidtesting
## 2779                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f1ec><u+0001f1e7>
## 2780                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f9cd><u+0001f51a><u+0001f637><u+0001f30f><u+0001f51c><u+0001f6b6>
## 2781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          1st
## 2782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          2nd
## 2783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   admissions
## 2784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     admitted
## 2785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      article
## 2786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      boosted
## 2787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cancelled
## 2788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        can�t
## 2789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          car
## 2790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        check
## 2791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chelsea
## 2792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   colleagues
## 2793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cough
## 2794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       credit
## 2795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doses
## 2796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dr
## 2797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      effects
## 2798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     evidence
## 2799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        found
## 2800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       global
## 2801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hear
## 2802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hit
## 2803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  information
## 2804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jabbed
## 2805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        level
## 2806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         link
## 2807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      message
## 2808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mild
## 2809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        novak
## 2810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       person
## 2811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         plan
## 2812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   population
## 2813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prevent
## 2814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rapid
## 2815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reduce
## 2816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     remember
## 2817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reports
## 2818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       return
## 2819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sense
## 2820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        south
## 2821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 transmission
## 2822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       walkin
## 2823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      weekend
## 2824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bbcr4today
## 2825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @goldiex11
## 2826                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @keepmericatrump
## 2827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @lbcnews
## 2828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @martinslewis
## 2829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @nhsuk
## 2830                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ourdivineyahuah
## 2831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @pheuk
## 2832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @talkradio
## 2833                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @therealmissjo
## 2834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @wishshopping
## 2835                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #anesthesiologist
## 2836                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #carersweek2020
## 2837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #coronaupdate
## 2838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #cummings
## 2839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #excludeduk
## 2840                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #forgottenfreelancers
## 2841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #forgottenltd
## 2842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #georgefloyd
## 2843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #iom
## 2844                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #notmovingontildomhasgone
## 2845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #pause
## 2846                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #volunteersweek2020
## 2847                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #wednesdaymorning
## 2848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f600>
## 2849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f633>
## 2850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f9ee>
## 2851                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+2622>covid19<u+2623>
## 2852                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2665><u+fe0f>x
## 2853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         10am
## 2854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         10th
## 2855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      adapted
## 2856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        added
## 2857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       advise
## 2858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       africa
## 2859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aged
## 2860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       agency
## 2861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           al
## 2862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  alternative
## 2863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       artist
## 2864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      artists
## 2865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  assessments
## 2866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    austerity
## 2867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    awareness
## 2868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      balance
## 2869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bank
## 2870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        banks
## 2871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bill
## 2872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bodies
## 2873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          box
## 2874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brand
## 2875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       budget
## 2876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       career
## 2877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      centres
## 2878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 championship
## 2879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    childrens
## 2880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cities
## 2881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      classes
## 2882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  competition
## 2883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      context
## 2884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cope
## 2885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        costs
## 2886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    coverings
## 2887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cycling
## 2888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dad
## 2889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dates
## 2890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        david
## 2891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     december
## 2892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    delighted
## 2893                                                                                                                                                                                                                                                                                                                                                                                                                                                                               demonstrations
## 2894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     diabetes
## 2895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       direct
## 2896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doubt
## 2897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eat
## 2898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           em
## 2899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      emailed
## 2900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     emerging
## 2901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    employees
## 2902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    employers
## 2903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       energy
## 2904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                environmental
## 2905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     facility
## 2906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  fascinating
## 2907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fellow
## 2908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      finding
## 2909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        forum
## 2910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fresh
## 2911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    genuinely
## 2912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      glasgow
## 2913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gonna
## 2914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gp
## 2915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 grandparents
## 2916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                heartbreaking
## 2917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       heroes
## 2918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hidden
## 2919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hits
## 2920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hotels
## 2921                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/bhrfkmra0j
## 2922                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/wnfsczfk7j
## 2923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hub
## 2924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          icu
## 2925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ignoring
## 2926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    increases
## 2927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   increasing
## 2928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   individual
## 2929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        inept
## 2930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  informative
## 2931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   innovative
## 2932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    instagram
## 2933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        items
## 2934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      journal
## 2935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jun
## 2936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kills
## 2937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        limit
## 2938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lose
## 2939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      manager
## 2940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         meat
## 2941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mess
## 2942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     midlands
## 2943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mins
## 2944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       minute
## 2945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mobile
## 2946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       morons
## 2947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nigeria
## 2948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      obvious
## 2949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    operation
## 2950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      outcome
## 2951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 overwhelming
## 2952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     painting
## 2953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parcels
## 2954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      peoples
## 2955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  performance
## 2956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       player
## 2957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prepare
## 2958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   prevention
## 2959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prices
## 2960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   priorities
## 2961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   procedures
## 2962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    professor
## 2963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     progress
## 2964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    protected
## 2965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       proven
## 2966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                psychological
## 2967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pupils
## 2968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quote
## 2969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rain
## 2970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       raised
## 2971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rallies
## 2972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recession
## 2973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recommend
## 2974                                                                                                                                                                                                                                                                                                                                                                                                                                                                               rehabilitation
## 2975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     relating
## 2976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reporting
## 2977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      restart
## 2978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ring
## 2979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rural
## 2980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       saftey
## 2981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      samples
## 2982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        saved
## 2983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     security
## 2984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    september
## 2985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                significantly
## 2986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      similar
## 2987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       simply
## 2988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sir
## 2989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spend
## 2990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     spending
## 2991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       square
## 2992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      starmer
## 2993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       struck
## 2994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       studio
## 2995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        style
## 2996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   successful
## 2997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    suppliers
## 2998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      survive
## 2999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suspect
## 3000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    suspected
## 3001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tackle
## 3002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     takeaway
## 3003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        talks
## 3004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   technology
## 3005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    temporary
## 3006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tracing
## 3007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      treated
## 3008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tune
## 3009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tweets
## 3010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         type
## 3011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unit
## 3012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ur
## 3013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        urban
## 3014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      useless
## 3015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      utterly
## 3016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      voucher
## 3017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      walking
## 3018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        waste
## 3019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      watched
## 3020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wide
## 3021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wider
## 3022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                wolverhampton
## 3023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      world�s
## 3024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        worry
## 3025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     worrying
## 3026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      writing
## 3027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          yep
## 3028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         zoos
## 3029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @toadmeister
## 3030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @zeitonline
## 3031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #brexit
## 3032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #corona
## 3033                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covid19cyprus
## 3034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #covid19tests
## 3035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #cyprus
## 3036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #football
## 3037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #mentalhealth
## 3038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #newyear
## 3039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #toriesout
## 3040                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f1ec><u+0001f1e7>
## 3041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f614>
## 3042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          8pm
## 3043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   activities
## 3044                                                                                                                                                                                                                                                                                                                                                                                                                                                                               administration
## 3045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     admitted
## 3046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    afternoon
## 3047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ain�t
## 3048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          arm
## 3049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arriving
## 3050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  authorities
## 3051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         beat
## 3052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       begins
## 3053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    behaviour
## 3054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      biggest
## 3055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bill
## 3056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bloody
## 3057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        board
## 3058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       boiler
## 3059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bojo
## 3060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        broke
## 3061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brought
## 3062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bullshit
## 3063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chaos
## 3064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        claim
## 3065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     claiming
## 3066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         clap
## 3067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   considered
## 3068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    continued
## 3069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cos
## 3070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       county
## 3071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     covid19�
## 3072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cyprus
## 3073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       damage
## 3074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dashboard
## 3075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decades
## 3076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          del
## 3077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dm
## 3078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       driver
## 3079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      driving
## 3080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      elderly
## 3081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        elite
## 3082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   escalating
## 3083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    estimated
## 3084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      explain
## 3085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eye
## 3086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       failed
## 3087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fatal
## 3088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fatigue
## 3089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       figure
## 3090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fishing
## 3091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fixture
## 3092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     happened
## 3093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    headlines
## 3094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 highlighting
## 3095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hill
## 3096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hotels
## 3097                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/fg0rckzcbb
## 3098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       humans
## 3099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       idiots
## 3100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ignoring
## 3101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  immediately
## 3102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  improvement
## 3103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     includes
## 3104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 independence
## 3105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   individual
## 3106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    injection
## 3107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    intensive
## 3108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       israel
## 3109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         keir
## 3110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      killing
## 3111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kills
## 3112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leading
## 3113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          led
## 3114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      limited
## 3115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      madness
## 3116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     majority
## 3117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        match
## 3118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mrna
## 3119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   nationwide
## 3120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ni
## 3121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    normality
## 3122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ongoing
## 3123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                opportunities
## 3124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 organisation
## 3125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  overwhelmed
## 3126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pass
## 3127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peter
## 3128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        phase
## 3129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      planned
## 3130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       played
## 3131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pneumonia
## 3132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ppl
## 3133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  precautions
## 3134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     previous
## 3135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      program
## 3136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     protocol
## 3137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     provided
## 3138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quick
## 3139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quiet
## 3140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reaction
## 3141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recommend
## 3142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recover
## 3143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    regularly
## 3144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       remote
## 3145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reply
## 3146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  respiratory
## 3147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  responsible
## 3148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reveals
## 3149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       secure
## 3150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       series
## 3151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shared
## 3152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        she�s
## 3153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       simple
## 3154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sit
## 3155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sport
## 3156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spring
## 3157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stock
## 3158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      streets
## 3159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stronger
## 3160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     struggle
## 3161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stuff
## 3162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       suffer
## 3163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suffered
## 3164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 supermarkets
## 3165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     supplies
## 3166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       survey
## 3167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      survive
## 3168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      symptom
## 3169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      talking
## 3170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     teaching
## 3171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thursday
## 3172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       todays
## 3173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tories
## 3174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tracing
## 3175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   travelling
## 3176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        treat
## 3177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      treated
## 3178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   treatments
## 3179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      trusted
## 3180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tuesday
## 3181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unable
## 3182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          usa
## 3183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        viral
## 3184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      virtual
## 3185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wasn�t
## 3186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      watched
## 3187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      webinar
## 3188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        who�s
## 3189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      written
## 3190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    yorkshire
## 3191                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #getvaccinated
## 3192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #isolation
## 3193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #schools
## 3194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #vaccination
## 3195                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+2620><u+fe0f>covid19
## 3196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       answer
## 3197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aware
## 3198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        break
## 3199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brilliant
## 3200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cancer
## 3201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     catching
## 3202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cells
## 3203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     compared
## 3204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      contact
## 3205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dangerous
## 3206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dead
## 3207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deserve
## 3208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          die
## 3209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   difference
## 3210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dying
## 3211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exemption
## 3212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      extreme
## 3213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    extremely
## 3214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forced
## 3215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fucking
## 3216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       giving
## 3217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        guess
## 3218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      helping
## 3219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 hospitalized
## 3220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        house
## 3221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        human
## 3222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     increase
## 3223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       issues
## 3224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      killing
## 3225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         left
## 3226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       levels
## 3227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lots
## 3228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          low
## 3229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        makes
## 3230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mentioned
## 3231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         miss
## 3232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mrna
## 3233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      natural
## 3234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       normal
## 3235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     outbreak
## 3236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          par
## 3237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        party
## 3238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         post
## 3239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     received
## 3240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recent
## 3241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sadly
## 3242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   scientists
## 3243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     staffing
## 3244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       system
## 3245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tuesday
## 3246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wait
## 3247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      workers
## 3248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        worst
## 3249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bjajournals
## 3250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @channel4news
## 3251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @davewaller20
## 3252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @fischercouk
## 3253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @govuk
## 3254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @hmtreasury
## 3255                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jacksoncarlaw
## 3256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @justgiving
## 3257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @kategarraway
## 3258                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @nursingnotesuk
## 3259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @pritipatel
## 3260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @punployart
## 3261                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @welshgovernment
## 3262                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #buildbackbetter
## 3263                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covidshambles
## 3264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #fase1
## 3265                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #forgottenpaye
## 3266                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #forthemany<u+0001f308>
## 3267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #justdonated
## 3268                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #lakedistrictuk
## 3269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #leadership
## 3270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #newnormal
## 3271                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #pressconference
## 3272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #savelives
## 3273                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #schoolsreopeninguk
## 3274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #scotland
## 3275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #stayhome
## 3276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #virtuallakes
## 3277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          +ve
## 3278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f449>
## 3279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f44d>
## 3280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f494>
## 3281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f49a>
## 3282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f60d>
## 3283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f62d>
## 3284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f648>
## 3285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f973>
## 3286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+fffc>
## 3287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         16th
## 3288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          3rd
## 3289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          6pm
## 3290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       agenda
## 3291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alert
## 3292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        allah
## 3293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     american
## 3294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       animal
## 3295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      animals
## 3296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    announces
## 3297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       annual
## 3298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          arm
## 3299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         asap
## 3300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ashamed
## 3301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 asymptomatic
## 3302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bereaved
## 3303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bet
## 3304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bike
## 3305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blaming
## 3306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      booking
## 3307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      borough
## 3308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bright
## 3309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bringing
## 3310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          btw
## 3311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cancel
## 3312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cards
## 3313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       caring
## 3314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     carrying
## 3315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  catastrophe
## 3316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      central
## 3317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chair
## 3318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cheers
## 3319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chris
## 3320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       church
## 3321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    clearance
## 3322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       closes
## 3323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      closure
## 3324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   commission
## 3325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       common
## 3326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                communication
## 3327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      compare
## 3328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  complaining
## 3329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                complications
## 3330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confirm
## 3331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 consultation
## 3332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    contracts
## 3333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contribute
## 3334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 contribution
## 3335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      correct
## 3336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      corrupt
## 3337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     counting
## 3338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       county
## 3339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       covers
## 3340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crap
## 3341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     creating
## 3342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cricket
## 3343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      crossed
## 3344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cummingss
## 3345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cuts
## 3346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       decide
## 3347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     declares
## 3348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       degree
## 3349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        delay
## 3350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      delayed
## 3351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    demanding
## 3352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   department
## 3353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deserve
## 3354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     designed
## 3355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   developing
## 3356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    diagnosed
## 3357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  diagnostics
## 3358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dies
## 3359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disabled
## 3360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disastrous
## 3361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  distraction
## 3362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dm
## 3363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    donations
## 3364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dream
## 3365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dropped
## 3366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ease
## 3367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       easier
## 3368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       effort
## 3369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    encourage
## 3370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     englands
## 3371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      enjoyed
## 3372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     exercise
## 3373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  explanation
## 3374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exploring
## 3375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exposed
## 3376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ffs
## 3377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         film
## 3378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fischerco
## 3379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       flying
## 3380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fm
## 3381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  fundraising
## 3382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        funny
## 3383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gather
## 3384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        govts
## 3385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       harder
## 3386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hasn�t
## 3387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hatred
## 3388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      heading
## 3389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     homeless
## 3390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       honest
## 3391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hopes
## 3392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hotel
## 3393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hour
## 3394                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/nen8hdntq0
## 3395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 huddersfield
## 3396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ian
## 3397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        idiot
## 3398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      improve
## 3399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inequality
## 3400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    insurance
## 3401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    intensive
## 3402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  introducing
## 3403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   investment
## 3404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        irish
## 3405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       issued
## 3406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        james
## 3407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jan
## 3408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jane
## 3409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        japan
## 3410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       joined
## 3411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         keen
## 3412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         keir
## 3413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         khan
## 3414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      knowing
## 3415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    literally
## 3416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lunch
## 3417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    marketing
## 3418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        match
## 3419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      meadows
## 3420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       memory
## 3421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      minimum
## 3422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mistakes
## 3423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       modern
## 3424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nations
## 3425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      natural
## 3426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   neighbours
## 3427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nights
## 3428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      offered
## 3429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      outdoor
## 3430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         para
## 3431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         paul
## 3432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pc
## 3433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   peacefully
## 3434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peter
## 3435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       photos
## 3436                                                                                                                                                                                                                                                                                                                                                                                                                                                              pics<u+0001f917><u+0001f618>day
## 3437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       plasma
## 3438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pledge
## 3439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pneumonia
## 3440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pollution
## 3441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     possibly
## 3442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        posts
## 3443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       powers
## 3444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prayers
## 3445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      praying
## 3446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        price
## 3447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      primary
## 3448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prior
## 3449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     produced
## 3450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     promised
## 3451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     property
## 3452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     provided
## 3453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ran
## 3454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rapid
## 3455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   recognised
## 3456                                                                                                                                                                                                                                                                                                                                                                                                                                                                              recommendations
## 3457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     refugees
## 3458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      refunds
## 3459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refuse
## 3460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      refused
## 3461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      regions
## 3462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   registered
## 3463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      regular
## 3464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       remove
## 3465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reply
## 3466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    responded
## 3467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   responding
## 3468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rid
## 3469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rising
## 3470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rt
## 3471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ruined
## 3472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sage
## 3473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sea
## 3474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       search
## 3475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       select
## 3476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       senior
## 3477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      setting
## 3478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     settings
## 3479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shape
## 3480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shielding
## 3481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shift
## 3482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shirt
## 3483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      silence
## 3484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sleep
## 3485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       slowly
## 3486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        snake
## 3487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sorted
## 3488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spot
## 3489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       status
## 3490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stopping
## 3491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stuck
## 3492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       supply
## 3493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     supposed
## 3494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  sustainable
## 3495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    targeting
## 3496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ten
## 3497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     terrible
## 3498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      theatre
## 3499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        theme
## 3500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     theories
## 3501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       theory
## 3502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        throw
## 3503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          to�
## 3504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      trading
## 3505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tragic
## 3506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   travellers
## 3507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trip
## 3508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      trouble
## 3509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         twat
## 3510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unable
## 3511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        utter
## 3512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ve
## 3513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       victim
## 3514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      viruses
## 3515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        voice
## 3516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wasted
## 3517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        who�s
## 3518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wins
## 3519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       winter
## 3520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         worn
## 3521                                                                                                                                                                                                                                                                                                                                                                                                                                                                            x<u+2665><u+fe0f>
## 3522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @astrazeneca
## 3523                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @breezergalway
## 3524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @doctoroxford
## 3525                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @gavinwilliamson
## 3526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @thercn
## 3527                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @welshgovernment
## 3528                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #coronavirusstrain
## 3529                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #coronavirustests
## 3530                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #coronavirusvaccine
## 3531                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #covid19lockdown
## 3532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #coviduk
## 3533                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covidvacccine
## 3534                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #handsfacespace
## 3535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #level5
## 3536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #newry
## 3537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #nhsheroes
## 3538                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #pfizervaccine
## 3539                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #protectnhsworkers
## 3540                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #stayhomesavelives
## 3541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #tier4
## 3542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #vaccinations
## 3543                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f447><u+0001f3fb>
## 3544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f602>
## 3545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f60a>
## 3546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f644>
## 3547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f64c>
## 3548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f92c>
## 3549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f970>
## 3550                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+27a1><u+fe0f>
## 3551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         13th
## 3552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    adherence
## 3553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      affects
## 3554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   agreements
## 3555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      airport
## 3556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           al
## 3557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      america
## 3558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     american
## 3559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   apparently
## 3560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arrested
## 3561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       attack
## 3562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attention
## 3563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aunt
## 3564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       auntie
## 3565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    australia
## 3566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        basic
## 3567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      benefit
## 3568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blind
## 3569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         blog
## 3570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       border
## 3571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      borders
## 3572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          box
## 3573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brazil
## 3574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       breach
## 3575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       breaks
## 3576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bristol
## 3577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brown
## 3578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      capitol
## 3579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        carry
## 3580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ceo
## 3581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chain
## 3582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chair
## 3583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       charge
## 3584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      charged
## 3585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       church
## 3586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       claims
## 3587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      clarity
## 3588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     clinical
## 3589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     closures
## 3590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coffee
## 3591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      comment
## 3592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     comments
## 3593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    committee
## 3594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    confusing
## 3595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    continues
## 3596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   continuing
## 3597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    contracts
## 3598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 contributing
## 3599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 contribution
## 3600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        costs
## 3601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        count
## 3602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       couple
## 3603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       create
## 3604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       credit
## 3605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     customer
## 3606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dark
## 3607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   delivering
## 3608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       demand
## 3609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    destroyed
## 3610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   devolution
## 3611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      digital
## 3612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         drop
## 3613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         drug
## 3614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    edinburgh
## 3615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       effort
## 3616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       enable
## 3617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     englands
## 3618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eve
## 3619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       events
## 3620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       excess
## 3621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    existence
## 3622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 experiencing
## 3623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        faith
## 3624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fed
## 3625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   footballer
## 3626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        force
## 3627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forced
## 3628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      funding
## 3629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   furloughed
## 3630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gaswise
## 3631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        guest
## 3632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       guests
## 3633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hall
## 3634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         harm
## 3635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hopes
## 3636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hoping
## 3637                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/3rwgyjffem
## 3638                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/4d3grgyiss
## 3639                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/jdf4e5rysr
## 3640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     humanity
## 3641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   increasing
## 3642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  independent
## 3643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        india
## 3644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      indoors
## 3645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    influenza
## 3646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          joe
## 3647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kill
## 3648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         land
## 3649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      laptops
## 3650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       launch
## 3651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   leadership
## 3652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leads
## 3653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        limit
## 3654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    literally
## 3655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      loading
## 3656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         main
## 3657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   management
## 3658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mate
## 3659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      meaning
## 3660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mhra
## 3661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       middle
## 3662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mike
## 3663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mins
## 3664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      missing
## 3665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mobile
## 3666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      moderna
## 3667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     movement
## 3668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nonsense
## 3669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   nottingham
## 3670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     november
## 3671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nurseries
## 3672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          n�o
## 3673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      obesity
## 3674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      obvious
## 3675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                organisations
## 3676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       parent
## 3677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   parliament
## 3678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      perfect
## 3679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    permitted
## 3680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pfizer�s
## 3681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        piece
## 3682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       planet
## 3683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     plumbing
## 3684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       poorly
## 3685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          por
## 3686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    potential
## 3687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prior
## 3688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   production
## 3689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     progress
## 3690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     promises
## 3691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   quarantine
## 3692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quote
## 3693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        raise
## 3694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ran
## 3695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reach
## 3696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  reassurance
## 3697                                                                                                                                                                                                                                                                                                                                                                                                                                                                              recommendations
## 3698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     refusing
## 3699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reopen
## 3700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      repairs
## 3701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       resign
## 3702                                                                                                                                                                                                                                                                                                                                                                                                                                                                               responsibility
## 3703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       retail
## 3704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      retweet
## 3705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        risks
## 3706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rugby
## 3707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sake
## 3708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        scams
## 3709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    secretary
## 3710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sex
## 3711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sharing
## 3712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sharp
## 3713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shift
## 3714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       signed
## 3715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                significantly
## 3716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     solution
## 3717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  southampton
## 3718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       speedy
## 3719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spike
## 3720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stage
## 3721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         star
## 3722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       status
## 3723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        steps
## 3724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        store
## 3725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stress
## 3726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 successfully
## 3727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    supported
## 3728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      surgery
## 3729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     survival
## 3730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suspend
## 3731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      swagger
## 3732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      telling
## 3733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tenancy
## 3734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tennis
## 3735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   thankfully
## 3736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    theorists
## 3737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      they�ve
## 3738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      today�s
## 3739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          uni
## 3740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                unprecedented
## 3741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        uturn
## 3742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      version
## 3743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     visiting
## 3744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     visitors
## 3745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 volunteering
## 3746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        voted
## 3747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wards
## 3748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        water
## 3749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       whitty
## 3750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        women
## 3751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     worrying
## 3752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        you�d
## 3753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bazzza1234
## 3754                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #getboostednow
## 3755                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #getvaccinatednow
## 3756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #iom
## 3757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #vaccineswork
## 3758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f447>
## 3759                                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+2708><u+fe0f>nofly
## 3760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          4th
## 3761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   absolutely
## 3762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adults
## 3763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          age
## 3764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        agree
## 3765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    announces
## 3766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          app
## 3767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bed
## 3768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bloody
## 3769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     boosters
## 3770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   businesses
## 3771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     campaign
## 3772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        catch
## 3773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       centre
## 3774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chance
## 3775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       colour
## 3776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      company
## 3777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   completely
## 3778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    continues
## 3779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     directly
## 3780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      doctors
## 3781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    effective
## 3782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        event
## 3783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fight
## 3784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      friends
## 3785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     happened
## 3786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      healthy
## 3787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 herdimmunity
## 3788                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/cgbkkwfhas
## 3789                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/wnfsczfk7j
## 3790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         huge
## 3791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          icu
## 3792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         idea
## 3793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     included
## 3794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        india
## 3795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         isle
## 3796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          key
## 3797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      kingdom
## 3798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kits
## 3799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        klopp
## 3800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leave
## 3801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          les
## 3802                                                                                                                                                                                                                                                                                                                                                                                                                                                                               misinformation
## 3803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        money
## 3804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       motley
## 3805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     national
## 3806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     personal
## 3807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       policy
## 3808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        popup
## 3809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prince
## 3810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ready
## 3811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  regulations
## 3812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rt
## 3813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          run
## 3814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      running
## 3815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     saturday
## 3816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      service
## 3817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shortages
## 3818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       simply
## 3819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sir
## 3820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       strong
## 3821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        surge
## 3822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       taking
## 3823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      telling
## 3824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    thousands
## 3825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       travel
## 3826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   treatments
## 3827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       triple
## 3828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         true
## 3829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        viral
## 3830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        visit
## 3831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vital
## 3832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   vulnerable
## 3833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wales
## 3834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wear
## 3835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       winter
## 3836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        worse
## 3837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wrong
## 3838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bbcbreaking
## 3839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bbcnewsnight
## 3840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bethrigby
## 3841                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @britishairways
## 3842                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @britishredcross
## 3843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @dailymailuk
## 3844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dhscgovuk
## 3845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dpjhodges
## 3846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @forgottenltd
## 3847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @futurelearn
## 3848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @itvnews
## 3849                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jeremyvineon5
## 3850                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mayoroflondon
## 3851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @metpoliceuk
## 3852                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @oneminutebriefs
## 3853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @peston
## 3854                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @rosscolquhoun
## 3855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sajidjavid
## 3856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @thebeaconhx
## 3857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @thercn
## 3858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @uklabour
## 3859                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @visitcalderdale
## 3860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @wenurses
## 3861                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #alllivesmatter
## 3862                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #blacklivesmattters
## 3863                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #borishasfaileduk
## 3864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #cumbria
## 3865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #education
## 3866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #health
## 3867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #heartnews
## 3868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #labourlies
## 3869                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #lakedistrictnationalpark
## 3870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #love
## 3871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #massage
## 3872                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #needlessdeaths
## 3873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #news
## 3874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #photography
## 3875                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #physiotherapy
## 3876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #politics
## 3877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #realestate
## 3878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #skynews
## 3879                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #stayhomesavelives
## 3880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #support
## 3881                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #supportbubble
## 3882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #thankyou
## 3883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #thankyounhs
## 3884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #trending
## 3885                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #twitter<u+2611><u+fe0f>
## 3886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #walking
## 3887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #wellbeing
## 3888                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #welovewestgate
## 3889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f308>
## 3890                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f447><u+0001f3fc>
## 3891                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f4aa><u+0001f3fb>
## 3892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f62c>
## 3893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f642>
## 3894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f6a8>
## 3895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f6b2>
## 3896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f917>
## 3897                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f937><u+0001f3fb><u+200d><u+2642><u+fe0f>
## 3898                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+2b07><u+fe0f>
## 3899                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+2b50><u+2b50><u+2b50><u+2b50><u+2b50><u+2b50>bcnlegendz
## 3900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         11th
## 3901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         12th
## 3902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           1m
## 3903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          40k
## 3904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ability
## 3905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     accurate
## 3906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        acute
## 3907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adapting
## 3908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   addressing
## 3909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        adult
## 3910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       affect
## 3911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      affects
## 3912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       afford
## 3913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       afraid
## 3914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ah
## 3915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ai
## 3916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       andrew
## 3917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         and�
## 3918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anymore
## 3919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    appalling
## 3920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 applications
## 3921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      applied
## 3922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     applying
## 3923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 appreciation
## 3924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         army
## 3925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aspects
## 3926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  astrazeneca
## 3927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aswell
## 3928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      attempt
## 3929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       attend
## 3930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attitudes
## 3931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       august
## 3932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    australia
## 3933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      avoided
## 3934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      belfast
## 3935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bid
## 3936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      billion
## 3937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bjp
## 3938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    britain�s
## 3939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        broke
## 3940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brother
## 3941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cafe
## 3942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         card
## 3943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      careful
## 3944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 catastrophic
## 3945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cautious
## 3946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chain
## 3947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     changing
## 3948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chaos
## 3949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chosen
## 3950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       closer
## 3951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coffee
## 3952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                collaboration
## 3953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    collected
## 3954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      comment
## 3955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      commons
## 3956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         como
## 3957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    confident
## 3958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  contributed
## 3959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                contributions
## 3960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  controlling
## 3961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        court
## 3962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      covered
## 3963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crime
## 3964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crises
## 3965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   critically
## 3966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cup
## 3967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           da
## 3968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         damn
## 3969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dance
## 3970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         debt
## 3971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deep
## 3972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       defeat
## 3973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 deliberately
## 3974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dental
## 3975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deprived
## 3976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  destruction
## 3977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       detail
## 3978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                disadvantaged
## 3979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disappear
## 3980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 discriminate
## 3981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    distanced
## 3982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dollar
## 3983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         draw
## 3984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     drinking
## 3985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      drivers
## 3986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        drugs
## 3987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       easily
## 3988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       eating
## 3989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    economies
## 3990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     effected
## 3991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 embarrassing
## 3992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emerge
## 3993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        empty
## 3994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     enjoying
## 3995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     entitled
## 3996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        entry
## 3997                                                                                                                                                                                                                                                                                                                                                                                                                                                                               epidemiologist
## 3998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        equal
## 3999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          era
## 4000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       estate
## 4001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    estimated
## 4002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     european
## 4003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   everyone�s
## 4004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     examples
## 4005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exists
## 4006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  experienced
## 4007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     extended
## 4008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        faced
## 4009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   facilities
## 4010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fail
## 4011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      failing
## 4012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     failings
## 4013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        faith
## 4014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    favourite
## 4015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fb
## 4016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fears
## 4017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fed
## 4018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fees
## 4019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fever
## 4020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fill
## 4021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      flights
## 4022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      florida
## 4023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         folk
## 4024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  foreseeable
## 4025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       format
## 4026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      freedom
## 4027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    freelance
## 4028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     friendly
## 4029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fucked
## 4030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   furloughed
## 4031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gain
## 4032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gardens
## 4033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     globally
## 4034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        globe
## 4035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     grateful
## 4036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ground
## 4037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      growing
## 4038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     guardian
## 4039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        guide
## 4040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       guilty
## 4041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        heads
## 4042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hearing
## 4043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hero
## 4044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hide
## 4045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    highlight
## 4046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   highlights
## 4047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hill
## 4048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     honestly
## 4049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hoping
## 4050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   horrendous
## 4051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       horror
## 4052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       horses
## 4053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  hospitality
## 4054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hosting
## 4055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hug
## 4056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hugs
## 4057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ibuprofen
## 4058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ideology
## 4059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ignorant
## 4060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     imperial
## 4061                                                                                                                                                                                                                                                                                                                                                                                                                                                                               implementation
## 4062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 implications
## 4063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   impossible
## 4064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    indonesia
## 4065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      indoors
## 4066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   industries
## 4067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       inform
## 4068                                                                                                                                                                                                                                                                                                                                                                                                                                                                               infrastructure
## 4069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   insightful
## 4070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     insights
## 4071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    introduce
## 4072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          in�
## 4073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        irony
## 4074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                irresponsible
## 4075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        joint
## 4076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          joy
## 4077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kit
## 4078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lancet
## 4079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leisure
## 4080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      letting
## 4081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        likes
## 4082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        links
## 4083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         load
## 4084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lord
## 4085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       losing
## 4086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lowest
## 4087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mad
## 4088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      madness
## 4089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mandatory
## 4090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     marching
## 4091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      measure
## 4092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       medics
## 4093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   membership
## 4094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       metres
## 4095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mild
## 4096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     military
## 4097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        minds
## 4098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mix
## 4099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mother
## 4100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      museums
## 4101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  necessarily
## 4102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      network
## 4103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       notice
## 4104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     november
## 4105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          n�o
## 4106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      obesity
## 4107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   officially
## 4108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       option
## 4109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           os
## 4110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     outcomes
## 4111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pacientes
## 4112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pak
## 4113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pictures
## 4114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         piss
## 4115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     platform
## 4116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     plymouth
## 4117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       poorer
## 4118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  populations
## 4119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       posted
## 4120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    practices
## 4121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      premier
## 4122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prep
## 4123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    preparing
## 4124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 presentation
## 4125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      produce
## 4126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   production
## 4127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                professionals
## 4128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     projects
## 4129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       proper
## 4130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     properly
## 4131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   protective
## 4132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    proximity
## 4133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     purchase
## 4134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       racing
## 4135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   rebuilding
## 4136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   recipients
## 4137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reckless
## 4138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  recognition
## 4139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          red
## 4140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reduced
## 4141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       region
## 4142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rehab
## 4143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       remote
## 4144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      removed
## 4145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     removing
## 4146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rescue
## 4147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  researchers
## 4148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   resilience
## 4149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reveals
## 4150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reverse
## 4151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rock
## 4152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        roles
## 4153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         roll
## 4154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rugby
## 4155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sack
## 4156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sanitiser
## 4157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      screens
## 4158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           se
## 4159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     seasonal
## 4160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sectors
## 4161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         seek
## 4162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     separate
## 4163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       served
## 4164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sessions
## 4165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     severity
## 4166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shameful
## 4167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ship
## 4168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sight
## 4169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   signatures
## 4170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       silent
## 4171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sim
## 4172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        simon
## 4173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   situations
## 4174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       skills
## 4175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         skin
## 4176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        slave
## 4177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     slightly
## 4178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spare
## 4179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     specific
## 4180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spirit
## 4181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    spiritual
## 4182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stands
## 4183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         star
## 4184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stated
## 4185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      staying
## 4186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        steps
## 4187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stick
## 4188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stoke
## 4189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        storm
## 4190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     strength
## 4191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     strongly
## 4192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sturgeon
## 4193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      subject
## 4194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sue
## 4195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suggests
## 4196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     supplies
## 4197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     supports
## 4198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sweet
## 4199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         swim
## 4200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       target
## 4201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tbh
## 4202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      teacher
## 4203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tech
## 4204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thankful
## 4205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         the�
## 4206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tho
## 4207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  threatening
## 4208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       timing
## 4209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tiny
## 4210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   tirelessly
## 4211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    tonight�s
## 4212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     treating
## 4213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       trumps
## 4214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        twats
## 4215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 unemployment
## 4216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    universal
## 4217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unseen
## 4218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        valid
## 4219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vehicle
## 4220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vitamin
## 4221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       voices
## 4222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       voting
## 4223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wall
## 4224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wards
## 4225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wee
## 4226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       week�s
## 4227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  westminster
## 4228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wet
## 4229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         we�d
## 4230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wing
## 4231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         woke
## 4232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    workforce
## 4233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        write
## 4234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       writer
## 4235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ya
## 4236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       yellow
## 4237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        youth
## 4238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       you�ll
## 4239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �1m
## 4240                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @allisonpearson
## 4241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @chrischirp
## 4242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @googlenews
## 4243                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jeremyclarkson
## 4244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @joebiden
## 4245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lisamcnally1
## 4246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @nhs
## 4247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nigelfarage
## 4248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @pheuk
## 4249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sainsburys
## 4250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @talkradio
## 4251                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @transportgovuk
## 4252                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #anotherdayanotherdollar
## 4253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #besafe
## 4254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #boris
## 4255                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #covid19vaccinecyprus
## 4256                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #cyprusfacemasks
## 4257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #day1dayone
## 4258                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #differentdaysameshit
## 4259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #england
## 4260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #fitness
## 4261                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #gordanoservices
## 4262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #health
## 4263                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #homeschooling
## 4264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #lockdownlife
## 4265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #m5
## 4266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #newcalendar
## 4267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #newday
## 4268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #newyearsday
## 4269                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #pfizerbiontech
## 4270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #tier3
## 4271                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #wearadamnmask
## 4272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #wellbeing
## 4273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f440>
## 4274                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f447><u+0001f3fc>
## 4275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f449>
## 4276                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f602><u+0001f602>
## 4277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f62d>
## 4278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f6a8>
## 4279                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f926><u+200d><u+2642><u+fe0f>
## 4280                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+25fe><u+fe0f>
## 4281                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+2b07><u+fe0f>
## 4282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         14th
## 4283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         31st
## 4284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ability
## 4285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      address
## 4286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      advance
## 4287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       advise
## 4288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       affect
## 4289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      african
## 4290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       agency
## 4291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      angling
## 4292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       answer
## 4293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         anti
## 4294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anxiety
## 4295                                                                                                                                                                                                                                                                                                                                                                                                                                                                              aposcovid19apos
## 4296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      applied
## 4297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 appointments
## 4298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arrivals
## 4299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arrive
## 4300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   assessment
## 4301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       assume
## 4302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 attenborough
## 4303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       autumn
## 4304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bame
## 4305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bar
## 4306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    basically
## 4307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        basis
## 4308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     battling
## 4309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blessed
## 4310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         blue
## 4311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      borough
## 4312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boss
## 4313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brazilian
## 4314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    breakdown
## 4315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bridge
## 4316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bringing
## 4317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    broadband
## 4318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      capital
## 4319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      captain
## 4320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     carrying
## 4321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    celebrate
## 4322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    champions
## 4323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chip
## 4324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       choice
## 4325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        class
## 4326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   clinically
## 4327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       closer
## 4328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      closing
## 4329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   commitment
## 4330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  communities
## 4331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   compliance
## 4332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    concerned
## 4333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 conservative
## 4334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contract
## 4335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 convalescent
## 4336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cope
## 4337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coping
## 4338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cough
## 4339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     criminal
## 4340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      crossed
## 4341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       debate
## 4342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deputy
## 4343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       detail
## 4344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        devon
## 4345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  diagnostics
## 4346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disappear
## 4347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disaster
## 4348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   discussion
## 4349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     diseases
## 4350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disgrace
## 4351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  disgraceful
## 4352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     district
## 4353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dizaman
## 4354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     document
## 4355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     donation
## 4356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    donations
## 4357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       double
## 4358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dubai
## 4359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        earth
## 4360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         edge
## 4361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  encouraging
## 4362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      enforce
## 4363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      episode
## 4364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          era
## 4365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        essex
## 4366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     european
## 4367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exceeds
## 4368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       excuse
## 4369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exhausted
## 4370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     existing
## 4371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exists
## 4372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     exposure
## 4373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      express
## 4374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         eyes
## 4375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       facing
## 4376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fans
## 4377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fatalities
## 4378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       favour
## 4379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fc
## 4380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fears
## 4381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      feeding
## 4382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fellow
## 4383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     findings
## 4384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fingers
## 4385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     finished
## 4386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      flexing
## 4387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fly
## 4388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fm
## 4389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  footballers
## 4390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      forever
## 4391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forget
## 4392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       france
## 4393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        frank
## 4394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       french
## 4395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     friendly
## 4396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  frightening
## 4397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        funds
## 4398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gas
## 4399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gather
## 4400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         golf
## 4401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        grant
## 4402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        guess
## 4403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          guy
## 4404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      handled
## 4405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        heavy
## 4406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hiding
## 4407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      holding
## 4408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        holds
## 4409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 hospitalised
## 4410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         host
## 4411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hrs
## 4412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      husband
## 4413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   identified
## 4414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       images
## 4415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      imagine
## 4416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     immunity
## 4417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     imperial
## 4418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      improve
## 4419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    indonesia
## 4420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 inequalities
## 4421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     informed
## 4422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     injected
## 4423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                irresponsible
## 4424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       island
## 4425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       issued
## 4426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        it�ll
## 4427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     johnsons
## 4428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      knowing
## 4429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    knowledge
## 4430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       labour
## 4431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       larger
## 4432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      largest
## 4433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          las
## 4434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         laws
## 4435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leeds
## 4436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      letters
## 4437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lie
## 4438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lo
## 4439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         load
## 4440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    locations
## 4441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      locking
## 4442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lol
## 4443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lower
## 4444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lowest
## 4445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lunch
## 4446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           m5
## 4447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     maintain
## 4448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      manager
## 4449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      matters
## 4450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     medicine
## 4451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mention
## 4452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mess
## 4453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mi
## 4454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     midnight
## 4455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ministers
## 4456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                mismanagement
## 4457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       missed
## 4458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mother
## 4459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ms
## 4460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nasty
## 4461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    newcastle
## 4462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nicola
## 4463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nightmare
## 4464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      operate
## 4465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       packed
## 4466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pain
## 4467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parks
## 4468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      partner
## 4469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   passengers
## 4470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pathetic
## 4471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pause
## 4472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      payment
## 4473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       permit
## 4474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        photo
## 4475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     physical
## 4476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pick
## 4477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      picture
## 4478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pitch
## 4479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  politicians
## 4480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    positives
## 4481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   positivity
## 4482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  potentially
## 4483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pray
## 4484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pre
## 4485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  premiership
## 4486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      process
## 4487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    professor
## 4488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      project
## 4489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    promoting
## 4490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     properly
## 4491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prove
## 4492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quality
## 4493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        radio
## 4494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       raised
## 4495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        range
## 4496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refuse
## 4497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      release
## 4498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      remains
## 4499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     resource
## 4500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     returned
## 4501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reviewed
## 4502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rid
## 4503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rolling
## 4504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rubbish
## 4505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sage
## 4506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       saints
## 4507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sars
## 4508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       saving
## 4509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       scenes
## 4510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scientist
## 4511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    selection
## 4512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    september
## 4513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shares
## 4514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shocking
## 4515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shoots
## 4516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shopping
## 4517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shortages
## 4518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         slow
## 4519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       soccer
## 4520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sorted
## 4521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sounds
## 4522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        speak
## 4523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     specific
## 4524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     spreader
## 4525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sri
## 4526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      strange
## 4527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stricter
## 4528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stroke
## 4529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suffolk
## 4530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   suggesting
## 4531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sun
## 4532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   supporters
## 4533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     surprise
## 4534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     survived
## 4535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         swab
## 4536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        taste
## 4537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      teacher
## 4538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   technology
## 4539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        terms
## 4540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   travellers
## 4541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tunnel
## 4542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tv
## 4543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          una
## 4544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                understanding
## 4545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        utter
## 4546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        views
## 4547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        voice
## 4548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      walking
## 4549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        waste
## 4550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       weapon
## 4551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     weddings
## 4552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        weird
## 4553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    wellbeing
## 4554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        welsh
## 4555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      western
## 4556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  westminster
## 4557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        we�ll
## 4558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wight
## 4559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    workforce
## 4560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    worldwide
## 4561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        write
## 4562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         yeah
## 4563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �a
## 4564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     �covid19
## 4565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �you
## 4566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @afneil
## 4567                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @agoldsmithesq
## 4568                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @andrewlazarus4
## 4569                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @andymac84956921
## 4570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bichonatlaw
## 4571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @carlsmythe
## 4572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @charastone6
## 4573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @chrischirp
## 4574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @crabbvicki
## 4575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dcgreenzone1
## 4576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @denutrients
## 4577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @dgurdasani1
## 4578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @diederikdk
## 4579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @doritmi
## 4580                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @floraoddchild
## 4581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @frankdelia7
## 4582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ghoppe
## 4583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @gobantwo2
## 4584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @indyymac
## 4585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @kathmarval
## 4586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @kolyin
## 4587                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @lakelandwalkstalks
## 4588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @liamkav
## 4589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mamadeb
## 4590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mcfunny
## 4591                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @mchael21592783m
## 4592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mdrisette
## 4593                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @melissa94307909
## 4594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ncdave4life
## 4595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @pippacrerar
## 4596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @policinguk
## 4597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @quigleyjesse
## 4598                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @skepticalmutant
## 4599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @spookyjay36
## 4600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @stevenmosher
## 4601                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @suesue2point0
## 4602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @takethatct
## 4603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tenebra99
## 4604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tonybaduy
## 4605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #covidvariant
## 4606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #lakedistrict
## 4607                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #lakedistrictuk
## 4608                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #lateralflowtest
## 4609                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #nhsstaffingcrisis
## 4610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #r4today
## 4611                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #selfisolation
## 4612                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #socialdistance
## 4613                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #torycovidcatastrophe
## 4614                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #torycoviddisaster
## 4615                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #toryincompetence
## 4616                                                                                                                                                                                                                                                                                                                                                                                                                                                      #uk<u+0001f1ec><u+0001f1e7>jeremycorbyn
## 4617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #virtuallakes
## 4618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f44d>
## 4619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f44f>
## 4620                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f60e><u+0001f60d>
## 4621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f929>
## 4622                                                                                                                                                                                                                                                                                                                                                                                                   <u+0646><u+0627><u+062f><u+064a><u+0645><u+0627><u+0646><u+0634><u+0633><u+062a><u+0631>41
## 4623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         amid
## 4624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arsenal
## 4625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attending
## 4626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   australian
## 4627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        avoid
## 4628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      balance
## 4629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bit
## 4630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     breaking
## 4631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     business
## 4632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       called
## 4633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cancel
## 4634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      careful
## 4635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       caught
## 4636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ce
## 4637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  certificate
## 4638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      changed
## 4639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        child
## 4640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        china
## 4641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       clinic
## 4642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        close
## 4643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        colds
## 4644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    concerned
## 4645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       couple
## 4646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      created
## 4647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cup
## 4648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      current
## 4649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cut
## 4650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deadly
## 4651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deal
## 4652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     decision
## 4653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      details
## 4654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      digital
## 4655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     djokovic
## 4656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       effect
## 4657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    employers
## 4658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    essential
## 4659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        extra
## 4660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        false
## 4661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fear
## 4662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fells
## 4663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      finally
## 4664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     football
## 4665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fourth
## 4666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fuck
## 4667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gay
## 4668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   guidelines
## 4669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         head
## 4670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    headlines
## 4671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      helpful
## 4672                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/ximkq6uci1
## 4673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     infected
## 4674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        issue
## 4675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jour
## 4676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jurgen
## 4677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      keeping
## 4678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lab
## 4679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         late
## 4680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          law
## 4681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           le
## 4682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lens
## 4683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        let�s
## 4684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lies
## 4685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         list
## 4686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       losing
## 4687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      managed
## 4688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mandatory
## 4689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        march
## 4690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       matter
## 4691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        means
## 4692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     millions
## 4693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        night
## 4694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       notice
## 4695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        offer
## 4696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     original
## 4697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parties
## 4698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pass
## 4699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         past
## 4700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peace
## 4701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       period
## 4702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     petition
## 4703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pfizer
## 4704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        plans
## 4705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      players
## 4706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     politics
## 4707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         poor
## 4708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      poverty
## 4709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    professor
## 4710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        proud
## 4711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      putting
## 4712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        queen
## 4713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         real
## 4714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reality
## 4715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recently
## 4716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recovery
## 4717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reducing
## 4718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  respiratory
## 4719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    responses
## 4720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      results
## 4721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rising
## 4722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        round
## 4723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rule
## 4724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sarscov2
## 4725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         save
## 4726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        saved
## 4727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     scotland
## 4728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shit
## 4729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        short
## 4730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shot
## 4731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sick
## 4732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sites
## 4733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        smell
## 4734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        squad
## 4735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      started
## 4736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       status
## 4737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        steve
## 4738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sunday
## 4739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         talk
## 4740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thinking
## 4741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tomorrow
## 4742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        treat
## 4743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       trials
## 4744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tweet
## 4745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   understand
## 4746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         view
## 4747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      viruses
## 4748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wave
## 4749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    wednesday
## 4750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        we�re
## 4751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        words
## 4752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    yesterday
## 4753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       you�re
## 4754                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @adamboultonsky
## 4755                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @andyburnhamgm
## 4756                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @andydetective
## 4757                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @barrygardiner
## 4758                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @barrysheerman
## 4759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bbcradio4
## 4760                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bobbylennox67
## 4761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cmoengland
## 4762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @colken16
## 4763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @davidlammy
## 4764                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @dawnbutlerbrent
## 4765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @drtochi
## 4766                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @isabeloakeshott
## 4767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jeremycorbyn
## 4768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @kdully1
## 4769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @loyalfreeapp
## 4770                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @maureen6johnson
## 4771                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @michelbarnier
## 4772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mrjamesob
## 4773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nhsengland
## 4774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @oliverdowden
## 4775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @parcel2go
## 4776                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @playlistforlife
## 4777                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @premierleague
## 4778                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @rorystewartuk
## 4779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @scottories
## 4780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @skynewsbreak
## 4781                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @spursofficial
## 4782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @telegraph
## 4783                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @uktravelchannel
## 4784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @wef
## 4785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #ai
## 4786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #backto60
## 4787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #bekind
## 4788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #belfast
## 4789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #boris
## 4790                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #borishasfailedbritain
## 4791                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #boristhebutcher
## 4792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #bubble
## 4793                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covidexercise
## 4794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covidiot
## 4795                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #dailybreifing
## 4796                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #dominiccummngs
## 4797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #england
## 4798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #facemasks
## 4799                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #fridaymorning
## 4800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #hospitality
## 4801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #hr
## 4802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #htafc
## 4803                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #imecewomenscentre
## 4804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #indonesia
## 4805                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #leadershipmatters
## 4806                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #lockdownextension
## 4807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #lockdownuk
## 4808                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #londonedition
## 4809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #londonlife
## 4810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #lufc
## 4811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #management
## 4812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #newsnight
## 4813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #nhsheroes
## 4814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #pubs
## 4815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #rochdale
## 4816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #safetyfirst
## 4817                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #schoolreopening
## 4818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #schools
## 4819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #shameful
## 4820                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #smallbusiness
## 4821                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #socialdistanacing
## 4822                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #socialdistancing2020
## 4823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #spring2020
## 4824                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #stayathomesavelives
## 4825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #taketheknee
## 4826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #thisislondon
## 4827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #travel
## 4828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #travelgram
## 4829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #trump
## 4830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #vaccine
## 4831                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #voguechallenge
## 4832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #volunteering
## 4833                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #volunteersweek
## 4834                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f1e8><u+0001f1f3>
## 4835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f30d>
## 4836                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb>
## 4837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4a5>
## 4838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f5e3>
## 4839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f601>
## 4840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f606>
## 4841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f60f>
## 4842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f629>
## 4843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f923>
## 4844                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f926><u+200d><u+2642><u+fe0f>
## 4845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f92f>
## 4846                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f937><u+200d><u+2640><u+fe0f>
## 4847                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0641><u+064a>
## 4848                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0643><u+0631><u+0648><u+0646><u+0627>
## 4849                                                                                                                                                                                                                                                                                                                                                                                                     <u+0643><u+0631><u+0648><u+0646><u+0627><u+0627><u+0644><u+0643><u+0648><u+064a><u+062a>
## 4850                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0645><u+0646>
## 4851                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+2620><u+fe0f>covid19
## 4852                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+2665><u+fe0f>
## 4853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         14th
## 4854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         17th
## 4855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         22nd
## 4856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         31st
## 4857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     50swomen
## 4858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          5th
## 4859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          6th
## 4860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          8th
## 4861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       absurd
## 4862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     achieved
## 4863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        acted
## 4864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adoption
## 4865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     advisers
## 4866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    affecting
## 4867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       agreed
## 4868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alive
## 4869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    americans
## 4870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amidst
## 4871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anchorfm
## 4872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         andy
## 4873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 announcement
## 4874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         anti
## 4875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    apologise
## 4876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      appears
## 4877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  application
## 4878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 appointments
## 4879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     approved
## 4880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        argue
## 4881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 arrangements
## 4882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arrived
## 4883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arse
## 4884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         asia
## 4885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   assistance
## 4886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  association
## 4887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     audience
## 4888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    automatic
## 4889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       autumn
## 4890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       avenue
## 4891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      awesome
## 4892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         baby
## 4893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        badly
## 4894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bags
## 4895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bailey
## 4896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bald
## 4897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bastards
## 4898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beating
## 4899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       begins
## 4900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beijing
## 4901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bespoke
## 4902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bin
## 4903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bio
## 4904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blamed
## 4905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bless
## 4906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blind
## 4907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        board
## 4908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boss
## 4909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boys
## 4910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    briefings
## 4911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  brilliantly
## 4912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    broadcast
## 4913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       broken
## 4914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brutality
## 4915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bubbles
## 4916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bus
## 4917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     calendar
## 4918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cambridge
## 4919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       canada
## 4920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      capital
## 4921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       carbon
## 4922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cared
## 4923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    carefully
## 4924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      carried
## 4925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cat
## 4926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cell
## 4927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cells
## 4928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ceo
## 4929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chances
## 4930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      charges
## 4931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chest
## 4932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   children�s
## 4933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     choosing
## 4934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      clapped
## 4935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clare
## 4936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      closely
## 4937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      closing
## 4938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clown
## 4939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cold
## 4940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      collect
## 4941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      college
## 4942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   commercial
## 4943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   commitment
## 4944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    committed
## 4945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    connected
## 4946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  consequence
## 4947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 consequences
## 4948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   constantly
## 4949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 constituents
## 4950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   continuous
## 4951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contrast
## 4952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                conversations
## 4953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  cooperation
## 4954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coping
## 4955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       corbyn
## 4956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         core
## 4957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cos
## 4958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       counts
## 4959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    criminals
## 4960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cruise
## 4961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crying
## 4962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     culpable
## 4963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cultural
## 4964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      custody
## 4965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     damaging
## 4966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dangers
## 4967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dday
## 4968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        debts
## 4969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dedicated
## 4970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   dedication
## 4971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       delays
## 4972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dementia
## 4973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  demonstrate
## 4974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                demonstration
## 4975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      designs
## 4976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    desperate
## 4977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      destroy
## 4978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     detailed
## 4979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     detected
## 4980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   discharged
## 4981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   discovered
## 4982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  discussions
## 4983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     diseases
## 4984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disregard
## 4985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                disrespectful
## 4986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disrupted
## 4987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     district
## 4988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     document
## 4989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    documents
## 4990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dodgy
## 4991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     donation
## 4992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         doom
## 4993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dreadful
## 4994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       driver
## 4995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         duty
## 4996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 economically
## 4997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         edge
## 4998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    edinburgh
## 4999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       editor
## 5000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      educate
## 5001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  effectively
## 5002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          efl
## 5003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    eliminate
## 5004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        elite
## 5005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  emergencies
## 5006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     employer
## 5007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       enable
## 5008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        enemy
## 5009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      engaged
## 5010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   engagement
## 5011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    equipment
## 5012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       escape
## 5013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        est�o
## 5014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ethnicities
## 5015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         eu27
## 5016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        evils
## 5017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exclusive
## 5018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    executive
## 5019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exist
## 5020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    expecting
## 5021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      expired
## 5022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   explaining
## 5023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      explore
## 5024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exposes
## 5025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fab
## 5026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fallen
## 5027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      falling
## 5028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     farright
## 5029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fashion
## 5030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      feature
## 5031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fell
## 5032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fewer
## 5033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fiasco
## 5034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        final
## 5035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     finances
## 5036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  financially
## 5037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fingers
## 5038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       finish
## 5039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        floor
## 5040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     focusing
## 5041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    followers
## 5042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     foodbank
## 5043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forgot
## 5044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fridge
## 5045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      friston
## 5046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fuel
## 5047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      funeral
## 5048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  gaslighting
## 5049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gates
## 5050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gift
## 5051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gilead
## 5052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         girl
## 5053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gloves
## 5054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gmb
## 5055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  goalkeeping
## 5056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      goodbye
## 5057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      grandad
## 5058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       grants
## 5059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grip
## 5060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      grounds
## 5061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grow
## 5062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    guarantee
## 5063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     guernsey
## 5064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       guests
## 5065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hair
## 5066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        handy
## 5067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        harms
## 5068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        heavy
## 5069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     heritage
## 5070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  highlighted
## 5071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hitting
## 5072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hivaids
## 5073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hole
## 5074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        holes
## 5075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       honour
## 5076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     horrific
## 5077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 hospitalised
## 5078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hotspots
## 5079                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/fukv0gmbqm
## 5080                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/vkwed0d8hu
## 5081                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/wuobubag9o
## 5082                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/zqj8qz20rs
## 5083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hurry
## 5084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ice
## 5085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     identity
## 5086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ikea
## 5087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  immediately
## 5088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    implement
## 5089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     improved
## 5090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   incredibly
## 5091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ineptitude
## 5092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inevitable
## 5093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    infecting
## 5094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   infectious
## 5095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      initial
## 5096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inspired
## 5097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    inspiring
## 5098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     instance
## 5099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                interventions
## 5100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   invaluable
## 5101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ironic
## 5102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      israeli
## 5103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      italian
## 5104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         item
## 5105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          itv
## 5106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      january
## 5107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         juan
## 5108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jump
## 5109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         karl
## 5110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lane
## 5111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          las
## 5112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     launches
## 5113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         laws
## 5114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leads
## 5115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leagues
## 5116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       leaves
## 5117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       legacy
## 5118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lesson
## 5119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         liar
## 5120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lifted
## 5121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lifting
## 5122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lines
## 5123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lo
## 5124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     location
## 5125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      looting
## 5126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lords
## 5127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       losses
## 5128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        loves
## 5129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lucena
## 5130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lung
## 5131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      machine
## 5132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  maintenance
## 5133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mandate
## 5134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 manufactured
## 5135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          map
## 5136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      markets
## 5137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    massively
## 5138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      matches
## 5139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     material
## 5140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mayors
## 5141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     meetings
## 5142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meter
## 5143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       meters
## 5144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mid
## 5145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     midnight
## 5146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     migrants
## 5147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mile
## 5148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    milestone
## 5149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mindless
## 5150                                                                                                                                                                                                                                                                                                                                                                                                                                                                               misinformation
## 5151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                mismanagement
## 5152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mission
## 5153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mistake
## 5154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mode
## 5155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    modelling
## 5156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     momentum
## 5157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mon
## 5158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mortgage
## 5159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       muslim
## 5160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    narrative
## 5161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    naturally
## 5162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     navigate
## 5163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nicola
## 5164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nike
## 5165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nonsense
## 5166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         norm
## 5167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     normandy
## 5168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      norwich
## 5169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    observing
## 5170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     occurred
## 5171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       offers
## 5172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    officials
## 5173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          of�
## 5174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          omg
## 5175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          on�
## 5176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       orange
## 5177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         our�
## 5178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        owner
## 5179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      package
## 5180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pain
## 5181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        paint
## 5182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pandemics
## 5183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        panic
## 5184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 participants
## 5185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      passing
## 5186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pathetic
## 5187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     payments
## 5188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        penny
## 5189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      persona
## 5190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pgl
## 5191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          phe
## 5192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       picked
## 5193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      picking
## 5194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pity
## 5195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      playing
## 5196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pleasure
## 5197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       plenty
## 5198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     policing
## 5199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       portal
## 5200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  postcovid19
## 5201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     postpone
## 5202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        powys
## 5203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    practical
## 5204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prefer
## 5205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pregnant
## 5206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    premature
## 5207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  preparation
## 5208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                presentations
## 5209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prize
## 5210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  procurement
## 5211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      product
## 5212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       profit
## 5213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      profits
## 5214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   programmes
## 5215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    protocols
## 5216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       proved
## 5217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     publicly
## 5218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        queen
## 5219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                questionnaire
## 5220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        queue
## 5221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quiet
## 5222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       racial
## 5223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        radio
## 5224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rage
## 5225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rally
## 5226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reach
## 5227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    receiving
## 5228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  recognising
## 5229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  recommended
## 5230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      records
## 5231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   recovering
## 5232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recovers
## 5233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reflection
## 5234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     refusing
## 5235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     regional
## 5236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      relaxed
## 5237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       remind
## 5238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reminded
## 5239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reputation
## 5240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     requires
## 5241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   respecting
## 5242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  respiratory
## 5243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   restarting
## 5244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       retail
## 5245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rethink
## 5246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      returns
## 5247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      retweet
## 5248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rich
## 5249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rightly
## 5250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ripped
## 5251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rishi
## 5252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      risking
## 5253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       robert
## 5254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       robust
## 5255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rochdale
## 5256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rubbish
## 5257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rumours
## 5258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 safeguarding
## 5259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        salon
## 5260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sanity
## 5261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        scale
## 5262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         scan
## 5263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       scared
## 5264                                                                                                                                                                                                                                                                                                                                                                                                                                                                               scaremongering
## 5265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        scots
## 5266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    searching
## 5267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sensitive
## 5268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        serco
## 5269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      serving
## 5270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shameless
## 5271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shield
## 5272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shortfall
## 5273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shot
## 5274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sister
## 5275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         size
## 5276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      slavery
## 5277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        slump
## 5278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       smiles
## 5279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sofa
## 5280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         song
## 5281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  southampton
## 5282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    southwark
## 5283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   spectators
## 5284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        speed
## 5285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       starts
## 5286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     startups
## 5287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stating
## 5288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      station
## 5289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    statistic
## 5290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stickers
## 5291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       strain
## 5292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stranded
## 5293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      strikes
## 5294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stripped
## 5295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     struggle
## 5296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    struggled
## 5297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      studios
## 5298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    stupidity
## 5299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suddenly
## 5300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suffered
## 5301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    suggested
## 5302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       superb
## 5303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  supermarket
## 5304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    supporter
## 5305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  surgisphere
## 5306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     surprise
## 5307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     survival
## 5308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    surviving
## 5309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  symptomatic
## 5310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tackling
## 5311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     targeted
## 5312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        taxes
## 5313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        teach
## 5314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tees
## 5315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tens
## 5316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tesco
## 5317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         text
## 5318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   thankfully
## 5319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thankyou
## 5320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thousand
## 5321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        title
## 5322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         todo
## 5323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       toilet
## 5324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    tomorrows
## 5325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tony
## 5326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      traders
## 5327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      traffic
## 5328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trans
## 5329                                                                                                                                                                                                                                                                                                                                                                                                                                                                               transformation
## 5330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tribute
## 5331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trips
## 5332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      trusted
## 5333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tweeted
## 5334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          una
## 5335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 unacceptable
## 5336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 unbelievable
## 5337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   underlying
## 5338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  understands
## 5339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   understood
## 5340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unique
## 5341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unsung
## 5342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unwell
## 5343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vaccines
## 5344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     valuable
## 5345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vandalism
## 5346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       venues
## 5347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      version
## 5348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      visited
## 5349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       visits
## 5350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wars
## 5351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      washing
## 5352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wealthy
## 5353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        weird
## 5354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        welsh
## 5355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wheel
## 5356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      where�s
## 5357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wine
## 5358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wishing
## 5359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      women�s
## 5360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    workplace
## 5361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      worries
## 5362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       writes
## 5363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wrote
## 5364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wtf
## 5365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wuhan
## 5366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         yeah
## 5367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    yorkshire
## 5368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         you�
## 5369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           yr
## 5370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          zoo
## 5371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �1k
## 5372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �a
## 5373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �if
## 5374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @adamhamdy
## 5375                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ashish30sharma
## 5376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @breesanna
## 5377                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @britishairways
## 5378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @dailymailuk
## 5379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @fmwales
## 5380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @grantshapps
## 5381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @guardian
## 5382                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @heathrowairport
## 5383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @itvnews
## 5384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jeanef1msp
## 5385                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @kingstonhospnhs
## 5386                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @marksandspencer
## 5387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @neunion
## 5388                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @nhscovid19app
## 5389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nhsmillion
## 5390                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @paceychildcare
## 5391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @peston
## 5392                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @peterstefanovi2
## 5393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @pfizer
## 5394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @royalfamily
## 5395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @royalfreenhs
## 5396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @telegraph
## 5397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @twitter
## 5398                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @virginatlantic
## 5399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #ampthill
## 5400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #balham
## 5401                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #breastfeedingmom
## 5402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #business
## 5403                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #generalpractice
## 5404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #hope
## 5405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #iom
## 5406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #nufc
## 5407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #pfizer
## 5408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #scam
## 5409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #tier5
## 5410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #tooting
## 5411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #uklockdown
## 5412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #vaccines
## 5413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #yoga
## 5414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f3e1>
## 5415                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f449><u+0001f3fb>
## 5416                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f44d><u+0001f3fb>
## 5417                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f44f><u+0001f3fc>
## 5418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f534>
## 5419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f601>
## 5420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f606>
## 5421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f629>
## 5422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f91d>
## 5423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f91e>
## 5424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f923>
## 5425                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f937><u+200d><u+2642><u+fe0f>
## 5426                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+260e><u+fe0f>
## 5427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+274c>no
## 5428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         11th
## 5429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          2pm
## 5430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          4am
## 5431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          6th
## 5432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       absent
## 5433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        abuse
## 5434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      actions
## 5435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     addition
## 5436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adhere
## 5437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        admin
## 5438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   administer
## 5439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ae
## 5440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aged
## 5441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ah
## 5442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alive
## 5443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alright
## 5444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amount
## 5445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       annual
## 5446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     answered
## 5447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 arrangements
## 5448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     articles
## 5449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arts
## 5450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         asda
## 5451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  association
## 5452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       asthma
## 5453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     attended
## 5454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attending
## 5455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    avoidable
## 5456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      awarded
## 5457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       babies
## 5458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   background
## 5459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    beautiful
## 5460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 bedfordshire
## 5461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bending
## 5462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   birmingham
## 5463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     birthday
## 5464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    blackpool
## 5465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blamed
## 5466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blaming
## 5467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bless
## 5468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bodies
## 5469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bored
## 5470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bought
## 5471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boys
## 5472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brain
## 5473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brand
## 5474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       breath
## 5475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    briefings
## 5476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        build
## 5477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cabinet
## 5478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cancel
## 5479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         card
## 5480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cat
## 5481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      causing
## 5482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cdc
## 5483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  celebrating
## 5484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  challenging
## 5485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      charity
## 5486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       checks
## 5487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cherry
## 5488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chest
## 5489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 childminders
## 5490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chinese
## 5491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    civilians
## 5492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       client
## 5493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      climate
## 5494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cloths
## 5495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cluster
## 5496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    colleague
## 5497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      comfort
## 5498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    condition
## 5499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      conduct
## 5500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    conducted
## 5501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    confident
## 5502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 consequences
## 5503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   consultant
## 5504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    contacted
## 5505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   controlled
## 5506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     councils
## 5507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      counted
## 5508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      counter
## 5509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        court
## 5510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cover
## 5511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     coverage
## 5512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    covidiots
## 5513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cross
## 5514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      croydon
## 5515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      crucial
## 5516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         damn
## 5517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dealing
## 5518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dealt
## 5519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     declares
## 5520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decline
## 5521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deep
## 5522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deeply
## 5523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       defeat
## 5524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      delayed
## 5525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   deliveries
## 5526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    denialism
## 5527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    departure
## 5528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        derby
## 5529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    desperate
## 5530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     detected
## 5531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   devastated
## 5532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      develop
## 5533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dialysis
## 5534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 disappointed
## 5535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                disappointing
## 5536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     donating
## 5537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       driven
## 5538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        drugs
## 5539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         easy
## 5540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         echo
## 5541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    educators
## 5542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  effectively
## 5543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     eligible
## 5544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    eliminate
## 5545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     emerging
## 5546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    encourage
## 5547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     endorsed
## 5548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        enjoy
## 5549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      enquiry
## 5550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  environment
## 5551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    equipment
## 5552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           es
## 5553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        est�n
## 5554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     everyday
## 5555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         evil
## 5556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exact
## 5557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      existed
## 5558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     explains
## 5559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     extended
## 5560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fabulous
## 5561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     facebook
## 5562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fail
## 5563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      failure
## 5564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fall
## 5565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        feels
## 5566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fever
## 5567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ffs
## 5568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         film
## 5569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      finding
## 5570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fitness
## 5571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         folk
## 5572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    followers
## 5573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fourth
## 5574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      funeral
## 5575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        girls
## 5576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gloves
## 5577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      goahead
## 5578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         goal
## 5579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gov
## 5580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       grants
## 5581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grim
## 5582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ground
## 5583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grow
## 5584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       growth
## 5585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         halt
## 5586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       handle
## 5587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hassle
## 5588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     headache
## 5589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         held
## 5590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hits
## 5591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     holidays
## 5592                                                                                                                                                                                                                                                                                                                                                                                                                                                                              hospitalisation
## 5593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  hospitality
## 5594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 hospitalized
## 5595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hot
## 5596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hotel
## 5597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    household
## 5598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   households
## 5599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      housing
## 5600                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/icainwewia
## 5601                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/il8myqmatt
## 5602                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/kvd5dt9wpk
## 5603                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/pavr4hsndq
## 5604                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/pxaybm9d6x
## 5605                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/x1eelxgeqy
## 5606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hugely
## 5607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hugs
## 5608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ice
## 5609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ideas
## 5610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        idiot
## 5611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ignore
## 5612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    illnesses
## 5613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      impacts
## 5614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 implications
## 5615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     improved
## 5616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  incompetent
## 5617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       indoor
## 5618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ineffective
## 5619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inevitable
## 5620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       infect
## 5621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   infectious
## 5622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       inform
## 5623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  informative
## 5624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ini
## 5625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     innocent
## 5626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inperson
## 5627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       inside
## 5628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      insight
## 5629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    interview
## 5630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                investigation
## 5631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     irelands
## 5632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        irish
## 5633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jcvi
## 5634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    johnson�s
## 5635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         june
## 5636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     language
## 5637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lanka
## 5638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        laugh
## 5639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     launched
## 5640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       learnt
## 5641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leisure
## 5642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      letting
## 5643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lifted
## 5644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lines
## 5645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       linked
## 5646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   liverpools
## 5647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      locally
## 5648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       locked
## 5649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    logistics
## 5650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       looked
## 5651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lose
## 5652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        loves
## 5653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lung
## 5654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lying
## 5655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mais
## 5656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     margaret
## 5657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      married
## 5658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     meantime
## 5659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      measure
## 5660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       metres
## 5661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     minority
## 5662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mistake
## 5663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        model
## 5664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mouth
## 5665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        moves
## 5666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        music
## 5667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mutations
## 5668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    narrative
## 5669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                neighbourhood
## 5670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  nightingale
## 5671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nights
## 5672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      norfolk
## 5673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nose
## 5674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nursery
## 5675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   officially
## 5676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         olds
## 5677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          omg
## 5678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ons
## 5679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  operational
## 5680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   operations
## 5681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     opposite
## 5682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   opposition
## 5683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       option
## 5684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    outbreaks
## 5685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      outlets
## 5686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     overcome
## 5687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     overseas
## 5688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      package
## 5689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pandemi
## 5690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        panel
## 5691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  participate
## 5692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parties
## 5693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      patrols
## 5694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pcn
## 5695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peace
## 5696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      penalty
## 5697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   percentage
## 5698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pero
## 5699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  perspective
## 5700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pharmacy
## 5701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         phew
## 5702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   physically
## 5703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       picked
## 5704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      playing
## 5705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pointless
## 5706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       posted
## 5707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     powerful
## 5708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       powers
## 5709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       praise
## 5710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pregnant
## 5711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prepare
## 5712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   prevention
## 5713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        price
## 5714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pro
## 5715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     promised
## 5716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        proof
## 5717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       proper
## 5718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     property
## 5719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   proportion
## 5720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     provider
## 5721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    providers
## 5722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pub
## 5723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     purchase
## 5724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pushing
## 5725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quarter
## 5726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rapidly
## 5727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rare
## 5728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    realising
## 5729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reasons
## 5730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   recipients
## 5731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recovered
## 5732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          red
## 5733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reduction
## 5734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   referendum
## 5735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       region
## 5736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     relative
## 5737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reliable
## 5738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    remaining
## 5739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  remembering
## 5740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     remotely
## 5741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      removed
## 5742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reopening
## 5743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  requirement
## 5744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      respond
## 5745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   responding
## 5746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  restriction
## 5747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      retired
## 5748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rishi
## 5749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      risking
## 5750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sat
## 5751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        saved
## 5752                                                                                                                                                                                                                                                                                                                                                                                                                                                                               scaremongering
## 5753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    schooling
## 5754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        scots
## 5755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sea
## 5756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sending
## 5757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      serving
## 5758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      setting
## 5759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shambles
## 5760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shameful
## 5761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sheer
## 5762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shouldn�t
## 5763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      signing
## 5764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    singapore
## 5765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         size
## 5766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sobering
## 5767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      society
## 5768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sound
## 5769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sources
## 5770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spoke
## 5771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spot
## 5772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stadium
## 5773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stanley
## 5774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stark
## 5775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       starts
## 5776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   statements
## 5777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stories
## 5778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      strains
## 5779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      studied
## 5780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sturgeon
## 5781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      success
## 5782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sunak
## 5783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suppose
## 5784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    suspended
## 5785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  symptomless
## 5786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tablets
## 5787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tackling
## 5788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     targeted
## 5789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    telephone
## 5790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  temporarily
## 5791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    temporary
## 5792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        texts
## 5793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thousand
## 5794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tickets
## 5795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tighter
## 5796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       timely
## 5797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tonights
## 5798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tool
## 5799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      torfaen
## 5800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     touching
## 5801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      traders
## 5802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      trading
## 5803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     transfer
## 5804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trees
## 5805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tribute
## 5806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         type
## 5807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        union
## 5808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unions
## 5809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        units
## 5810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unpaid
## 5811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unwell
## 5812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ur
## 5813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        urged
## 5814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       urgent
## 5815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        usual
## 5816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   vaccinator
## 5817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ventilation
## 5818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        venue
## 5819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        villa
## 5820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    virtually
## 5821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      visited
## 5822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vitamin
## 5823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wanna
## 5824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         warm
## 5825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      weather
## 5826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wide
## 5827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wild
## 5828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       window
## 5829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      winning
## 5830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wishes
## 5831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wishing
## 5832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    workplace
## 5833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       worlds
## 5834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         worn
## 5835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      worries
## 5836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        worry
## 5837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      writing
## 5838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          yep
## 5839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         york
## 5840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �covid
## 5841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �i
## 5842                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @anthonysop888
## 5843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @anyahoho1
## 5844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @brockkrause
## 5845                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @campbellclaret
## 5846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @chickaboy
## 5847                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @conservatives
## 5848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @coralblob
## 5849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dodirains
## 5850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @estespga
## 5851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @factode305
## 5852                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @garywat68381491
## 5853                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jacksoncarlaw
## 5854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jawkneefaiv
## 5855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @joehodgson0
## 5856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mally308
## 5857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mickusdickus
## 5858                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @monstercoyliar
## 5859                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @nhsenglandldn
## 5860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @prolarva
## 5861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @provaxtexan
## 5862                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @renfieldthomas
## 5863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @skynews
## 5864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @smyl2day
## 5865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @thetimes
## 5866                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @wendylynnette
## 5867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @zaynjaffer
## 5868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #fell
## 5869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #indvssa
## 5870                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #johnsonmustresign
## 5871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #lakes
## 5872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #lft
## 5873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #lufc
## 5874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #mask
## 5875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #nnn
## 5876                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #nomorelockdowns
## 5877                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #novakdjokovic
## 5878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #omnicron
## 5879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #pcrtest
## 5880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #scotland
## 5881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #uk
## 5882                                                                                                                                                                                                                                                                                                                                                                                                                                                         #usa<u+0001f1fa><u+0001f1f2>joebiden
## 5883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          +ve
## 5884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f489>
## 5885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f517>
## 5886                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f64f><u+0001f4f8><u+26f0>
## 5887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f914>
## 5888                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0627><u+0644><u+0645><u+0635><u+062f><u+0631>
## 5889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+2705>
## 5890                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+27a1><u+fe0f>
## 5891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ability
## 5892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       access
## 5893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      account
## 5894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     accurate
## 5895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   additional
## 5896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       advice
## 5897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       affect
## 5898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alive
## 5899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     announce
## 5900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  appointment
## 5901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       area�s
## 5902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       attack
## 5903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                authoritarian
## 5904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        awful
## 5905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         baby
## 5906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        basis
## 5907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         beat
## 5908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 bedfordshire
## 5909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    beginning
## 5910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blame
## 5911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         body
## 5912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     boosting
## 5913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cabinet
## 5914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       camera
## 5915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      capital
## 5916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        carry
## 5917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   challenged
## 5918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  challenging
## 5919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    christmas
## 5920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coming
## 5921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     complete
## 5922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      concern
## 5923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   confidence
## 5924                                                                                                                                                                                                                                                                                                                                                                                                                                                                              congratulations
## 5925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     constant
## 5926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   constantly
## 5927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     continue
## 5928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    continued
## 5929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contracted
## 5930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      control
## 5931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        court
## 5932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     covid19�
## 5933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         date
## 5934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dear
## 5935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       debate
## 5936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     december
## 5937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    deltacron
## 5938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    detecting
## 5939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disruption
## 5940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       double
## 5941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        drugs
## 5942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      earlier
## 5943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      economy
## 5944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    emergency
## 5945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    employees
## 5946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           en
## 5947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     entering
## 5948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        entry
## 5949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          est
## 5950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      evening
## 5951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       excuse
## 5952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exist
## 5953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   experience
## 5954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      experts
## 5955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     explains
## 5956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       failed
## 5957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      failure
## 5958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fears
## 5959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        field
## 5960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fighting
## 5961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fixture
## 5962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         flat
## 5963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       flight
## 5964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         folk
## 5965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      foundry
## 5966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       future
## 5967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  governments
## 5968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        grant
## 5969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     grateful
## 5970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        green
## 5971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         guns
## 5972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         guys
## 5973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         half
## 5974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hands
## 5975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       happen
## 5976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    happening
## 5977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hard
## 5978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   healthcare
## 5979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         he�s
## 5980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hiding
## 5981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       highly
## 5982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      history
## 5983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hold
## 5984                                                                                                                                                                                                                                                                                                                                                                                                                                                                              hospitalisation
## 5985                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/o6oai4g8vw
## 5986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   impossible
## 5987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   individual
## 5988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   infectious
## 5989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    influenza
## 5990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         info
## 5991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inquiry
## 5992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                irresponsible
## 5993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        isn�t
## 5994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      isolate
## 5995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        javid
## 5996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        learn
## 5997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          led
## 5998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       listen
## 5999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    literally
## 6000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       living
## 6001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lockdowns
## 6002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lot
## 6003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       malone
## 6004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      manager
## 6005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       market
## 6006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mental
## 6007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       milder
## 6008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      missing
## 6009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mortality
## 6010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         move
## 6011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mp
## 6012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mps
## 6013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mum
## 6014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nurse
## 6015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      october
## 6016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      olympic
## 6017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      opposed
## 6018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         park
## 6019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        phone
## 6020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      playing
## 6021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pregnant
## 6022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     previous
## 6023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prior
## 6024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       proper
## 6025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    published
## 6026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reading
## 6027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reasons
## 6028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recorded
## 6029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      records
## 6030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refuse
## 6031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      remains
## 6032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       resign
## 6033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  responsible
## 6034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rest
## 6035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ride
## 6036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rights
## 6037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sad
## 6038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       safely
## 6039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sajid
## 6040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scientist
## 6041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     scottish
## 6042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       scunny
## 6043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                selfisolation
## 6044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          set
## 6045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shame
## 6046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shameful
## 6047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        share
## 6048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  significant
## 6049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      similar
## 6050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      society
## 6051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          son
## 6052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       source
## 6053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                statistically
## 6054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stats
## 6055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stopped
## 6056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       strain
## 6057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       street
## 6058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   struggling
## 6059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suggests
## 6060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       surely
## 6061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        taste
## 6062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thailand
## 6063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       threat
## 6064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       throat
## 6065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tonight
## 6066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      totally
## 6067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tourism
## 6068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    transport
## 6069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trial
## 6070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      twitter
## 6071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        urged
## 6072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          usa
## 6073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         visa
## 6074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        white
## 6075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    worldwide
## 6076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wuhan
## 6077                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @2351onthelist
## 6078                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @aatkinson1962
## 6079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @afneil
## 6080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @aldiuk
## 6081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @alfiewm
## 6082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @amhni
## 6083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @audiokid3
## 6084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @axa
## 6085                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bagginsgsx1250
## 6086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @bbc
## 6087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bbcbreakfast
## 6088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bbcpolitics
## 6089                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bbcscotlandnews
## 6090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bbcsport
## 6091                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bellesareblue
## 6092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bigbhoy18881
## 6093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bobbofitz
## 6094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @brianwhit
## 6095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @catmckinnell
## 6096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @chriscjd
## 6097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cmjdiff
## 6098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cmshehbaz
## 6099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cnoengland
## 6100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @colinmair3
## 6101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @craig1
## 6102                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cybernatstoker
## 6103                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @darksideodunoon
## 6104                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @davidallengreen
## 6105                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @davidrmackinnon
## 6106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @dfiduk
## 6107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dodiegale
## 6108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @eaenergyeu
## 6109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @edglasgow59
## 6110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @edyong209
## 6111                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @electionmapsuk
## 6112                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @fawadchaudhry
## 6113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @feroxbill1
## 6114                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @forgottenpaye
## 6115                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @francis92802166
## 6116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @frasernelson
## 6117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @fsbpolicy
## 6118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @garylineker
## 6119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @grantshapps
## 6120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @hocpetitions
## 6121                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @holstravelmore
## 6122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @iainb56
## 6123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ianabne
## 6124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @imrankhanpti
## 6125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @itv
## 6126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @jc674
## 6127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jeremyhunt
## 6128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @jim1jas
## 6129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jthomsonjohn
## 6130                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @juantu81993858
## 6131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @katbee123
## 6132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @kayburley
## 6133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @keithrsteele
## 6134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ladysandison
## 6135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lordsugar
## 6136                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mancitycouncil
## 6137                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mattuthompson
## 6138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @meiodymac
## 6139                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @metromayorsteve
## 6140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @mhclg
## 6141                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mhdtcommunity
## 6142                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @misssbennett88
## 6143                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mrmackjack2905
## 6144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @nejm
## 6145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @nhspbank
## 6146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nhssoutheast
## 6147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nigelfarage
## 6148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nmcnews
## 6149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @nod641
## 6150                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @northofthecrap
## 6151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @notbowditch
## 6152                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @notinmy45877876
## 6153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @ons
## 6154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @peteonone
## 6155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @picsociety
## 6156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @pwcuks
## 6157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rachelburden
## 6158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @rfc477
## 6159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @rggoobi
## 6160                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @robertjenrick
## 6161                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @robertk44648171
## 6162                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @robinswannmoh
## 6163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ryanair
## 6164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ryescot1012
## 6165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sammyboy1610
## 6166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @saperevivere
## 6167                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @sarahho68914659
## 6168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @scotfax
## 6169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @scottishfa
## 6170                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @screamnevermore
## 6171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @shahedahmad
## 6172                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @shellretallick
## 6173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @snoozlessnow
## 6174                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @snpiscultlike
## 6175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @stephennolan
## 6176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @sterling7
## 6177                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @steveja89368890
## 6178                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @stevenm95164330
## 6179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @stewartnial
## 6180                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @stjohnambulance
## 6181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @stueyphooey
## 6182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sturdyalex
## 6183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @stvnews
## 6184                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @sunshineonleith
## 6185                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @susannareid100
## 6186                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @suzanneevans1
## 6187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tara61711
## 6188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @tesco
## 6189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @thelamexcat
## 6190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @thelancet
## 6191                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @toryboypierce
## 6192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ulsteruni
## 6193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @votesnpout
## 6194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @weemacdonald
## 6195                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @williammacfly
## 6196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @yougov
## 6197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @zepp4321
## 6198                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #agratefulheart
## 6199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #andreswiesse
## 6200                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #anesthesiologists
## 6201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #bbcfootball
## 6202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #birmingham
## 6203                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #blackandproud
## 6204                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #blackexcellence
## 6205                                                                                                                                                                                                                                                                                                                                                                                                                #blacklivesmatter<u+270a><u+0001f3fd><u+270a><u+0001f3fe><u+270a><u+0001f3ff>
## 6206                                                                                                                                                                                                                                                                                                                                                                                                                                                        #blacklivesmatter<u+270a><u+0001f3fe>
## 6207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #blacklove
## 6208                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #blackpinkiscoming
## 6209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #blmuk
## 6210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #brazil
## 6211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #brexit
## 6212                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #brexitextension
## 6213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #carersweek
## 6214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #cat
## 6215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #cats
## 6216                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #catsofinstagram
## 6217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #children
## 6218                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #collaboration
## 6219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #colour
## 6220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #covididiots
## 6221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #covidiots
## 6222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #cpd
## 6223                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #cummingsmustgo
## 6224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #cycling
## 6225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #design
## 6226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #edinburgh
## 6227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #eu
## 6228                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #everydayobjectschallenge
## 6229                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #extendmaternityleave
## 6230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #facemask
## 6231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #fathersday
## 6232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #fleets
## 6233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #food
## 6234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #foodbank
## 6235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #glasgow
## 6236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #gtto
## 6237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #holidayhomes
## 6238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #homelessness
## 6239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #isolation
## 6240                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #juliusmalemamustfall
## 6241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #keyworker
## 6242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #koronavir�s�
## 6243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #learning
## 6244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #leftbehind
## 6245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #local
## 6246                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #lockdowngames
## 6247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #lockdownlife
## 6248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #logistics
## 6249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #manchester
## 6250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #marr
## 6251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #meded
## 6252                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #mondaymotivation
## 6253                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #nevermoreneeded
## 6254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #newzealand
## 6255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #nmc
## 6256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #nursing
## 6257                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #protectthenhs
## 6258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #protest
## 6259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #publichealth
## 6260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #quarantine
## 6261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #reopening
## 6262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #resign
## 6263                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #returntonursing
## 6264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #rub
## 6265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #safety
## 6266                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #salvationarmy
## 6267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #secondwave
## 6268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #shielding
## 6269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #spring
## 6270                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #stayhomestaysafe
## 6271                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #streetspaceldn
## 6272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #sundarpichai
## 6273                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #toriesliepeopledie
## 6274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #torygenocide
## 6275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #transport
## 6276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #travelsafely
## 6277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #ukgovernment
## 6278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #uklockdown
## 6279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #volunteers
## 6280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #whatami
## 6281                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #workingsafely
## 6282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #workright
## 6283                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #worldenvironmentday2020
## 6284                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f1fa><u+0001f1f8>
## 6285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f30e>
## 6286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f440>
## 6287                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f447><u+0001f3fb>
## 6288                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f447><u+0001f3fd>
## 6289                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f44d><u+0001f3fb>
## 6290                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f44f><u+0001f3fc><u+0001f44f><u+0001f3fc><u+0001f44f><u+0001f3fc>
## 6291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f493>
## 6292                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f499><u+0001f308>
## 6293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f49b>
## 6294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f49e>
## 6295                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f4a5><u+0001f697>
## 6296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4fb>
## 6297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f50a>
## 6298                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f602><u+0001f602><u+0001f602>
## 6299                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f60e><u+0001f60d>lakedistrict
## 6300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f618>
## 6301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f61e>
## 6302                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f64c><u+0001f3fb>
## 6303                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f64f><u+0001f64f>
## 6304                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f69b><u+0001f69b><u+0001f69b><u+0001f69b><u+0001f69b><u+0001f69b><u+0001f69b>
## 6305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f91d>
## 6306                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f91e><u+0001f3fb>
## 6307                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f926><u+0001f3fb><u+200d><u+2640><u+fe0f>
## 6308                                                                                                                                                                                                                                                                                                                                                                     <u+0627><u+0644><u+062a><u+0633><u+0639><u+064a><u+0631><u+0629><u+0627><u+0644><u+062c><u+062f><u+064a><u+062f><u+0629>
## 6309                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0627><u+0644><u+062f><u+062d><u+064a><u+062d>
## 6310                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0627><u+0644><u+0635><u+0644><u+0639>
## 6311                                                                                                                                                                                                                                                                                                                                                                                     <u+0627><u+0644><u+0646><u+0633><u+0648><u+0627><u+0646><u+0627><u+0644><u+062d><u+0644><u+0648><u+0647>
## 6312                                                                                                                                                                                                                                                                                                                                                                                                     <u+062d><u+0633><u+0627><u+0628><u+0627><u+0644><u+0645><u+0648><u+0627><u+0637><u+0646>
## 6313                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+062f><u+0631><u+0627><u+0633><u+0629>
## 6314                                                                                                                                                                                                                                                                                                                                                                                                     <u+0643><u+0631><u+0648><u+0646><u+0627><u+0627><u+0644><u+062c><u+062f><u+064a><u+062f>
## 6315                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+263a><u+fe0f>
## 6316                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+2935><u+fe0f>
## 6317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    |lockdown
## 6318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       1000am
## 6319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        1000s
## 6320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         20th
## 6321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         21st
## 6322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         23rd
## 6323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        24hrs
## 6324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       365dni
## 6325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           5g
## 6326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          7pm
## 6327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          9th
## 6328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aaron
## 6329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    abandoned
## 6330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    abhorrent
## 6331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       abroad
## 6332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      abusing
## 6333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     academic
## 6334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     accepted
## 6335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       acting
## 6336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    activists
## 6337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   activities
## 6338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ad
## 6339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adding
## 6340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    addressed
## 6341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adds
## 6342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adhere
## 6343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      advance
## 6344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    adventure
## 6345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  advertising
## 6346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      advised
## 6347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      african
## 6348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     agencies
## 6349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ages
## 6350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   aggressive
## 6351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        agora
## 6352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ahmad
## 6353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ahora
## 6354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     aigburth
## 6355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     airports
## 6356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aka
## 6357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       allied
## 6358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alot
## 6359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          amp
## 6360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anfield
## 6361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     annoying
## 6362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    apologies
## 6363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       appeal
## 6364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     appeared
## 6365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     argument
## 6366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arms
## 6367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arrange
## 6368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arrests
## 6369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arrival
## 6370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      artwork
## 6371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aspirin
## 6372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       assume
## 6373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       asylum
## 6374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     attacked
## 6375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attacking
## 6376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   attendance
## 6377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     avoiding
## 6378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       awards
## 6379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           b4
## 6380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     backbone
## 6381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bahria
## 6382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      barnard
## 6383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     barriers
## 6384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bars
## 6385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bat
## 6386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     battling
## 6387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bay
## 6388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       beaten
## 6389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       beauty
## 6390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bed
## 6391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        begin
## 6392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        berks
## 6393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         beth
## 6394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bihar
## 6395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bills
## 6396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   biomedical
## 6397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bj
## 6398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blair
## 6399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     blessing
## 6400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bloke
## 6401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bmj
## 6402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boat
## 6403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         body
## 6404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bollocks
## 6405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bone
## 6406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bonkers
## 6407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bookings
## 6408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        books
## 6409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boom
## 6410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      borders
## 6411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bottle
## 6412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bottom
## 6413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bought
## 6414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bounce
## 6415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bouncing
## 6416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          boy
## 6417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bradford
## 6418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brain
## 6419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brains
## 6420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brave
## 6421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    breakdown
## 6422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    breathing
## 6423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brewing
## 6424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brick
## 6425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bridges
## 6426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bro
## 6427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    broadband
## 6428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     brothers
## 6429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bubble�
## 6430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        built
## 6431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bullshit
## 6432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       buying
## 6433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bye
## 6434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    campaigns
## 6435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 cancellation
## 6436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     captures
## 6437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cardiff
## 6438                                                                                                                                                                                                                                                                                                                                                                                                                                                                             cardiovasculares
## 6439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cartoon
## 6440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cast
## 6441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      catches
## 6442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   categories
## 6443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cc
## 6444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ce
## 6445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cenotaph
## 6446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       center
## 6447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   chancellor
## 6448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chaotic
## 6449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      charles
## 6450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chatting
## 6451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     checkout
## 6452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       checks
## 6453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cheered
## 6454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chef
## 6455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chester
## 6456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chicken
## 6457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chilling
## 6458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chinese
## 6459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    christmas
## 6460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cinema
## 6461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        civic
## 6462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        civil
## 6463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     claiming
## 6464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   clinicians
## 6465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     closures
## 6466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         clue
## 6467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        coach
## 6468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      coaches
## 6469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        coast
## 6470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   collecting
## 6471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   collective
## 6472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      colours
## 6473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      comfort
## 6474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    competent
## 6475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   compliance
## 6476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       comply
## 6477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   compulsory
## 6478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  concentrate
## 6479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     concerts
## 6480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   condemning
## 6481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      condone
## 6482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    conducted
## 6483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  conferencia
## 6484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     confused
## 6485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cons
## 6486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   considered
## 6487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    considers
## 6488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 construction
## 6489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                consultations
## 6490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contacting
## 6491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                contamination
## 6492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    continual
## 6493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contrary
## 6494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cooked
## 6495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   corruption
## 6496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   councillor
## 6497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  councillors
## 6498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    council�s
## 6499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  counselling
## 6500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    country�s
## 6501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      courage
## 6502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    covidence
## 6503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cracks
## 6504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crazy
## 6505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     creation
## 6506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    creatives
## 6507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   creativity
## 6508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     credible
## 6509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crew
## 6510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crimes
## 6511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cronies
## 6512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      crowded
## 6513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      crucial
## 6514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cunts
## 6515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   curriculum
## 6516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cyclists
## 6517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       daniel
## 6518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dark
## 6519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     database
## 6520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deadline
## 6521                                                                                                                                                                                                                                                                                                                                                                                                                                                                               dealerjeweller
## 6522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dealt
## 6523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deceased
## 6524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       decent
## 6525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decline
## 6526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    defending
## 6527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         defo
## 6528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         demo
## 6529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   democratic
## 6530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        demos
## 6531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      denying
## 6532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deployed
## 6533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   depressing
## 6534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  deprivation
## 6535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        derek
## 6536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       desire
## 6537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    destroyed
## 6538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 developments
## 6539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           di
## 6540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diamond
## 6541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        diary
## 6542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dick
## 6543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dig
## 6544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          din
## 6545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    direction
## 6546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     directly
## 6547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 disabilities
## 6548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disagree
## 6549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 disappointed
## 6550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    discharge
## 6551                                                                                                                                                                                                                                                                                                                                                                                                                                                                               discrimination
## 6552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    discussed
## 6553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disgusted
## 6554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      display
## 6555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     distract
## 6556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  distributed
## 6557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diverse
## 6558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       divide
## 6559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     division
## 6560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dom
## 6561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       donors
## 6562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     doorstep
## 6563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doses
## 6564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dozens
## 6565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       driven
## 6566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       drives
## 6567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dropping
## 6568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dubai
## 6569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dumb
## 6570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       durham
## 6571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ears
## 6572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ed
## 6573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     efficacy
## 6574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           eh
## 6575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     elephant
## 6576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   eloquently
## 6577                                                                                                                                                                                                                                                                                                                                                                                                                                                                               embarrassingly
## 6578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                embarrassment
## 6579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      embrace
## 6580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      emerged
## 6581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     emotions
## 6582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   employment
## 6583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  empowerment
## 6584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      endless
## 6585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      enforce
## 6586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       engage
## 6587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    enjoyable
## 6588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     enormous
## 6589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ensuring
## 6590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     entering
## 6591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   enterprise
## 6592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    epicentre
## 6593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      equally
## 6594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    eradicate
## 6595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       errors
## 6596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                establishment
## 6597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         esto
## 6598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      europes
## 6599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     eventful
## 6600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   eventually
## 6601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         evil
## 6602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exceed
## 6603                                                                                                                                                                                                                                                                                                                                                                                                                                                                               exceptionalism
## 6604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  exclusively
## 6605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      excuses
## 6606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exempt
## 6607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 experiencing
## 6608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     exposure
## 6609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      extreme
## 6610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fairly
## 6611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         faqs
## 6612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        farce
## 6613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       faster
## 6614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fathers
## 6615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       favour
## 6616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fearful
## 6617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     featured
## 6618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     features
## 6619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         feed
## 6620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     feedback
## 6621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         feet
## 6622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       female
## 6623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    festivals
## 6624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fiction
## 6625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      filming
## 6626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      finance
## 6627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     findings
## 6628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         firm
## 6629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        firms
## 6630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fix
## 6631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fixed
## 6632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fk
## 6633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         flag
## 6634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         flow
## 6635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fly
## 6636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fossil
## 6637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        frank
## 6638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fraud
## 6639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      freight
## 6640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fri
## 6641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fuckin
## 6642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       funded
## 6643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     funerals
## 6644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gallery
## 6645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gaming
## 6646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gap
## 6647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       garage
## 6648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gathered
## 6649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gay
## 6650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gdp
## 6651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gel
## 6652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gemstone
## 6653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      genuine
## 6654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      georgia
## 6655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gifts
## 6656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        girls
## 6657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        glass
## 6658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      glasses
## 6659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gobierno
## 6660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gods
## 6661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         golf
## 6662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     goodness
## 6663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gosh
## 6664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   governance
## 6665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        grand
## 6666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                grandchildren
## 6667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        graph
## 6668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gratuita
## 6669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      greatly
## 6670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grim
## 6671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gross
## 6672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        guard
## 6673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     guessing
## 6674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        habil
## 6675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hadn�t
## 6676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 hairdressers
## 6677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       halted
## 6678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       handle
## 6679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   handshakes
## 6680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hang
## 6681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      happier
## 6682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      happily
## 6683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hardest
## 6684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hardship
## 6685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hari
## 6686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hearts
## 6687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       heart�
## 6688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         heat
## 6689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        helen
## 6690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hiding
## 6691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    hilarious
## 6692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    hindsight
## 6693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     historic
## 6694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hoax
## 6695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hockey
## 6696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hoped
## 6697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hopeful
## 6698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     horrible
## 6699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hose
## 6700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hosted
## 6701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hotspot
## 6702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   households
## 6703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       houses
## 6704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hrs
## 6705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hs2
## 6706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ht
## 6707                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/cgbkkwfhas
## 6708                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/csmbejj3bi
## 6709                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/dqz0jth69u
## 6710                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/du9hljkjrl
## 6711                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/dunt3q3gdi
## 6712                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/evkudqw5mm
## 6713                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/hqoolqchdo
## 6714                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/mk8mfgvwe0
## 6715                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/rk6vn4umlh
## 6716                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/vtiuwfulbi
## 6717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hugely
## 6718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hull
## 6719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       humans
## 6720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    hypocrisy
## 6721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hysteria
## 6722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   identified
## 6723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       images
## 6724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      imaging
## 6725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   immigrants
## 6726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  immigration
## 6727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    impressed
## 6728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   impressive
## 6729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     incident
## 6730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     incoming
## 6731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       infect
## 6732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     informed
## 6733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  initiatives
## 6734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       injury
## 6735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       insane
## 6736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  insensitive
## 6737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    integrity
## 6738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 intelligence
## 6739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       intent
## 6740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     internal
## 6741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     internet
## 6742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 interviewing
## 6743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   introduced
## 6744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   introduces
## 6745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                investigating
## 6746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    invisible
## 6747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     isolated
## 6748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          itu
## 6749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          it�
## 6750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        it�ll
## 6751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           iv
## 6752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    izquierda
## 6753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jack
## 6754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    johnson�s
## 6755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   journalism
## 6756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  journalists
## 6757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     judicial
## 6758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kari
## 6759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kate
## 6760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kent
## 6761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   keyworkers
## 6762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kicked
## 6763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      kicking
## 6764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   laboratory
## 6765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lady
## 6766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      largest
## 6767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     laughing
## 6768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lay
## 6769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lazy
## 6770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           le
## 6771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       learnt
## 6772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leaving
## 6773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      licence
## 6774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lights
## 6775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lincoln
## 6776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       loaded
## 6777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      locally
## 6778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lodge
## 6779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          log
## 6780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                londonantwerp
## 6781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      londons
## 6782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     london�s
## 6783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         loud
## 6784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lungs
## 6785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      malaria
## 6786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         male
## 6787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       manner
## 6788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mapping
## 6789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        marks
## 6790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      masking
## 6791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       master
## 6792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        maths
## 6793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          max
## 6794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mccann
## 6795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         meal
## 6796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     meantime
## 6797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       medals
## 6798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meets
## 6799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     memorial
## 6800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     memories
## 6801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    menopause
## 6802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     messages
## 6803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        metre
## 6804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mi
## 6805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mike
## 6806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mitigate
## 6807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mixed
## 6808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      moaning
## 6809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      moments
## 6810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      monitor
## 6811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    monitored
## 6812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       morgan
## 6813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        moron
## 6814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      moronic
## 6815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mouth
## 6816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          msm
## 6817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     multiple
## 6818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           na
## 6819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      napping
## 6820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ne
## 6821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    newcastle
## 6822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nodeal
## 6823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    normality
## 6824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       norman
## 6825                                                                                                                                                                                                                                                                                                                                                                                                                                                                               northumberland
## 6826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nose
## 6827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        noses
## 6828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      noticed
## 6829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ny
## 6830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      n�meros
## 6831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     observed
## 6832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     occupied
## 6833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      october
## 6834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       offend
## 6835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         olds
## 6836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   oncologist
## 6837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  operational
## 6838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     opposite
## 6839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   opposition
## 6840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   oppression
## 6841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     optimism
## 6842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      options
## 6843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    outbreaks
## 6844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     outdoors
## 6845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      outfits
## 6846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      outlook
## 6847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      outrage
## 6848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      overdue
## 6849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       overly
## 6850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  overwhelmed
## 6851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     packages
## 6852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pains
## 6853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pakistan
## 6854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       parent
## 6855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                parliamentary
## 6856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parties
## 6857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    partnered
## 6858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   passionate
## 6859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         path
## 6860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peaks
## 6861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    perfectly
## 6862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      perform
## 6863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   performers
## 6864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pero
## 6865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         per�
## 6866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 peterborough
## 6867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   physically
## 6868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        picky
## 6869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       piffle
## 6870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pitch
## 6871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pizza
## 6872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       plants
## 6873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    platforms
## 6874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     playoffs
## 6875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         plot
## 6876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ploy
## 6877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     politely
## 6878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       poorly
## 6879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pop
## 6880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         port
## 6881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    postcovid
## 6882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pounds
## 6883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       praise
## 6884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     praising
## 6885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  predictable
## 6886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  preexisting
## 6887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pressing
## 6888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        print
## 6889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    proactive
## 6890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  probability
## 6891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     proceeds
## 6892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      profile
## 6893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      promote
## 6894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   promotions
## 6895                                                                                                                                                                                                                                                                                                                                                                                                                                                                              propertyrelated
## 6896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prove
## 6897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   provisions
## 6898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pub
## 6899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pull
## 6900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pulled
## 6901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pulling
## 6902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       purely
## 6903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    purposely
## 6904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           qa
## 6905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      qualify
## 6906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       quotes
## 6907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rail
## 6908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      railway
## 6909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       random
## 6910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ranging
## 6911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rare
## 6912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rattled
## 6913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reached
## 6914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reaction
## 6915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     realised
## 6916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rebuild
## 6917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    referring
## 6918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reflects
## 6919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reform
## 6920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         regs
## 6921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rejects
## 6922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    releasing
## 6923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reliable
## 6924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    religious
## 6925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   remarkable
## 6926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     remotely
## 6927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reopened
## 6928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  repercusi�n
## 6929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      replace
## 6930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  represented
## 6931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 representing
## 6932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    requested
## 6933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  rescheduled
## 6934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reserve
## 6935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      resolve
## 6936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   restaurant
## 6937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  restaurants
## 6938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    resulting
## 6939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     retested
## 6940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reviewed
## 6941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reward
## 6942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      riddled
## 6943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ridiculous
## 6944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rife
## 6945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         riot
## 6946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        risen
## 6947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rituals
## 6948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rollout
## 6949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rotten
## 6950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rough
## 6951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       routes
## 6952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rupert
## 6953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       russia
## 6954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sadiq
## 6955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       safari
## 6956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sale
## 6957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sample
## 6958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       saving
## 6959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      scandal
## 6960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sciences
## 6961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scotlands
## 6962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       screen
## 6963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   screenshot
## 6964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    secondary
## 6965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      seekers
## 6966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      seeking
## 6967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     selected
## 6968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                selfisolation
## 6969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sexual
## 6970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shares
## 6971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sheffield
## 6972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shocked
## 6973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    should�ve
## 6974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shouting
## 6975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shuts
## 6976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      signage
## 6977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    siguiente
## 6978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sikora
## 6979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        silly
## 6980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sin
## 6981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sitting
## 6982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        skill
## 6983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sleepers
## 6984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        smile
## 6985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        smoke
## 6986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sobre
## 6987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      socials
## 6988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                socioeconomic
## 6989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sod
## 6990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     software
## 6991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sold
## 6992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sons
## 6993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sound
## 6994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sounds
## 6995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sp
## 6996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      speaker
## 6997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     speakers
## 6998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   specialist
## 6999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 specifically
## 7000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spiral
## 7001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spirits
## 7002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spite
## 7003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sponsor
## 7004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sponsored
## 7005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    spreaders
## 7006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spurs
## 7007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   staggering
## 7008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     standing
## 7009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stark
## 7010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   statements
## 7011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stayed
## 7012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     steering
## 7013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stepped
## 7014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stewart
## 7015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stimulus
## 7016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stirling
## 7017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stolen
## 7018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stops
## 7019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stream
## 7020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    streaming
## 7021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    stringent
## 7022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    struggles
## 7023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stunning
## 7024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    submitted
## 7025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suicide
## 7026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      summary
## 7027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       summit
## 7028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   sunderland
## 7029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   surprising
## 7030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  surrounding
## 7031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 surveillance
## 7032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     survived
## 7033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     survivor
## 7034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    survivors
## 7035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sweep
## 7036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        swept
## 7037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    switching
## 7038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ta
## 7039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       talent
## 7040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       talked
## 7041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tears
## 7042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    telegraph
## 7043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  temperature
## 7044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tension
## 7045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     theatres
## 7046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      therapy
## 7047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     there�ll
## 7048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       they�d
## 7049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      they�ll
## 7050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        thick
## 7051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thompson
## 7052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      thrives
## 7053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     throwing
## 7054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ticket
## 7055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tim
## 7056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     timeline
## 7057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        todos
## 7058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tools
## 7059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        torys
## 7060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tour
## 7061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tourism
## 7062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        towns
## 7063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        toxic
## 7064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tragedy
## 7065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        train
## 7066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      traitor
## 7067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  transparent
## 7068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   travelling
## 7069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     trending
## 7070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      trigger
## 7071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       troops
## 7072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        types
## 7073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      typical
## 7074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           um
## 7075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          uma
## 7076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    uncertain
## 7077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  uncertainty
## 7078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    undermine
## 7079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          uni
## 7080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        unite
## 7081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      unknown
## 7082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unlike
## 7083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unpaid
## 7084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   unreliable
## 7085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     updating
## 7086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ups
## 7087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      urgency
## 7088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    utilising
## 7089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       valley
## 7090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       values
## 7091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vast
## 7092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          vat
## 7093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vehicles
## 7094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ventilated
## 7095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ver
## 7096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     veterans
## 7097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      victory
## 7098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       videos
## 7099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vietnam
## 7100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      viewing
## 7101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       virus�
## 7102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vouchers
## 7103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                vulnerability
## 7104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wage
## 7105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       walked
## 7106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         warn
## 7107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       washed
## 7108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    welcoming
## 7109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   whatsoever
## 7110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wild
## 7111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wind
## 7112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     windrush
## 7113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      winning
## 7114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wipes
## 7115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       woeful
## 7116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wood
## 7117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       worker
## 7118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   workplaces
## 7119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       worlds
## 7120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           xx
## 7121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         yass
## 7122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        year�
## 7123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        yeast
## 7124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           yo
## 7125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         york
## 7126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       yvonne
## 7127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ze
## 7128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          zoe
## 7129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         zone
## 7130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �25k
## 7131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �for
## 7132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �from
## 7133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �good
## 7134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �one
## 7135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     �support
## 7136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @afneil
## 7137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @andrewmarr9
## 7138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @asda
## 7139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @bbc
## 7140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bbcbreakfast
## 7141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @clo13
## 7142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cnoengland
## 7143                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @credlandnicki
## 7144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dhscgovuk
## 7145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dmcintyrewwe
## 7146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @dphmashton
## 7147                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @dr2nisreenalwan
## 7148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dramirkhangp
## 7149                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @drsarahjarvis
## 7150                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @duncanbannatyne
## 7151                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @emilyjrlawson
## 7152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @fioh
## 7153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @glennbbc
## 7154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @healthfdn
## 7155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @independent
## 7156                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jacksoncarlaw
## 7157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jannee
## 7158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jarihakanen
## 7159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jasonleitch
## 7160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jeremyhunt
## 7161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jokowi
## 7162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jujuliagrace
## 7163                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kannanmadhura
## 7164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @kateemccann
## 7165                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @leedshospitals
## 7166                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @liamthorpecho
## 7167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @lianed1965
## 7168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @libdems
## 7169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @mbklee
## 7170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mgoldenmsp
## 7171                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @michaelrosenyes
## 7172                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @michaelyeadon3
## 7173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @midwalesmike
## 7174                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @neildotobrien
## 7175                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @nhsenglandldn
## 7176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @nickpope
## 7177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ouhospitals
## 7178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @propelhub
## 7179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @pthbhealth
## 7180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @rishisunak
## 7181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rupertpearse
## 7182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sbattrawden
## 7183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @scotgovfm
## 7184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @skynewsbreak
## 7185                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @speakerpelosi
## 7186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @susanmichie
## 7187                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @susannareid100
## 7188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @tesco
## 7189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @thedauk
## 7190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @thesnp
## 7191                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @toryboypierce
## 7192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @uniofoxford
## 7193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @uoshealthsoc
## 7194                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @vaughangething
## 7195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @weesnowie
## 7196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @who
## 7197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #astrazeneca
## 7198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ausvind
## 7199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #bbcbreakfast
## 7200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #boristheliar
## 7201                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #breastfeeding
## 7202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #caritasgp
## 7203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #children
## 7204                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #clapforheroes
## 7205                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #closetheschoolsnow
## 7206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #community
## 7207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #coronaupdate
## 7208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #covid2019
## 7209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #covidtest
## 7210                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #downingstreetbriefing
## 7211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #excludeduk
## 7212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #falsenews
## 7213                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #forthemany<u+0001f308>
## 7214                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #getvaccinated
## 7215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #happynewyear
## 7216                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #happynewyear2021
## 7217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #hospital
## 7218                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #imecewomenscentre
## 7219                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #inthistogether
## 7220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #lateralflow
## 7221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #longcovid
## 7222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #love
## 7223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #marr
## 7224                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #mentalhealthawareness
## 7225                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #mentalhealthmatters
## 7226                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #mondaymotivation
## 7227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #motivation
## 7228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #nhsblueheart
## 7229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #nottingham
## 7230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #odx
## 7231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #online
## 7232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #oxford
## 7233                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #oxfordvaccine
## 7234                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #premierleague
## 7235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #property
## 7236                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #protectthenhs
## 7237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #rave
## 7238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #safety
## 7239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #sanitize
## 7240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #shop
## 7241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #shoplocal
## 7242                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #smallbusiness
## 7243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #supportlocal
## 7244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #swindon
## 7245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #taiwan
## 7246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #takeaway
## 7247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #telephone
## 7248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #thankyou
## 7249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #trending
## 7250                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #twitter<u+2611><u+fe0f>
## 7251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #ukgovt
## 7252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #vaccineswork
## 7253                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #washyourhands
## 7254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #wfh
## 7255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #whitstable
## 7256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #wiltshire
## 7257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f3a7>
## 7258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f44f>
## 7259                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f44f><u+0001f44f>
## 7260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f494>
## 7261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4aa>
## 7262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f525>
## 7263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f605>
## 7264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f615>
## 7265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f616>
## 7266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f61e>
## 7267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f625>
## 7268                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f644><u+0001f644>
## 7269                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f64f><u+0001f3fd>
## 7270                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f926><u+0001f3fc><u+200d><u+2642><u+fe0f>
## 7271                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f926><u+0001f3fe><u+200d><u+2642><u+fe0f>
## 7272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f92a>
## 7273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f974>
## 7274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f97a>
## 7275                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+203c><u+fe0f>
## 7276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         10am
## 7277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         11am
## 7278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         18th
## 7279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     2021year
## 7280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       24hour
## 7281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      24hours
## 7282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          3rd
## 7283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          4pm
## 7284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          7th
## 7285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    92yearold
## 7286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      academy
## 7287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  accountable
## 7288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     accurate
## 7289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  acknowledge
## 7290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       acting
## 7291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     activist
## 7292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ad
## 7293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        added
## 7294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adhering
## 7295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      adopted
## 7296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        adult
## 7297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       agreed
## 7298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    agreement
## 7299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aid
## 7300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     airborne
## 7301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     airports
## 7302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alcohol
## 7303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        allah
## 7304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alleged
## 7305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    allegedly
## 7306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     allowing
## 7307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amazon
## 7308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    americans
## 7309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 anaphylactic
## 7310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       andrew
## 7311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         andy
## 7312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      angeles
## 7313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       animal
## 7314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     announce
## 7315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     annoying
## 7316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ant
## 7317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  antibiotics
## 7318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    apologise
## 7319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  appreciated
## 7320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                appropriately
## 7321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      approve
## 7322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       approx
## 7323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aqu�
## 7324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arrival
## 7325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ashamed
## 7326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         asia
## 7327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aspect
## 7328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     athletes
## 7329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          atm
## 7330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      attacks
## 7331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     attitude
## 7332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       august
## 7333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 availability
## 7334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        award
## 7335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           az
## 7336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         baby
## 7337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        badly
## 7338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        baked
## 7339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ball
## 7340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ban
## 7341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bang
## 7342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bangkok
## 7343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bangor
## 7344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bay
## 7345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bed
## 7346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     believes
## 7347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     benefits
## 7348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bet
## 7349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      billion
## 7350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        birds
## 7351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        birth
## 7352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bleak
## 7353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     blocking
## 7354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bnt162b2
## 7355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      booking
## 7356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         born
## 7357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        boxes
## 7358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boyd
## 7359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     brighton
## 7360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brink
## 7361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bro
## 7362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bulletin
## 7363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bum
## 7364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bunch
## 7365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          buy
## 7366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       buying
## 7367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cakes
## 7368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         calm
## 7369                                                                                                                                                                                                                                                                                                                                                                                                                                                                               cambridgeshire
## 7370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 cancellation
## 7371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      capture
## 7372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cardiff
## 7373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cared
## 7374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       caring
## 7375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     carriers
## 7376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cash
## 7377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cc
## 7378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       celtic
## 7379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  certificate
## 7380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chamber
## 7381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   chancellor
## 7382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    character
## 7383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     checking
## 7384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chelsea
## 7385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cheshire
## 7386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chiefs
## 7387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    chocolate
## 7388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       choose
## 7389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chosen
## 7390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       christ
## 7391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chronic
## 7392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  circulating
## 7393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ciudad
## 7394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    classroom
## 7395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        climb
## 7396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      clinics
## 7397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cloth
## 7398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cnn
## 7399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        colin
## 7400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                collaboration
## 7401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      collect
## 7402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    combating
## 7403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   combatting
## 7404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   commercial
## 7405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                communication
## 7406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         como
## 7407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                comorbidities
## 7408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      compare
## 7409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    compliant
## 7410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          con
## 7411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  condolences
## 7412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     confirms
## 7413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conflict
## 7414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    confusion
## 7415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  consecutive
## 7416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     constant
## 7417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 construction
## 7418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contacts
## 7419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contagious
## 7420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  continually
## 7421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 continuously
## 7422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       contra
## 7423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  contributed
## 7424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     controls
## 7425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 conversation
## 7426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cool
## 7427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         copy
## 7428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cornwall
## 7429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       corona
## 7430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    corridors
## 7431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      corrupt
## 7432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     couldn�t
## 7433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      courier
## 7434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cousin
## 7435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crap
## 7436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crazy
## 7437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      created
## 7438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     creation
## 7439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crew
## 7440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crowd
## 7441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cummings
## 7442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cycle
## 7443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           da
## 7444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dan
## 7445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       danger
## 7446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dare
## 7447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dates
## 7448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         day�
## 7449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   dedication
## 7450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     defender
## 7451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      defends
## 7452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deletes
## 7453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    democracy
## 7454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       denial
## 7455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       denied
## 7456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       denier
## 7457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dental
## 7458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   department
## 7459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   depressing
## 7460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deprived
## 7461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  dereliction
## 7462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    developed
## 7463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  development
## 7464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dfe
## 7465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     diabetes
## 7466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    diagnosed
## 7467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    diagnosis
## 7468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 difficulties
## 7469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       direct
## 7470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 disabilities
## 7471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disagree
## 7472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   discharged
## 7473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   discovered
## 7474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   discussing
## 7475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dithering
## 7476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    documents
## 7477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       donald
## 7478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        donor
## 7479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         doom
## 7480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dosing
## 7481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      doubled
## 7482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dreaded
## 7483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dream
## 7484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dressing
## 7485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        drink
## 7486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        drone
## 7487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dry
## 7488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dust
## 7489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       easier
## 7490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          efl
## 7491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ego
## 7492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    elections
## 7493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  electricity
## 7494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      elitist
## 7495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    elizabeth
## 7496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emails
## 7497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      embrace
## 7498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    emotional
## 7499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     employed
## 7500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     enclosed
## 7501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      endemic
## 7502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     enforced
## 7503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  enforcement
## 7504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    england�s
## 7505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      enjoyed
## 7506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     entering
## 7507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       enters
## 7508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     entitled
## 7509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       equity
## 7510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   eradicated
## 7511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        essay
## 7512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     estimate
## 7513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   eventually
## 7514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    everyones
## 7515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     examples
## 7516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exceed
## 7517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     excluded
## 7518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exclusive
## 7519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exemption
## 7520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   expectancy
## 7521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fab
## 7522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        faced
## 7523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   facilities
## 7524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         farm
## 7525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fart
## 7526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  fascinating
## 7527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fault
## 7528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    featuring
## 7529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       female
## 7530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ferrier
## 7531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fewer
## 7532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         firm
## 7533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fixtures
## 7534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      frances
## 7535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      frankly
## 7536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fraudulent
## 7537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     freezing
## 7538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   frequently
## 7539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fulfilling
## 7540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fun
## 7541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gain
## 7542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    genuinely
## 7543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    geoghegan
## 7544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       george
## 7545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gloom
## 7546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gmt
## 7547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        goals
## 7548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gove
## 7549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gps
## 7550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      grandma
## 7551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        guide
## 7552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gym
## 7553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ham
## 7554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      happily
## 7555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hate
## 7556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        havoc
## 7557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hcws
## 7558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        heads
## 7559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                heartbreaking
## 7560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     heathrow
## 7561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     helpline
## 7562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       heroes
## 7563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hidden
## 7564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   highlights
## 7565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hivaids
## 7566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   hivtainted
## 7567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hoc
## 7568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     homeless
## 7569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     honestly
## 7570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     horrific
## 7571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hotspot
## 7572                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/73bbtismoq
## 7573                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/9z1a0iucrm
## 7574                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/eiz1pt7jpb
## 7575                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/lwgddwujut
## 7576                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/wi2uqibdxq
## 7577                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/wnfsczfk7j
## 7578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hungry
## 7579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hunts
## 7580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hurlford
## 7581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          iam
## 7582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        icymi
## 7583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ii
## 7584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     impacted
## 7585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   imperative
## 7586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       impose
## 7587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    impressed
## 7588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inbound
## 7589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                inconvenience
## 7590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        inept
## 7591                                                                                                                                                                                                                                                                                                                                                                                                                                                                               infrastructure
## 7592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     injuries
## 7593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    inpatient
## 7594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  inspiration
## 7595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     instance
## 7596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      instore
## 7597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 instructions
## 7598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 intervention
## 7599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   introduced
## 7600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  introducing
## 7601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   investment
## 7602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       invite
## 7603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      invited
## 7604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        isles
## 7605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     isolated
## 7606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      israeli
## 7607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        italy
## 7608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ivermectin
## 7609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jamaal
## 7610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        james
## 7611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jo
## 7612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        joint
## 7613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         keen
## 7614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    kejahatan
## 7615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kick
## 7616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       killer
## 7617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         king
## 7618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kings
## 7619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lads
## 7620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lady
## 7621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lake
## 7622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lancaster
## 7623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lascelles
## 7624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     laughing
## 7625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    launching
## 7626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       layers
## 7627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lbc
## 7628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leagues
## 7629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leaving
## 7630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        legal
## 7631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lens
## 7632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      library
## 7633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        likes
## 7634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   livestream
## 7635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   logistical
## 7636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    londoners
## 7637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     longterm
## 7638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       losing
## 7639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lothian
## 7640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         luck
## 7641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lynn
## 7642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        magic
## 7643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      managed
## 7644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     managers
## 7645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     managing
## 7646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                manufacturers
## 7647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                manufacturing
## 7648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      masters
## 7649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meals
## 7650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   medication
## 7651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      messing
## 7652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          met
## 7653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      methods
## 7654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      michael
## 7655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     midlands
## 7656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     military
## 7657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          min
## 7658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   misleading
## 7659                                                                                                                                                                                                                                                                                                                                                                                                                                                                               misrepresented
## 7660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mistakes
## 7661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mob
## 7662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        moeen
## 7663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      monthly
## 7664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        moral
## 7665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    morrisons
## 7666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mug
## 7667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        multi
## 7668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mundo
## 7669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mutant
## 7670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mutation
## 7671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nadhim
## 7672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      natural
## 7673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   negligence
## 7674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    negligent
## 7675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   neighbours
## 7676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        newly
## 7677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    newspaper
## 7678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nie
## 7679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        notes
## 7680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      notices
## 7681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nov
## 7682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nye
## 7683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         obey
## 7684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   obligation
## 7685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     observed
## 7686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    obstacles
## 7687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          odd
## 7688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         odds
## 7689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    operating
## 7690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     opposing
## 7691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        orang
## 7692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         out�
## 7693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       oxygen
## 7694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pages
## 7695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pair
## 7696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pakistan
## 7697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pandemics
## 7698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pandemic�
## 7699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     partying
## 7700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      passing
## 7701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        patel
## 7702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     patience
## 7703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    patients�
## 7704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peeps
## 7705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         peer
## 7706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     perbagai
## 7707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   permission
## 7708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   permitting
## 7709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pessoas
## 7710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pfa
## 7711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pharma
## 7712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  photography
## 7713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    physician
## 7714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pissed
## 7715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      placebo
## 7716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     planning
## 7717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       player
## 7718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pleasure
## 7719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pls
## 7720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pop
## 7721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     portrait
## 7722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     position
## 7723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      posting
## 7724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                postponements
## 7725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      praying
## 7726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    predicted
## 7727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  predictions
## 7728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prefer
## 7729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   preference
## 7730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  preventable
## 7731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    prevented
## 7732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prevents
## 7733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pride
## 7734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    principal
## 7735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   priorities
## 7736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        priti
## 7737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    privilege
## 7738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    procedure
## 7739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      produce
## 7740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     produced
## 7741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     products
## 7742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      profits
## 7743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  progression
## 7744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      promise
## 7745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    promising
## 7746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       proven
## 7747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ps
## 7748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pubs
## 7749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pulling
## 7750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      purpose
## 7751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         push
## 7752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      queries
## 7753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        query
## 7754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  questioning
## 7755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       queues
## 7756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      radical
## 7757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rail
## 7758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rated
## 7759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reached
## 7760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reaches
## 7761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reaching
## 7762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reasonable
## 7763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   recognised
## 7764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        refer
## 7765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reflects
## 7766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      refused
## 7767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    registers
## 7768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    relatives
## 7769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       relief
## 7770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     relieved
## 7771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rely
## 7772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       remove
## 7773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reporters
## 7774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     requires
## 7775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     resident
## 7776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    resilient
## 7777                                                                                                                                                                                                                                                                                                                                                                                                                                                                             responsibilities
## 7778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    returning
## 7779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     revealed
## 7780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rfu
## 7781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rigged
## 7782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rights
## 7783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        riots
## 7784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rob
## 7785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rochdale
## 7786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rock
## 7787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rodrigo
## 7788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        roles
## 7789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rounds
## 7790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    routinely
## 7791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          row
## 7792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      schemes
## 7793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        scope
## 7794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      scoring
## 7795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    screening
## 7796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     scrutiny
## 7797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         seal
## 7798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       search
## 7799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      section
## 7800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sectors
## 7801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     security
## 7802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     selected
## 7803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sell
## 7804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       senses
## 7805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      session
## 7806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sessions
## 7807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     settings
## 7808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      settled
## 7809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shambolic
## 7810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sheltered
## 7811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shield
## 7812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shifts
## 7813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shouting
## 7814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        simon
## 7815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sitting
## 7816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   situations
## 7817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        smart
## 7818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        smile
## 7819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         soar
## 7820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     socially
## 7821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sore
## 7822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sort
## 7823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spain
## 7824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spend
## 7825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spoken
## 7826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sports
## 7827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spreads
## 7828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        squad
## 7829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     standing
## 7830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stated
## 7831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      station
## 7832                                                                                                                                                                                                                                                                                                                                                                                                                                                                  stay<u+2620><u+fe0f>covid19
## 7833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stealing
## 7834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stops
## 7835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stores
## 7836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        storm
## 7837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     straight
## 7838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    strategic
## 7839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    streaming
## 7840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   strengthen
## 7841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    stretched
## 7842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       strict
## 7843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       strike
## 7844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      strikes
## 7845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        strip
## 7846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stuart
## 7847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    substance
## 7848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   successful
## 7849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   successive
## 7850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suggest
## 7851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         suit
## 7852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      summary
## 7853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sundays
## 7854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   supportive
## 7855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     supposed
## 7856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    surprised
## 7857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       surrey
## 7858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   surrounded
## 7859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     survivor
## 7860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suspect
## 7861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   suspicious
## 7862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sussex
## 7863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        swear
## 7864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      swedish
## 7865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     syndrome
## 7866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      systems
## 7867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tackled
## 7868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     takeaway
## 7869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     talented
## 7870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        talks
## 7871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       target
## 7872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        teach
## 7873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tears
## 7874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   techniques
## 7875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 technologies
## 7876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tem
## 7877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  temperature
## 7878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ten
## 7879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     terrible
## 7880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     theories
## 7881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        thick
## 7882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        this�
## 7883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tho
## 7884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thomas
## 7885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ticking
## 7886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tigers
## 7887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         till
## 7888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     timeline
## 7889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tip
## 7890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tired
## 7891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        toast
## 7892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    tonight�s
## 7893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tony
## 7894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        topic
## 7895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tourism
## 7896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  transmitted
## 7897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 transparency
## 7898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       trauma
## 7899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      travels
## 7900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     treating
## 7901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  trustworthy
## 7902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tweeting
## 7903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         uk�s
## 7904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           um
## 7905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          uma
## 7906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    uncertain
## 7907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    universal
## 7908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unlike
## 7909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  unnecessary
## 7910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          uno
## 7911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        upper
## 7912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         urge
## 7913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      utterly
## 7914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vacuna
## 7915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                vasculotropic
## 7916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vast
## 7917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ve
## 7918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vehicle
## 7919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ventilator
## 7920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       victim
## 7921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       virgin
## 7922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       visits
## 7923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        voc�s
## 7924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    voluntary
## 7925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        votes
## 7926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wake
## 7927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wankers
## 7928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      warning
## 7929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wars
## 7930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wealth
## 7931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    welcoming
## 7932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wet
## 7933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wider
## 7934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wildlife
## 7935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wing
## 7936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wm
## 7937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         woke
## 7938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       womens
## 7939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      women�s
## 7940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          won
## 7941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 worldbeating
## 7942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      worship
## 7943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wouldn�t
## 7944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wrote
## 7945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wuhan
## 7946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          xxx
## 7947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           yn
## 7948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           yo
## 7949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       you�ll
## 7950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          yrs
## 7951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       zahawi
## 7952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      zealand
## 7953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   �disperse�
## 7954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �if
## 7955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �it
## 7956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �very
## 7957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �we
## 7958                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bethisanurse1
## 7959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @brokentwitty
## 7960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @devisridhar
## 7961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @djokernole
## 7962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dpjhodges
## 7963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @drericding
## 7964                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @emmanuelmacron
## 7965                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @gladstonenoble
## 7966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @iamjolianne
## 7967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @j4ygrant
## 7968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @lbc
## 7969                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @leucinedreams
## 7970                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @mohamme13746629
## 7971                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @nicolasturgeon
## 7972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @petewscott
## 7973                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @premierleague
## 7974                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @realdenisewelch
## 7975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @somersetft
## 7976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @thephotohour
## 7977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #backtochina
## 7978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #bambam
## 7979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #borismustgo
## 7980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #china
## 7981                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #chinaquarantine
## 7982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #covid19ab
## 7983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #covidtravel
## 7984                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #covidtraveldiaries
## 7985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #dustbin2022
## 7986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #family
## 7987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #getboosted
## 7988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #gtto
## 7989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #johnsonout
## 7990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #kep1er
## 7991                                                                                                                                                                                                                                                                                                                                                                                                              #kep1er<u+30c7><u+30d3><u+30e5><u+30fc><u+304a><u+3081><u+3067><u+3068><u+3046>
## 7992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #lake
## 7993                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #lateralflowtests
## 7994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #negative
## 7995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #newyear2022
## 7996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #pandemic
## 7997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #partygate
## 7998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #quarantine
## 7999                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #returntohogwarts
## 8000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ruby
## 8001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #staysafe
## 8002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #swish
## 8003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #vaccinated
## 8004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #vaccine
## 8005                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f1ef><u+0001f1f5>
## 8006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f48a>
## 8007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4f0>
## 8008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f602>
## 8009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f621>
## 8010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f62d>
## 8011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f644>
## 8012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f64f>
## 8013                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0627><u+0644><u+0633><u+0627><u+0628><u+0642><u+0629>
## 8014                                                                                                                                                                                                                                                                                             <u+0e2b><u+0e21><u+0e14><u+0e40><u+0e27><u+0e25><u+0e32><u+0e2a><u+0e19><u+0e38><u+0e01><u+0e27><u+0e31><u+0e19><u+0e2b><u+0e22><u+0e38><u+0e14><u+0e41><u+0e25><u+0e49><u+0e27><u+0e2a><u+0e34>
## 8015                                                                                                                                                                                                                                                                                                                                                             <u+ccab><u+b208><u+cc98><u+b7fc><u+b2e4><u+ac00><u+c628><u+c9c0><u+c218><u+c758><u+c0dd><u+c77c><u+c744><u+cd95><u+d558><u+d574>
## 8016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          3rd
## 8017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          8th
## 8018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          9th
## 8019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   accessible
## 8020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    accounted
## 8021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          act
## 8022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       action
## 8023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       active
## 8024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 administered
## 8025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      adverse
## 8026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     affected
## 8027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       agency
## 8028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ahead
## 8029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      allowed
## 8030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     american
## 8031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    announced
## 8032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   antivaxxer
## 8033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    antiviral
## 8034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   antivirals
## 8035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anymore
## 8036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  application
## 8037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 appointments
## 8038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arrivals
## 8039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         asap
## 8040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  astrazeneca
## 8041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      attempt
## 8042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  authorities
## 8043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      biggest
## 8044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bless
## 8045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  bloodstream
## 8046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bodies
## 8047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boss
## 8048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          box
## 8049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brain
## 8050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     briefing
## 8051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bring
## 8052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       broken
## 8053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brought
## 8054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        build
## 8055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cabin
## 8056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        calls
## 8057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 cancellation
## 8058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   cancelling
## 8059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cannabis
## 8060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     capacity
## 8061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       caused
## 8062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       charge
## 8063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       checks
## 8064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chief
## 8065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chris
## 8066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         city
## 8067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     claiming
## 8068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clash
## 8069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        class
## 8070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        click
## 8071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      climate
## 8072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         club
## 8073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     clueless
## 8074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     colleges
## 8075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  communities
## 8076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      compare
## 8077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  competition
## 8078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     concerns
## 8079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confirm
## 8080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     confused
## 8081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   considered
## 8082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  consultants
## 8083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   continuing
## 8084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contract
## 8085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      correct
## 8086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      council
## 8087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    countless
## 8088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    customers
## 8089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cyprus
## 8090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dad
## 8091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        daley
## 8092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       damage
## 8093                                                                                                                                                                                                                                                                                                                                                                                                                                                                               dealerjeweller
## 8094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decided
## 8095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decline
## 8096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    delivered
## 8097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       denied
## 8098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      denmark
## 8099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deserved
## 8100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diamond
## 8101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        diver
## 8102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       divide
## 8103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dogs
## 8104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     download
## 8105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dream
## 8106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         easy
## 8107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     economic
## 8108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    education
## 8109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      elderly
## 8110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     eligible
## 8111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    elizabeth
## 8112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     emerging
## 8113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        empty
## 8114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      endemic
## 8115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       energy
## 8116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      english
## 8117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      equates
## 8118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eve
## 8119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    excellent
## 8120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fair
## 8121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     families
## 8122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  fascinating
## 8123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       father
## 8124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fauci
## 8125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        feels
## 8126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ffs
## 8127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        final
## 8128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     findings
## 8129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fine
## 8130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fit
## 8131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       flawed
## 8132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flows
## 8133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forces
## 8134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       french
## 8135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        front
## 8136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fucked
## 8137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fundraiser
## 8138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      funeral
## 8139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gemstone
## 8140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         govt
## 8141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          guy
## 8142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hand
## 8143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  hardworking
## 8144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hate
## 8145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      haven�t
## 8146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     headline
## 8147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         held
## 8148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       helped
## 8149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      holding
## 8150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      honours
## 8151                                                                                                                                                                                                                                                                                                                                                                                                                                                                             hospitalisations
## 8152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 hospitalised
## 8153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hour
## 8154                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/1u3nwvlfxa
## 8155                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/ehbj7ym3d2
## 8156                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/evkudqw5mm
## 8157                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/r1rwrkmnf8
## 8158                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/vyeccattfj
## 8159                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/wh6hpgxewv
## 8160                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/wsvxjqrn53
## 8161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hub
## 8162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hundreds
## 8163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hysteria
## 8164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   identified
## 8165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     identify
## 8166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  immediately
## 8167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 implications
## 8168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  independent
## 8169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     industry
## 8170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    infecting
## 8171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       inside
## 8172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                insignificant
## 8173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    integrity
## 8174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     internal
## 8175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ismore
## 8176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          i�d
## 8177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      jamaica
## 8178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     johnson�
## 8179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         join
## 8180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     jonathan
## 8181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jumped
## 8182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kit
## 8183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  knighthoods
## 8184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       labour
## 8185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lack
## 8186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       launch
## 8187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lazy
## 8188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lead
## 8189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       leader
## 8190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lfts
## 8191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lgbt
## 8192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    listening
## 8193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      locking
## 8194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lord
## 8195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         loss
## 8196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         luck
## 8197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lying
## 8198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       macron
## 8199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mad
## 8200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         main
## 8201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mandates
## 8202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     marathon
## 8203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mark
## 8204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mass
## 8205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    massively
## 8206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        match
## 8207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      meeting
## 8208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       messed
## 8209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     minimise
## 8210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nature
## 8211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ni
## 8212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nice
## 8213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nonsense
## 8214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     northern
## 8215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         note
## 8216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          obe
## 8217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     official
## 8218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      olivier
## 8219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ons
## 8220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     opinions
## 8221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                opportunities
## 8222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  opportunity
## 8223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   opposition
## 8224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  overwhelmed
## 8225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         page
## 8226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         paid
## 8227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pain
## 8228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parents
## 8229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       passed
## 8230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       photos
## 8231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     physical
## 8232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pile
## 8233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      planned
## 8234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     platform
## 8235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pleased
## 8236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    postponed
## 8237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  precautions
## 8238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  premiership
## 8239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prepares
## 8240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        press
## 8241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pressure
## 8242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pretty
## 8243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   preventing
## 8244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   prevention
## 8245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    principle
## 8246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      process
## 8247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      program
## 8248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    programme
## 8249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   propaganda
## 8250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     proteins
## 8251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     protocol
## 8252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    providing
## 8253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pulls
## 8254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pushing
## 8255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       queens
## 8256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reason
## 8257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   recognised
## 8258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recovered
## 8259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reminder
## 8260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reporting
## 8261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      require
## 8262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     required
## 8263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reuters
## 8264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reveal
## 8265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        royal
## 8266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        safer
## 8267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   scientific
## 8268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         send
## 8269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       senior
## 8270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       series
## 8271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sharing
## 8272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shock
## 8273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shut
## 8274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           si
## 8275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                significantly
## 8276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       simple
## 8277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         site
## 8278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    situation
## 8279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       slight
## 8280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     socially
## 8281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sont
## 8282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sort
## 8283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spent
## 8284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    spreading
## 8285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stated
## 8286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stronger
## 8287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     students
## 8288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        super
## 8289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sur
## 8290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      surgery
## 8291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suspect
## 8292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sustained
## 8293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      talking
## 8294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       target
## 8295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tens
## 8296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         term
## 8297                                                                                                                                                                                                                                                                                                                                                                                                                                                                          testing<u+0001f92a>
## 8298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   thankfully
## 8299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       that�s
## 8300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 therapeutics
## 8301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      there�s
## 8302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      they�re
## 8303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thomas
## 8304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thursday
## 8305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         toll
## 8306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tom
## 8307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tories
## 8308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tory
## 8309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tour
## 8310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trace
## 8311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        track
## 8312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       trusts
## 8313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tv
## 8314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tweets
## 8315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 underfunding
## 8316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   underlying
## 8317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vaccinate
## 8318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 vaccinations
## 8319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        video
## 8320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   volunteers
## 8321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        v�ran
## 8322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      waiting
## 8323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         walk
## 8324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      walkins
## 8325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        warns
## 8326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wash
## 8327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      watched
## 8328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        waves
## 8329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       weight
## 8330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        weird
## 8331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wide
## 8332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       widely
## 8333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wife
## 8334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wishes
## 8335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        won�t
## 8336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        worth
## 8337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         york
## 8338                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @42ndstreetldn
## 8339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @501notout
## 8340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @56deanstreet
## 8341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @aagbi
## 8342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ab4scambs
## 8343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @abc
## 8344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @adbhq
## 8345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @adenhallam
## 8346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @afrstemple
## 8347                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @agcolehamilton
## 8348                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @ahmadhablillah09
## 8349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @amazon
## 8350                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ambliuxiaoming
## 8351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @amitmalviya
## 8352                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @anderswijkman
## 8353                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @andrealeadsom
## 8354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @andyverity
## 8355                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @angelaknightja1
## 8356                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @angusmacneilsnp
## 8357                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @anthonyfjoshua
## 8358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @arjundhillon
## 8359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @asalifeline
## 8360                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ashcroftethics
## 8361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @asitofficial
## 8362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @aychub
## 8363                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bankers4climate
## 8364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bbc5live
## 8365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bbcdouglasf
## 8366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bbclaurak
## 8367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bbclooknorth
## 8368                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bbcparliament
## 8369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bbcworld
## 8370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bbradleymans
## 8371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @beckanewell
## 8372                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bhamchildrens
## 8373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bhhparos
## 8374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @biffbean
## 8375                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bjcsolicitors
## 8376                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @borisjohnson�s
## 8377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bossmum32
## 8378                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bradfordpearson
## 8379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bristoluni
## 8380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @britishvogue
## 8381                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @burgesssports
## 8382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @c4dispatches
## 8383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @c4gogglebox
## 8384                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @camclaret1calum
## 8385                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cardiffcouncil
## 8386                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cariadresearch
## 8387                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @carolinelucas
## 8388                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @carolinemack18
## 8389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cazhunter
## 8390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cbngovakin1
## 8391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cbsnews
## 8392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cbtwittle
## 8393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cebmoxford
## 8394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @chiefconpsni
## 8395                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @chrisboardman
## 8396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @chrisjcoates
## 8397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @cipd
## 8398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @climategroup
## 8399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @clsnooker
## 8400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cmowales
## 8401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @cnn
## 8402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @connollyltd
## 8403                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @councillorsuzie
## 8404                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @covidjusticeuk
## 8405                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @danieljhannan
## 8406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @darrylmorris
## 8407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @darshnasoni
## 8408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @davidheniguk
## 8409                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @deborahmeaden
## 8410                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @denisedoris59
## 8411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @digitfyi
## 8412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @doctoroxford
## 8413                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @dominiccumins
## 8414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @donnadlm71
## 8415                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @douglascarswell
## 8416                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @dreamcottages
## 8417                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @drhilaryjones
## 8418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @drtedros
## 8419                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @duncanmitchel80
## 8420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dvsagovuk
## 8421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @easyjet
## 8422                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @edinburghpaper
## 8423                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @educationgovuk
## 8424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @ee
## 8425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ellieobrown
## 8426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @emmahardymp
## 8427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @euinsomalia
## 8428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @examiner
## 8429                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @festivalofwork
## 8430                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @financialtimes
## 8431                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @firstwestyorks
## 8432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @fitaf83
## 8433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @flourish
## 8434                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @fnightingalef
## 8435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @fsbgtrlondon
## 8436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @ft
## 8437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @fujifilmxuk
## 8438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @garthdeecc
## 8439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @garymckeown
## 8440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @gaventures
## 8441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @geemacgee
## 8442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @gfigreen
## 8443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ggosden
## 8444                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @gloshospitals
## 8445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @godolphin
## 8446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @googlenews
## 8447                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @goonertilidie19
## 8448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gsttresearch
## 8449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gturner1969
## 8450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @guardiannews
## 8451                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @halfon4harlowmp
## 8452                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @harrietsergeant
## 8453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @helenwhately
## 8454                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @helpmusiciansuk
## 8455                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hermesparcels
## 8456                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hilarygarratt
## 8457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hodansomali
## 8458                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @houseofcommons
## 8459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @hydem1976
## 8460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ianrobo1
## 8461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @icecube
## 8462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @independent
## 8463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @itn
## 8464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @itvchanneltv
## 8465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @itvjoel
## 8466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @itvmlshow
## 8467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @iwm
## 8468                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jacindaardern
## 8469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @janetsivorn
## 8470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @janiehsieh
## 8471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jasonmanford
## 8472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jburnmurdoch
## 8473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jeanef1msp
## 8474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @jegullis
## 8475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @jenbrea
## 8476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jesssouth88
## 8477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jesusabaez
## 8478                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jlandpartners
## 8479                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @joelibrearley
## 8480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @johnmcternan
## 8481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @johnstrawson
## 8482                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @jonathanpienews
## 8483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jonhoneyball
## 8484                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @jostevenslabour
## 8485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @joutlook
## 8486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jsinghsohal
## 8487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @juliahb1
## 8488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @jvc2006
## 8489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @k4hns
## 8490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @kateandrs
## 8491                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kateforbesmsp
## 8492                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @kenilworthnews
## 8493                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kenilworthweb
## 8494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @kimsussex3
## 8495                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kirstymwalton
## 8496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @kirstysnp
## 8497                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @labourlordsuk
## 8498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @leichospital
## 8499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lewisgoodall
## 8500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @lseplc
## 8501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lucky7video
## 8502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lucyallan
## 8503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @maitlis
## 8504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mancaduom
## 8505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mandureid
## 8506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @manfrottouk
## 8507                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @marossefcovic
## 8508                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @mcrconfidential
## 8509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @medscape
## 8510                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @menopausetalk
## 8511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @michaelgove
## 8512                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @michaelrosenyes
## 8513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @miljotweets
## 8514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @montie
## 8515                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @morrisonracha
## 8516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @morrisons
## 8517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mrdanwalker
## 8518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @msehospitals
## 8519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @msnorthcott
## 8520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nadhimzahawi
## 8521                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @nancyblanchard
## 8522                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ncalliancenhs
## 8523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @neemdental
## 8524                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @neilfindlaymsp
## 8525                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @neillancastle
## 8526                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @newcastlehosps
## 8527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @nhs
## 8528                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @nhsbartshealth
## 8529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nhscharities
## 8530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @nhsggc
## 8531                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @nhshealthedeng
## 8532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @nhsx
## 8533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nikkikf
## 8534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nlandlabour
## 8535                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @northernunison
## 8536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @northmidnhs
## 8537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nottscc
## 8538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nulasuchet
## 8539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nytimes
## 8540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @nzherald
## 8541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @oecd
## 8542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @opblackvote
## 8543                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @paulglynnjourno
## 8544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @paulrey99
## 8545                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @paulsarmstrong
## 8546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @picubch
## 8547                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @pregnantscrewed
## 8548                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @profkevinfenton
## 8549                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @publichealthw
## 8550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @putneyfleur
## 8551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @pwcuk
## 8552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @quicktake
## 8553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @rcsed
## 8554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @realcalpol
## 8555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @reuters
## 8556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rohantime
## 8557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @runninghare
## 8558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rupertlowe10
## 8559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @scaithne
## 8560                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @scotgovhealth
## 8561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @scottecharmy
## 8562                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @scottishlabour
## 8563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @scullyp
## 8564                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @secrett53083107
## 8565                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @shaunkenworthy
## 8566                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @shelaghfogarty
## 8567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @shopaholicv
## 8568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @simondolan
## 8569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @socentscot
## 8570                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sophyridgesky
## 8571                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @sparklingdirect
## 8572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @srtrcengland
## 8573                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @staplefordtrain
## 8574                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @stgeorgestrust
## 8575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sunnysidegh
## 8576                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @suttoncouncil
## 8577                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @svanteaxelsson
## 8578                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @svpenglandwales
## 8579                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sykescottages
## 8580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @tagheuer
## 8581                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @teamknowhowuk
## 8582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @tedxqub
## 8583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @tfl
## 8584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @thebma
## 8585                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @thecriticaldri2
## 8586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @thecsp
## 8587                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @thegreenparty
## 8588                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @thejeremyvine
## 8589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @thekingsfund
## 8590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @theqni
## 8591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @thescotsman
## 8592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @thesnp
## 8593                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thesundaytimes
## 8594                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @thomasevans1984
## 8595                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @timbernerslee
## 8596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @timesnow
## 8597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @timpers7
## 8598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @trinitysam
## 8599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @ucu
## 8600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @uhsft
## 8601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ukhomeoffice
## 8602                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ukhouseoflords
## 8603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ukimpnet
## 8604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @uknaj
## 8605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @uniofoxford
## 8606                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @unitetheunion
## 8607                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @vicderbyshire
## 8608                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @virginiacrosbie
## 8609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @visitbritain
## 8610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @visitengland
## 8611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @walesonline
## 8612                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @wedistrictnurse
## 8613                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @wedonthavetime
## 8614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @wepuk
## 8615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @wesstreeting
## 8616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @whitehorsefc
## 8617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @wiltscouncil
## 8618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @winningline1
## 8619                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @winstonhill17
## 8620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @woowar
## 8621                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @wordpressdotcom
## 8622                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @worldresources
## 8623                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @xposetrophyhunt
## 8624                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @yorkshirelive
## 8625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @zarahsultana
## 8626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @zoomshift
## 8627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #afghanistan
## 8628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #airbnb
## 8629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #airtravel
## 8630                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #alllivesmatters
## 8631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #antibodytest
## 8632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #anxiety
## 8633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #apprentices
## 8634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #artwork
## 8635                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #attheheartofhealthcare
## 8636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #august20
## 8637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #axadivest
## 8638                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #axasolidarityresponse
## 8639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #baking
## 8640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #bangladesh
## 8641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #bbcbreakfast
## 8642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #bbcqt
## 8643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #beautiful
## 8644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #bellymujinga
## 8645                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #blacklivesmatter�
## 8646                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #blacklivesmattter
## 8647                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #blacklivesmattteruk
## 8648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #blmbristol
## 8649                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #borisbetrayal
## 8650                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #borisjohnsonmustgo
## 8651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #borisknew
## 8652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #bradford
## 8653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #breadmaking
## 8654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #briefing
## 8655                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #brighterworld
## 8656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #bristol
## 8657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #british
## 8658                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #britishairways
## 8659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #bubbles
## 8660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #businesses
## 8661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #butterfly
## 8662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #camera
## 8663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #carers
## 8664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #change
## 8665                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #cipdscoternetwork
## 8666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #city
## 8667                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #climatechange
## 8668                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #climateemergency
## 8669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #comeback
## 8670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #competition
## 8671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #construction
## 8672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #consumer
## 8673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #covid19art
## 8674                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #covid19impacttpml
## 8675                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #covid19ireland
## 8676                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #covid19pandemic
## 8677                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #covid19researchvoices
## 8678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #coviduk
## 8679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #crayon
## 8680                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #creativepavements
## 8681                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #customerservice
## 8682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #dailybrief
## 8683                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #dailybriefing
## 8684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #dailyupdate
## 8685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #data
## 8686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #dday
## 8687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #deaths
## 8688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #delivery
## 8689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #dementia
## 8690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #democracy
## 8691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #dentistry
## 8692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #depression
## 8693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #digital
## 8694                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #domesticviolence
## 8695                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #dominiccummingss
## 8696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #donate
## 8697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #donation
## 8698                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #downingstreetbriefing
## 8699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #drinkwine
## 8700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #economy
## 8701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #edutwitter
## 8702                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #employeewellbeing
## 8703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #environment
## 8704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #etsy
## 8705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #extra
## 8706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #fair
## 8707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #fase2
## 8708                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #fireandrehire
## 8709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #fishandchips
## 8710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #foodsupport
## 8711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #foodtogo
## 8712                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #foreveryjourney
## 8713                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #fromwhereiride
## 8714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #fun
## 8715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #funny
## 8716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #futureofwork
## 8717                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #generalpractice
## 8718                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #geographyteacher
## 8719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #giveaway
## 8720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #godolphin
## 8721                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #godolphinwinningline
## 8722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #goodtimes
## 8723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #govuk
## 8724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #gowernpt
## 8725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #graffiti
## 8726                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #graphicdesigner
## 8727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #haircut
## 8728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #happy
## 8729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #hat
## 8730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #hcp
## 8731                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #healthandsafety
## 8732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #helenwhately
## 8733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #herts
## 8734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #highstreet
## 8735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #historyacts
## 8736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #holiday2020
## 8737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #holidays
## 8738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #hongkong
## 8739                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #hydroxychloroquine
## 8740                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #increasedisabilitybenefits
## 8741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #informative
## 8742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #innovation
## 8743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #interesting
## 8744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #jewellery
## 8745                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #johnsonhasfailedbritain
## 8746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #july20
## 8747                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #justiceforgeorgefloyd
## 8748                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #keeppowyssafe
## 8749                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #kindnessmatters
## 8750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #knees
## 8751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #korona
## 8752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #kovit19
## 8753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #labour
## 8754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #labourleaks
## 8755                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #learningdisabilities
## 8756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #life
## 8757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #lifediary�
## 8758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #liveline
## 8759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #localgov
## 8760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #lockdownend
## 8761                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #lockdownextended
## 8762                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #lockdownviewing
## 8763                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #londonprotests
## 8764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #londonriots
## 8765                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #luckyducker<u+0001f986>
## 8766                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #makingcaringvisible
## 8767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #manorhouse
## 8768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #martinlewis
## 8769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #matthancock
## 8770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #mcmaster
## 8771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #mds
## 8772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #meat
## 8773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #medical
## 8774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #medicine
## 8775                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #mentalhealthatwork
## 8776                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #mondaythoughts
## 8777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #morocco
## 8778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #msk
## 8779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #music
## 8780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #myrohan
## 8781                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #nationalvolunteersweek
## 8782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #natural
## 8783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #networxhour
## 8784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #newmarket
## 8785                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #nhschangechallenge
## 8786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #notmovingon
## 8787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #nottingham
## 8788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #nufc
## 8789                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #onlineeducation
## 8790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #operations
## 8791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #organic
## 8792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #orthopaedics
## 8793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #outdoors
## 8794                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #outsideisfree
## 8795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #pain
## 8796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #pakistan
## 8797                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #palliativecare
## 8798                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #paulsgardengab
## 8799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #photo
## 8800                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #photooftheday
## 8801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #plymouth
## 8802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #police
## 8803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #politicslive
## 8804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #portrait
## 8805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #priorities
## 8806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #procurement
## 8807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #protus
## 8808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #proud
## 8809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #psychology
## 8810                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #publicinquirynow
## 8811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #publicsafety
## 8812                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #publictransport
## 8813                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #quarantinelife
## 8814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #rain
## 8815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #rainbow
## 8816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #rally
## 8817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #rapha
## 8818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #relax
## 8819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #research
## 8820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #resist
## 8821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #restaurant
## 8822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #retail
## 8823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #retailers
## 8824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #rip
## 8825                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #riskassessment
## 8826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #rochdalebid
## 8827                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #rochdaletogether
## 8828                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #rochdaletowncentre
## 8829                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #rochforddistrictunites
## 8830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #sackboris
## 8831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #sackcummings
## 8832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #safe
## 8833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #saveyournhs
## 8834                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #schoolreopeninguk
## 8835                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #sciencecentresforourfuture
## 8836                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #scottishfacoached
## 8837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #scummedia
## 8838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #selfcare
## 8839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #sheffield
## 8840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #shopping
## 8841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #shoulders
## 8842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #socialcare
## 8843                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #socialdistancinguk
## 8844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #socialsafety
## 8845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #solidarity
## 8846                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #sparklingdirect
## 8847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #speechless
## 8848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #stayathome
## 8849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #stayhealthy
## 8850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #staypositive
## 8851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #staysafe�
## 8852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #stockport
## 8853                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #streetphotography
## 8854                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #sundaythoughts
## 8855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #sundayvibes
## 8856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #sunshine
## 8857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #supplychain
## 8858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #tech
## 8859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #tedxqub
## 8860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #thirdsector
## 8861                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #thisisrochdale
## 8862                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #togetherapart
## 8863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #tooting
## 8864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #torylieskill
## 8865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #training
## 8866                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #tuesdaythoughts
## 8867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #tuesdayvibes
## 8868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #ukprotests
## 8869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #ulsterrugby
## 8870                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #unfitforoffice
## 8871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #update
## 8872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #us
## 8873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #uu5k
## 8874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #virus
## 8875                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #voteofnoconfidence
## 8876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #wales
## 8877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #weather
## 8878                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #webelieveinbrave
## 8879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #webinar
## 8880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #webinars
## 8881                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #westberkshire
## 8882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #who
## 8883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #whufc
## 8884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #win
## 8885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #wine
## 8886                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #woodberrydown
## 8887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #workers
## 8888                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #workingtogether
## 8889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #zerowaste
## 8890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #zimbabwe
## 8891                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f1ee><u+0001f1f9>
## 8892                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f1f8><u+0001f1f3>
## 8893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f338>
## 8894                                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f399><u+fe0f>
## 8895                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f449><u+0001f3fc>
## 8896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f44b>
## 8897                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f44b><u+0001f3fc>
## 8898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f44e>
## 8899                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f44f><u+0001f3fb>
## 8900                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f44f><u+0001f3fc>
## 8901                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f44f><u+0001f44f>
## 8902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f466>
## 8903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f489>
## 8904                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f489><u+0001f9a0>
## 8905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f495>
## 8906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f49c>
## 8907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4a9>
## 8908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4ad>
## 8909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4af>
## 8910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4bc>
## 8911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4dd>
## 8912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4e3>
## 8913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f4f8>
## 8914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f525>
## 8915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f590>
## 8916                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f602><u+0001f602><u+0001f602><u+0001f602>
## 8917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f603>
## 8918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f605>
## 8919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f60e>
## 8920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f620>
## 8921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f624>
## 8922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f625>
## 8923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f62b>
## 8924                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f633><u+0001f633><u+0001f633>
## 8925                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f644><u+0001f644>
## 8926                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f648><u+0001f923>
## 8927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f64c>
## 8928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f697>
## 8929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f6d1>
## 8930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f912>
## 8931                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f914><u+0001f914><u+0001f914>
## 8932                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f91e>it
## 8933                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f923><u+0001f923>
## 8934                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f926><u+0001f3fc><u+200d><u+2640><u+fe0f>
## 8935                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f92c><u+0001f92c>
## 8936                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f92c><u+0001f92c><u+0001f92c>
## 8937                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f937><u+0001f3fc><u+200d><u+2640><u+fe0f>
## 8938                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f937><u+0001f3fc><u+200d><u+2642><u+fe0f>
## 8939                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f937><u+0001f3fe><u+200d><u+2642><u+fe0f>
## 8940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f974>
## 8941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f9e1>
## 8942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0219>i
## 8943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+03bd>a
## 8944                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0627><u+0631><u+062a><u+0628><u+0627><u+0637>
## 8945                                                                                                                                                                                                                                                                                                                                                                                                                 <u+063a><u+0631><u+062f><u+0643><u+0623><u+0646><u+0643><u+0641><u+064a>2013
## 8946                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0645><u+0631><u+0636>
## 8947                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+06a9><u+0648>
## 8948                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+06a9><u+0648><u+0631><u+0648><u+0646><u+0627>
## 8949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+2063>
## 8950                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+23f0>lanzamiento
## 8951                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+2639><u+fe0f>
## 8952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+26bd>
## 8953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+2728>
## 8954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+2764>
## 8955                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+2b07><u+fe0f><u+2b07><u+fe0f><u+2b07><u+fe0f>
## 8956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+fffd>to
## 8957                                                                                                                                                                                                                                                                                                                                                                                                                                                                            1<u+fe0f><u+20e3>
## 8958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         100s
## 8959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        100�s
## 8960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          10s
## 8961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        10wks
## 8962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         13th
## 8963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        14day
## 8964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        200pm
## 8965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    2020sofar
## 8966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         250m
## 8967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          25k
## 8968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         320m
## 8969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          3pm
## 8970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       3point
## 8971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        400pm
## 8972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          48h
## 8973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          4pm
## 8974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          50k
## 8975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           5m
## 8976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          5pm
## 8977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     630730pm
## 8978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                999coastguard
## 8979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          9pm
## 8980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   abandoning
## 8981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       abject
## 8982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     abortion
## 8983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          abt
## 8984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       abused
## 8985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ac
## 8986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    academics
## 8987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   accelerate
## 8988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    accepting
## 8989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   accidental
## 8990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  accommodate
## 8991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 accomplished
## 8992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  accountable
## 8993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      accused
## 8994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      accuses
## 8995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     accusing
## 8996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     acquired
## 8997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     addition
## 8998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adequate
## 8999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adhering
## 9000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adidas
## 9001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adjust
## 9002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adjusted
## 9003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  adjustments
## 9004                                                                                                                                                                                                                                                                                                                                                                                                                                                                               administration
## 9005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 adultcontent
## 9006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    adversity
## 9007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      advisor
## 9008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     advisory
## 9009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   affiliated
## 9010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       afloat
## 9011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    agreement
## 9012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aiming
## 9013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aims
## 9014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      airline
## 9015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     airlines
## 9016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      airtime
## 9017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alan
## 9018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alarming
## 9019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alastair
## 9020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ale
## 9021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alemania
## 9022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alex
## 9023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alleged
## 9024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         all�
## 9025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     almighty
## 9026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       alumna
## 9027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amazed
## 9028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amazon
## 9029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ambitious
## 9030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ambulance
## 9031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      amnesty
## 9032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  anaesthesia
## 9033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    analytics
## 9034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        andor
## 9035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    anecdotal
## 9036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        angle
## 9037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     animated
## 9038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  anniversary
## 9039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                announcements
## 9040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      annoyed
## 9041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     answered
## 9042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    answering
## 9043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anthony
## 9044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  anticipated
## 9045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   antiracist
## 9046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anytime
## 9047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aol
## 9048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    apartheid
## 9049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      apology
## 9050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        apple
## 9051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   applicable
## 9052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   approached
## 9053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   approaches
## 9054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  approaching
## 9055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     approval
## 9056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aqu�
## 9057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arabia
## 9058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arabic
## 9059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     archives
## 9060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         are�
## 9061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arguing
## 9062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    arguments
## 9063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       argyle
## 9064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arise
## 9065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      armando
## 9066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        armed
## 9067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    armstrong
## 9068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arora
## 9069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arrest
## 9070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arrogant
## 9071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arsehole
## 9072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   artificial
## 9073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     artisans
## 9074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     artistic
## 9075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arun
## 9076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          asa
## 9077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        asahi
## 9078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         asda
## 9079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  asiapacific
## 9080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aslong
## 9081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  aspirations
## 9082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ass
## 9083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   assaulting
## 9084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     assembly
## 9085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       assess
## 9086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    assistant
## 9087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      assumes
## 9088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          as�
## 9089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    atrocious
## 9090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        atr�s
## 9091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     attempts
## 9092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     attitude
## 9093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     attorney
## 9094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     atypical
## 9095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      auction
## 9096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        audio
## 9097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        audit
## 9098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aug
## 9099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   australian
## 9100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       author
## 9101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      avocado
## 9102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    avoidable
## 9103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aw
## 9104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        await
## 9105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       awaits
## 9106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        award
## 9107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      awarded
## 9108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aye
## 9109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    backdrops
## 9110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  backgrounds
## 9111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        badge
## 9112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     balanced
## 9113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        balls
## 9114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         band
## 9115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bandana
## 9116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      banners
## 9117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       barber
## 9118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         base
## 9119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      battles
## 9120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bcc
## 9121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bcnlegendz
## 9122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        beale
## 9123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bear
## 9124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bearing
## 9125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     beating�
## 9126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        beats
## 9127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         beep
## 9128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      before�
## 9129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      begging
## 9130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        begun
## 9131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   behaviours
## 9132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      belgium
## 9133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beliefs
## 9134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     believed
## 9135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bell
## 9136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        belly
## 9137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       belong
## 9138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bending
## 9139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     benjamin
## 9140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bernerslee
## 9141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bicycle
## 9142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bigot
## 9143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bigotry
## 9144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    biosearch
## 9145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bird
## 9146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        birth
## 9147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          biz
## 9148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blacks
## 9149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blanket
## 9150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blessed
## 9151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blindly
## 9152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 bloodvessels
## 9153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bloomberg
## 9154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         blow
## 9155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         blue
## 9156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     boasting
## 9157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bob
## 9158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bod
## 9159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bojo
## 9160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bojo�s
## 9161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bold
## 9162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bolsonaros
## 9163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bolted
## 9164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bomb
## 9165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bored
## 9166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       boring
## 9167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bosses
## 9168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bothered
## 9169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bouldering
## 9170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  bournemouth
## 9171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brainless
## 9172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       branch
## 9173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bravo
## 9174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brazilian
## 9175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brazils
## 9176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       breach
## 9177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   breakpoint
## 9178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 breakthrough
## 9179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       breast
## 9180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       breath
## 9181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      breath�
## 9182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brecha
## 9183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     brexit�s
## 9184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     brighton
## 9185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brits
## 9186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bros
## 9187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brown
## 9188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brutal
## 9189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bst
## 9190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bubbly
## 9191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bugger
## 9192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bundle
## 9193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       buried
## 9194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       button
## 9195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         buzz
## 9196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      buzzing
## 9197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       byrhau
## 9198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cada
## 9199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cake
## 9200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cakes
## 9201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         calm
## 9202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cameras
## 9203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     canadian
## 9204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   cancelling
## 9205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cancers
## 9206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 capabilities
## 9207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      capable
## 9208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   capitalism
## 9209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     caravans
## 9210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cardiac
## 9211                                                                                                                                                                                                                                                                                                                                                                                                                                                                               cardiovascular
## 9212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     careless
## 9213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cares
## 9214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     caroline
## 9215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      carpets
## 9216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     carriers
## 9217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cars
## 9218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     catalyst
## 9219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     category
## 9220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cathy
## 9221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cats
## 9222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cbi
## 9223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ceased
## 9224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  celebrating
## 9225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       celebs
## 9226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   censorship
## 9227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cent
## 9228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      centers
## 9229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      century
## 9230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      certass
## 9231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 certificates
## 9232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                certification
## 9233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cet
## 9234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        champ
## 9235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      change�
## 9236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     channels
## 9237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      charged
## 9238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    charity�s
## 9239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      charlie
## 9240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    charlotte
## 9241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cheap
## 9242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cheek
## 9243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cheerful
## 9244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chelsea
## 9245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    childless
## 9246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       childs
## 9247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      child�s
## 9248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chin�
## 9249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  chlorinated
## 9250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    chocolate
## 9251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      choices
## 9252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        choir
## 9253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chord
## 9254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       christ
## 9255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chums
## 9256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     churches
## 9257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    churchill
## 9258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   churchills
## 9259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cinemas
## 9260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cite
## 9261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       citing
## 9262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    civilised
## 9263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      claimed
## 9264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      classed
## 9265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cleaned
## 9266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cliff
## 9267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      clinics
## 9268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         clip
## 9269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cllr
## 9270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clock
## 9271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     clothing
## 9272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     clusters
## 9273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     coaching
## 9274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         coal
## 9275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    coalition
## 9276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cobra
## 9277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      coghill
## 9278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cohort
## 9279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cohorting
## 9280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        colds
## 9281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                collaborating
## 9282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                collaborators
## 9283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      collage
## 9284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    collapsed
## 9285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     collated
## 9286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   collateral
## 9287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   collection
## 9288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  collections
## 9289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 collectively
## 9290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     colombia
## 9291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     colonial
## 9292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  comfortable
## 9293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   commentary
## 9294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       commit
## 9295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        comms
## 9296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  communicate
## 9297                                                                                                                                                                                                                                                                                                                                                                                                                                                                               communications
## 9298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    communist
## 9299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   comparison
## 9300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  comparisons
## 9301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                compassionate
## 9302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 compensation
## 9303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 competitions
## 9304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   complacent
## 9305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   complaints
## 9306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    complicit
## 9307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   compromise
## 9308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 concentrated
## 9309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                concentration
## 9310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conclusion
## 9311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    condemned
## 9312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   condolence
## 9313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  condolences
## 9314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      condoms
## 9315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   confidence
## 9316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 confirmation
## 9317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     confirms
## 9318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  conflicting
## 9319                                                                                                                                                                                                                                                                                                                                                                                                                                                                              confrontational
## 9320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   congregate
## 9321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      connect
## 9322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   connection
## 9323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    conscious
## 9324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 conservative
## 9325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 consistently
## 9326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     constant
## 9327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  constantine
## 9328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 constituency
## 9329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    consumers
## 9330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contacts
## 9331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contagio
## 9332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contagious
## 9333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 continuously
## 9334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  contraction
## 9335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       contre
## 9336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 contributing
## 9337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   convenient
## 9338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 conveniently
## 9339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cook
## 9340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cooking
## 9341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cool
## 9342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         copd
## 9343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     copeland
## 9344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cops
## 9345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cornered
## 9346                                                                                                                                                                                                                                                                                                                                                                                                                                                                           coronavirusrelated
## 9347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   correction
## 9348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      costing
## 9349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      coughed
## 9350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      counter
## 9351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    countless
## 9352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     countrys
## 9353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  countryside
## 9354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      courses
## 9355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       courts
## 9356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cousin
## 9357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     coventry
## 9358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      coverup
## 9359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     covid19s
## 9360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    covid19�s
## 9361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cramming
## 9362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crash
## 9363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    creditors
## 9364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      credits
## 9365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    crippling
## 9366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crise
## 9367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  criticising
## 9368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      critics
## 9369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     crowding
## 9370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cruelty
## 9371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cry
## 9372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ct
## 9373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cttee
## 9374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cttees
## 9375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cu
## 9376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cuando
## 9377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cube
## 9378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cumbrian
## 9379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cumplen
## 9380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cunt
## 9381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        curve
## 9382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cusp
## 9383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cutting
## 9384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  cuttingedge
## 9385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cv19
## 9386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cycles
## 9387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cyps
## 9388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dads
## 9389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      damaged
## 9390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      damming
## 9391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       damned
## 9392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dare
## 9393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 dawateislami
## 9394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dazl
## 9395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dcms
## 9396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deadlier
## 9397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    deafening
## 9398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        deals
## 9399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        deal�
## 9400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deaths=
## 9401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      debacle
## 9402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decades
## 9403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    declining
## 9404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    decorated
## 9405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     decrease
## 9406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deepest
## 9407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deeply
## 9408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     defacing
## 9409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      default
## 9410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deferred
## 9411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   deficiency
## 9412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      defined
## 9413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deflect
## 9414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      degrees
## 9415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     delaying
## 9416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   deliberate
## 9417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    democrats
## 9418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                demonstrating
## 9419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                demonstrators
## 9420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       denial
## 9421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      density
## 9422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dentistry
## 9423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dentists
## 9424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    depending
## 9425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      depends
## 9426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   depression
## 9427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deputy
## 9428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 deregulation
## 9429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      derek�s
## 9430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      desease
## 9431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deserved
## 9432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    designers
## 9433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   destroying
## 9434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     destroys
## 9435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    detenidos
## 9436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                determination
## 9437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    determine
## 9438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   determined
## 9439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   devastated
## 9440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  devastation
## 9441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    diagnosis
## 9442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diagram
## 9443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dictate
## 9444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         diet
## 9445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  differences
## 9446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 difficulties
## 9447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dim
## 9448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disability
## 9449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  disappeared
## 9450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   discerning
## 9451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disclaimer
## 9452                                                                                                                                                                                                                                                                                                                                                                                                                                                                               discriminatory
## 9453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dishonest
## 9454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 disinfectant
## 9455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dismiss
## 9456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   displaying
## 9457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disrespect
## 9458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      disrupt
## 9459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disruption
## 9460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  disruptions
## 9461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      distant
## 9462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 distribution
## 9463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dive
## 9464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 diversionary
## 9465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       divert
## 9466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   divestment
## 9467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      divided
## 9468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dividend
## 9469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dms
## 9470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dnt
## 9471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dogs
## 9472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dose
## 9473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          do�
## 9474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dragging
## 9475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        drama
## 9476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        drink
## 9477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 drivethrough
## 9478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dry
## 9479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ducks
## 9480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          duh
## 9481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       duncan
## 9482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dynamic
## 9483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dyson
## 9484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        eager
## 9485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     earliest
## 9486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     earnings
## 9487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ebola
## 9488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    economist
## 9489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ecr
## 9490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ecuador
## 9491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    eddystone
## 9492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         edit
## 9493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  efficiently
## 9494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ei
## 9495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        elbow
## 9496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        elder
## 9497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      elected
## 9498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  electricity
## 9499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     eligible
## 9500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      embassy
## 9501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  emotionally
## 9502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   empowering
## 9503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   encourages
## 9504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  endangering
## 9505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  endothelial
## 9506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      endowed
## 9507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     enforced
## 9508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    enforcing
## 9509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     enquires
## 9510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    enquiries
## 9511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      entails
## 9512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      entered
## 9513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    epidemics
## 9514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 epidemiology
## 9515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       equity
## 9516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   eradicated
## 9517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         eric
## 9518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          err
## 9519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          esp
## 9520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      esports
## 9521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        essay
## 9522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        essex
## 9523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         est�
## 9524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         eton
## 9525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      etonian
## 9526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     eugenics
## 9527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   evaluating
## 9528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        evans
## 9529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   eventbrite
## 9530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   everybodys
## 9531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       evitar
## 9532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         exam
## 9533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exams
## 9534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  exceptional
## 9535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    excessive
## 9536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     exchange
## 9537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     excluded
## 9538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   exhibition
## 9539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      existed
## 9540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         exit
## 9541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      expense
## 9542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    explained
## 9543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         expo
## 9544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      express
## 9545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    extending
## 9546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      extends
## 9547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    extention
## 9548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 extinguished
## 9549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        eyes�
## 9550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fa
## 9551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   facilitate
## 9552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      facists
## 9553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      factors
## 9554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      factory
## 9555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fails
## 9556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        faked
## 9557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fakes
## 9558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        falls
## 9559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       famous
## 9560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fan
## 9561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fanatec
## 9562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fancy
## 9563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fantasy
## 9564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fascism
## 9565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fascist
## 9566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fatally
## 9567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fatigue
## 9568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       faucis
## 9569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fc
## 9570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fcuk
## 9571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    featuring
## 9572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          feb
## 9573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      federal
## 9574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fee
## 9575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      feeding
## 9576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      females
## 9577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fence
## 9578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ferguson
## 9579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fergusons
## 9580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ferry
## 9581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ffydd
## 9582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        field
## 9583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fields
## 9584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fighter
## 9585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fiji
## 9586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       filled
## 9587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      filters
## 9588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fintech
## 9589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fiona
## 9590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      firstly
## 9591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fits
## 9592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       flames
## 9593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     flapping
## 9594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fleeing
## 9595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flood
## 9596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flout
## 9597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     flouting
## 9598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      flowers
## 9599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      focused
## 9600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    focussing
## 9601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        foods
## 9602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fool
## 9603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    foolishly
## 9604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         foot
## 9605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        footy
## 9606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     forecast
## 9607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    forefront
## 9608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forest
## 9609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      forever
## 9610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     formally
## 9611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       formed
## 9612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        forms
## 9613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  forthcoming
## 9614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fortunate
## 9615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  fortunately
## 9616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         for�
## 9617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   foundation
## 9618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      founder
## 9619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fourth
## 9620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        foyle
## 9621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     freedoms
## 9622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   freelancer
## 9623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      freeman
## 9624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        free�
## 9625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     frontier
## 9626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  froydenlund
## 9627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fucker
## 9628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fulfil
## 9629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      funcion
## 9630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     function
## 9631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  functioning
## 9632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fundraiser
## 9633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      furious
## 9634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       futile
## 9635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gael
## 9636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gained
## 9637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gan
## 9638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gang
## 9639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      garbage
## 9640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gas
## 9641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gears
## 9642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gem
## 9643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gemma
## 9644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     generate
## 9645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   generation
## 9646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  generations
## 9647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   generosity
## 9648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     genetics
## 9649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        genie
## 9650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ghost
## 9651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        giant
## 9652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gigs
## 9653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         glas
## 9654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gloom
## 9655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gloomy
## 9656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   gloucester
## 9657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         goal
## 9658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gold
## 9659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      goodall
## 9660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       google
## 9661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gorgeous
## 9662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gove
## 9663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      graphic
## 9664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   grassroots
## 9665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                gratuitamente
## 9666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        grave
## 9667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        greed
## 9668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        greek
## 9669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     grenfell
## 9670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     grieving
## 9671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        grind
## 9672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grwm
## 9673                                                                                                                                                                                                                                                                                                                                                                                                                                                                              guardianweekend
## 9674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        guest
## 9675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    guidlines
## 9676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gutted
## 9677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gvt
## 9678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gyal
## 9679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       g�nero
## 9680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hacer
## 9681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hacks
## 9682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hail
## 9683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 hairstylists
## 9684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         halt
## 9685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    hammering
## 9686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hamper
## 9687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       handed
## 9688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      handing
## 9689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      handles
## 9690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hanger
## 9691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hangover
## 9692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    happiness
## 9693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      harbour
## 9694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     haringey
## 9695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         harm
## 9696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hat
## 9697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        havnt
## 9698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        havoc
## 9699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    headaches
## 9700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     headline
## 9701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    headlines
## 9702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      healing
## 9703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   healthtech
## 9704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     heathrow
## 9705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       heaven
## 9706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      heavily
## 9707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          heb
## 9708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     helpline
## 9709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        heros
## 9710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        he�ll
## 9711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hidear
## 9712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    highland�
## 9713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hip
## 9714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hmg
## 9715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hmm
## 9716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hoc
## 9717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    homebirth
## 9718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     homemade
## 9719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hong
## 9720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     honoured
## 9721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hopi
## 9722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        horse
## 9723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         host
## 9724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hostile
## 9725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      housing
## 9726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       howard
## 9727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hoy
## 9728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hr
## 9729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hs
## 9730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hsbc
## 9731                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/0b7ppyvb5c
## 9732                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/0jsqhtuxar
## 9733                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/21rgzwipyz
## 9734                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/2uxlku9eew
## 9735                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/3lnfxinbli
## 9736                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/69ajj1aier
## 9737                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/7fjoqakaum
## 9738                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/7vf8kmnduu
## 9739                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/9n21jeox0k
## 9740                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/a31jrqxhyq
## 9741                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/ai7sknedpp
## 9742                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/amiuemdslk
## 9743                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/asaobr1vr5
## 9744                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/blqi2j7emy
## 9745                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/ctplgfmr1b�
## 9746                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/dgw5joagxl
## 9747                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/diu1y66bmd
## 9748                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/dkiffeak51
## 9749                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/ebnn85o9mi
## 9750                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/ecvb81meyl
## 9751                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/ev7truseoe
## 9752                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/fnjm6qzclv
## 9753                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/g6wvpazxix
## 9754                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/hsbg1eeexh
## 9755                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/igqgtv23sj
## 9756                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/iwolmtit5j
## 9757                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/kfzrwrps5j
## 9758                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/kwtvyaglrl
## 9759                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/ljon1l81en
## 9760                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/ngqdxfenqw
## 9761                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/ojmyzulnjv
## 9762                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/ovg6p2o1x6
## 9763                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/qapsh4s4tb
## 9764                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/qbsfrlclz1
## 9765                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/qwmvz7yfcf
## 9766                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/s4qgpbqrlm
## 9767                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/s6nfgnnkm6
## 9768                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/t9dzzukckl
## 9769                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/tnudt44s5x
## 9770                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/uyfvsb5fid
## 9771                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/wzrgonaauu
## 9772                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/z87cj3wnze
## 9773                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/zrpq7uh4yt
## 9774                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/zztzo6rygk
## 9775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hugger
## 9776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hundred
## 9777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hunger
## 9778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hungry
## 9779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hunt
## 9780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hurt
## 9781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hyde
## 9782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hynny
## 9783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hype
## 9784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 hypocritical
## 9785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          iag
## 9786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ideals
## 9787                                                                                                                                                                                                                                                                                                                                                                                                                                                                               identification
## 9788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ignorance
## 9789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     igualdad
## 9790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           il
## 9791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    illnesses
## 9792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        image
## 9793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     imminent
## 9794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          imo
## 9795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  imperialism
## 9796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  implemented
## 9797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 implementing
## 9798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   importante
## 9799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  importantly
## 9800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    improving
## 9801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inaction
## 9802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                inappropriate
## 9803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         incl
## 9804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inclined
## 9805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    inclusive
## 9806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        incom
## 9807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 inconsistent
## 9808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      induced
## 9809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   industrial
## 9810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inflicting
## 9811                                                                                                                                                                                                                                                                                                                                                                                                                                                                         infolacortmedicalcom
## 9812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inherent
## 9813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ini
## 9814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    initially
## 9815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    initiated
## 9816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      injured
## 9817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    injustice
## 9818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   injustice�
## 9819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  inscripci�n
## 9820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       insist
## 9821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 institutions
## 9822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   instructed
## 9823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 instructions
## 9824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  instructors
## 9825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      insured
## 9826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   integrated
## 9827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                intentionally
## 9828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  interaction
## 9829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     interior
## 9830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    interpret
## 9831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 intervention
## 9832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 intimidation
## 9833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     invasive
## 9834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    inverness
## 9835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       invest
## 9836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     invested
## 9837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                investigation
## 9838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    investing
## 9839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      involve
## 9840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    involving
## 9841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ir
## 9842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         iran
## 9843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     irelands
## 9844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   irrelevant
## 9845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ish
## 9846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        isles
## 9847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      israels
## 9848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      issues�
## 9849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jailed
## 9850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jamie
## 9851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     japanese
## 9852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jay
## 9853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           je
## 9854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jeremy
## 9855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jerez
## 9856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jestem
## 9857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jesus
## 9858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jhb
## 9859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    jihadists
## 9860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          joe
## 9861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    johnstone
## 9862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jokes
## 9863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jordan
## 9864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jorge
## 9865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      jornada
## 9866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       joshua
## 9867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   journalist
## 9868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     journals
## 9869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     journeys
## 9870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      jubilee
## 9871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    judgement
## 9872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      jumping
## 9873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        junio
## 9874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    justifies
## 9875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        karol
## 9876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     kateedwa
## 9877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     kayleigh
## 9878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kelis
## 9879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    kenworthy
## 9880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       keynes
## 9881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         keys
## 9882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        khans
## 9883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kick
## 9884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kid
## 9885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kier
## 9886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kili�
## 9887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      killers
## 9888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kim
## 9889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kindly
## 9890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     kindness
## 9891                                                                                                                                                                                                                                                                                                                                                                                                                                                                             kingstonuponhull
## 9892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kiss
## 9893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         knee
## 9894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kong
## 9895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        korea
## 9896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lacking
## 9897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lads
## 9898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lagos
## 9899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         laid
## 9900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lakes
## 9901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lammy
## 9902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      landing
## 9903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    landslide
## 9904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     language
## 9905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    languages
## 9906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lasted
## 9907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      latters
## 9908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     laudable
## 9909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    launching
## 9910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        law�s
## 9911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       layout
## 9912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leaflet
## 9913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       leaked
## 9914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     learners
## 9915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leeds
## 9916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leftist
## 9917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    legendary
## 9918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        legit
## 9919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   legitimate
## 9920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    leicester
## 9921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       length
## 9922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       liable
## 9923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        liars
## 9924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     libertad
## 9925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      licking
## 9926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   lieutenant
## 9927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  lifeguarded
## 9928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   lifeguards
## 9929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lifes
## 9930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     lifetime
## 9931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lift
## 9932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   lightening
## 9933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   likelihood
## 9934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lined
## 9935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lining
## 9936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       listed
## 9937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   literature
## 9938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       litter
## 9939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lived
## 9940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      loading
## 9941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         loan
## 9942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lobby
## 9943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    locations
## 9944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       locity
## 9945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lockdowns
## 9946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        logic
## 9947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        login
## 9948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      londres
## 9949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lonely
## 9950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     longterm
## 9951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          loo
## 9952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      looming
## 9953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      loosing
## 9954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      looters
## 9955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       louise
## 9956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lounge
## 9957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lover
## 9958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         luck
## 9959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lucy
## 9960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ludicrous
## 9961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      luggage
## 9962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       luxury
## 9963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    macdonald
## 9964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mackay
## 9965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    madeleine
## 9966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     madeline
## 9967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mae
## 9968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                maggiebmurphy
## 9969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        magic
## 9970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mail
## 9971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   maintained
## 9972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  maintaining
## 9973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      majesty
## 9974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       makers
## 9975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        makin
## 9976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mali
## 9977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 manslaughter
## 9978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                manufacturers
## 9979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mar
## 9980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  marchesmass
## 9981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     margaret
## 9982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      marmite
## 9983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      married
## 9984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       martin
## 9985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mas
## 9986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       masks�
## 9987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       masses
## 9988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   masyarakat
## 9989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mates
## 9990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    matterand
## 9991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      matter�
## 9992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mayoral
## 9993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           md
## 9994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          med
## 9995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     medicine
## 9996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         meds
## 9997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     meltdown
## 9998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    memorials
## 9999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mentally
## 10000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        menu
## 10001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      merger
## 10002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   messaging
## 10003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      messed
## 10004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   messenger
## 10005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      method
## 10006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     metres�
## 10007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mewn
## 10008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                microbiology
## 10009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  microphone
## 10010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      milton
## 10011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mindset
## 10012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     minimal
## 10013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   minnesota
## 10014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       minor
## 10015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mit
## 10016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mla
## 10017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mls
## 10018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mn
## 10019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  mobilising
## 10020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   momentous
## 10021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    monitors
## 10022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     monthly
## 10023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  monumental
## 10024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   monuments
## 10025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      morale
## 10026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    morality
## 10027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     morally
## 10028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   morrisons
## 10029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mortem
## 10030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mortes
## 10031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mothers
## 10032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   motivated
## 10033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       motor
## 10034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mourners
## 10035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mouse
## 10036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mu
## 10037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     muertes
## 10038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mundo
## 10039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     muppets
## 10040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    murdered
## 10041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   musicians
## 10042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     musings
## 10043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mutate
## 10044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mutation
## 10045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mutual
## 10046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        myas
## 10047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nada
## 10048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nails
## 10049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       naked
## 10050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       named
## 10051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       names
## 10052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nando�s
## 10053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       natto
## 10054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      navajo
## 10055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nazi
## 10056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ncdc
## 10057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nearest
## 10058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 necesitamos
## 10059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                negotiations
## 10060                                                                                                                                                                                                                                                                                                                                                                                                                                                                               neighborhoods
## 10061                                                                                                                                                                                                                                                                                                                                                                                                                                                                               neighbourhood
## 10062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        neil
## 10063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nene
## 10064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     netball
## 10065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 netherlands
## 10066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    networks
## 10067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     netzero
## 10068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  newsletter
## 10069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   newsnight
## 10070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   newunique
## 10071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nie
## 10072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       niece
## 10073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         niv
## 10074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nocure
## 10075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nome
## 10076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nominate
## 10077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        noon
## 10078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     norfolk
## 10079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       notes
## 10080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  noticeable
## 10081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        not�
## 10082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nowadays
## 10083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nrs
## 10084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nyc
## 10085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      n�mero
## 10086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      object
## 10087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     obliged
## 10088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  occasional
## 10089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                occasionally
## 10090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                occupational
## 10091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      occupy
## 10092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         odd
## 10093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        odds
## 10094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     offduty
## 10095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     offices
## 10096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 offthescale
## 10097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         oil
## 10098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  okehampton
## 10099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      oliver
## 10100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    omission
## 10101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ond
## 10102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       onset
## 10103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      onsite
## 10104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        oops
## 10105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          op
## 10106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       opera
## 10107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  operations
## 10108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ops
## 10109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      opting
## 10110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                optometrists
## 10111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        oral
## 10112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       organ
## 10113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    organise
## 10114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  organisers
## 10115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  organising
## 10116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                organization
## 10117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      organs
## 10118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        orgs
## 10119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       oscar
## 10120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     outlier
## 10121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    outright
## 10122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 outstanding
## 10123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        oven
## 10124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   overgrown
## 10125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    overseas
## 10126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       owned
## 10127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pack
## 10128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      packed
## 10129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     packing
## 10130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  paediatric
## 10131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pained
## 10132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     painful
## 10133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     painted
## 10134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     painter
## 10135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                palestinians
## 10136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  palliative
## 10137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   pandeamic
## 10138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    parallel
## 10139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       paris
## 10140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parked
## 10141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     parking
## 10142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     parkour
## 10143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       parks
## 10144                                                                                                                                                                                                                                                                                                                                                                                                                                                                               participation
## 10145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      partly
## 10146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    partners
## 10147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        paso
## 10148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     passion
## 10149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pasta
## 10150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   pathology
## 10151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      patrol
## 10152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     patrols
## 10153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      patron
## 10154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pause
## 10155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     payment
## 10156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pedals
## 10157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 pedestrians
## 10158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     penarth
## 10159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      penned
## 10160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   pensioner
## 10161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pepper
## 10162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  percentage
## 10163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  performing
## 10164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    performs
## 10165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 permanently
## 10166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   permitted
## 10167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   personnel
## 10168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     persons
## 10169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pesspa
## 10170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pet
## 10171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    petici�n
## 10172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   petitions
## 10173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pets
## 10174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       petty
## 10175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pharma
## 10176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      phased
## 10177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      phones
## 10178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 photography
## 10179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      physio
## 10180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      picnic
## 10181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pierdas
## 10182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pig
## 10183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pilot
## 10184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pimping
## 10185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pink
## 10186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pints
## 10187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pissed
## 10188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pissing
## 10189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pitiful
## 10190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   placement
## 10191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      plague
## 10192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      planes
## 10193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    planners
## 10194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     planted
## 10195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    planting
## 10196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     plastic
## 10197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       plate
## 10198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pleas
## 10199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        plug
## 10200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      plunge
## 10201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pockets
## 10202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       poder
## 10203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    poisoned
## 10204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      poland
## 10205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      polish
## 10206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 politically
## 10207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                politicising
## 10208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        poll
## 10209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pond
## 10210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pool
## 10211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     poorest
## 10212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 population=
## 10213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      porque
## 10214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    portrush
## 10215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  portsmouth
## 10216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       posed
## 10217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   positions
## 10218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 possibility
## 10219                                                                                                                                                                                                                                                                                                                                                                                                                                                                             postcoronavirus
## 10220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                postexposure
## 10221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                postponement
## 10222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pot
## 10223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       potus
## 10224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ppl
## 10225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pr
## 10226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pra
## 10227                                                                                                                                                                                                                                                                                                                                                                                                                                                                               practitioners
## 10228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prayer
## 10229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  precaution
## 10230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    precious
## 10231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  precovid19
## 10232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     predict
## 10233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   predicted
## 10234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  predicting
## 10235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  prediction
## 10236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    premises
## 10237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    prepared
## 10238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    preprint
## 10239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   preschool
## 10240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  presidents
## 10241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   prestatyn
## 10242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prevail
## 10243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  prevalence
## 10244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  preventing
## 10245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pricing
## 10246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     primark
## 10247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prince
## 10248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   principal
## 10249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  prioritise
## 10250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       probs
## 10251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   processed
## 10252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   processes
## 10253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  profession
## 10254                                                                                                                                                                                                                                                                                                                                                                                                                                                                              professionally
## 10255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    programs
## 10256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   projected
## 10257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  projection
## 10258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   prolonged
## 10259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     promise
## 10260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   promising
## 10261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       promo
## 10262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    promoted
## 10263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   promoting
## 10264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   promotion
## 10265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  properties
## 10266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 prophylaxis
## 10267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  proportion
## 10268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    proposed
## 10269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  prosecuted
## 10270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 prosecution
## 10271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   protested
## 10272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   providers
## 10273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     proving
## 10274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 publication
## 10275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        punk
## 10276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   purchased
## 10277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    purposes
## 10278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pushing
## 10279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     puzzled
## 10280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       qatra
## 10281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   qualified
## 10282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     quarter
## 10283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     queen�s
## 10284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      queues
## 10285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     quicker
## 10286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quiz
## 10287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     quoting
## 10288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       races
## 10289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     racists
## 10290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     radical
## 10291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         raf
## 10292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rainbow
## 10293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     raining
## 10294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rally�s
## 10295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ram
## 10296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ramadan
## 10297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rammed
## 10298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rampant
## 10299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  randomized
## 10300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rangers
## 10301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rants|
## 10302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rare�
## 10303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rating
## 10304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rave
## 10305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         raw
## 10306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rc
## 10307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rcc
## 10308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rcn
## 10309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     realize
## 10310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    realtime
## 10311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  reasonable
## 10312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reboot
## 10313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recall
## 10314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    receives
## 10315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recieved
## 10316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  recklessly
## 10317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reckoning
## 10318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   recognise
## 10319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 recruitment
## 10320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 redesigning
## 10321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  rediculous
## 10322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reduces
## 10323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reducing
## 10324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reduction
## 10325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  redundancy
## 10326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  referendum
## 10327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   referrals
## 10328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    referred
## 10329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  reflecting
## 10330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reg
## 10331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      regard
## 10332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                registration
## 10333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      regret
## 10334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     regrets
## 10335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   regularly
## 10336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   rehearsal
## 10337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reiki
## 10338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reject
## 10339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    relation
## 10340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   relations
## 10341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                relationship
## 10342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    relative
## 10343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    release�
## 10344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     releass
## 10345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   relegated
## 10346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  relegation
## 10347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   relevance
## 10348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   remaining
## 10349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  remembered
## 10350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    renowned
## 10351                                                                                                                                                                                                                                                                                                                                                                                                                                                                               repercussions
## 10352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    replaced
## 10353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     replies
## 10354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reporter
## 10355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reposting
## 10356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   represent
## 10357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    republic
## 10358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  requesting
## 10359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     require
## 10360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  requisitos
## 10361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  reschedule
## 10362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reset
## 10363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reshape
## 10364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 residential
## 10365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   resilient
## 10366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  resounding
## 10367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    resource
## 10368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  respectful
## 10369                                                                                                                                                                                                                                                                                                                                                                                                                                                                               respirat�rias
## 10370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    responce
## 10371                                                                                                                                                                                                                                                                                                                                                                                                                                                                            responsibilities
## 10372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                resurrection
## 10373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     retards
## 10374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     retired
## 10375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    retiring
## 10376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    retracts
## 10377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       retro
## 10378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   returnees
## 10379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reunion
## 10380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reuters
## 10381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rev
## 10382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reveal
## 10383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     revenue
## 10384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    revision
## 10385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rhaid
## 10386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    rhetoric
## 10387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ride
## 10388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rig
## 10389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rigged
## 10390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   rightwing
## 10391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rioters
## 10392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rip
## 10393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     robbins
## 10394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     roberts
## 10395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       robot
## 10396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rocket
## 10397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rocking
## 10398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rolled
## 10399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rolls
## 10400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rong
## 10401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       roots
## 10402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rory
## 10403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rose
## 10404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rounds
## 10405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  roundtable
## 10406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     routine
## 10407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rug
## 10408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ruin
## 10409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rules�
## 10410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rush
## 10411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rvi
## 10412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ryan
## 10413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sa
## 10414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sacked
## 10415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  sacrificed
## 10416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sadness
## 10417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      safest
## 10418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sail
## 10419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  sainsburys
## 10420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   salisbury
## 10421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      salute
## 10422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         san
## 10423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sandwell
## 10424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  sanitation
## 10425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   sanitised
## 10426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  sanitisers
## 10427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sans
## 10428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       santa
## 10429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sarah
## 10430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sardines
## 10431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sarscov2
## 10432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       saudi
## 10433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sc
## 10434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        scam
## 10435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  scandalous
## 10436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         scd
## 10437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scenario
## 10438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       scene
## 10439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   sceptical
## 10440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   scheduled
## 10441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     schemes
## 10442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   schooling
## 10443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       score
## 10444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        scot
## 10445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      scotch
## 10446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      scream
## 10447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   screening
## 10448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     screwed
## 10449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      script
## 10450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scrutiny
## 10451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sd
## 10452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sec
## 10453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     section
## 10454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sectoral
## 10455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     secured
## 10456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    securing
## 10457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       seeks
## 10458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   seemingly
## 10459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        seif
## 10460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   selection
## 10461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   selective
## 10462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                selfemployed
## 10463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sell
## 10464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     senegal
## 10465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     seniors
## 10466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sets
## 10467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      settle
## 10468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     settled
## 10469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 settlements
## 10470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shadow
## 10471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shaking
## 10472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sharply
## 10473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shaun
## 10474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shauna
## 10475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shavad
## 10476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sheep
## 10477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shelter
## 10478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shifts
## 10479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shimbun
## 10480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shipping
## 10481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shite
## 10482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shock
## 10483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shocks
## 10484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shoppers
## 10485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shores
## 10486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shots
## 10487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shout
## 10488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  shrewsbury
## 10489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shutting
## 10490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          si
## 10491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sickle
## 10492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   signalled
## 10493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    simeonov
## 10494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   similarly
## 10495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sincere
## 10496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                singleparent
## 10497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sisters
## 10498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sketch
## 10499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        skip
## 10500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  sleepovers
## 10501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      slough
## 10502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    slowdown
## 10503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     smashed
## 10504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    smashing
## 10505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       smith
## 10506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    snapshot
## 10507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sneak
## 10508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sneeze
## 10509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  snowballed
## 10510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        solo
## 10511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    someones
## 10512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    somerset
## 10513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sooner
## 10514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sop
## 10515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sore
## 10516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sos
## 10517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    southend
## 10518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    southern
## 10519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      south�
## 10520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     spain�s
## 10521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spat
## 10522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     spatial
## 10523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   specially
## 10524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    speeding
## 10525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      speeds
## 10526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spin
## 10527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    spitting
## 10528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       split
## 10529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spoken
## 10530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     spotify
## 10531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spots
## 10532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sprayed
## 10533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    spreader
## 10534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     spreads
## 10535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spring
## 10536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       squad
## 10537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stadium
## 10538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    stamford
## 10539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stamp
## 10540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    standard
## 10541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     standby
## 10542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  starvation
## 10543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    stations
## 10544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   stephanie
## 10545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    stepping
## 10546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       steve
## 10547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sticker
## 10548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sticking
## 10549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stifles
## 10550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  stigmabase
## 10551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   stimulate
## 10552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stinks
## 10553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stole
## 10554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stood
## 10555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      storey
## 10556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  storylines
## 10557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    stranger
## 10558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   strategic
## 10559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stress
## 10560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      strict
## 10561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    striking
## 10562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stroke
## 10563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   strongest
## 10564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  structural
## 10565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   structure
## 10566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    subjects
## 10567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      submit
## 10568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   subscribe
## 10569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  subsequent
## 10570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  substances
## 10571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 substantial
## 10572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     subzero
## 10573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suffers
## 10574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        suit
## 10575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     summers
## 10576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sums
## 10577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sun
## 10578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sunshine
## 10579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       super
## 10580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   superhero
## 10581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  supportive
## 10582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 suppressing
## 10583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     supreme
## 10584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     surgeon
## 10585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    surgical
## 10586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     surveys
## 10587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       susan
## 10588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     susanna
## 10589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     swabbed
## 10590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       swabs
## 10591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       swans
## 10592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sweeping
## 10593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    swimming
## 10594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     swindon
## 10595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    swinging
## 10596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    symbolic
## 10597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     symptom
## 10598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   symptoms�
## 10599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  systematic
## 10600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     systems
## 10601                                                                                                                                                                                                                                                                                                                                                                                                                                                                           t<u+03b7><u+03bd>
## 10602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       table
## 10603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tag
## 10604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tail
## 10605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      taiwan
## 10606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tambi�n
## 10607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       taper
## 10608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   tarnished
## 10609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        task
## 10610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    tatchell
## 10611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   taxpayers
## 10612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tbi
## 10613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          te
## 10614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tea
## 10615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tearing
## 10616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   technical
## 10617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  techniques
## 10618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    teenager
## 10619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        temp
## 10620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    template
## 10621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tennis
## 10622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     terapia
## 10623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  terminator
## 10624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   terrified
## 10625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   territory
## 10626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   testament
## 10627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        thea
## 10628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        theo
## 10629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thier
## 10630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       this�
## 10631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  thoughtful
## 10632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  threatened
## 10633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     threats
## 10634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    thrilled
## 10635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      thrive
## 10636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thrived
## 10637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      throat
## 10638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  thrombosis
## 10639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  thrombotic
## 10640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    thuggery
## 10641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      thumbs
## 10642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tight
## 10643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tips
## 10644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tired
## 10645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      titled
## 10646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     toilets
## 10647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    tolerate
## 10648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tommy
## 10649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tongue
## 10650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    tonights
## 10651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      topics
## 10652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tops
## 10653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        torn
## 10654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     touched
## 10655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     touches
## 10656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    touching
## 10657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tours
## 10658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      traced
## 10659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 traditional
## 10660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   trafalgar
## 10661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  tragically
## 10662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     trained
## 10663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      trains
## 10664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    transfer
## 10665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   transform
## 10666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                transforming
## 10667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  translated
## 10668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 transmitted
## 10669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                transparency
## 10670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  transplant
## 10671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     trapped
## 10672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   traveling
## 10673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     travels
## 10674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tree
## 10675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      trials
## 10676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       troop
## 10677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    trooping
## 10678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      truely
## 10679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     trustee
## 10680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      trusts
## 10681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tub
## 10682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tube
## 10683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tues
## 10684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tunza
## 10685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      turkey
## 10686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tying
## 10687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   typically
## 10688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          t�
## 10689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        uber
## 10690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ugh
## 10691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ukinmorocco
## 10692                                                                                                                                                                                                                                                                                                                                                                                                                                                                               un<u+03b9>ted
## 10693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       uncle
## 10694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       uncut
## 10695                                                                                                                                                                                                                                                                                                                                                                                                                                                                               underestimate
## 10696                                                                                                                                                                                                                                                                                                                                                                                                                                                                             underestimating
## 10697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  undergoing
## 10698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    underway
## 10699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        undo
## 10700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                undocumented
## 10701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     undoing
## 10702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 undoubtedly
## 10703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  unemployed
## 10704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                unexpectedly
## 10705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      unfair
## 10706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   unfolding
## 10707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     uniform
## 10708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       union
## 10709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      unions
## 10710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unity
## 10711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                universities
## 10712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  unreported
## 10713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      unrest
## 10714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         uns
## 10715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     unusual
## 10716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   unusually
## 10717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    upcoming
## 10718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      upload
## 10719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      upping
## 10720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       upset
## 10721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        urge
## 10722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       urged
## 10723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      urging
## 10724                                                                                                                                                                                                                                                                                                                                                                                                                                                           us<u+0001f30d>all<u+2620><u+fe0f>
## 10725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       users
## 10726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     utility
## 10727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       uturn
## 10728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vai
## 10729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     valuing
## 10730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vandals
## 10731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vans
## 10732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    variable
## 10733                                                                                                                                                                                                                                                                                                                                                                                                                                                                               vasculotropic
## 10734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         veg
## 10735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ventilation
## 10736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ventilator
## 10737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ventilators
## 10738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     venture
## 10739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       venue
## 10740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vernon
## 10741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   viewpoint
## 10742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        viiv
## 10743                                                                                                                                                                                                                                                                                                                                                                                                                                                                             villagescovid19
## 10744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     violent
## 10745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vip
## 10746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       viral
## 10747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      virgin
## 10748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      visors
## 10749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   visualise
## 10750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  visualised
## 10751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    visually
## 10752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vlog
## 10753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      voided
## 10754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      voters
## 10755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       votes
## 10756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wages
## 10757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      waited
## 10758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      walker
## 10759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       walls
## 10760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wankers
## 10761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wanna
## 10762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       warns
## 10763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wartime
## 10764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wary
## 10765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    watering
## 10766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    weakness
## 10767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  weaknesses
## 10768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      weapon
## 10769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         web
## 10770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    webinars
## 10771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    websites
## 10772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wedi
## 10773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        weds
## 10774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        weed
## 10775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    weekdays
## 10776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    weekends
## 10777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      weeks�
## 10778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wel
## 10779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    welcomed
## 10780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      weston
## 10781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         we�
## 10782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wh
## 10783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     whately
## 10784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    whatsapp
## 10785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      whitby
## 10786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   whitehall
## 10787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      whitty
## 10788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       whove
## 10789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       who�d
## 10790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    wilfully
## 10791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     windsor
## 10792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       windy
## 10793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      winner
## 10794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     winners
## 10795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  withregram
## 10796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     witness
## 10797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wives
## 10798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         won
## 10799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        woop
## 10800                                                                                                                                                                                                                                                                                                                                                                                                                                                                              worcestershire
## 10801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wore
## 10802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    workshop
## 10803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   workshops
## 10804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                worldbeating
## 10805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     worship
## 10806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      worthy
## 10807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wouldve
## 10808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wrexham
## 10809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wtaf
## 10810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 wythenshawe
## 10811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  xenophobic
## 10812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        xmas
## 10813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         yea
## 10814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  yesterdays
## 10815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       you�d
## 10816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         yrs
## 10817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       yulin
## 10818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       y�day
## 10819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      zanupf
## 10820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       zoo�s
## 10821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �525k
## 10822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �6bn
## 10823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �are
## 10824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �as
## 10825                                                                                                                                                                                                                                                                                                                                                                                                                                                                               �astonishing�
## 10826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   �capacity
## 10827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   �climbing
## 10828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �don�t
## 10829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �firma
## 10830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �it�s
## 10831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �i�m
## 10832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �just
## 10833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �long
## 10834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �ltima
## 10835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �new
## 10836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �new�
## 10837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   �systemic
## 10838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �take
## 10839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �there
## 10840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 �tradeoffs�
## 10841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �very
## 10842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    �victims
## 10843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �we�ve
## 10844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �what
## 10845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �world
## 10846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @19cbrl
## 10847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @38degrees
## 10848                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @actionfrauduk
## 10849                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @activedearnesw1
## 10850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @adamwagner1
## 10851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @adphuk
## 10852                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @adrianreece1
## 10853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @adspb
## 10854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ajenglish
## 10855                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @alexnorrisnn
## 10856                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @alisonwiddup
## 10857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @amazon
## 10858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @anna22361
## 10859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @apple
## 10860                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @archanataide
## 10861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bbc5live
## 10862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bbccasualty
## 10863                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bbceducation
## 10864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bbcnewsni
## 10865                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @bbcscotlandnews
## 10866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bbcsport
## 10867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bettemidler
## 10868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @bjgw
## 10869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bootsuk
## 10870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @britisharmy
## 10871                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @businessinsider
## 10872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cambslive
## 10873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @camcitco
## 10874                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @campbellclaret
## 10875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @carerstrust
## 10876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @carersuk
## 10877                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @carolecadwalla
## 10878                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cashwithflash
## 10879                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @catalinlucian6
## 10880                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @chrisdysonht
## 10881                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @chrismasonbbc
## 10882                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @chrismasonviews
## 10883                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @churchofengland
## 10884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cntwnhs
## 10885                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @confidencenac
## 10886                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @curtisstigers
## 10887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @cvuhb
## 10888                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @cyrilramaphosa
## 10889                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @daisyfancourt
## 10890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @danwilljo
## 10891                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @davejenks2020
## 10892                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @daviddavismp
## 10893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @davidlammy
## 10894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @deniset01
## 10895                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @dessiegibson
## 10896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dgurdasani1
## 10897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @docsad1
## 10898                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @drcarterp118
## 10899                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @drdrobertson
## 10900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @drericding
## 10901                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @drfrancesryan
## 10902                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @drhilaryjones
## 10903                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @drnicolabrink
## 10904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @edmnangagwa
## 10905                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @educationgovuk
## 10906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @emmakennytv
## 10907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @emmarcpch
## 10908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @eprjcts
## 10909                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ericlorandini
## 10910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @esrc
## 10911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @eyalliance
## 10912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @fa
## 10913                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @faridapirani
## 10914                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @farooqkperogi
## 10915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @fcdogovuk
## 10916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @femisorry
## 10917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @fliceverett
## 10918                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @foresthills1903
## 10919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @fotoole
## 10920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gammonuncle
## 10921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @garyafmuk
## 10922                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @gayane71254170
## 10923                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @gerrythecynic
## 10924                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @givebloodnhs
## 10925                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @governmentza
## 10926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @gsttnhs
## 10927                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @gsttspecambu
## 10928                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @harrietsergeant
## 10929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @healthdpt
## 10930                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hhepplewhite
## 10931                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @homeschoolcroft
## 10932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @hycolinuk
## 10933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @iaindale
## 10934                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @ianjamesparsley
## 10935                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @independentsage
## 10936                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @indiratandon1
## 10937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @iodine188
## 10938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @j4ck97
## 10939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @jack
## 10940                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @jamesymccusker1
## 10941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jet2tweets
## 10942                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jimfromoldham
## 10943                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @johnbishop100
## 10944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jonashworth
## 10945                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @joshuawareham
## 10946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @kathcalvert
## 10947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @kathevans2
## 10948                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kevinmaguire
## 10949                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @kirstiemallsopp
## 10950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @krishgm
## 10951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ksb79
## 10952                                                                                                                                                                                                                                                                                                                                                                                                                                                                           @labelmedelirious
## 10953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lancspolice
## 10954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @laylamoran
## 10955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @lbcnews
## 10956                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @lbofhounslow
## 10957                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @leedschildrens
## 10958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @leedspci
## 10959                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @lessthan15chars
## 10960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @lidlgb
## 10961                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @liliangreenwood
## 10962                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @lloydspharmacy
## 10963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @lucyallan
## 10964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @lufc
## 10965                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lynnmsheridan
## 10966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mailsport
## 10967                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @mamtadh21517562
## 10968                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @manchesterhcc
## 10969                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @mancitycouncil
## 10970                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @manorviewnhs
## 10971                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @marcusrashford
## 10972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @markhayter1
## 10973                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @maryboustedneu
## 10974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @matronkim
## 10975                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @matthew900118
## 10976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mattrodda
## 10977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @maudsleynhs
## 10978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mennewsdesk
## 10979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mlackeus
## 10980                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @moghalukingsley
## 10981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mohcczim
## 10982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mrdanwalker
## 10983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mrjamesob
## 10984                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @nadiawhittomemp
## 10985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nasuwt
## 10986                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @natik12964758
## 10987                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ncaresearchnhs
## 10988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ndnatalk
## 10989                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @newhamlondon
## 10990                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @nhsbartshealth
## 10991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @nhsbt
## 10992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nhsggc
## 10993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nhsgrampian
## 10994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @nhsleeds
## 10995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nidhitikoo
## 10996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @nikkikf
## 10997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @normanlamb
## 10998                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @northbristolnhs
## 10999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nypost
## 11000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @nytimes
## 11001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ofmpp
## 11002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ofstednews
## 11003                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @oliverdowden
## 11004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @ons
## 11005                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @paramedicsuk
## 11006                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @paulbhampton
## 11007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @pershoredan
## 11008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @phsofficial
## 11009                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @premierleague
## 11010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @rcplondon
## 11011                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @realjoelsmalley
## 11012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @riddleannie
## 11013                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @robofsalisbury
## 11014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @roobyhb
## 11015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ryanair
## 11016                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @sailawayonblue
## 11017                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @salfordcyprese1
## 11018                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @scotgovhealth
## 11019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @scottishfa
## 11020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @shanemuk
## 11021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sharrond62
## 11022                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @simonwhittle1
## 11023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @slamdon2019
## 11024                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @socialmediajon1
## 11025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @spfl
## 11026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @spfltrust
## 11027                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @staffmoorlanddc
## 11028                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @stgeorgestrust
## 11029                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @stjohnambulance
## 11030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @suec00k
## 11031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @supremecbd
## 11032                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @swsportsnews
## 11033                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @tesssummers98
## 11034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @thebda
## 11035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @thebma
## 11036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @thecsp
## 11037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @thefreds
## 11038                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @thesarcasticbar
## 11039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @thismorning
## 11040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @tomhfh
## 11041                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @tomswarbrick1
## 11042                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @tomtugendhat
## 11043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @ucu
## 11044                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @uksciencechief
## 11045                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @unitetheunion
## 11046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @virginmedia
## 11047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @walesonline
## 11048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @westm61
## 11049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @whhnhs
## 11050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @widehope
## 11051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @worldbank
## 11052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @wwe
## 11053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @yelesowore
## 11054                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @yvettecoopermp
## 11055                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #aberdeenshire
## 11056                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #activedearne
## 11057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #africa
## 11058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #art
## 11059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #australia�s
## 11060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #avct
## 11061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #backtowork
## 11062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #barnet
## 11063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #beautiful
## 11064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #bekind
## 11065                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #besafeoutthere
## 11066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #beware
## 11067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #beyourself
## 11068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #birmingham
## 11069                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #blackandwhitephotography
## 11070                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #borishasfailedthenation
## 11071                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #borishasfailedtheuk
## 11072                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #bottlefedbaby
## 11073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #breaking
## 11074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #bristol
## 11075                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #buildbackbetter
## 11076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #care
## 11077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #carehome
## 11078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #cheshire
## 11079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #chic
## 11080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #child
## 11081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #childrights
## 11082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #china
## 11083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #city
## 11084                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #coronavirusupdate
## 11085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #coronovirus
## 11086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #coverup
## 11087                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #covid19vaccination
## 11088                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #covidsecondwave
## 11089                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #covidwarriors
## 11090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covit19
## 11091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #cryptoart
## 11092                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #customerservice
## 11093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #cyp
## 11094                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #cypruslockdown
## 11095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #dailywalk
## 11096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #dance
## 11097                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #dancephotography
## 11098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #data
## 11099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #derbyshire
## 11100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #detox
## 11101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #devon
## 11102                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #diamantesbysammie
## 11103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #digitalart
## 11104                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #documentaryphotography
## 11105                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #dresstoimpress
## 11106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #edinburgh
## 11107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #embrace
## 11108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #engvssl
## 11109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #epl
## 11110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #exeter
## 11111                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #expressfeeding
## 11112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #facemask
## 11113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #facup
## 11114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #family
## 11115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #fashion
## 11116                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #feedingourbabies
## 11117                                                                                                                                                                                                                                                                                                                                                                                                                                                                #feelthelove<u+2764><u+fe0f>
## 11118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #fightordie
## 11119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #flitwick
## 11120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #focus
## 11121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #france
## 11122                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #freeschoolmeals
## 11123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #fruit
## 11124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #george
## 11125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #givingbirth
## 11126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #glasgow
## 11127                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #governmentsupport
## 11128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #grow
## 11129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #halloween
## 11130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #hampshire
## 11131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #hcsm
## 11132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #hcsmsa
## 11133                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #healthylifestyle
## 11134                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #healthyliving
## 11135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #heartnews
## 11136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #holiday
## 11137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #india
## 11138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #ivermectin
## 11139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #keyworkers
## 11140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #kids
## 11141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #knees
## 11142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #lady
## 11143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #laptop
## 11144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #leadership
## 11145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #lettings
## 11146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #lifesavers
## 11147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #liverpool
## 11148                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #lockdowndiaries
## 11149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #lufc
## 11150                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #makeschoolssafe
## 11151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #manchester
## 11152                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #manchestercity
## 11153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #marketing
## 11154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #maskup
## 11155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #mds
## 11156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #meded
## 11157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #medtwitter
## 11158                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #mentalheathawareness
## 11159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #msk
## 11160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #mum
## 11161                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #needlessdeaths
## 11162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #netherlands
## 11163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #newmothers
## 11164                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #newmotherssupportgroup
## 11165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #newsnight
## 11166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #newyear2021
## 11167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #nftart
## 11168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #nurse
## 11169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #onthisday
## 11170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #open
## 11171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #orders
## 11172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #party
## 11173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #petition
## 11174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #photography
## 11175                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #physiotherapist
## 11176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #poem
## 11177                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #positivevibes
## 11178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #pray
## 11179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #pregnancy
## 11180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #promotion
## 11181                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #propertynews
## 11182                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #publichealth
## 11183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #pumpingmilk
## 11184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #pumpingmom
## 11185                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #quarantinelife
## 11186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #r4today
## 11187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #rdguk
## 11188                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #remotelearning
## 11189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #rights
## 11190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #righttofood
## 11191                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #rugbytonight
## 11192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #rules
## 11193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #safc
## 11194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sammie
## 11195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #saycheese
## 11196                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #schoolclosures
## 11197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #schools
## 11198                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #schoolsreopening
## 11199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #scientists
## 11200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #sheek
## 11201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #shrewsbury
## 11202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #shropshire
## 11203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #slvseng
## 11204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #soccer
## 11205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sonya7
## 11206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #space
## 11207                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #stayconnected
## 11208                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #stayhomestaysafe
## 11209                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #stjohnpeople
## 11210                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #stockportcounty
## 11211                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #streetphotography
## 11212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #support
## 11213                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #supportbreastfeeding
## 11214                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #takeawaylondon
## 11215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #tantwenga
## 11216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #teammvp
## 11217                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #thereisanotherway
## 11218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #throwback
## 11219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #tory
## 11220                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #torycorruption
## 11221                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #toryincompetence
## 11222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #torylies
## 11223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #transfers
## 11224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #travel
## 11225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #trucking
## 11226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #trump
## 11227                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #truswellhaulage
## 11228                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #ukcoronavirus
## 11229                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #ukgovernment
## 11230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #ukhousing
## 11231                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #vaccinationcovid
## 11232                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #vaccinestrategy
## 11233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #virus
## 11234                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #washyourhandsregularly
## 11235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #who
## 11236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #wigwam
## 11237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #winter
## 11238                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #womanofcrypto
## 11239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #women
## 11240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #workout
## 11241                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #yphealthparticipation
## 11242                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1e8><u+0001f1fa>
## 11243                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f1ec><u+0001f1e7><u+0001f489>
## 11244                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f1ec><u+0001f1e7><u+0001f9a0>
## 11245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f30d>
## 11246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f339>
## 11247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f37a>
## 11248                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f3f4><u+000e0067><u+000e0062><u+000e0073><u+000e0063><u+000e0074><u+000e007f>
## 11249                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f447><u+0001f3fc><u+0001f447><u+0001f3fc>
## 11250                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f449><u+0001f3fc>
## 11251                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f44f><u+0001f44f><u+0001f44f>
## 11252                                                                                                                                                                                                                                                                                                                                                                    <u+0001f46e><u+0001f3fb><u+200d><u+2640><u+fe0f><u+0001f46e><u+0001f3fc><u+200d><u+2642><u+fe0f><u+0001f693><u+0001f694>
## 11253                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f4bb>httpstco3fhhfr31g3
## 11254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4eb>
## 11255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4f0>
## 11256                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f4f1>httpstco2gav8rydx1
## 11257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4f7>
## 11258                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f534><u+26aa><u+fe0f><u+0001f535>
## 11259                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f539>5
## 11260                                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f539>covid19
## 11261                                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f5e3><u+fe0f>
## 11262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f600>
## 11263                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f600><u+0001f44d>
## 11264                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f602><u+0001f602><u+0001f602>
## 11265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f609>
## 11266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f612>
## 11267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f620>
## 11268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f621>
## 11269                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f621><u+0001f621>
## 11270                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f622><u+0001f622><u+0001f622>
## 11271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f62b>
## 11272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f642>
## 11273                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f64f><u+0001f3fb>
## 11274                                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f6a8>covid19
## 11275                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f926><u+0001f3fb><u+200d><u+2642><u+fe0f>
## 11276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f92f>
## 11277                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f937><u+0001f3fb><u+200d><u+2640><u+fe0f>
## 11278                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f937><u+0001f3fc><u+200d><u+2642><u+fe0f>
## 11279                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f937><u+200d><u+2640><u+fe0f>
## 11280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f988>
## 11281                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f9d1><u+200d><u+0001f373>
## 11282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0432>
## 11283                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0438><u+0437><u+0437><u+0430>
## 11284                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0645><u+0646>
## 11285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+23f0>
## 11286                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2639><u+fe0f>
## 11287                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+263a><u+fe0f>
## 11288                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+26ab><u+fe0f>
## 11289                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+26bd><u+fe0f>
## 11290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+2728>
## 11291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+274e>
## 11292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+2764>
## 11293                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2b07><u+fe0f><u+2b07><u+fe0f><u+2b07><u+fe0f>
## 11294                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+2b50><u+fe0f>important
## 11295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         10m
## 11296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        10th
## 11297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        12th
## 11298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         1qs
## 11299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         20s
## 11300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        21st
## 11301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        24th
## 11302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         25m
## 11303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        25th
## 11304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        30th
## 11305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      501yv2
## 11306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         50s
## 11307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       7days
## 11308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          7m
## 11309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         85p
## 11310                                                                                                                                                                                                                                                                                                                                                                                                                                                                              a<u+0001f496>x
## 11311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   abandoned
## 11312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     aberfan
## 11313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   abilities
## 11314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      abroad
## 11315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  acceptable
## 11316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    accepted
## 11317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  accessible
## 11318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   accessing
## 11319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   accidents
## 11320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    accounts
## 11321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aches
## 11322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     achieve
## 11323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    achieved
## 11324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 achievement
## 11325                                                                                                                                                                                                                                                                                                                                                                                                                                                                               acknowledging
## 11326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    acquired
## 11327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    activity
## 11328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                activxpress+
## 11329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       acute
## 11330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        adam
## 11331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adapt
## 11332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    adapting
## 11333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   addresses
## 11334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        adds
## 11335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    adelante
## 11336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adhered
## 11337                                                                                                                                                                                                                                                                                                                                                                                                                                                                               administrator
## 11338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   advantage
## 11339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adverts
## 11340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adviser
## 11341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    advising
## 11342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     advisor
## 11343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    advocate
## 11344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   affecting
## 11345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     africas
## 11346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   aftermath
## 11347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                afterthefact
## 11348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      agenda
## 11349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       agora
## 11350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aim
## 11351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aimed
## 11352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    aircraft
## 11353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    airlines
## 11354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    alarming
## 11355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       album
## 11356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alevel
## 11357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alex
## 11358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   alexander
## 11359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ali
## 11360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      allaha
## 11361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   allocated
## 11362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alltime
## 11363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   alongside
## 11364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 alternative
## 11365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amaze
## 11366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ambitious
## 11367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ampthill
## 11368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 anaphylaxis
## 11369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       andor
## 11370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     android
## 11371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       angry
## 11372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     animals
## 11373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 anniversary
## 11374                                                                                                                                                                                                                                                                                                                                                                                                                                                                               announcements
## 11375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  announcing
## 11376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   annoyance
## 11377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     annoyed
## 11378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ano
## 11379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   anonymous
## 11380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     answers
## 11381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 antivaccine
## 11382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anvisa
## 11383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anytime
## 11384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     apalagi
## 11385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   apologies
## 11386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    apparent
## 11387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  appearance
## 11388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   appearing
## 11389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    appetite
## 11390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 application
## 11391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  approaches
## 11392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 approaching
## 11393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    approves
## 11394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        apps
## 11395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       appts
## 11396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aqui
## 11397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ar
## 11398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arena
## 11399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arguing
## 11400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    argument
## 11401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arise
## 11402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       armed
## 11403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arms
## 11404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arrange
## 11405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arrest
## 11406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arrived
## 11407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arsed
## 11408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     artists
## 11409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        asap
## 11410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  assertions
## 11411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      assist
## 11412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   assisting
## 11413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   associate
## 11414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      assure
## 11415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     assured
## 11416                                                                                                                                                                                                                                                                                                                                                                                                                                                                           astrazenecaoxford
## 11417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   athletics
## 11418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attached
## 11419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attempts
## 11420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  attributed
## 11421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       audit
## 11422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  authorised
## 11423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  autoimmune
## 11424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     avoided
## 11425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   avonmouth
## 11426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    awaiting
## 11427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aye
## 11428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       badge
## 11429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bailiwick
## 11430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     balance
## 11431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    balanced
## 11432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        band
## 11433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     banging
## 11434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bare
## 11435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      barnet
## 11436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       baron
## 11437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bars
## 11438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    baseline
## 11439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bastards
## 11440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     batches
## 11441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bath
## 11442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bbl
## 11443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       beach
## 11444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beaten
## 11445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     beating
## 11446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beauty
## 11447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        beef
## 11448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      behalf
## 11449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     belfast
## 11450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      belief
## 11451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    believer
## 11452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ben
## 11453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bend
## 11454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    benjamin
## 11455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    berbagai
## 11456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bernard
## 11457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bets
## 11458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beware
## 11459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       biden
## 11460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bien
## 11461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bigger
## 11462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bike
## 11463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    billions
## 11464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bio
## 11465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    biontech
## 11466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bishop
## 11467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bits
## 11468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blast
## 11469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blend
## 11470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    blessing
## 11471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         blm
## 11472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     blocked
## 11473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blogs
## 11474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bloke
## 11475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blow
## 11476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bma
## 11477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bolton
## 11478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bomb
## 11479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       books
## 11480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     booster
## 11481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bother
## 11482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bottom
## 11483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 bournemouth
## 11484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boy
## 11485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bracing
## 11486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brains
## 11487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   braintree
## 11488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brasil
## 11489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brave
## 11490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    breached
## 11491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   breaching
## 11492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      breast
## 11493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    breeding
## 11494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   brentford
## 11495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brighter
## 11496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    britains
## 11497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   broadcast
## 11498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  broadcasts
## 11499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brutal
## 11500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         btw
## 11501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bu
## 11502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bubbles
## 11503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bucks
## 11504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     buffoon
## 11505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   buildings
## 11506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bulk
## 11507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bumbling
## 11508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       buses
## 11509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cake
## 11510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    calendar
## 11511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cambodia
## 11512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       camps
## 11513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    canceled
## 11514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  candidates
## 11515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cara
## 11516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     caravan
## 11517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      career
## 11518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   carefully
## 11519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        carl
## 11520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       casos
## 11521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    casualty
## 11522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    catholic
## 11523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cautious
## 11524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      caveat
## 11525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ce
## 11526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cease
## 11527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 celebration
## 11528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                celebrations
## 11529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   celebrity
## 11530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cells
## 11531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cent
## 11532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     centers
## 11533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   centuries
## 11534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     century
## 11535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cepa
## 11536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                certificates
## 11537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   certified
## 11538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       champ
## 11539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    champion
## 11540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chapter
## 11541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     charges
## 11542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     charles
## 11543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   charlotte
## 11544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chase
## 11545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chasing
## 11546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chat
## 11547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    chatting
## 11548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cheap
## 11549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cheers
## 11550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  chichester
## 11551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   childrens
## 11552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  children�s
## 11553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chills
## 11554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chilly
## 11555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chimney
## 11556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     china�s
## 11557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chose
## 11558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    churches
## 11559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cic
## 11560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       circa
## 11561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     circles
## 11562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      city�s
## 11563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       civic
## 11564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       civil
## 11565                                                                                                                                                                                                                                                                                                                                                                                                                                                                               clarification
## 11566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    clarkson
## 11567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     classed
## 11568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       clean
## 11569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cleaning
## 11570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cliff
## 11571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     clothes
## 11572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    clothing
## 11573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cloud
## 11574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cmo
## 11575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        code
## 11576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    collapse
## 11577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  collateral
## 11578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  collection
## 11579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 collections
## 11580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    colleges
## 11581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    combined
## 11582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      comedy
## 11583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  commentary
## 11584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   committed
## 11585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  comparison
## 11586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 comparisons
## 11587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  compensate
## 11588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 competition
## 11589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 complacency
## 11590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    complain
## 11591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  completing
## 11592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     complex
## 11593                                                                                                                                                                                                                                                                                                                                                                                                                                                                               complications
## 11594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 compromised
## 11595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     concert
## 11596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  conducting
## 11597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  confidence
## 11598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     confuse
## 11599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                conspiracies
## 11600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                constituents
## 11601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cont
## 11602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  contacting
## 11603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  continuous
## 11604                                                                                                                                                                                                                                                                                                                                                                                                                                                                               contributions
## 11605                                                                                                                                                                                                                                                                                                                                                                                                                                                                               controversial
## 11606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   convinced
## 11607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   corporate
## 11608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  corruption
## 11609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       costa
## 11610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   council�s
## 11611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     countys
## 11612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     courage
## 11613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     courses
## 11614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      courts
## 11615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     covered
## 11616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      covers
## 11617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    covid19+
## 11618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 covid192021
## 11619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   covid19�s
## 11620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   coworkers
## 11621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crawl
## 11622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     crawley
## 11623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      crazed
## 11624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    creating
## 11625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    credible
## 11626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crews
## 11627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cricket
## 11628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cried
## 11629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    criteria
## 11630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  critically
## 11631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 criticizing
## 11632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cronies
## 11633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cronyism
## 11634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cumbria
## 11635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cunts
## 11636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      curing
## 11637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     curious
## 11638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       curve
## 11639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cute
## 11640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cuz
## 11641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cwm
## 11642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cyp
## 11643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         czy
## 11644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    damaging
## 11645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dame
## 11646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       davis
## 11647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   deadliest
## 11648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dead�
## 11649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dean
## 11650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     debates
## 11651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deceit
## 11652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decent
## 11653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decide
## 11654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    deciding
## 11655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   decimated
## 11656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     defence
## 11657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  definition
## 11658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        defy
## 11659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    delaying
## 11660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      delays
## 11661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       delhi
## 11662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   demanding
## 11663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     demands
## 11664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  democratic
## 11665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 demonstrate
## 11666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         den
## 11667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     denying
## 11668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   dependent
## 11669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      depois
## 11670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  depression
## 11671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     derived
## 11672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 description
## 11673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    deserved
## 11674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    deserves
## 11675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      design
## 11676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  designated
## 11677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    designed
## 11678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 destruction
## 11679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    detained
## 11680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      detect
## 11681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   determine
## 11682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       detox
## 11683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  developers
## 11684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  developing
## 11685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    devotees
## 11686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    diabetic
## 11687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dig
## 11688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   direction
## 11689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   directors
## 11690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dirt
## 11691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dirty
## 11692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  disability
## 11693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disabled
## 11694                                                                                                                                                                                                                                                                                                                                                                                                                                                                               disadvantaged
## 11695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 disappeared
## 11696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 disasterous
## 11697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                disciplinary
## 11698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  discomfort
## 11699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   discounts
## 11700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   discussed
## 11701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disgusted
## 11702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   dishonest
## 11703                                                                                                                                                                                                                                                                                                                                                                                                                                                                              disinformation
## 11704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  displaying
## 11705                                                                                                                                                                                                                                                                                                                                                                                                                                                                            disproportionate
## 11706                                                                                                                                                                                                                                                                                                                                                                                                                                                                          disproportionately
## 11707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  disrespect
## 11708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                distribution
## 11709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dither
## 11710                                                                                                                                                                                                                                                                                                                                                                                                                                                                               doctorsnurses
## 11711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 documentary
## 11712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    domestic
## 11713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dominic
## 11714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     donated
## 11715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       doors
## 11716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dragged
## 11717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    draining
## 11718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dreadful
## 11719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dreamlab
## 11720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dressed
## 11721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    drinking
## 11722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     droplet
## 11723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    droplets
## 11724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dropped
## 11725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dropping
## 11726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dup
## 11727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dylan
## 11728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         d�a
## 11729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        d�as
## 11730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          e3
## 11731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    earliest
## 11732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ears
## 11733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      easily
## 11734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      easter
## 11735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      eating
## 11736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ecosystems
## 11737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ecstatic
## 11738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    effected
## 11739                                                                                                                                                                                                                                                                                                                                                                                                                                                                               effectiveness
## 11740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  efficiency
## 11741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 efficiently
## 11742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        egen
## 11743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eh
## 11744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                eightyearold
## 11745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   elearning
## 11746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     elected
## 11747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    election
## 11748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       elude
## 11749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       elvis
## 11750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 emotionally
## 11751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    employee
## 11752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   employers
## 11753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  employment
## 11754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  encouraged
## 11755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       endon
## 11756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      energy
## 11757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    engaging
## 11758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   enjoyable
## 11759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ensured
## 11760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ensuring
## 11761                                                                                                                                                                                                                                                                                                                                                                                                                                                                               entertainment
## 11762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       entre
## 11763                                                                                                                                                                                                                                                                                                                                                                                                                                                                              epidemiologist
## 11764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    epiphany
## 11765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       epsom
## 11766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      equals
## 11767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  equivalent
## 11768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          er
## 11769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  essentials
## 11770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        esta
## 11771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      estate
## 11772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        est�
## 11773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       est�o
## 11774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    evenings
## 11775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exam
## 11776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exams
## 11777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     excuses
## 11778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   executive
## 11779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exeter
## 11780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 expectation
## 11781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     expense
## 11782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   explained
## 11783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  explaining
## 11784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 explanation
## 11785                                                                                                                                                                                                                                                                                                                                                                                                                                                                               exponentially
## 11786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      expose
## 11787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   extensive
## 11788                                                                                                                                                                                                                                                                                                                                                                                                                                                                               extraordinary
## 11789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     extreme
## 11790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    facility
## 11791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      factor
## 11792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     failing
## 11793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fairwinds
## 11794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fairy
## 11795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       falls
## 11796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     familia
## 11797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      famous
## 11798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fanciful
## 11799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       farts
## 11800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fastest
## 11801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fat
## 11802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    favorite
## 11803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   favourite
## 11804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fa�s
## 11805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fda
## 11806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fe
## 11807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      feared
## 11808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    featured
## 11809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        feed
## 11810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        feet
## 11811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ferguson
## 11812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    festival
## 11813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     festive
## 11814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 festivities
## 11815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fields
## 11816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fight�
## 11817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      filled
## 11818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     filming
## 11819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     finance
## 11820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 finestcovid
## 11821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   finishing
## 11822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fir
## 11823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     firstly
## 11824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fish
## 11825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fits
## 11826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fixed
## 11827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       flash
## 11828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flat
## 11829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    flitwick
## 11830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      flying
## 11831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    focusing
## 11832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    followup
## 11833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     footage
## 11834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      forces
## 11835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    forecast
## 11836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      forest
## 11837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      formal
## 11838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fortunate
## 11839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fought
## 11840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  foundation
## 11841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     francis
## 11842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fraud
## 11843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fraudster
## 11844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     freedom
## 11845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 freelancers
## 11846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gamble
## 11847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gap
## 11848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gaps
## 11849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 gaslighting
## 11850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gates
## 11851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   gathering
## 11852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  gatherings
## 11853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gavin
## 11854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gaza
## 11855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gear
## 11856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     generic
## 11857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  generosity
## 11858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    genetics
## 11859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      genome
## 11860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      german
## 11861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ghastly
## 11862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gift
## 11863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gill
## 11864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gla
## 11865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  gloucester
## 11866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    gobierno
## 11867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gods
## 11868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gonna
## 11869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    goodness
## 11870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      google
## 11871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gordon
## 11872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    gorgeous
## 11873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    gorillas
## 11874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       govuk
## 11875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    grandson
## 11876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      graphs
## 11877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       grasp
## 11878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  grassroots
## 11879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       grave
## 11880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                gregorysayce
## 11881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    grieving
## 11882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     grimsby
## 11883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       groom
## 11884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gross
## 11885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   groupings
## 11886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     growing
## 11887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    guardian
## 11888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   guildford
## 11889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      guilty
## 11890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gun
## 11891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gupta
## 11892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gyms
## 11893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       habit
## 11894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hair
## 11895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     halifax
## 11896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   hampshire
## 11897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         han
## 11898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      handed
## 11899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     handful
## 11900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     handing
## 11901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hardest
## 11902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      harley
## 11903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hashtag
## 11904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hats
## 11905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     heading
## 11906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     healgen
## 11907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    healthy�
## 11908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hearts
## 11909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hearty
## 11910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       heath
## 11911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     heights
## 11912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        herd
## 11913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hibs
## 11914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hide
## 11915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   highlight
## 11916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 highlighted
## 11917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hip
## 11918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hmrc
## 11919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hoje
## 11920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 hollandkaye
## 11921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   holocaust
## 11922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        holy
## 11923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   homegrown
## 11924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                homelessness
## 11925                                                                                                                                                                                                                                                                                                                                                                                                                                                                               homeschooling
## 11926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     honeys�
## 11927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      honour
## 11928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  horrendous
## 11929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    horrible
## 11930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       horse
## 11931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      horsey
## 11932                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hospitalisations
## 11933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   hospital�
## 11934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hosts
## 11935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    hounslow
## 11936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hoy
## 11937                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/04pftyu4jy
## 11938                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/3coym7zpjg
## 11939                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/5pxbibcpi3
## 11940                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/5qnswfekb6
## 11941                                                                                                                                                                                                                                                                                                                                                                                                                                                                    https://t.co/8d4er2cgex�
## 11942                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/95q3wxrbie
## 11943                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/9q2vnttdah
## 11944                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/9tpkslrrbp
## 11945                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/agscp73mht
## 11946                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/cflrd52zys
## 11947                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/cgbkkwfhas
## 11948                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/en846hirpy
## 11949                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/f3qe6okz9m
## 11950                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/fhg02wlbf1
## 11951                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/fjros2ajig
## 11952                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/fvrzlx7px6
## 11953                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/fw1p6qrjya
## 11954                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/gpidhskgoe
## 11955                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/guoqgahd0u
## 11956                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/h8vd2erfxw
## 11957                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/ht5nuxw4xq
## 11958                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/ivfpdycuk6
## 11959                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/kcgxx7ktsf
## 11960                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/krdwl78wr7
## 11961                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/ldtyv7qm8j
## 11962                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/lyld6bdquz
## 11963                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/matcm3fcvl
## 11964                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/ndawaonxyi
## 11965                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/neq0bkb142
## 11966                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/njmsvqr728
## 11967                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/o0cc7ucv0m
## 11968                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/phy6djn8st
## 11969                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/qvfern5foc
## 11970                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/qwymgky4ks
## 11971                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/qyfcnaxeux
## 11972                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/r02yi7avug
## 11973                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/sobo3edleb
## 11974                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/t5fdpkossx
## 11975                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/twarjqm6ah
## 11976                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/tzprmdqoo9
## 11977                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/u0j3nbqhwq
## 11978                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/uwrl2n9eb7
## 11979                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/vikr9cdsi2
## 11980                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/whkiekinix
## 11981                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/whyydihq6s
## 11982                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/widnipau3m
## 11983                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/wn2idstzew
## 11984                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/y1ax7kfleu
## 11985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hubs
## 11986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hug
## 11987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hugo
## 11988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hurt
## 11989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          h�
## 11990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ian
## 11991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        icus
## 11992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       icu�s
## 11993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    identify
## 11994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ignorance
## 11995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     illegal
## 11996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    illegals
## 11997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       image
## 11998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  immigrants
## 11999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                immunisation
## 12000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   impeached
## 12001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 implemented
## 12002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      import
## 12003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  importance
## 12004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     imposed
## 12005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     incited
## 12006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        incl
## 12007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inclusive
## 12008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  incredible
## 12009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   incre�ble
## 12010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      indian
## 12011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  industrial
## 12012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  inequality
## 12013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                inflammation
## 12014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inflicted
## 12015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  influenced
## 12016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     initial
## 12017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   initially
## 12018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     injured
## 12019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  innovation
## 12020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inquiry
## 12021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      insane
## 12022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    insanity
## 12023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    inspired
## 12024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   instagram
## 12025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  installers
## 12026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   institute
## 12027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 instruction
## 12028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   integrity
## 12029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    intended
## 12030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     intense
## 12031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    internet
## 12032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    interval
## 12033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  introduces
## 12034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   intubated
## 12035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 investigate
## 12036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   involving
## 12037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         in�
## 12038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     iranian
## 12039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       irans
## 12040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    israel�s
## 12041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          iv
## 12042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         j19
## 12043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jack
## 12044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      jaguar
## 12045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       japan
## 12046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jar
## 12047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jason
## 12048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jeg
## 12049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      jeremy
## 12050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      joined
## 12051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     jointly
## 12052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     journal
## 12053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     journey
## 12054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     journos
## 12055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         joy
## 12056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        judd
## 12057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     judging
## 12058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        july
## 12059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      junior
## 12060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     justice
## 12061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     justify
## 12062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kate
## 12063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        katy
## 12064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kent
## 12065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    khamenei
## 12066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    killings
## 12067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       knock
## 12068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kyle
## 12069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       label
## 12070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lad
## 12071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   lambasted
## 12072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   landscape
## 12073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     lanzini
## 12074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     lasting
## 12075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    launches
## 12076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       laura
## 12077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   leadenham
## 12078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   leicester
## 12079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         les
## 12080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lewes
## 12081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   liability
## 12082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      liable
## 12083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lib
## 12084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lied
## 12085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lies
## 12086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lifeboat
## 12087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  lifesaving
## 12088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    limiting
## 12089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      listed
## 12090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      litter
## 12091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lived
## 12092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  livelihood
## 12093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       logic
## 12094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        logo
## 12095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     londres
## 12096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       loose
## 12097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     loosing
## 12098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      losses
## 12099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    luchando
## 12100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     luckily
## 12101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ludicrous
## 12102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        luka
## 12103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   lunchtime
## 12104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       macam
## 12105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mackley
## 12106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     madonna
## 12107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mag
## 12108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      manage
## 12109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      manila
## 12110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mankind
## 12111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                manslaughter
## 12112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                manufactured
## 12113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      marcus
## 12114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      marine
## 12115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mary
## 12116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    maskless
## 12117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     massage
## 12118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   massively
## 12119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   materials
## 12120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   maternity
## 12121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     maximum
## 12122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  meaningful
## 12123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 meaningless
## 12124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      median
## 12125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   medicines
## 12126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    meetings
## 12127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    meltdown
## 12128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    memories
## 12129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mendy
## 12130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mers
## 12131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  merseyside
## 12132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   messaging
## 12133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       metal
## 12134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      metlab
## 12135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       metre
## 12136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                metropolitan
## 12137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       miami
## 12138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mick
## 12139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   microsoft
## 12140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       midst
## 12141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mile
## 12142                                                                                                                                                                                                                                                                                                                                                                                                                                                                               milivojevic�s
## 12143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mill
## 12144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  minister�s
## 12145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mix
## 12146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 mixandmatch
## 12147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mk
## 12148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mobiles
## 12149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   modelling
## 12150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    moderate
## 12151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    modernas
## 12152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       moore
## 12153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      morgan
## 12154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   morgannwg
## 12155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       moron
## 12156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      motors
## 12157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mulki
## 12158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     murdoch
## 12159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      muslim
## 12160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     my3verz
## 12161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        myth
## 12162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         m�s
## 12163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          na
## 12164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       names
## 12165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nans
## 12166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nao
## 12167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 nationality
## 12168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   naturally
## 12169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nature
## 12170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nazis
## 12171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     needles
## 12172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      negara
## 12173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                negotiations
## 12174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   neighbour
## 12175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nejm
## 12176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nepalese
## 12177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nervous
## 12178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       neste
## 12179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         net
## 12180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     network
## 12181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  newsletter
## 12182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nicholas
## 12183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       noise
## 12184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                nonessential
## 12185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       noneu
## 12186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        noor
## 12187                                                                                                                                                                                                                                                                                                                                                                                                                                                                            northamptonshire
## 12188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     norwich
## 12189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nos
## 12190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       noses
## 12191                                                                                                                                                                                                                                                                                                                                                                                                                                                                      notice<u+2b50><u+fe0f>
## 12192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     noticed
## 12193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nueva
## 12194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ny
## 12195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nz
## 12196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   objective
## 12197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    observer
## 12198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      obtain
## 12199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   occasions
## 12200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    occupied
## 12201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     october
## 12202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    offences
## 12203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   officials
## 12204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ofsted
## 12205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      oliver
## 12206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      olivia
## 12207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        olly
## 12208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       one�s
## 12209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       onset
## 12210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          oo
## 12211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   operation
## 12212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     opposed
## 12213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  optimistic
## 12214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      orange
## 12215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ordinary
## 12216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         org
## 12217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        orgy
## 12218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     origins
## 12219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      osborn
## 12220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     outcome
## 12221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    outdoors
## 12222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   outlining
## 12223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                overwhelming
## 12224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pa
## 12225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pacific
## 12226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    packages
## 12227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     packing
## 12228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  paediatric
## 12229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pains
## 12230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     paisley
## 12231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   palestine
## 12232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                palpitations
## 12233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       panic
## 12234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pantry
## 12235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        papa
## 12236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parish
## 12237                                                                                                                                                                                                                                                                                                                                                                                                                                                                               parliamentary
## 12238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   particles
## 12239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    passcode
## 12240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     passion
## 12241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    passport
## 12242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     patrick
## 12243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        paul
## 12244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pa�s
## 12245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peak
## 12246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pedal
## 12247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    peddling
## 12248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    people�s
## 12249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 performance
## 12250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   performed
## 12251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     persons
## 12252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    persuade
## 12253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       perth
## 12254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      phased
## 12255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         phe
## 12256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      phones
## 12257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                photographer
## 12258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      photos
## 12259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pic
## 12260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     picking
## 12261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pics
## 12262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pictures
## 12263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pinning
## 12264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        piss
## 12265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   placement
## 12266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       plant
## 12267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        plea
## 12268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      plenty
## 12269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        plot
## 12270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        plug
## 12271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    plymouth
## 12272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pms
## 12273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    policing
## 12274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      popped
## 12275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 populations
## 12276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      porque
## 12277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    portugal
## 12278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       posed
## 12279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       poses
## 12280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  positively
## 12281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    postpone
## 12282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      powell
## 12283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       power
## 12284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pr1
## 12285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prayer
## 12286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    premises
## 12287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 preocupados
## 12288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    prepared
## 12289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                presentation
## 12290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pressing
## 12291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   pressures
## 12292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     presume
## 12293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  preventing
## 12294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    previews
## 12295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prick
## 12296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  principles
## 12297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 prioritised
## 12298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   prisoners
## 12299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  privileged
## 12300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       probe
## 12301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  procedures
## 12302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   processed
## 12303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     product
## 12304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  profession
## 12305                                                                                                                                                                                                                                                                                                                                                                                                                                                                             professionalism
## 12306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     profile
## 12307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      profit
## 12308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  programmes
## 12309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    projects
## 12310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   prolonged
## 12311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prone
## 12312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  propaganda
## 12313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  properties
## 12314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  prosperous
## 12315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     protein
## 12316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  protesters
## 12317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    province
## 12318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   provision
## 12319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pull
## 12320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pulled
## 12321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    purposes
## 12322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          qa
## 12323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   qualified
## 12324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     qualify
## 12325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   quarterly
## 12326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     queuing
## 12327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quoted
## 12328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rally
## 12329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   rationale
## 12330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rcpch
## 12331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       react
## 12332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reactions
## 12333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   realistic
## 12334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       real�
## 12335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reassure
## 12336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reassured
## 12337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recall
## 12338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recalled
## 12339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reception
## 12340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reckon
## 12341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  recognises
## 12342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   recycling
## 12343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  redeployed
## 12344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reduces
## 12345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rees
## 12346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reference
## 12347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reflect
## 12348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  reflection
## 12349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reform
## 12350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reframing
## 12351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   regaining
## 12352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      regime
## 12353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     regimen
## 12354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    regional
## 12355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     regions
## 12356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      regras
## 12357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        regs
## 12358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  regulatory
## 12359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    relating
## 12360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                relationship
## 12361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    relaxing
## 12362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      remedy
## 12363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   remembers
## 12364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reminder
## 12365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       renal
## 12366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                renfrewshire
## 12367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    repeated
## 12368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  republican
## 12369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     request
## 12370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   required�
## 12371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   requiring
## 12372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  reschedule
## 12373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                rescheduling
## 12374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reset
## 12375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   resisting
## 12376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    resolved
## 12377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   responded
## 12378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    responds
## 12379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 restaurants
## 12380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     resting
## 12381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 restricting
## 12382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     result�
## 12383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      resume
## 12384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    resuming
## 12385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     returns
## 12386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     revenue
## 12387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  revolution
## 12388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rich
## 12389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ride
## 12390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ring
## 12391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        riot
## 12392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       risky
## 12393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rna
## 12394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       route
## 12395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rover
## 12396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ruin
## 12397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ruled
## 12398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rumours
## 12399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rush
## 12400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     russell
## 12401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      russia
## 12402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     russian
## 12403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sacked
## 12404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  sacrifices
## 12405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       safer
## 12406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  sainsburys
## 12407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sales
## 12408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sam
## 12409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sample
## 12410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  sanctioned
## 12411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   sanitised
## 12412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   sanitiser
## 12413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sarah
## 12414                                                                                                                                                                                                                                                                                                                                                                                                                                                                              sawbridgeworth
## 12415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sayisi
## 12416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   scapegoat
## 12417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scappers
## 12418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       scare
## 12419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scenario
## 12420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   sceptical
## 12421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   scorchers
## 12422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       score
## 12423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   scotlands
## 12424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  scotland�s
## 12425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scumbags
## 12426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   scuppered
## 12427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    seasonal
## 12428                                                                                                                                                                                                                                                                                                                                                                                                                                                                               secondhighest
## 12429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    secretly
## 12430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        seek
## 12431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      seguir
## 12432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 selfisolate
## 12433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    selfless
## 12434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    selfrule
## 12435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     selling
## 12436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   semifinal
## 12437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    separate
## 12438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     seperti
## 12439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   sequences
## 12440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sergio
## 12441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 seriousness
## 12442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       serve
## 12443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      server
## 12444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       setup
## 12445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sha
## 12446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shake
## 12447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   shameless
## 12448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shaven
## 12449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shelf
## 12450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                shijiazhuang
## 12451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shite
## 12452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shld
## 12453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shock
## 12454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shocked
## 12455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shockers
## 12456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shone
## 12457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shooting
## 12458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shortage
## 12459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shorter
## 12460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shots
## 12461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shout
## 12462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  shrewsbury
## 12463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shush
## 12464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shutting
## 12465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 sightseeing
## 12466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       signs
## 12467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sigo
## 12468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     simpson
## 12469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sin
## 12470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sink
## 12471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      skills
## 12472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sleep
## 12473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       slick
## 12474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    slightly
## 12475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     slowing
## 12476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    smallpox
## 12477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      smooth
## 12478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         snd
## 12479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sobre
## 12480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   socialism
## 12481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        soft
## 12482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   solutions
## 12483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       solve
## 12484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        song
## 12485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         soo
## 12486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sooner
## 12487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       souls
## 12488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   sourdough
## 12489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    southend
## 12490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spaces
## 12491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spat
## 12492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    speakers
## 12493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 specialists
## 12494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                specifically
## 12495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   spectator
## 12496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    spending
## 12497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spfl
## 12498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spiral
## 12499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spirit
## 12500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       split
## 12501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spout
## 12502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spray
## 12503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   spreaders
## 12504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spurs
## 12505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sputnik
## 12506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      square
## 12507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stance
## 12508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stands
## 12509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     staring
## 12510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stars
## 12511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stating
## 12512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stayed
## 12513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stays
## 12514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    steroids
## 12515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stole
## 12516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stone
## 12517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     storage
## 12518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     streams
## 12519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     striker
## 12520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     strokes
## 12521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    strongly
## 12522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   structure
## 12523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stuck
## 12524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     studies
## 12525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   stupidity
## 12526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       style
## 12527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   subscribe
## 12528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sucks
## 12529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sudanese
## 12530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    suddenly
## 12531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                sufficiently
## 12532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   suggested
## 12533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    suicidal
## 12534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       suite
## 12535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sums
## 12536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      superb
## 12537                                                                                                                                                                                                                                                                                                                                                                                                                                                                               superspreader
## 12538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    supplied
## 12539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    suppress
## 12540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     surface
## 12541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    surfaces
## 12542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   surgeries
## 12543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     surpass
## 12544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   surrender
## 12545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 susceptible
## 12546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   suspected
## 12547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sutton
## 12548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sweets
## 12549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       swine
## 12550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       swiss
## 12551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          s�
## 12552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         s�o
## 12553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         taf
## 12554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   takeaways
## 12555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   talkradio
## 12556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tamils
## 12557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tan
## 12558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tank
## 12559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tape
## 12560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        task
## 12561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tasks
## 12562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   taxpayers
## 12563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tbf
## 12564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    teamwork
## 12565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ted
## 12566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   teenagers
## 12567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       teeth
## 12568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        temp
## 12569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tenemos
## 12570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    terminal
## 12571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  terrifying
## 12572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tesco
## 12573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   testament
## 12574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tfl
## 12575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    thankful
## 12576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    thankyou
## 12577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     theatre
## 12578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    theatres
## 12579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    theorist
## 12580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      theory
## 12581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     thereof
## 12582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        thin
## 12583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   threshold
## 12584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      throat
## 12585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      thrown
## 12586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tiene
## 12587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tiers
## 12588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ties
## 12589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tighten
## 12590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  tightening
## 12591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   timetable
## 12592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tipped
## 12593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tips
## 12594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       title
## 12595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 tocilizumab
## 12596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        toda
## 12597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tools
## 12598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tooth
## 12599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    toughest
## 12600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tour
## 12601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    tracking
## 12602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   tradition
## 12603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 traditional
## 12604                                                                                                                                                                                                                                                                                                                                                                                                                                                                               traditionally
## 12605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    trafford
## 12606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  tragically
## 12607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       train
## 12608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     trained
## 12609                                                                                                                                                                                                                                                                                                                                                                                                                                                                              transformation
## 12610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  transition
## 12611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   translink
## 12612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    transmit
## 12613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                transmitters
## 12614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 transparent
## 12615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       trash
## 12616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tree
## 12617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       trend
## 12618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      trends
## 12619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       trick
## 12620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      triple
## 12621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     trump�s
## 12622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tube
## 12623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tune
## 12624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tweeted
## 12625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  twickenham
## 12626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   typically
## 12627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          t�
## 12628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         uae
## 12629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          uc
## 12630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    umbrella
## 12631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                unacceptable
## 12632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                unbelievable
## 12633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 uncertainty
## 12634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       uncle
## 12635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     unclear
## 12636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 undermining
## 12637                                                                                                                                                                                                                                                                                                                                                                                                                                                                              understatement
## 12638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 undoubtedly
## 12639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                unemployment
## 12640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      unfair
## 12641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     unified
## 12642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     unisons
## 12643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   unloading
## 12644                                                                                                                                                                                                                                                                                                                                                                                                                                                                               unnecessarily
## 12645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      unsafe
## 12646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    upcoming
## 12647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ups
## 12648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    uptodate
## 12649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     upwards
## 12650                                                                                                                                                                                                                                                                                                                                                                                                                                                                            vaccinateagainst
## 12651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  vaccinate�
## 12652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 vaccinators
## 12653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vallance
## 12654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      valley
## 12655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      valued
## 12656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         van
## 12657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    variante
## 12658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 variant�but
## 12659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     variety
## 12660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      venues
## 12661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      versus
## 12662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vials
## 12663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     victims
## 12664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     victory
## 12665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      videos
## 12666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vietnam
## 12667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     viewing
## 12668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vigilant
## 12669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       viner
## 12670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    virology
## 12671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        visa
## 12672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vodka
## 12673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      voting
## 12674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     voucher
## 12675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vouchers
## 12676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vowed
## 12677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       waits
## 12678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      walked
## 12679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  wandsworth
## 12680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   warehouse
## 12681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      warned
## 12682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  warrington
## 12683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     waspada
## 12684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wasting
## 12685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       waves
## 12686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wbro
## 12687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    weakness
## 12688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wealthy
## 12689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wearer
## 12690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         web
## 12691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    webinars
## 12692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     webpage
## 12693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wedding
## 12694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    weekends
## 12695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       week�
## 12696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    welcomed
## 12697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     welfare
## 12698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wembley
## 12699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wen
## 12700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wheel
## 12701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wheeze
## 12702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        whip
## 12703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  whitstable
## 12704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      who�ve
## 12705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      widely
## 12706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  widespread
## 12707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wifi
## 12708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     william
## 12709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  williamson
## 12710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     windows
## 12711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    winnings
## 12712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wood
## 12713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   worsening
## 12714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wot
## 12715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wow
## 12716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wrecked
## 12717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wtf
## 12718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      year�s
## 12719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      yellow
## 12720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      youths
## 12721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     youtube
## 12722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        yoyo
## 12723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          yr
## 12724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         yup
## 12725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        zone
## 12726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    zoonosis
## 12727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �51k
## 12728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �560k
## 12729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �be
## 12730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  �covid19�s
## 12731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �given
## 12732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �good
## 12733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �just
## 12734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �knee
## 12735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �l�m
## 12736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �m
## 12737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �one
## 12738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    �oxford�
## 12739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �uk
## 12740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    �vaccine
## 12741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �who
## 12742                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @academicshards
## 12743                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @allisonpearson
## 12744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @azeemmajeed
## 12745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bloiseda59
## 12746                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @breezergalway
## 12747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @brookied820
## 12748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bsbiireland
## 12749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @carolef2012
## 12750                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @carolinecoramuk
## 12751                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @championscovid
## 12752                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @chrisceohopson
## 12753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cmoengland
## 12754                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @consequentialbr
## 12755                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @covidjusticeuk
## 12756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @cvuhb
## 12757                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @dramirkhangp
## 12758                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @drgregorsmith
## 12759                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @eagleswinitall
## 12760                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @elisaperego78
## 12761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @f250roush
## 12762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @fenech7
## 12763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @garethcave
## 12764                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @gerard39delaney
## 12765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @gmb
## 12766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @googlenews
## 12767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @govuk
## 12768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @havenaar64
## 12769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hutch3bond
## 12770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @irishbees
## 12771                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @itsdanawhite
## 12772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @kookcove
## 12773                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @lollyallison101
## 12774                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @longcovidkids
## 12775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mailonline
## 12776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @metrosport
## 12777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @nelson81
## 12778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @nhs
## 12779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nhsengland
## 12780                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @niamhmcenery
## 12781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @nme
## 12782                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @patrici89225734
## 12783                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @randoxofficial
## 12784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @respect65
## 12785                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @rollingstone
## 12786                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @sandeshgulhane
## 12787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @scoopsmegan
## 12788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @scotgov
## 12789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @telegraph
## 12790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @tonilongesq
## 12791                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ukactionteam
## 12792                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ukcovid19stats
## 12793                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @vivekko39804049
## 12794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @webmd
## 12795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @welshconfed
## 12796                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @wghealthandcare
## 12797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @whykeepitup
## 12798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @worcscc
## 12799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @youtube
## 12800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #antivaxxers
## 12801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #arnold
## 12802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #ausopen
## 12803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #australia
## 12804                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #australianopen
## 12805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #backtowork
## 12806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #booster
## 12807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #boosterjab
## 12808                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #brexitdisaster
## 12809                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #brexithasfailed
## 12810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #carabaocup
## 12811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #clouds
## 12812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #commoncold
## 12813                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #coronavirusupdates
## 12814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #covid19uk
## 12815                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #covid19vaccine
## 12816                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #covidquarantine
## 12817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #deltacron
## 12818                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #downingstreetbriefing
## 12819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #england
## 12820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #facts
## 12821                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #happynewyear
## 12822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #harrypotter
## 12823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #health
## 12824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #healthcare
## 12825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #holidays
## 12826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #honours
## 12827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #idtwitter
## 12828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #ihuvariant
## 12829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #jamesbond
## 12830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #johnson
## 12831                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #johnsonoutnow
## 12832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #live
## 12833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #lockdownuk
## 12834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #macron
## 12835                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #mentalhealthmatters
## 12836                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #nomasksinclass
## 12837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #pcr
## 12838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #pmqs
## 12839                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #quarantineinchina
## 12840                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #quarantinelife
## 12841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #sarscov2
## 12842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #shake
## 12843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sharks
## 12844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #socialcare
## 12845                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #socialdistancing
## 12846                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #themaskedsingeruk
## 12847                                                                                                                                                                                                                                                                                                                                                                                                                                                               #toriespartiedwhilepeopledied
## 12848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #torylies
## 12849                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #uk<u+0001f1ec><u+0001f1e7>
## 12850                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #unvaccinated
## 12851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #usa
## 12852                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #vaccinatedandhappy
## 12853                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #vaccinessavelives
## 12854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #wales
## 12855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #wearamask
## 12856                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #who<u+0001f310>who
## 12857                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #youarenotalone
## 12858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f30d>
## 12859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f440>
## 12860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f44b>
## 12861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f601>
## 12862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f605>
## 12863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f607>
## 12864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f609>
## 12865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f61e>
## 12866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f637>
## 12867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f643>
## 12868                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f64f><u+0001f3fb>
## 12869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f6ab>
## 12870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f923>
## 12871                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f937><u+200d><u+2640><u+fe0f>
## 12872                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f937><u+200d><u+2642><u+fe0f>
## 12873                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f9cd><u+0001f51a><u+0001f30f><u+0001f637><u+0001f51c><u+0001f6b6>
## 12874                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0623><u+062e><u+0630>
## 12875                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0623><u+062f><u+0646><u+0627><u+0647>
## 12876                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0644><u+0625><u+062c><u+0631><u+0627><u+0621><u+0627><u+062a>
## 12877                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+062a><u+063a><u+0631><u+064a><u+062f><u+0629>
## 12878                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0644><u+0639><u+0645><u+0644>
## 12879                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0644><u+063a><u+064a><u+0631>
## 12880                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0644><u+0645><u+0639><u+062f><u+0644><u+0629>
## 12881                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0644><u+0646><u+062a><u+064a><u+062c><u+0629>
## 12882                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0628><u+062c><u+0645><u+064a><u+0639>
## 12883                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0639><u+0646>
## 12884                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0641><u+064a>
## 12885                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0643><u+0648><u+0631><u+0648><u+0646><u+0627>
## 12886                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0645><u+0646>
## 12887                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0645><u+0648><u+0642><u+0639>
## 12888                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0648><u+0627><u+0644><u+0645><u+0630><u+0643><u+0648><u+0631><u+0629>
## 12889                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+064a><u+0633><u+0631><u+064a>
## 12890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0666>
## 12891                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+2620><u+fe0f>covid19s
## 12892                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2665><u+fe0f>
## 12893                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2708><u+fe0f>
## 12894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+2764>
## 12895                                                                                                                                                                                                                                                                                                                                                                                                                   <u+c6b0><u+c9c0><u+bbf9><u+c2a4><u+d14c><u+c78e><u+b8e8><u+be44>6<u+c2dc>
## 12896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        12th
## 12897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   14566100k
## 12898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        20th
## 12899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         70s
## 12900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         7th
## 12901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      abbott
## 12902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     absence
## 12903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      accept
## 12904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 achievement
## 12905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    activity
## 12906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      actual
## 12907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       added
## 12908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      adding
## 12909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   admission
## 12910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  advertised
## 12911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    advisers
## 12912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    afforded
## 12913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   afternoon
## 12914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    agencies
## 12915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      agenda
## 12916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ahh
## 12917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          al
## 12918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alcohol
## 12919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    alliance
## 12920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    allowing
## 12921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       alpha
## 12922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   americans
## 12923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      andrew
## 12924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anthem
## 12925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anthony
## 12926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        anti
## 12927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    antibody
## 12928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     antigen
## 12929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 antivaxxers
## 12930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   appalling
## 12931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  apparently
## 12932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  appearance
## 12933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     appears
## 12934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    approach
## 12935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    approved
## 12936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       april
## 12937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aren�t
## 12938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arguing
## 12939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    argument
## 12940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      asians
## 12941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ass
## 12942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     assault
## 12943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 assessments
## 12944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      assume
## 12945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                asymptomatic
## 12946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attended
## 12947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   attention
## 12948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aux
## 12949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     avocado
## 12950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     avoided
## 12951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       award
## 12952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    balanced
## 12953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       balls
## 12954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      banned
## 12955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bans
## 12956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      barnet
## 12957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   basically
## 12958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      begins
## 12959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   behaviour
## 12960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     benefit
## 12961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  benefitted
## 12962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     billion
## 12963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      binley
## 12964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blair
## 12965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blog
## 12966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bloke
## 12967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blood
## 12968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  bloodcells
## 12969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bond
## 12970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      booked
## 12971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     booking
## 12972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bookings
## 12973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bosses
## 12974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brave
## 12975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brings
## 12976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   britain�s
## 12977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     carabao
## 12978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    carriers
## 12979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cars
## 12980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cas
## 12981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     causing
## 12982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cdc
## 12983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     centres
## 12984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ceo
## 12985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chain
## 12986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chair
## 12987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     channel
## 12988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    chanocha
## 12989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chaos
## 12990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chapter
## 12991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     charged
## 12992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chart
## 12993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cheese
## 12994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chest
## 12995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chicken
## 12996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chinese
## 12997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      choice
## 12998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    citizens
## 12999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     claimed
## 13000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  classrooms
## 13001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       clean
## 13002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    clinical
## 13003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  clinically
## 13004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     clinics
## 13005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      closed
## 13006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      closer
## 13007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    closures
## 13008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      clowns
## 13009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clue
## 13010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      coffee
## 13011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      combat
## 13012                                                                                                                                                                                                                                                                                                                                                                                                                                                                              communications
## 13013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  comparison
## 13014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 comparisons
## 13015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  complained
## 13016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   compounds
## 13017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   condition
## 13018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  conference
## 13019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     connect
## 13020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     consent
## 13021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                consequences
## 13022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                conservative
## 13023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                consistently
## 13024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  conspiracy
## 13025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  consultant
## 13026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    contacts
## 13027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  contagious
## 13028                                                                                                                                                                                                                                                                                                                                                                                                                                                                              contaminations
## 13029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     context
## 13030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contracts
## 13031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      contre
## 13032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                conversation
## 13033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  corruption
## 13034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    counting
## 13035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cover
## 13036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    covid19s
## 13037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      covid�
## 13038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crap
## 13039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      create
## 13040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      crises
## 13041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     crisis�
## 13042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      crispy
## 13043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crowd
## 13044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     crucial
## 13045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      curing
## 13046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cutting
## 13047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          da
## 13048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dads
## 13049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    database
## 13050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dates
## 13051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   day�there
## 13052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dealing
## 13053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dec
## 13054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   decisions
## 13055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     declare
## 13056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        deep
## 13057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     defined
## 13058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       delay
## 13059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      delays
## 13060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deliver
## 13061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        deny
## 13062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    deployed
## 13063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         des
## 13064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 development
## 13065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   diagnosis
## 13066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      didn�t
## 13067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dies
## 13068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   difficult
## 13069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dignity
## 13070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   direction
## 13071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    director
## 13072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disagree
## 13073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disaster
## 13074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  discussion
## 13075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disease�s
## 13076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    distance
## 13077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  distancing
## 13078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    distinct
## 13079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   documents
## 13080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dominant
## 13081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         don
## 13082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        door
## 13083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        drop
## 13084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dropped
## 13085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        drug
## 13086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        duck
## 13087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        d�as
## 13088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         eat
## 13089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      eating
## 13090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ecohealth
## 13091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     edouard
## 13092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      effort
## 13093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          el
## 13094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 eligibility
## 13095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    employee
## 13096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     enforce
## 13097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  engineered
## 13098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 engineering
## 13099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    entitled
## 13100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       erich
## 13101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      errors
## 13102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       estce
## 13103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   estimates
## 13104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eu
## 13105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      europe
## 13106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    european
## 13107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      events
## 13108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  everyone�s
## 13109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      excess
## 13110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     excited
## 13111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 exclusively
## 13112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   exhausted
## 13113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     existed
## 13114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    existing
## 13115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   expanding
## 13116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                experimental
## 13117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      expert
## 13118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  explaining
## 13119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    extended
## 13120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fail
## 13121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    failures
## 13122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fancy
## 13123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fantastic
## 13124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fast
## 13125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fat
## 13126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    february
## 13127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     federal
## 13128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fell
## 13129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    feminism
## 13130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fever
## 13131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ffp2
## 13132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        film
## 13133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  filtration
## 13134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     finding
## 13135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fined
## 13136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      finish
## 13137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fire
## 13138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    flexible
## 13139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       focus
## 13140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   followers
## 13141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        food
## 13142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      forget
## 13143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  forgetting
## 13144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   forgotten
## 13145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forma
## 13146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forms
## 13147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     freedom
## 13148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      friday
## 13149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      friend
## 13150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  frightened
## 13151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fun
## 13152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gardens
## 13153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     germany
## 13154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        glad
## 13155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       globe
## 13156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gonna
## 13157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      google
## 13158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gov
## 13159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                government�s
## 13160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gp
## 13161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gps
## 13162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      grants
## 13163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ground
## 13164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     growing
## 13165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gutted
## 13166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hadn�t
## 13167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    handling
## 13168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       harry
## 13169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    headache
## 13170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     heading
## 13171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       heads
## 13172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       heart
## 13173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       helps
## 13174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      here�s
## 13175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      heroes
## 13176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  hesitation
## 13177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hint
## 13178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    historic
## 13179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hits
## 13180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hole
## 13181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    holidays
## 13182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  homophobic
## 13183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    honestly
## 13184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hong
## 13185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hoping
## 13186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    horrible
## 13187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 hospitality
## 13188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        host
## 13189                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/2kwexqrfcb
## 13190                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/4zp0elwwga
## 13191                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/awkcbvq1uw
## 13192                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/bk1iga8s2d
## 13193                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/cf8gljdwue
## 13194                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/ct7suaaqqo
## 13195                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/d8ld139yhz
## 13196                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/ddd9swlugn
## 13197                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/gjrfn1cul7
## 13198                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/jwf1w3xhoc
## 13199                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/kf8gizrw24
## 13200                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/l5irmueofl
## 13201                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/l8kam57lsx
## 13202                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/nqrvamoq0i
## 13203                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/o7clf9qjdz
## 13204                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/obburgsj07
## 13205                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/pacckihrfc
## 13206                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/prejmijzmo
## 13207                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/v1uo63mkj8
## 13208                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/wgzu4prz2v
## 13209                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/xteccwljrm
## 13210                                                                                                                                                                                                                                                                                                                                                                                                                                                                     https://t.co/yw9dqk42se
## 13211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hug
## 13212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hull
## 13213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    humanity
## 13214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ideal
## 13215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       idiot
## 13216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      idiots
## 13217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 importantly
## 13218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  imposition
## 13219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    incident
## 13220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     include
## 13221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                incompetence
## 13222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  increasing
## 13223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  incredible
## 13224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      infect
## 13225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  injections
## 13226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     insists
## 13227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   institute
## 13228                                                                                                                                                                                                                                                                                                                                                                                                                                                                               interventions
## 13229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      invite
## 13230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     invited
## 13231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    involved
## 13232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ireland
## 13233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    isolated
## 13234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          iv
## 13235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jesus
## 13236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      jewish
## 13237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jobs
## 13238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        john
## 13239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      joseph
## 13240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       judge
## 13241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     judging
## 13242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        karl
## 13243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kent
## 13244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kill
## 13245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      killed
## 13246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kills
## 13247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    kindness
## 13248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         km2
## 13249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        knee
## 13250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kong
## 13251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        land
## 13252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     largest
## 13253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         las
## 13254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     leaders
## 13255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  leadership
## 13256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       leads
## 13257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      league
## 13258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leak
## 13259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leen
## 13260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     legally
## 13261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   leicester
## 13262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      letter
## 13263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     letting
## 13264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lgbt+
## 13265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        liar
## 13266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  lifesaving
## 13267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   lifestyle
## 13268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       light
## 13269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       limit
## 13270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                lincolnshire
## 13271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lived
## 13272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       logic
## 13273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   longcovid
## 13274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         los
## 13275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lucky
## 13276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lung
## 13277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       major
## 13278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    majority
## 13279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      manage
## 13280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      marked
## 13281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      markle
## 13282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       marks
## 13283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mary
## 13284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      masked
## 13285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     massive
## 13286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        matt
## 13287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mayer
## 13288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     measure
## 13289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    medicine
## 13290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meet
## 13291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      meghan
## 13292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    memorial
## 13293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mention
## 13294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    messages
## 13295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       messi
## 13296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    military
## 13297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        milk
## 13298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mind
## 13299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     minimum
## 13300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  misleading
## 13301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      missed
## 13302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 mitigations
## 13303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mixup
## 13304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mobile
## 13305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      moment
## 13306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     monitor
## 13307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   morbidity
## 13308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mother
## 13309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mothers
## 13310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       music
## 13311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mutating
## 13312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nada
## 13313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nadhim
## 13314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       named
## 13315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      navnat
## 13316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nazi
## 13317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 necessarily
## 13318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     neonazi
## 13319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nerve
## 13320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nossas
## 13321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                notification
## 13322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nurses
## 13323                                                                                                                                                                                                                                                                                                                                                                                                                                                                               nutrisnappers
## 13324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     obesity
## 13325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     observe
## 13326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     offered
## 13327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        olds
## 13328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         omg
## 13329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    omicron�
## 13330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     opinion
## 13331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      option
## 13332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      orange
## 13333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      oregon
## 13334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      organs
## 13335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     outcome
## 13336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     over50s
## 13337                                                                                                                                                                                                                                                                                                                                                                                                                                                                               overstretched
## 13338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      oxford
## 13339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   paragraph
## 13340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 participate
## 13341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  passengers
## 13342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    patented
## 13343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     patrick
## 13344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     perfect
## 13345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 permanently
## 13346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   personnel
## 13347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   personnes
## 13348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pharma
## 13349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  pharmacist
## 13350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         phd
## 13351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        phew
## 13352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pic
## 13353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pick
## 13354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     picking
## 13355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     picture
## 13356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pinknews
## 13357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        piss
## 13358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      plasma
## 13359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   platforms
## 13360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      player
## 13361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pleasure
## 13362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   political
## 13363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 politicians
## 13364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         por
## 13365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   positives
## 13366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    postpone
## 13367                                                                                                                                                                                                                                                                                                                                                                                                                                                                               postponements
## 13368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 potentially
## 13369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pour
## 13370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ppe
## 13371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    practice
## 13372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     praying
## 13373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prayut
## 13374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pre
## 13375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     predict
## 13376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prefer
## 13377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   pregnancy
## 13378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     premier
## 13379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   pressures
## 13380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     primary
## 13381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     private
## 13382                                                                                                                                                                                                                                                                                                                                                                                                                                                                               professionals
## 13383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    progress
## 13384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    prolarva
## 13385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  prolonging
## 13386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    promised
## 13387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       proof
## 13388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prosper
## 13389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   protected
## 13390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  protecting
## 13391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    protects
## 13392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     protein
## 13393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     protest
## 13394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   protocols
## 13395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     provide
## 13396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    provided
## 13397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ps
## 13398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pub
## 13399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  publishing
## 13400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   qualified
## 13401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     qualify
## 13402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  quarantine
## 13403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 questioning
## 13404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     quickly
## 13405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       quiet
## 13406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rapidly
## 13407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         raw
## 13408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     readied
## 13409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     realise
## 13410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 recommended
## 13411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  recovering
## 13412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reduced
## 13413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reduces
## 13414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      refund
## 13415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    refusing
## 13416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      regime
## 13417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 registering
## 13418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 reinfection
## 13419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    relative
## 13420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reliable
## 13421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      relief
## 13422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      remain
## 13423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   requiring
## 13424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  researcher
## 13425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   residents
## 13426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   resources
## 13427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        resp
## 13428                                                                                                                                                                                                                                                                                                                                                                                                                                                                              responsibility
## 13429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     revenue
## 13430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reviled
## 13431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      riders
## 13432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rises
## 13433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rod
## 13434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        role
## 13435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        roll
## 13436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       route
## 13437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      royals
## 13438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rumour
## 13439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 r�animation
## 13440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     salford
## 13441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      scared
## 13442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       scrap
## 13443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      scroll
## 13444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      search
## 13445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      season
## 13446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sector
## 13447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sectors
## 13448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    securing
## 13449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    security
## 13450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 selfisolate
## 13451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    separate
## 13452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      serves
## 13453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sessions
## 13454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     setting
## 13455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shares
## 13456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sharks
## 13457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shld
## 13458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shocking
## 13459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shop
## 13460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    shortage
## 13461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shortly
## 13462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   shoulders
## 13463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shout
## 13464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shown
## 13465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sickness
## 13466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sign
## 13467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     signing
## 13468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      single
## 13469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      slowly
## 13470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   socialism
## 13471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sore
## 13472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sorted
## 13473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        soul
## 13474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sound
## 13475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       space
## 13476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       speak
## 13477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    speaking
## 13478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     special
## 13479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    specific
## 13480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    spending
## 13481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spike
## 13482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sporting
## 13483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     spreads
## 13484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stable
## 13485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    standard
## 13486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stands
## 13487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    starting
## 13488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stating
## 13489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stock
## 13490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stories
## 13491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     strains
## 13492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     strange
## 13493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    strategy
## 13494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      string
## 13495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     studies
## 13496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     subject
## 13497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   successes
## 13498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  successful
## 13499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sucks
## 13500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    suffered
## 13501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   suggested
## 13502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sun
## 13503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      supply
## 13504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  supporting
## 13505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    supports
## 13506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    support�
## 13507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    supposed
## 13508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    surgical
## 13509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 surrounding
## 13510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                surveillance
## 13511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   suspected
## 13512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 sustainable
## 13513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     symptom
## 13514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 symptomatic
## 13515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    syndrome
## 13516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          t4
## 13517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     teacher
## 13518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    teachers
## 13519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  technology
## 13520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tells
## 13521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 temperature
## 13522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       terms
## 13523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       texas
## 13524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tfl
## 13525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      theory
## 13526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     they�ve
## 13527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      thread
## 13528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   throwback
## 13529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ticket
## 13530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        till
## 13531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tiny
## 13532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tissues
## 13533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      todays
## 13534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tons
## 13535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tony
## 13536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tool
## 13537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                transparency
## 13538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  travellers
## 13539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  travelling
## 13540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                tripledouble
## 13541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tuchel
## 13542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  twentyfour
## 13543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        type
## 13544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      unable
## 13545                                                                                                                                                                                                                                                                                                                                                                                                                                                                               understanding
## 13546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   universal
## 13547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    unmasked
## 13548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 unnecessary
## 13549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      urgent
## 13550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    usfunded
## 13551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       usual
## 13552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   vaccin�es
## 13553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  variations
## 13554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vax
## 13555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    verified
## 13556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vernon
## 13557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   viciously
## 13558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      victim
## 13559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       views
## 13560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       villa
## 13561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     village
## 13562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    villains
## 13563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    virology
## 13564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    visiting
## 13565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vitamin
## 13566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       voice
## 13567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wagon
## 13568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wake
## 13569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     walking
## 13570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         war
## 13571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        warn
## 13572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      warned
## 13573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wasn�t
## 13574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      waste�
## 13575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       watch
## 13576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       water
## 13577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wee
## 13578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      weekly
## 13579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   wellbeing
## 13580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     weren�t
## 13581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wey
## 13582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wheels
## 13583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      whitty
## 13584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wild
## 13585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         win
## 13586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wine
## 13587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wipes
## 13588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wise
## 13589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wishing
## 13590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   wonderful
## 13591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       woods
## 13592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   worcester
## 13593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    worrying
## 13594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       write
## 13595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     written
## 13596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          x3
## 13597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        xmas
## 13598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ya
## 13599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      year�s
## 13600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      yellow
## 13601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  yesterdays
## 13602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       youth
## 13603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     youtube
## 13604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          yr
## 13605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      zahawi
## 13606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 �350million
## 13607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �it�s
## 13608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    �pinged�
## 13609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   �services
## 13610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   �tatsunis
## 13611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �the
## 13612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @10000steps
## 13613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @11xcea
## 13614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @1350c
## 13615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @1ukdivision
## 13616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @2020protour
## 13617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @22craftsman
## 13618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @2cents69
## 13619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @4dthalord
## 13620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @5news
## 13621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @66iot
## 13622                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @71signalregt
## 13623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @73henny
## 13624                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @90minutecynic
## 13625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @a24com
## 13626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @aaacincy
## 13627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @aacpphysio
## 13628                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @aaronbastani
## 13629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @aasif
## 13630                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @abandonnuance
## 13631                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @aberdeenacvo
## 13632                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @aberdeenshire
## 13633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @aberdeenucu
## 13634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @abermapman
## 13635                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @abiholidayhomes
## 13636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @abimulhern
## 13637                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @abletogether
## 13638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @aboutimpact
## 13639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @abudhabicb
## 13640                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @academicmatters
## 13641                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @academicsclass
## 13642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @acasorguk
## 13643                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @accessplanit
## 13644                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @achyutaghosh
## 13645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @acmedsci
## 13646                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @aconstancesnp
## 13647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @acpgbi
## 13648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @acpgbiplg
## 13649                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @actiononlitter
## 13650                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @activetameside
## 13651                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @actualidadrt
## 13652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @adamboxer1
## 13653                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @adammilstein
## 13654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @adamprice
## 13655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @addthis
## 13656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @adiamantop
## 13657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @adinamay
## 13658                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @adithyavikrams1
## 13659                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @adriana79929839
## 13660                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @adriennegreg0
## 13661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @advancesdd
## 13662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @adventltd
## 13663                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @advpracticesu
## 13664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @adydayman
## 13665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @aehall1983
## 13666                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @afcbournemouth
## 13667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @afdbgroup
## 13668                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @afitzgerald1992
## 13669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @afpepe
## 13670                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @afpppresident
## 13671                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @africaofficial2
## 13672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @afrsblagdon
## 13673                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @afrskingswood
## 13674                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @afrssouthmead
## 13675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @agenciasinc
## 13676                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @agencycollectve
## 13677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @agjepagje
## 13678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @aiannucci
## 13679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ainegroogan
## 13680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @airbnb
## 13681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @airbnbhelp
## 13682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @airbnbuk
## 13683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @airdriearab
## 13684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @airwayhub
## 13685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @airwayinfo
## 13686                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @airwaymxacademy
## 13687                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ajayvenkatesh1
## 13688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ajenglish
## 13689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ajwiddowson
## 13690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @alanhuddart
## 13691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @alanmates1
## 13692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @alaqeelme
## 13693                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @alastairhowie2
## 13694                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @albertleblanc7
## 13695                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @albertobernalle
## 13696                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @albertocostamp
## 13697                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @alchemillaresto
## 13698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @alderhey
## 13699                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @alderleypark
## 13700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @aldertonliz
## 13701                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @alessadavison
## 13702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @alexar6
## 13703                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @alexberenson
## 13704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @alexcobham
## 13705                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @alexmacpherson
## 13706                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @alexpericsrb
## 13707                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @alexstafford
## 13708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @alexyoung
## 13709                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @algi49379342
## 13710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @algopind
## 13711                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @alialosaimi12
## 13712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @alicettimes
## 13713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @alichat66
## 13714                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @aliciacastillo
## 13715                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @aliciak78594734
## 13716                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @alisonharrismsp
## 13717                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @alisonhernandez
## 13718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @alisonius1
## 13719                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @alisonleary1
## 13720                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @allabouttrains2
## 13721                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @allencummings6
## 13722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @allenovery
## 13723                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @allianceparty
## 13724                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @allianceyouthni
## 13725                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @allianzuknews
## 13726                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @allinbritain
## 13727                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @allinwithchris
## 13728                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @allisonpearson
## 13729                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @allisontrimble1
## 13730                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @allsaintsmarket
## 13731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @allsoulslp
## 13732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @alranson
## 13733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @alsfanzine
## 13734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @alumrockcf
## 13735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @alvaroqc
## 13736                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @alvarouribevel
## 13737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @alyveuk
## 13738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @alzscotdnc
## 13739                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @amandamandyrj
## 13740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @amandaray02
## 13741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @amandsx
## 13742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @amazonhelp
## 13743                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ambitioninst
## 13744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @aminjamal11
## 13745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @amitshah
## 13746                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @amitshahoffice
## 13747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @amnestyuk
## 13748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @amolrajan
## 13749                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @amorbidpodcast
## 13750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @amysiskind
## 13751                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @amywhite3800
## 13752                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @anaesreports
## 13753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @anassarwar
## 13754                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @andersonbilly74
## 13755                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @anderthalneal
## 13756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @andie1105
## 13757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @andihoxhaj
## 13758                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @andreaedwards30
## 13759                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @andreefrieze
## 13760                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @andrew8walker
## 13761                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @andrewbensonf1
## 13762                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @andrewbowiemp
## 13763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @andrewmarr9
## 13764                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @andrewpain1974
## 13765                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @andrewscheidl
## 13766                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @androstownsend
## 13767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @andy4wm
## 13768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @andyatauto
## 13769                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @andydurmanemsi
## 13770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @andylong
## 13771                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @andymroberts
## 13772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @andypena
## 13773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @andysheppy
## 13774                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @andytaylor3012
## 13775                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @andywwestwood<u+2069>
## 13776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @aneezesmail
## 13777                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @anesthesianews
## 13778                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @anfieldroadfs
## 13779                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @anfieldrpmusic
## 13780                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @angelcandice
## 13781                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @animaladvocate
## 13782                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @animalsvoice4
## 13783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @anjames5
## 13784                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ankitbharatmd
## 13785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @annadown
## 13786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @annagirling
## 13787                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @annamamalaki
## 13788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @annarob20
## 13789                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @annefranktrust
## 13790                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @anneliesedodds
## 13791                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @annemariealex
## 13792                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @annemcmurray2
## 13793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @annetteboaz
## 13794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @annmairelee
## 13795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @anooshc
## 13796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @anshulk
## 13797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @anslow87
## 13798                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @antarcticdesign
## 13799                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @anthonybeyga31
## 13800                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @anthonyt2mufc
## 13801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @antlacey
## 13802                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @antoguerrera
## 13803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @antomidc
## 13804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @antoniosamp
## 13805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @antonymay
## 13806                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @antonyslumbers
## 13807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @any
## 13808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @aol
## 13809                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @apavementaway
## 13810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @appertunity
## 13811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @appletreefs
## 13812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @apsforg
## 13813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @aquilbusrai
## 13814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @aquinaband
## 13815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @arabcarol
## 13816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @arabellakyp
## 13817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @aradbenkoe
## 13818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @archnahr
## 13819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @archrose90
## 13820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ardalby71
## 13821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ardonagh
## 13822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ariercole
## 13823                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @armylogisticsuk
## 13824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @arsched
## 13825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @arsenal
## 13826                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @arslankhalidm
## 13827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @arupgroup
## 13828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @arupukimea
## 13829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @arynewwss
## 13830                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ascstammering
## 13831                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ashishskynews
## 13832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ashl93
## 13833                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ashoknellikar
## 13834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ashpro1
## 13835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @asicseurope
## 13836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @asmasultan
## 13837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @asphft
## 13838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @assocphoto�
## 13839                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @assurityconsult
## 13840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @astonmartin
## 13841                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @astonmartinwork
## 13842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @astrazeneca
## 13843                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @athleticevol
## 13844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @atluswest
## 13845                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @attachmentrc
## 13846                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ausamahalabsi
## 13847                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @authorrroberts
## 13848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @autocar
## 13849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @avasantina
## 13850                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @avfcofficial
## 13851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @awjre
## 13852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @aymanelt
## 13853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ayshahtull
## 13854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @aziemann
## 13855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @babygo2014
## 13856                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @baconboy1989
## 13857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @baddiel
## 13858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @badnewsjew
## 13859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bagpuss1300
## 13860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bairdtamsin
## 13861                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @baldheadteacher
## 13862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bangobilly
## 13863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @banwelljon
## 13864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @baosuk
## 13865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bapearson96
## 13866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @barackobama
## 13867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @barebellion
## 13868                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @barnettogether
## 13869                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @barnsleycouncil
## 13870                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @barryanderson
## 13871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @barryhearn
## 13872                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @barthol36370431
## 13873                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bartscardiac
## 13874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @basemuk
## 13875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @basjavidmps
## 13876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @baskila
## 13877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @baslfl
## 13878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bassa2000
## 13879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bassetlawdc
## 13880                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bathbusiness
## 13881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bathexpo
## 13882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bathinsider
## 13883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bathtubgin
## 13884                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @batterseaarts
## 13885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bazbam
## 13886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @bazk
## 13887                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bbcandrewkerr
## 13888                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bbcfreelancers
## 13889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bbcglos
## 13890                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bbchighlands
## 13891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bbchughpym
## 13892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bbcjaynemcc
## 13893                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bbcjohnbeattie
## 13894                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bbckatyaadler
## 13895                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bbclancashire
## 13896                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bbcleicester
## 13897                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bbclondonnews
## 13898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bbclookeast
## 13899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bbcmtd
## 13900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bbcnaga
## 13901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bbcnewsbeat
## 13902                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @bbcnickrobinson
## 13903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bbcnwt
## 13904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bbcone
## 13905                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bbcphilipsim
## 13906                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @bbcquestiontime
## 13907                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bbcradiocymru
## 13908                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bbcradioscot
## 13909                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bbcradiosolent
## 13910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bbcrajiniv
## 13911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bbcscotnine
## 13912                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bbcsheffield
## 13913                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bbcsouthnews
## 13914                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bbcspringwatch
## 13915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bbcsussex
## 13916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bbctalkback
## 13917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bbcturkce
## 13918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bbctwo
## 13919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bbcurdu
## 13920                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bbcwalesnews
## 13921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bbcwatchdog
## 13922                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @bbcworldservice
## 13923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bdadavid
## 13924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bdbritish
## 13925                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @beckybeckyfish
## 13926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @becsywecsy
## 13927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @beeduck
## 13928                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @beestonmarket
## 13929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @beinghr
## 13930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @beltel
## 13931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bemooremd
## 13932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @beneveritt
## 13933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @benhabib6
## 13934                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @benminsterfm
## 13935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @benomsam
## 13936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @benshapiro
## 13937                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @berkmannwine
## 13938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bermicourt
## 13939                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @berniemayall
## 13940                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @berniespofforth
## 13941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @besocialcam
## 13942                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bestforbritain
## 13943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bethanyct
## 13944                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bethfratesmd
## 13945                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @betterthancash
## 13946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bettgunther
## 13947                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bettingvillage
## 13948                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bettyelawhite
## 13949                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @beverleyharden
## 13950                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @beverleymomen
## 13951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bfc199
## 13952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bfcmark1
## 13953                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bhamkneeshould
## 13954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bhamupdates
## 13955                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @bharatbhandari1
## 13956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @bhhpa
## 13957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @bhmuk
## 13958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bhpcomms
## 13959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bhwords
## 13960                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @biancajagger
## 13961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bibresearch
## 13962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bidoodle
## 13963                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bigbearmusic68
## 13964                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bigbrotherau
## 13965                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bigeducation
## 13966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bigjockknew
## 13967                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bigmouthcomedy
## 13968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @billbates01
## 13969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @billeeo
## 13970                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @billykayscot
## 13971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bimafolami
## 13972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @birchy1788
## 13973                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @birminghamlive
## 13974                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @birmjazzfest�s
## 13975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bisiakins
## 13976                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bjgalloway1717
## 13977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @bjh
## 13978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bjhbfs
## 13979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bjsmbmj
## 13980                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @blackfenunited
## 13981                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @blackpoppies14
## 13982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @blamcharity
## 13983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @blanshb
## 13984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @blathnaido
## 13985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bloodhorse
## 13986                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bloodypolitics
## 13987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @blthrussell
## 13988                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bluechester3
## 13989                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bluesoulreggae
## 13990                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bluewurst1875
## 13991                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bluntedjames
## 13992                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bluwhitehoops
## 13993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bmjebm
## 13994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bmjpodcast
## 13995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bnppwealth
## 13996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bobbyllew
## 13997                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bobqureshi130
## 13998                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bobselflondon
## 13999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @boeresearch
## 14000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bolloticks
## 14001                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bonnielangford
## 14002                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bookplatypus
## 14003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @boon501
## 14004                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @boringolefart
## 14005                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @borisjohnsons
## 14006                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @boscregecaravan
## 14007                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bouncepatrol
## 14008                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @boutinotwines
## 14009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @boyleeds
## 14010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bpsutweet
## 14011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bradloncar
## 14012                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @brandonlewis
## 14013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @breesanna
## 14014                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @brendanneeson
## 14015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @brewedclee
## 14016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @brexit011
## 14017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bricycle
## 14018                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @bridgesoutcomes
## 14019                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @brightonhovecc
## 14020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @brilliansk
## 14021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @brilliving
## 14022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bristollive
## 14023                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @britainelects
## 14024                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @britaintrump4
## 14025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @briteeth
## 14026                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @britgerontology
## 14027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @britishalba
## 14028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @britisharmy
## 14029                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @britishparking
## 14030                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @britsocgastro
## 14031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @brittlifts
## 14032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @briw74
## 14033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @broadspire1
## 14034                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @brokenspanner
## 14035                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @broomfieldnhs
## 14036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @broradio
## 14037                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bruceyraberto
## 14038                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @brumhippodrome
## 14039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @brummiegran
## 14040                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bryanhellard
## 14041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bsirnews
## 14042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bsshand
## 14043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @btnhovefood
## 14044                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @bulfordmassive
## 14045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bulldog665
## 14046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bulliesout
## 14047                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bunsentweets
## 14048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bushtheatre
## 14049                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @businessdubai
## 14050                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @butlercaroline
## 14051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @butlins
## 14052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bzdrojewska
## 14053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @c40cities
## 14054                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @cabinetofficeuk
## 14055                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cadrprogramme
## 14056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cafcaffy12
## 14057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @calatest
## 14058                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cambridgeuni
## 14059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @camdenneuro
## 14060                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cameronian22
## 14061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @camj1953
## 14062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cammarkets
## 14063                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @campaignforpubs
## 14064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @candcc
## 14065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @canna420uk
## 14066                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @canterburycc
## 14067                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @captrogervictor
## 14068                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @carapac46808618
## 14069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @carbonbrief
## 14070                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @cardboardrobotg
## 14071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cardiffuni
## 14072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cardioian
## 14073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @careopinion
## 14074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @carersweek
## 14075                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @caridaviestv
## 14076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @caringcity
## 14077                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @carlheneghan
## 14078                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @carlquintanilla
## 14079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @carmen50
## 14080                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @carmenegonzale2
## 14081                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @carmsharriers
## 14082                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @carolstottphd
## 14083                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @carriermedia
## 14084                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @cartwrightcomms
## 14085                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @caseyexplosion
## 14086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @caspasian
## 14087                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @casssunstein
## 14088                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @casualseagull
## 14089                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @catererdotcom
## 14090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @catgarnett1
## 14091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cathaguamia
## 14092                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @catherinelido
## 14093                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @catherinemross
## 14094                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cathhewat123
## 14095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cathmurray
## 14096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cathynewman
## 14097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cazb52
## 14098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cazfoster
## 14099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cbinsights
## 14100                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cc4birchgreen
## 14101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ccyale
## 14102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cddftrni
## 14103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cdepaeztron
## 14104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cdevane89
## 14105                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @cdremelrobinson
## 14106                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @celticfctickets
## 14107                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @celticrumours
## 14108                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ceredigioncc
## 14109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ceresarabs
## 14110                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cerysmatthews
## 14111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cfcchris
## 14112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cfclamps1
## 14113                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @championsleague
## 14114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @change
## 14115                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @channel5press
## 14116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @channel5tv
## 14117                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @charleyboorman
## 14118                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @charliestayt
## 14119                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @charliewtrust
## 14120                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @charlotte3003g
## 14121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @charlottejw
## 14122                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @charlottenat18
## 14123                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @charlottenhsrn
## 14124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @chas01fca
## 14125                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @chauhanzahid
## 14126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cheianov
## 14127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @chellesta
## 14128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @chelseafc
## 14129                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @cherylcrannick
## 14130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @chesterzoo
## 14131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @chetna1806
## 14132                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @chez68266431
## 14133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @chftnhs
## 14134                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @chillipeppersi1
## 14135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @chinadaily
## 14136                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @chinaembaddis
## 14137                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @chinaembajada
## 14138                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @chinaembajadard
## 14139                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @chinaembangola
## 14140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @chinaembarg
## 14141                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @chinaembaustria
## 14142                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @chinaembperu
## 14143                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @chris020johnson
## 14144                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @chris180mason
## 14145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @chrisbobyn
## 14146                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @chrisceohopson
## 14147                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @chrischittell
## 14148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @chrisd
## 14149                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @chrisdonnelly12
## 14150                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @chrisgpackham
## 14151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @chrislhayes
## 14152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @chrislyttle
## 14153                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @chrism4chester
## 14154                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @chrismasonbbc
## 14155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @chrismusson
## 14156                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @chrissimons5
## 14157                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @chriswescott
## 14158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @chriswholt
## 14159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cimspa
## 14160                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cinderfordtc
## 14161                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @cinnamonbayhome
## 14162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ciprinside
## 14163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cirnetwork
## 14164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ciscero88
## 14165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @cisi
## 14166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cityairport
## 14167                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @citymayorleic
## 14168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cksntom
## 14169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @claimsfive
## 14170                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @claredickens2
## 14171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @clarehalse
## 14172                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @classicshirts
## 14173                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @cleanairlondon
## 14174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cleaningmag
## 14175                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @cleveleysbeach
## 14176                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @clevertitletk
## 14177                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @climateaction
## 14178                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @cllralanrhodes
## 14179                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @cllrdavidmellen
## 14180                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cllrlegresley
## 14181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @clo13
## 14182                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @clodaghlrice
## 14183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cloudappsoc
## 14184                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cmpooley1972
## 14185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @cnbc
## 14186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cnbcafrica
## 14187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cnnnews18
## 14188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cnntravel
## 14189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cnobmesag
## 14190                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cnutforkbeard
## 14191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cnwlnhs
## 14192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @co90s
## 14193                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @coachashukhanna
## 14194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @coachbarrow
## 14195                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @coachwmuschamp
## 14196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cognitionx
## 14197                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @cognitivevalley
## 14198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @colin00007
## 14199                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @collawborative
## 14200                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @collegemelbury
## 14201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @colmjoleary
## 14202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @comhaduk
## 14203                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @commonsensejan
## 14204                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @commonsidetrust
## 14205                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @communicatemag
## 14206                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @communitydavid
## 14207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @companionpr
## 14208                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @connectingcomm
## 14209                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @conorburnsuk
## 14210                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @conorwoodruff
## 14211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @coopuk
## 14212                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @corbynistateen
## 14213                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @cornwallcouncil
## 14214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @cosla
## 14215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cotswolddc
## 14216                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @councilofdeans
## 14217                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @counsellorscafe
## 14218                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @countygazette
## 14219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @couriersdm
## 14220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cousto
## 14221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @covidsurg
## 14222                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @coyneoftherealm
## 14223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @coytey
## 14224                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @cpcatapult<u+2069>
## 14225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cpdconnect
## 14226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @cqn
## 14227                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @crawleynews24
## 14228                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @creationse17
## 14229                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @creativebinlord
## 14230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @creativefed
## 14231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @crewealexfc
## 14232                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @crewegangshow
## 14233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cricbristol
## 14234                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cricketwyvern
## 14235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @crisisgroup
## 14236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @crowngolf
## 14237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @crtboating
## 14238                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @cruiselifestyl
## 14239                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @crystabelkelsey
## 14240                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @csceredigion
## 14241                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cschallengefw
## 14242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cscmerch
## 14243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @csplondon
## 14244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ctheodoraki
## 14245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ctsnetorg
## 14246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cubitclub
## 14247                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @cumbrianrambler
## 14248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cupararab
## 14249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cupgmedic
## 14250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @curbamorris
## 14251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @curnowrich
## 14252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @currie
## 14253                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @curtisstigers
## 14254                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cventerprise
## 14255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cwchamber
## 14256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cwitvrouwen
## 14257                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cxrmxnnxjjxr
## 14258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cyhand
## 14259                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @dadmattersuk
## 14260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dahlconsult
## 14261                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @dailymailceleb
## 14262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dailymirror
## 14263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dalerrowney
## 14264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @dalhousieu
## 14265                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @dallasbraden209
## 14266                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @damianastuart
## 14267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @damianfog
## 14268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @damothebhoy
## 14269                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @danchalmers89
## 14270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dancollard1
## 14271                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @dandystopsoil
## 14272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @danieldbunn
## 14273                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @danielhewittitv
## 14274                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @danielwbmouth
## 14275                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @danishblossom
## 14276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @danjarvismp
## 14277                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @dannybriggs19
## 14278                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @dannywallace
## 14279                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @darloborn1883
## 14280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @darlotoon
## 14281                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @darrengrimes
## 14282                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @darrenplymouth
## 14283                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @darrylsparey
## 14284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @dasairway
## 14285                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @datavitatweets
## 14286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @dauntlust
## 14287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @daveball65
## 14288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @davemacladd
## 14289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @daverimm
## 14290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @daveyb50609
## 14291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @davidcloke
## 14292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @davidfaber
## 14293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @davidgauke
## 14294                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @davidhwarwick
## 14295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @davidicke
## 14296                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @davidjamesrobe4
## 14297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @davidkurten
## 14298                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @davidlloyduk
## 14299                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @davidmbaziira
## 14300                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @davidmurdoch85
## 14301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @davidpugh25
## 14302                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @davidwienermd
## 14303                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @dawnrlfreeman
## 14304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dawnsmith07
## 14305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @dbimo1980
## 14306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @dbirch214
## 14307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @dclovesgp
## 14308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ddegea
## 14309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ddegea�s
## 14310                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @debbieabrahams
## 14311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @debbiebu
## 14312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @debbieleema
## 14313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @debolaolomo
## 14314                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @deborah61254701
## 14315                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @deborah62655228
## 14316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @debralindh
## 14317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @decathlonuk
## 14318                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @deedoubleyou6
## 14319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @deetoured
## 14320                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @defencepeople
## 14321                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @deleofficial
## 14322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @deloitteuk
## 14323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @demariodino
## 14324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @denbar64
## 14325                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @denisgrant13
## 14326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @deptinfra
## 14327                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @derek71432174
## 14328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dewalindsay
## 14329                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @dfrstraining
## 14330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dgalexander
## 14331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @dhcinfo
## 14332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @dianehinds
## 14333                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @dianemacmichael
## 14334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dianesarkar
## 14335                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @diariodeibiza
## 14336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @didifrench
## 14337                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @digitallegacyco
## 14338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dilmouse
## 14339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @diocesehn
## 14340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @dipilky
## 14341                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @discussionsfi
## 14342                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @divhealthpsych
## 14343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @diwelfare
## 14344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @djaneaileen
## 14345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @djokernole
## 14346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @dkhunne
## 14347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dlapiper
## 14348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dmsdefrehab
## 14349                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @dmulawschool
## 14350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dmuresearch
## 14351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @docfok
## 14352                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @docmarkgillett
## 14353                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @docsavagetju
## 14354                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @doctoramitpatel
## 14355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @doctorpaf
## 14356                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @doctorskitchen
## 14357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dogsofyulin
## 14358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dollfied
## 14359                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @dollystreasure
## 14360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @domanliz
## 14361                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @domdiformaggio
## 14362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dominicraab
## 14363                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @dominikawalker
## 14364                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @donaldmccain
## 14365                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @donaldsoncam
## 14366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @donholtmac
## 14367                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @donnaafolocal
## 14368                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @donslocalaction
## 14369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @donwyn6
## 14370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @dookist
## 14371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @dopradista
## 14372                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @dottyspotty101
## 14373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @dotwuk
## 14374                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @dradambitterman
## 14375                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @dramitinspires
## 14376                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @drandrewgreen
## 14377                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @drcarvalhosci
## 14378                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @drcjhouldcroft
## 14379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @drdannaylor
## 14380                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @drdaveobrien
## 14381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @drellie
## 14382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dresmerelda
## 14383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @dresserman
## 14384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @drewbrees
## 14385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @drfrocester
## 14386                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @drjamieparker
## 14387                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @drjdrooghaag
## 14388                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @drkatybarnett
## 14389                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @drmahendrapatel
## 14390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @drorpoleg
## 14391                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @drphiliplee1
## 14392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @drphilippaw
## 14393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @drranj
## 14394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @drsdeg
## 14395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @drteckkhong
## 14396                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @drtomlinsonep
## 14397                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @dtownsenddon
## 14398                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @dublincomments
## 14399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @duendejeams
## 14400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @duncyano
## 14401                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @dungeonsnbears
## 14402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @dvfc2
## 14403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @dvlagovuk
## 14404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @dwadepsych
## 14405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @dwflaw
## 14406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @dwils23
## 14407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @dykerojas
## 14408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @eaamalyon
## 14409                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @eacattainment
## 14410                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ealingcouncil
## 14411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @earthles
## 14412                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @eastlifecamb
## 14413                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @eastofdulwich
## 14414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @eatoutiom
## 14415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @ebrd
## 14416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ecbcricket
## 14417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ecocars1
## 14418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @edcosupport
## 14419                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @eddiehammerman
## 14420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @eddiemair
## 14421                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @edgarjacinta
## 14422                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @edgewaterlegal
## 14423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @edinburghcc
## 14424                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @edinburghwatch
## 14425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @edscribbles
## 14426                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @edsocteesside
## 14427                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @edstar1000rr
## 14428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @edthompsn
## 14429                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @educationthoug1
## 14430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @efl
## 14431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @eib
## 14432                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @eileenchanhu
## 14433                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @eileenshepherd
## 14434                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ejectamentacom
## 14435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @elderly
## 14436                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @electricwookie
## 14437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @elenlisa
## 14438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @eliabaggio
## 14439                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @eliefinegold
## 14440                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @ellenjoywebster
## 14441                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @elliephillipsuk
## 14442                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ellystrigner
## 14443                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @elohoefemuai
## 14444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @elpais
## 14445                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @elstreestudios
## 14446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @emmabtvs
## 14447                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @emmalewellbuck
## 14448                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @emmallawrance
## 14449                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @emmalouisewebb3
## 14450                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @emmamcinnes32
## 14451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @emmanuelrsk
## 14452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @emmyjane50
## 14453                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @emrodriguesots
## 14454                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @emtardigrade
## 14455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @endgame2021
## 14456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @endyulin
## 14457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @englandgolf
## 14458                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @englandrugby
## 14459                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @enricomolinari
## 14460                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @entrepthinking
## 14461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @epanda
## 14462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @epassoc
## 14463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @epicpgc
## 14464                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @eppingforestdc
## 14465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @equitysm
## 14466                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @erboldigital
## 14467                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ercboxoffice
## 14468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @erickweber
## 14469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ersanews
## 14470                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @esmehornbeam
## 14471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @esrasociety
## 14472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @esrc
## 14473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @essexpr
## 14474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @estatesrcht
## 14475                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @estherhailes
## 14476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ethelijeoma
## 14477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @etimsnet
## 14478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @etonrifle
## 14479                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @eucommission
## 14480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @euractiv
## 14481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @europeanaeu
## 14482                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @evefrancisholt
## 14483                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @evelinalondon
## 14484                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @eveningstandard
## 14485                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @eventbriteuk
## 14486                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @eventbriteuk�s
## 14487                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @eventimapollo
## 14488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @eveolivant
## 14489                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @evieppicrnyh
## 14490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ewmawound
## 14491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @excludeduk
## 14492                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @exeapprentices
## 14493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @exinterplod
## 14494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @expediauk
## 14495                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @expressandstar
## 14496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @eyobtolina
## 14497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ezy06001
## 14498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @fa
## 14499                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @fabrizioviani
## 14500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @facebook
## 14501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @faithymcr
## 14502                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @fallibilist1
## 14503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @fallooni
## 14504                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @familybizpaul
## 14505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @faodg
## 14506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @faresharebh
## 14507                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @farmerbilly1
## 14508                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @farmmktmanager
## 14509                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @farooquijameel
## 14510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @farrells
## 14511                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @farrukhhabibisf
## 14512                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @fascinatorfun
## 14513                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @fashionroundtab
## 14514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @fatemperor
## 14515                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @fatwheezybloke
## 14516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @fawales
## 14517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @fawcoached
## 14518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @fchorizoman
## 14519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @fdsrcs
## 14520                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @feilimmackle
## 14521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @femisorry
## 14522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @fep2050
## 14523                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ferguson2811
## 14524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @finntrekkie
## 14525                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @firstbusnews
## 14526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @firstport
## 14527                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @fischersbaslow
## 14528                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @fishmandeville
## 14529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @fizmarcus
## 14530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @flacqua
## 14531                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @flattenofficial
## 14532                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @fleetstreetcomm
## 14533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @fletchcath
## 14534                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @flightcentreuk
## 14535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @floblack15
## 14536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @floridatix
## 14537                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @floschechter
## 14538                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @flowesaunders68
## 14539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @fluffbuster
## 14540                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @flyermagazine
## 14541                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @flyingbinary
## 14542                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @fmquarantine
## 14543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @fmwales
## 14544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @focuswales
## 14545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @foddc
## 14546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @fogleshane
## 14547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @footankle
## 14548                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @foreignoffice
## 14549                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @foreignpolicy
## 14550                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @forestrycomm
## 14551                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @forthvalpolice
## 14552                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @fortiusclinicuk
## 14553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @foxnews
## 14554                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @foxxystweets
## 14555                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @fozziebear17
## 14556                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @francescocook
## 14557                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @francescoppola
## 14558                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @francoamato16
## 14559                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @fredaprempehgh
## 14560                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @freemasonry2day
## 14561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @freshmecha
## 14562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @frfestivals
## 14563                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @friendofdarwin
## 14564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @friendsamal
## 14565                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @frimleyhealth
## 14566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @frisesally
## 14567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @fritsz7
## 14568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @fsbni
## 14569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @fsemuk
## 14570                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @fsilvestrymd
## 14571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @fueltheatre
## 14572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @fujifilmeu
## 14573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @fujifilmjpx
## 14574                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @fullychargeddan
## 14575                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @fundforireland
## 14576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @funnygir5
## 14577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @furrymunkey
## 14578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @furyansport
## 14579                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @futureofwork
## 14580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @g4474denise
## 14581                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @gaeldesignshop
## 14582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gaelfastgaa
## 14583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @gafordyce
## 14584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @galinash
## 14585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gamecockfb
## 14586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gamedigital
## 14587                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @gareththomasmp
## 14588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @garlandmag
## 14589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @garryhale
## 14590                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @garyburgessci
## 14591                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @garyfloughran
## 14592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @garyhensel
## 14593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @garyogmusic
## 14594                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @garytheblade
## 14595                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @garyward1994
## 14596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @garyyounge
## 14597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gavgod1874
## 14598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @gavi
## 14599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gavinmairs
## 14600                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @gavinwilliamson
## 14601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @gaydio
## 14602                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @gaylecarrington
## 14603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gaynorann46
## 14604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gaystarade
## 14605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gazettepaul
## 14606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @gazzad
## 14607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @gbaliah
## 14608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gbpubconfed
## 14609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @gcdauk
## 14610                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @gchristopher37
## 14611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @gcugsbs
## 14612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gcuresearch
## 14613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @gcusebe
## 14614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @gdh1961
## 14615                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @geemclachlan
## 14616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gemandmoll
## 14617                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @gentlemangeorge
## 14618                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @georgebrinkman
## 14619                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @georgemonbiot
## 14620                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @georgeosborn
## 14621                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @georgiagould
## 14622                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @geraldpayne25
## 14623                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @gerontologyuk
## 14624                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @getbrexitdone
## 14625                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @getbrexitdone1
## 14626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @getdinghy
## 14627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @getthegloss
## 14628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ggbourne
## 14629                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ghostlyspells
## 14630                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ghostomichael
## 14631                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @giggsyblantyre
## 14632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @gigihadid
## 14633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gillrphysio
## 14634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ginaawokoh
## 14635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ginasell
## 14636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gingerrt215
## 14637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ginnieschat
## 14638                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @givebloodnhs
## 14639                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @givebloodscot
## 14640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gladdimegw
## 14641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @glasgowcf
## 14642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @glasgowcvs
## 14643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @glasgowmake
## 14644                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @glassesdirect
## 14645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @glgarry
## 14646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @global
## 14647                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @globalgiving
## 14648                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @globalstreetart
## 14649                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @globalwomenldrs
## 14650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @glofmmm
## 14651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @gloscc
## 14652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gloscricket
## 14653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gloslungdoc
## 14654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gloucester
## 14655                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @gloucestercity
## 14656                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @gloucestershirecc
## 14657                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @gloucestershirelive
## 14658                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @glyndebourne
## 14659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @gmbunion
## 14660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @gmcuk
## 14661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @gmlouk
## 14662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @gnev2
## 14663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @gobo2006
## 14664                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @goodeknyghte
## 14665                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @goodwalkerme
## 14666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @gop
## 14667                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @gorebridgeearly
## 14668                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @gorebridgeps
## 14669                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @gotopaulcastle
## 14670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @government
## 14671                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @gpinorthwest
## 14672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @gpnnes
## 14673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @grahamjf
## 14674                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @grahamstretch
## 14675                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @grampianlnclct
## 14676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @grampianrec
## 14677                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @granadareports
## 14678                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @grandauldteam
## 14679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @granicus
## 14680                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @grantstanleyuk
## 14681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @grass247
## 14682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @greenpacta
## 14683                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @greenspacescot
## 14684                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @gregmannarino
## 14685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gregscotttv
## 14686                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @greigexvs1300a
## 14687                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @groundworkuk
## 14688                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @grousebeater
## 14689                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @growthplatform
## 14690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @grthlwr
## 14691                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @grundyblackpool
## 14692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @gsofa
## 14693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @gsoh31
## 14694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @gsttnhs
## 14695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @gstyle
## 14696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gtflanagan
## 14697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gtsereteli
## 14698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @guardianeco
## 14699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @guardianedu
## 14700                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @guardiansport
## 14701                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @guardianweekly
## 14702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @guidofawkes
## 14703                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @guildfordergo
## 14704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @guils1957
## 14705                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @guyverhofstadt
## 14706                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @gwenhinessave
## 14707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @gwennanw
## 14708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @gwynnemp
## 14709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gzeromedia
## 14710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @h3madri
## 14711                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @hackneyabbott
## 14712                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @hackneybusiness
## 14713                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @hackneycouncil
## 14714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @hackneyglyn
## 14715                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hackneymoves
## 14716                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @haircutspock
## 14717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @halfordsuk
## 14718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hallsymatt
## 14719                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @hally16sports
## 14720                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hammerspolls
## 14721                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @hammondcharcute
## 14722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @hamzamali
## 14723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @handwrist
## 14724                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @hannahrmarston
## 14725                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @hannahs07780609
## 14726                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hantsconnect
## 14727                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @haroonsiddique
## 14728                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @harrowcouncil
## 14729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @harrycubbz
## 14730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @harvkudos
## 14731                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hayleybarlow
## 14732                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @haywardsheathcc
## 14733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @hbw69
## 14734                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @headstretcher
## 14735                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @healixhealth
## 14736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @healthdpt
## 14737                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @healthwatchbh
## 14738                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @healthwatches
## 14739                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @healthwatchws
## 14740                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @heartnewseast
## 14741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @heavidor
## 14742                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @heeltoecharity
## 14743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @heidildn
## 14744                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @helenamckeown
## 14745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @helenilsley
## 14746                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @helenmacdonald
## 14747                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @helenskinner99
## 14748                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hellograndpa
## 14749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @hellyz
## 14750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hendopolis
## 14751                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @hepburngraham
## 14752                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @heraldscotland
## 14753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @herboo44
## 14754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @herecelts
## 14755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @hertscc
## 14756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @hertslife
## 14757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @hertsmerebc
## 14758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hestia1970
## 14759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @heygirlsuk
## 14760                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @hillsideschool4
## 14761                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hiltonhotels
## 14762                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @hiroshimalily
## 14763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @historyhit
## 14764                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @hitidebarkingside
## 14765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @hlebwohl
## 14766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hmpassport
## 14767                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hmseagletrnr
## 14768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @hmskent
## 14769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @hmsramsey
## 14770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hodaakamel
## 14771                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @hodgehillvicar
## 14772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @hoidy
## 14773                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @holidaycaravan
## 14774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hollywills
## 14775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @homebhoys
## 14776                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @hotelfootballuk�s
## 14777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @hotvoxb
## 14778                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @houghtonquaker
## 14779                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @houldingrebecca
## 14780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @hpamerton
## 14781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @hpedu
## 14782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @hs2ltd
## 14783                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hs2rebellion
## 14784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @hscboard
## 14785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @hsccec
## 14786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hscpermsec
## 14787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @hsiborg
## 14788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @hsjnews
## 14789                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hughbothwell
## 14790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hughlaurie
## 14791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @humourmeplz
## 14792                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @hungerfordtown
## 14793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @huntdarton
## 14794                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hunterprague
## 14795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hutchesons
## 14796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @hutchywutch
## 14797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @huwphuw
## 14798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @huwthomas
## 14799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hvwilliams
## 14800                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @hwbboardleeds
## 14801                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @iaincampbell07
## 14802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @iaindale
## 14803                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @iainmacwhirter
## 14804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @iamclozz3r
## 14805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @iancnoble
## 14806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @iandunt
## 14807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ianfurst
## 14808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ianhamilton
## 14809                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ianjones5news
## 14810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ianmacgilp
## 14811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ianmwelsh
## 14812                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ianoakleypiano
## 14813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @iantaplin
## 14814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ibboart
## 14815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ibmnews
## 14816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ibrnews
## 14817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ibtimesuk
## 14818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ichntddnwc
## 14819                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @icleiadvocacy
## 14820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @icnuk
## 14821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @icsb
## 14822                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @ideamapsnetwork
## 14823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @iea
## 14824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ieeesa
## 14825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ifcorg
## 14826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @igfmining
## 14827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ihliverpool
## 14828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @iisheppard
## 14829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @iissorg
## 14830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @ikea
## 14831                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ikeafoundation
## 14832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @il0vethe80s
## 14833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ilfryn1
## 14834                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ilonajohnson
## 14835                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @iloveadoodea
## 14836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ilovetheiom
## 14837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @imcmillan
## 14838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @imfnews
## 14839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @imgwyr
## 14840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @imkimaaron
## 14841                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @immarkmartin
## 14842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @imolishaw
## 14843                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @imperialpeople
## 14844                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @incredibidman
## 14845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @indiaknight
## 14846                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @insidehousing
## 14847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @inspad
## 14848                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @instoreradiopro
## 14849                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @intdevalliance
## 14850                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @interferencearc
## 14851                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @intouniversity
## 14852                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @inverclydehscp
## 14853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @inzyrashid
## 14854                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @iomdfenterprise
## 14855                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @iomfoodanddrink
## 14856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @iomuk
## 14857                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @iotconsortium
## 14858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @iotforall
## 14859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @iotguide
## 14860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @iowbobseely
## 14861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @ippr
## 14862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @iqviauk
## 14863                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ireneoldfather
## 14864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @irfurugby
## 14865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @irishnews
## 14866                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @irishnewsbiz
## 14867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @irishrugby
## 14868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @irishtimes
## 14869                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @irishtimesworld
## 14870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @iromg
## 14871                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @irwinmitchell
## 14872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @isamastro
## 14873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @iscotnews
## 14874                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @iscprodmatters
## 14875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @isdbgroup
## 14876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @isitril
## 14877                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @islaybeachhouse
## 14878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @isnttony105
## 14879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @issoporg
## 14880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @issuu
## 14881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @itfaviation
## 14882                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @itfglobalunion
## 14883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @itone4s
## 14884                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @itsjohnmartin
## 14885                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @itsjustr0sie
## 14886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @itszoemaria
## 14887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @itu
## 14888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @itv4
## 14889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @itvcentral
## 14890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @itvmeridian
## 14891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @itvpeston
## 14892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @itvracing
## 14893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @itvstudios
## 14894                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @itvwestcountry
## 14895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @iwantmynews
## 14896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @j0physio
## 14897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jackcruss
## 14898                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jackiebarbosa
## 14899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jackiebmsp
## 14900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jackweir93
## 14901                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jacobculshaw
## 14902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jacqui703
## 14903                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jagendoscopy
## 14904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jaggersray
## 14905                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jairbolsonaro
## 14906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @jamelia
## 14907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jamesasser
## 14908                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @jamescushing79
## 14909                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jamesdmorris
## 14910                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jamesmanthorp
## 14911                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @jamesmc48947300
## 14912                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jamesmelville
## 14913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jamesmfahy
## 14914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jamesnorris
## 14915                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jamessreality
## 14916                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @jamestaffdavies
## 14917                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jamiemoore777
## 14918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jandewing
## 14919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jandubiel
## 14920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @janecross12
## 14921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @janegarvey1
## 14922                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @janegoodalluk
## 14923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @janelax
## 14924                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @janemiller18
## 14925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @janetb172
## 14926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @janeyoiseau
## 14927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @janr61
## 14928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @janroweljmu
## 14929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jasonroy20
## 14930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jayahmednhs
## 14931                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @jayduck16803727
## 14932                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jaynekirkham4
## 14933                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @jaynelovesshoes
## 14934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @jcg204
## 14935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @jchudd
## 14936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @jchudds
## 14937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jcstsurgery
## 14938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jenanyounis
## 14939                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jenbradley10
## 14940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jennyalto
## 14941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jennyfordey
## 14942                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @jennykeanecahpo
## 14943                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @jenwilliamsmen
## 14944                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jeremycdalton
## 14945                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jeremynewmark
## 14946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jerzybondov
## 14947                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @jessicapurcelll
## 14948                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @jewellerylondon
## 14949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jimbethell
## 14950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jimcramer
## 14951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jimfitznews
## 14952                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jimfromoldham
## 14953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jimkerr1973
## 14954                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jkbartsheart
## 14955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @jmpsimor
## 14956                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jnharris1189
## 14957                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @joannaccherry
## 14958                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @joannajarjue
## 14959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @joanncorley
## 14960                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @joebloggscity
## 14961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jofraarcher
## 14962                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @johnbakerleeds
## 14963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @johnghart
## 14964                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @johnhenryludwig
## 14965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @johnjotink
## 14966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @johnmnoonan
## 14967                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @johnrashton47
## 14968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @johnredwood
## 14969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @johntuffrey
## 14970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @johudson13
## 14971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jonashworth
## 14972                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jonathan1476
## 14973                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @jonathon793793
## 14974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @jonesy
## 14975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jonjonessnr
## 14976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @jonlis1
## 14977                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @jonmumford1982
## 14978                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @jonporter001601
## 14979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @jonshepy
## 14980                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @joplattleigh
## 14981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @josafiend
## 14982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @josbuttler
## 14983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @jose4ez
## 14984                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @joshuapotash
## 14985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @joshuavats
## 14986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @joyabdullah
## 14987                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @joysoftechnolog
## 14988                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jozefsamelnew
## 14989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @jps1184
## 14990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jpshaddock
## 14991                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jrickettsstar
## 14992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @jsideguy
## 14993                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @juddhollander
## 14994                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @judelhandley
## 14995                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @judithmaiden
## 14996                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @julianknight15
## 14997                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @juliansheasport
## 14998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @julianting
## 14999                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @julieelwood2810
## 15000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @julielee01
## 15001                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @julieschollick
## 15002                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @julietmacarthur
## 15003                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @junagarhmedia
## 15004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @junaidsalim
## 15005                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @juniordrblog
## 15006                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jurgenklopp12
## 15007                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @justintrudeau
## 15008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @justjojo71
## 15009                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @justsayingwhat1
## 15010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @jwatch
## 15011                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kaihavertz29
## 15012                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @kailashchandobe
## 15013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @kaimhillsch
## 15014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @kamsid66
## 15015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @kanaka100
## 15016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @kanova
## 15017                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @karenabonner2
## 15018                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @karenbeattie05
## 15019                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @karenjones242
## 15020                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @karenkirkham2
## 15021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @karlthyer
## 15022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @karriek817
## 15023                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @katcashmeade
## 15024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @kateadams3
## 15025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @katedearden
## 15026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @katewilton1
## 15027                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @kathevans2015
## 15028                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @kathrinjthomas
## 15029                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @katiegr30416370
## 15030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @katierazz
## 15031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @katierazzs
## 15032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @katj512
## 15033                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @kayfbutterfield
## 15034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @kaylaf1
## 15035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @kcflnews
## 15036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @keeleyboud
## 15037                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @keepbritaintidy
## 15038                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @keirawillott
## 15039                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @keirstarmerpm
## 15040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @keithboykin
## 15041                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @keithbrownsnp
## 15042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @keithlaws
## 15043                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @keithndlovu1
## 15044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @kelemencari
## 15045                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kellieturtle
## 15046                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @kellyaucoin77
## 15047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @kellybr76
## 15048                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @kendalljenner
## 15049                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @kenilworthlions
## 15050                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @kenilworthtrade
## 15051                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @kenilworthvibes
## 15052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @kenjmunn
## 15053                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @kennethbaillie
## 15054                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @kennymacaskill
## 15055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @kentfa
## 15056                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @kentpolicetwell
## 15057                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @kenyonhallfarm
## 15058                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @kerrywoodcock
## 15059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @kesleeman
## 15060                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @keswickbootco
## 15061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @kevingemmel
## 15062                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kevinmaguire
## 15063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @kfilbee
## 15064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @khaninam1
## 15065                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @kidneyacademy
## 15066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @kieranders
## 15067                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kieranmitton
## 15068                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @kilclooneyjohn
## 15069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @kilntheatre
## 15070                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kimberlygire
## 15071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @kimcarolc
## 15072                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kimljohnston
## 15073                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kimmiekidd64
## 15074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @kimsj
## 15075                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kingfisherfb
## 15076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @kingmartinj
## 15077                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @kingstonhospnhs
## 15078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @kingstonicu
## 15079                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @kirsteinrummery
## 15080                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @kittyslaundry
## 15081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @kiva
## 15082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @kkeanebbc
## 15083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @klmuk
## 15084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @klotet
## 15085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @kmckenna63
## 15086                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @kmiddletoncsp
## 15087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @knetminer
## 15088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @knibbsey
## 15089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @krishgm
## 15090                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @krissherbert
## 15091                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kritimakhija
## 15092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @kruk
## 15093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @krummel503
## 15094                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kscopehealth
## 15095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @labour
## 15096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @labourcllrs
## 15097                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @labourdfid�s
## 15098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @labourpress
## 15099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @laboursj
## 15100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lalanamour
## 15101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lamhfada
## 15102                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @lamnidaeblue
## 15103                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @lancashirepics
## 15104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lanceforman
## 15105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lancewalton
## 15106                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lancsaeroclub
## 15107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @larathing
## 15108                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @larrymorris16
## 15109                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @lastdancebulls
## 15110                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @latimeralder
## 15111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @latimes
## 15112                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @latorredemusica
## 15113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @laurabarr38
## 15114                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @lauraengland
## 15115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @laurafarris
## 15116                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lauramccarsol
## 15117                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @laurawhiteoffic
## 15118                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @laurenbradley
## 15119                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lauriegarrett
## 15120                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @laversclaire
## 15121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lbsouthwark
## 15122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lcdviews
## 15123                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @lcgymswansea
## 15124                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ldnambulance
## 15125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ldotnatalie
## 15126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ldrwaves
## 15127                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @leanleftwright
## 15128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @leanneaf
## 15129                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @leanneashley
## 15130                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @leannebuchan
## 15131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ledredman
## 15132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @lee4ned
## 15133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @leedsahwn
## 15134                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @leedshospitals
## 15135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @leefilters
## 15136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @leep1leeds
## 15137                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @leftieklalaaa
## 15138                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @legalbrainiac
## 15139                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @legsidelizzy
## 15140                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @leicesternews
## 15141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @leicshis
## 15142                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @leighgriff09
## 15143                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @leightonandrews
## 15144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @leimoniaden
## 15145                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @leokatzgastro
## 15146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @leonagraham
## 15147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @leonidas746
## 15148                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @lesleymillercyp
## 15149                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @lessthanjase
## 15150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lewharrison
## 15151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @lfc
## 15152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lfcynwa1974
## 15153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lgacomms
## 15154                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @lgpfirstgive19
## 15155                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @lhouselabsuk
## 15156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @liambeadle
## 15157                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @liamhamilton16
## 15158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @liamowls
## 15159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @libbypdm
## 15160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @libdems
## 15161                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @liberiangirl01
## 15162                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @libertywines
## 15163                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @lifechangestrst
## 15164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @lillydrak
## 15165                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @limitedoptions3
## 15166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lindaarella
## 15167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lindabauld
## 15168                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lindleydental
## 15169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @linuspoint
## 15170                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lisadeelondon
## 15171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lisamaria94
## 15172                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @lisamcnally1
## 15173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lisarcnldn
## 15174                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @lisatruthjohns
## 15175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @liskeard
## 15176                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @littlemissileo
## 15177                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @littlevodkaowl
## 15178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @litwales
## 15179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @liuif
## 15180                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @livaofficial
## 15181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @livechonews
## 15182                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @livecoventry
## 15183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @liveonmbc
## 15184                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @liverpooltweeta
## 15185                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @livewirelpool
## 15186                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @livingrefarch
## 15187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @liz6153
## 15188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lizbhandari
## 15189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @lizbrexit
## 15190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @lizhee
## 15191                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @lizziemrsmorry
## 15192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lizzihollis
## 15193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lloydcymru
## 15194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lluniaurich
## 15195                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @llywodraethcym
## 15196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lmharpin
## 15197                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @londoncouncils
## 15198                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lonelydeborah
## 15199                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lonsdalekeith
## 15200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @loosewomen
## 15201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lorabetani
## 15202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lordbrexit
## 15203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lordgaylor
## 15204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lordltwy
## 15205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lordmanley
## 15206                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lordmcconnell
## 15207                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @lornachampcork
## 15208                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lottiehipwood
## 15209                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @loughmacrorygaa
## 15210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @louhannan
## 15211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @louisa1000
## 15212                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @louisafirstgive
## 15213                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @louiserawauthor
## 15214                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @louisethetory
## 15215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @lourit
## 15216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @love2sketch
## 15217                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @lovegoldenheart
## 15218                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @lovelysocialist
## 15219                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @lovewestdulwich
## 15220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lozzafox
## 15221                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @lpoolcouncil
## 15222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lpoolstudio
## 15223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @lpp2014
## 15224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lptresearch
## 15225                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lseeuroppblog
## 15226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lsmurthy99
## 15227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @luced42
## 15228                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @luckynk09011210
## 15229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @luckytony72
## 15230                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @lucyleather1
## 15231                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lukewright204
## 15232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lulaoficial
## 15233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lweedall
## 15234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @lwhead
## 15235                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @lyalldavenport
## 15236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lyn20341444
## 15237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lyndat48
## 15238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lynneinnes1
## 15239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @maddow
## 15240                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @madeinbritaingb
## 15241                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @madhavilall1
## 15242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @madmancmama
## 15243                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @magicsponge77
## 15244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mags2a
## 15245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mahuichina
## 15246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mahyartousi
## 15247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @maidafloat
## 15248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mailsport
## 15249                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @mainstandultras
## 15250                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @maitrasulagna
## 15251                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @malindasmith
## 15252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @maloj
## 15253                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mandabarrell
## 15254                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mandreanieto
## 15255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @manghamgreg
## 15256                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @manifestolondra
## 15257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @manlawsoc
## 15258                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mansionglobal
## 15259                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @manufacturingni
## 15260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @marcellevi
## 15261                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @marcuswareing
## 15262                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @margaret8662254
## 15263                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @margaretdunne13
## 15264                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @mark4burngreave
## 15265                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @markataylor16
## 15266                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @markaustintv
## 15267                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @markbratttravel
## 15268                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @markcartermc
## 15269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @markdtector
## 15270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @marke278
## 15271                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @markfharrison
## 15272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @markfulker
## 15273                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @markhalsalllpft
## 15274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @markjhooper
## 15275                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @markmalcomson
## 15276                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @markmasonshall
## 15277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @marktopps
## 15278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @marmite
## 15279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @marrshow
## 15280                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @marshawright
## 15281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @martina
## 15282                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @martinmccluskey
## 15283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @martinrcgp
## 15284                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @martinrossiter
## 15285                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @martintideswell
## 15286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @martyallen
## 15287                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @martynziegler
## 15288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @maryfeemsp
## 15289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @maryhillin
## 15290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @marykfoy
## 15291                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @maryrosemuseum
## 15292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @maryvmos1
## 15293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mashable
## 15294                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @matchroomsport
## 15295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mathiedan
## 15296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @matiak5
## 15297                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @matthamilton
## 15298                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @matthancock�s
## 15299                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @matthewparris3
## 15300                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @matthewstadlen
## 15301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @matthewsyed
## 15302                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @matthunter27
## 15303                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mattjohnsonuk
## 15304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mattremains
## 15305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mattsingh
## 15306                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mattvickersmp
## 15307                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mattysmith600
## 15308                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @maureenpickeri5
## 15309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @maxcroser
## 15310                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @maximhorwitz
## 15311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @maydayrooms
## 15312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mayorbowser
## 15313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mbashwood
## 15314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mbobaben
## 15315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mc62474583
## 15316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mcb163
## 15317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @mcc
## 15318                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @mccaffertyheidi
## 15319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mcdonalds
## 15320                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @mcssportoxford
## 15321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mdonkin
## 15322                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @mdsastonmartin
## 15323                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @medcramvideos
## 15324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mediawisemj
## 15325                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @medicaleducator
## 15326                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @medpagetoday
## 15327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @medwaynhsft
## 15328                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @meemeenakshi
## 15329                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @meganmccubbin
## 15330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @meghamohan
## 15331                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @melanieemacleod
## 15332                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @mennovanhilten
## 15333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mercury1712
## 15334                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @mercurytheatre
## 15335                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @merlynmarsden
## 15336                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @merrigansteve
## 15337                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @merseypolice
## 15338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mesouk
## 15339                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @messengeraugur
## 15340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mgoldenmsp
## 15341                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mgreenwoodww
## 15342                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mheathacademy
## 15343                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @micailic0mica
## 15344                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @michaelatoms
## 15345                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @michaelcarter73
## 15346                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @michell85928006
## 15347                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @michellebatem16
## 15348                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @michellelhussey
## 15349                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @michellmybell1
## 15350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mickallen19
## 15351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mickyyule9
## 15352                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @microsoftteams
## 15353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @midearly
## 15354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @midlandorth
## 15355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @migmatfest
## 15356                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mikebloomberg
## 15357                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mikeholden42
## 15358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mikejhood
## 15359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mikekanemp
## 15360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mikeparry8
## 15361                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mikequindazzi
## 15362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @miketonge
## 15363                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @mikevanderwatt
## 15364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mileycyrus
## 15365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @millwallfc
## 15366                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ministryofst
## 15367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @minsquish
## 15368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @minsterfm
## 15369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @minzdravrf
## 15370                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @misogynyishate
## 15371                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @missdynamite
## 15372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @missingsun
## 15373                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @missmayormaynot
## 15374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @missott
## 15375                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @misterguilbert
## 15376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mitrab95
## 15377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mjfree
## 15378                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mjknight0380
## 15379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @mkfm
## 15380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mkhospital
## 15381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mkhour
## 15382                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mktgcheshire
## 15383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mlarsvogel
## 15384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mmksfl
## 15385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mn7cfc
## 15386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mnb0704
## 15387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @moatstv
## 15388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @modernatx
## 15389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @moggmentum
## 15390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mohcczim
## 15391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @moishesmom
## 15392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @monicadolan
## 15393                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @monmouthshirecc
## 15394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @monolini
## 15395                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @montanacansuk
## 15396                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @morganlowept
## 15397                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @morganmcdonoug2
## 15398                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @morgansindall
## 15399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @morvenjdunn
## 15400                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @moshpitwitch
## 15401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mossobyanin
## 15402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mpedson
## 15403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mph1982
## 15404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mpshackney
## 15405                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mradfordheecn
## 15406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mrcolinowen
## 15407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mrdtafc
## 15408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mrmalky
## 15409                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mrmasonmills
## 15410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mrmehramd
## 15411                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @mrmichaelspicer
## 15412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mrnishkumar
## 15413                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mrsbosanquet
## 15414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mrschu
## 15415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mrshatman40
## 15416                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @mrsmintobiosci
## 15417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mrsrswipe
## 15418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @mrssb
## 15419                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @mshiltongodwin
## 15420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @msrfuture
## 15421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mssthompson
## 15422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mstaronline
## 15423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @msuk6
## 15424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mtblondie12
## 15425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mtuj1974
## 15426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mucoff
## 15427                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mummyharriii
## 15428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @muqadaam
## 15429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @murdofraser
## 15430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @murrayf00te
## 15431                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @museumsassoc
## 15432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mwforhr
## 15433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @mwood
## 15434                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mwrestaurants
## 15435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @my5tv
## 15436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mymetro
## 15437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mzflyfisher
## 15438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mzgovpl
## 15439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @n1ckharwood
## 15440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @n68winstan
## 15441                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @naitscotland
## 15442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @nambyaj
## 15443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nanaakua1
## 15444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nancyhaven
## 15445                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @naomikellman
## 15446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @naomilwood
## 15447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @naoorguk
## 15448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @narcisd
## 15449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @natallini
## 15450                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @nathancoward1
## 15451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @nato
## 15452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nature
## 15453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @navikakumar
## 15454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @navshuk
## 15455                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @nbcnightlynews
## 15456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nbhelpline
## 15457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ncauk
## 15458                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ncccontracts
## 15459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nccltd
## 15460                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ncvovolunteers
## 15461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nealgilbert
## 15462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nealrogers
## 15463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @neambulance
## 15464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @neddc
## 15465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @neetal4u
## 15466                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @neilferguson
## 15467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @neilmac27
## 15468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @neilodor
## 15469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @neilweir8
## 15470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @neoavatara
## 15471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @nesnmahp
## 15472                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @neuroactivelon1
## 15473                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @nevillesouthall
## 15474                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @newcastlepsych
## 15475                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @newcrosshealth
## 15476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @neweurope
## 15477                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @neweuropeans
## 15478                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @newhamhospital
## 15479                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @newhamlondon
## 15480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @newmalden19
## 15481                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @newstatesman
## 15482                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @newwortleycc
## 15483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @nhft
## 15484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @nhs24
## 15485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @nhsbt
## 15486                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @nhsceoadamdoyle
## 15487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nhsdigital
## 15488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @nhselect
## 15489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @nhsgirft
## 15490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nhshmr
## 15491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nhstayside
## 15492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @niabbot
## 15493                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @niallgriffiths
## 15494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nichamber
## 15495                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @nickferrarilbc
## 15496                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @nickmorristt
## 15497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nickpelling
## 15498                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @nicksevdalis
## 15499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nickycarr51
## 15500                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @nickypettitt
## 15501                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @nicolabeaumon17
## 15502                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @nicolapatters17
## 15503                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @nicolebadstuber
## 15504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nicolesykes
## 15505                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @nicomanocchio
## 15506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @niexecutive
## 15507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nigreenways
## 15508                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @nihrresearch
## 15509                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @nikishabhogaita
## 15510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nikkitapper
## 15511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ninanobasi
## 15512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @niroads
## 15513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nixonlcfc
## 15514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @nksfl
## 15515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @nnylfets
## 15516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @nobbyzz
## 15517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nolelondon
## 15518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nomics
## 15519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nonfatmead
## 15520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @noornehmat
## 15521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @norfolkcc
## 15522                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @northayrshire
## 15523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @northbrewco
## 15524                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @northernassist
## 15525                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @northmcrghnhs
## 15526                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @northnottsbid
## 15527                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @northwaleslive
## 15528                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @northwestcsp
## 15529                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @northwichnews
## 15530                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @notjustroleplay
## 15531                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @nottobeneutral
## 15532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @npeuukoss
## 15533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @nsoames
## 15534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nstcareers
## 15535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @nts
## 15536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @nufc
## 15537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nursegrace
## 15538                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @nursingtimes
## 15539                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @nurtureuktweets
## 15540                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @nutritionjack
## 15541                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @nutritiousmind
## 15542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nuttsmutts
## 15543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nwambulance
## 15544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nwpioneer
## 15545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nygovcuomo
## 15546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @oakforduk
## 15547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @obdsfl
## 15548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @observeruk
## 15549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ocado
## 15550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @occadesign
## 15551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @oclactive
## 15552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @octagot
## 15553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @odn8
## 15554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @oecddev
## 15555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @oecdeconomy
## 15556                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @oecd�forecast
## 15557                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @officialalpzel
## 15558                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @officialblue
## 15559                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @officialdgispr
## 15560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @officialfpl
## 15561                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @officialstfc
## 15562                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @oflynnsocial
## 15563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @oharamal
## 15564                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ohgoodgrief2
## 15565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @oisindubai
## 15566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @oizuluaga
## 15567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @oldkentroad
## 15568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @oldpunky
## 15569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ollietwist4
## 15570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @olorin007nz
## 15571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @olulat3
## 15572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @omid9
## 15573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @onemoorgate
## 15574                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @onlivelearning
## 15575                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @onlyoneteeta
## 15576                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @opencovidpledge
## 15577                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @opendemocracy
## 15578                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @opiniumresearch
## 15579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @orhanseg
## 15580                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @orientoutlook
## 15581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @orthomeg
## 15582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @oscarconcha
## 15583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @oscepa
## 15584                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @otherhalfnyc
## 15585                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ottleyoconnor
## 15586                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @oucruvietnam
## 15587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @oufass
## 15588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ourmoh
## 15589                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ourtowntrust
## 15590                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ousocpolcrim
## 15591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @owenjones84
## 15592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @owilce
## 15593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @oxfordcity
## 15594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @oxfordhand
## 15595                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @pacrosthwaite
## 15596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @padraicknox
## 15597                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @palebackwriter
## 15598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @panasgurkha
## 15599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @panayisalad
## 15600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @panelbase
## 15601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @panlidsid
## 15602                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @paperbookmarks
## 15603                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @papworthbrewery
## 15604                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @parisdaguerre
## 15605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @parisldn
## 15606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @parkrunuk
## 15607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @parkwanju
## 15608                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @parpindersingh
## 15609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @parsuk
## 15610                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @partaisocmed
## 15611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @pascalefung
## 15612                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @pascaljabbourmd
## 15613                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @pat1975wattty
## 15614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @pate1pater1
## 15615                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @pathogenomenick
## 15616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @paulajaneb
## 15617                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @paulashyoung
## 15618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @paulbower
## 15619                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @paulbranditv
## 15620                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @paulcoulthard
## 15621                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @pauldubuisson
## 15622                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @pauloneill29
## 15623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @paulspires1
## 15624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @paultudor
## 15625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @paulwaugh
## 15626                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @paulwfleming
## 15627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @pauseorg
## 15628                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @paymentsethical
## 15629                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @payourplanet
## 15630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @pburlo
## 15631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @pcwthub
## 15632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @pdockerty
## 15633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @peerlessltd
## 15634                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @peoplefirstdor
## 15635                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @peoplespowerhse
## 15636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @perayahmet
## 15637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @perfxhockey
## 15638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @periopdoc
## 15639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @perkyg
## 15640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @pershoredan
## 15641                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @pertempsjobs
## 15642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @petemullin
## 15643                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @peterblair14
## 15644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @peteregan6
## 15645                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @peterha28087897
## 15646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @peterjohn6
## 15647                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @peterkavanaghs
## 15648                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @petermbenglish
## 15649                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @peterstefanovi2
## 15650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @petewishart
## 15651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @pftameside
## 15652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @pgatour
## 15653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @pgpmp
## 15654                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @phaedraxteddy
## 15655                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @pharmacistdaz
## 15656                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @pharmacynewsuk
## 15657                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @pharmadoctoruk
## 15658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @pharmafield
## 15659                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @phelpsiesarah
## 15660                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @phesoutheast
## 15661                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @philbatemanmbe
## 15662                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @philipjonmorris
## 15663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @philmac9896
## 15664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @phrcleeds
## 15665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @phsparents
## 15666                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @physiofirstc
## 15667                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @physiosbrookes
## 15668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @pickardje
## 15669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @picsoflpool
## 15670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @picuscot
## 15671                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @piersmogangmb
## 15672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @pimc66
## 15673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @pinknews
## 15674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @pippacrerar
## 15675                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @pippasangster
## 15676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @pishdaadc
## 15677                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @pitaliyavaibhav
## 15678                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @pittsburghtodd
## 15679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @pjl1971
## 15680                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @placemanagement
## 15681                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @planetafuturo
## 15682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @planetdebra
## 15683                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @planetorganicuk
## 15684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @plarshans
## 15685                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @pledgetowomen
## 15686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @plforindia
## 15687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @pnasnews
## 15688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @podcastselk
## 15689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @podparr
## 15690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @poetorganic
## 15691                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @policescotland
## 15692                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @policeserviceni
## 15693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @policysr
## 15694                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @politicalkitty
## 15695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @politico
## 15696                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @pollychamilton
## 15697                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @popunderrated
## 15698                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @portiarmount
## 15699                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @poscacoloring
## 15700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @poscauk
## 15701                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @positiveluxury
## 15702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @postoffice
## 15703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @potnoodle
## 15704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @potus
## 15705                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @povilaskorop
## 15706                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @pramoddrsolanki
## 15707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @praveen520
## 15708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @praxiscare
## 15709                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @preetibose26
## 15710                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @presidentpmln
## 15711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @presssec
## 15712                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @primeministergr
## 15713                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @prioryrentals
## 15714                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @profandrewscott
## 15715                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @profbmtgreat
## 15716                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @profbriancox
## 15717                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @profchloeorkin
## 15718                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @profhelenward
## 15719                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @proflappleby
## 15720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @profmakris
## 15721                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @profruthmason
## 15722                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @projectbetty
## 15723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @propertyshe
## 15724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @protectpubs
## 15725                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @protectwldlife
## 15726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @prwhittle
## 15727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @pscricket
## 15728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @psenews
## 15729                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @psnibelfasts
## 15730                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @psnimidulster
## 15731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @psqueak
## 15732                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @psychictwins
## 15733                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @pthbpallcare
## 15734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ptpenfold
## 15735                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @publichealtheng
## 15736                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @publichealthni
## 15737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @publicoes
## 15738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @puffacarrot
## 15739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @pughonline
## 15740                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @purejewelscom
## 15741                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @purvisadrian
## 15742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @putinsbotox
## 15743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @pwcuk�s
## 15744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @pydpbrake
## 15745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @pyllondon
## 15746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @qehbham
## 15747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @qmudca
## 15748                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @qmuniversity
## 15749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @qpcouncil
## 15750                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @qtrlyrapport
## 15751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @queensips
## 15752                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @queensubelfast
## 15753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @quinnccio
## 15754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @quinsfots
## 15755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @racejustice
## 15756                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @rachaelmoses
## 15757                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @rachaelswindon
## 15758                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @rachaelvenables
## 15759                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @rachelmillar
## 15760                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @rachelryder101
## 15761                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @rachelspenceruk
## 15762                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @rackapuzz1957
## 15763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @raddabarnen
## 15764                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @radiidevices
## 15765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @radusmall
## 15766                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @raengnews�futureworlds
## 15767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @rafvdvaart
## 15768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rahatheart1
## 15769                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @rainforestbook
## 15770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @rajansinha
## 15771                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @rajivpopatitv
## 15772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @rajmurali4
## 15773                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @rallyinsight
## 15774                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @rameshmehta15
## 15775                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ramsgaternli
## 15776                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ramsgatetown
## 15777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @randa
## 15778                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @randomsunrises
## 15779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @rango1917
## 15780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @rapha
## 15781                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @raveenahargun
## 15782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @rbfmaguire
## 15783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @rbhh
## 15784                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @rchelseacurran
## 15785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @rcndnforum
## 15786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rcnilisa
## 15787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rcnpainpall
## 15788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @rcomian
## 15789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @rcotopc
## 15790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rcpchtweets
## 15791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @rcpsych
## 15792                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @rcradiologists
## 15793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @rcsnews
## 15794                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @rdickson2902
## 15795                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @reactresponse
## 15796                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @realcandaceo
## 15797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @realkingrah
## 15798                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @reallorraine
## 15799                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @realpetebennett
## 15800                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @rebeccaofford
## 15801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rebfemme
## 15802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @recoveryrs
## 15803                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @recreatetoday
## 15804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @redredrev
## 15805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @redsarah99
## 15806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @redtab16
## 15807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @remainernow
## 15808                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @rennie1d<u+0001f60a>
## 15809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @rentec
## 15810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @researchrcn
## 15811                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @resonanceextra
## 15812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @resonancefm
## 15813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @retailni
## 15814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @rettlarson
## 15815                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @reuterspictures
## 15816                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @revthomas512
## 15817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @rfi
## 15818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @rharrabin
## 15819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rhinobaggie
## 15820                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @rhunapiorwerth
## 15821                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @richard37778076
## 15822                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @richardblack
## 15823                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @richardburgon
## 15824                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @richardfidler
## 15825                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @richardhammondz
## 15826                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @richardhorton1
## 15827                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @richardosborn13
## 15828                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @richdunleave
## 15829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @richt1979
## 15830                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @rickystutterz
## 15831                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ridgeonsunday
## 15832                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @righteous1indig
## 15833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rikkidoolan
## 15834                                                                                                                                                                                                                                                                                                                                                                                                                                                         @rishisunak<u+0001f447><u+0001f3fb>
## 15835                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @rkwinvisibleman
## 15836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rlcwords
## 15837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rlongbailey
## 15838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rmuflihi
## 15839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @rnli
## 15840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @rnreserve
## 15841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @robdelyn
## 15842                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @robertanugent1
## 15843                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @robertbuckland
## 15844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @robertjwest
## 15845                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @robertwhitemd
## 15846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @robfm
## 15847                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @robinflavell
## 15848                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @robinkellett
## 15849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @robinncst
## 15850                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @robjeffecology
## 15851                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @robrobbedwards
## 15852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @robron75
## 15853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @robster16a
## 15854                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @rochdalecouncil
## 15855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rochdaledph
## 15856                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @rochforddistrictcommunity
## 15857                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @rocklacasmar
## 15858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rogercasale
## 15859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rohnhsft
## 15860                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @ronaldopatrizio
## 15861                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ronamossmorris
## 15862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @rosaltmann
## 15863                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @rosannaogden
## 15864                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @rosirivera261
## 15865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rosskemp
## 15866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rossobus
## 15867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @rotarygbi
## 15868                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @rotoreverend
## 15869                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @roxanabarbulesc
## 15870                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @royallythamgolf
## 15871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @royalmail
## 15872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @royalnavy
## 15873                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @royalsociety
## 15874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @roylilley
## 15875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @rp131
## 15876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @rsceic
## 15877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rsignals
## 15878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ruchikumar
## 15879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rudolphhart
## 15880                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @rugbybencohen
## 15881                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @rugbyboroughfc
## 15882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @rupalr
## 15883                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ruralactionni
## 15884                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @russellcrowe
## 15885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @russelljj
## 15886                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @russincheshire
## 15887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @rutembessa
## 15888                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ruthbilhamart
## 15889                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @ruthdavidsonmsp
## 15890                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ruthgoodwing
## 15891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ruviz
## 15892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @rwb69
## 15893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @rwtnhs
## 15894                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @ryanwal59543002
## 15895                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sabinegerdon
## 15896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sainsburys
## 15897                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @salfordroyalnhs
## 15898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @salforduni
## 15899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sallymag1
## 15900                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @salvationarmy
## 15901                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @samanthacwcc
## 15902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @samatdigby
## 15903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @samheughan
## 15904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sammwhiting
## 15905                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @samsherrington
## 15906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @sand23x
## 15907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @sandbach
## 15908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sandrawors3
## 15909                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @sandwellcouncil
## 15910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sandymcafee
## 15911                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sanjaymuthal
## 15912                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @sanjeeperera1
## 15913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sapiofoxy
## 15914                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @sapphiremccalla
## 15915                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sarahanna161
## 15916                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sarahcchurch
## 15917                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @sarahchampion
## 15918                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @sarahedderwick
## 15919                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @sarahwollaston
## 15920                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @saralivadeas
## 15921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @saramkay
## 15922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sarfellboy
## 15923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sariel2005
## 15924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sarunogiri
## 15925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @sas1933
## 15926                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @satyagrahalba
## 15927                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @savethechildren
## 15928                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @saworldservice
## 15929                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @sayedzbukhari
## 15930                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @sbaenegplasmawr
## 15931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sblack505
## 15932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sbshallam
## 15933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @scaleup360
## 15934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @scarletrix
## 15935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @sciaf
## 15936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @scientits
## 15937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sclpathway
## 15938                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @scotbordersec
## 15939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @scotgov�s
## 15940                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @scotnational
## 15941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @scotpol1314
## 15942                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @scotrefcouncil
## 15943                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @scotsecofstate
## 15944                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @scottan28638063
## 15945                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @scottdurairaj
## 15946                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @scotthaddenmcim
## 15947                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @scottishcare
## 15948                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @scottishfabians
## 15949                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @scottishwizard
## 15950                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @scranacademy
## 15951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @scstcouncil
## 15952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @scstring
## 15953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @sctsuk
## 15954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @scutlerifa
## 15955                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @scvosandwell
## 15956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @sdgoals
## 15957                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sdrcresearch
## 15958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @se1
## 15959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @seacdefence
## 15960                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @seamasbelfast
## 15961                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @seanjos60720882
## 15962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @seboix
## 15963                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @secretattic2020
## 15964                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @selfmgmtscot
## 15965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @seneddwales
## 15966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @seniordebra
## 15967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @senscot
## 15968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sepehrara
## 15969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @serailway
## 15970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sercogroup
## 15971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sfaactive
## 15972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sgsahblog
## 15973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @shabi1009
## 15974                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @shadow135simmi
## 15975                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @shahanaramsden
## 15976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @shahidislam
## 15977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @shajedanhs
## 15978                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @shalini040876
## 15979                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @sharemytellyjob
## 15980                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @sharmasupriya
## 15981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @sharpie
## 15982                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @sharpshineyrow
## 15983                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @shashankjain
## 15984                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @shashidharamk
## 15985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @shastahali
## 15986                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @shaunbaileyuk
## 15987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @shehabkhan
## 15988                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @sheilam19534814
## 15989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @shep689
## 15990                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @sheuliporkess
## 15991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @shiblifaraz
## 15992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @shicooks
## 15993                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @shiptonmartin
## 15994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @shoutoutuk
## 15995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @shreyshtyle
## 15996                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @shropshirestar
## 15997                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @sianbaldwin2003
## 15998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @sida
## 15999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sidacarin
## 16000                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @sigsworthjanice
## 16001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sikhfeduk
## 16002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @sikhpa
## 16003                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sikhs4labour
## 16004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sileegpni
## 16005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @siliverpool
## 16006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @simcoeis
## 16007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @simoncalder
## 16008                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @simonfraser00
## 16009                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @simonhall1974
## 16010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @simonhgray
## 16011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @simonjhix
## 16012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @simonmaginn
## 16013                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @simonwebster74
## 16014                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @simpleshaman
## 16015                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @siobhancorria
## 16016                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @sirgrahambrady
## 16017                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sirtomhunter
## 16018                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @sistermedicine
## 16019                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sjalogistics
## 16020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sjwatkinson
## 16021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sjwhitson
## 16022                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @skeinheroine
## 16023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @skerryvore
## 16024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @skewspew
## 16025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @sknygy
## 16026                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @skredtherogue
## 16027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sktchdcomic
## 16028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @sky
## 16029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @skyarts
## 16030                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @skysportsgolf
## 16031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @skysportspl
## 16032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @sliceme
## 16033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sloaneguy
## 16034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sloanvaniva
## 16035                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @sloweducation
## 16036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @slsstudios
## 16037                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @smallbizsatuk
## 16038                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @smartasacarrot
## 16039                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @smartworksgm
## 16040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @smassoc
## 16041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @smcg600
## 16042                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @snapandgo222
## 16043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @snapchat
## 16044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @snickersuk
## 16045                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @socentacademy
## 16046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @socialentuk
## 16047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @socialmike
## 16048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sohoradio
## 16049                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @solihullaproach
## 16050                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @solomoncheruyot
## 16051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sombergella
## 16052                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @somersethour
## 16053                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @soniajohnson
## 16054                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sonicscrewup
## 16055                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @sonomachristian
## 16056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sonophysio
## 16057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @sonusood
## 16058                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @sorayasoraya55
## 16059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @sotlive
## 16060                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @southwarktigers
## 16061                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @soverybritish
## 16062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @spajw
## 16063                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @sparky77600125
## 16064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @spbail
## 16065                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @speakerpelosi
## 16066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @spectator�s
## 16067                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @spencermorgan93
## 16068                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @spirehealthcare
## 16069                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @spiritsbusiness
## 16070                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @sportscotland
## 16071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sportsdrzaf
## 16072                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sporttotalfm
## 16073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @spotify
## 16074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @spotifyuk
## 16075                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @squawkstreet
## 16076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ssabab
## 16077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @ssrn
## 16078                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @staceydooley
## 16079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @stalliance
## 16080                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @standbackup2
## 16081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @standfree3
## 16082                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @starmstrong1966
## 16083                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @staustellgolf
## 16084                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @stchrishospice
## 16085                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @steidlesamantha
## 16086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @stematphs
## 16087                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @stephaniedawe
## 16088                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @stephenhampson
## 16089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @stephenkb
## 16090                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @stephenleckieh
## 16091                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @stephenporter70
## 16092                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @stephthepsych
## 16093                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @stevebeale24
## 16094                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @stevebi27465893
## 16095                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @stevelo27481202
## 16096                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @stevemi23816324
## 16097                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @stevengranger17
## 16098                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @stevengthomson
## 16099                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @stevenhesketh
## 16100                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @stevenhill2011
## 16101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @stevetombs
## 16102                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @stevewallwork
## 16103                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @stewartcelhiney
## 16104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @stewtippler
## 16105                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @sthelenscouncil
## 16106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @stillpo
## 16107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @stiralumni
## 16108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @stirspyp
## 16109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @stiruni
## 16110                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @stjosephsdgc
## 16111                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @stninianspri
## 16112                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @stockexhotel�s
## 16113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @stooirvin
## 16114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @stophs2
## 16115                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @stopsepsisnow
## 16116                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @stormhuntley
## 16117                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @storyhouselive
## 16118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @stratandbiz
## 16119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @stratforddc
## 16120                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @stratforward
## 16121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @strathfai
## 16122                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @strawbeblonde
## 16123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @striturf
## 16124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @stuactor
## 16125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @stylcd
## 16126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @suchitrav
## 16127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @suehrd
## 16128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @suffolkcc
## 16129                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @suffolkroyal
## 16130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sully2fly
## 16131                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @sunderlandafc
## 16132                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sunderlanduk
## 16133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sunitasays
## 16134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @suparl
## 16135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @surfdoctor
## 16136                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @surgerysleeper
## 16137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @surgisphere
## 16138                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @susanmmathieson
## 16139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sussexccc
## 16140                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @sussexcricketfd
## 16141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sussexhcp
## 16142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sustransni
## 16143                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sutrscotland
## 16144                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @suttoncouncil�s
## 16145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @suzirockett
## 16146                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @suzysopenheart
## 16147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @svzy0
## 16148                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @swanswan0307
## 16149                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @swindonwiltspri
## 16150                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @swisscognitive
## 16151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @swotup
## 16152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @swsgl
## 16153                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @sylviab05413603
## 16154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @symeonbrown
## 16155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @syrecldd
## 16156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @tabaza
## 16157                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @talkolderpeople
## 16158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @talksport2
## 16159                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @tamaracharvey
## 16160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tammyhaq
## 16161                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @tamsingreenway
## 16162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tandhesi
## 16163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @taniadom1
## 16164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @taniawren
## 16165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tassiedi
## 16166                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @taygreenmusic
## 16167                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @taylorarmstrong
## 16168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @taylorshone
## 16169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @tbbbotira
## 16170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @tcunderdahl
## 16171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @teamcno
## 16172                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @teamwilldaily
## 16173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @teapainusa
## 16174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @techacad
## 16175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @techpriest
## 16176                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @tedperkins10
## 16177                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @tedxnorwiched
## 16178                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @tedyarbrough1
## 16179                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @teenagecancer
## 16180                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @tegidroberts
## 16181                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @telebusiness
## 16182                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @telegraphnews
## 16183                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @telepolitics
## 16184                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @telfordsupport
## 16185                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @telfordwrekin
## 16186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @tennea8
## 16187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @terlotte
## 16188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @tertiusiii
## 16189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @tes
## 16190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @tesconews
## 16191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tfkgawat
## 16192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @tfwrail
## 16193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @th1rt3entm
## 16194                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @th4tgingerk1d
## 16195                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thattimwalker
## 16196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @the
## 16197                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @the1stimmortal
## 16198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @the1voyce
## 16199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @theacprc
## 16200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @theaou
## 16201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @theapcc
## 16202                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @theatresupport
## 16203                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thebabylonbee
## 16204                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @thebansrugby
## 16205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @thebuyer11
## 16206                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @thecarltonleach
## 16207                                                                                                                                                                                                                                                                                                                        @thecarolemalone<u+0001f3f4><u+000e0067><u+000e0062><u+000e0065><u+000e006e><u+000e0067><u+000e007f><u+0001f1ec><u+0001f1e7><u+0001f3f3><u+fe0f><u+200d><u+0001f308>
## 16208                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thecelticstar
## 16209                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thecelticwiki
## 16210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @thecmj
## 16211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @theconwom
## 16212                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @thecspstudents
## 16213                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @thedemocrats
## 16214                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @theeconomist1
## 16215                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @theevilbarbie
## 16216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @thefca
## 16217                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @theforetrust
## 16218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @theftd2
## 16219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @thegazette
## 16220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @theghostbsl
## 16221                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @thehalotrust
## 16222                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thehighway2ai
## 16223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @thehill
## 16224                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thehistoryguy
## 16225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @theirishayk
## 16226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @thejamesmax
## 16227                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thejameswhale
## 16228                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @thejanemcdonald
## 16229                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @thejournalie
## 16230                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @thejusticedept
## 16231                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thelittlechis
## 16232                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @thelittlesmiler
## 16233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @thelizcarr
## 16234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @theltda
## 16235                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @thematildausyd
## 16236                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @themeltingpoted
## 16237                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @theneweuropean
## 16238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @thensyf
## 16239                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @theodoraclarke
## 16240                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @theonlyriya1
## 16241                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @theotherneilt
## 16242                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @thepoliticsund1
## 16243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @thercal
## 16244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @thercot
## 16245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @theripoman
## 16246                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @theroyalparks
## 16247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @thesimpsons
## 16248                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @theskinnymag
## 16249                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @thestandardarts
## 16250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @thesun
## 16251                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @thethumbcompass
## 16252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @thetimes
## 16253                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @thetimesscot
## 16254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @thetlinks
## 16255                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @thetrainline
## 16256                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @thevoicenews
## 16257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @thewhitmore
## 16258                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @thewiltonweigh
## 16259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @thewsbf
## 16260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @thieristan
## 16261                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @thinktankphoto
## 16262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @thinkytexan
## 16263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @thismorning
## 16264                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @thomascarrollgp
## 16265                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @thomasdavid007
## 16266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @thr
## 16267                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @threedaymonk
## 16268                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thrombosisday
## 16269                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @thrombosisuk
## 16270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @tidecarers
## 16271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tiktokin
## 16272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tiktokuk
## 16273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tiktokus
## 16274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @timbaland
## 16275                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @timeshighered
## 16276                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @timesofindia
## 16277                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @timinsuffolk
## 16278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @timjrhill
## 16279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @timmyvoe
## 16280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @timspector
## 16281                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @timthursfield
## 16282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @tjuhospital
## 16283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @tkwmag
## 16284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tmills15
## 16285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @tnewtondunn
## 16286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @toadmeister
## 16287                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @tobiasellwood
## 16288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tobyontv
## 16289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @tolanimade
## 16290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @tomaikens
## 16291                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @tombrow38006074
## 16292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @tomedgell
## 16293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @tomemurtha
## 16294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @tomhfh
## 16295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @tomjefford
## 16296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @tomlister
## 16297                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @tommysheppard
## 16298                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @tomscharfncl
## 16299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @tomstoker5
## 16300                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @tonyevans92a
## 16301                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @tonyflynn1208
## 16302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @tonyklpft
## 16303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @tonyrodduk
## 16304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @tonywaters
## 16305                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @toonarmyindia
## 16306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @toppsrobbs
## 16307                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @torbaycouncil
## 16308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @torbettr
## 16309                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @tothemo83592350
## 16310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @tourismfiji
## 16311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @tprstl
## 16312                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @traceyfutures
## 16313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @tracybrabin
## 16314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @tradtec2101
## 16315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @transdev
## 16316                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @transportgovuk
## 16317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @trassens
## 16318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @travelup
## 16319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @treekahlo
## 16320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @treevoices
## 16321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @treloars
## 16322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @treped
## 16323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @trevorlarge
## 16324                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @tribunemagazine
## 16325                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @trickyd90556041
## 16326                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @triptraveler2
## 16327                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @trishgreenhalgh
## 16328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @troopzafc
## 16329                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @truthtalkingmav
## 16330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @tsmiggy
## 16331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @tsunami65
## 16332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @tuiuk
## 16333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @tulipsiddiq
## 16334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @turkishldn
## 16335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @tuskorg
## 16336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @tvkev
## 16337                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @tvtalentmanager
## 16338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @twendeagain
## 16339                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @twittermoments
## 16340                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @twrinklyninja
## 16341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @twycrosszoo
## 16342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @tyddynisaf
## 16343                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @tylerrickytynes
## 16344                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @ualbertanursing
## 16345                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @ubeleinitiative
## 16346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @uber
## 16347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @uberuk
## 16348                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @uberuksupport
## 16349                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ucsaoaklands
## 16350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @uhbresearch
## 16351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @uhbtherapy
## 16352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @uhbtrust
## 16353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @uhlfox
## 16354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @uhmbt
## 16355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @uhmbtv
## 16356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @uhpnhs
## 16357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ukactive
## 16358                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ukcovid19stats
## 16359                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ukdomainnames
## 16360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ukgov
## 16361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ukhospkate
## 16362                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ukinbangladesh
## 16363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ukinvietnam
## 16364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ukmdsforum
## 16365                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ukparliament
## 16366                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @uksciencechief
## 16367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @uktheatre
## 16368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ukulele20
## 16369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ulivucu2
## 16370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ulsterrugby
## 16371                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ulsterrugby88
## 16372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @undarkmag
## 16373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @undp
## 16374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @unep
## 16375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @unescap
## 16376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @unhabitat
## 16377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @unicef
## 16378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @unicefbd
## 16379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @unisonwales
## 16380                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @unisouthampton�postgrad
## 16381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @unitedphd
## 16382                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @unknown73206909
## 16383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @uoedisabled
## 16384                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @uofgeducation
## 16385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @uofglasgow
## 16386                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @uogtranspharm
## 16387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @uonshs
## 16388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @uopedsoc
## 16389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @uophumss
## 16390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @uppergisurg
## 16391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @upshelpuk
## 16392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @upsuk
## 16393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @uptaleio
## 16394                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @urbanedenbeauty
## 16395                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @urbanpictures
## 16396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @urbelatam
## 16397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @urchtyrone
## 16398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ustraderep
## 16399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @uusuonline
## 16400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @v3n0m777
## 16401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @v5m1000
## 16402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @vaadaenews
## 16403                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @valezinhumwe
## 16404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @vallen5555
## 16405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @valuingn
## 16406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @vanda
## 16407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @vappg
## 16408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @vasbimedia
## 16409                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @vaughangething
## 16410                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @vexedinthecity
## 16411                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @vgovindarajan
## 16412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @viacomcbs
## 16413                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @viacomtalent
## 16414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @vice
## 16415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @vicknhope
## 16416                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @victori34220139
## 16417                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @victoriatopping
## 16418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @victoryabro
## 16419                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @vidhyaalakeson
## 16420                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @vikramkamboj
## 16421                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @vinealdershot
## 16422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @vinography
## 16423                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @virginradiouk
## 16424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @virtualash
## 16425                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @visitbathbiz
## 16426                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @visitblackpool
## 16427                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @visitfyldecoast
## 16428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @visitkent
## 16429                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @visitramsgateuk
## 16430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @visitthanet
## 16431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @vivamjm
## 16432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @vmallarino
## 16433                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @vngovtportal
## 16434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @voa1234
## 16435                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @vocabularyninja
## 16436                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @voicenewspapers
## 16437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @volscotland
## 16438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @voth26
## 16439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @vpnircem
## 16440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @vtgpoint
## 16441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @wacamerica
## 16442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @walesgolf
## 16443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @walesrugbyl
## 16444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @walk0ff
## 16445                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @waltdisneyworld
## 16446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @wamagaisa
## 16447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @wanpengmdec
## 16448                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @warchildmusic
## 16449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @warchilduk
## 16450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @warycat
## 16451                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @washingtonpost
## 16452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @watcgirl
## 16453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @wateraiduk
## 16454                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @watfordworkshop
## 16455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @wayward24
## 16456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @wbabenbow
## 16457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @wbankschool
## 16458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @wbcboxing
## 16459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @wccaew
## 16460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @weahps
## 16461                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @wealdenpolice
## 16462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @wearewst
## 16463                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @weatherherts
## 16464                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @weegingerdug
## 16465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @weekends
## 16466                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @weepeoplechat
## 16467                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @wefoodbank�s
## 16468                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @wehcscientists
## 16469                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @wellbeingalter1
## 16470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @wellindarlo
## 16471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @wellsyl70
## 16472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @welovebath
## 16473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @welshjaci
## 16474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @welshsprout
## 16475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @wemhnurses
## 16476                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @wendyharris2861
## 16477                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @wendyhurrell
## 16478                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @wendyjturner
## 16479                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @wesfafootball
## 16480                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @westernhsctrust
## 16481                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @westhampotts
## 16482                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @westhertsnhs
## 16483                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @westlondonnhs
## 16484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @westm61
## 16485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @westmidspcc
## 16486                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @wethecurious
## 16487                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @weybridgevcc
## 16488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @wfm972
## 16489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @wfp
## 16490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @whatsapp
## 16491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @wheeleraw
## 16492                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @wheels4heroes
## 16493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @whhahps
## 16494                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @whhinfectionco1
## 16495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @whhstroke
## 16496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @whichtravel
## 16497                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @whitchurchprima
## 16498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @whitehatgb
## 16499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @whitgreens
## 16500                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @whitstablelive
## 16501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @whos
## 16502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @wifeinspace
## 16503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @wijohn
## 16504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @wilbypeter
## 16505                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @wild4oxfordwa
## 16506                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @wildthingsinitv
## 16507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @will0pad
## 16508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @willbungay
## 16509                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @williamcrawley
## 16510                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @williammcleish5
## 16511                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @willmcgookin
## 16512                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @willmottdixon
## 16513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @willtravers
## 16514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @wimdows
## 16515                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @winchestercity
## 16516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @winidavies
## 16517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @wisheart12
## 16518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @witchdrash
## 16519                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @witchymacwoman
## 16520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @wldispatch
## 16521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @wmfevents
## 16522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @wmpolice
## 16523                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @womensfootbal15
## 16524                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @womensinstitute
## 16525                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @womensradiostn
## 16526                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @womensthoughtz
## 16527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @woodmangs
## 16528                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @woodynfriends
## 16529                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @woolwichcomcc
## 16530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @worcsmasons
## 16531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @wordfinga
## 16532                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @wordwhisperer
## 16533                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @workplacefromfb
## 16534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @worldbank
## 16535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @wotcricket
## 16536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @wresteam
## 16537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @wretch32
## 16538                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @wright62john
## 16539                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @writtenbysalma
## 16540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @wwf
## 16541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @wwicwales
## 16542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @wyfrs
## 16543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @xboxsupport
## 16544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @xhespanol
## 16545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @xlvets
## 16546                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @xrebellionuk
## 16547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @xxkirstym
## 16548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @yahoonews
## 16549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @yahoonewsuk
## 16550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @yca
## 16551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ygtmovement
## 16552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @yoliverpool
## 16553                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @yorkycourses
## 16554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @yotpo
## 16555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @younder
## 16556                                                                                                                                                                                                                                                                                                                                                                                                                                                                            @youngvictheatre
## 16557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @yourmccolls
## 16558                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @yournewswire
## 16559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @yourstmarys
## 16560                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @youssefkerkour
## 16561                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @zacgoldsmith
## 16562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @zalphaprime
## 16563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @zarasproul
## 16564                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @zarrarkhuhro
## 16565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @zaynmalik
## 16566                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ziauddinislam
## 16567                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @zsllondonzoo
## 16568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @zstroud
## 16569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @zubymusic
## 16570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @zurbo1984
## 16571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #a66
## 16572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #aberdeen
## 16573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #aberfeldy
## 16574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #abuse
## 16575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #acaw
## 16576                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #accesstoculture
## 16577                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #accesstofinance
## 16578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #accountants
## 16579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #acrylic
## 16580                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #acrylicpainting
## 16581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #acton
## 16582                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #actuallyautistic
## 16583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ad
## 16584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #adaptation
## 16585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #adaptcsp
## 16586                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #adelandkarina
## 16587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #adi
## 16588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #adobe
## 16589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #adoption
## 16590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #advertising
## 16591                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #advertoftheyear
## 16592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #advisors
## 16593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #affordable
## 16594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #afghan
## 16595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #agefriendly
## 16596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #aiai20
## 16597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #aiart
## 16598                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #airpollution
## 16599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #airport
## 16600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #airquality
## 16601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #aldershot�s
## 16602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #alive
## 16603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #allianz
## 16604                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #allinthistogether
## 16605                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #alllivesmater
## 16606                                                                                                                                                                                                                                                                                                                                                                                                                                                               #allschoolsshouldbeartschools
## 16607                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #allstoriesareimportant
## 16608                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #allthingsautism
## 16609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #alquds4me
## 16610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #altrincham
## 16611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #amd84
## 16612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #america
## 16613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #amseribrofi
## 16614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #amwriting
## 16615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #amy
## 16616                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #anaesthetist
## 16617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #andrewmarr
## 16618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #angels
## 16619                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #animaltherapy
## 16620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #anisaomar
## 16621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #anonymous
## 16622                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #anthropocene
## 16623                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #antisemitism
## 16624                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #anyoneclarify
## 16625                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #anyquestions
## 16626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #apac
## 16627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #apocolypse
## 16628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #apocolyptic
## 16629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #appleby
## 16630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #applepencil
## 16631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #appraisers
## 16632                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #apprenticeship
## 16633                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #apprenticeships
## 16634                                                                                                                                                                                                                                                                                                                                                                                                                                                             #aproblemsharedisaproblemhalved
## 16635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #arcadegames
## 16636                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #architecture
## 16637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #arena
## 16638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #argyll
## 16639                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #argyllandbute
## 16640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #ascot
## 16641                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #ascotracecourse
## 16642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #ascotraces
## 16643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #asda
## 16644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #asdc
## 16645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #asechat
## 16646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #asia
## 16647                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #asianwedding
## 16648                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #asitinthedoctorskitchen
## 16649                                                                                                                                                                                                                                                                                                                                                                                                                                                       #askthosewhofellillhowtheyfeelavoutit
## 16650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #asset
## 16651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #astrazeneca
## 16652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #auckland
## 16653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #audiologist
## 16654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #audit
## 16655                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #augmentedreality
## 16656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #australia
## 16657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #autism
## 16658                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #autisticlearners
## 16659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #avbrits
## 16660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #avfc
## 16661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #avtweeps
## 16662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #awrc
## 16663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #az
## 16664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ba
## 16665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #babetrayal
## 16666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #babmdb
## 16667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #babyboom
## 16668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #babyfood
## 16669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #background
## 16670                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #backtoclinic
## 16671                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #backtoschool
## 16672                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #backtotennis
## 16673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #backtowork
## 16674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #badjudge
## 16675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #baffled
## 16676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #bakerboyhat
## 16677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #balance
## 16678                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #baldlivesmatter
## 16679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #balham
## 16680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #bameuk
## 16681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #bankruptcy
## 16682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #baratthomes
## 16683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #barber
## 16684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #barberuk
## 16685                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #bargainhunter
## 16686                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #barnardcastleeyetest
## 16687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #barnet
## 16688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #barnsleyfc
## 16689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #bassetlaw�s
## 16690                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #bastopredundancies
## 16691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #bathtime
## 16692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #bawa
## 16693                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #baworkersunited
## 16694                                                                                                                                                                                                                                                                                                                                                                                              #bbc<u+0001f30d>bbcnews<u+0001f496>bbc5live<u+0001f496>rachelburden<u+0001f496>nickyaacampbell
## 16695                                                                                                                                                                                                                                                                                                                                                                                                                                            #bbc<u+0001f30e>bbclondonnews<u+0001f496>bbcnews
## 16696                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #bbcambulance
## 16697                                                                                                                                                                                                                                                                                                                                                                                                                                    #bbcbreakfast<u+0001f304>bbcnaga<u+0001f496>bbcbreakfast
## 16698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #bbcdp
## 16699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #bcafc
## 16700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #beard
## 16701                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #beardsofinstagram�
## 16702                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #beartopiaart
## 16703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #beeston
## 16704                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #behaviouralscience
## 16705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #beijing
## 16706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #beingthere
## 16707                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #belfastphysio
## 16708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #bemybubble
## 16709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #beoutraged
## 16710                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #bepartofresearch
## 16711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #bereavement
## 16712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #besch
## 16713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #bestfriends
## 16714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #bible
## 16715                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #bicarbonateofsoda
## 16716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #bid
## 16717                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #bigboysdontcry
## 16718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #bigdata
## 16719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #bigwheelers
## 16720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #bikeshop
## 16721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #billbarr
## 16722                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #bingewatching
## 16723                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #biodiversity
## 16724                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #biomedicalscienceday2020
## 16725                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #biscuitandbonnie
## 16726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #biztips
## 16727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #blackbeauty
## 16728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #blackfriday
## 16729                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #blacklivesmatterdc
## 16730                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #blakelivesmatter
## 16731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #blatantlie
## 16732                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #blmedinburgh
## 16733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #blmldn
## 16734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #blmprotest
## 16735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #blmscotland
## 16736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #blog
## 16737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #blood
## 16738                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #bloodbrothers
## 16739                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #bluelivesmatter
## 16740                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #bluelivesmatters
## 16741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #bluepeter
## 16742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #bma
## 16743                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #boardmeeting
## 16744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #bojo�s
## 16745                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #bolsonarojatacaindo
## 16746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #booforboris
## 16747                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #bookhydrafacial
## 16748                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #booklaserhairremoval
## 16749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #books
## 16750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #booksy
## 16751                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #bookyourfacial
## 16752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #boosttorbay
## 16753                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #borisjohnsonfaileduk
## 16754                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #borisjohnsonshouldnotbepm
## 16755                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #borismeltdown
## 16756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #borismustgo
## 16757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #borisresign
## 16758                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #borisvoteofnoconfidence
## 16759                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #borrisbubble
## 16760                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #borrisgiveyourheadawobble
## 16761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #bosak2020
## 16762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #botosani
## 16763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #bournemouth
## 16764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #boxes
## 16765                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #boycottsainsburys
## 16766                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #brandnewclinic
## 16767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #brands
## 16768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #brasserie
## 16769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #brassneck
## 16770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #bread
## 16771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #breadbaking
## 16772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #breads
## 16773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #breahead
## 16774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #breaking
## 16775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #breakingbad
## 16776                                                                                                                                                                                                                                                                                                                                                                                                                                                               #breastfeedingcelebrationweek
## 16777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #brent
## 16778                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #brexitbritain
## 16779                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #brexitshambles
## 16780                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #brighterfuture
## 16781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #brighton
## 16782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #brilliant
## 16783                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #bristolartgallery
## 16784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #britisharmy
## 16785                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #britishharpduo
## 16786                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #britishindians
## 16787                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #britishsummer
## 16788                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #britishvogue
## 16789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #broadmead
## 16790                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #brokenpromises
## 16791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #broll
## 16792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #brussels
## 16793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #bse
## 16794                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #buckinghamshire
## 16795                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #buggeroffboris
## 16796                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #buildbackdifferently
## 16797                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #buildforwardbetter
## 16798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #building
## 16799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #built
## 16800                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #bumblingboris
## 16801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #bundesliga
## 16802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #burgerking
## 16803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #burqaban
## 16804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #burundi
## 16805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #bury
## 16806                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #businessevents
## 16807                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #businessgrants
## 16808                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #businessinsights
## 16809                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #businessisack
## 16810                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #businessowners
## 16811                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #businesssupport
## 16812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #busted
## 16813                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #busybusybusy
## 16814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #bylinetimes
## 16815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #c
## 16816                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #c4news<u+0001f496>itn
## 16817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #cake
## 16818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #cakes
## 16819                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #cakesofinstagram
## 16820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #calderdale
## 16821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #cambridge
## 16822                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #cambridgeshire
## 16823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #canadawater
## 16824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #cancer
## 16825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #cancercare
## 16826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #canon
## 16827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #canon90d
## 16828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #capturelife
## 16829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #card
## 16830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #cardiff
## 16831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #cardiffhour
## 16832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #careers
## 16833                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #careforthecarers
## 16834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #caregivers
## 16835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #carehome
## 16836                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #carehomedisaster
## 16837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #carehomes
## 16838                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #carersweek20
## 16839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #carlisle
## 16840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #carlisletkd
## 16841                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #carntyneandriddriecu
## 16842                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #carpetcleaning
## 16843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #cartoon
## 16844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #cartoonart�
## 16845                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #cartoonoftheday
## 16846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #casablanca
## 16847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #caters
## 16848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #cavapoo
## 16849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #ccfc
## 16850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #cclive
## 16851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ceo
## 16852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #cfo
## 16853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #chakra
## 16854                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #championship
## 16855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #change4good
## 16856                                                                                                                                                                                                                                                                                                                                                                                                                                                                #changethesystemnottheperson
## 16857                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #changingtheconvo
## 16858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #char
## 16859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #chargeobama
## 16860                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #charitysector
## 16861                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #charitytuesday
## 16862                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #charlesdickens150
## 16863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #cheap
## 16864                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #cheerforourcharities
## 16865                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #cherishthenhs
## 16866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #chesterzoo
## 16867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #chicken
## 16868                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #childfriendlycities
## 16869                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #childrenservices
## 16870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #chile
## 16871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #china
## 16872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #chippenham
## 16873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #chlorinated
## 16874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #choice
## 16875                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #christinelagarde�s
## 16876                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #churchillthehero
## 16877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #ciabatta
## 16878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #cio
## 16879                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #citizenspannels
## 16880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #citylife
## 16881                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #clapforboris
## 16882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #cleanair
## 16883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #cleanenergy
## 16884                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #cleanerleanergreener
## 16885                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #cleveleysprom
## 16886                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #clinicaltrials
## 16887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #clinicready
## 16888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #cloudy
## 16889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #coaching
## 16890                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #coastalerosion
## 16891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #coasts
## 16892                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #cockneyrymingslang
## 16893                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #coffeebusiness
## 16894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #coffeeshop
## 16895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #coffeevan
## 16896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #cogx2020
## 16897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #coleshill
## 16898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #collage
## 16899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #colleagues
## 16900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #colmorerow
## 16901                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #colstonstatue
## 16902                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #comebackstronger
## 16903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #comic
## 16904                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #communityfoundation
## 16905                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #completeditmate
## 16906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #complexcare
## 16907                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #computervirus
## 16908                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #conditioning
## 16909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #confused
## 16910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #connection
## 16911                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #conservative
## 16912                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #constructionnews
## 16913                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #controlthevirus
## 16914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #coopradio
## 16915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #coproduce
## 16916                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #corbynwasright
## 16917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #cornwall
## 16918                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #coronacrisis
## 16919                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #coronacrisisuk
## 16920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #coronalife
## 16921                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #coronalockdownuk
## 16922                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #coronaoutbreak
## 16923                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #coronavirusart
## 16924                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #coronaviruslockdown
## 16925                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #coronaviruslockdownuk
## 16926                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #coronavirusoutbreak
## 16927                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #coronavirusqa
## 16928                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #coronavirusupdate
## 16929                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #coronavirus�
## 16930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #corpgov
## 16931                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #corporateblackmail
## 16932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #corvid19uk
## 16933                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #cosifantutte
## 16934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #costa
## 16935                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #costinmarculescu
## 16936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #councillor
## 16937                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #councillorlife
## 16938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #counseling
## 16939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #counselling
## 16940                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #countydurham
## 16941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covdi19
## 16942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covers
## 16943                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #coveryourface
## 16944                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #covid19<u+0001f637>
## 16945                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #covid19collecting
## 16946                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #covid19crisisfund
## 16947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #covid19dk
## 16948                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #covid19isolation
## 16949                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #covid19paksurv
## 16950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #covid19quiz
## 16951                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #covid19research
## 16952                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #covid19secure
## 16953                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #covid19thewaywelive
## 16954                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #covid19update
## 16955                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #covid19vaccine
## 16956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #covid19why
## 16957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #covid19�
## 16958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #covid2019
## 16959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #covid4rheum
## 16960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #covidair
## 16961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #covidbride
## 16962                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covidcuisine
## 16963                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covideoparty
## 16964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #covidfun
## 16965                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #covidinquirynow
## 16966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #covidsafe
## 16967                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #covidsurvivor
## 16968                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covidtesting
## 16969                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #covidtoiletchallenge�
## 16970                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #covidtraining
## 16971                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covidvaccine
## 16972                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #covidvaccinetrial
## 16973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #cpr
## 16974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #create
## 16975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #creative
## 16976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #creditunion
## 16977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #cricket
## 16978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #cringe
## 16979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #crisis
## 16980                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #criticalservices
## 16981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #croweaudit
## 16982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #crowfunding
## 16983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #croydon
## 16984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #culture
## 16985                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #culturematters
## 16986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #cummingsout
## 16987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #cummmings
## 16988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #customer
## 16989                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #customercare
## 16990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #cute
## 16991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #cutesy
## 16992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #cv19
## 16993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #cvst
## 16994                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #cyclecommute
## 16995                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #cyclecommuter
## 16996                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #cyclistsofinstagram
## 16997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #cymru
## 16998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #cymryambyth
## 16999                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #cyrraeddsero
## 17000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #dads
## 17001                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #dailybriefinguk
## 17002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #dailywalk
## 17003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #danhollings
## 17004                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #darwinawards
## 17005                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #dataanalytics
## 17006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #dataquality
## 17007                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #datasaveslives
## 17008                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #davidtennant
## 17009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #dawn
## 17010                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #daysofthebagnoldsummer
## 17011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #dcms
## 17012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #dday76
## 17013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #dealtown
## 17014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #deerness
## 17015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #defence
## 17016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #delivering
## 17017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #deluded
## 17018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #deludedlie
## 17019                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #dementiaawarenessweek2020
## 17020                                                                                                                                                                                                                                                                                                                                                                                                                                                                #dementiafriendlycommunities
## 17021                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #democracyunderthreat
## 17022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #dental
## 17023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #derby
## 17024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #derbyshire
## 17025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #designer
## 17026                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #designersfree
## 17027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #designwork
## 17028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #detected
## 17029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #devastated
## 17030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #development
## 17031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #dfidorals
## 17032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #dhscc
## 17033                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #digitalagriculture
## 17034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #dinamo
## 17035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #dining
## 17036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #diolch
## 17037                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #disabledbutable
## 17038                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #discretionary
## 17039                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #dissolvetheunion
## 17040                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #distancetraining
## 17041                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #ditchthetories
## 17042                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #djclairefuller
## 17043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #dl
## 17044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #docmartin
## 17045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #doctors
## 17046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #documentary
## 17047                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #documentaryphotography
## 17048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #doff
## 17049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #dog
## 17050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #dogboutique
## 17051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #dogfriendly
## 17052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #doglovers
## 17053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #dogs
## 17054                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #dogsarefamily
## 17055                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #dogsofinstagram
## 17056                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #dogsoftwitter
## 17057                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #doingtherightthing
## 17058                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #dominiccummimgs
## 17059                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #dominiccummings
## 17060                                                                                                                                                                                                                                                                                                                                                                                                                                                                #dominiccummings<u+0001f4a9>
## 17061                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #dominicummimgs
## 17062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #donations
## 17063                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #dontdriveblind
## 17064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #dopaj
## 17065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #dorset
## 17066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #dosomething
## 17067                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #doublebubble
## 17068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #draughtbeer
## 17069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #draw
## 17070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #drawing
## 17071                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #drivinglessons
## 17072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #drivingtest
## 17073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #dublin
## 17074                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #duncanwilliams
## 17075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #duo
## 17076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #dvt
## 17077                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #ealingbizexpo
## 17078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #earlyyears
## 17079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #earrings
## 17080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #earth
## 17081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #earthxr
## 17082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #eastbelfast
## 17083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #eastlondon
## 17084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #easyjet
## 17085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ecb
## 17086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #eccyarmy
## 17087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #ecumenical
## 17088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #eczema
## 17089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #edgbaston
## 17090                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #educationdurham
## 17091                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #educationmatters
## 17092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ee
## 17093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #elderly
## 17094                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #elderlyliving
## 17095                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #eleganteventspro
## 17096                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #elevatedmediauk
## 17097                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #emcharityawards
## 17098                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #emergingtech
## 17099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #emmerdale
## 17100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #emoji
## 17101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #empathy
## 17102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #end
## 17103                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #enddomesticviolence
## 17104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #endfgm
## 17105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #endlockdown
## 17106                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #endlockdownuk
## 17107                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #endoflifecare
## 17108                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #endwildlifecrime
## 17109                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #endyouthhomelessness
## 17110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #enfield
## 17111                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #enoughisenough
## 17112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #ented
## 17113                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #enteducators
## 17114                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #environmentday
## 17115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #epicfail
## 17116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #epl
## 17117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #equality
## 17118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #equity
## 17119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #esg
## 17120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #esports
## 17121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #essex
## 17122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #essexfood
## 17123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #etech
## 17124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #ethicalai
## 17125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #euro
## 17126                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #europeancitizens
## 17127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #eurozone
## 17128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #eu�s
## 17129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #evening
## 17130                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #eventplanners
## 17131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #eventprofs
## 17132                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #everythingfordogs�
## 17133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #evidence
## 17134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #excluded
## 17135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #executive
## 17136                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #executivecoaching
## 17137                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #exploitation
## 17138                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #extraordinaryyou
## 17139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #face
## 17140                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #facecovering
## 17141                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #facecoverings
## 17142                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #facilitiesmgmt
## 17143                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #facilitiessth
## 17144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #fact
## 17145                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #fairersociety
## 17146                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #faithinaction
## 17147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #fakemeds
## 17148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #family
## 17149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #familyfirst
## 17150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #familyguy
## 17151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #familylaw
## 17152                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #familylearning
## 17153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #familytime
## 17154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #famous
## 17155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #farageonlbc
## 17156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #farmshop
## 17157                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #farrukhhabib
## 17158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #fashion
## 17159                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #fathersdaygifts
## 17160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #fatoshopuk
## 17161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #faversham
## 17162                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #feedthoseinneed
## 17163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #feldyroo
## 17164                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #festivalofwork
## 17165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #fgnews
## 17166                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #fidgetandbob
## 17167                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #fightagainstcovid19
## 17168                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #fightforderek
## 17169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #filter
## 17170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #filthy
## 17171                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #fimdaesquerda
## 17172                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #financialinvesting
## 17173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #finishhim
## 17174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #finland
## 17175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #firstfamily
## 17176                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #firsttimeupthetube
## 17177                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #fitnessmotivation�
## 17178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #flashing
## 17179                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #flexibleworking
## 17180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #flights
## 17181                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #flightsimcentre
## 17182                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #floorgraphics
## 17183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #flooring
## 17184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #floral
## 17185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #flowerporn
## 17186                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #flowersofinstagram
## 17187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #fluierfinal
## 17188                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #flyouthanxiety
## 17189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #fmcg
## 17190                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #focuswales2021
## 17191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #folklore
## 17192                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #foodlovestories
## 17193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #football
## 17194                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #footballfanapp
## 17195                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #footballgossip
## 17196                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #forabol<u+5350>onaro
## 17197                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #forabolsonaro
## 17198                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #foreignpolicy
## 17199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #fornature
## 17200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #freedom
## 17201                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #freedomofreligion
## 17202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #freelancer
## 17203                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #freelancetaskforce
## 17204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #freiburg
## 17205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #fresh
## 17206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #freshstart
## 17207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #fridayvibes
## 17208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #frogs
## 17209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #fruitbox
## 17210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #fsg
## 17211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #fullframe�
## 17212                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #fullyregistered
## 17213                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #fundedbyrchtcharity
## 17214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #funding
## 17215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #furbabies
## 17216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #furlough
## 17217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #futball
## 17218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #future
## 17219                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #futurehighstreet
## 17220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #futurenhs
## 17221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #gallery
## 17222                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #gamecocksfootball
## 17223                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #gammonheaven
## 17224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #gardens
## 17225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #gatwick
## 17226                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #gbchamberchat
## 17227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #gecc
## 17228                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #gemstonedetective
## 17229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #gemstones
## 17230                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #geographyonthemove
## 17231                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #georgefloydlovein
## 17232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #georgeflyod
## 17233                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #georgeorwell
## 17234                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #getbritainflyingagain
## 17235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #getintouch
## 17236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #getoutside
## 17237                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #getsbrexitdone
## 17238                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #gettingtozero
## 17239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #ghostrecon
## 17240                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #giftexperience
## 17241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #gifts
## 17242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #giveback
## 17243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #giveblood�
## 17244                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #glassforsale
## 17245                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #globalhealth
## 17246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #globalpt
## 17247                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #globalwarming
## 17248                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #gloucesterguildhall
## 17249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #gloves
## 17250                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #glyndebourne
## 17251                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #glyndebourneopenhouse
## 17252                                                                                                                                                                                                                                                                                                                                                                                                                        #gmb<u+0001f304>piersmorgan<u+0001f496>susannareid100<u+0001f496>gmb
## 17253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #goals
## 17254                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #goawaycoronavirus
## 17255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #goback
## 17256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #goergefloyd
## 17257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #gogamecocks
## 17258                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #goldfoodcitybid
## 17259                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #goodgrowthbydesign
## 17260                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #goodmorningbritain
## 17261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #goodolddays
## 17262                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #goodproblems
## 17263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #google
## 17264                                                                                                                                                                                                                                                                                                                                                                                                                                                                #gorgeousday<u+2600><u+fe0f>
## 17265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #gossip
## 17266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #government
## 17267                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #governmentbriefing
## 17268                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #governmentofdeath
## 17269                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #graphicdesign
## 17270                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #greatwesternarcade
## 17271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #green
## 17272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #greenwich
## 17273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #greggs
## 17274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #grief
## 17275                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #groundhogday
## 17276                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #groupworkshops
## 17277                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #group�alismasi
## 17278                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #guardianweekend
## 17279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #gusfring
## 17280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #gwafinds
## 17281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #gym
## 17282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #hackney
## 17283                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #hadrianswall
## 17284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #hairdresser
## 17285                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #hairdressers
## 17286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #haltwhistle
## 17287                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #hancockmustgo
## 17288                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #happybirthday
## 17289                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #happyclients
## 17290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #happydays
## 17291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #happyfriday
## 17292                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #happyhoundsgroomingacademy
## 17293                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #happytuesdayeveryone
## 17294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #hardwork
## 17295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #haringey
## 17296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #harlesden
## 17297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #hashtag
## 17298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #hatmakers
## 17299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #hats
## 17300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #hatshop
## 17301                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #hatshopinbirmingham
## 17302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #hatshopping
## 17303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #hatteras
## 17304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #hawaii
## 17305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #hcq
## 17306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #hdruk
## 17307                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #healthandwellbeingteam
## 17308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #healthcare
## 17309                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #healthpartnerships
## 17310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #heartbroken
## 17311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #hearts
## 17312                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #hearttransplant
## 17313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #heisenberg
## 17314                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #hellomynameis
## 17315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #help
## 17316                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #helpbydesign
## 17317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #helping
## 17318                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #herdimmunity
## 17319                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #herdimmunityscandal
## 17320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #heretohelp
## 17321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #herrons
## 17322                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #highlandglass
## 17323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #hiking
## 17324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #hip
## 17325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #history
## 17326                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #holdstill2020
## 17327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #holidayhome
## 17328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #holidaylet
## 17329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #holidaylets
## 17330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #home
## 17331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #homebaking
## 17332                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #homecareagency
## 17333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #homehaircut
## 17334                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #homelesstaskforce
## 17335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #homemade
## 17336                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #homemademeals
## 17337                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #homemadesigns
## 17338                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #homeschooling
## 17339                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #hometeamhero
## 17340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #hometown
## 17341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #homeworking
## 17342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #honduras
## 17343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #horsehill
## 17344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #hospice
## 17345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #hospicecare
## 17346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #hospitals
## 17347                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #hospitalstaff
## 17348                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #hostileenvironment
## 17349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #hotels
## 17350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #hotelscomuk
## 17351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #hove
## 17352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #hrlife
## 17353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #htsos
## 17354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #huawei
## 17355                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #huaweip30pro
## 17356                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #huddersfield
## 17357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #hugger
## 17358                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #huggerproblems
## 17359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #hull
## 17360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #humanrace
## 17361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #humour
## 17362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #hunters
## 17363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #hwaf
## 17364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #hygiene
## 17365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #hypocrisy
## 17366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #iag
## 17367                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #iamchallengingbehaviour
## 17368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #iarss2020
## 17369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #idea
## 17370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #identity
## 17371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ifad12
## 17372                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #ifadpostcovid19
## 17373                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #ignorantdoctors
## 17374                                                                                                                                                                                                                                                                                                                                                                                                                                                                #ignoretheconspiracytheories
## 17375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #igualdad
## 17376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #ikea
## 17377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #ikeaglasgow
## 17378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ilford
## 17379                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #ilfordrecorder
## 17380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #imadelondon
## 17381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #imhaw2020
## 17382                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #immersiveaudio
## 17383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #impact
## 17384                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #impactinvestment
## 17385                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #incompetence
## 17386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #indeed
## 17387                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #independentsheffield
## 17388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #india
## 17389                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #infectionprevention
## 17390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #inflation
## 17391                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #inmersivecollaboration
## 17392                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #inspirationalleaders
## 17393                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #inspiredtolearnnightingale
## 17394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #instadaily�
## 17395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #instagay
## 17396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #instagood
## 17397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #instagram
## 17398                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #installation
## 17399                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #installationart
## 17400                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #installationartist
## 17401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #instamood
## 17402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #insurance
## 17403                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #insurancefraud
## 17404                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #interdisciplinarity
## 17405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #interfaith
## 17406                                                                                                                                                                                                                                                                                                                                                                                                                                                               #internationaljewellerylondon
## 17407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #internet
## 17408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #introbiz
## 17409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #iot
## 17410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ipa
## 17411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #ipadproart
## 17412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #iphonepic
## 17413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #ipprwebinar
## 17414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #irfu
## 17415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #irinashayk�
## 17416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #irish
## 17417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #irishleague
## 17418                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #irishmotorsport
## 17419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #irishrugby
## 17420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #iron
## 17421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #islam
## 17422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #isolated
## 17423                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #isolationlife
## 17424                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #isolationthoughts
## 17425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #isolation�
## 17426                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #istandwithyou
## 17427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #isthisyours
## 17428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #italian
## 17429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #italiani
## 17430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #italy
## 17431                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #itftaekwondo
## 17432                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #itsoktonotbeok
## 17433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #itstimetogo
## 17434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #itswhatwedo
## 17435                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #ivenotforgotten
## 17436                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #ivotedlabour
## 17437                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #jacindaardern
## 17438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #jamaican
## 17439                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #jessepinkman
## 17440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #jewelry
## 17441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #jimdavis
## 17442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #joepossible
## 17443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #johnson
## 17444                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #johnsonandcummingsmustgo
## 17445                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #johnsonmustgo
## 17446                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #jonathonvantam
## 17447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #joshuafury
## 17448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #journeys
## 17449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #juanlucena
## 17450                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #juaticeforgeorgefloyd
## 17451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #june
## 17452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #june15th
## 17453                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #junebroidery
## 17454                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #juniorbarber
## 17455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #jurgenklopp
## 17456                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #justiceforbellymujinga
## 17457                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #justiceforgeorgesfloyd
## 17458                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #justmyopinion
## 17459                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #justnailsandbeautybysian
## 17460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #justsayin
## 17461                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #justsaysorry
## 17462                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #justwanttogetoutthere
## 17463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #kabul
## 17464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #kaihavertz
## 17465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #kayburley
## 17466                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #keepbritaintidy
## 17467                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #keepbusinessmoving
## 17468                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #keepcalmandcreate
## 17469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #keepsafe
## 17470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #keepsmiling
## 17471                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #keepthemactive
## 17472                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #keepwalessafe
## 17473                                                                                                                                                                                                                                                                                                                                                                                                                                              #keepwashingyourhandsregulary<u+2665><u+fe0f>x
## 17474                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #keepyourdistance
## 17475                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #kendalljenner
## 17476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #kenilworth
## 17477                                                                                                                                                                                                                                                                                                                                                                                                                                                                #kenilworthsmostfamouscouple
## 17478                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #kennetisland
## 17479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #kentuk
## 17480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #kettering
## 17481                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #keyworkercorridor
## 17482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #keyworkers
## 17483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #kfc
## 17484                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #kidsoutdoors
## 17485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #killingeve
## 17486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #kindness
## 17487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #kirklees
## 17488                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #kmfc<u+0001f9e1>
## 17489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ko
## 17490                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #konfederacja
## 17491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #koronavir�s
## 17492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #korwin
## 17493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #kovid19
## 17494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #kovitvir�s�
## 17495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ktbffh
## 17496                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #kulturspaeti
## 17497                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #labourhypocrisy
## 17498                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #labtechnicians
## 17499                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #lachicadehielo
## 17500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #lad
## 17501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #laddakh
## 17502                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #lakedistrict
## 17503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #lakeside�
## 17504                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #lalsalaamcomrade
## 17505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #lancashire
## 17506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #landing
## 17507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #landlord
## 17508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #laundry
## 17509                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #lawanddisorder
## 17510                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #lawlessinjuries
## 17511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #lazyjohnson
## 17512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #lbc
## 17513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ldnblm
## 17514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #leaders
## 17515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #leagueone
## 17516                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #learnrealwork
## 17517                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #learnwithoak
## 17518                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #leftbehindbyrishi
## 17519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #legend
## 17520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #leicester
## 17521                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #leicestersquare
## 17522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #leisure
## 17523                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #lemans24virtual
## 17524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #lesiure
## 17525                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #lestweforget
## 17526                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #letsbamethegoverment
## 17527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #levellingup
## 17528                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #lewishamhospital
## 17529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #lfc
## 17530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #lfcfamily
## 17531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #lfcfans
## 17532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #lgw
## 17533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #liarjohnson
## 17534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #liarspoker
## 17535                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #librariesrespond
## 17536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #lifediary
## 17537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #lifedrawing
## 17538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #lifegoeson�
## 17539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #lights
## 17540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #lindley
## 17541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #linkinbio
## 17542                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #lisasratchethairsalon
## 17543                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #listentomusic
## 17544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #lithuania
## 17545                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #littlebritain
## 17546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #liverpool
## 17547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #liverpoolfc
## 17548                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #livesdontmatter
## 17549                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #lizmcburneyphotographer
## 17550                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #localbusiness
## 17551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #locale
## 17552                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #localeconomy
## 17553                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #localintimacy
## 17554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #localpeople
## 17555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #localpub
## 17556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #localradio
## 17557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #lochness
## 17558                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #lockdownfailed
## 17559                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #lockdownjournal
## 17560                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #lockdownlessons
## 17561                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #lockdownupdate
## 17562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #lockeddown
## 17563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #lofc
## 17564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #logfire
## 17565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #lol
## 17566                                                                                                                                                                                                                                                                                                                                                                                                                                                             #london<u+0001f1ec><u+0001f1e7>
## 17567                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #londonprotest
## 17568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #londra
## 17569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #loneliness
## 17570                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #lookforwardtoseeingyou
## 17571                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #love2sketchuk
## 17572                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #lovedonthate
## 17573                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #lovedosenthurt
## 17574                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #loveglasgowhateracism
## 17575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #loveincom
## 17576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #loveislove
## 17577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #lovemk
## 17578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #lovenothate
## 17579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #lovequb
## 17580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #lupus
## 17581                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #lutonweddings
## 17582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #machiavelli
## 17583                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #maddiemccann
## 17584                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #madeinaberdeen�
## 17585                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #madeleinemccann
## 17586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #magicstamp
## 17587                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #makeadifference
## 17588                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #makeindiagreat
## 17589                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #makethedifference
## 17590                                                                                                                                                                                                                                                                                                                                                                                                                                                       #makewestminsterbridgetoagardenbridge
## 17591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #mali
## 17592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #mamtor
## 17593                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #manufacturers
## 17594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #mappleton
## 17595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #maritime
## 17596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #market
## 17597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #markets
## 17598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #marqueehire
## 17599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #mask
## 17600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #matters
## 17601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #mayor
## 17602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #mcd
## 17603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #mcdonalds
## 17604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #media
## 17605                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #medicinespoon
## 17606                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #meditatifterapi
## 17607                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #meditativepractice
## 17608                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #medstudenttwitter
## 17609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #medtwitter
## 17610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #medway
## 17611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #meeting
## 17612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #meetup
## 17613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #meh
## 17614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #memories
## 17615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #men
## 17616                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #mentalhealthawareness
## 17617                                                                                                                                                                                                                                                                                                                                                                                                                                                              #mentalhealthawarenessweek2020
## 17618                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #mentalhealthcounseling
## 17619                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #mentalhealthmatters
## 17620                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #mentalwellbeing
## 17621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #menthealth
## 17622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #merseyside
## 17623                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #mesothelioma
## 17624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #messages
## 17625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #mhra
## 17626                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #microsoftteams
## 17627                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #midlandshour
## 17628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #millinery
## 17629                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #miltonkeynes
## 17630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #mimzie
## 17631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #mindfulness
## 17632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #minime
## 17633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #minivinnies
## 17634                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #misleadinglie
## 17635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #misshugs
## 17636                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #missionaccomplished
## 17637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ml
## 17638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #mobileapps
## 17639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #mobility
## 17640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #moldova
## 17641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #mondayblogs
## 17642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #mondayblues
## 17643                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #mondayseries
## 17644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #money
## 17645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #mono
## 17646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #morbid
## 17647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #more
## 17648                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #moredeathstocome
## 17649                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #mortalkombat
## 17650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #mortgage
## 17651                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #mortgageadvice
## 17652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #motivating
## 17653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #motorsport
## 17654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #mountains
## 17655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #mp
## 17656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #mrrogers
## 17657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ms
## 17658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #muchbetter
## 17659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #mucked
## 17660                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #multilateralismmatters
## 17661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #mural
## 17662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #musician
## 17663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #musicislife
## 17664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #music�
## 17665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #muslims
## 17666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #muslimwomen
## 17667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #myanmar
## 17668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #mylittlemen
## 17669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #mysjaday
## 17670                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #mytinyatlaslondon�
## 17671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #m�xico
## 17672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #naj
## 17673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #nashville
## 17674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #national
## 17675                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #nationaldisgrace
## 17676                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #nationaltrail
## 17677                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #nationalvolounteerweek
## 17678                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #naturalselection
## 17679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #nature
## 17680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #naturetrip
## 17681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #naughty
## 17682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #navy
## 17683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #need
## 17684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #nefollowers
## 17685                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #neighbourhoods
## 17686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #netflix
## 17687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #netflixuk
## 17688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #netherlands
## 17689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #networks
## 17690                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #nevergoingoutagain
## 17691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #newbabies
## 17692                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #newcastleupontyne
## 17693                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #newchurchinpendle
## 17694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #newhobbies
## 17695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #newmusic
## 17696                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #newnormal2020
## 17697                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #newprofilepicture
## 17698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #newscots
## 17699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #newskills
## 17700                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #newstarterfurlough
## 17701                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #newstarterjustice
## 17702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #newtheory
## 17703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #next
## 17704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #ngos
## 17705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #nhsd
## 17706                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #nhsenglandattendanywhere
## 17707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #nhsthankyou
## 17708                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #nickedfromlifeinquotes
## 17709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #nigelfarage
## 17710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #nigeria
## 17711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #nightlife
## 17712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #nike
## 17713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #nlaart
## 17714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #nmahp
## 17715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #nobodyabout
## 17716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #nochildcare
## 17717                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #nodealbrexit
## 17718                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #noisepollution
## 17719                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #nolivesmatter
## 17720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #nonreferral
## 17721                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #norfolkcoast
## 17722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #northeast
## 17723                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #northernireland
## 17724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #northmanc
## 17725                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #northnorfolk
## 17726                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #northumberland
## 17727                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #northumberlandtogether
## 17728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #northwales
## 17729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #northwest
## 17730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #not
## 17731                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #notforgotten
## 17732                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #notjusttherich
## 17733                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #notmovingontilldomisgone
## 17734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #novoice
## 17735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #now
## 17736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #nrecw
## 17737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #nuclear
## 17738                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #nudgestock2020
## 17739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #nufctakover
## 17740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #nz
## 17741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #oban
## 17742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #obese
## 17743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #obesity
## 17744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #office
## 17745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #olderage
## 17746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #oldmoat
## 17747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #omletcages
## 17748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #onay3eng
## 17749                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #onecultureofcare
## 17750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #oneill
## 17751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #onenhs
## 17752                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #oneruleforusoneruleforthem
## 17753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #oneteam
## 17754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #online
## 17755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #onlineevent
## 17756                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #onlinesessions
## 17757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #onlinestudy
## 17758                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #onlinesurvey
## 17759                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #onlinetraining
## 17760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ons
## 17761                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #openforbusiness
## 17762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #operating
## 17763                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #opinionsmatter
## 17764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #opportunity
## 17765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #opreact
## 17766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #oral
## 17767                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #organisation
## 17768                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #organisationaldevelopment
## 17769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #osteopathy
## 17770                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #osteopathyworks
## 17771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #ourchelt
## 17772                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #ourcommunity
## 17773                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #ournhspeople
## 17774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #outandabout
## 17775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #outcomes
## 17776                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #outdooreducation
## 17777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #outdoorgym
## 17778                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #outofbedinonehour
## 17779                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #outofviewfilm
## 17780                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #overthehedge
## 17781                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #oxfordvaccinetrial
## 17782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #oxted
## 17783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #p30pro
## 17784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #packaging
## 17785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #paediatric
## 17786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #pafc
## 17787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #paignton
## 17788                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #paigntonpier
## 17789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #paint
## 17790                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #pallativecare
## 17791                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #palliativecarenurse
## 17792                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #palliativeoralcare
## 17793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #parental
## 17794                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #parentsaspartners
## 17795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #paris
## 17796                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #parliamentsquare
## 17797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #partners
## 17798                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #partnerships
## 17799                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #partnershipworking
## 17800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #party
## 17801                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #patientaccesscoordinator
## 17802                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #paulp�rvulescu
## 17803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #pauseorpay
## 17804                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #pausesthelens
## 17805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #payment
## 17806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #payments
## 17807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #pdi
## 17808                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #peacefulmindscic
## 17809                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #peakyblinders
## 17810                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #pedalformusicians
## 17811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #pedsicu
## 17812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #pendlehill
## 17813                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #pendlehillphotos
## 17814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #pennineway
## 17815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #people
## 17816                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #peoplemanagement
## 17817                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #peoplesvaccine
## 17818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #pepremium
## 17819                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #perinatalmentalhealth
## 17820                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #persona5royal
## 17821                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #personalfinance
## 17822                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #personaltrainer
## 17823                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #personcenteredcare
## 17824                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #pertempsfamily
## 17825                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #pertempspotential
## 17826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #peru
## 17827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #pesspa
## 17828                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #petergriffin
## 17829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #petition
## 17830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #pets
## 17831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #petsathome
## 17832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #pharmacy
## 17833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #phd
## 17834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #pheic
## 17835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #pheic�its
## 17836                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #phlebotomistsrock
## 17837                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #photojournalism
## 17838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #photo�
## 17839                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #physicaldistance
## 17840                                                                                                                                                                                                                                                                                                                                                                                                                                                           #physicalmentalandsocialwellbeing
## 17841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #physio
## 17842                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #physios4globalhealth
## 17843                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #physiostrengthclub
## 17844                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #physiotherapist
## 17845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #pic
## 17846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #piccaddo
## 17847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #picture
## 17848                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #pictureoftheday
## 17849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #pidgeon
## 17850                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #pigeonsofinstagram
## 17851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #pilates
## 17852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #pirate
## 17853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #planning
## 17854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #plantbased
## 17855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #plexiglass
## 17856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #pmq
## 17857                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #pocketrumble
## 17858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #podcast
## 17859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #poet
## 17860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #poland
## 17861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #political
## 17862                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #politicsscotland
## 17863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #poll
## 17864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #portadown
## 17865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #positive
## 17866                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #positivemindset
## 17867                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #postcardfromislay
## 17868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #postcovid19
## 17869                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #postprynhawn
## 17870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #potus
## 17871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #ppeshortage
## 17872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ppg
## 17873                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #premierleague�efl
## 17874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #preorder
## 17875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #prey
## 17876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #pride
## 17877                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #prideedinburgh
## 17878                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #prideinsideuk
## 17879                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #pridemonth2020
## 17880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #prieteni
## 17881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #primarycare
## 17882                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #primeminister
## 17883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #prisoner
## 17884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #pritipatel
## 17885                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #processmapping
## 17886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #procreate
## 17887                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #professionaldevelopment
## 17888                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #professionallycurious
## 17889                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #professionaltraining
## 17890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #proffwhitty
## 17891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #project
## 17892                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #proofreading
## 17893                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #propertynews
## 17894                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #proptechperspectives
## 17895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #protect
## 17896                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #protectcustomers
## 17897                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #protectstaff
## 17898                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #protectthevulnerable
## 17899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #protests
## 17900                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #protests2020
## 17901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #proudtocare
## 17902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #ps5reveal
## 17903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #pswnetwork
## 17904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #pti
## 17905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #pub
## 17906                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #publichealthadvice
## 17907                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #publichealthadvicefail
## 17908                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #publichealthwales
## 17909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #publicorder
## 17910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #pufc
## 17911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #pusb
## 17912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #qr2
## 17913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #quality
## 17914                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #qubefromomlet
## 17915                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #queenelizabethii
## 17916                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #queensbirthdayparade
## 17917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #questions
## 17918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #quotes
## 17919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #r4today
## 17920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #racetozero
## 17921                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #racialinjustice
## 17922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #racism
## 17923                                                                                                                                                                                                                                                                                                                                                                                                                                                                #racismisapublichealthcrisis
## 17924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #raindrops
## 17925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #rainyday
## 17926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #rallying
## 17927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #ramsgate
## 17928                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #randomactofkindness
## 17929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ravers
## 17930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #rct
## 17931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #reading
## 17932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #readytotalk
## 17933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #realbread
## 17934                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #realheroesdontwearcapes
## 17935                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #recessionlooming
## 17936                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #recoverytrial
## 17937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #recycle
## 17938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #recycling
## 17939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #red
## 17940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #redbridge
## 17941                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #redeployment
## 17942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #redundancy
## 17943                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #reesmoggconga
## 17944                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #refugeeswelcome
## 17945                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #regionalanesthesia
## 17946                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #rehabilitation
## 17947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #reiki1
## 17948                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #reikionecourse
## 17949                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #reikiteacher
## 17950                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #reikitraining
## 17951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #relaxation
## 17952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #relief
## 17953                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #remotevolunteering
## 17954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #renaissance
## 17955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #rent
## 17956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #reportage
## 17957                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #republicofcongo
## 17958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #repurpose
## 17959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #reserve
## 17960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #resistance
## 17961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #restaurants
## 17962                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #retrogamesearch
## 17963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #retrogaming
## 17964                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #returnerrecruitment
## 17965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #returners
## 17966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #retweeet
## 17967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #revolut
## 17968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #revolution
## 17969                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #revolution2020
## 17970                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #rheumatology
## 17971                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #richardraanes
## 17972                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #richmondfamily
## 17973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ricovr
## 17974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #ridiculous
## 17975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #riflepark
## 17976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #riots
## 17977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ripoff
## 17978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #river
## 17979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #rnr
## 17980                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #robinhoodtaxnow
## 17981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #rollon2021
## 17982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #rossendale
## 17983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #rotary
## 17984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #rotherham
## 17985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #rotherhithe
## 17986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #royalnavy
## 17987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #royals�
## 17988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #rraanes
## 17989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #rrate
## 17990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #rugby
## 17991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #rugdoctor
## 17992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #rural
## 17993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #russia
## 17994                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #russianhamsters
## 17995                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #russiareport
## 17996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #ryanair
## 17997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #s10
## 17998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #s11
## 17999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #s7
## 18000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #s8
## 18001                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #sackborisanddom
## 18002                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #sackcummingssavelives
## 18003                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #sackdomandboris
## 18004                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #saddeludedwanker
## 18005                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #safeplacetolive
## 18006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #saferathome
## 18007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #safetravels
## 18008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #safetytips
## 18009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #saladboxes
## 18010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #salmonella
## 18011                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #samestormdifferentboat
## 18012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #sammendes
## 18013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #sangria
## 18014                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #sanidadpublica
## 18015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #sarscov2
## 18016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #savelife
## 18017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #savemildmay
## 18018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #savenhs
## 18019                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #saveourstoryhouse
## 18020                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #saveourtheatre
## 18021                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #savetheplanet
## 18022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #scam
## 18023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #scamdemic
## 18024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #scammers
## 18025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #scarborough
## 18026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #scfootball
## 18027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #school
## 18028                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #schoolsclosed
## 18029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #schooltimes
## 18030                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #sciencecentres
## 18031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #scientists
## 18032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #screen
## 18033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #scunthorpe
## 18034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #sdgs
## 18035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #sec
## 18036                                                                                                                                                                                                                                                                                                                                                                                                                                                         #secondwave<u+0001f44b><u+0001f44b>
## 18037                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #secondwaveiscoming
## 18038                                                                                                                                                                                                                                                                                                                                                                                                                                     #secondwaveiscoming<u+0001f3f4><u+200d><u+2620><u+fe0f>
## 18039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #secure
## 18040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #security
## 18041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #selecter
## 18042                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #selfemployed
## 18043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #selfisolate
## 18044                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #selfportrait
## 18045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #selkirk
## 18046                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #sellingoutthescientists
## 18047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #sen
## 18048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #serenity
## 18049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #sex
## 18050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #shameonba
## 18051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #shameonyou
## 18052                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #shareyourskills
## 18053                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #sharingiscaring
## 18054                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #sharingknowledge
## 18055                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #sharksfamily
## 18056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sharma
## 18057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #shave
## 18058                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #sheffieldissuper
## 18059                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #sheffieldwednesday
## 18060                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #shehiditfromyou
## 18061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #shipoffools
## 18062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #shitshow
## 18063                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #shockingcustomerexperience
## 18064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #shopsafely
## 18065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #shopsmall
## 18066                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #shouldertoshoulder
## 18067                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sixfeetapartatalltimes
## 18068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ska
## 18069                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #skatesafestaysafe
## 18070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #skotia
## 18071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #skullfucked
## 18072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #sky
## 18073                                                                                                                                                                                                                                                                                                                                                                                                                                        #skynews<u+0001f496>kateemccann<u+0001f496>bethrigby
## 18074                                                                                                                                                                                                                                                                                                                                                                                                                                          #skynews<u+0001f496>skynews<u+0001f496>kateemccann
## 18075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #sleepycat
## 18076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #slough
## 18077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #smallbiz
## 18078                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #smallbusinessowners
## 18079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #smalldog
## 18080                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #smartmobility
## 18081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #smots
## 18082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #snapchat
## 18083                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #sneezescreen
## 18084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #soap
## 18085                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #socialdistance
## 18086                                                                                                                                                                                                                                                                                                                                                                                                                                                          #socialdistancing<u+2665><u+fe0f>x
## 18087                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #socialdistancing�
## 18088                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #socialentreprise
## 18089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #socialism
## 18090                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #sociallydistant
## 18091                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #socialmediacensorship
## 18092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #soho
## 18093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #solihull
## 18094                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #somersethour
## 18095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #song
## 18096                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #sopranolaser�
## 18097                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #sopranotitanium
## 18098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #sorry
## 18099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #sosamazonia
## 18100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #sourdough
## 18101                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #sourdoughbread
## 18102                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #southcarolina
## 18103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #southwark
## 18104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #southwest
## 18105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #spain
## 18106                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #spatialaudio
## 18107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #sponsored
## 18108                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #sponsorourclub
## 18109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #spoon
## 18110                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #sportsmedicine�
## 18111                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #sportsphysio
## 18112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #sportsturf
## 18113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #springwatch
## 18114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #spring�
## 18115                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #spursstadium
## 18116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #ssvar
## 18117                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #staffabsence
## 18118                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #staffengagement
## 18119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #staffnurse
## 18120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #stammer
## 18121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #standup
## 18122                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #standuptogether
## 18123                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #standuptoracism
## 18124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #starbucks
## 18125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #starmer
## 18126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #startup
## 18127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #statistics
## 18128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #statues
## 18129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #stay
## 18130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #stayalive
## 18131                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #stayhomelistentomusic
## 18132                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #stayhomeprotectthenhs
## 18133                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #stayhomesavelifes
## 18134                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #stayhomestaysafe�
## 18135                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #staypositive<u+0001f4af>
## 18136                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #staysafestayhealthy
## 18137                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #staysmartapart
## 18138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #steelbooks
## 18139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #steroids
## 18140                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #stillatmumshouse
## 18141                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #stillshipping
## 18142                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #stillsmiling
## 18143                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #stirlinghardship
## 18144                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #stjohnpeople
## 18145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #stokecity
## 18146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #stopbrexit
## 18147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #stopit
## 18148                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #stopslaverytoday
## 18149                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #stopthedigitaldivide
## 18150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #storage
## 18151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #stores
## 18152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #stratford
## 18153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #streamathon
## 18154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #street
## 18155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #streetart
## 18156                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #streetviewlondon
## 18157                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #strengthtraining
## 18158                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #strongertogether
## 18159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #stuart
## 18160                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #studiojournal
## 18161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #style
## 18162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #sucks
## 18163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #sudbury
## 18164                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #summarywriting
## 18165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #summer
## 18166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #sun
## 18167                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #sundayblues�
## 18168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #sunderland
## 18169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #sunglasses
## 18170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sunset
## 18171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #sup
## 18172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #superproud
## 18173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #suppliers
## 18174                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #supportbubbles
## 18175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #supporting
## 18176                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #supportlocalbusiness
## 18177                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #supportlocalsaturday
## 18178                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #supportsmallbusiness
## 18179                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #supportstirling
## 18180                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #supportthepolice
## 18181                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #surgisphere�
## 18182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #surreyquays
## 18183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #surveying
## 18184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #surveys
## 18185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #sustainable
## 18186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sutton
## 18187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #svp
## 18188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #sweep
## 18189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sweets
## 18190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #swgm
## 18191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #swindon
## 18192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #swpt
## 18193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sylhet
## 18194                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #systemchange
## 18195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #tadpole
## 18196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #taekwondo
## 18197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #taipei
## 18198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #taiwan
## 18199                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #taiwancanhelp
## 18200                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #taiwanisnotchina
## 18201                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #takingitinhisstride
## 18202                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #taleoftwocities
## 18203                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #talkingtherapy
## 18204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #tamil
## 18205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #tapas
## 18206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #taxi
## 18207                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #taxidriversmatter
## 18208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #tbthursday
## 18209                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #teacher5aday
## 18210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #teachers
## 18211                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #teacherslivesmatter
## 18212                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #teamcollaboration
## 18213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #teamevans
## 18214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #teamht
## 18215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #teamlambeth
## 18216                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #teamlouiegeorge
## 18217                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #teammatthews
## 18218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #teammkuh
## 18219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #teamsharks
## 18220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #teamuhdb
## 18221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #teamwingate
## 18222                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #teamwolseleyroad
## 18223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #teamwork
## 18224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #technews
## 18225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #teded
## 18226                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #tedrosadhanomout
## 18227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #tedxtalk
## 18228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #teenagers
## 18229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #telford
## 18230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #tenant
## 18231                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #terapiaocupacional
## 18232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #teraputik
## 18233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #test
## 18234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #texasprison
## 18235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #thanksboris
## 18236                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #thankyounurses
## 18237                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #thatartgallery
## 18238                                                                                                                                                                                                                                                                                                                                                                                                  #the100daycovid19quarantinespacelockdownquarantinelifecovid19coronav�ruscollaborationday71
## 18239                                                                                                                                                                                                                                                                                                                                                                                                       #the100daycovid19quarantinespacelockdownquarantinelifecovid19coronav�ruscyclistsday69
## 18240                                                                                                                                                                                                                                                                                                                                                                                                          #the100daycovid19quarantinespacelockdownquarantinelifecovid19coronav�ruseerieday70
## 18241                                                                                                                                                                                                                                                                                                                                                                                           #the100daycovid19quarantinespacelockdownquarantinelifecovid19coronav�rusisolationinspirationday72
## 18242                                                                                                                                                                                                                                                                                                                                                                                                       #the100daycovid19quarantinespacelockdownquarantinelifecovid19coronav�ruskidsruleday73
## 18243                                                                                                                                                                                                                                                                                                                                                                                           #the100daycovid19quarantinespacelockdownquarantinelifecovid19coronav�rusnighttimephotographyday74
## 18244                                                                                                                                                                                                                                                                                                                                                                                                                                                        #the100dayprojectbehindthesceneday61
## 18245                                                                                                                                                                                                                                                                                                                                                                                                                                                        #the100dayprojectbehindthesceneday64
## 18246                                                                                                                                                                                                                                                                                                                                                                                                                                                             #the100dayprojectkidsworldday63
## 18247                                                                                                                                                                                                                                                                                                                                                                                                                                                         #the100dayprojectplentyofspaceday59
## 18248                                                                                                                                                                                                                                                                                                                                                                                                                                                         #the100dayprojectsaturdaynightday62
## 18249                                                                                                                                                                                                                                                                                                                                                                                                                                                     #the100dayprojectsilentnightlondonday60
## 18250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #thefens
## 18251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #theguardian
## 18252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #themedia
## 18253                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #theofpresidentzimbabwe
## 18254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #theory
## 18255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #theoryhelp
## 18256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #theorytest
## 18257                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #theoryworkshop
## 18258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #theplague
## 18259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #thequeen
## 18260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #therapeutic
## 18261                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #therapistsconnect
## 18262                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #therealmarigoldhotel
## 18263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #theselecter
## 18264                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #theshowmustgoon
## 18265                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #thinkofhyigene
## 18266                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #thiscanchange
## 18267                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #thisisrichmond
## 18268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #thismorning
## 18269                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #thoughtfulthursday
## 18270                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #throwbackthursday
## 18271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #thurrock
## 18272                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #thursdaymotivation
## 18273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #timeea
## 18274                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #timelapseart
## 18275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #timeline
## 18276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #timeoff
## 18277                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #timetosaythankyou
## 18278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #timetotest
## 18279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #timowerner
## 18280                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #tippingpoint
## 18281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #tiptuesday
## 18282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #together
## 18283                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #tootingbroadway
## 18284                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #topoftheworld
## 18285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #torbay
## 18286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #torbayhour
## 18287                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #torbayinpictures
## 18288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #toriesout
## 18289                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #torringtonrural
## 18290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #tory
## 18291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #toryliars
## 18292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #torylies
## 18293                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #toryshambles
## 18294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #totallie
## 18295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #toughtimes
## 18296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #tourism
## 18297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #towncentres
## 18298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #toxic
## 18299                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #tozalezyodciebie
## 18300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #trade
## 18301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #tradefairs
## 18302                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #tradingstandards
## 18303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #tragic
## 18304                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #trainingcourses
## 18305                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #trainingprograms
## 18306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #treat
## 18307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #triggering
## 18308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #trim
## 18309                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #troopingthecolour
## 18310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #troops
## 18311                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #trumphasnoplan
## 18312                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #trumpout2020
## 18313                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #trumpspriorities
## 18314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #trust
## 18315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #trustees
## 18316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #tsai
## 18317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #tuesdaymood
## 18318                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #tuesdaymotivation
## 18319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #tuesdaytip
## 18320                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #tuesdaytruths
## 18321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #tuirefund
## 18322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #tuiuk
## 18323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #tunnocks
## 18324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #twin
## 18325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #twitch
## 18326                                                                                                                                                                                                                                                                                                                                                                                                                                                            #twitter<u+2611><u+fe0f>trending
## 18327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #twotone
## 18328                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #type1diabetes
## 18329                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #uaemiceconnection
## 18330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #ubereats
## 18331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #uefa
## 18332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #uel
## 18333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #uelconected
## 18334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #ugbudget20
## 18335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #ukedchat
## 18336                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #ukimmigration
## 18337                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #ukmusicsector
## 18338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ukplc�
## 18339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #ukraine
## 18340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #ukvisas
## 18341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #ullapool
## 18342                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #umbrellabuddy
## 18343                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #unbelievable
## 18344                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #unitedkingdom
## 18345                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #unitednotdivided
## 18346                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #unlockingthenhs
## 18347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #upuntilnow
## 18348                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #urbanismlunchhour
## 18349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #usacitizens
## 18350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #usaonfire
## 18351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #usaprotests
## 18352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #uta
## 18353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #utb
## 18354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #uti
## 18355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #vaccines
## 18356                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #vaccinetrial
## 18357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #vacunas
## 18358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #valuechain
## 18359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #valuers
## 18360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #vandalism
## 18361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #vawg
## 18362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #vegan
## 18363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #vegetarian
## 18364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #ventilators
## 18365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #veterinary
## 18366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #vinatage
## 18367                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #vintagemusic
## 18368                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #vintagerecords
## 18369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #vinyls
## 18370                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #virtualclinic
## 18371                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #virtualevent
## 18372                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #virtuallearning
## 18373                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #virtualreality
## 18374                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #virtualteaching
## 18375                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #virtualtraining
## 18376                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #viruswhatvirus
## 18377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #vitamink
## 18378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #vivaldi
## 18379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #vlog
## 18380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #voluntary
## 18381                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #volunteeringmatters
## 18382                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #volunteersweek2020abz
## 18383                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #volunteersweekscot
## 18384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #vr
## 18385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #vrar
## 18386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #vulernable
## 18387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #wakefield
## 18388                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #walesrallygb
## 18389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #walestoday
## 18390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #walk
## 18391                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #walkingwithdad
## 18392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #wallsend
## 18393                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #walmercastleph
## 18394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #walthamstow
## 18395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #wandsworth
## 18396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #wapping
## 18397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #warning
## 18398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #washington
## 18399                                                                                                                                                                                                                                                                                                                                                                                                                                                             #washyourhands<u+2665><u+fe0f>x
## 18400                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #washyourhands�
## 18401                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #waterloostreet
## 18402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #wato
## 18403                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #wearegcu<u+0001f43a>
## 18404                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #wearehealthpsychology
## 18405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #wearemedway
## 18406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #weareopen
## 18407                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #weavingflowers
## 18408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #webex
## 18409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #webscience
## 18410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #webwewant
## 18411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #wecare
## 18412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #wedding
## 18413                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #wednesdaymotivation
## 18414                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #wednesdaythoughts
## 18415                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #wednesdaywisdom
## 18416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #week
## 18417                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #weekendvibes
## 18418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #welcomeback
## 18419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #wellington
## 18420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #welsh
## 18421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #welshmedia
## 18422                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #weneedanswers
## 18423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #werner
## 18424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #wespeak
## 18425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #westend
## 18426                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #westfaliafruit
## 18427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #westminster
## 18428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #wfh
## 18429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #wha73
## 18430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #whackamole
## 18431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #whenitsuits
## 18432                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #wherearethescientists
## 18433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #whitefen
## 18434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #whitewash
## 18435                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #whitewashing
## 18436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #widowers
## 18437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #widows
## 18438                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #wifflewaffling
## 18439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #williewalsh
## 18440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #willsmith
## 18441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #wiltshire
## 18442                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #windowcleaning
## 18443                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #windrushscandal
## 18444                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #windsorcastle
## 18445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #winter20
## 18446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #wmfevents
## 18447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #wmidshr
## 18448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #woman
## 18449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #women
## 18450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #womenled
## 18451                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #wontyoubemyneighbor
## 18452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #woodmill
## 18453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #work
## 18454                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #workerspartyofgreatbritain
## 18455                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #workfromhome
## 18456                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #workinghardfordevon
## 18457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #worksop
## 18458                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #worldbeating
## 18459                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #worlddayagainstchildlabour
## 18460                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #worldenvironmentday
## 18461                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #worldhealthorganization
## 18462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #worldnews
## 18463                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #worldoceanday
## 18464                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #worldsgonemad
## 18465                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #wovenflowers
## 18466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #wp
## 18467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #wrc
## 18468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #writeup
## 18469                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #writingcommunity
## 18470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #wtday20
## 18471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #wtf
## 18472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ww
## 18473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #ww�s
## 18474                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #wycombewanderers
## 18475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #wye
## 18476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #xijinping
## 18477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #xplore
## 18478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #xr
## 18479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #xrcol2020
## 18480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #yarm
## 18481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #yemen
## 18482                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #yestoantiterrorbill
## 18483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #yoga
## 18484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #yorkshire
## 18485                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #youarecausingit
## 18486                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #youarenotalone
## 18487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #youchoose
## 18488                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #yourdaysarenumbered
## 18489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #yourvoice
## 18490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #youth
## 18491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #youthwork
## 18492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #youtube
## 18493                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #youvegotthis
## 18494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #zionist
## 18495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #zone
## 18496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #zoom
## 18497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ^aw
## 18498                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1e7><u+0001f1f7>
## 18499                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1e7><u+0001f1f7><u+0001f1e7><u+0001f1f7><u+0001f1e7><u+0001f1f7>
## 18500                                                                                                                                                                                                                                                                                                                                            <u+0001f1e7><u+0001f1f7><u+0001f1f7><u+0001f1fa><u+0001f1ee><u+0001f1f3><u+0001f1f2><u+0001f1fd><u+0001f1fa><u+0001f1f8><u+0001f1ec><u+0001f1e7>
## 18501                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1e7><u+0001f1fc>
## 18502                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1e8><u+0001f1ed>
## 18503                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1e9><u+0001f1ea>
## 18504                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1ea><u+0001f1f8>
## 18505                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1ea><u+0001f1fa>
## 18506                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1eb><u+0001f1f7>
## 18507                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f1ec><u+0001f1e7><u+0001f4a5><u+0001f621><u+0001f621>
## 18508                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f1ec><u+0001f1e7>covid19
## 18509                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1ee><u+0001f1ea>
## 18510                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1ee><u+0001f1f2>
## 18511                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1f2><u+0001f1f1>
## 18512                                                                                                                                                                                                                                                                                           <u+0001f1f3><u+0001f1ff><u+0001f1e6><u+0001f1fa><u+0001f1f9><u+0001f1fc><u+0001f1e8><u+0001f1f3><u+0001f1f1><u+0001f1f9><u+0001f1f8><u+0001f1ee><u+0001f1fa><u+0001f1fe><u+0001f1fb><u+0001f1f3>�
## 18513                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f1f3><u+0001f1ff><u+0001f44f><u+0001f3fb>
## 18514                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f1f3><u+0001f1ff>nz
## 18515                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1f5><u+0001f1ea>
## 18516                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1f5><u+0001f1f9>
## 18517                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f1fa><u+0001f1f8>but
## 18518                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f1fb><u+0001f1f3>�s
## 18519                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f308><u+0001f60d>
## 18520                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f308><u+0001f98b><u+0001f499>that
## 18521                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f308><u+2764><u+fe0f><u+0001f308>
## 18522                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f308><u+2764><u+fe0f><u+2764><u+fe0f>
## 18523                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f308>giving
## 18524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f30a>
## 18525                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f30c><u+0001f33f>
## 18526                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f30d><u+0001f49a>
## 18527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f30f>
## 18528                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f31f><u+0001f31f><u+0001f31f>
## 18529                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f31f><u+0001f4ab><u+0001f60e><u+0001f4a1>
## 18530                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f32f><u+0001f32f><u+0001f32f><u+0001f32e><u+0001f32e><u+0001f32e>
## 18531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f343>
## 18532                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f345><u+0001f952>servingduringcovid19
## 18533                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f34a><u+0001f339>
## 18534                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f34a><u+0001f625>
## 18535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f34f>
## 18536                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f366><u+0001f4f8>
## 18537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f37a>
## 18538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f37b>
## 18539                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f37b><u+0001f37b><u+0001f37b>
## 18540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f381>
## 18541                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f381><u+0001f32e><u+0001f355><u+0001f35c>
## 18542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f389>
## 18543                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f389><u+0001f973><u+0001f483>
## 18544                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0001f389>reopening
## 18545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f393>
## 18546                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f393><u+0001f490>
## 18547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f399>
## 18548                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f399><u+0001f4fb>
## 18549                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f399><u+0001f951>
## 18550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f3a4>
## 18551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f3a5>
## 18552                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f3a7><u+0001f3a4>
## 18553                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f3a8><u+0001f4a1><u+0001f64c><u+0001f3fc>
## 18554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f3b6>
## 18555                                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f3b6>distant
## 18556                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0001f3b6>this~and~that<u+0001f3b8>
## 18557                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f3bc><u+0001f41d>honey
## 18558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f3c5>
## 18559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f3c6>
## 18560                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f3c9><u+0001f1f9><u+0001f1e9>
## 18561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f3cf>
## 18562                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f3cf><u+0001f3cf><u+0001f3cf>
## 18563                                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f3df><u+fe0f>
## 18564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f3e0>
## 18565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f3e1>
## 18566                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f3f3><u+fe0f><u+200d><u+0001f308>
## 18567                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f3f4><u+000e0067><u+000e0062><u+000e0073><u+000e0063><u+000e0074><u+000e007f>
## 18568                                                                                                                                                                                                                                                                                                                    <u+0001f3f4><u+000e0067><u+000e0062><u+000e0073><u+000e0063><u+000e0074><u+000e007f><u+0001f3f4><u+000e0067><u+000e0062><u+000e0073><u+000e0063><u+000e0074><u+000e007f>
## 18569                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f3f4><u+000e0067><u+000e0062><u+000e0077><u+000e006c><u+000e0073><u+000e007f>
## 18570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f415>
## 18571                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f415><u+0001f436><u+0001f43e>
## 18572                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f415><u+0001f43e><u+0001f43e><u+0001f43e>
## 18573                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f41d>n
## 18574                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f436><u+0001f43e>
## 18575                                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f43f><u+fe0f>
## 18576                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f440><u+0001f48d><u+0001f525>
## 18577                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f440><u+0001f49c><u+0001f499><u+26bd><u+fe0f>
## 18578                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f440><u+0001f914>
## 18579                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f440>a
## 18580                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f442><u+0001f3fb><u+0001f442><u+0001f3fb>
## 18581                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f447><u+0001f3fc><u+0001f447><u+0001f3fc>
## 18582                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f447><u+0001f3fd>httpstco2jijnvy7hg
## 18583                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f447><u+0001f3fe><u+0001f441><u+0001f353>
## 18584                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f447><u+0001f447><u+0001f447>
## 18585                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f447><u+0001f447><u+0001f447><u+0001f447>
## 18586                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f447>see
## 18587                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f449><u+0001f3fb>
## 18588                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f449><u+0001f3fb>httpstco9ityeqe6g5
## 18589                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f449><u+0001f3fc>httpstco9ityeqvi4f
## 18590                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f449>improvements
## 18591                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f449>no
## 18592                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f449>phil
## 18593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f44a>
## 18594                                                                                                                                                                                                                                                                                                                    <u+0001f44a><u+0001f3fb><u+0001f44a><u+0001f3fb><u+0001f44a><u+0001f3fb><u+0001f44a><u+0001f3fb><u+0001f622><u+0001f622><u+0001f622><u+0001f622><u+0001f622><u+0001f622>
## 18595                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f44a><u+0001f3fc><u+0001f44a><u+0001f3fd><u+0001f44a><u+0001f3fe><u+0001f44a><u+0001f3ff>
## 18596                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f44a><u+0001f3fc>httpstcoqrp4iywgpw
## 18597                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f44b><u+0001f3fb>
## 18598                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f44c><u+0001f44d>
## 18599                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f44d><u+0001f3fb><u+0001f601>
## 18600                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f44d><u+0001f3fb>httpstcofrxxjkwdus
## 18601                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f44d><u+0001f3fc>
## 18602                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f44d><u+0001f3fc><u+0001f637><u+0001f44d><u+0001f3fc>
## 18603                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f44d><u+0001f3fc>httpstcolccdqunxwj
## 18604                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f44d><u+0001f44d><u+0001f44d><u+0001f44d>
## 18605                                                                                                                                                                                                                                                                                                                                                                           <u+0001f44d><u+0001f44f><u+0001f44f><u+0001f44f><u+0001f44f><u+0001f44f><u+0001f44f><u+0001f44f><u+0001f49a>happy
## 18606                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f44d><u+0001f918><u+0001f601>
## 18607                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f44d><u+2764><u+fe0f>whhvolunteers
## 18608                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f44d>woodfarmboy
## 18609                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f44e><u+0001f3fb>
## 18610                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb>
## 18611                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb>
## 18612                                                                                                                                                                                                                                                                                                                                                                    <u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb>
## 18613                                                                                                                                                                                                                                                                                                                    <u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44d><u+0001f3fb>
## 18614                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f44f><u+0001f3fb>|
## 18615                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f44f><u+0001f3fc><u+0001f44f><u+0001f3fc>
## 18616                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f44f><u+0001f44f><u+0001f44f>
## 18617                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f44f><u+0001f44f><u+0001f44f><u+0001f44f>
## 18618                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f44f><u+0001f44f><u+0001f44f><u+0001f44f><u+0001f44f><u+0001f44f><u+0001f44f>
## 18619                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f44f><u+0001f917><u+0001f60d>
## 18620                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f44f>action<u+0001f44f>
## 18621                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f44f>demand
## 18622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f463>
## 18623                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f463>as
## 18624                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f468><u+200d><u+2695><u+fe0f><u+0001f469><u+200d><u+2695><u+fe0f>
## 18625                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f469><u+0001f3fb><u+200d><u+0001f4bb>
## 18626                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f47d><u+0001f47d><u+0001f602><u+0001f602>
## 18627                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f47f><u+0001f43a><u+0001f9ff>
## 18628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f480>
## 18629                                                                                                                                                                                                                                                                                                                    <u+0001f482><u+200d><u+2642><u+fe0f><u+0001f941><u+0001f434><u+0001f1ec><u+0001f1e7><u+0001f3f4><u+000e0067><u+000e0062><u+000e0077><u+000e006c><u+000e0073><u+000e007f>
## 18630                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f483><u+270c><u+0001f62d>
## 18631                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f485><u+0001f3fd>
## 18632                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f487><u+0001f44c>
## 18633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f48b>
## 18634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f48e>
## 18635                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f494><u+0001f1ea><u+0001f1e6>
## 18636                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f494><u+0001f494>
## 18637                                                                                                                                                                                                                                                                                                                                                                                <u+0001f495><u+0001f44f><u+0001f3fe><u+0001f44a><u+0001f3fe><u+0001f64f><u+0001f3fe><u+0001f64f><u+0001f3fe>
## 18638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f496>
## 18639                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f496><u+0001f496><u+0001f496><u+0001f496>
## 18640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f497>
## 18641                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f499><u+0001f5a4><u+0001f49b><u+0001f64f><u+0001f3fc>
## 18642                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f499>youngvinniesew
## 18643                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f49a><u+0001f929><u+2b50><u+fe0f>
## 18644                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f49b><u+0001f499><u+0001f44f>
## 18645                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f49b><u+0001f49a>
## 18646                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f49b><u+0001f49b><u+0001f49b><u+0001f49b><u+0001f49b><u+0001f49b>a
## 18647                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f49b><u+2764><u+fe0f><u+0001f5a4>
## 18648                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f49c><u+0001f49c>
## 18649                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f49c><u+0001f618>
## 18650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4a1>
## 18651                                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f4a5>outdoor
## 18652                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f4a5>this
## 18653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4aa>
## 18654                                                                                                                                                                                                                    <u+0001f4aa><u+0001f3fb><u+0001f4aa><u+0001f3fb><u+0001f4aa><u+0001f3fb><u+0001f44a><u+0001f3fb><u+0001f44a><u+0001f3fb><u+0001f44a><u+0001f3fb><u+0001f44a><u+0001f3fb><u+0001f44a><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb>
## 18655                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f4aa><u+0001f3fd><u+0001f3c3><u+200d><u+2640><u+fe0f><u+0001f6b2>
## 18656                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f4aa><u+0001f3fe><u+0001f94a><u+0001f60e>
## 18657                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f4aa><u+0001f4aa>
## 18658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4b0>
## 18659                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f4b0><u+0001f33e>
## 18660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4b5>
## 18661                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f4bb>httpstcooqpkbblogu
## 18662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4c5>
## 18663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4c8>
## 18664                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f4ca><u+0001f4c8>radioterapia
## 18665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4cb>
## 18666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4d6>
## 18667                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f4dd>new
## 18668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4de>
## 18669                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f4e7>info
## 18670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4e9>
## 18671                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f4e9>inscripci�n
## 18672                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f4f1>httpstco6zk80xiffn
## 18673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4f7>
## 18674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f4f9>
## 18675                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+0001f4fb>about
## 18676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f510>
## 18677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f517>
## 18678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f51c>
## 18679                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f51c><u+0001f51c>no
## 18680                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f51c>inscr�bete
## 18681                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f525><u+0001f4af>
## 18682                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f525><u+0001f525><u+0001f525>
## 18683                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f525>muller
## 18684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f52c>
## 18685                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f535><u+0001f534><u+26aa><u+0001f988><u+0001f988><u+0001f988>
## 18686                                                                                                                                                                                                                                                                                                                                                <u+0001f535><u+26aa><u+0001f535><u+26aa><u+0001f535><u+26aa><u+0001f535><u+26aa><u+0001f535><u+26aa><u+0001f535><u+26aa><u+0001f535><u+26aa>
## 18687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f5a4>
## 18688                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f5a4><u+2764><u+fe0f>
## 18689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f5d1>
## 18690                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f5de>|
## 18691                                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f5e3><u+fe0f>
## 18692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f5fa>
## 18693                                                                                                                                                                                                                                                                                                                                                                                <u+0001f600><u+0001f3cc><u+0001f3fb><u+200d><u+2640><u+fe0f><u+0001f3cc><u+0001f3fc><u+200d><u+2642><u+fe0f>
## 18694                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f601><u+0001f60e>
## 18695                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f602><u+0001f44c><u+0001f3fc>
## 18696                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f602><u+0001f602><u+0001f602><u+0001f608>
## 18697                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f602><u+0001f609>
## 18698                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f602><u+0001f923><u+0001f602>
## 18699                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f602><u+0001f92f>
## 18700                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f603><u+0001f44d>
## 18701                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f608>went
## 18702                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f609><u+0001f411><u+0001fa78><u+0001f489>
## 18703                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f609><u+0001f602>
## 18704                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f609>fiberkshire
## 18705                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f60a><u+0001f308>
## 18706                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f60a><u+2764><u+271d><u+fe0f>
## 18707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f60c>
## 18708                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f60e>followback
## 18709                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f60e>johncooperclarke<u+0001f3b8>theinvisiblegirls
## 18710                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f610><u+0001f610>
## 18711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f612>
## 18712                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f614><u+0001f494>
## 18713                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f614><u+0001f614><u+0001f614><u+0001f614>artist
## 18714                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f614><u+0001f614>wise
## 18715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f615>
## 18716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f616>
## 18717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f617>
## 18718                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f618><u+0001f618>
## 18719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f61c>
## 18720                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f61e><u+0001f622>
## 18721                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f620><u+0001f620><u+0001f620><u+0001f620><u+0001f620>
## 18722                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f620><u+0001f624><u+0001f621>
## 18723                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f621>and
## 18724                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f621>just
## 18725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f623>
## 18726                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f625><u+0001f494>
## 18727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f62a>
## 18728                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f62a><u+0001f62a><u+0001f62a><u+0001f62a>
## 18729                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f62c><u+0001f62c><u+0001f62c>
## 18730                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f62d><u+0001f62d>
## 18731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f62e>
## 18732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f630>
## 18733                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f630><u+0001f621>
## 18734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f631>
## 18735                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f631>httpstcotnfxdqdh1x
## 18736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f632>
## 18737                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f632><u+0001f632><u+0001f632>
## 18738                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f633><u+0001f974><u+0001f937><u+0001f3fb><u+200d><u+2642><u+fe0f><u+0001f610>thats
## 18739                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f637><u+0001f463><u+0001f6d2><u+0001f6d2><u+0001f463><u+0001f44f><u+0001f3ff>
## 18740                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f637><u+0001f637>httpstcoqvprvvblc3
## 18741                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f637><u+0001f9a0>
## 18742                                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f637>covid19
## 18743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f641>
## 18744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f643>
## 18745                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f644><u+0001f644><u+0001f644><u+0001f644>
## 18746                                                                                                                                                                                                                                                                                                                                                                                <u+0001f644><u+0001f644><u+0001f926><u+200d><u+2642><u+fe0f><u+0001f926><u+200d><u+2642><u+fe0f>hypocritical
## 18747                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f644><u+0001f92d><u+0001f308>
## 18748                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f644><u+0001f92f><u+0001f489>covid19
## 18749                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f644><u+0001f937><u+0001f3fb><u+200d><u+2640><u+fe0f>
## 18750                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f644>bydd
## 18751                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f648><u+0001f631>
## 18752                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f648><u+0001f641>
## 18753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f64a>
## 18754                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f64b><u+0001f3fb><u+200d><u+2640><u+fe0f>
## 18755                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f64b><u+0001f3fb><u+200d><u+2642><u+fe0f><u+0001f64b><u+0001f3fc><u+200d><u+2640><u+fe0f>
## 18756                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f64b><u+0001f3fc><u+200d><u+2640><u+fe0f>
## 18757                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f64c><u+0001f3fc>
## 18758                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f64c><u+0001f3fd><u+2693><u+fe0f><u+0001f64c><u+0001f3fd><u+2693><u+fe0f><u+0001f64c><u+0001f3fd>
## 18759                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f64c><u+0001f64c>
## 18760                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f64c><u+2764><u+fe0f>
## 18761                                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f64c>covid19
## 18762                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f64f><u+0001f3fb><u+0001f49c>
## 18763                                                                                                                                                                                                                                                                                                                                                                                                           <u+0001f64f><u+0001f3fc><u+0001f44d><u+0001f3fc><u+0001f44d><u+0001f3fc>emmerdale
## 18764                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f64f><u+0001f3fc><u+0001f64f><u+0001f3fc>duncanmorrow
## 18765                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f64f><u+0001f3fc><u+0001f970><u+2764><u+fe0f>
## 18766                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f64f><u+0001f3fe>
## 18767                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f64f><u+0001f3fe><u+0001f44a><u+0001f3fe>
## 18768                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f64f><u+0001f3ff><u+0001f64f><u+0001f64f><u+0001f3ff><u+0001f64f>
## 18769                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f64f><u+0001f499><u+0001f308>
## 18770                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f64f><u+0001f64f><u+0001f64f><u+0001f64f><u+0001f64f><u+0001f64f><u+0001f64f><u+0001f64f>
## 18771                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f64f>spreadkindness
## 18772                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f64f>we
## 18773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f680>
## 18774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f691>
## 18775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f695>
## 18776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f699>
## 18777                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f6a8><u+0001f4f0>
## 18778                                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f6a8>breaking
## 18779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f6aa>
## 18780                                                                                                                                                                                                                                                                                                                                                                                <u+0001f6b6><u+0001f3fc><u+200d><u+2640><u+fe0f><u+0001f463><u+0001f415><u+0001f43e><u+0001f43e><u+0001f43e>
## 18781                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f6bd><u+0001f6ba>
## 18782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f6cc>
## 18783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f6f0>
## 18784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f6f9>
## 18785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f913>
## 18786                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f914><u+0001f620><u+0001f620><u+0001f620>
## 18787                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f914><u+0001f644><u+0001f60e>
## 18788                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f914><u+0001f648>
## 18789                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f914><u+0001f914><u+0001f914><u+0001f914>
## 18790                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f914><u+0001f914><u+0001f914><u+0001f914><u+0001f914><u+0001f914>
## 18791                                                                                                                                                                                                                                                                                                                                                                      <u+0001f914><u+0001f926><u+0001f3fd><u+200d><u+2642><u+fe0f><u+2b50><u+2b50><u+2b50><u+2b50><u+2b50><u+2b50>bcnlegendz
## 18792                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f914><u+0001f9d0><u+0001f928><u+0001f914>
## 18793                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f914>as
## 18794                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+0001f914>can�t
## 18795                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f914>just
## 18796                                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f914>lockdown
## 18797                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f914>my
## 18798                                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f914>peckham
## 18799                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f914>stayhomesavelives
## 18800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f915>
## 18801                                                                                            <u+0001f919><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f44f><u+0001f3fb><u+0001f3f4><u+000e0067><u+000e0062><u+000e0077><u+000e006c><u+000e0073><u+000e007f><u+0001f4af><u+0001f4af><u+0001f4af><u+0001f914><u+0001f914><u+0001f914><u+0001f914><u+0001f4a5><u+0001f4a5><u+0001f4a5><u+0001f4a5><u+0001f4a5><u+0001f4a5><u+0001f4a5><u+0001f4a5><u+0001f4a5><u+0001f4a5><u+0001f4a5>
## 18802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f91b>
## 18803                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f91e><u+0001f91e><u+0001f64f><u+0001f64f>
## 18804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f921>
## 18805                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f921>�s
## 18806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f922>
## 18807                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f923><u+0001f602><u+0001f637><u+0001f637><u+0001f637>
## 18808                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f923><u+0001f64f><u+2764><u+fe0f>
## 18809                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f923><u+0001f923><u+0001f923><u+0001f923><u+0001f923>
## 18810                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f923><u+0001f92b>
## 18811                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f923>if
## 18812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f924>
## 18813                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f926><u+0001f3fb><u+200d><u+2642><u+fe0f>
## 18814                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f926><u+0001f3fc><u+200d><u+2642><u+fe0f><u+0001f926><u+0001f3fc><u+200d><u+2642><u+fe0f>
## 18815                                                                                                                                                                                                                                                                                                                                            <u+0001f926><u+0001f3fd><u+200d><u+2640><u+fe0f><u+0001f926><u+0001f3fd><u+200d><u+2640><u+fe0f><u+0001f926><u+0001f3fd><u+200d><u+2640><u+fe0f>
## 18816                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f926><u+0001f3fd><u+200d><u+2642><u+fe0f>
## 18817                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f926><u+0001f926><u+0001f926>
## 18818                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f926><u+200d><u+2642><u+fe0f>30
## 18819                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f927><u+0001f912><u+0001f61d>
## 18820                                                                                                                                                                                                                                                                                                                                                <u+0001f929><u+0001f44d><u+0001f340><u+0001f633><u+0001f4af><u+2705><u+0001f30d><u+0001f970><u+0001f49d><u+0001f44c><u+0001f60e><u+0001f609>
## 18821                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f929><u+0001f44d>thats
## 18822                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f929><u+0001f4ab>
## 18823                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f929><u+0001f60e><u+0001f60d>lakedistrict
## 18824                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f929><u+0001f929>
## 18825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f92a>
## 18826                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f92a><u+0001f92a><u+0001f92a>
## 18827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f92b>
## 18828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f92c>
## 18829                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f92c><u+0001f92f><u+0001f624>
## 18830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f92e>
## 18831                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f930><u+0001f3fc><u+0001f930><u+0001f3fc><u+0001f931><u+0001f3fb><u+0001f931><u+0001f3fb>
## 18832                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f937><u+0001f3fb><u+200d><u+2640><u+fe0f>
## 18833                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f937><u+0001f3fb><u+200d><u+2640><u+fe0f><u+0001f914>
## 18834                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f937><u+200d><u+2640><u+fe0f><u+0001f937><u+200d><u+2640><u+fe0f>
## 18835                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f937><u+200d><u+2642><u+fe0f>they
## 18836                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f93c><u+200d><u+2642><u+fe0f>
## 18837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f940>
## 18838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f94a>
## 18839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f966>
## 18840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f970>
## 18841                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f970><u+0001f64f><u+0001f3fc><u+0001f49a>
## 18842                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f973><u+0001f4aa><u+0001f3fb>
## 18843                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f973><u+0001f973>
## 18844                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f974><u+0001f603>
## 18845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f976>
## 18846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f97a>
## 18847                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f97a><u+0001f97a>
## 18848                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f97a><u+0001f97a><u+0001f97a>
## 18849                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001f97c><u+0001f97d><u+0001f601>
## 18850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f97e>
## 18851                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f97e>cumbrianrambler
## 18852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f9b7>
## 18853                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f9d7><u+200d><u+2640><u+fe0f>first
## 18854                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f9e1><u+0001f5a4><u+0001f43a>covid19
## 18855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f9eb>
## 18856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f9ec>
## 18857                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+0001fa78><u+0001f489><u+0001f9a0>
## 18858                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001fa81><u+26c5><u+fe0f><u+0001f4a8>
## 18859                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0395><u+03bb><u+03bb><u+03ac>da
## 18860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+03ae>
## 18861                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+03b3><u+03b9>a
## 18862                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+03ba><u+03ac><u+03bd><u+03bf><u+03c5><u+03bd>
## 18863                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+03ba><u+03bf><u+03bb><u+03bb><u+03ac><u+03bd>e
## 18864                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+03ba><u+03bf>��<u+03c9>t<u+03ae><u+03c1><u+03b9><u+03bf>
## 18865                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+03ba>a<u+03b9>
## 18866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+03c1>e
## 18867                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0411><u+0430><u+043d><u+0434><u+0438><u+0442><u+044b>
## 18868                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0412>�<u+041c><u+043e><u+0441><u+043a><u+0432><u+0435>
## 18869                                                                                                                                                                                                                                                                                                                                                                                                           <u+0412>�<u+0431><u+0443><u+0440><u+044f><u+0442><u+0441><u+043a><u+043e><u+0439>
## 18870                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+041a><u+0430><u+043a>
## 18871                                                                                                                                                                                                                                                                                                                                                                                                    <u+041a><u+043e><u+043d><u+0441><u+0442><u+0438><u+0442><u+0443><u+0446><u+0438><u+044f>
## 18872                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+041c><u+0438><u+043d><u+044e><u+0441><u+0442>
## 18873                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+041d><u+0435>
## 18874                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+041e><u+0442><u+043a><u+0440><u+044b><u+043b>
## 18875                                                                                                                                                                                                                                                                                                                                                                                                  <u+0420><u+0424>�<u+043d><u+0435>�<u+0443><u+0432><u+0438><u+0434><u+0435><u+043b><u+0438>
## 18876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0430>
## 18877                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0431><u+0435><u+0441><u+0438><u+0442>
## 18878                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0431><u+043e><u+043b><u+044c><u+043d><u+0438><u+0446><u+0435>
## 18879                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0432><u+0432><u+0435><u+0434><u+0435><u+043d><u+043d><u+044b><u+0445>
## 18880                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0432><u+043e><u+0442>
## 18881                                                                                                                                                                                                                                                                                                                                                                                   <u+0432>�<u+043e><u+0433><u+0440><u+0430><u+043d><u+0438><u+0447><u+0435><u+043d><u+0438><u+044f><u+0445>
## 18882                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0432>�<u+0442><u+0443><u+0430><u+043b><u+0435><u+0442>
## 18883                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0433><u+0440><u+0430><u+0436><u+0434><u+0430><u+043d>
## 18884                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0436><u+0435>
## 18885                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0437><u+0430><u+043f><u+0440><u+0435><u+0442><u+0438><u+043b><u+0438>
## 18886                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0437><u+0430><u+0449><u+0438><u+0442><u+044b>
## 18887                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0438><u+0437>
## 18888                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0438><u+0437><u+0437><u+0430>
## 18889                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0438><u+043b><u+0438>
## 18890                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0438><u+0445>
## 18891                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+043a><u+043e><u+0442><u+043e><u+0440><u+043e><u+0435>
## 18892                                                                                                                                                                                                                                                                                                                                                                                                                    <u+043d><u+0430><u+0440><u+0443><u+0448><u+0435><u+043d><u+0438><u+0439>
## 18893                                                                                                                                                                                                                                                                                                                                                                                           <u+043d><u+0430>�<u+043e><u+0442><u+0441><u+0443><u+0442><u+0441><u+0442><u+0432><u+0438><u+0435>
## 18894                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+043d><u+0435>
## 18895                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+043e><u+043f><u+044f><u+0442><u+044c>
## 18896                                                                                                                                                                                                                                                                                                                                                                                                            <u+043e><u+0442><u+0441><u+0443><u+0442><u+0441><u+0442><u+0432><u+0438><u+0435>
## 18897                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+043e><u+0442>�covid19
## 18898                                                                                                                                                                                                                                                                                                                                                                                                                    <u+043f><u+0430><u+0446><u+0438><u+0435><u+043d><u+0442><u+0430><u+043c>
## 18899                                                                                                                                                                                                                                                                                                                                                                                                    <u+043f><u+0435><u+0440><u+0435><u+0432><u+043e><u+0437><u+044f><u+0449><u+0438><u+0435>
## 18900                                                                                                                                                                                                                                                                                                                                                                                            <u+043f><u+043e><u+0436><u+0430><u+043b><u+043e><u+0432><u+0430><u+043b><u+0438><u+0441><u+044c>
## 18901                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+043f><u+0440><u+0430><u+0432>
## 18902                                                                                                                                                                                                                                                                                                                                                                                                            <u+043f><u+0440><u+0438><u+043b><u+043e><u+0436><u+0435><u+043d><u+0438><u+0435>
## 18903                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0441><u+0430><u+043d><u+0438><u+0442><u+0430><u+0440><u+044b>
## 18904                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0441><u+0438><u+043c><u+043f><u+0442><u+043e><u+043c><u+044b>
## 18905                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0441><u+043b><u+044b><u+0448><u+0430><u+043b><u+0438>
## 18906                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0441>�covid19
## 18907                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0442><u+0440><u+0435><u+043a><u+0430><u+0435><u+0442>
## 18908                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0442><u+0440><u+0443><u+043f><u+044b>
## 18909                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0442><u+0443><u+0442>
## 18910                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0445><u+043e><u+0434><u+0438><u+0442><u+044c>
## 18911                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0445><u+0443><u+0438><u+0442><u+0430>
## 18912                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+044d><u+0442><u+0430>
## 18913                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0622><u+0691>
## 18914                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0622><u+06af><u+06cc><u+0627>
## 18915                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0628><u+0646><u+0627><u+0626><u+064a>
## 18916                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+062c><u+0627><u+0628><u+0629>
## 18917                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+062d><u+062a><u+0645><u+0627><u+0644><u+064a><u+0629>
## 18918                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+062e><u+0648><u+0627><u+0646><u+064a>
## 18919                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0631><u+062a><u+0641><u+0627><u+0639>
## 18920                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0638><u+0647><u+0631><u+062a>
## 18921                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0643><u+062a><u+0628>
## 18922                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0643><u+062b><u+0631>
## 18923                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644>
## 18924                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0644><u+0627><u+0635><u+0627><u+0628><u+0629>
## 18925                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0628><u+0631><u+0648><u+0641><u+064a><u+0633><u+0648><u+0631>
## 18926                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+062c><u+0645><u+0639><u+0629>
## 18927                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+062f><u+0639><u+0627><u+0621>
## 18928                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0644><u+062f><u+0643><u+062a><u+0648><u+0631><u+0627><u+0629>
## 18929                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0644><u+0630><u+0643><u+0648><u+0631><u+0629>
## 18930                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0630><u+064a>
## 18931                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0631><u+062c><u+0627><u+0644>
## 18932                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0633><u+0644><u+0627><u+0645>
## 18933                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0644><u+0635><u+062d><u+0629><u+0627><u+0644><u+0639><u+0627><u+0644><u+0645><u+064a><u+0629>
## 18934                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0637><u+0627><u+0644><u+0628><u+0627><u+062a>
## 18935                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0637><u+0628><u+064a><u+0629>
## 18936                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0637><u+0644><u+0627><u+0628>
## 18937                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0639><u+062a><u+0645><u+0629>
## 18938                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0641><u+0627><u+064a><u+0631><u+0648><u+0633>
## 18939                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0644><u+0647>
## 18940                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0645><u+062e><u+0644><u+0635><u+064a><u+0646>
## 18941                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0644><u+0645><u+0631><u+0636>
## 18942                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0645><u+0633><u+062a><u+0634><u+0641><u+0649>
## 18943                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0644><u+0645><u+0644><u+0627><u+0631><u+064a><u+0627>
## 18944                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0644><u+064a><u+0648><u+0645>
## 18945                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+0646>
## 18946                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0646><u+0635><u+0627><u+0641>
## 18947                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+0646><u+0647>
## 18948                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+064a><u+0644><u+0627><u+0646><u+062f>
## 18949                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+06cc><u+0645>
## 18950                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0627><u+06cc><u+0646>
## 18951                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0627><u+06d2>
## 18952                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0628><u+0627><u+0644><u+0627><u+062e><u+0631><u+064a><u+0646>
## 18953                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0628><u+062d><u+062b>
## 18954                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0628><u+0631><u+0627><u+0648><u+0646>
## 18955                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0628><u+0631><u+062c><u+0627><u+0621>
## 18956                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0628><u+0639><u+062f>
## 18957                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0628><u+0645><u+0631><u+0636>
## 18958                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0628><u+0648><u+0644><u+0627><u+064a><u+0629>
## 18959                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0628><u+064a><u+0646>
## 18960                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+062a><u+0627><u+062e><u+0630><u+0647>
## 18961                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+062a><u+062d><u+0631><u+06cc><u+06a9>
## 18962                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+062a><u+0642><u+0648><u+0644>
## 18963                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+062c><u+0627><u+0645><u+0639><u+0629>
## 18964                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+062c><u+062f><u+064a><u+062f><u+0629>
## 18965                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+062d><u+0628><u+06cc><u+0628>
## 18966                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+062d><u+062f><u+0629>
## 18967                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+062d><u+0642><u+064a><u+060c>
## 18968                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+062e><u+0627><u+0637><u+0631><u+062a><u+064a>
## 18969                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+062e><u+062f><u+0627>
## 18970                                                                                                                                                                                                                                                                                                                                                                                                                    <u+062e><u+0632><u+0639><u+0628><u+0644><u+0627><u+062a><u+0647><u+0645>
## 18971                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+062e><u+0648><u+0628>
## 18972                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0631><u+0627>
## 18973                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0631><u+0648><u+062f>
## 18974                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0631><u+06a9><u+06be><u+06cc>
## 18975                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0631><u+06c1><u+0646><u+0645><u+0627><u+0621>
## 18976                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0632><u+064a><u+064a>
## 18977                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0633><u+0627><u+0639><u+0629>
## 18978                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0633><u+0648><u+0648><u+0627>
## 18979                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0635><u+062d><u+062a>
## 18980                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0639><u+0644><u+0627><u+062c>
## 18981                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0639><u+0644><u+064a><u+0643><u+0645>
## 18982                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0639><u+0644><u+0651>
## 18983                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0639><u+0646>
## 18984                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0639><u+0646><u+062f>
## 18985                                                                                                                                                                                                                                                                                                                                                                                                                 <u+063a><u+0631><u+062f><u+0643><u+0623><u+0646><u+0643><u+0641><u+064a>201
## 18986                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0641><u+0628><u+0627><u+0644><u+062a><u+0627><u+0644><u+064a>
## 18987                                                                                                                                                                                                                                                                                                                                                                                                    <u+0641><u+0631><u+0645><u+0627><u+0626><u+06d2><u+06d4><u+0622><u+0645><u+06cc><u+0646>
## 18988                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0641><u+0631><u+0648><u+062e>
## 18989                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0641><u+064a><u+062f><u+064a><u+0648><u+0661>
## 18990                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0641><u+064a><u+062f><u+064a><u+0648><u+0662>
## 18991                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0641><u+064a><u+0647><u+0627>
## 18992                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0642><u+0627><u+0645>
## 18993                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0642><u+0628><u+0644>
## 18994                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0642><u+0648><u+0629>
## 18995                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0643><u+0648><u+0631><u+0648><u+0646><u+0627>
## 18996                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0643><u+0648><u+0641><u+064a><u+062f><u+0661><u+0669>
## 18997                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0643><u+0648><u+0642><u+0627><u+064a><u+0629>
## 18998                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0644><u+0623><u+062d><u+062f>
## 18999                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0644><u+0627>
## 19000                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0644><u+0627><u+0632><u+0645>
## 19001                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0644><u+0648><u+0679>
## 19002                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0644><u+06af><u+0627>
## 19003                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0645><u+0627>
## 19004                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0645><u+0627><u+0631>
## 19005                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0645><u+0628><u+062a><u+0639><u+062b><u+0648><u+0646>
## 19006                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0645><u+062a><u+062d><u+0631><u+06a9>
## 19007                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0645><u+062c><u+0644><u+0629>
## 19008                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0645><u+0639>
## 19009                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0645><u+0642><u+0627><u+0631><u+0646><u+0629>
## 19010                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0645><u+064f><u+062b><u+0628><u+062a>
## 19011                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0645><u+06cc><u+06ba>
## 19012                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0646><u+062c><u+06cc>
## 19013                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0646><u+0633><u+062a><u+0641><u+064a><u+062f><u+060c>
## 19014                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0646><u+0634><u+0631><u+062a>
## 19015                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0646><u+0648><u+062c><u+0648><u+0627><u+0646>
## 19016                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0646><u+0648><u+0631><u+064c>
## 19017                                                                                                                                                                                                                                                                                                                                                                                                            <u+0646><u+064a><u+0648><u+0625><u+0646><u+062c><u+0644><u+0627><u+0646><u+062f>
## 19018                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0647><u+0630><u+064a>
## 19019                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0647><u+0631><u+0645><u+0648><u+0646><u+0627><u+062a>
## 19020                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0647><u+0646><u+0627><u+0643>
## 19021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0648>
## 19022                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0648><u+0627><u+062e><u+0648><u+0627><u+062a><u+064a>
## 19023                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0648><u+0627><u+0644><u+0644><u+0647>
## 19024                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0648><u+0628><u+0631><u+0643><u+0627><u+062a><u+0647>
## 19025                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0648><u+0631><u+062d><u+0645><u+0629>
## 19026                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0648><u+0635><u+0644>
## 19027                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0648><u+0639><u+0633><u+0649>
## 19028                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0648><u+0641><u+064a><u+0647><u+0627>
## 19029                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0648><u+0644><u+0627>
## 19030                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0648><u+064a><u+0628><u+0645><u+064a><u+0631>
## 19031                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+064a><u+062d><u+062a><u+0636><u+0631>
## 19032                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+064a><u+062d><u+0645><u+064a>
## 19033                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+064a><u+0632><u+064a><u+062f>
## 19034                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+064a><u+0639><u+0646><u+064a><u+060c>
## 19035                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+064a><u+0642><u+0644><u+0644>
## 19036                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+064a><u+0642><u+0648><u+0644>
## 19037                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+064a><u+0643><u+0648><u+0646>
## 19038                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+064a><u+0646><u+0641><u+0639>
## 19039                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0679><u+06cc><u+0633><u+0679>
## 19040                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+067e><u+0627><u+06a9>
## 19041                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+067e><u+0627><u+06a9><u+0633><u+062a><u+0627><u+0646>
## 19042                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+06a9><u+0627>
## 19043                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+06a9><u+0627><u+0645><u+0644><u+06c1>
## 19044                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+06a9><u+0631><u+0648>
## 19045                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+06a9><u+0646><u+0691><u+0648><u+0644>
## 19046                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+06a9><u+06cc>
## 19047                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+06a9><u+06d2>
## 19048                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+06be><u+0633><u+067e><u+062a><u+0627><u+0644>
## 19049                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+06be><u+06d2>
## 19050                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+06c1><u+06d2>
## 19051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+06d4>
## 19052                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+203c><u+fe0f><u+0001f4fa>
## 19053                                                                                                                                                                                                                                                                                                                                                                                                                                <u+2066><u+2066><u+2066><u+2066><u+2066><u+2066>borisjohnson
## 19054                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+2066>greatormondst<u+2069>
## 19055                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+2066>gregclarkcities
## 19056                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+2066>northmidnhs<u+2069>
## 19057                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+2066>thetimes<u+2069>
## 19058                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+231a><u+fe0f>
## 19059                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+23ed><u+23ed>
## 19060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+23f3>
## 19061                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+25aa><u+fe0f>
## 19062                                                                                                                                                                                                                                                                                                                                                                                                            <u+25aa><u+fe0f>through<u+25aa><u+fe0f>the<u+25aa><u+fe0f>window<u+25aa><u+fe0f>
## 19063                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+25b6><u+fe0f><u+0001f50a>
## 19064                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+25ba><u+25ba>accede
## 19065                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+25ba>excelente
## 19066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+25ba>la
## 19067                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2601><u+fe0f><u+2601><u+fe0f><u+2601><u+fe0f>
## 19068                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2602><u+fe0f>
## 19069                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+2602><u+fe0f>marypoppins
## 19070                                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+260e><u+fe0f>hrh
## 19071                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2614><u+fe0f>
## 19072                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2620><u+fe0f><u+0001f637><u+270c><u+0001f3fc>
## 19073                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2620><u+fe0f>covid19<u+2620><u+fe0f>theplague
## 19074                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2622><u+fe0f>
## 19075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+263a>
## 19076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+2665>
## 19077                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2665><u+fe0f><u+2665><u+fe0f><u+2665><u+fe0f>
## 19078                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+26a0><u+fe0f>
## 19079                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+26bd><u+fe0f>
## 19080                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+26c5><u+fe0f>
## 19081                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+26f0><u+fe0f>
## 19082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+2705>only
## 19083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+2705>stay
## 19084                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2708><u+fe0f>
## 19085                                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+270a><u+0001f3fd>
## 19086                                                                                                                                                                                                                                                                                                                                                                                                                                <u+270a><u+0001f3fd><u+270a><u+0001f3fe><u+270a><u+0001f3ff>
## 19087                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+270a><u+0001f3fd>blm
## 19088                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+270a>blacklivesmatter
## 19089                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+270a>protestsurvive
## 19090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+270c>
## 19091                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+270c><u+0001f1ec><u+0001f1e7>
## 19092                                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+270c><u+0001f3fd>
## 19093                                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+270c><u+fe0f>news
## 19094                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2714><u+fe0f>
## 19095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+2753>
## 19096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+2753>|
## 19097                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+2764><u+fe0f><u+0001f44f>sal4kf
## 19098                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+2764><u+fe0f><u+0001f499>
## 19099                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+2764><u+fe0f><u+0001f5a4>
## 19100                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2764><u+fe0f><u+2764><u+fe0f><u+2764><u+fe0f>
## 19101                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+2764><u+fe0f>harry
## 19102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+2795>
## 19103                                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+27a1><u+fe0f>park
## 19104                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+2b07><u+fe0f><u+0001f411>
## 19105                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2b50><u+fe0f>
## 19106                                                                                                                                                                                                                                                                                                                                                                                                            <u+2b50><u+fe0f><u+2b50><u+fe0f><u+2b50><u+fe0f><u+2b50><u+fe0f><u+2b50><u+fe0f>
## 19107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+2b55>huge
## 19108                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+2b55>people
## 19109                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+2b55>structual
## 19110 <u+3053><u+306e><u+30a2><u+30d7><u+30ea><u+3067><u+6bce><u+65e5><u+4f53><u+8abf><u+3092><u+30a2><u+30c3><u+30d7><u+30c7><u+30fc><u+30c8><u+3057><u+3066><u+3066><u+3001><u+3053><u+3053><u+6570><u+65e5><u+5589><u+304c><u+75db><u+304f><u+4ed6><u+66f4><u+65b0><u+3057><u+305f><u+3068><u+3053><u+308d><u+3001>covid19<u+30c6><u+30b9><u+30c8><u+3092><u+30dc><u+30e9><u+30f3><u+30c6><u+30a3><u+30a2><u+3067><u+53d7><u+3051><u+308b><u+4e8b><u+306b><u+3002><u+90f5><u+9001><u+3067>test
## 19111                                                                                                                                                                                                                                                                                    <u+306b><u+7acb><u+3061><u+5411><u+304b><u+3046><u+30d0><u+30fc><u+30df><u+30f3><u+30ac><u+30e0><u+306e><u+8857><u+3068><u+4f4f><u+6c11><u+304c><u+63cf><u+304b><u+308c><u+3066><u+3044><u+308b><u+3002>
## 19112                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+30a2><u+30fc><u+30c8>
## 19113                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+30b0><u+30e9><u+30d5><u+30a3><u+30c6><u+30a3>
## 19114                                                                                                                            <u+30d0><u+30fc><u+30df><u+30f3><u+30ac><u+30e0><u+5728><u+4f4f><u+306e><u+30a2><u+30fc><u+30c6><u+30a3><u+30b9><u+30c8><u+304c><u+63cf><u+3044><u+305f><u+30b0><u+30e9><u+30d5><u+30a3><u+30c6><u+30a3><u+304c><u+30ab><u+30c3><u+30b3><u+3088><u+3059><u+304e><u+308b><u+306e><u+3067><u+898b><u+3066><u+3044><u+305f><u+3060><u+304d><u+305f><u+3044><u+3002>
## 19115                                                                            <u+5049><u+3044><u+4eba><u+304c><u+4f55><u+304b><u+8a00><u+3046><u+6642><u+306f><u+3001><u+3069><u+3046><u+89e3><u+91c8><u+3055><u+308c><u+308b><u+304b><u+826f><u+304f><u+8003><u+3048><u+305f><u+65b9><u+304c><u+826f><u+3044><u+3068><u+3044><u+3046><u+3001><u+5178><u+578b><u+7684><u+306a><u+4f8b><u+3002><u+672c><u+5f53><u+306b><u+4f55><u+8003><u+3048><u+3066><u+305f><u+306e><u+304b><u+306d><u+3002>
## 19116                                                                                                                                                                                                                    <u+8857><u+306e><u+8c61><u+5fb4><u+3067><u+3042><u+308b><u+30d6><u+30eb><u+306b><u+4e57><u+308a><u+30d0><u+30fc><u+30df><u+30f3><u+30ac><u+30e0><u+306e><u+5e02><u+65d7><u+3092><u+63b2><u+3052><u+3001><u+533b><u+7642><u+5f93><u+4e8b><u+8005><u+3068><u+5171><u+306b>
## 19117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+fdf2>
## 19118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      $509bn
## 19119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  04june2020
## 19120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     1+above
## 19121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      1000mg
## 19122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        100k
## 19123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       100k+
## 19124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       100th
## 19125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        100y
## 19126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     10am1pm
## 19127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         10k
## 19128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       10min
## 19129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      10mins
## 19130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         10p
## 19131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     11000km
## 19132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   1112years
## 19133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      1130am
## 19134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    1200noon
## 19135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        120k
## 19136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      1230pm
## 19137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      1230uk
## 19138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       125cc
## 19139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        12pt
## 19140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                12zzzzzzzzzz
## 19141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        130k
## 19142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         14d
## 19143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   15th�june
## 19144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     16stray
## 19145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 1700hrs�ish
## 19146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   17million
## 19147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        18th
## 19148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       18yrs
## 19149                                                                                                                                                                                                                                                                                                                                                                                                                                                                            19+demonstrating
## 19150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       1940s
## 19151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       1950s
## 19152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   19related
## 19153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      19stay
## 19154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        19th
## 19155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     19there
## 19156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        19�s
## 19157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   19�weekly
## 19158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      1am5am
## 19159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  1childless
## 19160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         1hr
## 19161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        1its
## 19162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         1ml
## 19163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         1pm
## 19164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          1s
## 19165                                                                                                                                                                                                                                                                                                                                                                                                                                                                   2<u+0001f631><u+0001f632>
## 19166                                                                                                                                                                                                                                                                                                                                                                                                                                                                           2<u+fe0f><u+20e3>
## 19167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   2020goals
## 19168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                2020isbadbut
## 19169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                2020protests
## 19170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                2020showedus
## 19171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  2020vision
## 19172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                2021<u+2063>
## 19173                                                                                                                                                                                                                                                                                                                                                                                                                                                                         20p<u+2b05><u+fe0f>
## 19174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         20s
## 19175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    20th21st
## 19176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        20�s
## 19177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         22k
## 19178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     24hours
## 19179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        24th
## 19180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      2538km
## 19181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        27th
## 19182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 283079plans
## 19183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   284agreed
## 19184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        28th
## 19185                                                                                                                                                                                                                                                                                                                                                                                                                                                                               28to29sep2020
## 19186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        29th
## 19187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      2covid
## 19188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       2hour
## 19189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     2meters
## 19190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          2n
## 19191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      2night
## 19192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      2pmbst
## 19193                                                                                                                                                                                                                                                                                                                                                                                                                                                                        30<u+2757><u+fe0f>of
## 19194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       300pm
## 19195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  30dayswild
## 19196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       30sqm
## 19197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        30th
## 19198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     357more
## 19199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          3d
## 19200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          3m
## 19201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       3part
## 19202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          3s
## 19203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        40�s
## 19204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          4k
## 19205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         4pt
## 19206                                                                                                                                                                                                                                                                                                                                                                                                                                                                           5000teststhisweek
## 19207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        50k+
## 19208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        50km
## 19209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        50th
## 19210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                5598�million
## 19211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        55bn
## 19212                                                                                                                                                                                                                                                                                                                                                                                                                                                                        55httpstcomdqfabu38s
## 19213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       560ml
## 19214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        57cm
## 19215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        5hrs
## 19216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         60k
## 19217                                                                                                                                                                                                                                                                                                                                                                                                                                                                        6123<u+260e><u+fe0f>
## 19218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       630am
## 19219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       630pm
## 19220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         63k
## 19221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       645pm
## 19222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         65s
## 19223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        65th
## 19224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       65yrs
## 19225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         6am
## 19226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       6days
## 19227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         6ft
## 19228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      6weeks
## 19229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        6yrs
## 19230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         70p
## 19231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      70year
## 19232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       70yrs
## 19233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      717yrs
## 19234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      750kgs
## 19235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      75728a
## 19236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        77cm
## 19237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         7am
## 19238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        7day
## 19239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         7ft
## 19240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         7th
## 19241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         7�s
## 19242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        80of
## 19243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    80smusic
## 19244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     83gotta
## 19245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   84�monday
## 19246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         85m
## 19247                                                                                                                                                                                                                                                                                                                                                                                                                                                                  89<u+0001f631><u+0001f631>
## 19248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         8am
## 19249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    8million
## 19250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  900�am�bst
## 19251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  930am930pm
## 19252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       972fm
## 19253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         9am
## 19254                                                                                                                                                                                                                                                                                                                                                                                                                                             a<u+03bd>t<u+03b9>�et<u+03ce>p<u+03b9>s<u+03b7>
## 19255                                                                                                                                                                                                                                                                                                                                                                                                                                                                    aaaaaarrrrgh<u+0001f63e>
## 19256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aaaand
## 19257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aameen
## 19258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aaye
## 19259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      abattu
## 19260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       abbey
## 19261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     abcissa
## 19262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 abergavenny
## 19263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    abhorant
## 19264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         abi
## 19265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        abid
## 19266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       abide
## 19267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     abiding
## 19268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        abis
## 19269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    abjectly
## 19270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ably
## 19271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  abnormally
## 19272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         abo
## 19273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aboard
## 19274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  aborigines
## 19275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   abortions
## 19276                                                                                                                                                                                                                                                                                                                                                                                                                                       about<u+0001f937><u+0001f3fb><u+200d><u+2642><u+fe0f>
## 19277                                                                                                                                                                                                                                                                                                                                                                                                                                                              about<u+2620><u+fe0f>theplague
## 19278                                                                                                                                                                                                                                                                                                                                                                                                                                                                     abouthttpstcoc1wqhgc22x
## 19279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      about�
## 19280                                                                                                                                                                                                                                                                                                                                                                                                                                                                       above<u+2b06><u+fe0f>
## 19281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       abril
## 19282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  abrocharse
## 19283                                                                                                                                                                                                                                                                                                                                                                                                                                                                               absolutelyyou
## 19284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   abundance
## 19285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     abusive
## 19286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      acabei
## 19287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     academy
## 19288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   academy�s
## 19289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  accelerant
## 19290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 accelerated
## 19291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     accepts
## 19292                                                                                                                                                                                                                                                                                                                                                                                                                                                                               accessibility
## 19293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  accessible
## 19294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   accessing
## 19295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    accident
## 19296                                                                                                                                                                                                                                                                                                                                                                                                                                                                               accommodation
## 19297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  accomodate
## 19298                                                                                                                                                                                                                                                                                                                                                                                                                                                                      accordinglythesemostly
## 19299                                                                                                                                                                                                                                                                                                                                                                                                                                                                              accountability
## 19300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  accounting
## 19301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    accounts
## 19302                                                                                                                                                                                                                                                                                                                                                                                                                                                                             accounttreasury
## 19303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  accurately
## 19304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      accuse
## 19305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ace4digital
## 19306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aches
## 19307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 achievement
## 19308                                                                                                                                                                                                                                                                                                                                                                                                                                                                             achievement�the
## 19309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ack
## 19310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                acknowledged
## 19311                                                                                                                                                                                                                                                                                                                                                                                                                                                                             acknowledgmentm
## 19312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        acta
## 19313                                                                                                                                                                                                                                                                                                                                                                                                                                                                         actions<u+0001f914>
## 19314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                actionseeing
## 19315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   activator
## 19316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    actively
## 19317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   actividad
## 19318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    activist
## 19319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  activitist
## 19320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       actor
## 19321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     actress
## 19322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        act�
## 19323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adael
## 19324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      adalah
## 19325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adams
## 19326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 adaptations
## 19327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    addicted
## 19328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                additionally
## 19329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    addoldai
## 19330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                addressphoto
## 19331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adhered
## 19332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adi
## 19333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                administered
## 19334                                                                                                                                                                                                                                                                                                                                                                                                                                                                  adminspringfielddentalcouk
## 19335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   admirable
## 19336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     admiral
## 19337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      admire
## 19338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    admisi�n
## 19339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   admitting
## 19340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    adopters
## 19341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      adopts
## 19342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  adrenaline
## 19343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adults�
## 19344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 advancement
## 19345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   advancing
## 19346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adverse
## 19347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   adversely
## 19348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  advertised
## 19349                                                                                                                                                                                                                                                                                                                                                                                                                                                        advice<u+0001f449>httpstcov1wablwisl
## 19350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adviser
## 19351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     advises
## 19352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    advisors
## 19353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    advocate
## 19354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ad�n
## 19355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ae
## 19356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aeg
## 19357                                                                                                                                                                                                                                                                                                                                                                                                                                                             af<u+03b9>e<u+03c1><u+03ce>�ata
## 19358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      afecta
## 19359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aff
## 19360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                affectionate
## 19361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   affluence
## 19362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    affluent
## 19363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   affluent�
## 19364                                                                                                                                                                                                                                                                                                                                                                                                                                                                               affordability
## 19365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     affront
## 19366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 afghanistan
## 19367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      afield
## 19368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        afpe
## 19369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      afpe�s
## 19370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  afternoons
## 19371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                afterthought
## 19372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         afu
## 19373                                                                                                                                                                                                                                                                                                                                                                                                                                                                           again<u+0001f643>
## 19374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   againdcmt
## 19375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      agents
## 19376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  aggression
## 19377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   aggressor
## 19378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   aggrieved
## 19379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         agm
## 19380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       agnes
## 19381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    agrarian
## 19382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   agreewhat
## 19383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        agri
## 19384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 agriculture
## 19385                                                                                                                                                                                                                                                                                                                                                                                                                           ahead<u+0001f914><u+0001f62f><u+0001f92f><u+0001f62d><u+0001f92c>
## 19386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ahead�
## 19387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ahh
## 19388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ahmedabad
## 19389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ahp
## 19390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aide
## 19391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aided
## 19392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aider
## 19393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aids
## 19394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ailagor
## 19395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ailments
## 19396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aimed
## 19397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ain�t
## 19398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     airbnbs
## 19399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    airborne
## 19400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    aircraft
## 19401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aire
## 19402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      airing
## 19403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       airnz
## 19404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    airstrip
## 19405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      airway
## 19406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aisle
## 19407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aj
## 19408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ajungeam
## 19409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       akkad
## 19410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    aktivora
## 19411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alaric
## 19412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       alarm
## 19413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    alarmist
## 19414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alas
## 19415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alaska
## 19416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      albans
## 19417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      albeit
## 19418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      albert
## 19419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      albion
## 19420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    albufera
## 19421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alcalde
## 19422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    alcanzan
## 19423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alcohol
## 19424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aldi
## 19425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aldrin
## 19426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alegr�a
## 19427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       alex�
## 19428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alfies
## 19429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   algorithm
## 19430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     algunos
## 19431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       alice
## 19432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alicia
## 19433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    alienate
## 19434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  alienators
## 19435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       align
## 19436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alike�
## 19437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alister
## 19438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alk
## 19439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    allergic
## 19440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   alleviate
## 19441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alli
## 19442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      allies
## 19443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   allisland
## 19444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   allocated
## 19445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alls
## 19446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ally
## 19447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     almonte
## 19448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alone�
## 19449                                                                                                                                                                                                                                                                                                                                                                                                                                                                         already<u+0001f308>
## 19450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alright
## 19451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       alter
## 19452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alterd
## 19453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   alternate
## 19454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                alternatives
## 19455                                                                                                                                                                                                                                                                                                                                                                                                                                                                               alternatives�
## 19456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      altfel
## 19457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alto
## 19458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 altogether�
## 19459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  altrincham
## 19460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      amanda
## 19461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   amazonian
## 19462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    amaz�nia
## 19463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         amb
## 19464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ambassador
## 19465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ambition
## 19466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 amblygustia
## 19467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ambssis
## 19468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ambulance�s
## 19469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ambush
## 19470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amend
## 19471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amici
## 19472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        amok
## 19473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    amounted
## 19474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     amounts
## 19475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ampl�a
## 19476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    amserlen
## 19477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   amsterdam
## 19478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        an18
## 19479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 anaesthetic
## 19480                                                                                                                                                                                                                                                                                                                                                                                                                                                                               anaesthetists
## 19481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    analysed
## 19482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anarchy
## 19483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anchors
## 19484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ancient
## 19485                                                                                                                                                                                                                                                                                                                                                                                                                                                       andor<u+0001f496>love<u+2b07><u+fe0f>
## 19486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      andrea
## 19487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     android
## 19488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                andromache05
## 19489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      andros
## 19490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    andwe�re
## 19491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       angel
## 19492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      angela
## 19493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       anger
## 19494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       angie
## 19495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   angiogram
## 19496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anglers
## 19497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anglia
## 19498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  animations
## 19499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anipals
## 19500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       anita
## 19501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        anna
## 19502                                                                                                                                                                                                                                                                                                                                                                                                                                                                             anniversarywith
## 19503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  announcing
## 19504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anonimo
## 19505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anosmia
## 19506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        anpr
## 19507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ansawdd
## 19508                                                                                                                                                                                                                                                                                                                                                                                                                                                                  answerquestionscoronavirus
## 19509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ante
## 19510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anther
## 19511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                anthropocene
## 19512                                                                                                                                                                                                                                                                                                                                                                                                                                                                               antibacterial
## 19513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 antibiotics
## 19514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   antibody+
## 19515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  antichrist
## 19516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      antifa
## 19517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     antigen
## 19518                                                                                                                                                                                                                                                                                                                                                                                                                                                                              antigovernment
## 19519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  antiracism
## 19520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  antiracsim
## 19521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     antivax
## 19522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 antivaxxers
## 19523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   antiviral
## 19524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     antonio
## 19525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anxiaty
## 19526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        anya
## 19527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anyones
## 19528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    anyone�s
## 19529                                                                                                                                                                                                                                                                                                                                                                                                                                                                anythingleaveitonthedoorstep
## 19530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   anythings
## 19531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aos
## 19532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ap
## 19533                                                                                                                                                                                                                                                                                                                                                                                                                                           ap<u+03bf>te<u+03bb>es�at<u+03b9><u+03ba><u+03ae>
## 19534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     apabila
## 19535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   apartment
## 19536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      apart�
## 19537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    apertura
## 19538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        apex
## 19539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     aphthos
## 19540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    aplausos
## 19541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  apocalypse
## 19542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 apocolyptic
## 19543                                                                                                                                                                                                                                                                                                                                                                                                                                                                            apologisingnever
## 19544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   apologist
## 19545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   apologize
## 19546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   apositive
## 19547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      apoyar
## 19548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    appalled
## 19549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   apparatus
## 19550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    apparent
## 19551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   appealing
## 19552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  appearance
## 19553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   appearing
## 19554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     applaud
## 19555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      apples
## 19556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  applicants
## 19557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     applies
## 19558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     appoint
## 19559                                                                                                                                                                                                                                                                                                                                                                                                                                                                             appointmentonly
## 19560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                apportioning
## 19561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                appreciative
## 19562                                                                                                                                                                                                                                                                                                                                                                                                                                                                              apprenticeship
## 19563                                                                                                                                                                                                                                                                                                                                                                                                                                                                               appropriately
## 19564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      approx
## 19565                                                                                                                                                                                                                                                                                                                                                                                                                                                                               approximately
## 19566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   appualing
## 19567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  april�2020
## 19568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aqua
## 19569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aran
## 19570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arcade
## 19571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 archaeology
## 19572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   archivist
## 19573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  archivists
## 19574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ardern
## 19575                                                                                                                                                                                                                                                                                                                                                                                                                                                                             are<u+0001f616>
## 19576                                                                                                                                                                                                                                                                                                                                                                                                                     are<u+0001f926><u+0001f3fc><u+200d><u+2640><u+fe0f><u+0001f970>actually
## 19577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       area�
## 19578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arena
## 19579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arethe
## 19580                                                                                                                                                                                                                                                                                                                                                                                                                                                                        are�17m�undiscovered
## 19581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       argar
## 19582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   argentina
## 19583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      argued
## 19584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arising
## 19585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arlene
## 19586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arlming
## 19587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      armada
## 19588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     armenia
## 19589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     armoury
## 19590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arnt
## 19591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   arranging
## 19592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arras�
## 19593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       array
## 19594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   arresting
## 19595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    arrivals
## 19596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arrive
## 19597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arrives
## 19598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    arriving
## 19599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   arrogance
## 19600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arrr
## 19601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  arruinaste
## 19602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arrving
## 19603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   arseholes
## 19604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arses
## 19605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    artbandb
## 19606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    arterial
## 19607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    arteries
## 19608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   arthritis
## 19609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    articles
## 19610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 articulated
## 19611                                                                                                                                                                                                                                                                                                                                                                                                                                                                      artificialintelligence
## 19612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    artistdj
## 19613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   arundhati
## 19614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   asapcovid
## 19615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ascertain
## 19616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ascot�s
## 19617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         asf
## 19618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ashington
## 19619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ashley
## 19620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ashore
## 19621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ashworth�s
## 19622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      asians
## 19623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        asif
## 19624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                asparaginase
## 19625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aspect
## 19626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       asper
## 19627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    aspiring
## 19628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   assassins
## 19629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    assaults
## 19630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   assesment
## 19631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    assesors
## 19632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       asset
## 19633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      assist
## 19634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    assisted
## 19635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   assisting
## 19636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     assist�
## 19637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   associate
## 19638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  associates
## 19639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        asst
## 19640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     assumed
## 19641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    assuming
## 19642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  assumption
## 19643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 assumptions
## 19644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      assure
## 19645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  assurities
## 19646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      astazi
## 19647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      asthma
## 19648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   asthmatic
## 19649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   astounded
## 19650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   astudio�r
## 19651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  asymptotic
## 19652                                                                                                                                                                                                                                                                                                                                                                                                                                                               at<u+0001f1fa><u+0001f1f8>usa
## 19653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      atarse
## 19654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ate
## 19655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    atherton
## 19656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    athletes
## 19657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   athletes�
## 19658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ati
## 19659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    atletico
## 19660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         atm
## 19661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 atmanirbhar
## 19662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  atmosphere
## 19663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  atrocities
## 19664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attached
## 19665                                                                                                                                                                                                                                                                                                                                                                                                                                                                              attackedpeople
## 19666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     attacks
## 19667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   attempted
## 19668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  attraction
## 19669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  attributed
## 19670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         at�
## 19671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          au
## 19672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  aubamayeng
## 19673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    audacity
## 19674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    audibhas
## 19675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   audiology
## 19676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        auld
## 19677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aunt
## 19678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      auntie
## 19679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     austens
## 19680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     austria
## 19681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  authorised
## 19682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 authorities
## 19683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      autism
## 19684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        auto
## 19685                                                                                                                                                                                                                                                                                                                                                                                                                                                                               automatically
## 19686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   autoreply
## 19687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   autorit�s
## 19688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aux
## 19689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     auxilia
## 19690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ava
## 19691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  available�
## 19692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    availble
## 19693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         avc
## 19694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    averaged
## 19695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    averages
## 19696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       avery
## 19697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        avid
## 19698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aviod
## 19699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aviso
## 19700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    avocados
## 19701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   avoidance
## 19702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      avowed
## 19703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     awaited
## 19704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    awaiting
## 19705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      awakes
## 19706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   awardthey
## 19707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                awardwinning
## 19708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                awayremember
## 19709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      awgrym
## 19710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        awry
## 19711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ayer
## 19712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   aylestone
## 19713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ayrshire
## 19714                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ayuntamientos
## 19715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 azacitidine
## 19716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  azerbaijan
## 19717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          a�
## 19718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     a�level
## 19719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        a�os
## 19720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    a�public
## 19721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         a��
## 19722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ba
## 19723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        babe
## 19724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      babies
## 19725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    backdrop
## 19726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 background�
## 19727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    backroom
## 19728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   backsides
## 19729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                backslapping
## 19730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 backslidden
## 19731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    backward
## 19732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   backwards
## 19733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    badenoch
## 19734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      badges
## 19735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   badlyjust
## 19736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bad�
## 19737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                baftawinning
## 19738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bag
## 19739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bagsthis
## 19740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bail
## 19741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bailed
## 19742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bailouts
## 19743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bairns
## 19744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bajar
## 19745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      baking
## 19746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     balcony
## 19747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     baldies
## 19748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    baldness
## 19749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      balham
## 19750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ball
## 19751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ballet
## 19752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    balloons
## 19753                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ballymacarrett
## 19754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      baltic
## 19755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     baltics
## 19756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bamako
## 19757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    banality
## 19758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bandara
## 19759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bands
## 19760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bandwagon
## 19761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bang
## 19762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bankrupt
## 19763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                bankruptcies
## 19764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bank�
## 19765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      banner
## 19766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bans
## 19767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      banter
## 19768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bantuan
## 19769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      banyak
## 19770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     baqarah
## 19771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      barata
## 19772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      barbed
## 19773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   barbicide
## 19774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bare
## 19775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bargain
## 19776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bargains
## 19777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      barker
## 19778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       barmy
## 19779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      barnes
## 19780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      barnet
## 19781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    barnlaus
## 19782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    barnsley
## 19783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      barren
## 19784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   barrett�s
## 19785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      barrow
## 19786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       barry
## 19787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bartlett
## 19788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    basement
## 19789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bashing
## 19790                                                                                                                                                                                                                                                                                                                                                                                                                                                                           basis<u+0001f632>
## 19791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      basket
## 19792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bastard
## 19793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bastion
## 19794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bataille
## 19795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bated
## 19796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bath
## 19797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  batmobiles
## 19798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bats
## 19799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    battered
## 19800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   batteries
## 19801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   battering
## 19802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     battery
## 19803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     batting
## 19804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                battletaylor
## 19805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bayoh
## 19806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  bb<u+0421>
## 19807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bbc1
## 19808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bbcnews
## 19809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                bbcnewsnight
## 19810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bbcwill
## 19811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bbqs
## 19812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bcb
## 19813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bcca
## 19814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bcs
## 19815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bd
## 19816                                                                                                                                                                                                                                                                                                                                                                                                                                          be<u+0001f44d><u+0001f44f><u+0001f914><u+0001f499>
## 19817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    beachers
## 19818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    beachshe
## 19819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        beap
## 19820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       beard
## 19821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bearers
## 19822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   beartopia
## 19823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        beas
## 19824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        beau
## 19825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 beautifully
## 19826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   beckenham
## 19827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     beckons
## 19828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       becky
## 19829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   becomethe
## 19830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  bedminster
## 19831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bedroom
## 19832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        beds
## 19833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 beds�turned
## 19834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bed�
## 19835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       been�
## 19836                                                                                                                                                                                                                                                                                                                                                                                                                                                                             beforetherefore
## 19837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     beggars
## 19838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    begining
## 19839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   beginners
## 19840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      behave
## 19841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 behavioural
## 19842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      behold
## 19843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      belair
## 19844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    believes
## 19845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bellicose
## 19846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bellum
## 19847                                                                                                                                                                                                                                                                                                                                                                                                                                                                           below<u+0001f447>
## 19848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  bemusement
## 19849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ben
## 19850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      benar2
## 19851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bench
## 19852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     benches
## 19853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bend
## 19854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bended
## 19855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bender
## 19856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 benefactors
## 19857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 beneficiary
## 19858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  benefitted
## 19859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bengal
## 19860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      benign
## 19861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        benn
## 19862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       benny
## 19863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bent
## 19864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  bentwaters
## 19865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   berdampak
## 19866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      berlin
## 19867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      besoin
## 19868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bestand
## 19869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                bestdesigned
## 19870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       best�
## 19871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    betrayal
## 19872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     better�
## 19873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       betty
## 19874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beware
## 19875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bewhat
## 19876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     beyond�
## 19877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 bhaktpuppet
## 19878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bhatty
## 19879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bhunas
## 19880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bias
## 19881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      biased
## 19882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  bickington
## 19883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bicycles
## 19884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      biggly
## 19885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bikesafe
## 19886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                billionaires
## 19887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    billions
## 19888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       billy
## 19889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     binary�
## 19890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bine
## 19891                                                                                                                                                                                                                                                                                                                                                                                                                                                                 bio<u+0001f446><u+0001f3fe>
## 19892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                bioenergetic
## 19893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                biologically
## 19894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   biologics
## 19895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     biology
## 19896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  biopharmas
## 19897                                                                                                                                                                                                                                                                                                                                                                                                                                                                               biostatistics
## 19898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       birds
## 19899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      birnie
## 19900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 birthdayour
## 19901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      births
## 19902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    biscuits
## 19903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bitch
## 19904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bits
## 19905                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bits<u+0001f622><u+2764>
## 19906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bitter
## 19907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 bittersweet
## 19908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bizarre
## 19909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bizarrely
## 19910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bjs
## 19911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bl
## 19912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    blackall
## 19913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   blackburn
## 19914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blames
## 19915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blame�
## 19916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blas�
## 19917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     blatant
## 19918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bleach
## 19919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bleat
## 19920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bleating
## 19921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bleeder
## 19922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bleeds
## 19923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   blessings
## 19924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     blether
## 19925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blip
## 19926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bliss
## 19927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     blocked
## 19928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                blog<u+2066>
## 19929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     blogger
## 19930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blogs
## 19931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blokes
## 19932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bloods
## 19933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bloor
## 19934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     blowing
## 19935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blown
## 19936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blows
## 19937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blowy
## 19938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bls
## 19939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     blunder
## 19940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     blurred
## 19941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blush
## 19942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bluster
## 19943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    blusters
## 19944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     boarded
## 19945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    boarders
## 19946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    boarding
## 19947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      boards
## 19948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     boasted
## 19949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       boats
## 19950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bobl
## 19951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bocboc
## 19952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bodied
## 19953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      boeing
## 19954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bog
## 19955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     boggles
## 19956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bogs
## 19957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      boiled
## 19958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  bolashodun
## 19959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bolder
## 19960                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bollocksborisjohnson
## 19961                                                                                                                                                                                                                                                                                                                                                                                                                                                                               bolsonaristas
## 19962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bolsonaro
## 19963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 bolsonaro�s
## 19964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bolt
## 19965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bolton
## 19966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bombing
## 19967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bonding
## 19968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bonehill
## 19969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bonfire
## 19970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bonnet
## 19971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bonnie
## 19972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bonus
## 19973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     booklet
## 19974                                                                                                                                                                                                                                                                                                                                                                                                                                                                            boom<u+0001f4a5>
## 19975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     boosted
## 19976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    boosting
## 19977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        boot
## 19978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       boots
## 19979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      boozer
## 19980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  borderline
## 19981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    borglike
## 19982                                                                                                                                                                                                                                                                                                                                                                                                                    boris<u+0001f64b><u+0001f3fc><u+200d><u+2640><u+fe0f><u+0001f973>covid19
## 19983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                borisjohnson
## 19984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      boriss
## 19985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        born
## 19986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   borough�s
## 19987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      borris
## 19988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      borrow
## 19989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   borrowing
## 19990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      boston
## 19991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bot
## 19992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     botanic
## 19993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     botched
## 19994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bother
## 19995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bothers
## 19996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     botones
## 19997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    botswana
## 19998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bottled
## 19999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bottles
##          n total         freq
## 1     2884 70067 4.116060e-02
## 2     2570 53016 4.847593e-02
## 3      889 70067 1.268786e-02
## 4      797 70067 1.137483e-02
## 5      644 53016 1.214728e-02
## 6      568 16547 3.432646e-02
## 7      541 70067 7.721181e-03
## 8      442 53016 8.337106e-03
## 9      405 53016 7.639203e-03
## 10     384 53016 7.243096e-03
## 11     383 16547 2.314619e-02
## 12     364 70067 5.195028e-03
## 13     333 53016 6.281123e-03
## 14     270 53016 5.092802e-03
## 15     243 70067 3.468109e-03
## 16     239 53016 4.508073e-03
## 17     220 70067 3.139852e-03
## 18     217 70067 3.097036e-03
## 19     216 70067 3.082764e-03
## 20     215 53016 4.055380e-03
## 21     213 70067 3.039947e-03
## 22     208 53016 3.923344e-03
## 23     207 70067 2.954315e-03
## 24     198 70067 2.825867e-03
## 25     194 16547 1.172418e-02
## 26     183 70067 2.611786e-03
## 27     174 53016 3.282028e-03
## 28     168 53016 3.168855e-03
## 29     165 53016 3.112268e-03
## 30     163 53016 3.074544e-03
## 31     162 53016 3.055681e-03
## 32     160 53016 3.017957e-03
## 33     159 70067 2.269257e-03
## 34     158 53016 2.980232e-03
## 35     157 70067 2.240712e-03
## 36     154 53016 2.904783e-03
## 37     151 53016 2.848197e-03
## 38     150 70067 2.140808e-03
## 39     145 70067 2.069448e-03
## 40     141 70067 2.012360e-03
## 41     139 70067 1.983815e-03
## 42     135 70067 1.926727e-03
## 43     135 53016 2.546401e-03
## 44     132 53016 2.489814e-03
## 45     131 53016 2.470952e-03
## 46     129 70067 1.841095e-03
## 47     129 70067 1.841095e-03
## 48     129 70067 1.841095e-03
## 49     127 70067 1.812551e-03
## 50     121 53016 2.282330e-03
## 51     120 70067 1.712646e-03
## 52     120 70067 1.712646e-03
## 53     118 70067 1.684102e-03
## 54     118 53016 2.225743e-03
## 55     118 16547 7.131202e-03
## 56     116 70067 1.655558e-03
## 57     115 53016 2.169156e-03
## 58     115 53016 2.169156e-03
## 59     114 70067 1.627014e-03
## 60     113 53016 2.131432e-03
## 61     112 70067 1.598470e-03
## 62     112 53016 2.112570e-03
## 63     111 70067 1.584198e-03
## 64     110 53016 2.074845e-03
## 65     110 53016 2.074845e-03
## 66     110 53016 2.074845e-03
## 67     108 70067 1.541382e-03
## 68     108 53016 2.037121e-03
## 69     105 70067 1.498566e-03
## 70     104 70067 1.484294e-03
## 71     104 70067 1.484294e-03
## 72     104 53016 1.961672e-03
## 73     104 53016 1.961672e-03
## 74     103 70067 1.470022e-03
## 75     103 70067 1.470022e-03
## 76     102 53016 1.923947e-03
## 77     101 70067 1.441477e-03
## 78     101 70067 1.441477e-03
## 79     101 70067 1.441477e-03
## 80     100 70067 1.427205e-03
## 81      97 70067 1.384389e-03
## 82      96 70067 1.370117e-03
## 83      92 53016 1.735325e-03
## 84      92 53016 1.735325e-03
## 85      89 70067 1.270213e-03
## 86      88 70067 1.255941e-03
## 87      88 53016 1.659876e-03
## 88      87 70067 1.241669e-03
## 89      87 70067 1.241669e-03
## 90      87 70067 1.241669e-03
## 91      86 70067 1.227397e-03
## 92      85 70067 1.213125e-03
## 93      85 53016 1.603290e-03
## 94      84 53016 1.584427e-03
## 95      83 70067 1.184580e-03
## 96      82 70067 1.170308e-03
## 97      82 53016 1.546703e-03
## 98      82 16547 4.955581e-03
## 99      81 70067 1.156036e-03
## 100     81 53016 1.527841e-03
## 101     80 70067 1.141764e-03
## 102     80 53016 1.508978e-03
## 103     79 53016 1.490116e-03
## 104     79 53016 1.490116e-03
## 105     78 70067 1.113220e-03
## 106     78 53016 1.471254e-03
## 107     78 53016 1.471254e-03
## 108     78 53016 1.471254e-03
## 109     78 53016 1.471254e-03
## 110     78 53016 1.471254e-03
## 111     77 70067 1.098948e-03
## 112     77 70067 1.098948e-03
## 113     76 70067 1.084676e-03
## 114     76 53016 1.433530e-03
## 115     75 70067 1.070404e-03
## 116     74 70067 1.056132e-03
## 117     73 70067 1.041860e-03
## 118     73 53016 1.376943e-03
## 119     72 70067 1.027588e-03
## 120     72 53016 1.358081e-03
## 121     72 53016 1.358081e-03
## 122     70 70067 9.990438e-04
## 123     70 70067 9.990438e-04
## 124     70 53016 1.320356e-03
## 125     69 70067 9.847717e-04
## 126     69 70067 9.847717e-04
## 127     69 70067 9.847717e-04
## 128     69 53016 1.301494e-03
## 129     69 16547 4.169940e-03
## 130     68 53016 1.282632e-03
## 131     68 53016 1.282632e-03
## 132     67 70067 9.562276e-04
## 133     67 70067 9.562276e-04
## 134     67 53016 1.263769e-03
## 135     67 53016 1.263769e-03
## 136     66 70067 9.419556e-04
## 137     66 70067 9.419556e-04
## 138     66 70067 9.419556e-04
## 139     66 53016 1.244907e-03
## 140     65 70067 9.276835e-04
## 141     65 70067 9.276835e-04
## 142     65 53016 1.226045e-03
## 143     65 53016 1.226045e-03
## 144     65 53016 1.226045e-03
## 145     65 53016 1.226045e-03
## 146     63 70067 8.991394e-04
## 147     63 53016 1.188321e-03
## 148     62 70067 8.848673e-04
## 149     62 70067 8.848673e-04
## 150     62 70067 8.848673e-04
## 151     62 53016 1.169458e-03
## 152     62 53016 1.169458e-03
## 153     61 70067 8.705953e-04
## 154     61 70067 8.705953e-04
## 155     61 53016 1.150596e-03
## 156     61 53016 1.150596e-03
## 157     60 70067 8.563232e-04
## 158     60 70067 8.563232e-04
## 159     60 70067 8.563232e-04
## 160     60 70067 8.563232e-04
## 161     60 16547 3.626035e-03
## 162     60 16547 3.626035e-03
## 163     59 70067 8.420512e-04
## 164     59 53016 1.112872e-03
## 165     59 53016 1.112872e-03
## 166     58 70067 8.277791e-04
## 167     58 70067 8.277791e-04
## 168     58 70067 8.277791e-04
## 169     57 70067 8.135071e-04
## 170     57 53016 1.075147e-03
## 171     56 70067 7.992350e-04
## 172     56 70067 7.992350e-04
## 173     56 70067 7.992350e-04
## 174     56 53016 1.056285e-03
## 175     56 53016 1.056285e-03
## 176     56 53016 1.056285e-03
## 177     56 53016 1.056285e-03
## 178     56 16547 3.384299e-03
## 179     55 70067 7.849630e-04
## 180     55 70067 7.849630e-04
## 181     55 53016 1.037423e-03
## 182     55 16547 3.323865e-03
## 183     54 70067 7.706909e-04
## 184     54 70067 7.706909e-04
## 185     54 70067 7.706909e-04
## 186     54 70067 7.706909e-04
## 187     54 53016 1.018560e-03
## 188     54 53016 1.018560e-03
## 189     54 53016 1.018560e-03
## 190     53 70067 7.564189e-04
## 191     53 70067 7.564189e-04
## 192     53 70067 7.564189e-04
## 193     53 70067 7.564189e-04
## 194     52 70067 7.421468e-04
## 195     52 70067 7.421468e-04
## 196     52 70067 7.421468e-04
## 197     52 70067 7.421468e-04
## 198     52 53016 9.808360e-04
## 199     52 53016 9.808360e-04
## 200     52 16547 3.142564e-03
## 201     51 70067 7.278747e-04
## 202     51 70067 7.278747e-04
## 203     51 70067 7.278747e-04
## 204     51 53016 9.619737e-04
## 205     50 70067 7.136027e-04
## 206     50 70067 7.136027e-04
## 207     50 70067 7.136027e-04
## 208     50 70067 7.136027e-04
## 209     50 70067 7.136027e-04
## 210     50 53016 9.431115e-04
## 211     50 53016 9.431115e-04
## 212     50 53016 9.431115e-04
## 213     49 70067 6.993306e-04
## 214     49 70067 6.993306e-04
## 215     49 70067 6.993306e-04
## 216     49 70067 6.993306e-04
## 217     49 70067 6.993306e-04
## 218     49 70067 6.993306e-04
## 219     48 70067 6.850586e-04
## 220     48 53016 9.053871e-04
## 221     48 53016 9.053871e-04
## 222     48 53016 9.053871e-04
## 223     48 53016 9.053871e-04
## 224     48 16547 2.900828e-03
## 225     47 70067 6.707865e-04
## 226     47 70067 6.707865e-04
## 227     47 70067 6.707865e-04
## 228     47 70067 6.707865e-04
## 229     47 70067 6.707865e-04
## 230     47 16547 2.840394e-03
## 231     46 70067 6.565145e-04
## 232     46 70067 6.565145e-04
## 233     46 70067 6.565145e-04
## 234     46 70067 6.565145e-04
## 235     45 70067 6.422424e-04
## 236     45 70067 6.422424e-04
## 237     45 70067 6.422424e-04
## 238     45 70067 6.422424e-04
## 239     45 70067 6.422424e-04
## 240     45 53016 8.488004e-04
## 241     45 16547 2.719526e-03
## 242     44 70067 6.279704e-04
## 243     44 70067 6.279704e-04
## 244     44 70067 6.279704e-04
## 245     44 70067 6.279704e-04
## 246     44 70067 6.279704e-04
## 247     44 70067 6.279704e-04
## 248     44 53016 8.299381e-04
## 249     44 53016 8.299381e-04
## 250     44 53016 8.299381e-04
## 251     44 53016 8.299381e-04
## 252     44 53016 8.299381e-04
## 253     44 16547 2.659092e-03
## 254     44 16547 2.659092e-03
## 255     43 70067 6.136983e-04
## 256     43 70067 6.136983e-04
## 257     43 70067 6.136983e-04
## 258     43 70067 6.136983e-04
## 259     43 70067 6.136983e-04
## 260     43 70067 6.136983e-04
## 261     43 53016 8.110759e-04
## 262     43 53016 8.110759e-04
## 263     43 53016 8.110759e-04
## 264     43 53016 8.110759e-04
## 265     43 53016 8.110759e-04
## 266     43 53016 8.110759e-04
## 267     43 16547 2.598658e-03
## 268     43 16547 2.598658e-03
## 269     42 70067 5.994263e-04
## 270     42 70067 5.994263e-04
## 271     42 70067 5.994263e-04
## 272     42 70067 5.994263e-04
## 273     42 70067 5.994263e-04
## 274     42 70067 5.994263e-04
## 275     42 70067 5.994263e-04
## 276     42 70067 5.994263e-04
## 277     42 70067 5.994263e-04
## 278     42 53016 7.922137e-04
## 279     42 53016 7.922137e-04
## 280     42 53016 7.922137e-04
## 281     42 53016 7.922137e-04
## 282     42 53016 7.922137e-04
## 283     41 70067 5.851542e-04
## 284     41 70067 5.851542e-04
## 285     41 70067 5.851542e-04
## 286     41 70067 5.851542e-04
## 287     41 53016 7.733514e-04
## 288     41 53016 7.733514e-04
## 289     41 53016 7.733514e-04
## 290     41 53016 7.733514e-04
## 291     40 70067 5.708822e-04
## 292     40 70067 5.708822e-04
## 293     40 70067 5.708822e-04
## 294     40 70067 5.708822e-04
## 295     40 70067 5.708822e-04
## 296     40 70067 5.708822e-04
## 297     40 70067 5.708822e-04
## 298     40 70067 5.708822e-04
## 299     40 70067 5.708822e-04
## 300     40 70067 5.708822e-04
## 301     40 70067 5.708822e-04
## 302     40 53016 7.544892e-04
## 303     40 53016 7.544892e-04
## 304     40 53016 7.544892e-04
## 305     40 53016 7.544892e-04
## 306     40 53016 7.544892e-04
## 307     40 16547 2.417357e-03
## 308     40 16547 2.417357e-03
## 309     39 70067 5.566101e-04
## 310     39 70067 5.566101e-04
## 311     39 70067 5.566101e-04
## 312     39 70067 5.566101e-04
## 313     39 70067 5.566101e-04
## 314     39 70067 5.566101e-04
## 315     39 70067 5.566101e-04
## 316     39 70067 5.566101e-04
## 317     39 70067 5.566101e-04
## 318     39 53016 7.356270e-04
## 319     39 53016 7.356270e-04
## 320     39 53016 7.356270e-04
## 321     39 53016 7.356270e-04
## 322     39 53016 7.356270e-04
## 323     39 53016 7.356270e-04
## 324     39 53016 7.356270e-04
## 325     39 53016 7.356270e-04
## 326     39 16547 2.356923e-03
## 327     38 70067 5.423380e-04
## 328     38 70067 5.423380e-04
## 329     38 70067 5.423380e-04
## 330     38 70067 5.423380e-04
## 331     38 70067 5.423380e-04
## 332     38 70067 5.423380e-04
## 333     38 53016 7.167648e-04
## 334     38 53016 7.167648e-04
## 335     38 53016 7.167648e-04
## 336     38 53016 7.167648e-04
## 337     38 16547 2.296489e-03
## 338     37 70067 5.280660e-04
## 339     37 70067 5.280660e-04
## 340     37 70067 5.280660e-04
## 341     37 70067 5.280660e-04
## 342     37 70067 5.280660e-04
## 343     37 70067 5.280660e-04
## 344     37 70067 5.280660e-04
## 345     37 70067 5.280660e-04
## 346     37 70067 5.280660e-04
## 347     37 70067 5.280660e-04
## 348     37 53016 6.979025e-04
## 349     37 53016 6.979025e-04
## 350     37 53016 6.979025e-04
## 351     37 53016 6.979025e-04
## 352     37 53016 6.979025e-04
## 353     37 16547 2.236055e-03
## 354     36 70067 5.137939e-04
## 355     36 70067 5.137939e-04
## 356     36 70067 5.137939e-04
## 357     36 70067 5.137939e-04
## 358     36 70067 5.137939e-04
## 359     36 70067 5.137939e-04
## 360     36 70067 5.137939e-04
## 361     36 53016 6.790403e-04
## 362     36 53016 6.790403e-04
## 363     36 53016 6.790403e-04
## 364     36 53016 6.790403e-04
## 365     36 16547 2.175621e-03
## 366     35 70067 4.995219e-04
## 367     35 70067 4.995219e-04
## 368     35 70067 4.995219e-04
## 369     35 70067 4.995219e-04
## 370     35 70067 4.995219e-04
## 371     35 70067 4.995219e-04
## 372     35 70067 4.995219e-04
## 373     35 53016 6.601781e-04
## 374     35 53016 6.601781e-04
## 375     35 53016 6.601781e-04
## 376     35 53016 6.601781e-04
## 377     35 16547 2.115187e-03
## 378     35 16547 2.115187e-03
## 379     34 70067 4.852498e-04
## 380     34 70067 4.852498e-04
## 381     34 70067 4.852498e-04
## 382     34 70067 4.852498e-04
## 383     34 70067 4.852498e-04
## 384     34 70067 4.852498e-04
## 385     34 70067 4.852498e-04
## 386     34 53016 6.413158e-04
## 387     34 53016 6.413158e-04
## 388     34 53016 6.413158e-04
## 389     34 53016 6.413158e-04
## 390     34 53016 6.413158e-04
## 391     34 53016 6.413158e-04
## 392     34 16547 2.054753e-03
## 393     33 70067 4.709778e-04
## 394     33 70067 4.709778e-04
## 395     33 70067 4.709778e-04
## 396     33 70067 4.709778e-04
## 397     33 70067 4.709778e-04
## 398     33 70067 4.709778e-04
## 399     33 70067 4.709778e-04
## 400     33 70067 4.709778e-04
## 401     33 70067 4.709778e-04
## 402     33 70067 4.709778e-04
## 403     33 53016 6.224536e-04
## 404     33 53016 6.224536e-04
## 405     33 53016 6.224536e-04
## 406     33 53016 6.224536e-04
## 407     33 53016 6.224536e-04
## 408     32 70067 4.567057e-04
## 409     32 70067 4.567057e-04
## 410     32 70067 4.567057e-04
## 411     32 70067 4.567057e-04
## 412     32 70067 4.567057e-04
## 413     32 70067 4.567057e-04
## 414     32 70067 4.567057e-04
## 415     32 70067 4.567057e-04
## 416     32 70067 4.567057e-04
## 417     32 70067 4.567057e-04
## 418     32 70067 4.567057e-04
## 419     32 53016 6.035914e-04
## 420     32 53016 6.035914e-04
## 421     32 53016 6.035914e-04
## 422     32 53016 6.035914e-04
## 423     32 53016 6.035914e-04
## 424     32 16547 1.933885e-03
## 425     31 70067 4.424337e-04
## 426     31 70067 4.424337e-04
## 427     31 70067 4.424337e-04
## 428     31 70067 4.424337e-04
## 429     31 70067 4.424337e-04
## 430     31 70067 4.424337e-04
## 431     31 70067 4.424337e-04
## 432     31 70067 4.424337e-04
## 433     31 70067 4.424337e-04
## 434     31 70067 4.424337e-04
## 435     31 70067 4.424337e-04
## 436     31 70067 4.424337e-04
## 437     31 70067 4.424337e-04
## 438     31 70067 4.424337e-04
## 439     31 70067 4.424337e-04
## 440     31 70067 4.424337e-04
## 441     31 70067 4.424337e-04
## 442     31 70067 4.424337e-04
## 443     31 70067 4.424337e-04
## 444     31 70067 4.424337e-04
## 445     31 70067 4.424337e-04
## 446     31 53016 5.847291e-04
## 447     31 53016 5.847291e-04
## 448     31 53016 5.847291e-04
## 449     31 53016 5.847291e-04
## 450     31 53016 5.847291e-04
## 451     31 53016 5.847291e-04
## 452     31 53016 5.847291e-04
## 453     31 16547 1.873451e-03
## 454     31 16547 1.873451e-03
## 455     30 70067 4.281616e-04
## 456     30 70067 4.281616e-04
## 457     30 70067 4.281616e-04
## 458     30 70067 4.281616e-04
## 459     30 70067 4.281616e-04
## 460     30 70067 4.281616e-04
## 461     30 70067 4.281616e-04
## 462     30 70067 4.281616e-04
## 463     30 70067 4.281616e-04
## 464     30 70067 4.281616e-04
## 465     30 70067 4.281616e-04
## 466     30 70067 4.281616e-04
## 467     30 53016 5.658669e-04
## 468     30 53016 5.658669e-04
## 469     30 53016 5.658669e-04
## 470     30 53016 5.658669e-04
## 471     30 53016 5.658669e-04
## 472     30 53016 5.658669e-04
## 473     30 53016 5.658669e-04
## 474     30 53016 5.658669e-04
## 475     30 53016 5.658669e-04
## 476     30 53016 5.658669e-04
## 477     30 53016 5.658669e-04
## 478     30 53016 5.658669e-04
## 479     30 53016 5.658669e-04
## 480     30 16547 1.813017e-03
## 481     30 16547 1.813017e-03
## 482     29 70067 4.138896e-04
## 483     29 70067 4.138896e-04
## 484     29 70067 4.138896e-04
## 485     29 70067 4.138896e-04
## 486     29 70067 4.138896e-04
## 487     29 70067 4.138896e-04
## 488     29 70067 4.138896e-04
## 489     29 70067 4.138896e-04
## 490     29 70067 4.138896e-04
## 491     29 70067 4.138896e-04
## 492     29 70067 4.138896e-04
## 493     29 70067 4.138896e-04
## 494     29 70067 4.138896e-04
## 495     29 70067 4.138896e-04
## 496     29 70067 4.138896e-04
## 497     29 70067 4.138896e-04
## 498     29 70067 4.138896e-04
## 499     29 53016 5.470047e-04
## 500     29 53016 5.470047e-04
## 501     29 53016 5.470047e-04
## 502     29 53016 5.470047e-04
## 503     29 53016 5.470047e-04
## 504     29 53016 5.470047e-04
## 505     29 53016 5.470047e-04
## 506     29 53016 5.470047e-04
## 507     29 53016 5.470047e-04
## 508     29 53016 5.470047e-04
## 509     29 53016 5.470047e-04
## 510     29 16547 1.752584e-03
## 511     29 16547 1.752584e-03
## 512     28 70067 3.996175e-04
## 513     28 70067 3.996175e-04
## 514     28 70067 3.996175e-04
## 515     28 70067 3.996175e-04
## 516     28 70067 3.996175e-04
## 517     28 70067 3.996175e-04
## 518     28 70067 3.996175e-04
## 519     28 70067 3.996175e-04
## 520     28 70067 3.996175e-04
## 521     28 70067 3.996175e-04
## 522     28 53016 5.281424e-04
## 523     28 53016 5.281424e-04
## 524     28 53016 5.281424e-04
## 525     28 53016 5.281424e-04
## 526     28 53016 5.281424e-04
## 527     28 53016 5.281424e-04
## 528     28 53016 5.281424e-04
## 529     28 53016 5.281424e-04
## 530     28 53016 5.281424e-04
## 531     28 53016 5.281424e-04
## 532     28 16547 1.692150e-03
## 533     27 70067 3.853455e-04
## 534     27 70067 3.853455e-04
## 535     27 70067 3.853455e-04
## 536     27 70067 3.853455e-04
## 537     27 70067 3.853455e-04
## 538     27 70067 3.853455e-04
## 539     27 70067 3.853455e-04
## 540     27 70067 3.853455e-04
## 541     27 70067 3.853455e-04
## 542     27 70067 3.853455e-04
## 543     27 70067 3.853455e-04
## 544     27 70067 3.853455e-04
## 545     27 70067 3.853455e-04
## 546     27 70067 3.853455e-04
## 547     27 70067 3.853455e-04
## 548     27 70067 3.853455e-04
## 549     27 70067 3.853455e-04
## 550     27 70067 3.853455e-04
## 551     27 70067 3.853455e-04
## 552     27 70067 3.853455e-04
## 553     27 70067 3.853455e-04
## 554     27 53016 5.092802e-04
## 555     27 53016 5.092802e-04
## 556     27 53016 5.092802e-04
## 557     27 53016 5.092802e-04
## 558     27 53016 5.092802e-04
## 559     27 53016 5.092802e-04
## 560     27 53016 5.092802e-04
## 561     27 53016 5.092802e-04
## 562     27 53016 5.092802e-04
## 563     27 53016 5.092802e-04
## 564     27 53016 5.092802e-04
## 565     27 53016 5.092802e-04
## 566     27 53016 5.092802e-04
## 567     27 53016 5.092802e-04
## 568     27 16547 1.631716e-03
## 569     27 16547 1.631716e-03
## 570     27 16547 1.631716e-03
## 571     26 70067 3.710734e-04
## 572     26 70067 3.710734e-04
## 573     26 70067 3.710734e-04
## 574     26 70067 3.710734e-04
## 575     26 70067 3.710734e-04
## 576     26 70067 3.710734e-04
## 577     26 70067 3.710734e-04
## 578     26 70067 3.710734e-04
## 579     26 70067 3.710734e-04
## 580     26 70067 3.710734e-04
## 581     26 70067 3.710734e-04
## 582     26 70067 3.710734e-04
## 583     26 70067 3.710734e-04
## 584     26 70067 3.710734e-04
## 585     26 70067 3.710734e-04
## 586     26 70067 3.710734e-04
## 587     26 70067 3.710734e-04
## 588     26 70067 3.710734e-04
## 589     26 70067 3.710734e-04
## 590     26 70067 3.710734e-04
## 591     26 70067 3.710734e-04
## 592     26 70067 3.710734e-04
## 593     26 70067 3.710734e-04
## 594     26 70067 3.710734e-04
## 595     26 70067 3.710734e-04
## 596     26 70067 3.710734e-04
## 597     26 53016 4.904180e-04
## 598     26 53016 4.904180e-04
## 599     26 53016 4.904180e-04
## 600     26 53016 4.904180e-04
## 601     26 53016 4.904180e-04
## 602     26 53016 4.904180e-04
## 603     26 53016 4.904180e-04
## 604     26 53016 4.904180e-04
## 605     26 53016 4.904180e-04
## 606     26 53016 4.904180e-04
## 607     26 53016 4.904180e-04
## 608     26 53016 4.904180e-04
## 609     26 53016 4.904180e-04
## 610     26 53016 4.904180e-04
## 611     26 53016 4.904180e-04
## 612     26 53016 4.904180e-04
## 613     26 53016 4.904180e-04
## 614     26 53016 4.904180e-04
## 615     26 53016 4.904180e-04
## 616     26 53016 4.904180e-04
## 617     26 16547 1.571282e-03
## 618     26 16547 1.571282e-03
## 619     26 16547 1.571282e-03
## 620     26 16547 1.571282e-03
## 621     26 16547 1.571282e-03
## 622     26 16547 1.571282e-03
## 623     25 70067 3.568013e-04
## 624     25 70067 3.568013e-04
## 625     25 70067 3.568013e-04
## 626     25 70067 3.568013e-04
## 627     25 70067 3.568013e-04
## 628     25 70067 3.568013e-04
## 629     25 70067 3.568013e-04
## 630     25 70067 3.568013e-04
## 631     25 70067 3.568013e-04
## 632     25 70067 3.568013e-04
## 633     25 70067 3.568013e-04
## 634     25 70067 3.568013e-04
## 635     25 70067 3.568013e-04
## 636     25 70067 3.568013e-04
## 637     25 53016 4.715558e-04
## 638     25 53016 4.715558e-04
## 639     25 53016 4.715558e-04
## 640     25 53016 4.715558e-04
## 641     25 53016 4.715558e-04
## 642     25 53016 4.715558e-04
## 643     25 53016 4.715558e-04
## 644     25 53016 4.715558e-04
## 645     25 53016 4.715558e-04
## 646     25 53016 4.715558e-04
## 647     25 53016 4.715558e-04
## 648     25 16547 1.510848e-03
## 649     25 16547 1.510848e-03
## 650     25 16547 1.510848e-03
## 651     25 16547 1.510848e-03
## 652     25 16547 1.510848e-03
## 653     24 70067 3.425293e-04
## 654     24 70067 3.425293e-04
## 655     24 70067 3.425293e-04
## 656     24 70067 3.425293e-04
## 657     24 70067 3.425293e-04
## 658     24 70067 3.425293e-04
## 659     24 70067 3.425293e-04
## 660     24 70067 3.425293e-04
## 661     24 70067 3.425293e-04
## 662     24 70067 3.425293e-04
## 663     24 70067 3.425293e-04
## 664     24 70067 3.425293e-04
## 665     24 70067 3.425293e-04
## 666     24 70067 3.425293e-04
## 667     24 70067 3.425293e-04
## 668     24 70067 3.425293e-04
## 669     24 70067 3.425293e-04
## 670     24 70067 3.425293e-04
## 671     24 70067 3.425293e-04
## 672     24 70067 3.425293e-04
## 673     24 70067 3.425293e-04
## 674     24 70067 3.425293e-04
## 675     24 70067 3.425293e-04
## 676     24 70067 3.425293e-04
## 677     24 70067 3.425293e-04
## 678     24 70067 3.425293e-04
## 679     24 53016 4.526935e-04
## 680     24 53016 4.526935e-04
## 681     24 53016 4.526935e-04
## 682     24 53016 4.526935e-04
## 683     24 53016 4.526935e-04
## 684     24 53016 4.526935e-04
## 685     24 53016 4.526935e-04
## 686     24 53016 4.526935e-04
## 687     24 53016 4.526935e-04
## 688     24 16547 1.450414e-03
## 689     24 16547 1.450414e-03
## 690     24 16547 1.450414e-03
## 691     24 16547 1.450414e-03
## 692     23 70067 3.282572e-04
## 693     23 70067 3.282572e-04
## 694     23 70067 3.282572e-04
## 695     23 70067 3.282572e-04
## 696     23 70067 3.282572e-04
## 697     23 70067 3.282572e-04
## 698     23 70067 3.282572e-04
## 699     23 70067 3.282572e-04
## 700     23 70067 3.282572e-04
## 701     23 70067 3.282572e-04
## 702     23 70067 3.282572e-04
## 703     23 70067 3.282572e-04
## 704     23 70067 3.282572e-04
## 705     23 70067 3.282572e-04
## 706     23 70067 3.282572e-04
## 707     23 70067 3.282572e-04
## 708     23 70067 3.282572e-04
## 709     23 70067 3.282572e-04
## 710     23 70067 3.282572e-04
## 711     23 70067 3.282572e-04
## 712     23 70067 3.282572e-04
## 713     23 70067 3.282572e-04
## 714     23 53016 4.338313e-04
## 715     23 53016 4.338313e-04
## 716     23 53016 4.338313e-04
## 717     23 53016 4.338313e-04
## 718     23 53016 4.338313e-04
## 719     23 53016 4.338313e-04
## 720     23 53016 4.338313e-04
## 721     23 53016 4.338313e-04
## 722     23 53016 4.338313e-04
## 723     23 53016 4.338313e-04
## 724     23 53016 4.338313e-04
## 725     23 53016 4.338313e-04
## 726     23 53016 4.338313e-04
## 727     23 53016 4.338313e-04
## 728     23 53016 4.338313e-04
## 729     23 53016 4.338313e-04
## 730     23 16547 1.389980e-03
## 731     23 16547 1.389980e-03
## 732     23 16547 1.389980e-03
## 733     23 16547 1.389980e-03
## 734     22 70067 3.139852e-04
## 735     22 70067 3.139852e-04
## 736     22 70067 3.139852e-04
## 737     22 70067 3.139852e-04
## 738     22 70067 3.139852e-04
## 739     22 70067 3.139852e-04
## 740     22 70067 3.139852e-04
## 741     22 70067 3.139852e-04
## 742     22 70067 3.139852e-04
## 743     22 70067 3.139852e-04
## 744     22 70067 3.139852e-04
## 745     22 70067 3.139852e-04
## 746     22 70067 3.139852e-04
## 747     22 70067 3.139852e-04
## 748     22 70067 3.139852e-04
## 749     22 70067 3.139852e-04
## 750     22 70067 3.139852e-04
## 751     22 70067 3.139852e-04
## 752     22 70067 3.139852e-04
## 753     22 70067 3.139852e-04
## 754     22 70067 3.139852e-04
## 755     22 70067 3.139852e-04
## 756     22 70067 3.139852e-04
## 757     22 70067 3.139852e-04
## 758     22 70067 3.139852e-04
## 759     22 70067 3.139852e-04
## 760     22 70067 3.139852e-04
## 761     22 70067 3.139852e-04
## 762     22 70067 3.139852e-04
## 763     22 70067 3.139852e-04
## 764     22 70067 3.139852e-04
## 765     22 70067 3.139852e-04
## 766     22 53016 4.149691e-04
## 767     22 53016 4.149691e-04
## 768     22 53016 4.149691e-04
## 769     22 53016 4.149691e-04
## 770     22 53016 4.149691e-04
## 771     22 53016 4.149691e-04
## 772     22 53016 4.149691e-04
## 773     22 53016 4.149691e-04
## 774     22 53016 4.149691e-04
## 775     22 53016 4.149691e-04
## 776     22 53016 4.149691e-04
## 777     22 53016 4.149691e-04
## 778     22 53016 4.149691e-04
## 779     22 53016 4.149691e-04
## 780     22 53016 4.149691e-04
## 781     22 53016 4.149691e-04
## 782     22 53016 4.149691e-04
## 783     22 53016 4.149691e-04
## 784     22 53016 4.149691e-04
## 785     22 53016 4.149691e-04
## 786     22 53016 4.149691e-04
## 787     22 53016 4.149691e-04
## 788     22 16547 1.329546e-03
## 789     22 16547 1.329546e-03
## 790     22 16547 1.329546e-03
## 791     21 70067 2.997131e-04
## 792     21 70067 2.997131e-04
## 793     21 70067 2.997131e-04
## 794     21 70067 2.997131e-04
## 795     21 70067 2.997131e-04
## 796     21 70067 2.997131e-04
## 797     21 70067 2.997131e-04
## 798     21 70067 2.997131e-04
## 799     21 70067 2.997131e-04
## 800     21 70067 2.997131e-04
## 801     21 70067 2.997131e-04
## 802     21 70067 2.997131e-04
## 803     21 70067 2.997131e-04
## 804     21 70067 2.997131e-04
## 805     21 70067 2.997131e-04
## 806     21 70067 2.997131e-04
## 807     21 70067 2.997131e-04
## 808     21 70067 2.997131e-04
## 809     21 70067 2.997131e-04
## 810     21 70067 2.997131e-04
## 811     21 70067 2.997131e-04
## 812     21 70067 2.997131e-04
## 813     21 70067 2.997131e-04
## 814     21 70067 2.997131e-04
## 815     21 70067 2.997131e-04
## 816     21 70067 2.997131e-04
## 817     21 70067 2.997131e-04
## 818     21 70067 2.997131e-04
## 819     21 70067 2.997131e-04
## 820     21 70067 2.997131e-04
## 821     21 70067 2.997131e-04
## 822     21 70067 2.997131e-04
## 823     21 70067 2.997131e-04
## 824     21 70067 2.997131e-04
## 825     21 70067 2.997131e-04
## 826     21 70067 2.997131e-04
## 827     21 70067 2.997131e-04
## 828     21 53016 3.961068e-04
## 829     21 53016 3.961068e-04
## 830     21 53016 3.961068e-04
## 831     21 53016 3.961068e-04
## 832     21 53016 3.961068e-04
## 833     21 53016 3.961068e-04
## 834     21 53016 3.961068e-04
## 835     21 53016 3.961068e-04
## 836     21 53016 3.961068e-04
## 837     21 53016 3.961068e-04
## 838     21 53016 3.961068e-04
## 839     21 53016 3.961068e-04
## 840     21 53016 3.961068e-04
## 841     21 53016 3.961068e-04
## 842     21 53016 3.961068e-04
## 843     21 53016 3.961068e-04
## 844     21 53016 3.961068e-04
## 845     21 53016 3.961068e-04
## 846     21 53016 3.961068e-04
## 847     21 53016 3.961068e-04
## 848     21 53016 3.961068e-04
## 849     21 53016 3.961068e-04
## 850     21 53016 3.961068e-04
## 851     21 53016 3.961068e-04
## 852     21 53016 3.961068e-04
## 853     21 53016 3.961068e-04
## 854     21 53016 3.961068e-04
## 855     21 53016 3.961068e-04
## 856     21 53016 3.961068e-04
## 857     21 53016 3.961068e-04
## 858     21 53016 3.961068e-04
## 859     21 53016 3.961068e-04
## 860     20 70067 2.854411e-04
## 861     20 70067 2.854411e-04
## 862     20 70067 2.854411e-04
## 863     20 70067 2.854411e-04
## 864     20 70067 2.854411e-04
## 865     20 70067 2.854411e-04
## 866     20 70067 2.854411e-04
## 867     20 70067 2.854411e-04
## 868     20 70067 2.854411e-04
## 869     20 70067 2.854411e-04
## 870     20 70067 2.854411e-04
## 871     20 70067 2.854411e-04
## 872     20 70067 2.854411e-04
## 873     20 70067 2.854411e-04
## 874     20 70067 2.854411e-04
## 875     20 70067 2.854411e-04
## 876     20 70067 2.854411e-04
## 877     20 70067 2.854411e-04
## 878     20 70067 2.854411e-04
## 879     20 70067 2.854411e-04
## 880     20 70067 2.854411e-04
## 881     20 70067 2.854411e-04
## 882     20 70067 2.854411e-04
## 883     20 70067 2.854411e-04
## 884     20 70067 2.854411e-04
## 885     20 70067 2.854411e-04
## 886     20 70067 2.854411e-04
## 887     20 70067 2.854411e-04
## 888     20 70067 2.854411e-04
## 889     20 70067 2.854411e-04
## 890     20 70067 2.854411e-04
## 891     20 53016 3.772446e-04
## 892     20 53016 3.772446e-04
## 893     20 53016 3.772446e-04
## 894     20 53016 3.772446e-04
## 895     20 53016 3.772446e-04
## 896     20 53016 3.772446e-04
## 897     20 53016 3.772446e-04
## 898     20 53016 3.772446e-04
## 899     20 53016 3.772446e-04
## 900     20 53016 3.772446e-04
## 901     20 53016 3.772446e-04
## 902     20 53016 3.772446e-04
## 903     20 53016 3.772446e-04
## 904     20 53016 3.772446e-04
## 905     20 53016 3.772446e-04
## 906     20 53016 3.772446e-04
## 907     20 53016 3.772446e-04
## 908     20 53016 3.772446e-04
## 909     20 53016 3.772446e-04
## 910     20 53016 3.772446e-04
## 911     20 53016 3.772446e-04
## 912     20 53016 3.772446e-04
## 913     20 53016 3.772446e-04
## 914     20 53016 3.772446e-04
## 915     20 53016 3.772446e-04
## 916     20 53016 3.772446e-04
## 917     20 53016 3.772446e-04
## 918     20 53016 3.772446e-04
## 919     20 53016 3.772446e-04
## 920     20 16547 1.208678e-03
## 921     20 16547 1.208678e-03
## 922     20 16547 1.208678e-03
## 923     20 16547 1.208678e-03
## 924     20 16547 1.208678e-03
## 925     20 16547 1.208678e-03
## 926     19 70067 2.711690e-04
## 927     19 70067 2.711690e-04
## 928     19 70067 2.711690e-04
## 929     19 70067 2.711690e-04
## 930     19 70067 2.711690e-04
## 931     19 70067 2.711690e-04
## 932     19 70067 2.711690e-04
## 933     19 70067 2.711690e-04
## 934     19 70067 2.711690e-04
## 935     19 70067 2.711690e-04
## 936     19 70067 2.711690e-04
## 937     19 70067 2.711690e-04
## 938     19 70067 2.711690e-04
## 939     19 70067 2.711690e-04
## 940     19 70067 2.711690e-04
## 941     19 70067 2.711690e-04
## 942     19 70067 2.711690e-04
## 943     19 70067 2.711690e-04
## 944     19 70067 2.711690e-04
## 945     19 70067 2.711690e-04
## 946     19 70067 2.711690e-04
## 947     19 70067 2.711690e-04
## 948     19 70067 2.711690e-04
## 949     19 70067 2.711690e-04
## 950     19 70067 2.711690e-04
## 951     19 70067 2.711690e-04
## 952     19 70067 2.711690e-04
## 953     19 53016 3.583824e-04
## 954     19 53016 3.583824e-04
## 955     19 53016 3.583824e-04
## 956     19 53016 3.583824e-04
## 957     19 53016 3.583824e-04
## 958     19 53016 3.583824e-04
## 959     19 53016 3.583824e-04
## 960     19 53016 3.583824e-04
## 961     19 53016 3.583824e-04
## 962     19 53016 3.583824e-04
## 963     19 53016 3.583824e-04
## 964     19 53016 3.583824e-04
## 965     19 53016 3.583824e-04
## 966     19 53016 3.583824e-04
## 967     19 53016 3.583824e-04
## 968     19 53016 3.583824e-04
## 969     19 53016 3.583824e-04
## 970     19 53016 3.583824e-04
## 971     19 53016 3.583824e-04
## 972     19 53016 3.583824e-04
## 973     19 53016 3.583824e-04
## 974     19 53016 3.583824e-04
## 975     19 53016 3.583824e-04
## 976     19 53016 3.583824e-04
## 977     19 53016 3.583824e-04
## 978     19 53016 3.583824e-04
## 979     19 16547 1.148244e-03
## 980     19 16547 1.148244e-03
## 981     19 16547 1.148244e-03
## 982     18 70067 2.568970e-04
## 983     18 70067 2.568970e-04
## 984     18 70067 2.568970e-04
## 985     18 70067 2.568970e-04
## 986     18 70067 2.568970e-04
## 987     18 70067 2.568970e-04
## 988     18 70067 2.568970e-04
## 989     18 70067 2.568970e-04
## 990     18 70067 2.568970e-04
## 991     18 70067 2.568970e-04
## 992     18 70067 2.568970e-04
## 993     18 70067 2.568970e-04
## 994     18 70067 2.568970e-04
## 995     18 70067 2.568970e-04
## 996     18 70067 2.568970e-04
## 997     18 70067 2.568970e-04
## 998     18 70067 2.568970e-04
## 999     18 70067 2.568970e-04
## 1000    18 70067 2.568970e-04
## 1001    18 70067 2.568970e-04
## 1002    18 70067 2.568970e-04
## 1003    18 70067 2.568970e-04
## 1004    18 70067 2.568970e-04
## 1005    18 70067 2.568970e-04
## 1006    18 70067 2.568970e-04
## 1007    18 70067 2.568970e-04
## 1008    18 53016 3.395201e-04
## 1009    18 53016 3.395201e-04
## 1010    18 53016 3.395201e-04
## 1011    18 53016 3.395201e-04
## 1012    18 53016 3.395201e-04
## 1013    18 53016 3.395201e-04
## 1014    18 53016 3.395201e-04
## 1015    18 53016 3.395201e-04
## 1016    18 53016 3.395201e-04
## 1017    18 53016 3.395201e-04
## 1018    18 53016 3.395201e-04
## 1019    18 53016 3.395201e-04
## 1020    18 53016 3.395201e-04
## 1021    18 53016 3.395201e-04
## 1022    18 53016 3.395201e-04
## 1023    18 53016 3.395201e-04
## 1024    18 53016 3.395201e-04
## 1025    18 53016 3.395201e-04
## 1026    18 53016 3.395201e-04
## 1027    18 53016 3.395201e-04
## 1028    18 53016 3.395201e-04
## 1029    18 53016 3.395201e-04
## 1030    18 53016 3.395201e-04
## 1031    18 53016 3.395201e-04
## 1032    18 53016 3.395201e-04
## 1033    18 53016 3.395201e-04
## 1034    18 53016 3.395201e-04
## 1035    18 53016 3.395201e-04
## 1036    18 53016 3.395201e-04
## 1037    18 16547 1.087810e-03
## 1038    18 16547 1.087810e-03
## 1039    17 70067 2.426249e-04
## 1040    17 70067 2.426249e-04
## 1041    17 70067 2.426249e-04
## 1042    17 70067 2.426249e-04
## 1043    17 70067 2.426249e-04
## 1044    17 70067 2.426249e-04
## 1045    17 70067 2.426249e-04
## 1046    17 70067 2.426249e-04
## 1047    17 70067 2.426249e-04
## 1048    17 70067 2.426249e-04
## 1049    17 70067 2.426249e-04
## 1050    17 70067 2.426249e-04
## 1051    17 70067 2.426249e-04
## 1052    17 70067 2.426249e-04
## 1053    17 70067 2.426249e-04
## 1054    17 70067 2.426249e-04
## 1055    17 70067 2.426249e-04
## 1056    17 70067 2.426249e-04
## 1057    17 70067 2.426249e-04
## 1058    17 70067 2.426249e-04
## 1059    17 70067 2.426249e-04
## 1060    17 70067 2.426249e-04
## 1061    17 70067 2.426249e-04
## 1062    17 70067 2.426249e-04
## 1063    17 70067 2.426249e-04
## 1064    17 70067 2.426249e-04
## 1065    17 70067 2.426249e-04
## 1066    17 70067 2.426249e-04
## 1067    17 70067 2.426249e-04
## 1068    17 70067 2.426249e-04
## 1069    17 70067 2.426249e-04
## 1070    17 70067 2.426249e-04
## 1071    17 70067 2.426249e-04
## 1072    17 70067 2.426249e-04
## 1073    17 70067 2.426249e-04
## 1074    17 70067 2.426249e-04
## 1075    17 70067 2.426249e-04
## 1076    17 70067 2.426249e-04
## 1077    17 70067 2.426249e-04
## 1078    17 70067 2.426249e-04
## 1079    17 70067 2.426249e-04
## 1080    17 70067 2.426249e-04
## 1081    17 70067 2.426249e-04
## 1082    17 70067 2.426249e-04
## 1083    17 70067 2.426249e-04
## 1084    17 70067 2.426249e-04
## 1085    17 70067 2.426249e-04
## 1086    17 70067 2.426249e-04
## 1087    17 70067 2.426249e-04
## 1088    17 53016 3.206579e-04
## 1089    17 53016 3.206579e-04
## 1090    17 53016 3.206579e-04
## 1091    17 53016 3.206579e-04
## 1092    17 53016 3.206579e-04
## 1093    17 53016 3.206579e-04
## 1094    17 53016 3.206579e-04
## 1095    17 53016 3.206579e-04
## 1096    17 53016 3.206579e-04
## 1097    17 53016 3.206579e-04
## 1098    17 53016 3.206579e-04
## 1099    17 53016 3.206579e-04
## 1100    17 53016 3.206579e-04
## 1101    17 53016 3.206579e-04
## 1102    17 53016 3.206579e-04
## 1103    17 53016 3.206579e-04
## 1104    17 53016 3.206579e-04
## 1105    17 53016 3.206579e-04
## 1106    17 53016 3.206579e-04
## 1107    17 53016 3.206579e-04
## 1108    17 53016 3.206579e-04
## 1109    17 53016 3.206579e-04
## 1110    17 53016 3.206579e-04
## 1111    17 53016 3.206579e-04
## 1112    17 53016 3.206579e-04
## 1113    17 53016 3.206579e-04
## 1114    17 53016 3.206579e-04
## 1115    17 16547 1.027377e-03
## 1116    17 16547 1.027377e-03
## 1117    17 16547 1.027377e-03
## 1118    17 16547 1.027377e-03
## 1119    17 16547 1.027377e-03
## 1120    17 16547 1.027377e-03
## 1121    17 16547 1.027377e-03
## 1122    17 16547 1.027377e-03
## 1123    16 70067 2.283529e-04
## 1124    16 70067 2.283529e-04
## 1125    16 70067 2.283529e-04
## 1126    16 70067 2.283529e-04
## 1127    16 70067 2.283529e-04
## 1128    16 70067 2.283529e-04
## 1129    16 70067 2.283529e-04
## 1130    16 70067 2.283529e-04
## 1131    16 70067 2.283529e-04
## 1132    16 70067 2.283529e-04
## 1133    16 70067 2.283529e-04
## 1134    16 70067 2.283529e-04
## 1135    16 70067 2.283529e-04
## 1136    16 70067 2.283529e-04
## 1137    16 70067 2.283529e-04
## 1138    16 70067 2.283529e-04
## 1139    16 70067 2.283529e-04
## 1140    16 70067 2.283529e-04
## 1141    16 70067 2.283529e-04
## 1142    16 70067 2.283529e-04
## 1143    16 70067 2.283529e-04
## 1144    16 70067 2.283529e-04
## 1145    16 70067 2.283529e-04
## 1146    16 70067 2.283529e-04
## 1147    16 70067 2.283529e-04
## 1148    16 70067 2.283529e-04
## 1149    16 70067 2.283529e-04
## 1150    16 70067 2.283529e-04
## 1151    16 70067 2.283529e-04
## 1152    16 70067 2.283529e-04
## 1153    16 70067 2.283529e-04
## 1154    16 70067 2.283529e-04
## 1155    16 70067 2.283529e-04
## 1156    16 70067 2.283529e-04
## 1157    16 70067 2.283529e-04
## 1158    16 70067 2.283529e-04
## 1159    16 70067 2.283529e-04
## 1160    16 70067 2.283529e-04
## 1161    16 70067 2.283529e-04
## 1162    16 70067 2.283529e-04
## 1163    16 70067 2.283529e-04
## 1164    16 70067 2.283529e-04
## 1165    16 70067 2.283529e-04
## 1166    16 70067 2.283529e-04
## 1167    16 70067 2.283529e-04
## 1168    16 70067 2.283529e-04
## 1169    16 70067 2.283529e-04
## 1170    16 70067 2.283529e-04
## 1171    16 70067 2.283529e-04
## 1172    16 53016 3.017957e-04
## 1173    16 53016 3.017957e-04
## 1174    16 53016 3.017957e-04
## 1175    16 53016 3.017957e-04
## 1176    16 53016 3.017957e-04
## 1177    16 53016 3.017957e-04
## 1178    16 53016 3.017957e-04
## 1179    16 53016 3.017957e-04
## 1180    16 53016 3.017957e-04
## 1181    16 53016 3.017957e-04
## 1182    16 53016 3.017957e-04
## 1183    16 53016 3.017957e-04
## 1184    16 53016 3.017957e-04
## 1185    16 53016 3.017957e-04
## 1186    16 53016 3.017957e-04
## 1187    16 53016 3.017957e-04
## 1188    16 53016 3.017957e-04
## 1189    16 53016 3.017957e-04
## 1190    16 53016 3.017957e-04
## 1191    16 53016 3.017957e-04
## 1192    16 53016 3.017957e-04
## 1193    16 53016 3.017957e-04
## 1194    16 53016 3.017957e-04
## 1195    16 53016 3.017957e-04
## 1196    16 53016 3.017957e-04
## 1197    16 53016 3.017957e-04
## 1198    16 53016 3.017957e-04
## 1199    16 53016 3.017957e-04
## 1200    16 53016 3.017957e-04
## 1201    16 53016 3.017957e-04
## 1202    16 53016 3.017957e-04
## 1203    16 53016 3.017957e-04
## 1204    16 53016 3.017957e-04
## 1205    16 53016 3.017957e-04
## 1206    16 53016 3.017957e-04
## 1207    16 53016 3.017957e-04
## 1208    16 53016 3.017957e-04
## 1209    16 53016 3.017957e-04
## 1210    16 53016 3.017957e-04
## 1211    16 53016 3.017957e-04
## 1212    16 16547 9.669426e-04
## 1213    16 16547 9.669426e-04
## 1214    16 16547 9.669426e-04
## 1215    16 16547 9.669426e-04
## 1216    16 16547 9.669426e-04
## 1217    16 16547 9.669426e-04
## 1218    16 16547 9.669426e-04
## 1219    16 16547 9.669426e-04
## 1220    16 16547 9.669426e-04
## 1221    15 70067 2.140808e-04
## 1222    15 70067 2.140808e-04
## 1223    15 70067 2.140808e-04
## 1224    15 70067 2.140808e-04
## 1225    15 70067 2.140808e-04
## 1226    15 70067 2.140808e-04
## 1227    15 70067 2.140808e-04
## 1228    15 70067 2.140808e-04
## 1229    15 70067 2.140808e-04
## 1230    15 70067 2.140808e-04
## 1231    15 70067 2.140808e-04
## 1232    15 70067 2.140808e-04
## 1233    15 70067 2.140808e-04
## 1234    15 70067 2.140808e-04
## 1235    15 70067 2.140808e-04
## 1236    15 70067 2.140808e-04
## 1237    15 70067 2.140808e-04
## 1238    15 70067 2.140808e-04
## 1239    15 70067 2.140808e-04
## 1240    15 70067 2.140808e-04
## 1241    15 70067 2.140808e-04
## 1242    15 70067 2.140808e-04
## 1243    15 70067 2.140808e-04
## 1244    15 70067 2.140808e-04
## 1245    15 70067 2.140808e-04
## 1246    15 70067 2.140808e-04
## 1247    15 70067 2.140808e-04
## 1248    15 70067 2.140808e-04
## 1249    15 70067 2.140808e-04
## 1250    15 70067 2.140808e-04
## 1251    15 70067 2.140808e-04
## 1252    15 70067 2.140808e-04
## 1253    15 70067 2.140808e-04
## 1254    15 70067 2.140808e-04
## 1255    15 70067 2.140808e-04
## 1256    15 70067 2.140808e-04
## 1257    15 70067 2.140808e-04
## 1258    15 70067 2.140808e-04
## 1259    15 70067 2.140808e-04
## 1260    15 70067 2.140808e-04
## 1261    15 70067 2.140808e-04
## 1262    15 70067 2.140808e-04
## 1263    15 70067 2.140808e-04
## 1264    15 70067 2.140808e-04
## 1265    15 70067 2.140808e-04
## 1266    15 70067 2.140808e-04
## 1267    15 70067 2.140808e-04
## 1268    15 70067 2.140808e-04
## 1269    15 70067 2.140808e-04
## 1270    15 70067 2.140808e-04
## 1271    15 70067 2.140808e-04
## 1272    15 70067 2.140808e-04
## 1273    15 70067 2.140808e-04
## 1274    15 70067 2.140808e-04
## 1275    15 70067 2.140808e-04
## 1276    15 70067 2.140808e-04
## 1277    15 70067 2.140808e-04
## 1278    15 70067 2.140808e-04
## 1279    15 70067 2.140808e-04
## 1280    15 70067 2.140808e-04
## 1281    15 70067 2.140808e-04
## 1282    15 70067 2.140808e-04
## 1283    15 70067 2.140808e-04
## 1284    15 70067 2.140808e-04
## 1285    15 70067 2.140808e-04
## 1286    15 70067 2.140808e-04
## 1287    15 70067 2.140808e-04
## 1288    15 70067 2.140808e-04
## 1289    15 70067 2.140808e-04
## 1290    15 70067 2.140808e-04
## 1291    15 70067 2.140808e-04
## 1292    15 53016 2.829335e-04
## 1293    15 53016 2.829335e-04
## 1294    15 53016 2.829335e-04
## 1295    15 53016 2.829335e-04
## 1296    15 53016 2.829335e-04
## 1297    15 53016 2.829335e-04
## 1298    15 53016 2.829335e-04
## 1299    15 53016 2.829335e-04
## 1300    15 53016 2.829335e-04
## 1301    15 53016 2.829335e-04
## 1302    15 53016 2.829335e-04
## 1303    15 53016 2.829335e-04
## 1304    15 53016 2.829335e-04
## 1305    15 53016 2.829335e-04
## 1306    15 53016 2.829335e-04
## 1307    15 53016 2.829335e-04
## 1308    15 53016 2.829335e-04
## 1309    15 53016 2.829335e-04
## 1310    15 53016 2.829335e-04
## 1311    15 53016 2.829335e-04
## 1312    15 53016 2.829335e-04
## 1313    15 53016 2.829335e-04
## 1314    15 53016 2.829335e-04
## 1315    15 53016 2.829335e-04
## 1316    15 53016 2.829335e-04
## 1317    15 53016 2.829335e-04
## 1318    15 53016 2.829335e-04
## 1319    15 53016 2.829335e-04
## 1320    15 53016 2.829335e-04
## 1321    15 53016 2.829335e-04
## 1322    15 53016 2.829335e-04
## 1323    15 53016 2.829335e-04
## 1324    15 53016 2.829335e-04
## 1325    15 53016 2.829335e-04
## 1326    15 53016 2.829335e-04
## 1327    15 53016 2.829335e-04
## 1328    15 53016 2.829335e-04
## 1329    15 53016 2.829335e-04
## 1330    15 53016 2.829335e-04
## 1331    15 53016 2.829335e-04
## 1332    15 53016 2.829335e-04
## 1333    15 53016 2.829335e-04
## 1334    15 53016 2.829335e-04
## 1335    15 53016 2.829335e-04
## 1336    15 53016 2.829335e-04
## 1337    15 53016 2.829335e-04
## 1338    15 53016 2.829335e-04
## 1339    15 53016 2.829335e-04
## 1340    15 53016 2.829335e-04
## 1341    15 53016 2.829335e-04
## 1342    15 53016 2.829335e-04
## 1343    15 53016 2.829335e-04
## 1344    15 53016 2.829335e-04
## 1345    15 53016 2.829335e-04
## 1346    15 16547 9.065087e-04
## 1347    15 16547 9.065087e-04
## 1348    15 16547 9.065087e-04
## 1349    15 16547 9.065087e-04
## 1350    15 16547 9.065087e-04
## 1351    15 16547 9.065087e-04
## 1352    15 16547 9.065087e-04
## 1353    15 16547 9.065087e-04
## 1354    15 16547 9.065087e-04
## 1355    15 16547 9.065087e-04
## 1356    14 70067 1.998088e-04
## 1357    14 70067 1.998088e-04
## 1358    14 70067 1.998088e-04
## 1359    14 70067 1.998088e-04
## 1360    14 70067 1.998088e-04
## 1361    14 70067 1.998088e-04
## 1362    14 70067 1.998088e-04
## 1363    14 70067 1.998088e-04
## 1364    14 70067 1.998088e-04
## 1365    14 70067 1.998088e-04
## 1366    14 70067 1.998088e-04
## 1367    14 70067 1.998088e-04
## 1368    14 70067 1.998088e-04
## 1369    14 70067 1.998088e-04
## 1370    14 70067 1.998088e-04
## 1371    14 70067 1.998088e-04
## 1372    14 70067 1.998088e-04
## 1373    14 70067 1.998088e-04
## 1374    14 70067 1.998088e-04
## 1375    14 70067 1.998088e-04
## 1376    14 70067 1.998088e-04
## 1377    14 70067 1.998088e-04
## 1378    14 70067 1.998088e-04
## 1379    14 70067 1.998088e-04
## 1380    14 70067 1.998088e-04
## 1381    14 70067 1.998088e-04
## 1382    14 70067 1.998088e-04
## 1383    14 70067 1.998088e-04
## 1384    14 70067 1.998088e-04
## 1385    14 70067 1.998088e-04
## 1386    14 70067 1.998088e-04
## 1387    14 70067 1.998088e-04
## 1388    14 70067 1.998088e-04
## 1389    14 70067 1.998088e-04
## 1390    14 70067 1.998088e-04
## 1391    14 70067 1.998088e-04
## 1392    14 70067 1.998088e-04
## 1393    14 70067 1.998088e-04
## 1394    14 70067 1.998088e-04
## 1395    14 70067 1.998088e-04
## 1396    14 70067 1.998088e-04
## 1397    14 70067 1.998088e-04
## 1398    14 70067 1.998088e-04
## 1399    14 70067 1.998088e-04
## 1400    14 70067 1.998088e-04
## 1401    14 70067 1.998088e-04
## 1402    14 70067 1.998088e-04
## 1403    14 70067 1.998088e-04
## 1404    14 70067 1.998088e-04
## 1405    14 70067 1.998088e-04
## 1406    14 70067 1.998088e-04
## 1407    14 70067 1.998088e-04
## 1408    14 70067 1.998088e-04
## 1409    14 70067 1.998088e-04
## 1410    14 70067 1.998088e-04
## 1411    14 70067 1.998088e-04
## 1412    14 70067 1.998088e-04
## 1413    14 70067 1.998088e-04
## 1414    14 70067 1.998088e-04
## 1415    14 53016 2.640712e-04
## 1416    14 53016 2.640712e-04
## 1417    14 53016 2.640712e-04
## 1418    14 53016 2.640712e-04
## 1419    14 53016 2.640712e-04
## 1420    14 53016 2.640712e-04
## 1421    14 53016 2.640712e-04
## 1422    14 53016 2.640712e-04
## 1423    14 53016 2.640712e-04
## 1424    14 53016 2.640712e-04
## 1425    14 53016 2.640712e-04
## 1426    14 53016 2.640712e-04
## 1427    14 53016 2.640712e-04
## 1428    14 53016 2.640712e-04
## 1429    14 53016 2.640712e-04
## 1430    14 53016 2.640712e-04
## 1431    14 53016 2.640712e-04
## 1432    14 53016 2.640712e-04
## 1433    14 53016 2.640712e-04
## 1434    14 53016 2.640712e-04
## 1435    14 53016 2.640712e-04
## 1436    14 53016 2.640712e-04
## 1437    14 53016 2.640712e-04
## 1438    14 53016 2.640712e-04
## 1439    14 53016 2.640712e-04
## 1440    14 53016 2.640712e-04
## 1441    14 53016 2.640712e-04
## 1442    14 53016 2.640712e-04
## 1443    14 53016 2.640712e-04
## 1444    14 53016 2.640712e-04
## 1445    14 53016 2.640712e-04
## 1446    14 53016 2.640712e-04
## 1447    14 53016 2.640712e-04
## 1448    14 53016 2.640712e-04
## 1449    14 53016 2.640712e-04
## 1450    14 53016 2.640712e-04
## 1451    14 53016 2.640712e-04
## 1452    14 53016 2.640712e-04
## 1453    14 53016 2.640712e-04
## 1454    14 53016 2.640712e-04
## 1455    14 53016 2.640712e-04
## 1456    14 53016 2.640712e-04
## 1457    14 53016 2.640712e-04
## 1458    14 53016 2.640712e-04
## 1459    14 53016 2.640712e-04
## 1460    14 53016 2.640712e-04
## 1461    14 53016 2.640712e-04
## 1462    14 53016 2.640712e-04
## 1463    14 16547 8.460748e-04
## 1464    14 16547 8.460748e-04
## 1465    14 16547 8.460748e-04
## 1466    14 16547 8.460748e-04
## 1467    14 16547 8.460748e-04
## 1468    14 16547 8.460748e-04
## 1469    14 16547 8.460748e-04
## 1470    14 16547 8.460748e-04
## 1471    13 70067 1.855367e-04
## 1472    13 70067 1.855367e-04
## 1473    13 70067 1.855367e-04
## 1474    13 70067 1.855367e-04
## 1475    13 70067 1.855367e-04
## 1476    13 70067 1.855367e-04
## 1477    13 70067 1.855367e-04
## 1478    13 70067 1.855367e-04
## 1479    13 70067 1.855367e-04
## 1480    13 70067 1.855367e-04
## 1481    13 70067 1.855367e-04
## 1482    13 70067 1.855367e-04
## 1483    13 70067 1.855367e-04
## 1484    13 70067 1.855367e-04
## 1485    13 70067 1.855367e-04
## 1486    13 70067 1.855367e-04
## 1487    13 70067 1.855367e-04
## 1488    13 70067 1.855367e-04
## 1489    13 70067 1.855367e-04
## 1490    13 70067 1.855367e-04
## 1491    13 70067 1.855367e-04
## 1492    13 70067 1.855367e-04
## 1493    13 70067 1.855367e-04
## 1494    13 70067 1.855367e-04
## 1495    13 70067 1.855367e-04
## 1496    13 70067 1.855367e-04
## 1497    13 70067 1.855367e-04
## 1498    13 70067 1.855367e-04
## 1499    13 70067 1.855367e-04
## 1500    13 70067 1.855367e-04
## 1501    13 70067 1.855367e-04
## 1502    13 70067 1.855367e-04
## 1503    13 70067 1.855367e-04
## 1504    13 70067 1.855367e-04
## 1505    13 70067 1.855367e-04
## 1506    13 70067 1.855367e-04
## 1507    13 70067 1.855367e-04
## 1508    13 70067 1.855367e-04
## 1509    13 70067 1.855367e-04
## 1510    13 70067 1.855367e-04
## 1511    13 70067 1.855367e-04
## 1512    13 70067 1.855367e-04
## 1513    13 70067 1.855367e-04
## 1514    13 70067 1.855367e-04
## 1515    13 70067 1.855367e-04
## 1516    13 70067 1.855367e-04
## 1517    13 70067 1.855367e-04
## 1518    13 70067 1.855367e-04
## 1519    13 70067 1.855367e-04
## 1520    13 70067 1.855367e-04
## 1521    13 70067 1.855367e-04
## 1522    13 70067 1.855367e-04
## 1523    13 70067 1.855367e-04
## 1524    13 70067 1.855367e-04
## 1525    13 70067 1.855367e-04
## 1526    13 70067 1.855367e-04
## 1527    13 70067 1.855367e-04
## 1528    13 70067 1.855367e-04
## 1529    13 70067 1.855367e-04
## 1530    13 70067 1.855367e-04
## 1531    13 70067 1.855367e-04
## 1532    13 70067 1.855367e-04
## 1533    13 70067 1.855367e-04
## 1534    13 70067 1.855367e-04
## 1535    13 70067 1.855367e-04
## 1536    13 70067 1.855367e-04
## 1537    13 70067 1.855367e-04
## 1538    13 70067 1.855367e-04
## 1539    13 70067 1.855367e-04
## 1540    13 70067 1.855367e-04
## 1541    13 70067 1.855367e-04
## 1542    13 70067 1.855367e-04
## 1543    13 70067 1.855367e-04
## 1544    13 70067 1.855367e-04
## 1545    13 70067 1.855367e-04
## 1546    13 53016 2.452090e-04
## 1547    13 53016 2.452090e-04
## 1548    13 53016 2.452090e-04
## 1549    13 53016 2.452090e-04
## 1550    13 53016 2.452090e-04
## 1551    13 53016 2.452090e-04
## 1552    13 53016 2.452090e-04
## 1553    13 53016 2.452090e-04
## 1554    13 53016 2.452090e-04
## 1555    13 53016 2.452090e-04
## 1556    13 53016 2.452090e-04
## 1557    13 53016 2.452090e-04
## 1558    13 53016 2.452090e-04
## 1559    13 53016 2.452090e-04
## 1560    13 53016 2.452090e-04
## 1561    13 53016 2.452090e-04
## 1562    13 53016 2.452090e-04
## 1563    13 53016 2.452090e-04
## 1564    13 53016 2.452090e-04
## 1565    13 53016 2.452090e-04
## 1566    13 53016 2.452090e-04
## 1567    13 53016 2.452090e-04
## 1568    13 53016 2.452090e-04
## 1569    13 53016 2.452090e-04
## 1570    13 53016 2.452090e-04
## 1571    13 53016 2.452090e-04
## 1572    13 53016 2.452090e-04
## 1573    13 53016 2.452090e-04
## 1574    13 53016 2.452090e-04
## 1575    13 53016 2.452090e-04
## 1576    13 53016 2.452090e-04
## 1577    13 53016 2.452090e-04
## 1578    13 53016 2.452090e-04
## 1579    13 53016 2.452090e-04
## 1580    13 53016 2.452090e-04
## 1581    13 53016 2.452090e-04
## 1582    13 53016 2.452090e-04
## 1583    13 53016 2.452090e-04
## 1584    13 53016 2.452090e-04
## 1585    13 53016 2.452090e-04
## 1586    13 53016 2.452090e-04
## 1587    13 53016 2.452090e-04
## 1588    13 53016 2.452090e-04
## 1589    13 53016 2.452090e-04
## 1590    13 53016 2.452090e-04
## 1591    13 53016 2.452090e-04
## 1592    13 53016 2.452090e-04
## 1593    13 53016 2.452090e-04
## 1594    13 53016 2.452090e-04
## 1595    13 16547 7.856409e-04
## 1596    13 16547 7.856409e-04
## 1597    13 16547 7.856409e-04
## 1598    13 16547 7.856409e-04
## 1599    13 16547 7.856409e-04
## 1600    13 16547 7.856409e-04
## 1601    13 16547 7.856409e-04
## 1602    13 16547 7.856409e-04
## 1603    13 16547 7.856409e-04
## 1604    13 16547 7.856409e-04
## 1605    13 16547 7.856409e-04
## 1606    13 16547 7.856409e-04
## 1607    13 16547 7.856409e-04
## 1608    13 16547 7.856409e-04
## 1609    13 16547 7.856409e-04
## 1610    13 16547 7.856409e-04
## 1611    13 16547 7.856409e-04
## 1612    13 16547 7.856409e-04
## 1613    13 16547 7.856409e-04
## 1614    12 70067 1.712646e-04
## 1615    12 70067 1.712646e-04
## 1616    12 70067 1.712646e-04
## 1617    12 70067 1.712646e-04
## 1618    12 70067 1.712646e-04
## 1619    12 70067 1.712646e-04
## 1620    12 70067 1.712646e-04
## 1621    12 70067 1.712646e-04
## 1622    12 70067 1.712646e-04
## 1623    12 70067 1.712646e-04
## 1624    12 70067 1.712646e-04
## 1625    12 70067 1.712646e-04
## 1626    12 70067 1.712646e-04
## 1627    12 70067 1.712646e-04
## 1628    12 70067 1.712646e-04
## 1629    12 70067 1.712646e-04
## 1630    12 70067 1.712646e-04
## 1631    12 70067 1.712646e-04
## 1632    12 70067 1.712646e-04
## 1633    12 70067 1.712646e-04
## 1634    12 70067 1.712646e-04
## 1635    12 70067 1.712646e-04
## 1636    12 70067 1.712646e-04
## 1637    12 70067 1.712646e-04
## 1638    12 70067 1.712646e-04
## 1639    12 70067 1.712646e-04
## 1640    12 70067 1.712646e-04
## 1641    12 70067 1.712646e-04
## 1642    12 70067 1.712646e-04
## 1643    12 70067 1.712646e-04
## 1644    12 70067 1.712646e-04
## 1645    12 70067 1.712646e-04
## 1646    12 70067 1.712646e-04
## 1647    12 70067 1.712646e-04
## 1648    12 70067 1.712646e-04
## 1649    12 70067 1.712646e-04
## 1650    12 70067 1.712646e-04
## 1651    12 70067 1.712646e-04
## 1652    12 70067 1.712646e-04
## 1653    12 70067 1.712646e-04
## 1654    12 70067 1.712646e-04
## 1655    12 70067 1.712646e-04
## 1656    12 70067 1.712646e-04
## 1657    12 70067 1.712646e-04
## 1658    12 70067 1.712646e-04
## 1659    12 70067 1.712646e-04
## 1660    12 70067 1.712646e-04
## 1661    12 70067 1.712646e-04
## 1662    12 70067 1.712646e-04
## 1663    12 70067 1.712646e-04
## 1664    12 70067 1.712646e-04
## 1665    12 70067 1.712646e-04
## 1666    12 70067 1.712646e-04
## 1667    12 70067 1.712646e-04
## 1668    12 70067 1.712646e-04
## 1669    12 70067 1.712646e-04
## 1670    12 70067 1.712646e-04
## 1671    12 70067 1.712646e-04
## 1672    12 70067 1.712646e-04
## 1673    12 70067 1.712646e-04
## 1674    12 70067 1.712646e-04
## 1675    12 70067 1.712646e-04
## 1676    12 70067 1.712646e-04
## 1677    12 70067 1.712646e-04
## 1678    12 70067 1.712646e-04
## 1679    12 70067 1.712646e-04
## 1680    12 70067 1.712646e-04
## 1681    12 70067 1.712646e-04
## 1682    12 70067 1.712646e-04
## 1683    12 70067 1.712646e-04
## 1684    12 70067 1.712646e-04
## 1685    12 70067 1.712646e-04
## 1686    12 70067 1.712646e-04
## 1687    12 70067 1.712646e-04
## 1688    12 70067 1.712646e-04
## 1689    12 70067 1.712646e-04
## 1690    12 70067 1.712646e-04
## 1691    12 70067 1.712646e-04
## 1692    12 70067 1.712646e-04
## 1693    12 70067 1.712646e-04
## 1694    12 70067 1.712646e-04
## 1695    12 70067 1.712646e-04
## 1696    12 70067 1.712646e-04
## 1697    12 70067 1.712646e-04
## 1698    12 70067 1.712646e-04
## 1699    12 70067 1.712646e-04
## 1700    12 70067 1.712646e-04
## 1701    12 70067 1.712646e-04
## 1702    12 70067 1.712646e-04
## 1703    12 70067 1.712646e-04
## 1704    12 53016 2.263468e-04
## 1705    12 53016 2.263468e-04
## 1706    12 53016 2.263468e-04
## 1707    12 53016 2.263468e-04
## 1708    12 53016 2.263468e-04
## 1709    12 53016 2.263468e-04
## 1710    12 53016 2.263468e-04
## 1711    12 53016 2.263468e-04
## 1712    12 53016 2.263468e-04
## 1713    12 53016 2.263468e-04
## 1714    12 53016 2.263468e-04
## 1715    12 53016 2.263468e-04
## 1716    12 53016 2.263468e-04
## 1717    12 53016 2.263468e-04
## 1718    12 53016 2.263468e-04
## 1719    12 53016 2.263468e-04
## 1720    12 53016 2.263468e-04
## 1721    12 53016 2.263468e-04
## 1722    12 53016 2.263468e-04
## 1723    12 53016 2.263468e-04
## 1724    12 53016 2.263468e-04
## 1725    12 53016 2.263468e-04
## 1726    12 53016 2.263468e-04
## 1727    12 53016 2.263468e-04
## 1728    12 53016 2.263468e-04
## 1729    12 53016 2.263468e-04
## 1730    12 53016 2.263468e-04
## 1731    12 53016 2.263468e-04
## 1732    12 53016 2.263468e-04
## 1733    12 53016 2.263468e-04
## 1734    12 53016 2.263468e-04
## 1735    12 53016 2.263468e-04
## 1736    12 53016 2.263468e-04
## 1737    12 53016 2.263468e-04
## 1738    12 53016 2.263468e-04
## 1739    12 53016 2.263468e-04
## 1740    12 53016 2.263468e-04
## 1741    12 53016 2.263468e-04
## 1742    12 53016 2.263468e-04
## 1743    12 53016 2.263468e-04
## 1744    12 53016 2.263468e-04
## 1745    12 53016 2.263468e-04
## 1746    12 53016 2.263468e-04
## 1747    12 53016 2.263468e-04
## 1748    12 53016 2.263468e-04
## 1749    12 53016 2.263468e-04
## 1750    12 53016 2.263468e-04
## 1751    12 53016 2.263468e-04
## 1752    12 53016 2.263468e-04
## 1753    12 53016 2.263468e-04
## 1754    12 53016 2.263468e-04
## 1755    12 53016 2.263468e-04
## 1756    12 53016 2.263468e-04
## 1757    12 53016 2.263468e-04
## 1758    12 53016 2.263468e-04
## 1759    12 53016 2.263468e-04
## 1760    12 53016 2.263468e-04
## 1761    12 53016 2.263468e-04
## 1762    12 53016 2.263468e-04
## 1763    12 53016 2.263468e-04
## 1764    12 53016 2.263468e-04
## 1765    12 53016 2.263468e-04
## 1766    12 16547 7.252070e-04
## 1767    12 16547 7.252070e-04
## 1768    12 16547 7.252070e-04
## 1769    12 16547 7.252070e-04
## 1770    12 16547 7.252070e-04
## 1771    12 16547 7.252070e-04
## 1772    12 16547 7.252070e-04
## 1773    12 16547 7.252070e-04
## 1774    12 16547 7.252070e-04
## 1775    12 16547 7.252070e-04
## 1776    12 16547 7.252070e-04
## 1777    11 70067 1.569926e-04
## 1778    11 70067 1.569926e-04
## 1779    11 70067 1.569926e-04
## 1780    11 70067 1.569926e-04
## 1781    11 70067 1.569926e-04
## 1782    11 70067 1.569926e-04
## 1783    11 70067 1.569926e-04
## 1784    11 70067 1.569926e-04
## 1785    11 70067 1.569926e-04
## 1786    11 70067 1.569926e-04
## 1787    11 70067 1.569926e-04
## 1788    11 70067 1.569926e-04
## 1789    11 70067 1.569926e-04
## 1790    11 70067 1.569926e-04
## 1791    11 70067 1.569926e-04
## 1792    11 70067 1.569926e-04
## 1793    11 70067 1.569926e-04
## 1794    11 70067 1.569926e-04
## 1795    11 70067 1.569926e-04
## 1796    11 70067 1.569926e-04
## 1797    11 70067 1.569926e-04
## 1798    11 70067 1.569926e-04
## 1799    11 70067 1.569926e-04
## 1800    11 70067 1.569926e-04
## 1801    11 70067 1.569926e-04
## 1802    11 70067 1.569926e-04
## 1803    11 70067 1.569926e-04
## 1804    11 70067 1.569926e-04
## 1805    11 70067 1.569926e-04
## 1806    11 70067 1.569926e-04
## 1807    11 70067 1.569926e-04
## 1808    11 70067 1.569926e-04
## 1809    11 70067 1.569926e-04
## 1810    11 70067 1.569926e-04
## 1811    11 70067 1.569926e-04
## 1812    11 70067 1.569926e-04
## 1813    11 70067 1.569926e-04
## 1814    11 70067 1.569926e-04
## 1815    11 70067 1.569926e-04
## 1816    11 70067 1.569926e-04
## 1817    11 70067 1.569926e-04
## 1818    11 70067 1.569926e-04
## 1819    11 70067 1.569926e-04
## 1820    11 70067 1.569926e-04
## 1821    11 70067 1.569926e-04
## 1822    11 70067 1.569926e-04
## 1823    11 70067 1.569926e-04
## 1824    11 70067 1.569926e-04
## 1825    11 70067 1.569926e-04
## 1826    11 70067 1.569926e-04
## 1827    11 70067 1.569926e-04
## 1828    11 70067 1.569926e-04
## 1829    11 70067 1.569926e-04
## 1830    11 70067 1.569926e-04
## 1831    11 70067 1.569926e-04
## 1832    11 70067 1.569926e-04
## 1833    11 70067 1.569926e-04
## 1834    11 70067 1.569926e-04
## 1835    11 70067 1.569926e-04
## 1836    11 70067 1.569926e-04
## 1837    11 70067 1.569926e-04
## 1838    11 70067 1.569926e-04
## 1839    11 70067 1.569926e-04
## 1840    11 70067 1.569926e-04
## 1841    11 70067 1.569926e-04
## 1842    11 70067 1.569926e-04
## 1843    11 70067 1.569926e-04
## 1844    11 70067 1.569926e-04
## 1845    11 70067 1.569926e-04
## 1846    11 70067 1.569926e-04
## 1847    11 70067 1.569926e-04
## 1848    11 70067 1.569926e-04
## 1849    11 70067 1.569926e-04
## 1850    11 70067 1.569926e-04
## 1851    11 70067 1.569926e-04
## 1852    11 70067 1.569926e-04
## 1853    11 70067 1.569926e-04
## 1854    11 70067 1.569926e-04
## 1855    11 70067 1.569926e-04
## 1856    11 70067 1.569926e-04
## 1857    11 70067 1.569926e-04
## 1858    11 70067 1.569926e-04
## 1859    11 70067 1.569926e-04
## 1860    11 70067 1.569926e-04
## 1861    11 70067 1.569926e-04
## 1862    11 70067 1.569926e-04
## 1863    11 70067 1.569926e-04
## 1864    11 53016 2.074845e-04
## 1865    11 53016 2.074845e-04
## 1866    11 53016 2.074845e-04
## 1867    11 53016 2.074845e-04
## 1868    11 53016 2.074845e-04
## 1869    11 53016 2.074845e-04
## 1870    11 53016 2.074845e-04
## 1871    11 53016 2.074845e-04
## 1872    11 53016 2.074845e-04
## 1873    11 53016 2.074845e-04
## 1874    11 53016 2.074845e-04
## 1875    11 53016 2.074845e-04
## 1876    11 53016 2.074845e-04
## 1877    11 53016 2.074845e-04
## 1878    11 53016 2.074845e-04
## 1879    11 53016 2.074845e-04
## 1880    11 53016 2.074845e-04
## 1881    11 53016 2.074845e-04
## 1882    11 53016 2.074845e-04
## 1883    11 53016 2.074845e-04
## 1884    11 53016 2.074845e-04
## 1885    11 53016 2.074845e-04
## 1886    11 53016 2.074845e-04
## 1887    11 53016 2.074845e-04
## 1888    11 53016 2.074845e-04
## 1889    11 53016 2.074845e-04
## 1890    11 53016 2.074845e-04
## 1891    11 53016 2.074845e-04
## 1892    11 53016 2.074845e-04
## 1893    11 53016 2.074845e-04
## 1894    11 53016 2.074845e-04
## 1895    11 53016 2.074845e-04
## 1896    11 53016 2.074845e-04
## 1897    11 53016 2.074845e-04
## 1898    11 53016 2.074845e-04
## 1899    11 53016 2.074845e-04
## 1900    11 53016 2.074845e-04
## 1901    11 53016 2.074845e-04
## 1902    11 53016 2.074845e-04
## 1903    11 53016 2.074845e-04
## 1904    11 53016 2.074845e-04
## 1905    11 53016 2.074845e-04
## 1906    11 53016 2.074845e-04
## 1907    11 53016 2.074845e-04
## 1908    11 53016 2.074845e-04
## 1909    11 53016 2.074845e-04
## 1910    11 53016 2.074845e-04
## 1911    11 53016 2.074845e-04
## 1912    11 53016 2.074845e-04
## 1913    11 53016 2.074845e-04
## 1914    11 53016 2.074845e-04
## 1915    11 53016 2.074845e-04
## 1916    11 53016 2.074845e-04
## 1917    11 53016 2.074845e-04
## 1918    11 53016 2.074845e-04
## 1919    11 53016 2.074845e-04
## 1920    11 53016 2.074845e-04
## 1921    11 53016 2.074845e-04
## 1922    11 53016 2.074845e-04
## 1923    11 53016 2.074845e-04
## 1924    11 53016 2.074845e-04
## 1925    11 53016 2.074845e-04
## 1926    11 53016 2.074845e-04
## 1927    11 16547 6.647731e-04
## 1928    11 16547 6.647731e-04
## 1929    11 16547 6.647731e-04
## 1930    11 16547 6.647731e-04
## 1931    11 16547 6.647731e-04
## 1932    11 16547 6.647731e-04
## 1933    11 16547 6.647731e-04
## 1934    11 16547 6.647731e-04
## 1935    11 16547 6.647731e-04
## 1936    11 16547 6.647731e-04
## 1937    11 16547 6.647731e-04
## 1938    11 16547 6.647731e-04
## 1939    11 16547 6.647731e-04
## 1940    11 16547 6.647731e-04
## 1941    11 16547 6.647731e-04
## 1942    11 16547 6.647731e-04
## 1943    11 16547 6.647731e-04
## 1944    11 16547 6.647731e-04
## 1945    11 16547 6.647731e-04
## 1946    11 16547 6.647731e-04
## 1947    10 70067 1.427205e-04
## 1948    10 70067 1.427205e-04
## 1949    10 70067 1.427205e-04
## 1950    10 70067 1.427205e-04
## 1951    10 70067 1.427205e-04
## 1952    10 70067 1.427205e-04
## 1953    10 70067 1.427205e-04
## 1954    10 70067 1.427205e-04
## 1955    10 70067 1.427205e-04
## 1956    10 70067 1.427205e-04
## 1957    10 70067 1.427205e-04
## 1958    10 70067 1.427205e-04
## 1959    10 70067 1.427205e-04
## 1960    10 70067 1.427205e-04
## 1961    10 70067 1.427205e-04
## 1962    10 70067 1.427205e-04
## 1963    10 70067 1.427205e-04
## 1964    10 70067 1.427205e-04
## 1965    10 70067 1.427205e-04
## 1966    10 70067 1.427205e-04
## 1967    10 70067 1.427205e-04
## 1968    10 70067 1.427205e-04
## 1969    10 70067 1.427205e-04
## 1970    10 70067 1.427205e-04
## 1971    10 70067 1.427205e-04
## 1972    10 70067 1.427205e-04
## 1973    10 70067 1.427205e-04
## 1974    10 70067 1.427205e-04
## 1975    10 70067 1.427205e-04
## 1976    10 70067 1.427205e-04
## 1977    10 70067 1.427205e-04
## 1978    10 70067 1.427205e-04
## 1979    10 70067 1.427205e-04
## 1980    10 70067 1.427205e-04
## 1981    10 70067 1.427205e-04
## 1982    10 70067 1.427205e-04
## 1983    10 70067 1.427205e-04
## 1984    10 70067 1.427205e-04
## 1985    10 70067 1.427205e-04
## 1986    10 70067 1.427205e-04
## 1987    10 70067 1.427205e-04
## 1988    10 70067 1.427205e-04
## 1989    10 70067 1.427205e-04
## 1990    10 70067 1.427205e-04
## 1991    10 70067 1.427205e-04
## 1992    10 70067 1.427205e-04
## 1993    10 70067 1.427205e-04
## 1994    10 70067 1.427205e-04
## 1995    10 70067 1.427205e-04
## 1996    10 70067 1.427205e-04
## 1997    10 70067 1.427205e-04
## 1998    10 70067 1.427205e-04
## 1999    10 70067 1.427205e-04
## 2000    10 70067 1.427205e-04
## 2001    10 70067 1.427205e-04
## 2002    10 70067 1.427205e-04
## 2003    10 70067 1.427205e-04
## 2004    10 70067 1.427205e-04
## 2005    10 70067 1.427205e-04
## 2006    10 70067 1.427205e-04
## 2007    10 70067 1.427205e-04
## 2008    10 70067 1.427205e-04
## 2009    10 70067 1.427205e-04
## 2010    10 70067 1.427205e-04
## 2011    10 70067 1.427205e-04
## 2012    10 70067 1.427205e-04
## 2013    10 70067 1.427205e-04
## 2014    10 70067 1.427205e-04
## 2015    10 70067 1.427205e-04
## 2016    10 70067 1.427205e-04
## 2017    10 70067 1.427205e-04
## 2018    10 70067 1.427205e-04
## 2019    10 70067 1.427205e-04
## 2020    10 70067 1.427205e-04
## 2021    10 70067 1.427205e-04
## 2022    10 70067 1.427205e-04
## 2023    10 70067 1.427205e-04
## 2024    10 70067 1.427205e-04
## 2025    10 70067 1.427205e-04
## 2026    10 70067 1.427205e-04
## 2027    10 70067 1.427205e-04
## 2028    10 70067 1.427205e-04
## 2029    10 70067 1.427205e-04
## 2030    10 70067 1.427205e-04
## 2031    10 70067 1.427205e-04
## 2032    10 70067 1.427205e-04
## 2033    10 70067 1.427205e-04
## 2034    10 70067 1.427205e-04
## 2035    10 70067 1.427205e-04
## 2036    10 70067 1.427205e-04
## 2037    10 70067 1.427205e-04
## 2038    10 70067 1.427205e-04
## 2039    10 70067 1.427205e-04
## 2040    10 70067 1.427205e-04
## 2041    10 70067 1.427205e-04
## 2042    10 70067 1.427205e-04
## 2043    10 70067 1.427205e-04
## 2044    10 70067 1.427205e-04
## 2045    10 70067 1.427205e-04
## 2046    10 70067 1.427205e-04
## 2047    10 70067 1.427205e-04
## 2048    10 70067 1.427205e-04
## 2049    10 70067 1.427205e-04
## 2050    10 70067 1.427205e-04
## 2051    10 70067 1.427205e-04
## 2052    10 70067 1.427205e-04
## 2053    10 70067 1.427205e-04
## 2054    10 70067 1.427205e-04
## 2055    10 70067 1.427205e-04
## 2056    10 70067 1.427205e-04
## 2057    10 70067 1.427205e-04
## 2058    10 70067 1.427205e-04
## 2059    10 70067 1.427205e-04
## 2060    10 70067 1.427205e-04
## 2061    10 70067 1.427205e-04
## 2062    10 70067 1.427205e-04
## 2063    10 70067 1.427205e-04
## 2064    10 70067 1.427205e-04
## 2065    10 70067 1.427205e-04
## 2066    10 70067 1.427205e-04
## 2067    10 70067 1.427205e-04
## 2068    10 70067 1.427205e-04
## 2069    10 70067 1.427205e-04
## 2070    10 70067 1.427205e-04
## 2071    10 70067 1.427205e-04
## 2072    10 70067 1.427205e-04
## 2073    10 70067 1.427205e-04
## 2074    10 70067 1.427205e-04
## 2075    10 70067 1.427205e-04
## 2076    10 70067 1.427205e-04
## 2077    10 70067 1.427205e-04
## 2078    10 53016 1.886223e-04
## 2079    10 53016 1.886223e-04
## 2080    10 53016 1.886223e-04
## 2081    10 53016 1.886223e-04
## 2082    10 53016 1.886223e-04
## 2083    10 53016 1.886223e-04
## 2084    10 53016 1.886223e-04
## 2085    10 53016 1.886223e-04
## 2086    10 53016 1.886223e-04
## 2087    10 53016 1.886223e-04
## 2088    10 53016 1.886223e-04
## 2089    10 53016 1.886223e-04
## 2090    10 53016 1.886223e-04
## 2091    10 53016 1.886223e-04
## 2092    10 53016 1.886223e-04
## 2093    10 53016 1.886223e-04
## 2094    10 53016 1.886223e-04
## 2095    10 53016 1.886223e-04
## 2096    10 53016 1.886223e-04
## 2097    10 53016 1.886223e-04
## 2098    10 53016 1.886223e-04
## 2099    10 53016 1.886223e-04
## 2100    10 53016 1.886223e-04
## 2101    10 53016 1.886223e-04
## 2102    10 53016 1.886223e-04
## 2103    10 53016 1.886223e-04
## 2104    10 53016 1.886223e-04
## 2105    10 53016 1.886223e-04
## 2106    10 53016 1.886223e-04
## 2107    10 53016 1.886223e-04
## 2108    10 53016 1.886223e-04
## 2109    10 53016 1.886223e-04
## 2110    10 53016 1.886223e-04
## 2111    10 53016 1.886223e-04
## 2112    10 53016 1.886223e-04
## 2113    10 53016 1.886223e-04
## 2114    10 53016 1.886223e-04
## 2115    10 53016 1.886223e-04
## 2116    10 53016 1.886223e-04
## 2117    10 53016 1.886223e-04
## 2118    10 53016 1.886223e-04
## 2119    10 53016 1.886223e-04
## 2120    10 53016 1.886223e-04
## 2121    10 53016 1.886223e-04
## 2122    10 53016 1.886223e-04
## 2123    10 53016 1.886223e-04
## 2124    10 53016 1.886223e-04
## 2125    10 53016 1.886223e-04
## 2126    10 53016 1.886223e-04
## 2127    10 53016 1.886223e-04
## 2128    10 53016 1.886223e-04
## 2129    10 53016 1.886223e-04
## 2130    10 53016 1.886223e-04
## 2131    10 53016 1.886223e-04
## 2132    10 53016 1.886223e-04
## 2133    10 53016 1.886223e-04
## 2134    10 53016 1.886223e-04
## 2135    10 53016 1.886223e-04
## 2136    10 53016 1.886223e-04
## 2137    10 53016 1.886223e-04
## 2138    10 53016 1.886223e-04
## 2139    10 53016 1.886223e-04
## 2140    10 53016 1.886223e-04
## 2141    10 53016 1.886223e-04
## 2142    10 53016 1.886223e-04
## 2143    10 53016 1.886223e-04
## 2144    10 53016 1.886223e-04
## 2145    10 53016 1.886223e-04
## 2146    10 53016 1.886223e-04
## 2147    10 53016 1.886223e-04
## 2148    10 53016 1.886223e-04
## 2149    10 53016 1.886223e-04
## 2150    10 53016 1.886223e-04
## 2151    10 53016 1.886223e-04
## 2152    10 53016 1.886223e-04
## 2153    10 53016 1.886223e-04
## 2154    10 53016 1.886223e-04
## 2155    10 53016 1.886223e-04
## 2156    10 53016 1.886223e-04
## 2157    10 53016 1.886223e-04
## 2158    10 53016 1.886223e-04
## 2159    10 53016 1.886223e-04
## 2160    10 53016 1.886223e-04
## 2161    10 53016 1.886223e-04
## 2162    10 53016 1.886223e-04
## 2163    10 53016 1.886223e-04
## 2164    10 53016 1.886223e-04
## 2165    10 53016 1.886223e-04
## 2166    10 53016 1.886223e-04
## 2167    10 53016 1.886223e-04
## 2168    10 53016 1.886223e-04
## 2169    10 53016 1.886223e-04
## 2170    10 53016 1.886223e-04
## 2171    10 16547 6.043392e-04
## 2172    10 16547 6.043392e-04
## 2173    10 16547 6.043392e-04
## 2174    10 16547 6.043392e-04
## 2175    10 16547 6.043392e-04
## 2176    10 16547 6.043392e-04
## 2177    10 16547 6.043392e-04
## 2178    10 16547 6.043392e-04
## 2179    10 16547 6.043392e-04
## 2180    10 16547 6.043392e-04
## 2181    10 16547 6.043392e-04
## 2182    10 16547 6.043392e-04
## 2183    10 16547 6.043392e-04
## 2184    10 16547 6.043392e-04
## 2185    10 16547 6.043392e-04
## 2186    10 16547 6.043392e-04
## 2187    10 16547 6.043392e-04
## 2188    10 16547 6.043392e-04
## 2189    10 16547 6.043392e-04
## 2190    10 16547 6.043392e-04
## 2191    10 16547 6.043392e-04
## 2192    10 16547 6.043392e-04
## 2193    10 16547 6.043392e-04
## 2194    10 16547 6.043392e-04
## 2195    10 16547 6.043392e-04
## 2196    10 16547 6.043392e-04
## 2197     9 70067 1.284485e-04
## 2198     9 70067 1.284485e-04
## 2199     9 70067 1.284485e-04
## 2200     9 70067 1.284485e-04
## 2201     9 70067 1.284485e-04
## 2202     9 70067 1.284485e-04
## 2203     9 70067 1.284485e-04
## 2204     9 70067 1.284485e-04
## 2205     9 70067 1.284485e-04
## 2206     9 70067 1.284485e-04
## 2207     9 70067 1.284485e-04
## 2208     9 70067 1.284485e-04
## 2209     9 70067 1.284485e-04
## 2210     9 70067 1.284485e-04
## 2211     9 70067 1.284485e-04
## 2212     9 70067 1.284485e-04
## 2213     9 70067 1.284485e-04
## 2214     9 70067 1.284485e-04
## 2215     9 70067 1.284485e-04
## 2216     9 70067 1.284485e-04
## 2217     9 70067 1.284485e-04
## 2218     9 70067 1.284485e-04
## 2219     9 70067 1.284485e-04
## 2220     9 70067 1.284485e-04
## 2221     9 70067 1.284485e-04
## 2222     9 70067 1.284485e-04
## 2223     9 70067 1.284485e-04
## 2224     9 70067 1.284485e-04
## 2225     9 70067 1.284485e-04
## 2226     9 70067 1.284485e-04
## 2227     9 70067 1.284485e-04
## 2228     9 70067 1.284485e-04
## 2229     9 70067 1.284485e-04
## 2230     9 70067 1.284485e-04
## 2231     9 70067 1.284485e-04
## 2232     9 70067 1.284485e-04
## 2233     9 70067 1.284485e-04
## 2234     9 70067 1.284485e-04
## 2235     9 70067 1.284485e-04
## 2236     9 70067 1.284485e-04
## 2237     9 70067 1.284485e-04
## 2238     9 70067 1.284485e-04
## 2239     9 70067 1.284485e-04
## 2240     9 70067 1.284485e-04
## 2241     9 70067 1.284485e-04
## 2242     9 70067 1.284485e-04
## 2243     9 70067 1.284485e-04
## 2244     9 70067 1.284485e-04
## 2245     9 70067 1.284485e-04
## 2246     9 70067 1.284485e-04
## 2247     9 70067 1.284485e-04
## 2248     9 70067 1.284485e-04
## 2249     9 70067 1.284485e-04
## 2250     9 70067 1.284485e-04
## 2251     9 70067 1.284485e-04
## 2252     9 70067 1.284485e-04
## 2253     9 70067 1.284485e-04
## 2254     9 70067 1.284485e-04
## 2255     9 70067 1.284485e-04
## 2256     9 70067 1.284485e-04
## 2257     9 70067 1.284485e-04
## 2258     9 70067 1.284485e-04
## 2259     9 70067 1.284485e-04
## 2260     9 70067 1.284485e-04
## 2261     9 70067 1.284485e-04
## 2262     9 70067 1.284485e-04
## 2263     9 70067 1.284485e-04
## 2264     9 70067 1.284485e-04
## 2265     9 70067 1.284485e-04
## 2266     9 70067 1.284485e-04
## 2267     9 70067 1.284485e-04
## 2268     9 70067 1.284485e-04
## 2269     9 70067 1.284485e-04
## 2270     9 70067 1.284485e-04
## 2271     9 70067 1.284485e-04
## 2272     9 70067 1.284485e-04
## 2273     9 70067 1.284485e-04
## 2274     9 70067 1.284485e-04
## 2275     9 70067 1.284485e-04
## 2276     9 70067 1.284485e-04
## 2277     9 70067 1.284485e-04
## 2278     9 70067 1.284485e-04
## 2279     9 70067 1.284485e-04
## 2280     9 70067 1.284485e-04
## 2281     9 70067 1.284485e-04
## 2282     9 70067 1.284485e-04
## 2283     9 70067 1.284485e-04
## 2284     9 70067 1.284485e-04
## 2285     9 70067 1.284485e-04
## 2286     9 70067 1.284485e-04
## 2287     9 70067 1.284485e-04
## 2288     9 70067 1.284485e-04
## 2289     9 70067 1.284485e-04
## 2290     9 70067 1.284485e-04
## 2291     9 70067 1.284485e-04
## 2292     9 70067 1.284485e-04
## 2293     9 70067 1.284485e-04
## 2294     9 70067 1.284485e-04
## 2295     9 70067 1.284485e-04
## 2296     9 70067 1.284485e-04
## 2297     9 70067 1.284485e-04
## 2298     9 70067 1.284485e-04
## 2299     9 70067 1.284485e-04
## 2300     9 70067 1.284485e-04
## 2301     9 70067 1.284485e-04
## 2302     9 70067 1.284485e-04
## 2303     9 70067 1.284485e-04
## 2304     9 70067 1.284485e-04
## 2305     9 70067 1.284485e-04
## 2306     9 70067 1.284485e-04
## 2307     9 70067 1.284485e-04
## 2308     9 70067 1.284485e-04
## 2309     9 70067 1.284485e-04
## 2310     9 70067 1.284485e-04
## 2311     9 70067 1.284485e-04
## 2312     9 70067 1.284485e-04
## 2313     9 70067 1.284485e-04
## 2314     9 70067 1.284485e-04
## 2315     9 70067 1.284485e-04
## 2316     9 70067 1.284485e-04
## 2317     9 70067 1.284485e-04
## 2318     9 70067 1.284485e-04
## 2319     9 70067 1.284485e-04
## 2320     9 70067 1.284485e-04
## 2321     9 70067 1.284485e-04
## 2322     9 70067 1.284485e-04
## 2323     9 70067 1.284485e-04
## 2324     9 70067 1.284485e-04
## 2325     9 70067 1.284485e-04
## 2326     9 70067 1.284485e-04
## 2327     9 53016 1.697601e-04
## 2328     9 53016 1.697601e-04
## 2329     9 53016 1.697601e-04
## 2330     9 53016 1.697601e-04
## 2331     9 53016 1.697601e-04
## 2332     9 53016 1.697601e-04
## 2333     9 53016 1.697601e-04
## 2334     9 53016 1.697601e-04
## 2335     9 53016 1.697601e-04
## 2336     9 53016 1.697601e-04
## 2337     9 53016 1.697601e-04
## 2338     9 53016 1.697601e-04
## 2339     9 53016 1.697601e-04
## 2340     9 53016 1.697601e-04
## 2341     9 53016 1.697601e-04
## 2342     9 53016 1.697601e-04
## 2343     9 53016 1.697601e-04
## 2344     9 53016 1.697601e-04
## 2345     9 53016 1.697601e-04
## 2346     9 53016 1.697601e-04
## 2347     9 53016 1.697601e-04
## 2348     9 53016 1.697601e-04
## 2349     9 53016 1.697601e-04
## 2350     9 53016 1.697601e-04
## 2351     9 53016 1.697601e-04
## 2352     9 53016 1.697601e-04
## 2353     9 53016 1.697601e-04
## 2354     9 53016 1.697601e-04
## 2355     9 53016 1.697601e-04
## 2356     9 53016 1.697601e-04
## 2357     9 53016 1.697601e-04
## 2358     9 53016 1.697601e-04
## 2359     9 53016 1.697601e-04
## 2360     9 53016 1.697601e-04
## 2361     9 53016 1.697601e-04
## 2362     9 53016 1.697601e-04
## 2363     9 53016 1.697601e-04
## 2364     9 53016 1.697601e-04
## 2365     9 53016 1.697601e-04
## 2366     9 53016 1.697601e-04
## 2367     9 53016 1.697601e-04
## 2368     9 53016 1.697601e-04
## 2369     9 53016 1.697601e-04
## 2370     9 53016 1.697601e-04
## 2371     9 53016 1.697601e-04
## 2372     9 53016 1.697601e-04
## 2373     9 53016 1.697601e-04
## 2374     9 53016 1.697601e-04
## 2375     9 53016 1.697601e-04
## 2376     9 53016 1.697601e-04
## 2377     9 53016 1.697601e-04
## 2378     9 53016 1.697601e-04
## 2379     9 53016 1.697601e-04
## 2380     9 53016 1.697601e-04
## 2381     9 53016 1.697601e-04
## 2382     9 53016 1.697601e-04
## 2383     9 53016 1.697601e-04
## 2384     9 53016 1.697601e-04
## 2385     9 53016 1.697601e-04
## 2386     9 53016 1.697601e-04
## 2387     9 53016 1.697601e-04
## 2388     9 53016 1.697601e-04
## 2389     9 53016 1.697601e-04
## 2390     9 53016 1.697601e-04
## 2391     9 53016 1.697601e-04
## 2392     9 53016 1.697601e-04
## 2393     9 53016 1.697601e-04
## 2394     9 53016 1.697601e-04
## 2395     9 53016 1.697601e-04
## 2396     9 53016 1.697601e-04
## 2397     9 53016 1.697601e-04
## 2398     9 53016 1.697601e-04
## 2399     9 53016 1.697601e-04
## 2400     9 53016 1.697601e-04
## 2401     9 53016 1.697601e-04
## 2402     9 53016 1.697601e-04
## 2403     9 53016 1.697601e-04
## 2404     9 53016 1.697601e-04
## 2405     9 53016 1.697601e-04
## 2406     9 53016 1.697601e-04
## 2407     9 53016 1.697601e-04
## 2408     9 53016 1.697601e-04
## 2409     9 53016 1.697601e-04
## 2410     9 53016 1.697601e-04
## 2411     9 53016 1.697601e-04
## 2412     9 53016 1.697601e-04
## 2413     9 53016 1.697601e-04
## 2414     9 53016 1.697601e-04
## 2415     9 53016 1.697601e-04
## 2416     9 53016 1.697601e-04
## 2417     9 53016 1.697601e-04
## 2418     9 53016 1.697601e-04
## 2419     9 53016 1.697601e-04
## 2420     9 53016 1.697601e-04
## 2421     9 53016 1.697601e-04
## 2422     9 53016 1.697601e-04
## 2423     9 53016 1.697601e-04
## 2424     9 53016 1.697601e-04
## 2425     9 53016 1.697601e-04
## 2426     9 16547 5.439052e-04
## 2427     9 16547 5.439052e-04
## 2428     9 16547 5.439052e-04
## 2429     9 16547 5.439052e-04
## 2430     9 16547 5.439052e-04
## 2431     9 16547 5.439052e-04
## 2432     9 16547 5.439052e-04
## 2433     9 16547 5.439052e-04
## 2434     9 16547 5.439052e-04
## 2435     9 16547 5.439052e-04
## 2436     9 16547 5.439052e-04
## 2437     9 16547 5.439052e-04
## 2438     9 16547 5.439052e-04
## 2439     9 16547 5.439052e-04
## 2440     9 16547 5.439052e-04
## 2441     9 16547 5.439052e-04
## 2442     9 16547 5.439052e-04
## 2443     9 16547 5.439052e-04
## 2444     9 16547 5.439052e-04
## 2445     9 16547 5.439052e-04
## 2446     9 16547 5.439052e-04
## 2447     9 16547 5.439052e-04
## 2448     9 16547 5.439052e-04
## 2449     9 16547 5.439052e-04
## 2450     9 16547 5.439052e-04
## 2451     9 16547 5.439052e-04
## 2452     9 16547 5.439052e-04
## 2453     9 16547 5.439052e-04
## 2454     9 16547 5.439052e-04
## 2455     9 16547 5.439052e-04
## 2456     9 16547 5.439052e-04
## 2457     9 16547 5.439052e-04
## 2458     9 16547 5.439052e-04
## 2459     9 16547 5.439052e-04
## 2460     9 16547 5.439052e-04
## 2461     9 16547 5.439052e-04
## 2462     9 16547 5.439052e-04
## 2463     9 16547 5.439052e-04
## 2464     9 16547 5.439052e-04
## 2465     9 16547 5.439052e-04
## 2466     9 16547 5.439052e-04
## 2467     9 16547 5.439052e-04
## 2468     8 70067 1.141764e-04
## 2469     8 70067 1.141764e-04
## 2470     8 70067 1.141764e-04
## 2471     8 70067 1.141764e-04
## 2472     8 70067 1.141764e-04
## 2473     8 70067 1.141764e-04
## 2474     8 70067 1.141764e-04
## 2475     8 70067 1.141764e-04
## 2476     8 70067 1.141764e-04
## 2477     8 70067 1.141764e-04
## 2478     8 70067 1.141764e-04
## 2479     8 70067 1.141764e-04
## 2480     8 70067 1.141764e-04
## 2481     8 70067 1.141764e-04
## 2482     8 70067 1.141764e-04
## 2483     8 70067 1.141764e-04
## 2484     8 70067 1.141764e-04
## 2485     8 70067 1.141764e-04
## 2486     8 70067 1.141764e-04
## 2487     8 70067 1.141764e-04
## 2488     8 70067 1.141764e-04
## 2489     8 70067 1.141764e-04
## 2490     8 70067 1.141764e-04
## 2491     8 70067 1.141764e-04
## 2492     8 70067 1.141764e-04
## 2493     8 70067 1.141764e-04
## 2494     8 70067 1.141764e-04
## 2495     8 70067 1.141764e-04
## 2496     8 70067 1.141764e-04
## 2497     8 70067 1.141764e-04
## 2498     8 70067 1.141764e-04
## 2499     8 70067 1.141764e-04
## 2500     8 70067 1.141764e-04
## 2501     8 70067 1.141764e-04
## 2502     8 70067 1.141764e-04
## 2503     8 70067 1.141764e-04
## 2504     8 70067 1.141764e-04
## 2505     8 70067 1.141764e-04
## 2506     8 70067 1.141764e-04
## 2507     8 70067 1.141764e-04
## 2508     8 70067 1.141764e-04
## 2509     8 70067 1.141764e-04
## 2510     8 70067 1.141764e-04
## 2511     8 70067 1.141764e-04
## 2512     8 70067 1.141764e-04
## 2513     8 70067 1.141764e-04
## 2514     8 70067 1.141764e-04
## 2515     8 70067 1.141764e-04
## 2516     8 70067 1.141764e-04
## 2517     8 70067 1.141764e-04
## 2518     8 70067 1.141764e-04
## 2519     8 70067 1.141764e-04
## 2520     8 70067 1.141764e-04
## 2521     8 70067 1.141764e-04
## 2522     8 70067 1.141764e-04
## 2523     8 70067 1.141764e-04
## 2524     8 70067 1.141764e-04
## 2525     8 70067 1.141764e-04
## 2526     8 70067 1.141764e-04
## 2527     8 70067 1.141764e-04
## 2528     8 70067 1.141764e-04
## 2529     8 70067 1.141764e-04
## 2530     8 70067 1.141764e-04
## 2531     8 70067 1.141764e-04
## 2532     8 70067 1.141764e-04
## 2533     8 70067 1.141764e-04
## 2534     8 70067 1.141764e-04
## 2535     8 70067 1.141764e-04
## 2536     8 70067 1.141764e-04
## 2537     8 70067 1.141764e-04
## 2538     8 70067 1.141764e-04
## 2539     8 70067 1.141764e-04
## 2540     8 70067 1.141764e-04
## 2541     8 70067 1.141764e-04
## 2542     8 70067 1.141764e-04
## 2543     8 70067 1.141764e-04
## 2544     8 70067 1.141764e-04
## 2545     8 70067 1.141764e-04
## 2546     8 70067 1.141764e-04
## 2547     8 70067 1.141764e-04
## 2548     8 70067 1.141764e-04
## 2549     8 70067 1.141764e-04
## 2550     8 70067 1.141764e-04
## 2551     8 70067 1.141764e-04
## 2552     8 70067 1.141764e-04
## 2553     8 70067 1.141764e-04
## 2554     8 70067 1.141764e-04
## 2555     8 70067 1.141764e-04
## 2556     8 70067 1.141764e-04
## 2557     8 70067 1.141764e-04
## 2558     8 70067 1.141764e-04
## 2559     8 70067 1.141764e-04
## 2560     8 70067 1.141764e-04
## 2561     8 70067 1.141764e-04
## 2562     8 70067 1.141764e-04
## 2563     8 70067 1.141764e-04
## 2564     8 70067 1.141764e-04
## 2565     8 70067 1.141764e-04
## 2566     8 70067 1.141764e-04
## 2567     8 70067 1.141764e-04
## 2568     8 70067 1.141764e-04
## 2569     8 70067 1.141764e-04
## 2570     8 70067 1.141764e-04
## 2571     8 70067 1.141764e-04
## 2572     8 70067 1.141764e-04
## 2573     8 70067 1.141764e-04
## 2574     8 70067 1.141764e-04
## 2575     8 70067 1.141764e-04
## 2576     8 70067 1.141764e-04
## 2577     8 70067 1.141764e-04
## 2578     8 70067 1.141764e-04
## 2579     8 70067 1.141764e-04
## 2580     8 70067 1.141764e-04
## 2581     8 70067 1.141764e-04
## 2582     8 70067 1.141764e-04
## 2583     8 70067 1.141764e-04
## 2584     8 70067 1.141764e-04
## 2585     8 70067 1.141764e-04
## 2586     8 70067 1.141764e-04
## 2587     8 70067 1.141764e-04
## 2588     8 70067 1.141764e-04
## 2589     8 70067 1.141764e-04
## 2590     8 70067 1.141764e-04
## 2591     8 70067 1.141764e-04
## 2592     8 70067 1.141764e-04
## 2593     8 70067 1.141764e-04
## 2594     8 70067 1.141764e-04
## 2595     8 70067 1.141764e-04
## 2596     8 70067 1.141764e-04
## 2597     8 70067 1.141764e-04
## 2598     8 70067 1.141764e-04
## 2599     8 70067 1.141764e-04
## 2600     8 70067 1.141764e-04
## 2601     8 70067 1.141764e-04
## 2602     8 70067 1.141764e-04
## 2603     8 70067 1.141764e-04
## 2604     8 70067 1.141764e-04
## 2605     8 70067 1.141764e-04
## 2606     8 70067 1.141764e-04
## 2607     8 70067 1.141764e-04
## 2608     8 70067 1.141764e-04
## 2609     8 70067 1.141764e-04
## 2610     8 70067 1.141764e-04
## 2611     8 70067 1.141764e-04
## 2612     8 70067 1.141764e-04
## 2613     8 70067 1.141764e-04
## 2614     8 70067 1.141764e-04
## 2615     8 70067 1.141764e-04
## 2616     8 70067 1.141764e-04
## 2617     8 70067 1.141764e-04
## 2618     8 70067 1.141764e-04
## 2619     8 70067 1.141764e-04
## 2620     8 70067 1.141764e-04
## 2621     8 70067 1.141764e-04
## 2622     8 70067 1.141764e-04
## 2623     8 70067 1.141764e-04
## 2624     8 70067 1.141764e-04
## 2625     8 70067 1.141764e-04
## 2626     8 70067 1.141764e-04
## 2627     8 70067 1.141764e-04
## 2628     8 70067 1.141764e-04
## 2629     8 70067 1.141764e-04
## 2630     8 70067 1.141764e-04
## 2631     8 70067 1.141764e-04
## 2632     8 70067 1.141764e-04
## 2633     8 70067 1.141764e-04
## 2634     8 70067 1.141764e-04
## 2635     8 70067 1.141764e-04
## 2636     8 70067 1.141764e-04
## 2637     8 70067 1.141764e-04
## 2638     8 70067 1.141764e-04
## 2639     8 70067 1.141764e-04
## 2640     8 70067 1.141764e-04
## 2641     8 70067 1.141764e-04
## 2642     8 70067 1.141764e-04
## 2643     8 70067 1.141764e-04
## 2644     8 70067 1.141764e-04
## 2645     8 70067 1.141764e-04
## 2646     8 70067 1.141764e-04
## 2647     8 70067 1.141764e-04
## 2648     8 70067 1.141764e-04
## 2649     8 70067 1.141764e-04
## 2650     8 70067 1.141764e-04
## 2651     8 70067 1.141764e-04
## 2652     8 70067 1.141764e-04
## 2653     8 70067 1.141764e-04
## 2654     8 70067 1.141764e-04
## 2655     8 70067 1.141764e-04
## 2656     8 70067 1.141764e-04
## 2657     8 70067 1.141764e-04
## 2658     8 53016 1.508978e-04
## 2659     8 53016 1.508978e-04
## 2660     8 53016 1.508978e-04
## 2661     8 53016 1.508978e-04
## 2662     8 53016 1.508978e-04
## 2663     8 53016 1.508978e-04
## 2664     8 53016 1.508978e-04
## 2665     8 53016 1.508978e-04
## 2666     8 53016 1.508978e-04
## 2667     8 53016 1.508978e-04
## 2668     8 53016 1.508978e-04
## 2669     8 53016 1.508978e-04
## 2670     8 53016 1.508978e-04
## 2671     8 53016 1.508978e-04
## 2672     8 53016 1.508978e-04
## 2673     8 53016 1.508978e-04
## 2674     8 53016 1.508978e-04
## 2675     8 53016 1.508978e-04
## 2676     8 53016 1.508978e-04
## 2677     8 53016 1.508978e-04
## 2678     8 53016 1.508978e-04
## 2679     8 53016 1.508978e-04
## 2680     8 53016 1.508978e-04
## 2681     8 53016 1.508978e-04
## 2682     8 53016 1.508978e-04
## 2683     8 53016 1.508978e-04
## 2684     8 53016 1.508978e-04
## 2685     8 53016 1.508978e-04
## 2686     8 53016 1.508978e-04
## 2687     8 53016 1.508978e-04
## 2688     8 53016 1.508978e-04
## 2689     8 53016 1.508978e-04
## 2690     8 53016 1.508978e-04
## 2691     8 53016 1.508978e-04
## 2692     8 53016 1.508978e-04
## 2693     8 53016 1.508978e-04
## 2694     8 53016 1.508978e-04
## 2695     8 53016 1.508978e-04
## 2696     8 53016 1.508978e-04
## 2697     8 53016 1.508978e-04
## 2698     8 53016 1.508978e-04
## 2699     8 53016 1.508978e-04
## 2700     8 53016 1.508978e-04
## 2701     8 53016 1.508978e-04
## 2702     8 53016 1.508978e-04
## 2703     8 53016 1.508978e-04
## 2704     8 53016 1.508978e-04
## 2705     8 53016 1.508978e-04
## 2706     8 53016 1.508978e-04
## 2707     8 53016 1.508978e-04
## 2708     8 53016 1.508978e-04
## 2709     8 53016 1.508978e-04
## 2710     8 53016 1.508978e-04
## 2711     8 53016 1.508978e-04
## 2712     8 53016 1.508978e-04
## 2713     8 53016 1.508978e-04
## 2714     8 53016 1.508978e-04
## 2715     8 53016 1.508978e-04
## 2716     8 53016 1.508978e-04
## 2717     8 53016 1.508978e-04
## 2718     8 53016 1.508978e-04
## 2719     8 53016 1.508978e-04
## 2720     8 53016 1.508978e-04
## 2721     8 53016 1.508978e-04
## 2722     8 53016 1.508978e-04
## 2723     8 53016 1.508978e-04
## 2724     8 53016 1.508978e-04
## 2725     8 53016 1.508978e-04
## 2726     8 53016 1.508978e-04
## 2727     8 53016 1.508978e-04
## 2728     8 53016 1.508978e-04
## 2729     8 53016 1.508978e-04
## 2730     8 53016 1.508978e-04
## 2731     8 53016 1.508978e-04
## 2732     8 53016 1.508978e-04
## 2733     8 53016 1.508978e-04
## 2734     8 53016 1.508978e-04
## 2735     8 53016 1.508978e-04
## 2736     8 53016 1.508978e-04
## 2737     8 53016 1.508978e-04
## 2738     8 53016 1.508978e-04
## 2739     8 53016 1.508978e-04
## 2740     8 53016 1.508978e-04
## 2741     8 53016 1.508978e-04
## 2742     8 53016 1.508978e-04
## 2743     8 53016 1.508978e-04
## 2744     8 53016 1.508978e-04
## 2745     8 53016 1.508978e-04
## 2746     8 53016 1.508978e-04
## 2747     8 53016 1.508978e-04
## 2748     8 53016 1.508978e-04
## 2749     8 53016 1.508978e-04
## 2750     8 53016 1.508978e-04
## 2751     8 53016 1.508978e-04
## 2752     8 53016 1.508978e-04
## 2753     8 53016 1.508978e-04
## 2754     8 53016 1.508978e-04
## 2755     8 53016 1.508978e-04
## 2756     8 53016 1.508978e-04
## 2757     8 53016 1.508978e-04
## 2758     8 53016 1.508978e-04
## 2759     8 53016 1.508978e-04
## 2760     8 53016 1.508978e-04
## 2761     8 53016 1.508978e-04
## 2762     8 53016 1.508978e-04
## 2763     8 53016 1.508978e-04
## 2764     8 53016 1.508978e-04
## 2765     8 53016 1.508978e-04
## 2766     8 53016 1.508978e-04
## 2767     8 53016 1.508978e-04
## 2768     8 53016 1.508978e-04
## 2769     8 53016 1.508978e-04
## 2770     8 53016 1.508978e-04
## 2771     8 53016 1.508978e-04
## 2772     8 53016 1.508978e-04
## 2773     8 53016 1.508978e-04
## 2774     8 53016 1.508978e-04
## 2775     8 53016 1.508978e-04
## 2776     8 53016 1.508978e-04
## 2777     8 16547 4.834713e-04
## 2778     8 16547 4.834713e-04
## 2779     8 16547 4.834713e-04
## 2780     8 16547 4.834713e-04
## 2781     8 16547 4.834713e-04
## 2782     8 16547 4.834713e-04
## 2783     8 16547 4.834713e-04
## 2784     8 16547 4.834713e-04
## 2785     8 16547 4.834713e-04
## 2786     8 16547 4.834713e-04
## 2787     8 16547 4.834713e-04
## 2788     8 16547 4.834713e-04
## 2789     8 16547 4.834713e-04
## 2790     8 16547 4.834713e-04
## 2791     8 16547 4.834713e-04
## 2792     8 16547 4.834713e-04
## 2793     8 16547 4.834713e-04
## 2794     8 16547 4.834713e-04
## 2795     8 16547 4.834713e-04
## 2796     8 16547 4.834713e-04
## 2797     8 16547 4.834713e-04
## 2798     8 16547 4.834713e-04
## 2799     8 16547 4.834713e-04
## 2800     8 16547 4.834713e-04
## 2801     8 16547 4.834713e-04
## 2802     8 16547 4.834713e-04
## 2803     8 16547 4.834713e-04
## 2804     8 16547 4.834713e-04
## 2805     8 16547 4.834713e-04
## 2806     8 16547 4.834713e-04
## 2807     8 16547 4.834713e-04
## 2808     8 16547 4.834713e-04
## 2809     8 16547 4.834713e-04
## 2810     8 16547 4.834713e-04
## 2811     8 16547 4.834713e-04
## 2812     8 16547 4.834713e-04
## 2813     8 16547 4.834713e-04
## 2814     8 16547 4.834713e-04
## 2815     8 16547 4.834713e-04
## 2816     8 16547 4.834713e-04
## 2817     8 16547 4.834713e-04
## 2818     8 16547 4.834713e-04
## 2819     8 16547 4.834713e-04
## 2820     8 16547 4.834713e-04
## 2821     8 16547 4.834713e-04
## 2822     8 16547 4.834713e-04
## 2823     8 16547 4.834713e-04
## 2824     7 70067 9.990438e-05
## 2825     7 70067 9.990438e-05
## 2826     7 70067 9.990438e-05
## 2827     7 70067 9.990438e-05
## 2828     7 70067 9.990438e-05
## 2829     7 70067 9.990438e-05
## 2830     7 70067 9.990438e-05
## 2831     7 70067 9.990438e-05
## 2832     7 70067 9.990438e-05
## 2833     7 70067 9.990438e-05
## 2834     7 70067 9.990438e-05
## 2835     7 70067 9.990438e-05
## 2836     7 70067 9.990438e-05
## 2837     7 70067 9.990438e-05
## 2838     7 70067 9.990438e-05
## 2839     7 70067 9.990438e-05
## 2840     7 70067 9.990438e-05
## 2841     7 70067 9.990438e-05
## 2842     7 70067 9.990438e-05
## 2843     7 70067 9.990438e-05
## 2844     7 70067 9.990438e-05
## 2845     7 70067 9.990438e-05
## 2846     7 70067 9.990438e-05
## 2847     7 70067 9.990438e-05
## 2848     7 70067 9.990438e-05
## 2849     7 70067 9.990438e-05
## 2850     7 70067 9.990438e-05
## 2851     7 70067 9.990438e-05
## 2852     7 70067 9.990438e-05
## 2853     7 70067 9.990438e-05
## 2854     7 70067 9.990438e-05
## 2855     7 70067 9.990438e-05
## 2856     7 70067 9.990438e-05
## 2857     7 70067 9.990438e-05
## 2858     7 70067 9.990438e-05
## 2859     7 70067 9.990438e-05
## 2860     7 70067 9.990438e-05
## 2861     7 70067 9.990438e-05
## 2862     7 70067 9.990438e-05
## 2863     7 70067 9.990438e-05
## 2864     7 70067 9.990438e-05
## 2865     7 70067 9.990438e-05
## 2866     7 70067 9.990438e-05
## 2867     7 70067 9.990438e-05
## 2868     7 70067 9.990438e-05
## 2869     7 70067 9.990438e-05
## 2870     7 70067 9.990438e-05
## 2871     7 70067 9.990438e-05
## 2872     7 70067 9.990438e-05
## 2873     7 70067 9.990438e-05
## 2874     7 70067 9.990438e-05
## 2875     7 70067 9.990438e-05
## 2876     7 70067 9.990438e-05
## 2877     7 70067 9.990438e-05
## 2878     7 70067 9.990438e-05
## 2879     7 70067 9.990438e-05
## 2880     7 70067 9.990438e-05
## 2881     7 70067 9.990438e-05
## 2882     7 70067 9.990438e-05
## 2883     7 70067 9.990438e-05
## 2884     7 70067 9.990438e-05
## 2885     7 70067 9.990438e-05
## 2886     7 70067 9.990438e-05
## 2887     7 70067 9.990438e-05
## 2888     7 70067 9.990438e-05
## 2889     7 70067 9.990438e-05
## 2890     7 70067 9.990438e-05
## 2891     7 70067 9.990438e-05
## 2892     7 70067 9.990438e-05
## 2893     7 70067 9.990438e-05
## 2894     7 70067 9.990438e-05
## 2895     7 70067 9.990438e-05
## 2896     7 70067 9.990438e-05
## 2897     7 70067 9.990438e-05
## 2898     7 70067 9.990438e-05
## 2899     7 70067 9.990438e-05
## 2900     7 70067 9.990438e-05
## 2901     7 70067 9.990438e-05
## 2902     7 70067 9.990438e-05
## 2903     7 70067 9.990438e-05
## 2904     7 70067 9.990438e-05
## 2905     7 70067 9.990438e-05
## 2906     7 70067 9.990438e-05
## 2907     7 70067 9.990438e-05
## 2908     7 70067 9.990438e-05
## 2909     7 70067 9.990438e-05
## 2910     7 70067 9.990438e-05
## 2911     7 70067 9.990438e-05
## 2912     7 70067 9.990438e-05
## 2913     7 70067 9.990438e-05
## 2914     7 70067 9.990438e-05
## 2915     7 70067 9.990438e-05
## 2916     7 70067 9.990438e-05
## 2917     7 70067 9.990438e-05
## 2918     7 70067 9.990438e-05
## 2919     7 70067 9.990438e-05
## 2920     7 70067 9.990438e-05
## 2921     7 70067 9.990438e-05
## 2922     7 70067 9.990438e-05
## 2923     7 70067 9.990438e-05
## 2924     7 70067 9.990438e-05
## 2925     7 70067 9.990438e-05
## 2926     7 70067 9.990438e-05
## 2927     7 70067 9.990438e-05
## 2928     7 70067 9.990438e-05
## 2929     7 70067 9.990438e-05
## 2930     7 70067 9.990438e-05
## 2931     7 70067 9.990438e-05
## 2932     7 70067 9.990438e-05
## 2933     7 70067 9.990438e-05
## 2934     7 70067 9.990438e-05
## 2935     7 70067 9.990438e-05
## 2936     7 70067 9.990438e-05
## 2937     7 70067 9.990438e-05
## 2938     7 70067 9.990438e-05
## 2939     7 70067 9.990438e-05
## 2940     7 70067 9.990438e-05
## 2941     7 70067 9.990438e-05
## 2942     7 70067 9.990438e-05
## 2943     7 70067 9.990438e-05
## 2944     7 70067 9.990438e-05
## 2945     7 70067 9.990438e-05
## 2946     7 70067 9.990438e-05
## 2947     7 70067 9.990438e-05
## 2948     7 70067 9.990438e-05
## 2949     7 70067 9.990438e-05
## 2950     7 70067 9.990438e-05
## 2951     7 70067 9.990438e-05
## 2952     7 70067 9.990438e-05
## 2953     7 70067 9.990438e-05
## 2954     7 70067 9.990438e-05
## 2955     7 70067 9.990438e-05
## 2956     7 70067 9.990438e-05
## 2957     7 70067 9.990438e-05
## 2958     7 70067 9.990438e-05
## 2959     7 70067 9.990438e-05
## 2960     7 70067 9.990438e-05
## 2961     7 70067 9.990438e-05
## 2962     7 70067 9.990438e-05
## 2963     7 70067 9.990438e-05
## 2964     7 70067 9.990438e-05
## 2965     7 70067 9.990438e-05
## 2966     7 70067 9.990438e-05
## 2967     7 70067 9.990438e-05
## 2968     7 70067 9.990438e-05
## 2969     7 70067 9.990438e-05
## 2970     7 70067 9.990438e-05
## 2971     7 70067 9.990438e-05
## 2972     7 70067 9.990438e-05
## 2973     7 70067 9.990438e-05
## 2974     7 70067 9.990438e-05
## 2975     7 70067 9.990438e-05
## 2976     7 70067 9.990438e-05
## 2977     7 70067 9.990438e-05
## 2978     7 70067 9.990438e-05
## 2979     7 70067 9.990438e-05
## 2980     7 70067 9.990438e-05
## 2981     7 70067 9.990438e-05
## 2982     7 70067 9.990438e-05
## 2983     7 70067 9.990438e-05
## 2984     7 70067 9.990438e-05
## 2985     7 70067 9.990438e-05
## 2986     7 70067 9.990438e-05
## 2987     7 70067 9.990438e-05
## 2988     7 70067 9.990438e-05
## 2989     7 70067 9.990438e-05
## 2990     7 70067 9.990438e-05
## 2991     7 70067 9.990438e-05
## 2992     7 70067 9.990438e-05
## 2993     7 70067 9.990438e-05
## 2994     7 70067 9.990438e-05
## 2995     7 70067 9.990438e-05
## 2996     7 70067 9.990438e-05
## 2997     7 70067 9.990438e-05
## 2998     7 70067 9.990438e-05
## 2999     7 70067 9.990438e-05
## 3000     7 70067 9.990438e-05
## 3001     7 70067 9.990438e-05
## 3002     7 70067 9.990438e-05
## 3003     7 70067 9.990438e-05
## 3004     7 70067 9.990438e-05
## 3005     7 70067 9.990438e-05
## 3006     7 70067 9.990438e-05
## 3007     7 70067 9.990438e-05
## 3008     7 70067 9.990438e-05
## 3009     7 70067 9.990438e-05
## 3010     7 70067 9.990438e-05
## 3011     7 70067 9.990438e-05
## 3012     7 70067 9.990438e-05
## 3013     7 70067 9.990438e-05
## 3014     7 70067 9.990438e-05
## 3015     7 70067 9.990438e-05
## 3016     7 70067 9.990438e-05
## 3017     7 70067 9.990438e-05
## 3018     7 70067 9.990438e-05
## 3019     7 70067 9.990438e-05
## 3020     7 70067 9.990438e-05
## 3021     7 70067 9.990438e-05
## 3022     7 70067 9.990438e-05
## 3023     7 70067 9.990438e-05
## 3024     7 70067 9.990438e-05
## 3025     7 70067 9.990438e-05
## 3026     7 70067 9.990438e-05
## 3027     7 70067 9.990438e-05
## 3028     7 70067 9.990438e-05
## 3029     7 53016 1.320356e-04
## 3030     7 53016 1.320356e-04
## 3031     7 53016 1.320356e-04
## 3032     7 53016 1.320356e-04
## 3033     7 53016 1.320356e-04
## 3034     7 53016 1.320356e-04
## 3035     7 53016 1.320356e-04
## 3036     7 53016 1.320356e-04
## 3037     7 53016 1.320356e-04
## 3038     7 53016 1.320356e-04
## 3039     7 53016 1.320356e-04
## 3040     7 53016 1.320356e-04
## 3041     7 53016 1.320356e-04
## 3042     7 53016 1.320356e-04
## 3043     7 53016 1.320356e-04
## 3044     7 53016 1.320356e-04
## 3045     7 53016 1.320356e-04
## 3046     7 53016 1.320356e-04
## 3047     7 53016 1.320356e-04
## 3048     7 53016 1.320356e-04
## 3049     7 53016 1.320356e-04
## 3050     7 53016 1.320356e-04
## 3051     7 53016 1.320356e-04
## 3052     7 53016 1.320356e-04
## 3053     7 53016 1.320356e-04
## 3054     7 53016 1.320356e-04
## 3055     7 53016 1.320356e-04
## 3056     7 53016 1.320356e-04
## 3057     7 53016 1.320356e-04
## 3058     7 53016 1.320356e-04
## 3059     7 53016 1.320356e-04
## 3060     7 53016 1.320356e-04
## 3061     7 53016 1.320356e-04
## 3062     7 53016 1.320356e-04
## 3063     7 53016 1.320356e-04
## 3064     7 53016 1.320356e-04
## 3065     7 53016 1.320356e-04
## 3066     7 53016 1.320356e-04
## 3067     7 53016 1.320356e-04
## 3068     7 53016 1.320356e-04
## 3069     7 53016 1.320356e-04
## 3070     7 53016 1.320356e-04
## 3071     7 53016 1.320356e-04
## 3072     7 53016 1.320356e-04
## 3073     7 53016 1.320356e-04
## 3074     7 53016 1.320356e-04
## 3075     7 53016 1.320356e-04
## 3076     7 53016 1.320356e-04
## 3077     7 53016 1.320356e-04
## 3078     7 53016 1.320356e-04
## 3079     7 53016 1.320356e-04
## 3080     7 53016 1.320356e-04
## 3081     7 53016 1.320356e-04
## 3082     7 53016 1.320356e-04
## 3083     7 53016 1.320356e-04
## 3084     7 53016 1.320356e-04
## 3085     7 53016 1.320356e-04
## 3086     7 53016 1.320356e-04
## 3087     7 53016 1.320356e-04
## 3088     7 53016 1.320356e-04
## 3089     7 53016 1.320356e-04
## 3090     7 53016 1.320356e-04
## 3091     7 53016 1.320356e-04
## 3092     7 53016 1.320356e-04
## 3093     7 53016 1.320356e-04
## 3094     7 53016 1.320356e-04
## 3095     7 53016 1.320356e-04
## 3096     7 53016 1.320356e-04
## 3097     7 53016 1.320356e-04
## 3098     7 53016 1.320356e-04
## 3099     7 53016 1.320356e-04
## 3100     7 53016 1.320356e-04
## 3101     7 53016 1.320356e-04
## 3102     7 53016 1.320356e-04
## 3103     7 53016 1.320356e-04
## 3104     7 53016 1.320356e-04
## 3105     7 53016 1.320356e-04
## 3106     7 53016 1.320356e-04
## 3107     7 53016 1.320356e-04
## 3108     7 53016 1.320356e-04
## 3109     7 53016 1.320356e-04
## 3110     7 53016 1.320356e-04
## 3111     7 53016 1.320356e-04
## 3112     7 53016 1.320356e-04
## 3113     7 53016 1.320356e-04
## 3114     7 53016 1.320356e-04
## 3115     7 53016 1.320356e-04
## 3116     7 53016 1.320356e-04
## 3117     7 53016 1.320356e-04
## 3118     7 53016 1.320356e-04
## 3119     7 53016 1.320356e-04
## 3120     7 53016 1.320356e-04
## 3121     7 53016 1.320356e-04
## 3122     7 53016 1.320356e-04
## 3123     7 53016 1.320356e-04
## 3124     7 53016 1.320356e-04
## 3125     7 53016 1.320356e-04
## 3126     7 53016 1.320356e-04
## 3127     7 53016 1.320356e-04
## 3128     7 53016 1.320356e-04
## 3129     7 53016 1.320356e-04
## 3130     7 53016 1.320356e-04
## 3131     7 53016 1.320356e-04
## 3132     7 53016 1.320356e-04
## 3133     7 53016 1.320356e-04
## 3134     7 53016 1.320356e-04
## 3135     7 53016 1.320356e-04
## 3136     7 53016 1.320356e-04
## 3137     7 53016 1.320356e-04
## 3138     7 53016 1.320356e-04
## 3139     7 53016 1.320356e-04
## 3140     7 53016 1.320356e-04
## 3141     7 53016 1.320356e-04
## 3142     7 53016 1.320356e-04
## 3143     7 53016 1.320356e-04
## 3144     7 53016 1.320356e-04
## 3145     7 53016 1.320356e-04
## 3146     7 53016 1.320356e-04
## 3147     7 53016 1.320356e-04
## 3148     7 53016 1.320356e-04
## 3149     7 53016 1.320356e-04
## 3150     7 53016 1.320356e-04
## 3151     7 53016 1.320356e-04
## 3152     7 53016 1.320356e-04
## 3153     7 53016 1.320356e-04
## 3154     7 53016 1.320356e-04
## 3155     7 53016 1.320356e-04
## 3156     7 53016 1.320356e-04
## 3157     7 53016 1.320356e-04
## 3158     7 53016 1.320356e-04
## 3159     7 53016 1.320356e-04
## 3160     7 53016 1.320356e-04
## 3161     7 53016 1.320356e-04
## 3162     7 53016 1.320356e-04
## 3163     7 53016 1.320356e-04
## 3164     7 53016 1.320356e-04
## 3165     7 53016 1.320356e-04
## 3166     7 53016 1.320356e-04
## 3167     7 53016 1.320356e-04
## 3168     7 53016 1.320356e-04
## 3169     7 53016 1.320356e-04
## 3170     7 53016 1.320356e-04
## 3171     7 53016 1.320356e-04
## 3172     7 53016 1.320356e-04
## 3173     7 53016 1.320356e-04
## 3174     7 53016 1.320356e-04
## 3175     7 53016 1.320356e-04
## 3176     7 53016 1.320356e-04
## 3177     7 53016 1.320356e-04
## 3178     7 53016 1.320356e-04
## 3179     7 53016 1.320356e-04
## 3180     7 53016 1.320356e-04
## 3181     7 53016 1.320356e-04
## 3182     7 53016 1.320356e-04
## 3183     7 53016 1.320356e-04
## 3184     7 53016 1.320356e-04
## 3185     7 53016 1.320356e-04
## 3186     7 53016 1.320356e-04
## 3187     7 53016 1.320356e-04
## 3188     7 53016 1.320356e-04
## 3189     7 53016 1.320356e-04
## 3190     7 53016 1.320356e-04
## 3191     7 16547 4.230374e-04
## 3192     7 16547 4.230374e-04
## 3193     7 16547 4.230374e-04
## 3194     7 16547 4.230374e-04
## 3195     7 16547 4.230374e-04
## 3196     7 16547 4.230374e-04
## 3197     7 16547 4.230374e-04
## 3198     7 16547 4.230374e-04
## 3199     7 16547 4.230374e-04
## 3200     7 16547 4.230374e-04
## 3201     7 16547 4.230374e-04
## 3202     7 16547 4.230374e-04
## 3203     7 16547 4.230374e-04
## 3204     7 16547 4.230374e-04
## 3205     7 16547 4.230374e-04
## 3206     7 16547 4.230374e-04
## 3207     7 16547 4.230374e-04
## 3208     7 16547 4.230374e-04
## 3209     7 16547 4.230374e-04
## 3210     7 16547 4.230374e-04
## 3211     7 16547 4.230374e-04
## 3212     7 16547 4.230374e-04
## 3213     7 16547 4.230374e-04
## 3214     7 16547 4.230374e-04
## 3215     7 16547 4.230374e-04
## 3216     7 16547 4.230374e-04
## 3217     7 16547 4.230374e-04
## 3218     7 16547 4.230374e-04
## 3219     7 16547 4.230374e-04
## 3220     7 16547 4.230374e-04
## 3221     7 16547 4.230374e-04
## 3222     7 16547 4.230374e-04
## 3223     7 16547 4.230374e-04
## 3224     7 16547 4.230374e-04
## 3225     7 16547 4.230374e-04
## 3226     7 16547 4.230374e-04
## 3227     7 16547 4.230374e-04
## 3228     7 16547 4.230374e-04
## 3229     7 16547 4.230374e-04
## 3230     7 16547 4.230374e-04
## 3231     7 16547 4.230374e-04
## 3232     7 16547 4.230374e-04
## 3233     7 16547 4.230374e-04
## 3234     7 16547 4.230374e-04
## 3235     7 16547 4.230374e-04
## 3236     7 16547 4.230374e-04
## 3237     7 16547 4.230374e-04
## 3238     7 16547 4.230374e-04
## 3239     7 16547 4.230374e-04
## 3240     7 16547 4.230374e-04
## 3241     7 16547 4.230374e-04
## 3242     7 16547 4.230374e-04
## 3243     7 16547 4.230374e-04
## 3244     7 16547 4.230374e-04
## 3245     7 16547 4.230374e-04
## 3246     7 16547 4.230374e-04
## 3247     7 16547 4.230374e-04
## 3248     7 16547 4.230374e-04
## 3249     6 70067 8.563232e-05
## 3250     6 70067 8.563232e-05
## 3251     6 70067 8.563232e-05
## 3252     6 70067 8.563232e-05
## 3253     6 70067 8.563232e-05
## 3254     6 70067 8.563232e-05
## 3255     6 70067 8.563232e-05
## 3256     6 70067 8.563232e-05
## 3257     6 70067 8.563232e-05
## 3258     6 70067 8.563232e-05
## 3259     6 70067 8.563232e-05
## 3260     6 70067 8.563232e-05
## 3261     6 70067 8.563232e-05
## 3262     6 70067 8.563232e-05
## 3263     6 70067 8.563232e-05
## 3264     6 70067 8.563232e-05
## 3265     6 70067 8.563232e-05
## 3266     6 70067 8.563232e-05
## 3267     6 70067 8.563232e-05
## 3268     6 70067 8.563232e-05
## 3269     6 70067 8.563232e-05
## 3270     6 70067 8.563232e-05
## 3271     6 70067 8.563232e-05
## 3272     6 70067 8.563232e-05
## 3273     6 70067 8.563232e-05
## 3274     6 70067 8.563232e-05
## 3275     6 70067 8.563232e-05
## 3276     6 70067 8.563232e-05
## 3277     6 70067 8.563232e-05
## 3278     6 70067 8.563232e-05
## 3279     6 70067 8.563232e-05
## 3280     6 70067 8.563232e-05
## 3281     6 70067 8.563232e-05
## 3282     6 70067 8.563232e-05
## 3283     6 70067 8.563232e-05
## 3284     6 70067 8.563232e-05
## 3285     6 70067 8.563232e-05
## 3286     6 70067 8.563232e-05
## 3287     6 70067 8.563232e-05
## 3288     6 70067 8.563232e-05
## 3289     6 70067 8.563232e-05
## 3290     6 70067 8.563232e-05
## 3291     6 70067 8.563232e-05
## 3292     6 70067 8.563232e-05
## 3293     6 70067 8.563232e-05
## 3294     6 70067 8.563232e-05
## 3295     6 70067 8.563232e-05
## 3296     6 70067 8.563232e-05
## 3297     6 70067 8.563232e-05
## 3298     6 70067 8.563232e-05
## 3299     6 70067 8.563232e-05
## 3300     6 70067 8.563232e-05
## 3301     6 70067 8.563232e-05
## 3302     6 70067 8.563232e-05
## 3303     6 70067 8.563232e-05
## 3304     6 70067 8.563232e-05
## 3305     6 70067 8.563232e-05
## 3306     6 70067 8.563232e-05
## 3307     6 70067 8.563232e-05
## 3308     6 70067 8.563232e-05
## 3309     6 70067 8.563232e-05
## 3310     6 70067 8.563232e-05
## 3311     6 70067 8.563232e-05
## 3312     6 70067 8.563232e-05
## 3313     6 70067 8.563232e-05
## 3314     6 70067 8.563232e-05
## 3315     6 70067 8.563232e-05
## 3316     6 70067 8.563232e-05
## 3317     6 70067 8.563232e-05
## 3318     6 70067 8.563232e-05
## 3319     6 70067 8.563232e-05
## 3320     6 70067 8.563232e-05
## 3321     6 70067 8.563232e-05
## 3322     6 70067 8.563232e-05
## 3323     6 70067 8.563232e-05
## 3324     6 70067 8.563232e-05
## 3325     6 70067 8.563232e-05
## 3326     6 70067 8.563232e-05
## 3327     6 70067 8.563232e-05
## 3328     6 70067 8.563232e-05
## 3329     6 70067 8.563232e-05
## 3330     6 70067 8.563232e-05
## 3331     6 70067 8.563232e-05
## 3332     6 70067 8.563232e-05
## 3333     6 70067 8.563232e-05
## 3334     6 70067 8.563232e-05
## 3335     6 70067 8.563232e-05
## 3336     6 70067 8.563232e-05
## 3337     6 70067 8.563232e-05
## 3338     6 70067 8.563232e-05
## 3339     6 70067 8.563232e-05
## 3340     6 70067 8.563232e-05
## 3341     6 70067 8.563232e-05
## 3342     6 70067 8.563232e-05
## 3343     6 70067 8.563232e-05
## 3344     6 70067 8.563232e-05
## 3345     6 70067 8.563232e-05
## 3346     6 70067 8.563232e-05
## 3347     6 70067 8.563232e-05
## 3348     6 70067 8.563232e-05
## 3349     6 70067 8.563232e-05
## 3350     6 70067 8.563232e-05
## 3351     6 70067 8.563232e-05
## 3352     6 70067 8.563232e-05
## 3353     6 70067 8.563232e-05
## 3354     6 70067 8.563232e-05
## 3355     6 70067 8.563232e-05
## 3356     6 70067 8.563232e-05
## 3357     6 70067 8.563232e-05
## 3358     6 70067 8.563232e-05
## 3359     6 70067 8.563232e-05
## 3360     6 70067 8.563232e-05
## 3361     6 70067 8.563232e-05
## 3362     6 70067 8.563232e-05
## 3363     6 70067 8.563232e-05
## 3364     6 70067 8.563232e-05
## 3365     6 70067 8.563232e-05
## 3366     6 70067 8.563232e-05
## 3367     6 70067 8.563232e-05
## 3368     6 70067 8.563232e-05
## 3369     6 70067 8.563232e-05
## 3370     6 70067 8.563232e-05
## 3371     6 70067 8.563232e-05
## 3372     6 70067 8.563232e-05
## 3373     6 70067 8.563232e-05
## 3374     6 70067 8.563232e-05
## 3375     6 70067 8.563232e-05
## 3376     6 70067 8.563232e-05
## 3377     6 70067 8.563232e-05
## 3378     6 70067 8.563232e-05
## 3379     6 70067 8.563232e-05
## 3380     6 70067 8.563232e-05
## 3381     6 70067 8.563232e-05
## 3382     6 70067 8.563232e-05
## 3383     6 70067 8.563232e-05
## 3384     6 70067 8.563232e-05
## 3385     6 70067 8.563232e-05
## 3386     6 70067 8.563232e-05
## 3387     6 70067 8.563232e-05
## 3388     6 70067 8.563232e-05
## 3389     6 70067 8.563232e-05
## 3390     6 70067 8.563232e-05
## 3391     6 70067 8.563232e-05
## 3392     6 70067 8.563232e-05
## 3393     6 70067 8.563232e-05
## 3394     6 70067 8.563232e-05
## 3395     6 70067 8.563232e-05
## 3396     6 70067 8.563232e-05
## 3397     6 70067 8.563232e-05
## 3398     6 70067 8.563232e-05
## 3399     6 70067 8.563232e-05
## 3400     6 70067 8.563232e-05
## 3401     6 70067 8.563232e-05
## 3402     6 70067 8.563232e-05
## 3403     6 70067 8.563232e-05
## 3404     6 70067 8.563232e-05
## 3405     6 70067 8.563232e-05
## 3406     6 70067 8.563232e-05
## 3407     6 70067 8.563232e-05
## 3408     6 70067 8.563232e-05
## 3409     6 70067 8.563232e-05
## 3410     6 70067 8.563232e-05
## 3411     6 70067 8.563232e-05
## 3412     6 70067 8.563232e-05
## 3413     6 70067 8.563232e-05
## 3414     6 70067 8.563232e-05
## 3415     6 70067 8.563232e-05
## 3416     6 70067 8.563232e-05
## 3417     6 70067 8.563232e-05
## 3418     6 70067 8.563232e-05
## 3419     6 70067 8.563232e-05
## 3420     6 70067 8.563232e-05
## 3421     6 70067 8.563232e-05
## 3422     6 70067 8.563232e-05
## 3423     6 70067 8.563232e-05
## 3424     6 70067 8.563232e-05
## 3425     6 70067 8.563232e-05
## 3426     6 70067 8.563232e-05
## 3427     6 70067 8.563232e-05
## 3428     6 70067 8.563232e-05
## 3429     6 70067 8.563232e-05
## 3430     6 70067 8.563232e-05
## 3431     6 70067 8.563232e-05
## 3432     6 70067 8.563232e-05
## 3433     6 70067 8.563232e-05
## 3434     6 70067 8.563232e-05
## 3435     6 70067 8.563232e-05
## 3436     6 70067 8.563232e-05
## 3437     6 70067 8.563232e-05
## 3438     6 70067 8.563232e-05
## 3439     6 70067 8.563232e-05
## 3440     6 70067 8.563232e-05
## 3441     6 70067 8.563232e-05
## 3442     6 70067 8.563232e-05
## 3443     6 70067 8.563232e-05
## 3444     6 70067 8.563232e-05
## 3445     6 70067 8.563232e-05
## 3446     6 70067 8.563232e-05
## 3447     6 70067 8.563232e-05
## 3448     6 70067 8.563232e-05
## 3449     6 70067 8.563232e-05
## 3450     6 70067 8.563232e-05
## 3451     6 70067 8.563232e-05
## 3452     6 70067 8.563232e-05
## 3453     6 70067 8.563232e-05
## 3454     6 70067 8.563232e-05
## 3455     6 70067 8.563232e-05
## 3456     6 70067 8.563232e-05
## 3457     6 70067 8.563232e-05
## 3458     6 70067 8.563232e-05
## 3459     6 70067 8.563232e-05
## 3460     6 70067 8.563232e-05
## 3461     6 70067 8.563232e-05
## 3462     6 70067 8.563232e-05
## 3463     6 70067 8.563232e-05
## 3464     6 70067 8.563232e-05
## 3465     6 70067 8.563232e-05
## 3466     6 70067 8.563232e-05
## 3467     6 70067 8.563232e-05
## 3468     6 70067 8.563232e-05
## 3469     6 70067 8.563232e-05
## 3470     6 70067 8.563232e-05
## 3471     6 70067 8.563232e-05
## 3472     6 70067 8.563232e-05
## 3473     6 70067 8.563232e-05
## 3474     6 70067 8.563232e-05
## 3475     6 70067 8.563232e-05
## 3476     6 70067 8.563232e-05
## 3477     6 70067 8.563232e-05
## 3478     6 70067 8.563232e-05
## 3479     6 70067 8.563232e-05
## 3480     6 70067 8.563232e-05
## 3481     6 70067 8.563232e-05
## 3482     6 70067 8.563232e-05
## 3483     6 70067 8.563232e-05
## 3484     6 70067 8.563232e-05
## 3485     6 70067 8.563232e-05
## 3486     6 70067 8.563232e-05
## 3487     6 70067 8.563232e-05
## 3488     6 70067 8.563232e-05
## 3489     6 70067 8.563232e-05
## 3490     6 70067 8.563232e-05
## 3491     6 70067 8.563232e-05
## 3492     6 70067 8.563232e-05
## 3493     6 70067 8.563232e-05
## 3494     6 70067 8.563232e-05
## 3495     6 70067 8.563232e-05
## 3496     6 70067 8.563232e-05
## 3497     6 70067 8.563232e-05
## 3498     6 70067 8.563232e-05
## 3499     6 70067 8.563232e-05
## 3500     6 70067 8.563232e-05
## 3501     6 70067 8.563232e-05
## 3502     6 70067 8.563232e-05
## 3503     6 70067 8.563232e-05
## 3504     6 70067 8.563232e-05
## 3505     6 70067 8.563232e-05
## 3506     6 70067 8.563232e-05
## 3507     6 70067 8.563232e-05
## 3508     6 70067 8.563232e-05
## 3509     6 70067 8.563232e-05
## 3510     6 70067 8.563232e-05
## 3511     6 70067 8.563232e-05
## 3512     6 70067 8.563232e-05
## 3513     6 70067 8.563232e-05
## 3514     6 70067 8.563232e-05
## 3515     6 70067 8.563232e-05
## 3516     6 70067 8.563232e-05
## 3517     6 70067 8.563232e-05
## 3518     6 70067 8.563232e-05
## 3519     6 70067 8.563232e-05
## 3520     6 70067 8.563232e-05
## 3521     6 70067 8.563232e-05
## 3522     6 53016 1.131734e-04
## 3523     6 53016 1.131734e-04
## 3524     6 53016 1.131734e-04
## 3525     6 53016 1.131734e-04
## 3526     6 53016 1.131734e-04
## 3527     6 53016 1.131734e-04
## 3528     6 53016 1.131734e-04
## 3529     6 53016 1.131734e-04
## 3530     6 53016 1.131734e-04
## 3531     6 53016 1.131734e-04
## 3532     6 53016 1.131734e-04
## 3533     6 53016 1.131734e-04
## 3534     6 53016 1.131734e-04
## 3535     6 53016 1.131734e-04
## 3536     6 53016 1.131734e-04
## 3537     6 53016 1.131734e-04
## 3538     6 53016 1.131734e-04
## 3539     6 53016 1.131734e-04
## 3540     6 53016 1.131734e-04
## 3541     6 53016 1.131734e-04
## 3542     6 53016 1.131734e-04
## 3543     6 53016 1.131734e-04
## 3544     6 53016 1.131734e-04
## 3545     6 53016 1.131734e-04
## 3546     6 53016 1.131734e-04
## 3547     6 53016 1.131734e-04
## 3548     6 53016 1.131734e-04
## 3549     6 53016 1.131734e-04
## 3550     6 53016 1.131734e-04
## 3551     6 53016 1.131734e-04
## 3552     6 53016 1.131734e-04
## 3553     6 53016 1.131734e-04
## 3554     6 53016 1.131734e-04
## 3555     6 53016 1.131734e-04
## 3556     6 53016 1.131734e-04
## 3557     6 53016 1.131734e-04
## 3558     6 53016 1.131734e-04
## 3559     6 53016 1.131734e-04
## 3560     6 53016 1.131734e-04
## 3561     6 53016 1.131734e-04
## 3562     6 53016 1.131734e-04
## 3563     6 53016 1.131734e-04
## 3564     6 53016 1.131734e-04
## 3565     6 53016 1.131734e-04
## 3566     6 53016 1.131734e-04
## 3567     6 53016 1.131734e-04
## 3568     6 53016 1.131734e-04
## 3569     6 53016 1.131734e-04
## 3570     6 53016 1.131734e-04
## 3571     6 53016 1.131734e-04
## 3572     6 53016 1.131734e-04
## 3573     6 53016 1.131734e-04
## 3574     6 53016 1.131734e-04
## 3575     6 53016 1.131734e-04
## 3576     6 53016 1.131734e-04
## 3577     6 53016 1.131734e-04
## 3578     6 53016 1.131734e-04
## 3579     6 53016 1.131734e-04
## 3580     6 53016 1.131734e-04
## 3581     6 53016 1.131734e-04
## 3582     6 53016 1.131734e-04
## 3583     6 53016 1.131734e-04
## 3584     6 53016 1.131734e-04
## 3585     6 53016 1.131734e-04
## 3586     6 53016 1.131734e-04
## 3587     6 53016 1.131734e-04
## 3588     6 53016 1.131734e-04
## 3589     6 53016 1.131734e-04
## 3590     6 53016 1.131734e-04
## 3591     6 53016 1.131734e-04
## 3592     6 53016 1.131734e-04
## 3593     6 53016 1.131734e-04
## 3594     6 53016 1.131734e-04
## 3595     6 53016 1.131734e-04
## 3596     6 53016 1.131734e-04
## 3597     6 53016 1.131734e-04
## 3598     6 53016 1.131734e-04
## 3599     6 53016 1.131734e-04
## 3600     6 53016 1.131734e-04
## 3601     6 53016 1.131734e-04
## 3602     6 53016 1.131734e-04
## 3603     6 53016 1.131734e-04
## 3604     6 53016 1.131734e-04
## 3605     6 53016 1.131734e-04
## 3606     6 53016 1.131734e-04
## 3607     6 53016 1.131734e-04
## 3608     6 53016 1.131734e-04
## 3609     6 53016 1.131734e-04
## 3610     6 53016 1.131734e-04
## 3611     6 53016 1.131734e-04
## 3612     6 53016 1.131734e-04
## 3613     6 53016 1.131734e-04
## 3614     6 53016 1.131734e-04
## 3615     6 53016 1.131734e-04
## 3616     6 53016 1.131734e-04
## 3617     6 53016 1.131734e-04
## 3618     6 53016 1.131734e-04
## 3619     6 53016 1.131734e-04
## 3620     6 53016 1.131734e-04
## 3621     6 53016 1.131734e-04
## 3622     6 53016 1.131734e-04
## 3623     6 53016 1.131734e-04
## 3624     6 53016 1.131734e-04
## 3625     6 53016 1.131734e-04
## 3626     6 53016 1.131734e-04
## 3627     6 53016 1.131734e-04
## 3628     6 53016 1.131734e-04
## 3629     6 53016 1.131734e-04
## 3630     6 53016 1.131734e-04
## 3631     6 53016 1.131734e-04
## 3632     6 53016 1.131734e-04
## 3633     6 53016 1.131734e-04
## 3634     6 53016 1.131734e-04
## 3635     6 53016 1.131734e-04
## 3636     6 53016 1.131734e-04
## 3637     6 53016 1.131734e-04
## 3638     6 53016 1.131734e-04
## 3639     6 53016 1.131734e-04
## 3640     6 53016 1.131734e-04
## 3641     6 53016 1.131734e-04
## 3642     6 53016 1.131734e-04
## 3643     6 53016 1.131734e-04
## 3644     6 53016 1.131734e-04
## 3645     6 53016 1.131734e-04
## 3646     6 53016 1.131734e-04
## 3647     6 53016 1.131734e-04
## 3648     6 53016 1.131734e-04
## 3649     6 53016 1.131734e-04
## 3650     6 53016 1.131734e-04
## 3651     6 53016 1.131734e-04
## 3652     6 53016 1.131734e-04
## 3653     6 53016 1.131734e-04
## 3654     6 53016 1.131734e-04
## 3655     6 53016 1.131734e-04
## 3656     6 53016 1.131734e-04
## 3657     6 53016 1.131734e-04
## 3658     6 53016 1.131734e-04
## 3659     6 53016 1.131734e-04
## 3660     6 53016 1.131734e-04
## 3661     6 53016 1.131734e-04
## 3662     6 53016 1.131734e-04
## 3663     6 53016 1.131734e-04
## 3664     6 53016 1.131734e-04
## 3665     6 53016 1.131734e-04
## 3666     6 53016 1.131734e-04
## 3667     6 53016 1.131734e-04
## 3668     6 53016 1.131734e-04
## 3669     6 53016 1.131734e-04
## 3670     6 53016 1.131734e-04
## 3671     6 53016 1.131734e-04
## 3672     6 53016 1.131734e-04
## 3673     6 53016 1.131734e-04
## 3674     6 53016 1.131734e-04
## 3675     6 53016 1.131734e-04
## 3676     6 53016 1.131734e-04
## 3677     6 53016 1.131734e-04
## 3678     6 53016 1.131734e-04
## 3679     6 53016 1.131734e-04
## 3680     6 53016 1.131734e-04
## 3681     6 53016 1.131734e-04
## 3682     6 53016 1.131734e-04
## 3683     6 53016 1.131734e-04
## 3684     6 53016 1.131734e-04
## 3685     6 53016 1.131734e-04
## 3686     6 53016 1.131734e-04
## 3687     6 53016 1.131734e-04
## 3688     6 53016 1.131734e-04
## 3689     6 53016 1.131734e-04
## 3690     6 53016 1.131734e-04
## 3691     6 53016 1.131734e-04
## 3692     6 53016 1.131734e-04
## 3693     6 53016 1.131734e-04
## 3694     6 53016 1.131734e-04
## 3695     6 53016 1.131734e-04
## 3696     6 53016 1.131734e-04
## 3697     6 53016 1.131734e-04
## 3698     6 53016 1.131734e-04
## 3699     6 53016 1.131734e-04
## 3700     6 53016 1.131734e-04
## 3701     6 53016 1.131734e-04
## 3702     6 53016 1.131734e-04
## 3703     6 53016 1.131734e-04
## 3704     6 53016 1.131734e-04
## 3705     6 53016 1.131734e-04
## 3706     6 53016 1.131734e-04
## 3707     6 53016 1.131734e-04
## 3708     6 53016 1.131734e-04
## 3709     6 53016 1.131734e-04
## 3710     6 53016 1.131734e-04
## 3711     6 53016 1.131734e-04
## 3712     6 53016 1.131734e-04
## 3713     6 53016 1.131734e-04
## 3714     6 53016 1.131734e-04
## 3715     6 53016 1.131734e-04
## 3716     6 53016 1.131734e-04
## 3717     6 53016 1.131734e-04
## 3718     6 53016 1.131734e-04
## 3719     6 53016 1.131734e-04
## 3720     6 53016 1.131734e-04
## 3721     6 53016 1.131734e-04
## 3722     6 53016 1.131734e-04
## 3723     6 53016 1.131734e-04
## 3724     6 53016 1.131734e-04
## 3725     6 53016 1.131734e-04
## 3726     6 53016 1.131734e-04
## 3727     6 53016 1.131734e-04
## 3728     6 53016 1.131734e-04
## 3729     6 53016 1.131734e-04
## 3730     6 53016 1.131734e-04
## 3731     6 53016 1.131734e-04
## 3732     6 53016 1.131734e-04
## 3733     6 53016 1.131734e-04
## 3734     6 53016 1.131734e-04
## 3735     6 53016 1.131734e-04
## 3736     6 53016 1.131734e-04
## 3737     6 53016 1.131734e-04
## 3738     6 53016 1.131734e-04
## 3739     6 53016 1.131734e-04
## 3740     6 53016 1.131734e-04
## 3741     6 53016 1.131734e-04
## 3742     6 53016 1.131734e-04
## 3743     6 53016 1.131734e-04
## 3744     6 53016 1.131734e-04
## 3745     6 53016 1.131734e-04
## 3746     6 53016 1.131734e-04
## 3747     6 53016 1.131734e-04
## 3748     6 53016 1.131734e-04
## 3749     6 53016 1.131734e-04
## 3750     6 53016 1.131734e-04
## 3751     6 53016 1.131734e-04
## 3752     6 53016 1.131734e-04
## 3753     6 16547 3.626035e-04
## 3754     6 16547 3.626035e-04
## 3755     6 16547 3.626035e-04
## 3756     6 16547 3.626035e-04
## 3757     6 16547 3.626035e-04
## 3758     6 16547 3.626035e-04
## 3759     6 16547 3.626035e-04
## 3760     6 16547 3.626035e-04
## 3761     6 16547 3.626035e-04
## 3762     6 16547 3.626035e-04
## 3763     6 16547 3.626035e-04
## 3764     6 16547 3.626035e-04
## 3765     6 16547 3.626035e-04
## 3766     6 16547 3.626035e-04
## 3767     6 16547 3.626035e-04
## 3768     6 16547 3.626035e-04
## 3769     6 16547 3.626035e-04
## 3770     6 16547 3.626035e-04
## 3771     6 16547 3.626035e-04
## 3772     6 16547 3.626035e-04
## 3773     6 16547 3.626035e-04
## 3774     6 16547 3.626035e-04
## 3775     6 16547 3.626035e-04
## 3776     6 16547 3.626035e-04
## 3777     6 16547 3.626035e-04
## 3778     6 16547 3.626035e-04
## 3779     6 16547 3.626035e-04
## 3780     6 16547 3.626035e-04
## 3781     6 16547 3.626035e-04
## 3782     6 16547 3.626035e-04
## 3783     6 16547 3.626035e-04
## 3784     6 16547 3.626035e-04
## 3785     6 16547 3.626035e-04
## 3786     6 16547 3.626035e-04
## 3787     6 16547 3.626035e-04
## 3788     6 16547 3.626035e-04
## 3789     6 16547 3.626035e-04
## 3790     6 16547 3.626035e-04
## 3791     6 16547 3.626035e-04
## 3792     6 16547 3.626035e-04
## 3793     6 16547 3.626035e-04
## 3794     6 16547 3.626035e-04
## 3795     6 16547 3.626035e-04
## 3796     6 16547 3.626035e-04
## 3797     6 16547 3.626035e-04
## 3798     6 16547 3.626035e-04
## 3799     6 16547 3.626035e-04
## 3800     6 16547 3.626035e-04
## 3801     6 16547 3.626035e-04
## 3802     6 16547 3.626035e-04
## 3803     6 16547 3.626035e-04
## 3804     6 16547 3.626035e-04
## 3805     6 16547 3.626035e-04
## 3806     6 16547 3.626035e-04
## 3807     6 16547 3.626035e-04
## 3808     6 16547 3.626035e-04
## 3809     6 16547 3.626035e-04
## 3810     6 16547 3.626035e-04
## 3811     6 16547 3.626035e-04
## 3812     6 16547 3.626035e-04
## 3813     6 16547 3.626035e-04
## 3814     6 16547 3.626035e-04
## 3815     6 16547 3.626035e-04
## 3816     6 16547 3.626035e-04
## 3817     6 16547 3.626035e-04
## 3818     6 16547 3.626035e-04
## 3819     6 16547 3.626035e-04
## 3820     6 16547 3.626035e-04
## 3821     6 16547 3.626035e-04
## 3822     6 16547 3.626035e-04
## 3823     6 16547 3.626035e-04
## 3824     6 16547 3.626035e-04
## 3825     6 16547 3.626035e-04
## 3826     6 16547 3.626035e-04
## 3827     6 16547 3.626035e-04
## 3828     6 16547 3.626035e-04
## 3829     6 16547 3.626035e-04
## 3830     6 16547 3.626035e-04
## 3831     6 16547 3.626035e-04
## 3832     6 16547 3.626035e-04
## 3833     6 16547 3.626035e-04
## 3834     6 16547 3.626035e-04
## 3835     6 16547 3.626035e-04
## 3836     6 16547 3.626035e-04
## 3837     6 16547 3.626035e-04
## 3838     5 70067 7.136027e-05
## 3839     5 70067 7.136027e-05
## 3840     5 70067 7.136027e-05
## 3841     5 70067 7.136027e-05
## 3842     5 70067 7.136027e-05
## 3843     5 70067 7.136027e-05
## 3844     5 70067 7.136027e-05
## 3845     5 70067 7.136027e-05
## 3846     5 70067 7.136027e-05
## 3847     5 70067 7.136027e-05
## 3848     5 70067 7.136027e-05
## 3849     5 70067 7.136027e-05
## 3850     5 70067 7.136027e-05
## 3851     5 70067 7.136027e-05
## 3852     5 70067 7.136027e-05
## 3853     5 70067 7.136027e-05
## 3854     5 70067 7.136027e-05
## 3855     5 70067 7.136027e-05
## 3856     5 70067 7.136027e-05
## 3857     5 70067 7.136027e-05
## 3858     5 70067 7.136027e-05
## 3859     5 70067 7.136027e-05
## 3860     5 70067 7.136027e-05
## 3861     5 70067 7.136027e-05
## 3862     5 70067 7.136027e-05
## 3863     5 70067 7.136027e-05
## 3864     5 70067 7.136027e-05
## 3865     5 70067 7.136027e-05
## 3866     5 70067 7.136027e-05
## 3867     5 70067 7.136027e-05
## 3868     5 70067 7.136027e-05
## 3869     5 70067 7.136027e-05
## 3870     5 70067 7.136027e-05
## 3871     5 70067 7.136027e-05
## 3872     5 70067 7.136027e-05
## 3873     5 70067 7.136027e-05
## 3874     5 70067 7.136027e-05
## 3875     5 70067 7.136027e-05
## 3876     5 70067 7.136027e-05
## 3877     5 70067 7.136027e-05
## 3878     5 70067 7.136027e-05
## 3879     5 70067 7.136027e-05
## 3880     5 70067 7.136027e-05
## 3881     5 70067 7.136027e-05
## 3882     5 70067 7.136027e-05
## 3883     5 70067 7.136027e-05
## 3884     5 70067 7.136027e-05
## 3885     5 70067 7.136027e-05
## 3886     5 70067 7.136027e-05
## 3887     5 70067 7.136027e-05
## 3888     5 70067 7.136027e-05
## 3889     5 70067 7.136027e-05
## 3890     5 70067 7.136027e-05
## 3891     5 70067 7.136027e-05
## 3892     5 70067 7.136027e-05
## 3893     5 70067 7.136027e-05
## 3894     5 70067 7.136027e-05
## 3895     5 70067 7.136027e-05
## 3896     5 70067 7.136027e-05
## 3897     5 70067 7.136027e-05
## 3898     5 70067 7.136027e-05
## 3899     5 70067 7.136027e-05
## 3900     5 70067 7.136027e-05
## 3901     5 70067 7.136027e-05
## 3902     5 70067 7.136027e-05
## 3903     5 70067 7.136027e-05
## 3904     5 70067 7.136027e-05
## 3905     5 70067 7.136027e-05
## 3906     5 70067 7.136027e-05
## 3907     5 70067 7.136027e-05
## 3908     5 70067 7.136027e-05
## 3909     5 70067 7.136027e-05
## 3910     5 70067 7.136027e-05
## 3911     5 70067 7.136027e-05
## 3912     5 70067 7.136027e-05
## 3913     5 70067 7.136027e-05
## 3914     5 70067 7.136027e-05
## 3915     5 70067 7.136027e-05
## 3916     5 70067 7.136027e-05
## 3917     5 70067 7.136027e-05
## 3918     5 70067 7.136027e-05
## 3919     5 70067 7.136027e-05
## 3920     5 70067 7.136027e-05
## 3921     5 70067 7.136027e-05
## 3922     5 70067 7.136027e-05
## 3923     5 70067 7.136027e-05
## 3924     5 70067 7.136027e-05
## 3925     5 70067 7.136027e-05
## 3926     5 70067 7.136027e-05
## 3927     5 70067 7.136027e-05
## 3928     5 70067 7.136027e-05
## 3929     5 70067 7.136027e-05
## 3930     5 70067 7.136027e-05
## 3931     5 70067 7.136027e-05
## 3932     5 70067 7.136027e-05
## 3933     5 70067 7.136027e-05
## 3934     5 70067 7.136027e-05
## 3935     5 70067 7.136027e-05
## 3936     5 70067 7.136027e-05
## 3937     5 70067 7.136027e-05
## 3938     5 70067 7.136027e-05
## 3939     5 70067 7.136027e-05
## 3940     5 70067 7.136027e-05
## 3941     5 70067 7.136027e-05
## 3942     5 70067 7.136027e-05
## 3943     5 70067 7.136027e-05
## 3944     5 70067 7.136027e-05
## 3945     5 70067 7.136027e-05
## 3946     5 70067 7.136027e-05
## 3947     5 70067 7.136027e-05
## 3948     5 70067 7.136027e-05
## 3949     5 70067 7.136027e-05
## 3950     5 70067 7.136027e-05
## 3951     5 70067 7.136027e-05
## 3952     5 70067 7.136027e-05
## 3953     5 70067 7.136027e-05
## 3954     5 70067 7.136027e-05
## 3955     5 70067 7.136027e-05
## 3956     5 70067 7.136027e-05
## 3957     5 70067 7.136027e-05
## 3958     5 70067 7.136027e-05
## 3959     5 70067 7.136027e-05
## 3960     5 70067 7.136027e-05
## 3961     5 70067 7.136027e-05
## 3962     5 70067 7.136027e-05
## 3963     5 70067 7.136027e-05
## 3964     5 70067 7.136027e-05
## 3965     5 70067 7.136027e-05
## 3966     5 70067 7.136027e-05
## 3967     5 70067 7.136027e-05
## 3968     5 70067 7.136027e-05
## 3969     5 70067 7.136027e-05
## 3970     5 70067 7.136027e-05
## 3971     5 70067 7.136027e-05
## 3972     5 70067 7.136027e-05
## 3973     5 70067 7.136027e-05
## 3974     5 70067 7.136027e-05
## 3975     5 70067 7.136027e-05
## 3976     5 70067 7.136027e-05
## 3977     5 70067 7.136027e-05
## 3978     5 70067 7.136027e-05
## 3979     5 70067 7.136027e-05
## 3980     5 70067 7.136027e-05
## 3981     5 70067 7.136027e-05
## 3982     5 70067 7.136027e-05
## 3983     5 70067 7.136027e-05
## 3984     5 70067 7.136027e-05
## 3985     5 70067 7.136027e-05
## 3986     5 70067 7.136027e-05
## 3987     5 70067 7.136027e-05
## 3988     5 70067 7.136027e-05
## 3989     5 70067 7.136027e-05
## 3990     5 70067 7.136027e-05
## 3991     5 70067 7.136027e-05
## 3992     5 70067 7.136027e-05
## 3993     5 70067 7.136027e-05
## 3994     5 70067 7.136027e-05
## 3995     5 70067 7.136027e-05
## 3996     5 70067 7.136027e-05
## 3997     5 70067 7.136027e-05
## 3998     5 70067 7.136027e-05
## 3999     5 70067 7.136027e-05
## 4000     5 70067 7.136027e-05
## 4001     5 70067 7.136027e-05
## 4002     5 70067 7.136027e-05
## 4003     5 70067 7.136027e-05
## 4004     5 70067 7.136027e-05
## 4005     5 70067 7.136027e-05
## 4006     5 70067 7.136027e-05
## 4007     5 70067 7.136027e-05
## 4008     5 70067 7.136027e-05
## 4009     5 70067 7.136027e-05
## 4010     5 70067 7.136027e-05
## 4011     5 70067 7.136027e-05
## 4012     5 70067 7.136027e-05
## 4013     5 70067 7.136027e-05
## 4014     5 70067 7.136027e-05
## 4015     5 70067 7.136027e-05
## 4016     5 70067 7.136027e-05
## 4017     5 70067 7.136027e-05
## 4018     5 70067 7.136027e-05
## 4019     5 70067 7.136027e-05
## 4020     5 70067 7.136027e-05
## 4021     5 70067 7.136027e-05
## 4022     5 70067 7.136027e-05
## 4023     5 70067 7.136027e-05
## 4024     5 70067 7.136027e-05
## 4025     5 70067 7.136027e-05
## 4026     5 70067 7.136027e-05
## 4027     5 70067 7.136027e-05
## 4028     5 70067 7.136027e-05
## 4029     5 70067 7.136027e-05
## 4030     5 70067 7.136027e-05
## 4031     5 70067 7.136027e-05
## 4032     5 70067 7.136027e-05
## 4033     5 70067 7.136027e-05
## 4034     5 70067 7.136027e-05
## 4035     5 70067 7.136027e-05
## 4036     5 70067 7.136027e-05
## 4037     5 70067 7.136027e-05
## 4038     5 70067 7.136027e-05
## 4039     5 70067 7.136027e-05
## 4040     5 70067 7.136027e-05
## 4041     5 70067 7.136027e-05
## 4042     5 70067 7.136027e-05
## 4043     5 70067 7.136027e-05
## 4044     5 70067 7.136027e-05
## 4045     5 70067 7.136027e-05
## 4046     5 70067 7.136027e-05
## 4047     5 70067 7.136027e-05
## 4048     5 70067 7.136027e-05
## 4049     5 70067 7.136027e-05
## 4050     5 70067 7.136027e-05
## 4051     5 70067 7.136027e-05
## 4052     5 70067 7.136027e-05
## 4053     5 70067 7.136027e-05
## 4054     5 70067 7.136027e-05
## 4055     5 70067 7.136027e-05
## 4056     5 70067 7.136027e-05
## 4057     5 70067 7.136027e-05
## 4058     5 70067 7.136027e-05
## 4059     5 70067 7.136027e-05
## 4060     5 70067 7.136027e-05
## 4061     5 70067 7.136027e-05
## 4062     5 70067 7.136027e-05
## 4063     5 70067 7.136027e-05
## 4064     5 70067 7.136027e-05
## 4065     5 70067 7.136027e-05
## 4066     5 70067 7.136027e-05
## 4067     5 70067 7.136027e-05
## 4068     5 70067 7.136027e-05
## 4069     5 70067 7.136027e-05
## 4070     5 70067 7.136027e-05
## 4071     5 70067 7.136027e-05
## 4072     5 70067 7.136027e-05
## 4073     5 70067 7.136027e-05
## 4074     5 70067 7.136027e-05
## 4075     5 70067 7.136027e-05
## 4076     5 70067 7.136027e-05
## 4077     5 70067 7.136027e-05
## 4078     5 70067 7.136027e-05
## 4079     5 70067 7.136027e-05
## 4080     5 70067 7.136027e-05
## 4081     5 70067 7.136027e-05
## 4082     5 70067 7.136027e-05
## 4083     5 70067 7.136027e-05
## 4084     5 70067 7.136027e-05
## 4085     5 70067 7.136027e-05
## 4086     5 70067 7.136027e-05
## 4087     5 70067 7.136027e-05
## 4088     5 70067 7.136027e-05
## 4089     5 70067 7.136027e-05
## 4090     5 70067 7.136027e-05
## 4091     5 70067 7.136027e-05
## 4092     5 70067 7.136027e-05
## 4093     5 70067 7.136027e-05
## 4094     5 70067 7.136027e-05
## 4095     5 70067 7.136027e-05
## 4096     5 70067 7.136027e-05
## 4097     5 70067 7.136027e-05
## 4098     5 70067 7.136027e-05
## 4099     5 70067 7.136027e-05
## 4100     5 70067 7.136027e-05
## 4101     5 70067 7.136027e-05
## 4102     5 70067 7.136027e-05
## 4103     5 70067 7.136027e-05
## 4104     5 70067 7.136027e-05
## 4105     5 70067 7.136027e-05
## 4106     5 70067 7.136027e-05
## 4107     5 70067 7.136027e-05
## 4108     5 70067 7.136027e-05
## 4109     5 70067 7.136027e-05
## 4110     5 70067 7.136027e-05
## 4111     5 70067 7.136027e-05
## 4112     5 70067 7.136027e-05
## 4113     5 70067 7.136027e-05
## 4114     5 70067 7.136027e-05
## 4115     5 70067 7.136027e-05
## 4116     5 70067 7.136027e-05
## 4117     5 70067 7.136027e-05
## 4118     5 70067 7.136027e-05
## 4119     5 70067 7.136027e-05
## 4120     5 70067 7.136027e-05
## 4121     5 70067 7.136027e-05
## 4122     5 70067 7.136027e-05
## 4123     5 70067 7.136027e-05
## 4124     5 70067 7.136027e-05
## 4125     5 70067 7.136027e-05
## 4126     5 70067 7.136027e-05
## 4127     5 70067 7.136027e-05
## 4128     5 70067 7.136027e-05
## 4129     5 70067 7.136027e-05
## 4130     5 70067 7.136027e-05
## 4131     5 70067 7.136027e-05
## 4132     5 70067 7.136027e-05
## 4133     5 70067 7.136027e-05
## 4134     5 70067 7.136027e-05
## 4135     5 70067 7.136027e-05
## 4136     5 70067 7.136027e-05
## 4137     5 70067 7.136027e-05
## 4138     5 70067 7.136027e-05
## 4139     5 70067 7.136027e-05
## 4140     5 70067 7.136027e-05
## 4141     5 70067 7.136027e-05
## 4142     5 70067 7.136027e-05
## 4143     5 70067 7.136027e-05
## 4144     5 70067 7.136027e-05
## 4145     5 70067 7.136027e-05
## 4146     5 70067 7.136027e-05
## 4147     5 70067 7.136027e-05
## 4148     5 70067 7.136027e-05
## 4149     5 70067 7.136027e-05
## 4150     5 70067 7.136027e-05
## 4151     5 70067 7.136027e-05
## 4152     5 70067 7.136027e-05
## 4153     5 70067 7.136027e-05
## 4154     5 70067 7.136027e-05
## 4155     5 70067 7.136027e-05
## 4156     5 70067 7.136027e-05
## 4157     5 70067 7.136027e-05
## 4158     5 70067 7.136027e-05
## 4159     5 70067 7.136027e-05
## 4160     5 70067 7.136027e-05
## 4161     5 70067 7.136027e-05
## 4162     5 70067 7.136027e-05
## 4163     5 70067 7.136027e-05
## 4164     5 70067 7.136027e-05
## 4165     5 70067 7.136027e-05
## 4166     5 70067 7.136027e-05
## 4167     5 70067 7.136027e-05
## 4168     5 70067 7.136027e-05
## 4169     5 70067 7.136027e-05
## 4170     5 70067 7.136027e-05
## 4171     5 70067 7.136027e-05
## 4172     5 70067 7.136027e-05
## 4173     5 70067 7.136027e-05
## 4174     5 70067 7.136027e-05
## 4175     5 70067 7.136027e-05
## 4176     5 70067 7.136027e-05
## 4177     5 70067 7.136027e-05
## 4178     5 70067 7.136027e-05
## 4179     5 70067 7.136027e-05
## 4180     5 70067 7.136027e-05
## 4181     5 70067 7.136027e-05
## 4182     5 70067 7.136027e-05
## 4183     5 70067 7.136027e-05
## 4184     5 70067 7.136027e-05
## 4185     5 70067 7.136027e-05
## 4186     5 70067 7.136027e-05
## 4187     5 70067 7.136027e-05
## 4188     5 70067 7.136027e-05
## 4189     5 70067 7.136027e-05
## 4190     5 70067 7.136027e-05
## 4191     5 70067 7.136027e-05
## 4192     5 70067 7.136027e-05
## 4193     5 70067 7.136027e-05
## 4194     5 70067 7.136027e-05
## 4195     5 70067 7.136027e-05
## 4196     5 70067 7.136027e-05
## 4197     5 70067 7.136027e-05
## 4198     5 70067 7.136027e-05
## 4199     5 70067 7.136027e-05
## 4200     5 70067 7.136027e-05
## 4201     5 70067 7.136027e-05
## 4202     5 70067 7.136027e-05
## 4203     5 70067 7.136027e-05
## 4204     5 70067 7.136027e-05
## 4205     5 70067 7.136027e-05
## 4206     5 70067 7.136027e-05
## 4207     5 70067 7.136027e-05
## 4208     5 70067 7.136027e-05
## 4209     5 70067 7.136027e-05
## 4210     5 70067 7.136027e-05
## 4211     5 70067 7.136027e-05
## 4212     5 70067 7.136027e-05
## 4213     5 70067 7.136027e-05
## 4214     5 70067 7.136027e-05
## 4215     5 70067 7.136027e-05
## 4216     5 70067 7.136027e-05
## 4217     5 70067 7.136027e-05
## 4218     5 70067 7.136027e-05
## 4219     5 70067 7.136027e-05
## 4220     5 70067 7.136027e-05
## 4221     5 70067 7.136027e-05
## 4222     5 70067 7.136027e-05
## 4223     5 70067 7.136027e-05
## 4224     5 70067 7.136027e-05
## 4225     5 70067 7.136027e-05
## 4226     5 70067 7.136027e-05
## 4227     5 70067 7.136027e-05
## 4228     5 70067 7.136027e-05
## 4229     5 70067 7.136027e-05
## 4230     5 70067 7.136027e-05
## 4231     5 70067 7.136027e-05
## 4232     5 70067 7.136027e-05
## 4233     5 70067 7.136027e-05
## 4234     5 70067 7.136027e-05
## 4235     5 70067 7.136027e-05
## 4236     5 70067 7.136027e-05
## 4237     5 70067 7.136027e-05
## 4238     5 70067 7.136027e-05
## 4239     5 70067 7.136027e-05
## 4240     5 53016 9.431115e-05
## 4241     5 53016 9.431115e-05
## 4242     5 53016 9.431115e-05
## 4243     5 53016 9.431115e-05
## 4244     5 53016 9.431115e-05
## 4245     5 53016 9.431115e-05
## 4246     5 53016 9.431115e-05
## 4247     5 53016 9.431115e-05
## 4248     5 53016 9.431115e-05
## 4249     5 53016 9.431115e-05
## 4250     5 53016 9.431115e-05
## 4251     5 53016 9.431115e-05
## 4252     5 53016 9.431115e-05
## 4253     5 53016 9.431115e-05
## 4254     5 53016 9.431115e-05
## 4255     5 53016 9.431115e-05
## 4256     5 53016 9.431115e-05
## 4257     5 53016 9.431115e-05
## 4258     5 53016 9.431115e-05
## 4259     5 53016 9.431115e-05
## 4260     5 53016 9.431115e-05
## 4261     5 53016 9.431115e-05
## 4262     5 53016 9.431115e-05
## 4263     5 53016 9.431115e-05
## 4264     5 53016 9.431115e-05
## 4265     5 53016 9.431115e-05
## 4266     5 53016 9.431115e-05
## 4267     5 53016 9.431115e-05
## 4268     5 53016 9.431115e-05
## 4269     5 53016 9.431115e-05
## 4270     5 53016 9.431115e-05
## 4271     5 53016 9.431115e-05
## 4272     5 53016 9.431115e-05
## 4273     5 53016 9.431115e-05
## 4274     5 53016 9.431115e-05
## 4275     5 53016 9.431115e-05
## 4276     5 53016 9.431115e-05
## 4277     5 53016 9.431115e-05
## 4278     5 53016 9.431115e-05
## 4279     5 53016 9.431115e-05
## 4280     5 53016 9.431115e-05
## 4281     5 53016 9.431115e-05
## 4282     5 53016 9.431115e-05
## 4283     5 53016 9.431115e-05
## 4284     5 53016 9.431115e-05
## 4285     5 53016 9.431115e-05
## 4286     5 53016 9.431115e-05
## 4287     5 53016 9.431115e-05
## 4288     5 53016 9.431115e-05
## 4289     5 53016 9.431115e-05
## 4290     5 53016 9.431115e-05
## 4291     5 53016 9.431115e-05
## 4292     5 53016 9.431115e-05
## 4293     5 53016 9.431115e-05
## 4294     5 53016 9.431115e-05
## 4295     5 53016 9.431115e-05
## 4296     5 53016 9.431115e-05
## 4297     5 53016 9.431115e-05
## 4298     5 53016 9.431115e-05
## 4299     5 53016 9.431115e-05
## 4300     5 53016 9.431115e-05
## 4301     5 53016 9.431115e-05
## 4302     5 53016 9.431115e-05
## 4303     5 53016 9.431115e-05
## 4304     5 53016 9.431115e-05
## 4305     5 53016 9.431115e-05
## 4306     5 53016 9.431115e-05
## 4307     5 53016 9.431115e-05
## 4308     5 53016 9.431115e-05
## 4309     5 53016 9.431115e-05
## 4310     5 53016 9.431115e-05
## 4311     5 53016 9.431115e-05
## 4312     5 53016 9.431115e-05
## 4313     5 53016 9.431115e-05
## 4314     5 53016 9.431115e-05
## 4315     5 53016 9.431115e-05
## 4316     5 53016 9.431115e-05
## 4317     5 53016 9.431115e-05
## 4318     5 53016 9.431115e-05
## 4319     5 53016 9.431115e-05
## 4320     5 53016 9.431115e-05
## 4321     5 53016 9.431115e-05
## 4322     5 53016 9.431115e-05
## 4323     5 53016 9.431115e-05
## 4324     5 53016 9.431115e-05
## 4325     5 53016 9.431115e-05
## 4326     5 53016 9.431115e-05
## 4327     5 53016 9.431115e-05
## 4328     5 53016 9.431115e-05
## 4329     5 53016 9.431115e-05
## 4330     5 53016 9.431115e-05
## 4331     5 53016 9.431115e-05
## 4332     5 53016 9.431115e-05
## 4333     5 53016 9.431115e-05
## 4334     5 53016 9.431115e-05
## 4335     5 53016 9.431115e-05
## 4336     5 53016 9.431115e-05
## 4337     5 53016 9.431115e-05
## 4338     5 53016 9.431115e-05
## 4339     5 53016 9.431115e-05
## 4340     5 53016 9.431115e-05
## 4341     5 53016 9.431115e-05
## 4342     5 53016 9.431115e-05
## 4343     5 53016 9.431115e-05
## 4344     5 53016 9.431115e-05
## 4345     5 53016 9.431115e-05
## 4346     5 53016 9.431115e-05
## 4347     5 53016 9.431115e-05
## 4348     5 53016 9.431115e-05
## 4349     5 53016 9.431115e-05
## 4350     5 53016 9.431115e-05
## 4351     5 53016 9.431115e-05
## 4352     5 53016 9.431115e-05
## 4353     5 53016 9.431115e-05
## 4354     5 53016 9.431115e-05
## 4355     5 53016 9.431115e-05
## 4356     5 53016 9.431115e-05
## 4357     5 53016 9.431115e-05
## 4358     5 53016 9.431115e-05
## 4359     5 53016 9.431115e-05
## 4360     5 53016 9.431115e-05
## 4361     5 53016 9.431115e-05
## 4362     5 53016 9.431115e-05
## 4363     5 53016 9.431115e-05
## 4364     5 53016 9.431115e-05
## 4365     5 53016 9.431115e-05
## 4366     5 53016 9.431115e-05
## 4367     5 53016 9.431115e-05
## 4368     5 53016 9.431115e-05
## 4369     5 53016 9.431115e-05
## 4370     5 53016 9.431115e-05
## 4371     5 53016 9.431115e-05
## 4372     5 53016 9.431115e-05
## 4373     5 53016 9.431115e-05
## 4374     5 53016 9.431115e-05
## 4375     5 53016 9.431115e-05
## 4376     5 53016 9.431115e-05
## 4377     5 53016 9.431115e-05
## 4378     5 53016 9.431115e-05
## 4379     5 53016 9.431115e-05
## 4380     5 53016 9.431115e-05
## 4381     5 53016 9.431115e-05
## 4382     5 53016 9.431115e-05
## 4383     5 53016 9.431115e-05
## 4384     5 53016 9.431115e-05
## 4385     5 53016 9.431115e-05
## 4386     5 53016 9.431115e-05
## 4387     5 53016 9.431115e-05
## 4388     5 53016 9.431115e-05
## 4389     5 53016 9.431115e-05
## 4390     5 53016 9.431115e-05
## 4391     5 53016 9.431115e-05
## 4392     5 53016 9.431115e-05
## 4393     5 53016 9.431115e-05
## 4394     5 53016 9.431115e-05
## 4395     5 53016 9.431115e-05
## 4396     5 53016 9.431115e-05
## 4397     5 53016 9.431115e-05
## 4398     5 53016 9.431115e-05
## 4399     5 53016 9.431115e-05
## 4400     5 53016 9.431115e-05
## 4401     5 53016 9.431115e-05
## 4402     5 53016 9.431115e-05
## 4403     5 53016 9.431115e-05
## 4404     5 53016 9.431115e-05
## 4405     5 53016 9.431115e-05
## 4406     5 53016 9.431115e-05
## 4407     5 53016 9.431115e-05
## 4408     5 53016 9.431115e-05
## 4409     5 53016 9.431115e-05
## 4410     5 53016 9.431115e-05
## 4411     5 53016 9.431115e-05
## 4412     5 53016 9.431115e-05
## 4413     5 53016 9.431115e-05
## 4414     5 53016 9.431115e-05
## 4415     5 53016 9.431115e-05
## 4416     5 53016 9.431115e-05
## 4417     5 53016 9.431115e-05
## 4418     5 53016 9.431115e-05
## 4419     5 53016 9.431115e-05
## 4420     5 53016 9.431115e-05
## 4421     5 53016 9.431115e-05
## 4422     5 53016 9.431115e-05
## 4423     5 53016 9.431115e-05
## 4424     5 53016 9.431115e-05
## 4425     5 53016 9.431115e-05
## 4426     5 53016 9.431115e-05
## 4427     5 53016 9.431115e-05
## 4428     5 53016 9.431115e-05
## 4429     5 53016 9.431115e-05
## 4430     5 53016 9.431115e-05
## 4431     5 53016 9.431115e-05
## 4432     5 53016 9.431115e-05
## 4433     5 53016 9.431115e-05
## 4434     5 53016 9.431115e-05
## 4435     5 53016 9.431115e-05
## 4436     5 53016 9.431115e-05
## 4437     5 53016 9.431115e-05
## 4438     5 53016 9.431115e-05
## 4439     5 53016 9.431115e-05
## 4440     5 53016 9.431115e-05
## 4441     5 53016 9.431115e-05
## 4442     5 53016 9.431115e-05
## 4443     5 53016 9.431115e-05
## 4444     5 53016 9.431115e-05
## 4445     5 53016 9.431115e-05
## 4446     5 53016 9.431115e-05
## 4447     5 53016 9.431115e-05
## 4448     5 53016 9.431115e-05
## 4449     5 53016 9.431115e-05
## 4450     5 53016 9.431115e-05
## 4451     5 53016 9.431115e-05
## 4452     5 53016 9.431115e-05
## 4453     5 53016 9.431115e-05
## 4454     5 53016 9.431115e-05
## 4455     5 53016 9.431115e-05
## 4456     5 53016 9.431115e-05
## 4457     5 53016 9.431115e-05
## 4458     5 53016 9.431115e-05
## 4459     5 53016 9.431115e-05
## 4460     5 53016 9.431115e-05
## 4461     5 53016 9.431115e-05
## 4462     5 53016 9.431115e-05
## 4463     5 53016 9.431115e-05
## 4464     5 53016 9.431115e-05
## 4465     5 53016 9.431115e-05
## 4466     5 53016 9.431115e-05
## 4467     5 53016 9.431115e-05
## 4468     5 53016 9.431115e-05
## 4469     5 53016 9.431115e-05
## 4470     5 53016 9.431115e-05
## 4471     5 53016 9.431115e-05
## 4472     5 53016 9.431115e-05
## 4473     5 53016 9.431115e-05
## 4474     5 53016 9.431115e-05
## 4475     5 53016 9.431115e-05
## 4476     5 53016 9.431115e-05
## 4477     5 53016 9.431115e-05
## 4478     5 53016 9.431115e-05
## 4479     5 53016 9.431115e-05
## 4480     5 53016 9.431115e-05
## 4481     5 53016 9.431115e-05
## 4482     5 53016 9.431115e-05
## 4483     5 53016 9.431115e-05
## 4484     5 53016 9.431115e-05
## 4485     5 53016 9.431115e-05
## 4486     5 53016 9.431115e-05
## 4487     5 53016 9.431115e-05
## 4488     5 53016 9.431115e-05
## 4489     5 53016 9.431115e-05
## 4490     5 53016 9.431115e-05
## 4491     5 53016 9.431115e-05
## 4492     5 53016 9.431115e-05
## 4493     5 53016 9.431115e-05
## 4494     5 53016 9.431115e-05
## 4495     5 53016 9.431115e-05
## 4496     5 53016 9.431115e-05
## 4497     5 53016 9.431115e-05
## 4498     5 53016 9.431115e-05
## 4499     5 53016 9.431115e-05
## 4500     5 53016 9.431115e-05
## 4501     5 53016 9.431115e-05
## 4502     5 53016 9.431115e-05
## 4503     5 53016 9.431115e-05
## 4504     5 53016 9.431115e-05
## 4505     5 53016 9.431115e-05
## 4506     5 53016 9.431115e-05
## 4507     5 53016 9.431115e-05
## 4508     5 53016 9.431115e-05
## 4509     5 53016 9.431115e-05
## 4510     5 53016 9.431115e-05
## 4511     5 53016 9.431115e-05
## 4512     5 53016 9.431115e-05
## 4513     5 53016 9.431115e-05
## 4514     5 53016 9.431115e-05
## 4515     5 53016 9.431115e-05
## 4516     5 53016 9.431115e-05
## 4517     5 53016 9.431115e-05
## 4518     5 53016 9.431115e-05
## 4519     5 53016 9.431115e-05
## 4520     5 53016 9.431115e-05
## 4521     5 53016 9.431115e-05
## 4522     5 53016 9.431115e-05
## 4523     5 53016 9.431115e-05
## 4524     5 53016 9.431115e-05
## 4525     5 53016 9.431115e-05
## 4526     5 53016 9.431115e-05
## 4527     5 53016 9.431115e-05
## 4528     5 53016 9.431115e-05
## 4529     5 53016 9.431115e-05
## 4530     5 53016 9.431115e-05
## 4531     5 53016 9.431115e-05
## 4532     5 53016 9.431115e-05
## 4533     5 53016 9.431115e-05
## 4534     5 53016 9.431115e-05
## 4535     5 53016 9.431115e-05
## 4536     5 53016 9.431115e-05
## 4537     5 53016 9.431115e-05
## 4538     5 53016 9.431115e-05
## 4539     5 53016 9.431115e-05
## 4540     5 53016 9.431115e-05
## 4541     5 53016 9.431115e-05
## 4542     5 53016 9.431115e-05
## 4543     5 53016 9.431115e-05
## 4544     5 53016 9.431115e-05
## 4545     5 53016 9.431115e-05
## 4546     5 53016 9.431115e-05
## 4547     5 53016 9.431115e-05
## 4548     5 53016 9.431115e-05
## 4549     5 53016 9.431115e-05
## 4550     5 53016 9.431115e-05
## 4551     5 53016 9.431115e-05
## 4552     5 53016 9.431115e-05
## 4553     5 53016 9.431115e-05
## 4554     5 53016 9.431115e-05
## 4555     5 53016 9.431115e-05
## 4556     5 53016 9.431115e-05
## 4557     5 53016 9.431115e-05
## 4558     5 53016 9.431115e-05
## 4559     5 53016 9.431115e-05
## 4560     5 53016 9.431115e-05
## 4561     5 53016 9.431115e-05
## 4562     5 53016 9.431115e-05
## 4563     5 53016 9.431115e-05
## 4564     5 53016 9.431115e-05
## 4565     5 53016 9.431115e-05
## 4566     5 16547 3.021696e-04
## 4567     5 16547 3.021696e-04
## 4568     5 16547 3.021696e-04
## 4569     5 16547 3.021696e-04
## 4570     5 16547 3.021696e-04
## 4571     5 16547 3.021696e-04
## 4572     5 16547 3.021696e-04
## 4573     5 16547 3.021696e-04
## 4574     5 16547 3.021696e-04
## 4575     5 16547 3.021696e-04
## 4576     5 16547 3.021696e-04
## 4577     5 16547 3.021696e-04
## 4578     5 16547 3.021696e-04
## 4579     5 16547 3.021696e-04
## 4580     5 16547 3.021696e-04
## 4581     5 16547 3.021696e-04
## 4582     5 16547 3.021696e-04
## 4583     5 16547 3.021696e-04
## 4584     5 16547 3.021696e-04
## 4585     5 16547 3.021696e-04
## 4586     5 16547 3.021696e-04
## 4587     5 16547 3.021696e-04
## 4588     5 16547 3.021696e-04
## 4589     5 16547 3.021696e-04
## 4590     5 16547 3.021696e-04
## 4591     5 16547 3.021696e-04
## 4592     5 16547 3.021696e-04
## 4593     5 16547 3.021696e-04
## 4594     5 16547 3.021696e-04
## 4595     5 16547 3.021696e-04
## 4596     5 16547 3.021696e-04
## 4597     5 16547 3.021696e-04
## 4598     5 16547 3.021696e-04
## 4599     5 16547 3.021696e-04
## 4600     5 16547 3.021696e-04
## 4601     5 16547 3.021696e-04
## 4602     5 16547 3.021696e-04
## 4603     5 16547 3.021696e-04
## 4604     5 16547 3.021696e-04
## 4605     5 16547 3.021696e-04
## 4606     5 16547 3.021696e-04
## 4607     5 16547 3.021696e-04
## 4608     5 16547 3.021696e-04
## 4609     5 16547 3.021696e-04
## 4610     5 16547 3.021696e-04
## 4611     5 16547 3.021696e-04
## 4612     5 16547 3.021696e-04
## 4613     5 16547 3.021696e-04
## 4614     5 16547 3.021696e-04
## 4615     5 16547 3.021696e-04
## 4616     5 16547 3.021696e-04
## 4617     5 16547 3.021696e-04
## 4618     5 16547 3.021696e-04
## 4619     5 16547 3.021696e-04
## 4620     5 16547 3.021696e-04
## 4621     5 16547 3.021696e-04
## 4622     5 16547 3.021696e-04
## 4623     5 16547 3.021696e-04
## 4624     5 16547 3.021696e-04
## 4625     5 16547 3.021696e-04
## 4626     5 16547 3.021696e-04
## 4627     5 16547 3.021696e-04
## 4628     5 16547 3.021696e-04
## 4629     5 16547 3.021696e-04
## 4630     5 16547 3.021696e-04
## 4631     5 16547 3.021696e-04
## 4632     5 16547 3.021696e-04
## 4633     5 16547 3.021696e-04
## 4634     5 16547 3.021696e-04
## 4635     5 16547 3.021696e-04
## 4636     5 16547 3.021696e-04
## 4637     5 16547 3.021696e-04
## 4638     5 16547 3.021696e-04
## 4639     5 16547 3.021696e-04
## 4640     5 16547 3.021696e-04
## 4641     5 16547 3.021696e-04
## 4642     5 16547 3.021696e-04
## 4643     5 16547 3.021696e-04
## 4644     5 16547 3.021696e-04
## 4645     5 16547 3.021696e-04
## 4646     5 16547 3.021696e-04
## 4647     5 16547 3.021696e-04
## 4648     5 16547 3.021696e-04
## 4649     5 16547 3.021696e-04
## 4650     5 16547 3.021696e-04
## 4651     5 16547 3.021696e-04
## 4652     5 16547 3.021696e-04
## 4653     5 16547 3.021696e-04
## 4654     5 16547 3.021696e-04
## 4655     5 16547 3.021696e-04
## 4656     5 16547 3.021696e-04
## 4657     5 16547 3.021696e-04
## 4658     5 16547 3.021696e-04
## 4659     5 16547 3.021696e-04
## 4660     5 16547 3.021696e-04
## 4661     5 16547 3.021696e-04
## 4662     5 16547 3.021696e-04
## 4663     5 16547 3.021696e-04
## 4664     5 16547 3.021696e-04
## 4665     5 16547 3.021696e-04
## 4666     5 16547 3.021696e-04
## 4667     5 16547 3.021696e-04
## 4668     5 16547 3.021696e-04
## 4669     5 16547 3.021696e-04
## 4670     5 16547 3.021696e-04
## 4671     5 16547 3.021696e-04
## 4672     5 16547 3.021696e-04
## 4673     5 16547 3.021696e-04
## 4674     5 16547 3.021696e-04
## 4675     5 16547 3.021696e-04
## 4676     5 16547 3.021696e-04
## 4677     5 16547 3.021696e-04
## 4678     5 16547 3.021696e-04
## 4679     5 16547 3.021696e-04
## 4680     5 16547 3.021696e-04
## 4681     5 16547 3.021696e-04
## 4682     5 16547 3.021696e-04
## 4683     5 16547 3.021696e-04
## 4684     5 16547 3.021696e-04
## 4685     5 16547 3.021696e-04
## 4686     5 16547 3.021696e-04
## 4687     5 16547 3.021696e-04
## 4688     5 16547 3.021696e-04
## 4689     5 16547 3.021696e-04
## 4690     5 16547 3.021696e-04
## 4691     5 16547 3.021696e-04
## 4692     5 16547 3.021696e-04
## 4693     5 16547 3.021696e-04
## 4694     5 16547 3.021696e-04
## 4695     5 16547 3.021696e-04
## 4696     5 16547 3.021696e-04
## 4697     5 16547 3.021696e-04
## 4698     5 16547 3.021696e-04
## 4699     5 16547 3.021696e-04
## 4700     5 16547 3.021696e-04
## 4701     5 16547 3.021696e-04
## 4702     5 16547 3.021696e-04
## 4703     5 16547 3.021696e-04
## 4704     5 16547 3.021696e-04
## 4705     5 16547 3.021696e-04
## 4706     5 16547 3.021696e-04
## 4707     5 16547 3.021696e-04
## 4708     5 16547 3.021696e-04
## 4709     5 16547 3.021696e-04
## 4710     5 16547 3.021696e-04
## 4711     5 16547 3.021696e-04
## 4712     5 16547 3.021696e-04
## 4713     5 16547 3.021696e-04
## 4714     5 16547 3.021696e-04
## 4715     5 16547 3.021696e-04
## 4716     5 16547 3.021696e-04
## 4717     5 16547 3.021696e-04
## 4718     5 16547 3.021696e-04
## 4719     5 16547 3.021696e-04
## 4720     5 16547 3.021696e-04
## 4721     5 16547 3.021696e-04
## 4722     5 16547 3.021696e-04
## 4723     5 16547 3.021696e-04
## 4724     5 16547 3.021696e-04
## 4725     5 16547 3.021696e-04
## 4726     5 16547 3.021696e-04
## 4727     5 16547 3.021696e-04
## 4728     5 16547 3.021696e-04
## 4729     5 16547 3.021696e-04
## 4730     5 16547 3.021696e-04
## 4731     5 16547 3.021696e-04
## 4732     5 16547 3.021696e-04
## 4733     5 16547 3.021696e-04
## 4734     5 16547 3.021696e-04
## 4735     5 16547 3.021696e-04
## 4736     5 16547 3.021696e-04
## 4737     5 16547 3.021696e-04
## 4738     5 16547 3.021696e-04
## 4739     5 16547 3.021696e-04
## 4740     5 16547 3.021696e-04
## 4741     5 16547 3.021696e-04
## 4742     5 16547 3.021696e-04
## 4743     5 16547 3.021696e-04
## 4744     5 16547 3.021696e-04
## 4745     5 16547 3.021696e-04
## 4746     5 16547 3.021696e-04
## 4747     5 16547 3.021696e-04
## 4748     5 16547 3.021696e-04
## 4749     5 16547 3.021696e-04
## 4750     5 16547 3.021696e-04
## 4751     5 16547 3.021696e-04
## 4752     5 16547 3.021696e-04
## 4753     5 16547 3.021696e-04
## 4754     4 70067 5.708822e-05
## 4755     4 70067 5.708822e-05
## 4756     4 70067 5.708822e-05
## 4757     4 70067 5.708822e-05
## 4758     4 70067 5.708822e-05
## 4759     4 70067 5.708822e-05
## 4760     4 70067 5.708822e-05
## 4761     4 70067 5.708822e-05
## 4762     4 70067 5.708822e-05
## 4763     4 70067 5.708822e-05
## 4764     4 70067 5.708822e-05
## 4765     4 70067 5.708822e-05
## 4766     4 70067 5.708822e-05
## 4767     4 70067 5.708822e-05
## 4768     4 70067 5.708822e-05
## 4769     4 70067 5.708822e-05
## 4770     4 70067 5.708822e-05
## 4771     4 70067 5.708822e-05
## 4772     4 70067 5.708822e-05
## 4773     4 70067 5.708822e-05
## 4774     4 70067 5.708822e-05
## 4775     4 70067 5.708822e-05
## 4776     4 70067 5.708822e-05
## 4777     4 70067 5.708822e-05
## 4778     4 70067 5.708822e-05
## 4779     4 70067 5.708822e-05
## 4780     4 70067 5.708822e-05
## 4781     4 70067 5.708822e-05
## 4782     4 70067 5.708822e-05
## 4783     4 70067 5.708822e-05
## 4784     4 70067 5.708822e-05
## 4785     4 70067 5.708822e-05
## 4786     4 70067 5.708822e-05
## 4787     4 70067 5.708822e-05
## 4788     4 70067 5.708822e-05
## 4789     4 70067 5.708822e-05
## 4790     4 70067 5.708822e-05
## 4791     4 70067 5.708822e-05
## 4792     4 70067 5.708822e-05
## 4793     4 70067 5.708822e-05
## 4794     4 70067 5.708822e-05
## 4795     4 70067 5.708822e-05
## 4796     4 70067 5.708822e-05
## 4797     4 70067 5.708822e-05
## 4798     4 70067 5.708822e-05
## 4799     4 70067 5.708822e-05
## 4800     4 70067 5.708822e-05
## 4801     4 70067 5.708822e-05
## 4802     4 70067 5.708822e-05
## 4803     4 70067 5.708822e-05
## 4804     4 70067 5.708822e-05
## 4805     4 70067 5.708822e-05
## 4806     4 70067 5.708822e-05
## 4807     4 70067 5.708822e-05
## 4808     4 70067 5.708822e-05
## 4809     4 70067 5.708822e-05
## 4810     4 70067 5.708822e-05
## 4811     4 70067 5.708822e-05
## 4812     4 70067 5.708822e-05
## 4813     4 70067 5.708822e-05
## 4814     4 70067 5.708822e-05
## 4815     4 70067 5.708822e-05
## 4816     4 70067 5.708822e-05
## 4817     4 70067 5.708822e-05
## 4818     4 70067 5.708822e-05
## 4819     4 70067 5.708822e-05
## 4820     4 70067 5.708822e-05
## 4821     4 70067 5.708822e-05
## 4822     4 70067 5.708822e-05
## 4823     4 70067 5.708822e-05
## 4824     4 70067 5.708822e-05
## 4825     4 70067 5.708822e-05
## 4826     4 70067 5.708822e-05
## 4827     4 70067 5.708822e-05
## 4828     4 70067 5.708822e-05
## 4829     4 70067 5.708822e-05
## 4830     4 70067 5.708822e-05
## 4831     4 70067 5.708822e-05
## 4832     4 70067 5.708822e-05
## 4833     4 70067 5.708822e-05
## 4834     4 70067 5.708822e-05
## 4835     4 70067 5.708822e-05
## 4836     4 70067 5.708822e-05
## 4837     4 70067 5.708822e-05
## 4838     4 70067 5.708822e-05
## 4839     4 70067 5.708822e-05
## 4840     4 70067 5.708822e-05
## 4841     4 70067 5.708822e-05
## 4842     4 70067 5.708822e-05
## 4843     4 70067 5.708822e-05
## 4844     4 70067 5.708822e-05
## 4845     4 70067 5.708822e-05
## 4846     4 70067 5.708822e-05
## 4847     4 70067 5.708822e-05
## 4848     4 70067 5.708822e-05
## 4849     4 70067 5.708822e-05
## 4850     4 70067 5.708822e-05
## 4851     4 70067 5.708822e-05
## 4852     4 70067 5.708822e-05
## 4853     4 70067 5.708822e-05
## 4854     4 70067 5.708822e-05
## 4855     4 70067 5.708822e-05
## 4856     4 70067 5.708822e-05
## 4857     4 70067 5.708822e-05
## 4858     4 70067 5.708822e-05
## 4859     4 70067 5.708822e-05
## 4860     4 70067 5.708822e-05
## 4861     4 70067 5.708822e-05
## 4862     4 70067 5.708822e-05
## 4863     4 70067 5.708822e-05
## 4864     4 70067 5.708822e-05
## 4865     4 70067 5.708822e-05
## 4866     4 70067 5.708822e-05
## 4867     4 70067 5.708822e-05
## 4868     4 70067 5.708822e-05
## 4869     4 70067 5.708822e-05
## 4870     4 70067 5.708822e-05
## 4871     4 70067 5.708822e-05
## 4872     4 70067 5.708822e-05
## 4873     4 70067 5.708822e-05
## 4874     4 70067 5.708822e-05
## 4875     4 70067 5.708822e-05
## 4876     4 70067 5.708822e-05
## 4877     4 70067 5.708822e-05
## 4878     4 70067 5.708822e-05
## 4879     4 70067 5.708822e-05
## 4880     4 70067 5.708822e-05
## 4881     4 70067 5.708822e-05
## 4882     4 70067 5.708822e-05
## 4883     4 70067 5.708822e-05
## 4884     4 70067 5.708822e-05
## 4885     4 70067 5.708822e-05
## 4886     4 70067 5.708822e-05
## 4887     4 70067 5.708822e-05
## 4888     4 70067 5.708822e-05
## 4889     4 70067 5.708822e-05
## 4890     4 70067 5.708822e-05
## 4891     4 70067 5.708822e-05
## 4892     4 70067 5.708822e-05
## 4893     4 70067 5.708822e-05
## 4894     4 70067 5.708822e-05
## 4895     4 70067 5.708822e-05
## 4896     4 70067 5.708822e-05
## 4897     4 70067 5.708822e-05
## 4898     4 70067 5.708822e-05
## 4899     4 70067 5.708822e-05
## 4900     4 70067 5.708822e-05
## 4901     4 70067 5.708822e-05
## 4902     4 70067 5.708822e-05
## 4903     4 70067 5.708822e-05
## 4904     4 70067 5.708822e-05
## 4905     4 70067 5.708822e-05
## 4906     4 70067 5.708822e-05
## 4907     4 70067 5.708822e-05
## 4908     4 70067 5.708822e-05
## 4909     4 70067 5.708822e-05
## 4910     4 70067 5.708822e-05
## 4911     4 70067 5.708822e-05
## 4912     4 70067 5.708822e-05
## 4913     4 70067 5.708822e-05
## 4914     4 70067 5.708822e-05
## 4915     4 70067 5.708822e-05
## 4916     4 70067 5.708822e-05
## 4917     4 70067 5.708822e-05
## 4918     4 70067 5.708822e-05
## 4919     4 70067 5.708822e-05
## 4920     4 70067 5.708822e-05
## 4921     4 70067 5.708822e-05
## 4922     4 70067 5.708822e-05
## 4923     4 70067 5.708822e-05
## 4924     4 70067 5.708822e-05
## 4925     4 70067 5.708822e-05
## 4926     4 70067 5.708822e-05
## 4927     4 70067 5.708822e-05
## 4928     4 70067 5.708822e-05
## 4929     4 70067 5.708822e-05
## 4930     4 70067 5.708822e-05
## 4931     4 70067 5.708822e-05
## 4932     4 70067 5.708822e-05
## 4933     4 70067 5.708822e-05
## 4934     4 70067 5.708822e-05
## 4935     4 70067 5.708822e-05
## 4936     4 70067 5.708822e-05
## 4937     4 70067 5.708822e-05
## 4938     4 70067 5.708822e-05
## 4939     4 70067 5.708822e-05
## 4940     4 70067 5.708822e-05
## 4941     4 70067 5.708822e-05
## 4942     4 70067 5.708822e-05
## 4943     4 70067 5.708822e-05
## 4944     4 70067 5.708822e-05
## 4945     4 70067 5.708822e-05
## 4946     4 70067 5.708822e-05
## 4947     4 70067 5.708822e-05
## 4948     4 70067 5.708822e-05
## 4949     4 70067 5.708822e-05
## 4950     4 70067 5.708822e-05
## 4951     4 70067 5.708822e-05
## 4952     4 70067 5.708822e-05
## 4953     4 70067 5.708822e-05
## 4954     4 70067 5.708822e-05
## 4955     4 70067 5.708822e-05
## 4956     4 70067 5.708822e-05
## 4957     4 70067 5.708822e-05
## 4958     4 70067 5.708822e-05
## 4959     4 70067 5.708822e-05
## 4960     4 70067 5.708822e-05
## 4961     4 70067 5.708822e-05
## 4962     4 70067 5.708822e-05
## 4963     4 70067 5.708822e-05
## 4964     4 70067 5.708822e-05
## 4965     4 70067 5.708822e-05
## 4966     4 70067 5.708822e-05
## 4967     4 70067 5.708822e-05
## 4968     4 70067 5.708822e-05
## 4969     4 70067 5.708822e-05
## 4970     4 70067 5.708822e-05
## 4971     4 70067 5.708822e-05
## 4972     4 70067 5.708822e-05
## 4973     4 70067 5.708822e-05
## 4974     4 70067 5.708822e-05
## 4975     4 70067 5.708822e-05
## 4976     4 70067 5.708822e-05
## 4977     4 70067 5.708822e-05
## 4978     4 70067 5.708822e-05
## 4979     4 70067 5.708822e-05
## 4980     4 70067 5.708822e-05
## 4981     4 70067 5.708822e-05
## 4982     4 70067 5.708822e-05
## 4983     4 70067 5.708822e-05
## 4984     4 70067 5.708822e-05
## 4985     4 70067 5.708822e-05
## 4986     4 70067 5.708822e-05
## 4987     4 70067 5.708822e-05
## 4988     4 70067 5.708822e-05
## 4989     4 70067 5.708822e-05
## 4990     4 70067 5.708822e-05
## 4991     4 70067 5.708822e-05
## 4992     4 70067 5.708822e-05
## 4993     4 70067 5.708822e-05
## 4994     4 70067 5.708822e-05
## 4995     4 70067 5.708822e-05
## 4996     4 70067 5.708822e-05
## 4997     4 70067 5.708822e-05
## 4998     4 70067 5.708822e-05
## 4999     4 70067 5.708822e-05
## 5000     4 70067 5.708822e-05
## 5001     4 70067 5.708822e-05
## 5002     4 70067 5.708822e-05
## 5003     4 70067 5.708822e-05
## 5004     4 70067 5.708822e-05
## 5005     4 70067 5.708822e-05
## 5006     4 70067 5.708822e-05
## 5007     4 70067 5.708822e-05
## 5008     4 70067 5.708822e-05
## 5009     4 70067 5.708822e-05
## 5010     4 70067 5.708822e-05
## 5011     4 70067 5.708822e-05
## 5012     4 70067 5.708822e-05
## 5013     4 70067 5.708822e-05
## 5014     4 70067 5.708822e-05
## 5015     4 70067 5.708822e-05
## 5016     4 70067 5.708822e-05
## 5017     4 70067 5.708822e-05
## 5018     4 70067 5.708822e-05
## 5019     4 70067 5.708822e-05
## 5020     4 70067 5.708822e-05
## 5021     4 70067 5.708822e-05
## 5022     4 70067 5.708822e-05
## 5023     4 70067 5.708822e-05
## 5024     4 70067 5.708822e-05
## 5025     4 70067 5.708822e-05
## 5026     4 70067 5.708822e-05
## 5027     4 70067 5.708822e-05
## 5028     4 70067 5.708822e-05
## 5029     4 70067 5.708822e-05
## 5030     4 70067 5.708822e-05
## 5031     4 70067 5.708822e-05
## 5032     4 70067 5.708822e-05
## 5033     4 70067 5.708822e-05
## 5034     4 70067 5.708822e-05
## 5035     4 70067 5.708822e-05
## 5036     4 70067 5.708822e-05
## 5037     4 70067 5.708822e-05
## 5038     4 70067 5.708822e-05
## 5039     4 70067 5.708822e-05
## 5040     4 70067 5.708822e-05
## 5041     4 70067 5.708822e-05
## 5042     4 70067 5.708822e-05
## 5043     4 70067 5.708822e-05
## 5044     4 70067 5.708822e-05
## 5045     4 70067 5.708822e-05
## 5046     4 70067 5.708822e-05
## 5047     4 70067 5.708822e-05
## 5048     4 70067 5.708822e-05
## 5049     4 70067 5.708822e-05
## 5050     4 70067 5.708822e-05
## 5051     4 70067 5.708822e-05
## 5052     4 70067 5.708822e-05
## 5053     4 70067 5.708822e-05
## 5054     4 70067 5.708822e-05
## 5055     4 70067 5.708822e-05
## 5056     4 70067 5.708822e-05
## 5057     4 70067 5.708822e-05
## 5058     4 70067 5.708822e-05
## 5059     4 70067 5.708822e-05
## 5060     4 70067 5.708822e-05
## 5061     4 70067 5.708822e-05
## 5062     4 70067 5.708822e-05
## 5063     4 70067 5.708822e-05
## 5064     4 70067 5.708822e-05
## 5065     4 70067 5.708822e-05
## 5066     4 70067 5.708822e-05
## 5067     4 70067 5.708822e-05
## 5068     4 70067 5.708822e-05
## 5069     4 70067 5.708822e-05
## 5070     4 70067 5.708822e-05
## 5071     4 70067 5.708822e-05
## 5072     4 70067 5.708822e-05
## 5073     4 70067 5.708822e-05
## 5074     4 70067 5.708822e-05
## 5075     4 70067 5.708822e-05
## 5076     4 70067 5.708822e-05
## 5077     4 70067 5.708822e-05
## 5078     4 70067 5.708822e-05
## 5079     4 70067 5.708822e-05
## 5080     4 70067 5.708822e-05
## 5081     4 70067 5.708822e-05
## 5082     4 70067 5.708822e-05
## 5083     4 70067 5.708822e-05
## 5084     4 70067 5.708822e-05
## 5085     4 70067 5.708822e-05
## 5086     4 70067 5.708822e-05
## 5087     4 70067 5.708822e-05
## 5088     4 70067 5.708822e-05
## 5089     4 70067 5.708822e-05
## 5090     4 70067 5.708822e-05
## 5091     4 70067 5.708822e-05
## 5092     4 70067 5.708822e-05
## 5093     4 70067 5.708822e-05
## 5094     4 70067 5.708822e-05
## 5095     4 70067 5.708822e-05
## 5096     4 70067 5.708822e-05
## 5097     4 70067 5.708822e-05
## 5098     4 70067 5.708822e-05
## 5099     4 70067 5.708822e-05
## 5100     4 70067 5.708822e-05
## 5101     4 70067 5.708822e-05
## 5102     4 70067 5.708822e-05
## 5103     4 70067 5.708822e-05
## 5104     4 70067 5.708822e-05
## 5105     4 70067 5.708822e-05
## 5106     4 70067 5.708822e-05
## 5107     4 70067 5.708822e-05
## 5108     4 70067 5.708822e-05
## 5109     4 70067 5.708822e-05
## 5110     4 70067 5.708822e-05
## 5111     4 70067 5.708822e-05
## 5112     4 70067 5.708822e-05
## 5113     4 70067 5.708822e-05
## 5114     4 70067 5.708822e-05
## 5115     4 70067 5.708822e-05
## 5116     4 70067 5.708822e-05
## 5117     4 70067 5.708822e-05
## 5118     4 70067 5.708822e-05
## 5119     4 70067 5.708822e-05
## 5120     4 70067 5.708822e-05
## 5121     4 70067 5.708822e-05
## 5122     4 70067 5.708822e-05
## 5123     4 70067 5.708822e-05
## 5124     4 70067 5.708822e-05
## 5125     4 70067 5.708822e-05
## 5126     4 70067 5.708822e-05
## 5127     4 70067 5.708822e-05
## 5128     4 70067 5.708822e-05
## 5129     4 70067 5.708822e-05
## 5130     4 70067 5.708822e-05
## 5131     4 70067 5.708822e-05
## 5132     4 70067 5.708822e-05
## 5133     4 70067 5.708822e-05
## 5134     4 70067 5.708822e-05
## 5135     4 70067 5.708822e-05
## 5136     4 70067 5.708822e-05
## 5137     4 70067 5.708822e-05
## 5138     4 70067 5.708822e-05
## 5139     4 70067 5.708822e-05
## 5140     4 70067 5.708822e-05
## 5141     4 70067 5.708822e-05
## 5142     4 70067 5.708822e-05
## 5143     4 70067 5.708822e-05
## 5144     4 70067 5.708822e-05
## 5145     4 70067 5.708822e-05
## 5146     4 70067 5.708822e-05
## 5147     4 70067 5.708822e-05
## 5148     4 70067 5.708822e-05
## 5149     4 70067 5.708822e-05
## 5150     4 70067 5.708822e-05
## 5151     4 70067 5.708822e-05
## 5152     4 70067 5.708822e-05
## 5153     4 70067 5.708822e-05
## 5154     4 70067 5.708822e-05
## 5155     4 70067 5.708822e-05
## 5156     4 70067 5.708822e-05
## 5157     4 70067 5.708822e-05
## 5158     4 70067 5.708822e-05
## 5159     4 70067 5.708822e-05
## 5160     4 70067 5.708822e-05
## 5161     4 70067 5.708822e-05
## 5162     4 70067 5.708822e-05
## 5163     4 70067 5.708822e-05
## 5164     4 70067 5.708822e-05
## 5165     4 70067 5.708822e-05
## 5166     4 70067 5.708822e-05
## 5167     4 70067 5.708822e-05
## 5168     4 70067 5.708822e-05
## 5169     4 70067 5.708822e-05
## 5170     4 70067 5.708822e-05
## 5171     4 70067 5.708822e-05
## 5172     4 70067 5.708822e-05
## 5173     4 70067 5.708822e-05
## 5174     4 70067 5.708822e-05
## 5175     4 70067 5.708822e-05
## 5176     4 70067 5.708822e-05
## 5177     4 70067 5.708822e-05
## 5178     4 70067 5.708822e-05
## 5179     4 70067 5.708822e-05
## 5180     4 70067 5.708822e-05
## 5181     4 70067 5.708822e-05
## 5182     4 70067 5.708822e-05
## 5183     4 70067 5.708822e-05
## 5184     4 70067 5.708822e-05
## 5185     4 70067 5.708822e-05
## 5186     4 70067 5.708822e-05
## 5187     4 70067 5.708822e-05
## 5188     4 70067 5.708822e-05
## 5189     4 70067 5.708822e-05
## 5190     4 70067 5.708822e-05
## 5191     4 70067 5.708822e-05
## 5192     4 70067 5.708822e-05
## 5193     4 70067 5.708822e-05
## 5194     4 70067 5.708822e-05
## 5195     4 70067 5.708822e-05
## 5196     4 70067 5.708822e-05
## 5197     4 70067 5.708822e-05
## 5198     4 70067 5.708822e-05
## 5199     4 70067 5.708822e-05
## 5200     4 70067 5.708822e-05
## 5201     4 70067 5.708822e-05
## 5202     4 70067 5.708822e-05
## 5203     4 70067 5.708822e-05
## 5204     4 70067 5.708822e-05
## 5205     4 70067 5.708822e-05
## 5206     4 70067 5.708822e-05
## 5207     4 70067 5.708822e-05
## 5208     4 70067 5.708822e-05
## 5209     4 70067 5.708822e-05
## 5210     4 70067 5.708822e-05
## 5211     4 70067 5.708822e-05
## 5212     4 70067 5.708822e-05
## 5213     4 70067 5.708822e-05
## 5214     4 70067 5.708822e-05
## 5215     4 70067 5.708822e-05
## 5216     4 70067 5.708822e-05
## 5217     4 70067 5.708822e-05
## 5218     4 70067 5.708822e-05
## 5219     4 70067 5.708822e-05
## 5220     4 70067 5.708822e-05
## 5221     4 70067 5.708822e-05
## 5222     4 70067 5.708822e-05
## 5223     4 70067 5.708822e-05
## 5224     4 70067 5.708822e-05
## 5225     4 70067 5.708822e-05
## 5226     4 70067 5.708822e-05
## 5227     4 70067 5.708822e-05
## 5228     4 70067 5.708822e-05
## 5229     4 70067 5.708822e-05
## 5230     4 70067 5.708822e-05
## 5231     4 70067 5.708822e-05
## 5232     4 70067 5.708822e-05
## 5233     4 70067 5.708822e-05
## 5234     4 70067 5.708822e-05
## 5235     4 70067 5.708822e-05
## 5236     4 70067 5.708822e-05
## 5237     4 70067 5.708822e-05
## 5238     4 70067 5.708822e-05
## 5239     4 70067 5.708822e-05
## 5240     4 70067 5.708822e-05
## 5241     4 70067 5.708822e-05
## 5242     4 70067 5.708822e-05
## 5243     4 70067 5.708822e-05
## 5244     4 70067 5.708822e-05
## 5245     4 70067 5.708822e-05
## 5246     4 70067 5.708822e-05
## 5247     4 70067 5.708822e-05
## 5248     4 70067 5.708822e-05
## 5249     4 70067 5.708822e-05
## 5250     4 70067 5.708822e-05
## 5251     4 70067 5.708822e-05
## 5252     4 70067 5.708822e-05
## 5253     4 70067 5.708822e-05
## 5254     4 70067 5.708822e-05
## 5255     4 70067 5.708822e-05
## 5256     4 70067 5.708822e-05
## 5257     4 70067 5.708822e-05
## 5258     4 70067 5.708822e-05
## 5259     4 70067 5.708822e-05
## 5260     4 70067 5.708822e-05
## 5261     4 70067 5.708822e-05
## 5262     4 70067 5.708822e-05
## 5263     4 70067 5.708822e-05
## 5264     4 70067 5.708822e-05
## 5265     4 70067 5.708822e-05
## 5266     4 70067 5.708822e-05
## 5267     4 70067 5.708822e-05
## 5268     4 70067 5.708822e-05
## 5269     4 70067 5.708822e-05
## 5270     4 70067 5.708822e-05
## 5271     4 70067 5.708822e-05
## 5272     4 70067 5.708822e-05
## 5273     4 70067 5.708822e-05
## 5274     4 70067 5.708822e-05
## 5275     4 70067 5.708822e-05
## 5276     4 70067 5.708822e-05
## 5277     4 70067 5.708822e-05
## 5278     4 70067 5.708822e-05
## 5279     4 70067 5.708822e-05
## 5280     4 70067 5.708822e-05
## 5281     4 70067 5.708822e-05
## 5282     4 70067 5.708822e-05
## 5283     4 70067 5.708822e-05
## 5284     4 70067 5.708822e-05
## 5285     4 70067 5.708822e-05
## 5286     4 70067 5.708822e-05
## 5287     4 70067 5.708822e-05
## 5288     4 70067 5.708822e-05
## 5289     4 70067 5.708822e-05
## 5290     4 70067 5.708822e-05
## 5291     4 70067 5.708822e-05
## 5292     4 70067 5.708822e-05
## 5293     4 70067 5.708822e-05
## 5294     4 70067 5.708822e-05
## 5295     4 70067 5.708822e-05
## 5296     4 70067 5.708822e-05
## 5297     4 70067 5.708822e-05
## 5298     4 70067 5.708822e-05
## 5299     4 70067 5.708822e-05
## 5300     4 70067 5.708822e-05
## 5301     4 70067 5.708822e-05
## 5302     4 70067 5.708822e-05
## 5303     4 70067 5.708822e-05
## 5304     4 70067 5.708822e-05
## 5305     4 70067 5.708822e-05
## 5306     4 70067 5.708822e-05
## 5307     4 70067 5.708822e-05
## 5308     4 70067 5.708822e-05
## 5309     4 70067 5.708822e-05
## 5310     4 70067 5.708822e-05
## 5311     4 70067 5.708822e-05
## 5312     4 70067 5.708822e-05
## 5313     4 70067 5.708822e-05
## 5314     4 70067 5.708822e-05
## 5315     4 70067 5.708822e-05
## 5316     4 70067 5.708822e-05
## 5317     4 70067 5.708822e-05
## 5318     4 70067 5.708822e-05
## 5319     4 70067 5.708822e-05
## 5320     4 70067 5.708822e-05
## 5321     4 70067 5.708822e-05
## 5322     4 70067 5.708822e-05
## 5323     4 70067 5.708822e-05
## 5324     4 70067 5.708822e-05
## 5325     4 70067 5.708822e-05
## 5326     4 70067 5.708822e-05
## 5327     4 70067 5.708822e-05
## 5328     4 70067 5.708822e-05
## 5329     4 70067 5.708822e-05
## 5330     4 70067 5.708822e-05
## 5331     4 70067 5.708822e-05
## 5332     4 70067 5.708822e-05
## 5333     4 70067 5.708822e-05
## 5334     4 70067 5.708822e-05
## 5335     4 70067 5.708822e-05
## 5336     4 70067 5.708822e-05
## 5337     4 70067 5.708822e-05
## 5338     4 70067 5.708822e-05
## 5339     4 70067 5.708822e-05
## 5340     4 70067 5.708822e-05
## 5341     4 70067 5.708822e-05
## 5342     4 70067 5.708822e-05
## 5343     4 70067 5.708822e-05
## 5344     4 70067 5.708822e-05
## 5345     4 70067 5.708822e-05
## 5346     4 70067 5.708822e-05
## 5347     4 70067 5.708822e-05
## 5348     4 70067 5.708822e-05
## 5349     4 70067 5.708822e-05
## 5350     4 70067 5.708822e-05
## 5351     4 70067 5.708822e-05
## 5352     4 70067 5.708822e-05
## 5353     4 70067 5.708822e-05
## 5354     4 70067 5.708822e-05
## 5355     4 70067 5.708822e-05
## 5356     4 70067 5.708822e-05
## 5357     4 70067 5.708822e-05
## 5358     4 70067 5.708822e-05
## 5359     4 70067 5.708822e-05
## 5360     4 70067 5.708822e-05
## 5361     4 70067 5.708822e-05
## 5362     4 70067 5.708822e-05
## 5363     4 70067 5.708822e-05
## 5364     4 70067 5.708822e-05
## 5365     4 70067 5.708822e-05
## 5366     4 70067 5.708822e-05
## 5367     4 70067 5.708822e-05
## 5368     4 70067 5.708822e-05
## 5369     4 70067 5.708822e-05
## 5370     4 70067 5.708822e-05
## 5371     4 70067 5.708822e-05
## 5372     4 70067 5.708822e-05
## 5373     4 70067 5.708822e-05
## 5374     4 53016 7.544892e-05
## 5375     4 53016 7.544892e-05
## 5376     4 53016 7.544892e-05
## 5377     4 53016 7.544892e-05
## 5378     4 53016 7.544892e-05
## 5379     4 53016 7.544892e-05
## 5380     4 53016 7.544892e-05
## 5381     4 53016 7.544892e-05
## 5382     4 53016 7.544892e-05
## 5383     4 53016 7.544892e-05
## 5384     4 53016 7.544892e-05
## 5385     4 53016 7.544892e-05
## 5386     4 53016 7.544892e-05
## 5387     4 53016 7.544892e-05
## 5388     4 53016 7.544892e-05
## 5389     4 53016 7.544892e-05
## 5390     4 53016 7.544892e-05
## 5391     4 53016 7.544892e-05
## 5392     4 53016 7.544892e-05
## 5393     4 53016 7.544892e-05
## 5394     4 53016 7.544892e-05
## 5395     4 53016 7.544892e-05
## 5396     4 53016 7.544892e-05
## 5397     4 53016 7.544892e-05
## 5398     4 53016 7.544892e-05
## 5399     4 53016 7.544892e-05
## 5400     4 53016 7.544892e-05
## 5401     4 53016 7.544892e-05
## 5402     4 53016 7.544892e-05
## 5403     4 53016 7.544892e-05
## 5404     4 53016 7.544892e-05
## 5405     4 53016 7.544892e-05
## 5406     4 53016 7.544892e-05
## 5407     4 53016 7.544892e-05
## 5408     4 53016 7.544892e-05
## 5409     4 53016 7.544892e-05
## 5410     4 53016 7.544892e-05
## 5411     4 53016 7.544892e-05
## 5412     4 53016 7.544892e-05
## 5413     4 53016 7.544892e-05
## 5414     4 53016 7.544892e-05
## 5415     4 53016 7.544892e-05
## 5416     4 53016 7.544892e-05
## 5417     4 53016 7.544892e-05
## 5418     4 53016 7.544892e-05
## 5419     4 53016 7.544892e-05
## 5420     4 53016 7.544892e-05
## 5421     4 53016 7.544892e-05
## 5422     4 53016 7.544892e-05
## 5423     4 53016 7.544892e-05
## 5424     4 53016 7.544892e-05
## 5425     4 53016 7.544892e-05
## 5426     4 53016 7.544892e-05
## 5427     4 53016 7.544892e-05
## 5428     4 53016 7.544892e-05
## 5429     4 53016 7.544892e-05
## 5430     4 53016 7.544892e-05
## 5431     4 53016 7.544892e-05
## 5432     4 53016 7.544892e-05
## 5433     4 53016 7.544892e-05
## 5434     4 53016 7.544892e-05
## 5435     4 53016 7.544892e-05
## 5436     4 53016 7.544892e-05
## 5437     4 53016 7.544892e-05
## 5438     4 53016 7.544892e-05
## 5439     4 53016 7.544892e-05
## 5440     4 53016 7.544892e-05
## 5441     4 53016 7.544892e-05
## 5442     4 53016 7.544892e-05
## 5443     4 53016 7.544892e-05
## 5444     4 53016 7.544892e-05
## 5445     4 53016 7.544892e-05
## 5446     4 53016 7.544892e-05
## 5447     4 53016 7.544892e-05
## 5448     4 53016 7.544892e-05
## 5449     4 53016 7.544892e-05
## 5450     4 53016 7.544892e-05
## 5451     4 53016 7.544892e-05
## 5452     4 53016 7.544892e-05
## 5453     4 53016 7.544892e-05
## 5454     4 53016 7.544892e-05
## 5455     4 53016 7.544892e-05
## 5456     4 53016 7.544892e-05
## 5457     4 53016 7.544892e-05
## 5458     4 53016 7.544892e-05
## 5459     4 53016 7.544892e-05
## 5460     4 53016 7.544892e-05
## 5461     4 53016 7.544892e-05
## 5462     4 53016 7.544892e-05
## 5463     4 53016 7.544892e-05
## 5464     4 53016 7.544892e-05
## 5465     4 53016 7.544892e-05
## 5466     4 53016 7.544892e-05
## 5467     4 53016 7.544892e-05
## 5468     4 53016 7.544892e-05
## 5469     4 53016 7.544892e-05
## 5470     4 53016 7.544892e-05
## 5471     4 53016 7.544892e-05
## 5472     4 53016 7.544892e-05
## 5473     4 53016 7.544892e-05
## 5474     4 53016 7.544892e-05
## 5475     4 53016 7.544892e-05
## 5476     4 53016 7.544892e-05
## 5477     4 53016 7.544892e-05
## 5478     4 53016 7.544892e-05
## 5479     4 53016 7.544892e-05
## 5480     4 53016 7.544892e-05
## 5481     4 53016 7.544892e-05
## 5482     4 53016 7.544892e-05
## 5483     4 53016 7.544892e-05
## 5484     4 53016 7.544892e-05
## 5485     4 53016 7.544892e-05
## 5486     4 53016 7.544892e-05
## 5487     4 53016 7.544892e-05
## 5488     4 53016 7.544892e-05
## 5489     4 53016 7.544892e-05
## 5490     4 53016 7.544892e-05
## 5491     4 53016 7.544892e-05
## 5492     4 53016 7.544892e-05
## 5493     4 53016 7.544892e-05
## 5494     4 53016 7.544892e-05
## 5495     4 53016 7.544892e-05
## 5496     4 53016 7.544892e-05
## 5497     4 53016 7.544892e-05
## 5498     4 53016 7.544892e-05
## 5499     4 53016 7.544892e-05
## 5500     4 53016 7.544892e-05
## 5501     4 53016 7.544892e-05
## 5502     4 53016 7.544892e-05
## 5503     4 53016 7.544892e-05
## 5504     4 53016 7.544892e-05
## 5505     4 53016 7.544892e-05
## 5506     4 53016 7.544892e-05
## 5507     4 53016 7.544892e-05
## 5508     4 53016 7.544892e-05
## 5509     4 53016 7.544892e-05
## 5510     4 53016 7.544892e-05
## 5511     4 53016 7.544892e-05
## 5512     4 53016 7.544892e-05
## 5513     4 53016 7.544892e-05
## 5514     4 53016 7.544892e-05
## 5515     4 53016 7.544892e-05
## 5516     4 53016 7.544892e-05
## 5517     4 53016 7.544892e-05
## 5518     4 53016 7.544892e-05
## 5519     4 53016 7.544892e-05
## 5520     4 53016 7.544892e-05
## 5521     4 53016 7.544892e-05
## 5522     4 53016 7.544892e-05
## 5523     4 53016 7.544892e-05
## 5524     4 53016 7.544892e-05
## 5525     4 53016 7.544892e-05
## 5526     4 53016 7.544892e-05
## 5527     4 53016 7.544892e-05
## 5528     4 53016 7.544892e-05
## 5529     4 53016 7.544892e-05
## 5530     4 53016 7.544892e-05
## 5531     4 53016 7.544892e-05
## 5532     4 53016 7.544892e-05
## 5533     4 53016 7.544892e-05
## 5534     4 53016 7.544892e-05
## 5535     4 53016 7.544892e-05
## 5536     4 53016 7.544892e-05
## 5537     4 53016 7.544892e-05
## 5538     4 53016 7.544892e-05
## 5539     4 53016 7.544892e-05
## 5540     4 53016 7.544892e-05
## 5541     4 53016 7.544892e-05
## 5542     4 53016 7.544892e-05
## 5543     4 53016 7.544892e-05
## 5544     4 53016 7.544892e-05
## 5545     4 53016 7.544892e-05
## 5546     4 53016 7.544892e-05
## 5547     4 53016 7.544892e-05
## 5548     4 53016 7.544892e-05
## 5549     4 53016 7.544892e-05
## 5550     4 53016 7.544892e-05
## 5551     4 53016 7.544892e-05
## 5552     4 53016 7.544892e-05
## 5553     4 53016 7.544892e-05
## 5554     4 53016 7.544892e-05
## 5555     4 53016 7.544892e-05
## 5556     4 53016 7.544892e-05
## 5557     4 53016 7.544892e-05
## 5558     4 53016 7.544892e-05
## 5559     4 53016 7.544892e-05
## 5560     4 53016 7.544892e-05
## 5561     4 53016 7.544892e-05
## 5562     4 53016 7.544892e-05
## 5563     4 53016 7.544892e-05
## 5564     4 53016 7.544892e-05
## 5565     4 53016 7.544892e-05
## 5566     4 53016 7.544892e-05
## 5567     4 53016 7.544892e-05
## 5568     4 53016 7.544892e-05
## 5569     4 53016 7.544892e-05
## 5570     4 53016 7.544892e-05
## 5571     4 53016 7.544892e-05
## 5572     4 53016 7.544892e-05
## 5573     4 53016 7.544892e-05
## 5574     4 53016 7.544892e-05
## 5575     4 53016 7.544892e-05
## 5576     4 53016 7.544892e-05
## 5577     4 53016 7.544892e-05
## 5578     4 53016 7.544892e-05
## 5579     4 53016 7.544892e-05
## 5580     4 53016 7.544892e-05
## 5581     4 53016 7.544892e-05
## 5582     4 53016 7.544892e-05
## 5583     4 53016 7.544892e-05
## 5584     4 53016 7.544892e-05
## 5585     4 53016 7.544892e-05
## 5586     4 53016 7.544892e-05
## 5587     4 53016 7.544892e-05
## 5588     4 53016 7.544892e-05
## 5589     4 53016 7.544892e-05
## 5590     4 53016 7.544892e-05
## 5591     4 53016 7.544892e-05
## 5592     4 53016 7.544892e-05
## 5593     4 53016 7.544892e-05
## 5594     4 53016 7.544892e-05
## 5595     4 53016 7.544892e-05
## 5596     4 53016 7.544892e-05
## 5597     4 53016 7.544892e-05
## 5598     4 53016 7.544892e-05
## 5599     4 53016 7.544892e-05
## 5600     4 53016 7.544892e-05
## 5601     4 53016 7.544892e-05
## 5602     4 53016 7.544892e-05
## 5603     4 53016 7.544892e-05
## 5604     4 53016 7.544892e-05
## 5605     4 53016 7.544892e-05
## 5606     4 53016 7.544892e-05
## 5607     4 53016 7.544892e-05
## 5608     4 53016 7.544892e-05
## 5609     4 53016 7.544892e-05
## 5610     4 53016 7.544892e-05
## 5611     4 53016 7.544892e-05
## 5612     4 53016 7.544892e-05
## 5613     4 53016 7.544892e-05
## 5614     4 53016 7.544892e-05
## 5615     4 53016 7.544892e-05
## 5616     4 53016 7.544892e-05
## 5617     4 53016 7.544892e-05
## 5618     4 53016 7.544892e-05
## 5619     4 53016 7.544892e-05
## 5620     4 53016 7.544892e-05
## 5621     4 53016 7.544892e-05
## 5622     4 53016 7.544892e-05
## 5623     4 53016 7.544892e-05
## 5624     4 53016 7.544892e-05
## 5625     4 53016 7.544892e-05
## 5626     4 53016 7.544892e-05
## 5627     4 53016 7.544892e-05
## 5628     4 53016 7.544892e-05
## 5629     4 53016 7.544892e-05
## 5630     4 53016 7.544892e-05
## 5631     4 53016 7.544892e-05
## 5632     4 53016 7.544892e-05
## 5633     4 53016 7.544892e-05
## 5634     4 53016 7.544892e-05
## 5635     4 53016 7.544892e-05
## 5636     4 53016 7.544892e-05
## 5637     4 53016 7.544892e-05
## 5638     4 53016 7.544892e-05
## 5639     4 53016 7.544892e-05
## 5640     4 53016 7.544892e-05
## 5641     4 53016 7.544892e-05
## 5642     4 53016 7.544892e-05
## 5643     4 53016 7.544892e-05
## 5644     4 53016 7.544892e-05
## 5645     4 53016 7.544892e-05
## 5646     4 53016 7.544892e-05
## 5647     4 53016 7.544892e-05
## 5648     4 53016 7.544892e-05
## 5649     4 53016 7.544892e-05
## 5650     4 53016 7.544892e-05
## 5651     4 53016 7.544892e-05
## 5652     4 53016 7.544892e-05
## 5653     4 53016 7.544892e-05
## 5654     4 53016 7.544892e-05
## 5655     4 53016 7.544892e-05
## 5656     4 53016 7.544892e-05
## 5657     4 53016 7.544892e-05
## 5658     4 53016 7.544892e-05
## 5659     4 53016 7.544892e-05
## 5660     4 53016 7.544892e-05
## 5661     4 53016 7.544892e-05
## 5662     4 53016 7.544892e-05
## 5663     4 53016 7.544892e-05
## 5664     4 53016 7.544892e-05
## 5665     4 53016 7.544892e-05
## 5666     4 53016 7.544892e-05
## 5667     4 53016 7.544892e-05
## 5668     4 53016 7.544892e-05
## 5669     4 53016 7.544892e-05
## 5670     4 53016 7.544892e-05
## 5671     4 53016 7.544892e-05
## 5672     4 53016 7.544892e-05
## 5673     4 53016 7.544892e-05
## 5674     4 53016 7.544892e-05
## 5675     4 53016 7.544892e-05
## 5676     4 53016 7.544892e-05
## 5677     4 53016 7.544892e-05
## 5678     4 53016 7.544892e-05
## 5679     4 53016 7.544892e-05
## 5680     4 53016 7.544892e-05
## 5681     4 53016 7.544892e-05
## 5682     4 53016 7.544892e-05
## 5683     4 53016 7.544892e-05
## 5684     4 53016 7.544892e-05
## 5685     4 53016 7.544892e-05
## 5686     4 53016 7.544892e-05
## 5687     4 53016 7.544892e-05
## 5688     4 53016 7.544892e-05
## 5689     4 53016 7.544892e-05
## 5690     4 53016 7.544892e-05
## 5691     4 53016 7.544892e-05
## 5692     4 53016 7.544892e-05
## 5693     4 53016 7.544892e-05
## 5694     4 53016 7.544892e-05
## 5695     4 53016 7.544892e-05
## 5696     4 53016 7.544892e-05
## 5697     4 53016 7.544892e-05
## 5698     4 53016 7.544892e-05
## 5699     4 53016 7.544892e-05
## 5700     4 53016 7.544892e-05
## 5701     4 53016 7.544892e-05
## 5702     4 53016 7.544892e-05
## 5703     4 53016 7.544892e-05
## 5704     4 53016 7.544892e-05
## 5705     4 53016 7.544892e-05
## 5706     4 53016 7.544892e-05
## 5707     4 53016 7.544892e-05
## 5708     4 53016 7.544892e-05
## 5709     4 53016 7.544892e-05
## 5710     4 53016 7.544892e-05
## 5711     4 53016 7.544892e-05
## 5712     4 53016 7.544892e-05
## 5713     4 53016 7.544892e-05
## 5714     4 53016 7.544892e-05
## 5715     4 53016 7.544892e-05
## 5716     4 53016 7.544892e-05
## 5717     4 53016 7.544892e-05
## 5718     4 53016 7.544892e-05
## 5719     4 53016 7.544892e-05
## 5720     4 53016 7.544892e-05
## 5721     4 53016 7.544892e-05
## 5722     4 53016 7.544892e-05
## 5723     4 53016 7.544892e-05
## 5724     4 53016 7.544892e-05
## 5725     4 53016 7.544892e-05
## 5726     4 53016 7.544892e-05
## 5727     4 53016 7.544892e-05
## 5728     4 53016 7.544892e-05
## 5729     4 53016 7.544892e-05
## 5730     4 53016 7.544892e-05
## 5731     4 53016 7.544892e-05
## 5732     4 53016 7.544892e-05
## 5733     4 53016 7.544892e-05
## 5734     4 53016 7.544892e-05
## 5735     4 53016 7.544892e-05
## 5736     4 53016 7.544892e-05
## 5737     4 53016 7.544892e-05
## 5738     4 53016 7.544892e-05
## 5739     4 53016 7.544892e-05
## 5740     4 53016 7.544892e-05
## 5741     4 53016 7.544892e-05
## 5742     4 53016 7.544892e-05
## 5743     4 53016 7.544892e-05
## 5744     4 53016 7.544892e-05
## 5745     4 53016 7.544892e-05
## 5746     4 53016 7.544892e-05
## 5747     4 53016 7.544892e-05
## 5748     4 53016 7.544892e-05
## 5749     4 53016 7.544892e-05
## 5750     4 53016 7.544892e-05
## 5751     4 53016 7.544892e-05
## 5752     4 53016 7.544892e-05
## 5753     4 53016 7.544892e-05
## 5754     4 53016 7.544892e-05
## 5755     4 53016 7.544892e-05
## 5756     4 53016 7.544892e-05
## 5757     4 53016 7.544892e-05
## 5758     4 53016 7.544892e-05
## 5759     4 53016 7.544892e-05
## 5760     4 53016 7.544892e-05
## 5761     4 53016 7.544892e-05
## 5762     4 53016 7.544892e-05
## 5763     4 53016 7.544892e-05
## 5764     4 53016 7.544892e-05
## 5765     4 53016 7.544892e-05
## 5766     4 53016 7.544892e-05
## 5767     4 53016 7.544892e-05
## 5768     4 53016 7.544892e-05
## 5769     4 53016 7.544892e-05
## 5770     4 53016 7.544892e-05
## 5771     4 53016 7.544892e-05
## 5772     4 53016 7.544892e-05
## 5773     4 53016 7.544892e-05
## 5774     4 53016 7.544892e-05
## 5775     4 53016 7.544892e-05
## 5776     4 53016 7.544892e-05
## 5777     4 53016 7.544892e-05
## 5778     4 53016 7.544892e-05
## 5779     4 53016 7.544892e-05
## 5780     4 53016 7.544892e-05
## 5781     4 53016 7.544892e-05
## 5782     4 53016 7.544892e-05
## 5783     4 53016 7.544892e-05
## 5784     4 53016 7.544892e-05
## 5785     4 53016 7.544892e-05
## 5786     4 53016 7.544892e-05
## 5787     4 53016 7.544892e-05
## 5788     4 53016 7.544892e-05
## 5789     4 53016 7.544892e-05
## 5790     4 53016 7.544892e-05
## 5791     4 53016 7.544892e-05
## 5792     4 53016 7.544892e-05
## 5793     4 53016 7.544892e-05
## 5794     4 53016 7.544892e-05
## 5795     4 53016 7.544892e-05
## 5796     4 53016 7.544892e-05
## 5797     4 53016 7.544892e-05
## 5798     4 53016 7.544892e-05
## 5799     4 53016 7.544892e-05
## 5800     4 53016 7.544892e-05
## 5801     4 53016 7.544892e-05
## 5802     4 53016 7.544892e-05
## 5803     4 53016 7.544892e-05
## 5804     4 53016 7.544892e-05
## 5805     4 53016 7.544892e-05
## 5806     4 53016 7.544892e-05
## 5807     4 53016 7.544892e-05
## 5808     4 53016 7.544892e-05
## 5809     4 53016 7.544892e-05
## 5810     4 53016 7.544892e-05
## 5811     4 53016 7.544892e-05
## 5812     4 53016 7.544892e-05
## 5813     4 53016 7.544892e-05
## 5814     4 53016 7.544892e-05
## 5815     4 53016 7.544892e-05
## 5816     4 53016 7.544892e-05
## 5817     4 53016 7.544892e-05
## 5818     4 53016 7.544892e-05
## 5819     4 53016 7.544892e-05
## 5820     4 53016 7.544892e-05
## 5821     4 53016 7.544892e-05
## 5822     4 53016 7.544892e-05
## 5823     4 53016 7.544892e-05
## 5824     4 53016 7.544892e-05
## 5825     4 53016 7.544892e-05
## 5826     4 53016 7.544892e-05
## 5827     4 53016 7.544892e-05
## 5828     4 53016 7.544892e-05
## 5829     4 53016 7.544892e-05
## 5830     4 53016 7.544892e-05
## 5831     4 53016 7.544892e-05
## 5832     4 53016 7.544892e-05
## 5833     4 53016 7.544892e-05
## 5834     4 53016 7.544892e-05
## 5835     4 53016 7.544892e-05
## 5836     4 53016 7.544892e-05
## 5837     4 53016 7.544892e-05
## 5838     4 53016 7.544892e-05
## 5839     4 53016 7.544892e-05
## 5840     4 53016 7.544892e-05
## 5841     4 53016 7.544892e-05
## 5842     4 16547 2.417357e-04
## 5843     4 16547 2.417357e-04
## 5844     4 16547 2.417357e-04
## 5845     4 16547 2.417357e-04
## 5846     4 16547 2.417357e-04
## 5847     4 16547 2.417357e-04
## 5848     4 16547 2.417357e-04
## 5849     4 16547 2.417357e-04
## 5850     4 16547 2.417357e-04
## 5851     4 16547 2.417357e-04
## 5852     4 16547 2.417357e-04
## 5853     4 16547 2.417357e-04
## 5854     4 16547 2.417357e-04
## 5855     4 16547 2.417357e-04
## 5856     4 16547 2.417357e-04
## 5857     4 16547 2.417357e-04
## 5858     4 16547 2.417357e-04
## 5859     4 16547 2.417357e-04
## 5860     4 16547 2.417357e-04
## 5861     4 16547 2.417357e-04
## 5862     4 16547 2.417357e-04
## 5863     4 16547 2.417357e-04
## 5864     4 16547 2.417357e-04
## 5865     4 16547 2.417357e-04
## 5866     4 16547 2.417357e-04
## 5867     4 16547 2.417357e-04
## 5868     4 16547 2.417357e-04
## 5869     4 16547 2.417357e-04
## 5870     4 16547 2.417357e-04
## 5871     4 16547 2.417357e-04
## 5872     4 16547 2.417357e-04
## 5873     4 16547 2.417357e-04
## 5874     4 16547 2.417357e-04
## 5875     4 16547 2.417357e-04
## 5876     4 16547 2.417357e-04
## 5877     4 16547 2.417357e-04
## 5878     4 16547 2.417357e-04
## 5879     4 16547 2.417357e-04
## 5880     4 16547 2.417357e-04
## 5881     4 16547 2.417357e-04
## 5882     4 16547 2.417357e-04
## 5883     4 16547 2.417357e-04
## 5884     4 16547 2.417357e-04
## 5885     4 16547 2.417357e-04
## 5886     4 16547 2.417357e-04
## 5887     4 16547 2.417357e-04
## 5888     4 16547 2.417357e-04
## 5889     4 16547 2.417357e-04
## 5890     4 16547 2.417357e-04
## 5891     4 16547 2.417357e-04
## 5892     4 16547 2.417357e-04
## 5893     4 16547 2.417357e-04
## 5894     4 16547 2.417357e-04
## 5895     4 16547 2.417357e-04
## 5896     4 16547 2.417357e-04
## 5897     4 16547 2.417357e-04
## 5898     4 16547 2.417357e-04
## 5899     4 16547 2.417357e-04
## 5900     4 16547 2.417357e-04
## 5901     4 16547 2.417357e-04
## 5902     4 16547 2.417357e-04
## 5903     4 16547 2.417357e-04
## 5904     4 16547 2.417357e-04
## 5905     4 16547 2.417357e-04
## 5906     4 16547 2.417357e-04
## 5907     4 16547 2.417357e-04
## 5908     4 16547 2.417357e-04
## 5909     4 16547 2.417357e-04
## 5910     4 16547 2.417357e-04
## 5911     4 16547 2.417357e-04
## 5912     4 16547 2.417357e-04
## 5913     4 16547 2.417357e-04
## 5914     4 16547 2.417357e-04
## 5915     4 16547 2.417357e-04
## 5916     4 16547 2.417357e-04
## 5917     4 16547 2.417357e-04
## 5918     4 16547 2.417357e-04
## 5919     4 16547 2.417357e-04
## 5920     4 16547 2.417357e-04
## 5921     4 16547 2.417357e-04
## 5922     4 16547 2.417357e-04
## 5923     4 16547 2.417357e-04
## 5924     4 16547 2.417357e-04
## 5925     4 16547 2.417357e-04
## 5926     4 16547 2.417357e-04
## 5927     4 16547 2.417357e-04
## 5928     4 16547 2.417357e-04
## 5929     4 16547 2.417357e-04
## 5930     4 16547 2.417357e-04
## 5931     4 16547 2.417357e-04
## 5932     4 16547 2.417357e-04
## 5933     4 16547 2.417357e-04
## 5934     4 16547 2.417357e-04
## 5935     4 16547 2.417357e-04
## 5936     4 16547 2.417357e-04
## 5937     4 16547 2.417357e-04
## 5938     4 16547 2.417357e-04
## 5939     4 16547 2.417357e-04
## 5940     4 16547 2.417357e-04
## 5941     4 16547 2.417357e-04
## 5942     4 16547 2.417357e-04
## 5943     4 16547 2.417357e-04
## 5944     4 16547 2.417357e-04
## 5945     4 16547 2.417357e-04
## 5946     4 16547 2.417357e-04
## 5947     4 16547 2.417357e-04
## 5948     4 16547 2.417357e-04
## 5949     4 16547 2.417357e-04
## 5950     4 16547 2.417357e-04
## 5951     4 16547 2.417357e-04
## 5952     4 16547 2.417357e-04
## 5953     4 16547 2.417357e-04
## 5954     4 16547 2.417357e-04
## 5955     4 16547 2.417357e-04
## 5956     4 16547 2.417357e-04
## 5957     4 16547 2.417357e-04
## 5958     4 16547 2.417357e-04
## 5959     4 16547 2.417357e-04
## 5960     4 16547 2.417357e-04
## 5961     4 16547 2.417357e-04
## 5962     4 16547 2.417357e-04
## 5963     4 16547 2.417357e-04
## 5964     4 16547 2.417357e-04
## 5965     4 16547 2.417357e-04
## 5966     4 16547 2.417357e-04
## 5967     4 16547 2.417357e-04
## 5968     4 16547 2.417357e-04
## 5969     4 16547 2.417357e-04
## 5970     4 16547 2.417357e-04
## 5971     4 16547 2.417357e-04
## 5972     4 16547 2.417357e-04
## 5973     4 16547 2.417357e-04
## 5974     4 16547 2.417357e-04
## 5975     4 16547 2.417357e-04
## 5976     4 16547 2.417357e-04
## 5977     4 16547 2.417357e-04
## 5978     4 16547 2.417357e-04
## 5979     4 16547 2.417357e-04
## 5980     4 16547 2.417357e-04
## 5981     4 16547 2.417357e-04
## 5982     4 16547 2.417357e-04
## 5983     4 16547 2.417357e-04
## 5984     4 16547 2.417357e-04
## 5985     4 16547 2.417357e-04
## 5986     4 16547 2.417357e-04
## 5987     4 16547 2.417357e-04
## 5988     4 16547 2.417357e-04
## 5989     4 16547 2.417357e-04
## 5990     4 16547 2.417357e-04
## 5991     4 16547 2.417357e-04
## 5992     4 16547 2.417357e-04
## 5993     4 16547 2.417357e-04
## 5994     4 16547 2.417357e-04
## 5995     4 16547 2.417357e-04
## 5996     4 16547 2.417357e-04
## 5997     4 16547 2.417357e-04
## 5998     4 16547 2.417357e-04
## 5999     4 16547 2.417357e-04
## 6000     4 16547 2.417357e-04
## 6001     4 16547 2.417357e-04
## 6002     4 16547 2.417357e-04
## 6003     4 16547 2.417357e-04
## 6004     4 16547 2.417357e-04
## 6005     4 16547 2.417357e-04
## 6006     4 16547 2.417357e-04
## 6007     4 16547 2.417357e-04
## 6008     4 16547 2.417357e-04
## 6009     4 16547 2.417357e-04
## 6010     4 16547 2.417357e-04
## 6011     4 16547 2.417357e-04
## 6012     4 16547 2.417357e-04
## 6013     4 16547 2.417357e-04
## 6014     4 16547 2.417357e-04
## 6015     4 16547 2.417357e-04
## 6016     4 16547 2.417357e-04
## 6017     4 16547 2.417357e-04
## 6018     4 16547 2.417357e-04
## 6019     4 16547 2.417357e-04
## 6020     4 16547 2.417357e-04
## 6021     4 16547 2.417357e-04
## 6022     4 16547 2.417357e-04
## 6023     4 16547 2.417357e-04
## 6024     4 16547 2.417357e-04
## 6025     4 16547 2.417357e-04
## 6026     4 16547 2.417357e-04
## 6027     4 16547 2.417357e-04
## 6028     4 16547 2.417357e-04
## 6029     4 16547 2.417357e-04
## 6030     4 16547 2.417357e-04
## 6031     4 16547 2.417357e-04
## 6032     4 16547 2.417357e-04
## 6033     4 16547 2.417357e-04
## 6034     4 16547 2.417357e-04
## 6035     4 16547 2.417357e-04
## 6036     4 16547 2.417357e-04
## 6037     4 16547 2.417357e-04
## 6038     4 16547 2.417357e-04
## 6039     4 16547 2.417357e-04
## 6040     4 16547 2.417357e-04
## 6041     4 16547 2.417357e-04
## 6042     4 16547 2.417357e-04
## 6043     4 16547 2.417357e-04
## 6044     4 16547 2.417357e-04
## 6045     4 16547 2.417357e-04
## 6046     4 16547 2.417357e-04
## 6047     4 16547 2.417357e-04
## 6048     4 16547 2.417357e-04
## 6049     4 16547 2.417357e-04
## 6050     4 16547 2.417357e-04
## 6051     4 16547 2.417357e-04
## 6052     4 16547 2.417357e-04
## 6053     4 16547 2.417357e-04
## 6054     4 16547 2.417357e-04
## 6055     4 16547 2.417357e-04
## 6056     4 16547 2.417357e-04
## 6057     4 16547 2.417357e-04
## 6058     4 16547 2.417357e-04
## 6059     4 16547 2.417357e-04
## 6060     4 16547 2.417357e-04
## 6061     4 16547 2.417357e-04
## 6062     4 16547 2.417357e-04
## 6063     4 16547 2.417357e-04
## 6064     4 16547 2.417357e-04
## 6065     4 16547 2.417357e-04
## 6066     4 16547 2.417357e-04
## 6067     4 16547 2.417357e-04
## 6068     4 16547 2.417357e-04
## 6069     4 16547 2.417357e-04
## 6070     4 16547 2.417357e-04
## 6071     4 16547 2.417357e-04
## 6072     4 16547 2.417357e-04
## 6073     4 16547 2.417357e-04
## 6074     4 16547 2.417357e-04
## 6075     4 16547 2.417357e-04
## 6076     4 16547 2.417357e-04
## 6077     3 70067 4.281616e-05
## 6078     3 70067 4.281616e-05
## 6079     3 70067 4.281616e-05
## 6080     3 70067 4.281616e-05
## 6081     3 70067 4.281616e-05
## 6082     3 70067 4.281616e-05
## 6083     3 70067 4.281616e-05
## 6084     3 70067 4.281616e-05
## 6085     3 70067 4.281616e-05
## 6086     3 70067 4.281616e-05
## 6087     3 70067 4.281616e-05
## 6088     3 70067 4.281616e-05
## 6089     3 70067 4.281616e-05
## 6090     3 70067 4.281616e-05
## 6091     3 70067 4.281616e-05
## 6092     3 70067 4.281616e-05
## 6093     3 70067 4.281616e-05
## 6094     3 70067 4.281616e-05
## 6095     3 70067 4.281616e-05
## 6096     3 70067 4.281616e-05
## 6097     3 70067 4.281616e-05
## 6098     3 70067 4.281616e-05
## 6099     3 70067 4.281616e-05
## 6100     3 70067 4.281616e-05
## 6101     3 70067 4.281616e-05
## 6102     3 70067 4.281616e-05
## 6103     3 70067 4.281616e-05
## 6104     3 70067 4.281616e-05
## 6105     3 70067 4.281616e-05
## 6106     3 70067 4.281616e-05
## 6107     3 70067 4.281616e-05
## 6108     3 70067 4.281616e-05
## 6109     3 70067 4.281616e-05
## 6110     3 70067 4.281616e-05
## 6111     3 70067 4.281616e-05
## 6112     3 70067 4.281616e-05
## 6113     3 70067 4.281616e-05
## 6114     3 70067 4.281616e-05
## 6115     3 70067 4.281616e-05
## 6116     3 70067 4.281616e-05
## 6117     3 70067 4.281616e-05
## 6118     3 70067 4.281616e-05
## 6119     3 70067 4.281616e-05
## 6120     3 70067 4.281616e-05
## 6121     3 70067 4.281616e-05
## 6122     3 70067 4.281616e-05
## 6123     3 70067 4.281616e-05
## 6124     3 70067 4.281616e-05
## 6125     3 70067 4.281616e-05
## 6126     3 70067 4.281616e-05
## 6127     3 70067 4.281616e-05
## 6128     3 70067 4.281616e-05
## 6129     3 70067 4.281616e-05
## 6130     3 70067 4.281616e-05
## 6131     3 70067 4.281616e-05
## 6132     3 70067 4.281616e-05
## 6133     3 70067 4.281616e-05
## 6134     3 70067 4.281616e-05
## 6135     3 70067 4.281616e-05
## 6136     3 70067 4.281616e-05
## 6137     3 70067 4.281616e-05
## 6138     3 70067 4.281616e-05
## 6139     3 70067 4.281616e-05
## 6140     3 70067 4.281616e-05
## 6141     3 70067 4.281616e-05
## 6142     3 70067 4.281616e-05
## 6143     3 70067 4.281616e-05
## 6144     3 70067 4.281616e-05
## 6145     3 70067 4.281616e-05
## 6146     3 70067 4.281616e-05
## 6147     3 70067 4.281616e-05
## 6148     3 70067 4.281616e-05
## 6149     3 70067 4.281616e-05
## 6150     3 70067 4.281616e-05
## 6151     3 70067 4.281616e-05
## 6152     3 70067 4.281616e-05
## 6153     3 70067 4.281616e-05
## 6154     3 70067 4.281616e-05
## 6155     3 70067 4.281616e-05
## 6156     3 70067 4.281616e-05
## 6157     3 70067 4.281616e-05
## 6158     3 70067 4.281616e-05
## 6159     3 70067 4.281616e-05
## 6160     3 70067 4.281616e-05
## 6161     3 70067 4.281616e-05
## 6162     3 70067 4.281616e-05
## 6163     3 70067 4.281616e-05
## 6164     3 70067 4.281616e-05
## 6165     3 70067 4.281616e-05
## 6166     3 70067 4.281616e-05
## 6167     3 70067 4.281616e-05
## 6168     3 70067 4.281616e-05
## 6169     3 70067 4.281616e-05
## 6170     3 70067 4.281616e-05
## 6171     3 70067 4.281616e-05
## 6172     3 70067 4.281616e-05
## 6173     3 70067 4.281616e-05
## 6174     3 70067 4.281616e-05
## 6175     3 70067 4.281616e-05
## 6176     3 70067 4.281616e-05
## 6177     3 70067 4.281616e-05
## 6178     3 70067 4.281616e-05
## 6179     3 70067 4.281616e-05
## 6180     3 70067 4.281616e-05
## 6181     3 70067 4.281616e-05
## 6182     3 70067 4.281616e-05
## 6183     3 70067 4.281616e-05
## 6184     3 70067 4.281616e-05
## 6185     3 70067 4.281616e-05
## 6186     3 70067 4.281616e-05
## 6187     3 70067 4.281616e-05
## 6188     3 70067 4.281616e-05
## 6189     3 70067 4.281616e-05
## 6190     3 70067 4.281616e-05
## 6191     3 70067 4.281616e-05
## 6192     3 70067 4.281616e-05
## 6193     3 70067 4.281616e-05
## 6194     3 70067 4.281616e-05
## 6195     3 70067 4.281616e-05
## 6196     3 70067 4.281616e-05
## 6197     3 70067 4.281616e-05
## 6198     3 70067 4.281616e-05
## 6199     3 70067 4.281616e-05
## 6200     3 70067 4.281616e-05
## 6201     3 70067 4.281616e-05
## 6202     3 70067 4.281616e-05
## 6203     3 70067 4.281616e-05
## 6204     3 70067 4.281616e-05
## 6205     3 70067 4.281616e-05
## 6206     3 70067 4.281616e-05
## 6207     3 70067 4.281616e-05
## 6208     3 70067 4.281616e-05
## 6209     3 70067 4.281616e-05
## 6210     3 70067 4.281616e-05
## 6211     3 70067 4.281616e-05
## 6212     3 70067 4.281616e-05
## 6213     3 70067 4.281616e-05
## 6214     3 70067 4.281616e-05
## 6215     3 70067 4.281616e-05
## 6216     3 70067 4.281616e-05
## 6217     3 70067 4.281616e-05
## 6218     3 70067 4.281616e-05
## 6219     3 70067 4.281616e-05
## 6220     3 70067 4.281616e-05
## 6221     3 70067 4.281616e-05
## 6222     3 70067 4.281616e-05
## 6223     3 70067 4.281616e-05
## 6224     3 70067 4.281616e-05
## 6225     3 70067 4.281616e-05
## 6226     3 70067 4.281616e-05
## 6227     3 70067 4.281616e-05
## 6228     3 70067 4.281616e-05
## 6229     3 70067 4.281616e-05
## 6230     3 70067 4.281616e-05
## 6231     3 70067 4.281616e-05
## 6232     3 70067 4.281616e-05
## 6233     3 70067 4.281616e-05
## 6234     3 70067 4.281616e-05
## 6235     3 70067 4.281616e-05
## 6236     3 70067 4.281616e-05
## 6237     3 70067 4.281616e-05
## 6238     3 70067 4.281616e-05
## 6239     3 70067 4.281616e-05
## 6240     3 70067 4.281616e-05
## 6241     3 70067 4.281616e-05
## 6242     3 70067 4.281616e-05
## 6243     3 70067 4.281616e-05
## 6244     3 70067 4.281616e-05
## 6245     3 70067 4.281616e-05
## 6246     3 70067 4.281616e-05
## 6247     3 70067 4.281616e-05
## 6248     3 70067 4.281616e-05
## 6249     3 70067 4.281616e-05
## 6250     3 70067 4.281616e-05
## 6251     3 70067 4.281616e-05
## 6252     3 70067 4.281616e-05
## 6253     3 70067 4.281616e-05
## 6254     3 70067 4.281616e-05
## 6255     3 70067 4.281616e-05
## 6256     3 70067 4.281616e-05
## 6257     3 70067 4.281616e-05
## 6258     3 70067 4.281616e-05
## 6259     3 70067 4.281616e-05
## 6260     3 70067 4.281616e-05
## 6261     3 70067 4.281616e-05
## 6262     3 70067 4.281616e-05
## 6263     3 70067 4.281616e-05
## 6264     3 70067 4.281616e-05
## 6265     3 70067 4.281616e-05
## 6266     3 70067 4.281616e-05
## 6267     3 70067 4.281616e-05
## 6268     3 70067 4.281616e-05
## 6269     3 70067 4.281616e-05
## 6270     3 70067 4.281616e-05
## 6271     3 70067 4.281616e-05
## 6272     3 70067 4.281616e-05
## 6273     3 70067 4.281616e-05
## 6274     3 70067 4.281616e-05
## 6275     3 70067 4.281616e-05
## 6276     3 70067 4.281616e-05
## 6277     3 70067 4.281616e-05
## 6278     3 70067 4.281616e-05
## 6279     3 70067 4.281616e-05
## 6280     3 70067 4.281616e-05
## 6281     3 70067 4.281616e-05
## 6282     3 70067 4.281616e-05
## 6283     3 70067 4.281616e-05
## 6284     3 70067 4.281616e-05
## 6285     3 70067 4.281616e-05
## 6286     3 70067 4.281616e-05
## 6287     3 70067 4.281616e-05
## 6288     3 70067 4.281616e-05
## 6289     3 70067 4.281616e-05
## 6290     3 70067 4.281616e-05
## 6291     3 70067 4.281616e-05
## 6292     3 70067 4.281616e-05
## 6293     3 70067 4.281616e-05
## 6294     3 70067 4.281616e-05
## 6295     3 70067 4.281616e-05
## 6296     3 70067 4.281616e-05
## 6297     3 70067 4.281616e-05
## 6298     3 70067 4.281616e-05
## 6299     3 70067 4.281616e-05
## 6300     3 70067 4.281616e-05
## 6301     3 70067 4.281616e-05
## 6302     3 70067 4.281616e-05
## 6303     3 70067 4.281616e-05
## 6304     3 70067 4.281616e-05
## 6305     3 70067 4.281616e-05
## 6306     3 70067 4.281616e-05
## 6307     3 70067 4.281616e-05
## 6308     3 70067 4.281616e-05
## 6309     3 70067 4.281616e-05
## 6310     3 70067 4.281616e-05
## 6311     3 70067 4.281616e-05
## 6312     3 70067 4.281616e-05
## 6313     3 70067 4.281616e-05
## 6314     3 70067 4.281616e-05
## 6315     3 70067 4.281616e-05
## 6316     3 70067 4.281616e-05
## 6317     3 70067 4.281616e-05
## 6318     3 70067 4.281616e-05
## 6319     3 70067 4.281616e-05
## 6320     3 70067 4.281616e-05
## 6321     3 70067 4.281616e-05
## 6322     3 70067 4.281616e-05
## 6323     3 70067 4.281616e-05
## 6324     3 70067 4.281616e-05
## 6325     3 70067 4.281616e-05
## 6326     3 70067 4.281616e-05
## 6327     3 70067 4.281616e-05
## 6328     3 70067 4.281616e-05
## 6329     3 70067 4.281616e-05
## 6330     3 70067 4.281616e-05
## 6331     3 70067 4.281616e-05
## 6332     3 70067 4.281616e-05
## 6333     3 70067 4.281616e-05
## 6334     3 70067 4.281616e-05
## 6335     3 70067 4.281616e-05
## 6336     3 70067 4.281616e-05
## 6337     3 70067 4.281616e-05
## 6338     3 70067 4.281616e-05
## 6339     3 70067 4.281616e-05
## 6340     3 70067 4.281616e-05
## 6341     3 70067 4.281616e-05
## 6342     3 70067 4.281616e-05
## 6343     3 70067 4.281616e-05
## 6344     3 70067 4.281616e-05
## 6345     3 70067 4.281616e-05
## 6346     3 70067 4.281616e-05
## 6347     3 70067 4.281616e-05
## 6348     3 70067 4.281616e-05
## 6349     3 70067 4.281616e-05
## 6350     3 70067 4.281616e-05
## 6351     3 70067 4.281616e-05
## 6352     3 70067 4.281616e-05
## 6353     3 70067 4.281616e-05
## 6354     3 70067 4.281616e-05
## 6355     3 70067 4.281616e-05
## 6356     3 70067 4.281616e-05
## 6357     3 70067 4.281616e-05
## 6358     3 70067 4.281616e-05
## 6359     3 70067 4.281616e-05
## 6360     3 70067 4.281616e-05
## 6361     3 70067 4.281616e-05
## 6362     3 70067 4.281616e-05
## 6363     3 70067 4.281616e-05
## 6364     3 70067 4.281616e-05
## 6365     3 70067 4.281616e-05
## 6366     3 70067 4.281616e-05
## 6367     3 70067 4.281616e-05
## 6368     3 70067 4.281616e-05
## 6369     3 70067 4.281616e-05
## 6370     3 70067 4.281616e-05
## 6371     3 70067 4.281616e-05
## 6372     3 70067 4.281616e-05
## 6373     3 70067 4.281616e-05
## 6374     3 70067 4.281616e-05
## 6375     3 70067 4.281616e-05
## 6376     3 70067 4.281616e-05
## 6377     3 70067 4.281616e-05
## 6378     3 70067 4.281616e-05
## 6379     3 70067 4.281616e-05
## 6380     3 70067 4.281616e-05
## 6381     3 70067 4.281616e-05
## 6382     3 70067 4.281616e-05
## 6383     3 70067 4.281616e-05
## 6384     3 70067 4.281616e-05
## 6385     3 70067 4.281616e-05
## 6386     3 70067 4.281616e-05
## 6387     3 70067 4.281616e-05
## 6388     3 70067 4.281616e-05
## 6389     3 70067 4.281616e-05
## 6390     3 70067 4.281616e-05
## 6391     3 70067 4.281616e-05
## 6392     3 70067 4.281616e-05
## 6393     3 70067 4.281616e-05
## 6394     3 70067 4.281616e-05
## 6395     3 70067 4.281616e-05
## 6396     3 70067 4.281616e-05
## 6397     3 70067 4.281616e-05
## 6398     3 70067 4.281616e-05
## 6399     3 70067 4.281616e-05
## 6400     3 70067 4.281616e-05
## 6401     3 70067 4.281616e-05
## 6402     3 70067 4.281616e-05
## 6403     3 70067 4.281616e-05
## 6404     3 70067 4.281616e-05
## 6405     3 70067 4.281616e-05
## 6406     3 70067 4.281616e-05
## 6407     3 70067 4.281616e-05
## 6408     3 70067 4.281616e-05
## 6409     3 70067 4.281616e-05
## 6410     3 70067 4.281616e-05
## 6411     3 70067 4.281616e-05
## 6412     3 70067 4.281616e-05
## 6413     3 70067 4.281616e-05
## 6414     3 70067 4.281616e-05
## 6415     3 70067 4.281616e-05
## 6416     3 70067 4.281616e-05
## 6417     3 70067 4.281616e-05
## 6418     3 70067 4.281616e-05
## 6419     3 70067 4.281616e-05
## 6420     3 70067 4.281616e-05
## 6421     3 70067 4.281616e-05
## 6422     3 70067 4.281616e-05
## 6423     3 70067 4.281616e-05
## 6424     3 70067 4.281616e-05
## 6425     3 70067 4.281616e-05
## 6426     3 70067 4.281616e-05
## 6427     3 70067 4.281616e-05
## 6428     3 70067 4.281616e-05
## 6429     3 70067 4.281616e-05
## 6430     3 70067 4.281616e-05
## 6431     3 70067 4.281616e-05
## 6432     3 70067 4.281616e-05
## 6433     3 70067 4.281616e-05
## 6434     3 70067 4.281616e-05
## 6435     3 70067 4.281616e-05
## 6436     3 70067 4.281616e-05
## 6437     3 70067 4.281616e-05
## 6438     3 70067 4.281616e-05
## 6439     3 70067 4.281616e-05
## 6440     3 70067 4.281616e-05
## 6441     3 70067 4.281616e-05
## 6442     3 70067 4.281616e-05
## 6443     3 70067 4.281616e-05
## 6444     3 70067 4.281616e-05
## 6445     3 70067 4.281616e-05
## 6446     3 70067 4.281616e-05
## 6447     3 70067 4.281616e-05
## 6448     3 70067 4.281616e-05
## 6449     3 70067 4.281616e-05
## 6450     3 70067 4.281616e-05
## 6451     3 70067 4.281616e-05
## 6452     3 70067 4.281616e-05
## 6453     3 70067 4.281616e-05
## 6454     3 70067 4.281616e-05
## 6455     3 70067 4.281616e-05
## 6456     3 70067 4.281616e-05
## 6457     3 70067 4.281616e-05
## 6458     3 70067 4.281616e-05
## 6459     3 70067 4.281616e-05
## 6460     3 70067 4.281616e-05
## 6461     3 70067 4.281616e-05
## 6462     3 70067 4.281616e-05
## 6463     3 70067 4.281616e-05
## 6464     3 70067 4.281616e-05
## 6465     3 70067 4.281616e-05
## 6466     3 70067 4.281616e-05
## 6467     3 70067 4.281616e-05
## 6468     3 70067 4.281616e-05
## 6469     3 70067 4.281616e-05
## 6470     3 70067 4.281616e-05
## 6471     3 70067 4.281616e-05
## 6472     3 70067 4.281616e-05
## 6473     3 70067 4.281616e-05
## 6474     3 70067 4.281616e-05
## 6475     3 70067 4.281616e-05
## 6476     3 70067 4.281616e-05
## 6477     3 70067 4.281616e-05
## 6478     3 70067 4.281616e-05
## 6479     3 70067 4.281616e-05
## 6480     3 70067 4.281616e-05
## 6481     3 70067 4.281616e-05
## 6482     3 70067 4.281616e-05
## 6483     3 70067 4.281616e-05
## 6484     3 70067 4.281616e-05
## 6485     3 70067 4.281616e-05
## 6486     3 70067 4.281616e-05
## 6487     3 70067 4.281616e-05
## 6488     3 70067 4.281616e-05
## 6489     3 70067 4.281616e-05
## 6490     3 70067 4.281616e-05
## 6491     3 70067 4.281616e-05
## 6492     3 70067 4.281616e-05
## 6493     3 70067 4.281616e-05
## 6494     3 70067 4.281616e-05
## 6495     3 70067 4.281616e-05
## 6496     3 70067 4.281616e-05
## 6497     3 70067 4.281616e-05
## 6498     3 70067 4.281616e-05
## 6499     3 70067 4.281616e-05
## 6500     3 70067 4.281616e-05
## 6501     3 70067 4.281616e-05
## 6502     3 70067 4.281616e-05
## 6503     3 70067 4.281616e-05
## 6504     3 70067 4.281616e-05
## 6505     3 70067 4.281616e-05
## 6506     3 70067 4.281616e-05
## 6507     3 70067 4.281616e-05
## 6508     3 70067 4.281616e-05
## 6509     3 70067 4.281616e-05
## 6510     3 70067 4.281616e-05
## 6511     3 70067 4.281616e-05
## 6512     3 70067 4.281616e-05
## 6513     3 70067 4.281616e-05
## 6514     3 70067 4.281616e-05
## 6515     3 70067 4.281616e-05
## 6516     3 70067 4.281616e-05
## 6517     3 70067 4.281616e-05
## 6518     3 70067 4.281616e-05
## 6519     3 70067 4.281616e-05
## 6520     3 70067 4.281616e-05
## 6521     3 70067 4.281616e-05
## 6522     3 70067 4.281616e-05
## 6523     3 70067 4.281616e-05
## 6524     3 70067 4.281616e-05
## 6525     3 70067 4.281616e-05
## 6526     3 70067 4.281616e-05
## 6527     3 70067 4.281616e-05
## 6528     3 70067 4.281616e-05
## 6529     3 70067 4.281616e-05
## 6530     3 70067 4.281616e-05
## 6531     3 70067 4.281616e-05
## 6532     3 70067 4.281616e-05
## 6533     3 70067 4.281616e-05
## 6534     3 70067 4.281616e-05
## 6535     3 70067 4.281616e-05
## 6536     3 70067 4.281616e-05
## 6537     3 70067 4.281616e-05
## 6538     3 70067 4.281616e-05
## 6539     3 70067 4.281616e-05
## 6540     3 70067 4.281616e-05
## 6541     3 70067 4.281616e-05
## 6542     3 70067 4.281616e-05
## 6543     3 70067 4.281616e-05
## 6544     3 70067 4.281616e-05
## 6545     3 70067 4.281616e-05
## 6546     3 70067 4.281616e-05
## 6547     3 70067 4.281616e-05
## 6548     3 70067 4.281616e-05
## 6549     3 70067 4.281616e-05
## 6550     3 70067 4.281616e-05
## 6551     3 70067 4.281616e-05
## 6552     3 70067 4.281616e-05
## 6553     3 70067 4.281616e-05
## 6554     3 70067 4.281616e-05
## 6555     3 70067 4.281616e-05
## 6556     3 70067 4.281616e-05
## 6557     3 70067 4.281616e-05
## 6558     3 70067 4.281616e-05
## 6559     3 70067 4.281616e-05
## 6560     3 70067 4.281616e-05
## 6561     3 70067 4.281616e-05
## 6562     3 70067 4.281616e-05
## 6563     3 70067 4.281616e-05
## 6564     3 70067 4.281616e-05
## 6565     3 70067 4.281616e-05
## 6566     3 70067 4.281616e-05
## 6567     3 70067 4.281616e-05
## 6568     3 70067 4.281616e-05
## 6569     3 70067 4.281616e-05
## 6570     3 70067 4.281616e-05
## 6571     3 70067 4.281616e-05
## 6572     3 70067 4.281616e-05
## 6573     3 70067 4.281616e-05
## 6574     3 70067 4.281616e-05
## 6575     3 70067 4.281616e-05
## 6576     3 70067 4.281616e-05
## 6577     3 70067 4.281616e-05
## 6578     3 70067 4.281616e-05
## 6579     3 70067 4.281616e-05
## 6580     3 70067 4.281616e-05
## 6581     3 70067 4.281616e-05
## 6582     3 70067 4.281616e-05
## 6583     3 70067 4.281616e-05
## 6584     3 70067 4.281616e-05
## 6585     3 70067 4.281616e-05
## 6586     3 70067 4.281616e-05
## 6587     3 70067 4.281616e-05
## 6588     3 70067 4.281616e-05
## 6589     3 70067 4.281616e-05
## 6590     3 70067 4.281616e-05
## 6591     3 70067 4.281616e-05
## 6592     3 70067 4.281616e-05
## 6593     3 70067 4.281616e-05
## 6594     3 70067 4.281616e-05
## 6595     3 70067 4.281616e-05
## 6596     3 70067 4.281616e-05
## 6597     3 70067 4.281616e-05
## 6598     3 70067 4.281616e-05
## 6599     3 70067 4.281616e-05
## 6600     3 70067 4.281616e-05
## 6601     3 70067 4.281616e-05
## 6602     3 70067 4.281616e-05
## 6603     3 70067 4.281616e-05
## 6604     3 70067 4.281616e-05
## 6605     3 70067 4.281616e-05
## 6606     3 70067 4.281616e-05
## 6607     3 70067 4.281616e-05
## 6608     3 70067 4.281616e-05
## 6609     3 70067 4.281616e-05
## 6610     3 70067 4.281616e-05
## 6611     3 70067 4.281616e-05
## 6612     3 70067 4.281616e-05
## 6613     3 70067 4.281616e-05
## 6614     3 70067 4.281616e-05
## 6615     3 70067 4.281616e-05
## 6616     3 70067 4.281616e-05
## 6617     3 70067 4.281616e-05
## 6618     3 70067 4.281616e-05
## 6619     3 70067 4.281616e-05
## 6620     3 70067 4.281616e-05
## 6621     3 70067 4.281616e-05
## 6622     3 70067 4.281616e-05
## 6623     3 70067 4.281616e-05
## 6624     3 70067 4.281616e-05
## 6625     3 70067 4.281616e-05
## 6626     3 70067 4.281616e-05
## 6627     3 70067 4.281616e-05
## 6628     3 70067 4.281616e-05
## 6629     3 70067 4.281616e-05
## 6630     3 70067 4.281616e-05
## 6631     3 70067 4.281616e-05
## 6632     3 70067 4.281616e-05
## 6633     3 70067 4.281616e-05
## 6634     3 70067 4.281616e-05
## 6635     3 70067 4.281616e-05
## 6636     3 70067 4.281616e-05
## 6637     3 70067 4.281616e-05
## 6638     3 70067 4.281616e-05
## 6639     3 70067 4.281616e-05
## 6640     3 70067 4.281616e-05
## 6641     3 70067 4.281616e-05
## 6642     3 70067 4.281616e-05
## 6643     3 70067 4.281616e-05
## 6644     3 70067 4.281616e-05
## 6645     3 70067 4.281616e-05
## 6646     3 70067 4.281616e-05
## 6647     3 70067 4.281616e-05
## 6648     3 70067 4.281616e-05
## 6649     3 70067 4.281616e-05
## 6650     3 70067 4.281616e-05
## 6651     3 70067 4.281616e-05
## 6652     3 70067 4.281616e-05
## 6653     3 70067 4.281616e-05
## 6654     3 70067 4.281616e-05
## 6655     3 70067 4.281616e-05
## 6656     3 70067 4.281616e-05
## 6657     3 70067 4.281616e-05
## 6658     3 70067 4.281616e-05
## 6659     3 70067 4.281616e-05
## 6660     3 70067 4.281616e-05
## 6661     3 70067 4.281616e-05
## 6662     3 70067 4.281616e-05
## 6663     3 70067 4.281616e-05
## 6664     3 70067 4.281616e-05
## 6665     3 70067 4.281616e-05
## 6666     3 70067 4.281616e-05
## 6667     3 70067 4.281616e-05
## 6668     3 70067 4.281616e-05
## 6669     3 70067 4.281616e-05
## 6670     3 70067 4.281616e-05
## 6671     3 70067 4.281616e-05
## 6672     3 70067 4.281616e-05
## 6673     3 70067 4.281616e-05
## 6674     3 70067 4.281616e-05
## 6675     3 70067 4.281616e-05
## 6676     3 70067 4.281616e-05
## 6677     3 70067 4.281616e-05
## 6678     3 70067 4.281616e-05
## 6679     3 70067 4.281616e-05
## 6680     3 70067 4.281616e-05
## 6681     3 70067 4.281616e-05
## 6682     3 70067 4.281616e-05
## 6683     3 70067 4.281616e-05
## 6684     3 70067 4.281616e-05
## 6685     3 70067 4.281616e-05
## 6686     3 70067 4.281616e-05
## 6687     3 70067 4.281616e-05
## 6688     3 70067 4.281616e-05
## 6689     3 70067 4.281616e-05
## 6690     3 70067 4.281616e-05
## 6691     3 70067 4.281616e-05
## 6692     3 70067 4.281616e-05
## 6693     3 70067 4.281616e-05
## 6694     3 70067 4.281616e-05
## 6695     3 70067 4.281616e-05
## 6696     3 70067 4.281616e-05
## 6697     3 70067 4.281616e-05
## 6698     3 70067 4.281616e-05
## 6699     3 70067 4.281616e-05
## 6700     3 70067 4.281616e-05
## 6701     3 70067 4.281616e-05
## 6702     3 70067 4.281616e-05
## 6703     3 70067 4.281616e-05
## 6704     3 70067 4.281616e-05
## 6705     3 70067 4.281616e-05
## 6706     3 70067 4.281616e-05
## 6707     3 70067 4.281616e-05
## 6708     3 70067 4.281616e-05
## 6709     3 70067 4.281616e-05
## 6710     3 70067 4.281616e-05
## 6711     3 70067 4.281616e-05
## 6712     3 70067 4.281616e-05
## 6713     3 70067 4.281616e-05
## 6714     3 70067 4.281616e-05
## 6715     3 70067 4.281616e-05
## 6716     3 70067 4.281616e-05
## 6717     3 70067 4.281616e-05
## 6718     3 70067 4.281616e-05
## 6719     3 70067 4.281616e-05
## 6720     3 70067 4.281616e-05
## 6721     3 70067 4.281616e-05
## 6722     3 70067 4.281616e-05
## 6723     3 70067 4.281616e-05
## 6724     3 70067 4.281616e-05
## 6725     3 70067 4.281616e-05
## 6726     3 70067 4.281616e-05
## 6727     3 70067 4.281616e-05
## 6728     3 70067 4.281616e-05
## 6729     3 70067 4.281616e-05
## 6730     3 70067 4.281616e-05
## 6731     3 70067 4.281616e-05
## 6732     3 70067 4.281616e-05
## 6733     3 70067 4.281616e-05
## 6734     3 70067 4.281616e-05
## 6735     3 70067 4.281616e-05
## 6736     3 70067 4.281616e-05
## 6737     3 70067 4.281616e-05
## 6738     3 70067 4.281616e-05
## 6739     3 70067 4.281616e-05
## 6740     3 70067 4.281616e-05
## 6741     3 70067 4.281616e-05
## 6742     3 70067 4.281616e-05
## 6743     3 70067 4.281616e-05
## 6744     3 70067 4.281616e-05
## 6745     3 70067 4.281616e-05
## 6746     3 70067 4.281616e-05
## 6747     3 70067 4.281616e-05
## 6748     3 70067 4.281616e-05
## 6749     3 70067 4.281616e-05
## 6750     3 70067 4.281616e-05
## 6751     3 70067 4.281616e-05
## 6752     3 70067 4.281616e-05
## 6753     3 70067 4.281616e-05
## 6754     3 70067 4.281616e-05
## 6755     3 70067 4.281616e-05
## 6756     3 70067 4.281616e-05
## 6757     3 70067 4.281616e-05
## 6758     3 70067 4.281616e-05
## 6759     3 70067 4.281616e-05
## 6760     3 70067 4.281616e-05
## 6761     3 70067 4.281616e-05
## 6762     3 70067 4.281616e-05
## 6763     3 70067 4.281616e-05
## 6764     3 70067 4.281616e-05
## 6765     3 70067 4.281616e-05
## 6766     3 70067 4.281616e-05
## 6767     3 70067 4.281616e-05
## 6768     3 70067 4.281616e-05
## 6769     3 70067 4.281616e-05
## 6770     3 70067 4.281616e-05
## 6771     3 70067 4.281616e-05
## 6772     3 70067 4.281616e-05
## 6773     3 70067 4.281616e-05
## 6774     3 70067 4.281616e-05
## 6775     3 70067 4.281616e-05
## 6776     3 70067 4.281616e-05
## 6777     3 70067 4.281616e-05
## 6778     3 70067 4.281616e-05
## 6779     3 70067 4.281616e-05
## 6780     3 70067 4.281616e-05
## 6781     3 70067 4.281616e-05
## 6782     3 70067 4.281616e-05
## 6783     3 70067 4.281616e-05
## 6784     3 70067 4.281616e-05
## 6785     3 70067 4.281616e-05
## 6786     3 70067 4.281616e-05
## 6787     3 70067 4.281616e-05
## 6788     3 70067 4.281616e-05
## 6789     3 70067 4.281616e-05
## 6790     3 70067 4.281616e-05
## 6791     3 70067 4.281616e-05
## 6792     3 70067 4.281616e-05
## 6793     3 70067 4.281616e-05
## 6794     3 70067 4.281616e-05
## 6795     3 70067 4.281616e-05
## 6796     3 70067 4.281616e-05
## 6797     3 70067 4.281616e-05
## 6798     3 70067 4.281616e-05
## 6799     3 70067 4.281616e-05
## 6800     3 70067 4.281616e-05
## 6801     3 70067 4.281616e-05
## 6802     3 70067 4.281616e-05
## 6803     3 70067 4.281616e-05
## 6804     3 70067 4.281616e-05
## 6805     3 70067 4.281616e-05
## 6806     3 70067 4.281616e-05
## 6807     3 70067 4.281616e-05
## 6808     3 70067 4.281616e-05
## 6809     3 70067 4.281616e-05
## 6810     3 70067 4.281616e-05
## 6811     3 70067 4.281616e-05
## 6812     3 70067 4.281616e-05
## 6813     3 70067 4.281616e-05
## 6814     3 70067 4.281616e-05
## 6815     3 70067 4.281616e-05
## 6816     3 70067 4.281616e-05
## 6817     3 70067 4.281616e-05
## 6818     3 70067 4.281616e-05
## 6819     3 70067 4.281616e-05
## 6820     3 70067 4.281616e-05
## 6821     3 70067 4.281616e-05
## 6822     3 70067 4.281616e-05
## 6823     3 70067 4.281616e-05
## 6824     3 70067 4.281616e-05
## 6825     3 70067 4.281616e-05
## 6826     3 70067 4.281616e-05
## 6827     3 70067 4.281616e-05
## 6828     3 70067 4.281616e-05
## 6829     3 70067 4.281616e-05
## 6830     3 70067 4.281616e-05
## 6831     3 70067 4.281616e-05
## 6832     3 70067 4.281616e-05
## 6833     3 70067 4.281616e-05
## 6834     3 70067 4.281616e-05
## 6835     3 70067 4.281616e-05
## 6836     3 70067 4.281616e-05
## 6837     3 70067 4.281616e-05
## 6838     3 70067 4.281616e-05
## 6839     3 70067 4.281616e-05
## 6840     3 70067 4.281616e-05
## 6841     3 70067 4.281616e-05
## 6842     3 70067 4.281616e-05
## 6843     3 70067 4.281616e-05
## 6844     3 70067 4.281616e-05
## 6845     3 70067 4.281616e-05
## 6846     3 70067 4.281616e-05
## 6847     3 70067 4.281616e-05
## 6848     3 70067 4.281616e-05
## 6849     3 70067 4.281616e-05
## 6850     3 70067 4.281616e-05
## 6851     3 70067 4.281616e-05
## 6852     3 70067 4.281616e-05
## 6853     3 70067 4.281616e-05
## 6854     3 70067 4.281616e-05
## 6855     3 70067 4.281616e-05
## 6856     3 70067 4.281616e-05
## 6857     3 70067 4.281616e-05
## 6858     3 70067 4.281616e-05
## 6859     3 70067 4.281616e-05
## 6860     3 70067 4.281616e-05
## 6861     3 70067 4.281616e-05
## 6862     3 70067 4.281616e-05
## 6863     3 70067 4.281616e-05
## 6864     3 70067 4.281616e-05
## 6865     3 70067 4.281616e-05
## 6866     3 70067 4.281616e-05
## 6867     3 70067 4.281616e-05
## 6868     3 70067 4.281616e-05
## 6869     3 70067 4.281616e-05
## 6870     3 70067 4.281616e-05
## 6871     3 70067 4.281616e-05
## 6872     3 70067 4.281616e-05
## 6873     3 70067 4.281616e-05
## 6874     3 70067 4.281616e-05
## 6875     3 70067 4.281616e-05
## 6876     3 70067 4.281616e-05
## 6877     3 70067 4.281616e-05
## 6878     3 70067 4.281616e-05
## 6879     3 70067 4.281616e-05
## 6880     3 70067 4.281616e-05
## 6881     3 70067 4.281616e-05
## 6882     3 70067 4.281616e-05
## 6883     3 70067 4.281616e-05
## 6884     3 70067 4.281616e-05
## 6885     3 70067 4.281616e-05
## 6886     3 70067 4.281616e-05
## 6887     3 70067 4.281616e-05
## 6888     3 70067 4.281616e-05
## 6889     3 70067 4.281616e-05
## 6890     3 70067 4.281616e-05
## 6891     3 70067 4.281616e-05
## 6892     3 70067 4.281616e-05
## 6893     3 70067 4.281616e-05
## 6894     3 70067 4.281616e-05
## 6895     3 70067 4.281616e-05
## 6896     3 70067 4.281616e-05
## 6897     3 70067 4.281616e-05
## 6898     3 70067 4.281616e-05
## 6899     3 70067 4.281616e-05
## 6900     3 70067 4.281616e-05
## 6901     3 70067 4.281616e-05
## 6902     3 70067 4.281616e-05
## 6903     3 70067 4.281616e-05
## 6904     3 70067 4.281616e-05
## 6905     3 70067 4.281616e-05
## 6906     3 70067 4.281616e-05
## 6907     3 70067 4.281616e-05
## 6908     3 70067 4.281616e-05
## 6909     3 70067 4.281616e-05
## 6910     3 70067 4.281616e-05
## 6911     3 70067 4.281616e-05
## 6912     3 70067 4.281616e-05
## 6913     3 70067 4.281616e-05
## 6914     3 70067 4.281616e-05
## 6915     3 70067 4.281616e-05
## 6916     3 70067 4.281616e-05
## 6917     3 70067 4.281616e-05
## 6918     3 70067 4.281616e-05
## 6919     3 70067 4.281616e-05
## 6920     3 70067 4.281616e-05
## 6921     3 70067 4.281616e-05
## 6922     3 70067 4.281616e-05
## 6923     3 70067 4.281616e-05
## 6924     3 70067 4.281616e-05
## 6925     3 70067 4.281616e-05
## 6926     3 70067 4.281616e-05
## 6927     3 70067 4.281616e-05
## 6928     3 70067 4.281616e-05
## 6929     3 70067 4.281616e-05
## 6930     3 70067 4.281616e-05
## 6931     3 70067 4.281616e-05
## 6932     3 70067 4.281616e-05
## 6933     3 70067 4.281616e-05
## 6934     3 70067 4.281616e-05
## 6935     3 70067 4.281616e-05
## 6936     3 70067 4.281616e-05
## 6937     3 70067 4.281616e-05
## 6938     3 70067 4.281616e-05
## 6939     3 70067 4.281616e-05
## 6940     3 70067 4.281616e-05
## 6941     3 70067 4.281616e-05
## 6942     3 70067 4.281616e-05
## 6943     3 70067 4.281616e-05
## 6944     3 70067 4.281616e-05
## 6945     3 70067 4.281616e-05
## 6946     3 70067 4.281616e-05
## 6947     3 70067 4.281616e-05
## 6948     3 70067 4.281616e-05
## 6949     3 70067 4.281616e-05
## 6950     3 70067 4.281616e-05
## 6951     3 70067 4.281616e-05
## 6952     3 70067 4.281616e-05
## 6953     3 70067 4.281616e-05
## 6954     3 70067 4.281616e-05
## 6955     3 70067 4.281616e-05
## 6956     3 70067 4.281616e-05
## 6957     3 70067 4.281616e-05
## 6958     3 70067 4.281616e-05
## 6959     3 70067 4.281616e-05
## 6960     3 70067 4.281616e-05
## 6961     3 70067 4.281616e-05
## 6962     3 70067 4.281616e-05
## 6963     3 70067 4.281616e-05
## 6964     3 70067 4.281616e-05
## 6965     3 70067 4.281616e-05
## 6966     3 70067 4.281616e-05
## 6967     3 70067 4.281616e-05
## 6968     3 70067 4.281616e-05
## 6969     3 70067 4.281616e-05
## 6970     3 70067 4.281616e-05
## 6971     3 70067 4.281616e-05
## 6972     3 70067 4.281616e-05
## 6973     3 70067 4.281616e-05
## 6974     3 70067 4.281616e-05
## 6975     3 70067 4.281616e-05
## 6976     3 70067 4.281616e-05
## 6977     3 70067 4.281616e-05
## 6978     3 70067 4.281616e-05
## 6979     3 70067 4.281616e-05
## 6980     3 70067 4.281616e-05
## 6981     3 70067 4.281616e-05
## 6982     3 70067 4.281616e-05
## 6983     3 70067 4.281616e-05
## 6984     3 70067 4.281616e-05
## 6985     3 70067 4.281616e-05
## 6986     3 70067 4.281616e-05
## 6987     3 70067 4.281616e-05
## 6988     3 70067 4.281616e-05
## 6989     3 70067 4.281616e-05
## 6990     3 70067 4.281616e-05
## 6991     3 70067 4.281616e-05
## 6992     3 70067 4.281616e-05
## 6993     3 70067 4.281616e-05
## 6994     3 70067 4.281616e-05
## 6995     3 70067 4.281616e-05
## 6996     3 70067 4.281616e-05
## 6997     3 70067 4.281616e-05
## 6998     3 70067 4.281616e-05
## 6999     3 70067 4.281616e-05
## 7000     3 70067 4.281616e-05
## 7001     3 70067 4.281616e-05
## 7002     3 70067 4.281616e-05
## 7003     3 70067 4.281616e-05
## 7004     3 70067 4.281616e-05
## 7005     3 70067 4.281616e-05
## 7006     3 70067 4.281616e-05
## 7007     3 70067 4.281616e-05
## 7008     3 70067 4.281616e-05
## 7009     3 70067 4.281616e-05
## 7010     3 70067 4.281616e-05
## 7011     3 70067 4.281616e-05
## 7012     3 70067 4.281616e-05
## 7013     3 70067 4.281616e-05
## 7014     3 70067 4.281616e-05
## 7015     3 70067 4.281616e-05
## 7016     3 70067 4.281616e-05
## 7017     3 70067 4.281616e-05
## 7018     3 70067 4.281616e-05
## 7019     3 70067 4.281616e-05
## 7020     3 70067 4.281616e-05
## 7021     3 70067 4.281616e-05
## 7022     3 70067 4.281616e-05
## 7023     3 70067 4.281616e-05
## 7024     3 70067 4.281616e-05
## 7025     3 70067 4.281616e-05
## 7026     3 70067 4.281616e-05
## 7027     3 70067 4.281616e-05
## 7028     3 70067 4.281616e-05
## 7029     3 70067 4.281616e-05
## 7030     3 70067 4.281616e-05
## 7031     3 70067 4.281616e-05
## 7032     3 70067 4.281616e-05
## 7033     3 70067 4.281616e-05
## 7034     3 70067 4.281616e-05
## 7035     3 70067 4.281616e-05
## 7036     3 70067 4.281616e-05
## 7037     3 70067 4.281616e-05
## 7038     3 70067 4.281616e-05
## 7039     3 70067 4.281616e-05
## 7040     3 70067 4.281616e-05
## 7041     3 70067 4.281616e-05
## 7042     3 70067 4.281616e-05
## 7043     3 70067 4.281616e-05
## 7044     3 70067 4.281616e-05
## 7045     3 70067 4.281616e-05
## 7046     3 70067 4.281616e-05
## 7047     3 70067 4.281616e-05
## 7048     3 70067 4.281616e-05
## 7049     3 70067 4.281616e-05
## 7050     3 70067 4.281616e-05
## 7051     3 70067 4.281616e-05
## 7052     3 70067 4.281616e-05
## 7053     3 70067 4.281616e-05
## 7054     3 70067 4.281616e-05
## 7055     3 70067 4.281616e-05
## 7056     3 70067 4.281616e-05
## 7057     3 70067 4.281616e-05
## 7058     3 70067 4.281616e-05
## 7059     3 70067 4.281616e-05
## 7060     3 70067 4.281616e-05
## 7061     3 70067 4.281616e-05
## 7062     3 70067 4.281616e-05
## 7063     3 70067 4.281616e-05
## 7064     3 70067 4.281616e-05
## 7065     3 70067 4.281616e-05
## 7066     3 70067 4.281616e-05
## 7067     3 70067 4.281616e-05
## 7068     3 70067 4.281616e-05
## 7069     3 70067 4.281616e-05
## 7070     3 70067 4.281616e-05
## 7071     3 70067 4.281616e-05
## 7072     3 70067 4.281616e-05
## 7073     3 70067 4.281616e-05
## 7074     3 70067 4.281616e-05
## 7075     3 70067 4.281616e-05
## 7076     3 70067 4.281616e-05
## 7077     3 70067 4.281616e-05
## 7078     3 70067 4.281616e-05
## 7079     3 70067 4.281616e-05
## 7080     3 70067 4.281616e-05
## 7081     3 70067 4.281616e-05
## 7082     3 70067 4.281616e-05
## 7083     3 70067 4.281616e-05
## 7084     3 70067 4.281616e-05
## 7085     3 70067 4.281616e-05
## 7086     3 70067 4.281616e-05
## 7087     3 70067 4.281616e-05
## 7088     3 70067 4.281616e-05
## 7089     3 70067 4.281616e-05
## 7090     3 70067 4.281616e-05
## 7091     3 70067 4.281616e-05
## 7092     3 70067 4.281616e-05
## 7093     3 70067 4.281616e-05
## 7094     3 70067 4.281616e-05
## 7095     3 70067 4.281616e-05
## 7096     3 70067 4.281616e-05
## 7097     3 70067 4.281616e-05
## 7098     3 70067 4.281616e-05
## 7099     3 70067 4.281616e-05
## 7100     3 70067 4.281616e-05
## 7101     3 70067 4.281616e-05
## 7102     3 70067 4.281616e-05
## 7103     3 70067 4.281616e-05
## 7104     3 70067 4.281616e-05
## 7105     3 70067 4.281616e-05
## 7106     3 70067 4.281616e-05
## 7107     3 70067 4.281616e-05
## 7108     3 70067 4.281616e-05
## 7109     3 70067 4.281616e-05
## 7110     3 70067 4.281616e-05
## 7111     3 70067 4.281616e-05
## 7112     3 70067 4.281616e-05
## 7113     3 70067 4.281616e-05
## 7114     3 70067 4.281616e-05
## 7115     3 70067 4.281616e-05
## 7116     3 70067 4.281616e-05
## 7117     3 70067 4.281616e-05
## 7118     3 70067 4.281616e-05
## 7119     3 70067 4.281616e-05
## 7120     3 70067 4.281616e-05
## 7121     3 70067 4.281616e-05
## 7122     3 70067 4.281616e-05
## 7123     3 70067 4.281616e-05
## 7124     3 70067 4.281616e-05
## 7125     3 70067 4.281616e-05
## 7126     3 70067 4.281616e-05
## 7127     3 70067 4.281616e-05
## 7128     3 70067 4.281616e-05
## 7129     3 70067 4.281616e-05
## 7130     3 70067 4.281616e-05
## 7131     3 70067 4.281616e-05
## 7132     3 70067 4.281616e-05
## 7133     3 70067 4.281616e-05
## 7134     3 70067 4.281616e-05
## 7135     3 70067 4.281616e-05
## 7136     3 53016 5.658669e-05
## 7137     3 53016 5.658669e-05
## 7138     3 53016 5.658669e-05
## 7139     3 53016 5.658669e-05
## 7140     3 53016 5.658669e-05
## 7141     3 53016 5.658669e-05
## 7142     3 53016 5.658669e-05
## 7143     3 53016 5.658669e-05
## 7144     3 53016 5.658669e-05
## 7145     3 53016 5.658669e-05
## 7146     3 53016 5.658669e-05
## 7147     3 53016 5.658669e-05
## 7148     3 53016 5.658669e-05
## 7149     3 53016 5.658669e-05
## 7150     3 53016 5.658669e-05
## 7151     3 53016 5.658669e-05
## 7152     3 53016 5.658669e-05
## 7153     3 53016 5.658669e-05
## 7154     3 53016 5.658669e-05
## 7155     3 53016 5.658669e-05
## 7156     3 53016 5.658669e-05
## 7157     3 53016 5.658669e-05
## 7158     3 53016 5.658669e-05
## 7159     3 53016 5.658669e-05
## 7160     3 53016 5.658669e-05
## 7161     3 53016 5.658669e-05
## 7162     3 53016 5.658669e-05
## 7163     3 53016 5.658669e-05
## 7164     3 53016 5.658669e-05
## 7165     3 53016 5.658669e-05
## 7166     3 53016 5.658669e-05
## 7167     3 53016 5.658669e-05
## 7168     3 53016 5.658669e-05
## 7169     3 53016 5.658669e-05
## 7170     3 53016 5.658669e-05
## 7171     3 53016 5.658669e-05
## 7172     3 53016 5.658669e-05
## 7173     3 53016 5.658669e-05
## 7174     3 53016 5.658669e-05
## 7175     3 53016 5.658669e-05
## 7176     3 53016 5.658669e-05
## 7177     3 53016 5.658669e-05
## 7178     3 53016 5.658669e-05
## 7179     3 53016 5.658669e-05
## 7180     3 53016 5.658669e-05
## 7181     3 53016 5.658669e-05
## 7182     3 53016 5.658669e-05
## 7183     3 53016 5.658669e-05
## 7184     3 53016 5.658669e-05
## 7185     3 53016 5.658669e-05
## 7186     3 53016 5.658669e-05
## 7187     3 53016 5.658669e-05
## 7188     3 53016 5.658669e-05
## 7189     3 53016 5.658669e-05
## 7190     3 53016 5.658669e-05
## 7191     3 53016 5.658669e-05
## 7192     3 53016 5.658669e-05
## 7193     3 53016 5.658669e-05
## 7194     3 53016 5.658669e-05
## 7195     3 53016 5.658669e-05
## 7196     3 53016 5.658669e-05
## 7197     3 53016 5.658669e-05
## 7198     3 53016 5.658669e-05
## 7199     3 53016 5.658669e-05
## 7200     3 53016 5.658669e-05
## 7201     3 53016 5.658669e-05
## 7202     3 53016 5.658669e-05
## 7203     3 53016 5.658669e-05
## 7204     3 53016 5.658669e-05
## 7205     3 53016 5.658669e-05
## 7206     3 53016 5.658669e-05
## 7207     3 53016 5.658669e-05
## 7208     3 53016 5.658669e-05
## 7209     3 53016 5.658669e-05
## 7210     3 53016 5.658669e-05
## 7211     3 53016 5.658669e-05
## 7212     3 53016 5.658669e-05
## 7213     3 53016 5.658669e-05
## 7214     3 53016 5.658669e-05
## 7215     3 53016 5.658669e-05
## 7216     3 53016 5.658669e-05
## 7217     3 53016 5.658669e-05
## 7218     3 53016 5.658669e-05
## 7219     3 53016 5.658669e-05
## 7220     3 53016 5.658669e-05
## 7221     3 53016 5.658669e-05
## 7222     3 53016 5.658669e-05
## 7223     3 53016 5.658669e-05
## 7224     3 53016 5.658669e-05
## 7225     3 53016 5.658669e-05
## 7226     3 53016 5.658669e-05
## 7227     3 53016 5.658669e-05
## 7228     3 53016 5.658669e-05
## 7229     3 53016 5.658669e-05
## 7230     3 53016 5.658669e-05
## 7231     3 53016 5.658669e-05
## 7232     3 53016 5.658669e-05
## 7233     3 53016 5.658669e-05
## 7234     3 53016 5.658669e-05
## 7235     3 53016 5.658669e-05
## 7236     3 53016 5.658669e-05
## 7237     3 53016 5.658669e-05
## 7238     3 53016 5.658669e-05
## 7239     3 53016 5.658669e-05
## 7240     3 53016 5.658669e-05
## 7241     3 53016 5.658669e-05
## 7242     3 53016 5.658669e-05
## 7243     3 53016 5.658669e-05
## 7244     3 53016 5.658669e-05
## 7245     3 53016 5.658669e-05
## 7246     3 53016 5.658669e-05
## 7247     3 53016 5.658669e-05
## 7248     3 53016 5.658669e-05
## 7249     3 53016 5.658669e-05
## 7250     3 53016 5.658669e-05
## 7251     3 53016 5.658669e-05
## 7252     3 53016 5.658669e-05
## 7253     3 53016 5.658669e-05
## 7254     3 53016 5.658669e-05
## 7255     3 53016 5.658669e-05
## 7256     3 53016 5.658669e-05
## 7257     3 53016 5.658669e-05
## 7258     3 53016 5.658669e-05
## 7259     3 53016 5.658669e-05
## 7260     3 53016 5.658669e-05
## 7261     3 53016 5.658669e-05
## 7262     3 53016 5.658669e-05
## 7263     3 53016 5.658669e-05
## 7264     3 53016 5.658669e-05
## 7265     3 53016 5.658669e-05
## 7266     3 53016 5.658669e-05
## 7267     3 53016 5.658669e-05
## 7268     3 53016 5.658669e-05
## 7269     3 53016 5.658669e-05
## 7270     3 53016 5.658669e-05
## 7271     3 53016 5.658669e-05
## 7272     3 53016 5.658669e-05
## 7273     3 53016 5.658669e-05
## 7274     3 53016 5.658669e-05
## 7275     3 53016 5.658669e-05
## 7276     3 53016 5.658669e-05
## 7277     3 53016 5.658669e-05
## 7278     3 53016 5.658669e-05
## 7279     3 53016 5.658669e-05
## 7280     3 53016 5.658669e-05
## 7281     3 53016 5.658669e-05
## 7282     3 53016 5.658669e-05
## 7283     3 53016 5.658669e-05
## 7284     3 53016 5.658669e-05
## 7285     3 53016 5.658669e-05
## 7286     3 53016 5.658669e-05
## 7287     3 53016 5.658669e-05
## 7288     3 53016 5.658669e-05
## 7289     3 53016 5.658669e-05
## 7290     3 53016 5.658669e-05
## 7291     3 53016 5.658669e-05
## 7292     3 53016 5.658669e-05
## 7293     3 53016 5.658669e-05
## 7294     3 53016 5.658669e-05
## 7295     3 53016 5.658669e-05
## 7296     3 53016 5.658669e-05
## 7297     3 53016 5.658669e-05
## 7298     3 53016 5.658669e-05
## 7299     3 53016 5.658669e-05
## 7300     3 53016 5.658669e-05
## 7301     3 53016 5.658669e-05
## 7302     3 53016 5.658669e-05
## 7303     3 53016 5.658669e-05
## 7304     3 53016 5.658669e-05
## 7305     3 53016 5.658669e-05
## 7306     3 53016 5.658669e-05
## 7307     3 53016 5.658669e-05
## 7308     3 53016 5.658669e-05
## 7309     3 53016 5.658669e-05
## 7310     3 53016 5.658669e-05
## 7311     3 53016 5.658669e-05
## 7312     3 53016 5.658669e-05
## 7313     3 53016 5.658669e-05
## 7314     3 53016 5.658669e-05
## 7315     3 53016 5.658669e-05
## 7316     3 53016 5.658669e-05
## 7317     3 53016 5.658669e-05
## 7318     3 53016 5.658669e-05
## 7319     3 53016 5.658669e-05
## 7320     3 53016 5.658669e-05
## 7321     3 53016 5.658669e-05
## 7322     3 53016 5.658669e-05
## 7323     3 53016 5.658669e-05
## 7324     3 53016 5.658669e-05
## 7325     3 53016 5.658669e-05
## 7326     3 53016 5.658669e-05
## 7327     3 53016 5.658669e-05
## 7328     3 53016 5.658669e-05
## 7329     3 53016 5.658669e-05
## 7330     3 53016 5.658669e-05
## 7331     3 53016 5.658669e-05
## 7332     3 53016 5.658669e-05
## 7333     3 53016 5.658669e-05
## 7334     3 53016 5.658669e-05
## 7335     3 53016 5.658669e-05
## 7336     3 53016 5.658669e-05
## 7337     3 53016 5.658669e-05
## 7338     3 53016 5.658669e-05
## 7339     3 53016 5.658669e-05
## 7340     3 53016 5.658669e-05
## 7341     3 53016 5.658669e-05
## 7342     3 53016 5.658669e-05
## 7343     3 53016 5.658669e-05
## 7344     3 53016 5.658669e-05
## 7345     3 53016 5.658669e-05
## 7346     3 53016 5.658669e-05
## 7347     3 53016 5.658669e-05
## 7348     3 53016 5.658669e-05
## 7349     3 53016 5.658669e-05
## 7350     3 53016 5.658669e-05
## 7351     3 53016 5.658669e-05
## 7352     3 53016 5.658669e-05
## 7353     3 53016 5.658669e-05
## 7354     3 53016 5.658669e-05
## 7355     3 53016 5.658669e-05
## 7356     3 53016 5.658669e-05
## 7357     3 53016 5.658669e-05
## 7358     3 53016 5.658669e-05
## 7359     3 53016 5.658669e-05
## 7360     3 53016 5.658669e-05
## 7361     3 53016 5.658669e-05
## 7362     3 53016 5.658669e-05
## 7363     3 53016 5.658669e-05
## 7364     3 53016 5.658669e-05
## 7365     3 53016 5.658669e-05
## 7366     3 53016 5.658669e-05
## 7367     3 53016 5.658669e-05
## 7368     3 53016 5.658669e-05
## 7369     3 53016 5.658669e-05
## 7370     3 53016 5.658669e-05
## 7371     3 53016 5.658669e-05
## 7372     3 53016 5.658669e-05
## 7373     3 53016 5.658669e-05
## 7374     3 53016 5.658669e-05
## 7375     3 53016 5.658669e-05
## 7376     3 53016 5.658669e-05
## 7377     3 53016 5.658669e-05
## 7378     3 53016 5.658669e-05
## 7379     3 53016 5.658669e-05
## 7380     3 53016 5.658669e-05
## 7381     3 53016 5.658669e-05
## 7382     3 53016 5.658669e-05
## 7383     3 53016 5.658669e-05
## 7384     3 53016 5.658669e-05
## 7385     3 53016 5.658669e-05
## 7386     3 53016 5.658669e-05
## 7387     3 53016 5.658669e-05
## 7388     3 53016 5.658669e-05
## 7389     3 53016 5.658669e-05
## 7390     3 53016 5.658669e-05
## 7391     3 53016 5.658669e-05
## 7392     3 53016 5.658669e-05
## 7393     3 53016 5.658669e-05
## 7394     3 53016 5.658669e-05
## 7395     3 53016 5.658669e-05
## 7396     3 53016 5.658669e-05
## 7397     3 53016 5.658669e-05
## 7398     3 53016 5.658669e-05
## 7399     3 53016 5.658669e-05
## 7400     3 53016 5.658669e-05
## 7401     3 53016 5.658669e-05
## 7402     3 53016 5.658669e-05
## 7403     3 53016 5.658669e-05
## 7404     3 53016 5.658669e-05
## 7405     3 53016 5.658669e-05
## 7406     3 53016 5.658669e-05
## 7407     3 53016 5.658669e-05
## 7408     3 53016 5.658669e-05
## 7409     3 53016 5.658669e-05
## 7410     3 53016 5.658669e-05
## 7411     3 53016 5.658669e-05
## 7412     3 53016 5.658669e-05
## 7413     3 53016 5.658669e-05
## 7414     3 53016 5.658669e-05
## 7415     3 53016 5.658669e-05
## 7416     3 53016 5.658669e-05
## 7417     3 53016 5.658669e-05
## 7418     3 53016 5.658669e-05
## 7419     3 53016 5.658669e-05
## 7420     3 53016 5.658669e-05
## 7421     3 53016 5.658669e-05
## 7422     3 53016 5.658669e-05
## 7423     3 53016 5.658669e-05
## 7424     3 53016 5.658669e-05
## 7425     3 53016 5.658669e-05
## 7426     3 53016 5.658669e-05
## 7427     3 53016 5.658669e-05
## 7428     3 53016 5.658669e-05
## 7429     3 53016 5.658669e-05
## 7430     3 53016 5.658669e-05
## 7431     3 53016 5.658669e-05
## 7432     3 53016 5.658669e-05
## 7433     3 53016 5.658669e-05
## 7434     3 53016 5.658669e-05
## 7435     3 53016 5.658669e-05
## 7436     3 53016 5.658669e-05
## 7437     3 53016 5.658669e-05
## 7438     3 53016 5.658669e-05
## 7439     3 53016 5.658669e-05
## 7440     3 53016 5.658669e-05
## 7441     3 53016 5.658669e-05
## 7442     3 53016 5.658669e-05
## 7443     3 53016 5.658669e-05
## 7444     3 53016 5.658669e-05
## 7445     3 53016 5.658669e-05
## 7446     3 53016 5.658669e-05
## 7447     3 53016 5.658669e-05
## 7448     3 53016 5.658669e-05
## 7449     3 53016 5.658669e-05
## 7450     3 53016 5.658669e-05
## 7451     3 53016 5.658669e-05
## 7452     3 53016 5.658669e-05
## 7453     3 53016 5.658669e-05
## 7454     3 53016 5.658669e-05
## 7455     3 53016 5.658669e-05
## 7456     3 53016 5.658669e-05
## 7457     3 53016 5.658669e-05
## 7458     3 53016 5.658669e-05
## 7459     3 53016 5.658669e-05
## 7460     3 53016 5.658669e-05
## 7461     3 53016 5.658669e-05
## 7462     3 53016 5.658669e-05
## 7463     3 53016 5.658669e-05
## 7464     3 53016 5.658669e-05
## 7465     3 53016 5.658669e-05
## 7466     3 53016 5.658669e-05
## 7467     3 53016 5.658669e-05
## 7468     3 53016 5.658669e-05
## 7469     3 53016 5.658669e-05
## 7470     3 53016 5.658669e-05
## 7471     3 53016 5.658669e-05
## 7472     3 53016 5.658669e-05
## 7473     3 53016 5.658669e-05
## 7474     3 53016 5.658669e-05
## 7475     3 53016 5.658669e-05
## 7476     3 53016 5.658669e-05
## 7477     3 53016 5.658669e-05
## 7478     3 53016 5.658669e-05
## 7479     3 53016 5.658669e-05
## 7480     3 53016 5.658669e-05
## 7481     3 53016 5.658669e-05
## 7482     3 53016 5.658669e-05
## 7483     3 53016 5.658669e-05
## 7484     3 53016 5.658669e-05
## 7485     3 53016 5.658669e-05
## 7486     3 53016 5.658669e-05
## 7487     3 53016 5.658669e-05
## 7488     3 53016 5.658669e-05
## 7489     3 53016 5.658669e-05
## 7490     3 53016 5.658669e-05
## 7491     3 53016 5.658669e-05
## 7492     3 53016 5.658669e-05
## 7493     3 53016 5.658669e-05
## 7494     3 53016 5.658669e-05
## 7495     3 53016 5.658669e-05
## 7496     3 53016 5.658669e-05
## 7497     3 53016 5.658669e-05
## 7498     3 53016 5.658669e-05
## 7499     3 53016 5.658669e-05
## 7500     3 53016 5.658669e-05
## 7501     3 53016 5.658669e-05
## 7502     3 53016 5.658669e-05
## 7503     3 53016 5.658669e-05
## 7504     3 53016 5.658669e-05
## 7505     3 53016 5.658669e-05
## 7506     3 53016 5.658669e-05
## 7507     3 53016 5.658669e-05
## 7508     3 53016 5.658669e-05
## 7509     3 53016 5.658669e-05
## 7510     3 53016 5.658669e-05
## 7511     3 53016 5.658669e-05
## 7512     3 53016 5.658669e-05
## 7513     3 53016 5.658669e-05
## 7514     3 53016 5.658669e-05
## 7515     3 53016 5.658669e-05
## 7516     3 53016 5.658669e-05
## 7517     3 53016 5.658669e-05
## 7518     3 53016 5.658669e-05
## 7519     3 53016 5.658669e-05
## 7520     3 53016 5.658669e-05
## 7521     3 53016 5.658669e-05
## 7522     3 53016 5.658669e-05
## 7523     3 53016 5.658669e-05
## 7524     3 53016 5.658669e-05
## 7525     3 53016 5.658669e-05
## 7526     3 53016 5.658669e-05
## 7527     3 53016 5.658669e-05
## 7528     3 53016 5.658669e-05
## 7529     3 53016 5.658669e-05
## 7530     3 53016 5.658669e-05
## 7531     3 53016 5.658669e-05
## 7532     3 53016 5.658669e-05
## 7533     3 53016 5.658669e-05
## 7534     3 53016 5.658669e-05
## 7535     3 53016 5.658669e-05
## 7536     3 53016 5.658669e-05
## 7537     3 53016 5.658669e-05
## 7538     3 53016 5.658669e-05
## 7539     3 53016 5.658669e-05
## 7540     3 53016 5.658669e-05
## 7541     3 53016 5.658669e-05
## 7542     3 53016 5.658669e-05
## 7543     3 53016 5.658669e-05
## 7544     3 53016 5.658669e-05
## 7545     3 53016 5.658669e-05
## 7546     3 53016 5.658669e-05
## 7547     3 53016 5.658669e-05
## 7548     3 53016 5.658669e-05
## 7549     3 53016 5.658669e-05
## 7550     3 53016 5.658669e-05
## 7551     3 53016 5.658669e-05
## 7552     3 53016 5.658669e-05
## 7553     3 53016 5.658669e-05
## 7554     3 53016 5.658669e-05
## 7555     3 53016 5.658669e-05
## 7556     3 53016 5.658669e-05
## 7557     3 53016 5.658669e-05
## 7558     3 53016 5.658669e-05
## 7559     3 53016 5.658669e-05
## 7560     3 53016 5.658669e-05
## 7561     3 53016 5.658669e-05
## 7562     3 53016 5.658669e-05
## 7563     3 53016 5.658669e-05
## 7564     3 53016 5.658669e-05
## 7565     3 53016 5.658669e-05
## 7566     3 53016 5.658669e-05
## 7567     3 53016 5.658669e-05
## 7568     3 53016 5.658669e-05
## 7569     3 53016 5.658669e-05
## 7570     3 53016 5.658669e-05
## 7571     3 53016 5.658669e-05
## 7572     3 53016 5.658669e-05
## 7573     3 53016 5.658669e-05
## 7574     3 53016 5.658669e-05
## 7575     3 53016 5.658669e-05
## 7576     3 53016 5.658669e-05
## 7577     3 53016 5.658669e-05
## 7578     3 53016 5.658669e-05
## 7579     3 53016 5.658669e-05
## 7580     3 53016 5.658669e-05
## 7581     3 53016 5.658669e-05
## 7582     3 53016 5.658669e-05
## 7583     3 53016 5.658669e-05
## 7584     3 53016 5.658669e-05
## 7585     3 53016 5.658669e-05
## 7586     3 53016 5.658669e-05
## 7587     3 53016 5.658669e-05
## 7588     3 53016 5.658669e-05
## 7589     3 53016 5.658669e-05
## 7590     3 53016 5.658669e-05
## 7591     3 53016 5.658669e-05
## 7592     3 53016 5.658669e-05
## 7593     3 53016 5.658669e-05
## 7594     3 53016 5.658669e-05
## 7595     3 53016 5.658669e-05
## 7596     3 53016 5.658669e-05
## 7597     3 53016 5.658669e-05
## 7598     3 53016 5.658669e-05
## 7599     3 53016 5.658669e-05
## 7600     3 53016 5.658669e-05
## 7601     3 53016 5.658669e-05
## 7602     3 53016 5.658669e-05
## 7603     3 53016 5.658669e-05
## 7604     3 53016 5.658669e-05
## 7605     3 53016 5.658669e-05
## 7606     3 53016 5.658669e-05
## 7607     3 53016 5.658669e-05
## 7608     3 53016 5.658669e-05
## 7609     3 53016 5.658669e-05
## 7610     3 53016 5.658669e-05
## 7611     3 53016 5.658669e-05
## 7612     3 53016 5.658669e-05
## 7613     3 53016 5.658669e-05
## 7614     3 53016 5.658669e-05
## 7615     3 53016 5.658669e-05
## 7616     3 53016 5.658669e-05
## 7617     3 53016 5.658669e-05
## 7618     3 53016 5.658669e-05
## 7619     3 53016 5.658669e-05
## 7620     3 53016 5.658669e-05
## 7621     3 53016 5.658669e-05
## 7622     3 53016 5.658669e-05
## 7623     3 53016 5.658669e-05
## 7624     3 53016 5.658669e-05
## 7625     3 53016 5.658669e-05
## 7626     3 53016 5.658669e-05
## 7627     3 53016 5.658669e-05
## 7628     3 53016 5.658669e-05
## 7629     3 53016 5.658669e-05
## 7630     3 53016 5.658669e-05
## 7631     3 53016 5.658669e-05
## 7632     3 53016 5.658669e-05
## 7633     3 53016 5.658669e-05
## 7634     3 53016 5.658669e-05
## 7635     3 53016 5.658669e-05
## 7636     3 53016 5.658669e-05
## 7637     3 53016 5.658669e-05
## 7638     3 53016 5.658669e-05
## 7639     3 53016 5.658669e-05
## 7640     3 53016 5.658669e-05
## 7641     3 53016 5.658669e-05
## 7642     3 53016 5.658669e-05
## 7643     3 53016 5.658669e-05
## 7644     3 53016 5.658669e-05
## 7645     3 53016 5.658669e-05
## 7646     3 53016 5.658669e-05
## 7647     3 53016 5.658669e-05
## 7648     3 53016 5.658669e-05
## 7649     3 53016 5.658669e-05
## 7650     3 53016 5.658669e-05
## 7651     3 53016 5.658669e-05
## 7652     3 53016 5.658669e-05
## 7653     3 53016 5.658669e-05
## 7654     3 53016 5.658669e-05
## 7655     3 53016 5.658669e-05
## 7656     3 53016 5.658669e-05
## 7657     3 53016 5.658669e-05
## 7658     3 53016 5.658669e-05
## 7659     3 53016 5.658669e-05
## 7660     3 53016 5.658669e-05
## 7661     3 53016 5.658669e-05
## 7662     3 53016 5.658669e-05
## 7663     3 53016 5.658669e-05
## 7664     3 53016 5.658669e-05
## 7665     3 53016 5.658669e-05
## 7666     3 53016 5.658669e-05
## 7667     3 53016 5.658669e-05
## 7668     3 53016 5.658669e-05
## 7669     3 53016 5.658669e-05
## 7670     3 53016 5.658669e-05
## 7671     3 53016 5.658669e-05
## 7672     3 53016 5.658669e-05
## 7673     3 53016 5.658669e-05
## 7674     3 53016 5.658669e-05
## 7675     3 53016 5.658669e-05
## 7676     3 53016 5.658669e-05
## 7677     3 53016 5.658669e-05
## 7678     3 53016 5.658669e-05
## 7679     3 53016 5.658669e-05
## 7680     3 53016 5.658669e-05
## 7681     3 53016 5.658669e-05
## 7682     3 53016 5.658669e-05
## 7683     3 53016 5.658669e-05
## 7684     3 53016 5.658669e-05
## 7685     3 53016 5.658669e-05
## 7686     3 53016 5.658669e-05
## 7687     3 53016 5.658669e-05
## 7688     3 53016 5.658669e-05
## 7689     3 53016 5.658669e-05
## 7690     3 53016 5.658669e-05
## 7691     3 53016 5.658669e-05
## 7692     3 53016 5.658669e-05
## 7693     3 53016 5.658669e-05
## 7694     3 53016 5.658669e-05
## 7695     3 53016 5.658669e-05
## 7696     3 53016 5.658669e-05
## 7697     3 53016 5.658669e-05
## 7698     3 53016 5.658669e-05
## 7699     3 53016 5.658669e-05
## 7700     3 53016 5.658669e-05
## 7701     3 53016 5.658669e-05
## 7702     3 53016 5.658669e-05
## 7703     3 53016 5.658669e-05
## 7704     3 53016 5.658669e-05
## 7705     3 53016 5.658669e-05
## 7706     3 53016 5.658669e-05
## 7707     3 53016 5.658669e-05
## 7708     3 53016 5.658669e-05
## 7709     3 53016 5.658669e-05
## 7710     3 53016 5.658669e-05
## 7711     3 53016 5.658669e-05
## 7712     3 53016 5.658669e-05
## 7713     3 53016 5.658669e-05
## 7714     3 53016 5.658669e-05
## 7715     3 53016 5.658669e-05
## 7716     3 53016 5.658669e-05
## 7717     3 53016 5.658669e-05
## 7718     3 53016 5.658669e-05
## 7719     3 53016 5.658669e-05
## 7720     3 53016 5.658669e-05
## 7721     3 53016 5.658669e-05
## 7722     3 53016 5.658669e-05
## 7723     3 53016 5.658669e-05
## 7724     3 53016 5.658669e-05
## 7725     3 53016 5.658669e-05
## 7726     3 53016 5.658669e-05
## 7727     3 53016 5.658669e-05
## 7728     3 53016 5.658669e-05
## 7729     3 53016 5.658669e-05
## 7730     3 53016 5.658669e-05
## 7731     3 53016 5.658669e-05
## 7732     3 53016 5.658669e-05
## 7733     3 53016 5.658669e-05
## 7734     3 53016 5.658669e-05
## 7735     3 53016 5.658669e-05
## 7736     3 53016 5.658669e-05
## 7737     3 53016 5.658669e-05
## 7738     3 53016 5.658669e-05
## 7739     3 53016 5.658669e-05
## 7740     3 53016 5.658669e-05
## 7741     3 53016 5.658669e-05
## 7742     3 53016 5.658669e-05
## 7743     3 53016 5.658669e-05
## 7744     3 53016 5.658669e-05
## 7745     3 53016 5.658669e-05
## 7746     3 53016 5.658669e-05
## 7747     3 53016 5.658669e-05
## 7748     3 53016 5.658669e-05
## 7749     3 53016 5.658669e-05
## 7750     3 53016 5.658669e-05
## 7751     3 53016 5.658669e-05
## 7752     3 53016 5.658669e-05
## 7753     3 53016 5.658669e-05
## 7754     3 53016 5.658669e-05
## 7755     3 53016 5.658669e-05
## 7756     3 53016 5.658669e-05
## 7757     3 53016 5.658669e-05
## 7758     3 53016 5.658669e-05
## 7759     3 53016 5.658669e-05
## 7760     3 53016 5.658669e-05
## 7761     3 53016 5.658669e-05
## 7762     3 53016 5.658669e-05
## 7763     3 53016 5.658669e-05
## 7764     3 53016 5.658669e-05
## 7765     3 53016 5.658669e-05
## 7766     3 53016 5.658669e-05
## 7767     3 53016 5.658669e-05
## 7768     3 53016 5.658669e-05
## 7769     3 53016 5.658669e-05
## 7770     3 53016 5.658669e-05
## 7771     3 53016 5.658669e-05
## 7772     3 53016 5.658669e-05
## 7773     3 53016 5.658669e-05
## 7774     3 53016 5.658669e-05
## 7775     3 53016 5.658669e-05
## 7776     3 53016 5.658669e-05
## 7777     3 53016 5.658669e-05
## 7778     3 53016 5.658669e-05
## 7779     3 53016 5.658669e-05
## 7780     3 53016 5.658669e-05
## 7781     3 53016 5.658669e-05
## 7782     3 53016 5.658669e-05
## 7783     3 53016 5.658669e-05
## 7784     3 53016 5.658669e-05
## 7785     3 53016 5.658669e-05
## 7786     3 53016 5.658669e-05
## 7787     3 53016 5.658669e-05
## 7788     3 53016 5.658669e-05
## 7789     3 53016 5.658669e-05
## 7790     3 53016 5.658669e-05
## 7791     3 53016 5.658669e-05
## 7792     3 53016 5.658669e-05
## 7793     3 53016 5.658669e-05
## 7794     3 53016 5.658669e-05
## 7795     3 53016 5.658669e-05
## 7796     3 53016 5.658669e-05
## 7797     3 53016 5.658669e-05
## 7798     3 53016 5.658669e-05
## 7799     3 53016 5.658669e-05
## 7800     3 53016 5.658669e-05
## 7801     3 53016 5.658669e-05
## 7802     3 53016 5.658669e-05
## 7803     3 53016 5.658669e-05
## 7804     3 53016 5.658669e-05
## 7805     3 53016 5.658669e-05
## 7806     3 53016 5.658669e-05
## 7807     3 53016 5.658669e-05
## 7808     3 53016 5.658669e-05
## 7809     3 53016 5.658669e-05
## 7810     3 53016 5.658669e-05
## 7811     3 53016 5.658669e-05
## 7812     3 53016 5.658669e-05
## 7813     3 53016 5.658669e-05
## 7814     3 53016 5.658669e-05
## 7815     3 53016 5.658669e-05
## 7816     3 53016 5.658669e-05
## 7817     3 53016 5.658669e-05
## 7818     3 53016 5.658669e-05
## 7819     3 53016 5.658669e-05
## 7820     3 53016 5.658669e-05
## 7821     3 53016 5.658669e-05
## 7822     3 53016 5.658669e-05
## 7823     3 53016 5.658669e-05
## 7824     3 53016 5.658669e-05
## 7825     3 53016 5.658669e-05
## 7826     3 53016 5.658669e-05
## 7827     3 53016 5.658669e-05
## 7828     3 53016 5.658669e-05
## 7829     3 53016 5.658669e-05
## 7830     3 53016 5.658669e-05
## 7831     3 53016 5.658669e-05
## 7832     3 53016 5.658669e-05
## 7833     3 53016 5.658669e-05
## 7834     3 53016 5.658669e-05
## 7835     3 53016 5.658669e-05
## 7836     3 53016 5.658669e-05
## 7837     3 53016 5.658669e-05
## 7838     3 53016 5.658669e-05
## 7839     3 53016 5.658669e-05
## 7840     3 53016 5.658669e-05
## 7841     3 53016 5.658669e-05
## 7842     3 53016 5.658669e-05
## 7843     3 53016 5.658669e-05
## 7844     3 53016 5.658669e-05
## 7845     3 53016 5.658669e-05
## 7846     3 53016 5.658669e-05
## 7847     3 53016 5.658669e-05
## 7848     3 53016 5.658669e-05
## 7849     3 53016 5.658669e-05
## 7850     3 53016 5.658669e-05
## 7851     3 53016 5.658669e-05
## 7852     3 53016 5.658669e-05
## 7853     3 53016 5.658669e-05
## 7854     3 53016 5.658669e-05
## 7855     3 53016 5.658669e-05
## 7856     3 53016 5.658669e-05
## 7857     3 53016 5.658669e-05
## 7858     3 53016 5.658669e-05
## 7859     3 53016 5.658669e-05
## 7860     3 53016 5.658669e-05
## 7861     3 53016 5.658669e-05
## 7862     3 53016 5.658669e-05
## 7863     3 53016 5.658669e-05
## 7864     3 53016 5.658669e-05
## 7865     3 53016 5.658669e-05
## 7866     3 53016 5.658669e-05
## 7867     3 53016 5.658669e-05
## 7868     3 53016 5.658669e-05
## 7869     3 53016 5.658669e-05
## 7870     3 53016 5.658669e-05
## 7871     3 53016 5.658669e-05
## 7872     3 53016 5.658669e-05
## 7873     3 53016 5.658669e-05
## 7874     3 53016 5.658669e-05
## 7875     3 53016 5.658669e-05
## 7876     3 53016 5.658669e-05
## 7877     3 53016 5.658669e-05
## 7878     3 53016 5.658669e-05
## 7879     3 53016 5.658669e-05
## 7880     3 53016 5.658669e-05
## 7881     3 53016 5.658669e-05
## 7882     3 53016 5.658669e-05
## 7883     3 53016 5.658669e-05
## 7884     3 53016 5.658669e-05
## 7885     3 53016 5.658669e-05
## 7886     3 53016 5.658669e-05
## 7887     3 53016 5.658669e-05
## 7888     3 53016 5.658669e-05
## 7889     3 53016 5.658669e-05
## 7890     3 53016 5.658669e-05
## 7891     3 53016 5.658669e-05
## 7892     3 53016 5.658669e-05
## 7893     3 53016 5.658669e-05
## 7894     3 53016 5.658669e-05
## 7895     3 53016 5.658669e-05
## 7896     3 53016 5.658669e-05
## 7897     3 53016 5.658669e-05
## 7898     3 53016 5.658669e-05
## 7899     3 53016 5.658669e-05
## 7900     3 53016 5.658669e-05
## 7901     3 53016 5.658669e-05
## 7902     3 53016 5.658669e-05
## 7903     3 53016 5.658669e-05
## 7904     3 53016 5.658669e-05
## 7905     3 53016 5.658669e-05
## 7906     3 53016 5.658669e-05
## 7907     3 53016 5.658669e-05
## 7908     3 53016 5.658669e-05
## 7909     3 53016 5.658669e-05
## 7910     3 53016 5.658669e-05
## 7911     3 53016 5.658669e-05
## 7912     3 53016 5.658669e-05
## 7913     3 53016 5.658669e-05
## 7914     3 53016 5.658669e-05
## 7915     3 53016 5.658669e-05
## 7916     3 53016 5.658669e-05
## 7917     3 53016 5.658669e-05
## 7918     3 53016 5.658669e-05
## 7919     3 53016 5.658669e-05
## 7920     3 53016 5.658669e-05
## 7921     3 53016 5.658669e-05
## 7922     3 53016 5.658669e-05
## 7923     3 53016 5.658669e-05
## 7924     3 53016 5.658669e-05
## 7925     3 53016 5.658669e-05
## 7926     3 53016 5.658669e-05
## 7927     3 53016 5.658669e-05
## 7928     3 53016 5.658669e-05
## 7929     3 53016 5.658669e-05
## 7930     3 53016 5.658669e-05
## 7931     3 53016 5.658669e-05
## 7932     3 53016 5.658669e-05
## 7933     3 53016 5.658669e-05
## 7934     3 53016 5.658669e-05
## 7935     3 53016 5.658669e-05
## 7936     3 53016 5.658669e-05
## 7937     3 53016 5.658669e-05
## 7938     3 53016 5.658669e-05
## 7939     3 53016 5.658669e-05
## 7940     3 53016 5.658669e-05
## 7941     3 53016 5.658669e-05
## 7942     3 53016 5.658669e-05
## 7943     3 53016 5.658669e-05
## 7944     3 53016 5.658669e-05
## 7945     3 53016 5.658669e-05
## 7946     3 53016 5.658669e-05
## 7947     3 53016 5.658669e-05
## 7948     3 53016 5.658669e-05
## 7949     3 53016 5.658669e-05
## 7950     3 53016 5.658669e-05
## 7951     3 53016 5.658669e-05
## 7952     3 53016 5.658669e-05
## 7953     3 53016 5.658669e-05
## 7954     3 53016 5.658669e-05
## 7955     3 53016 5.658669e-05
## 7956     3 53016 5.658669e-05
## 7957     3 53016 5.658669e-05
## 7958     3 16547 1.813017e-04
## 7959     3 16547 1.813017e-04
## 7960     3 16547 1.813017e-04
## 7961     3 16547 1.813017e-04
## 7962     3 16547 1.813017e-04
## 7963     3 16547 1.813017e-04
## 7964     3 16547 1.813017e-04
## 7965     3 16547 1.813017e-04
## 7966     3 16547 1.813017e-04
## 7967     3 16547 1.813017e-04
## 7968     3 16547 1.813017e-04
## 7969     3 16547 1.813017e-04
## 7970     3 16547 1.813017e-04
## 7971     3 16547 1.813017e-04
## 7972     3 16547 1.813017e-04
## 7973     3 16547 1.813017e-04
## 7974     3 16547 1.813017e-04
## 7975     3 16547 1.813017e-04
## 7976     3 16547 1.813017e-04
## 7977     3 16547 1.813017e-04
## 7978     3 16547 1.813017e-04
## 7979     3 16547 1.813017e-04
## 7980     3 16547 1.813017e-04
## 7981     3 16547 1.813017e-04
## 7982     3 16547 1.813017e-04
## 7983     3 16547 1.813017e-04
## 7984     3 16547 1.813017e-04
## 7985     3 16547 1.813017e-04
## 7986     3 16547 1.813017e-04
## 7987     3 16547 1.813017e-04
## 7988     3 16547 1.813017e-04
## 7989     3 16547 1.813017e-04
## 7990     3 16547 1.813017e-04
## 7991     3 16547 1.813017e-04
## 7992     3 16547 1.813017e-04
## 7993     3 16547 1.813017e-04
## 7994     3 16547 1.813017e-04
## 7995     3 16547 1.813017e-04
## 7996     3 16547 1.813017e-04
## 7997     3 16547 1.813017e-04
## 7998     3 16547 1.813017e-04
## 7999     3 16547 1.813017e-04
## 8000     3 16547 1.813017e-04
## 8001     3 16547 1.813017e-04
## 8002     3 16547 1.813017e-04
## 8003     3 16547 1.813017e-04
## 8004     3 16547 1.813017e-04
## 8005     3 16547 1.813017e-04
## 8006     3 16547 1.813017e-04
## 8007     3 16547 1.813017e-04
## 8008     3 16547 1.813017e-04
## 8009     3 16547 1.813017e-04
## 8010     3 16547 1.813017e-04
## 8011     3 16547 1.813017e-04
## 8012     3 16547 1.813017e-04
## 8013     3 16547 1.813017e-04
## 8014     3 16547 1.813017e-04
## 8015     3 16547 1.813017e-04
## 8016     3 16547 1.813017e-04
## 8017     3 16547 1.813017e-04
## 8018     3 16547 1.813017e-04
## 8019     3 16547 1.813017e-04
## 8020     3 16547 1.813017e-04
## 8021     3 16547 1.813017e-04
## 8022     3 16547 1.813017e-04
## 8023     3 16547 1.813017e-04
## 8024     3 16547 1.813017e-04
## 8025     3 16547 1.813017e-04
## 8026     3 16547 1.813017e-04
## 8027     3 16547 1.813017e-04
## 8028     3 16547 1.813017e-04
## 8029     3 16547 1.813017e-04
## 8030     3 16547 1.813017e-04
## 8031     3 16547 1.813017e-04
## 8032     3 16547 1.813017e-04
## 8033     3 16547 1.813017e-04
## 8034     3 16547 1.813017e-04
## 8035     3 16547 1.813017e-04
## 8036     3 16547 1.813017e-04
## 8037     3 16547 1.813017e-04
## 8038     3 16547 1.813017e-04
## 8039     3 16547 1.813017e-04
## 8040     3 16547 1.813017e-04
## 8041     3 16547 1.813017e-04
## 8042     3 16547 1.813017e-04
## 8043     3 16547 1.813017e-04
## 8044     3 16547 1.813017e-04
## 8045     3 16547 1.813017e-04
## 8046     3 16547 1.813017e-04
## 8047     3 16547 1.813017e-04
## 8048     3 16547 1.813017e-04
## 8049     3 16547 1.813017e-04
## 8050     3 16547 1.813017e-04
## 8051     3 16547 1.813017e-04
## 8052     3 16547 1.813017e-04
## 8053     3 16547 1.813017e-04
## 8054     3 16547 1.813017e-04
## 8055     3 16547 1.813017e-04
## 8056     3 16547 1.813017e-04
## 8057     3 16547 1.813017e-04
## 8058     3 16547 1.813017e-04
## 8059     3 16547 1.813017e-04
## 8060     3 16547 1.813017e-04
## 8061     3 16547 1.813017e-04
## 8062     3 16547 1.813017e-04
## 8063     3 16547 1.813017e-04
## 8064     3 16547 1.813017e-04
## 8065     3 16547 1.813017e-04
## 8066     3 16547 1.813017e-04
## 8067     3 16547 1.813017e-04
## 8068     3 16547 1.813017e-04
## 8069     3 16547 1.813017e-04
## 8070     3 16547 1.813017e-04
## 8071     3 16547 1.813017e-04
## 8072     3 16547 1.813017e-04
## 8073     3 16547 1.813017e-04
## 8074     3 16547 1.813017e-04
## 8075     3 16547 1.813017e-04
## 8076     3 16547 1.813017e-04
## 8077     3 16547 1.813017e-04
## 8078     3 16547 1.813017e-04
## 8079     3 16547 1.813017e-04
## 8080     3 16547 1.813017e-04
## 8081     3 16547 1.813017e-04
## 8082     3 16547 1.813017e-04
## 8083     3 16547 1.813017e-04
## 8084     3 16547 1.813017e-04
## 8085     3 16547 1.813017e-04
## 8086     3 16547 1.813017e-04
## 8087     3 16547 1.813017e-04
## 8088     3 16547 1.813017e-04
## 8089     3 16547 1.813017e-04
## 8090     3 16547 1.813017e-04
## 8091     3 16547 1.813017e-04
## 8092     3 16547 1.813017e-04
## 8093     3 16547 1.813017e-04
## 8094     3 16547 1.813017e-04
## 8095     3 16547 1.813017e-04
## 8096     3 16547 1.813017e-04
## 8097     3 16547 1.813017e-04
## 8098     3 16547 1.813017e-04
## 8099     3 16547 1.813017e-04
## 8100     3 16547 1.813017e-04
## 8101     3 16547 1.813017e-04
## 8102     3 16547 1.813017e-04
## 8103     3 16547 1.813017e-04
## 8104     3 16547 1.813017e-04
## 8105     3 16547 1.813017e-04
## 8106     3 16547 1.813017e-04
## 8107     3 16547 1.813017e-04
## 8108     3 16547 1.813017e-04
## 8109     3 16547 1.813017e-04
## 8110     3 16547 1.813017e-04
## 8111     3 16547 1.813017e-04
## 8112     3 16547 1.813017e-04
## 8113     3 16547 1.813017e-04
## 8114     3 16547 1.813017e-04
## 8115     3 16547 1.813017e-04
## 8116     3 16547 1.813017e-04
## 8117     3 16547 1.813017e-04
## 8118     3 16547 1.813017e-04
## 8119     3 16547 1.813017e-04
## 8120     3 16547 1.813017e-04
## 8121     3 16547 1.813017e-04
## 8122     3 16547 1.813017e-04
## 8123     3 16547 1.813017e-04
## 8124     3 16547 1.813017e-04
## 8125     3 16547 1.813017e-04
## 8126     3 16547 1.813017e-04
## 8127     3 16547 1.813017e-04
## 8128     3 16547 1.813017e-04
## 8129     3 16547 1.813017e-04
## 8130     3 16547 1.813017e-04
## 8131     3 16547 1.813017e-04
## 8132     3 16547 1.813017e-04
## 8133     3 16547 1.813017e-04
## 8134     3 16547 1.813017e-04
## 8135     3 16547 1.813017e-04
## 8136     3 16547 1.813017e-04
## 8137     3 16547 1.813017e-04
## 8138     3 16547 1.813017e-04
## 8139     3 16547 1.813017e-04
## 8140     3 16547 1.813017e-04
## 8141     3 16547 1.813017e-04
## 8142     3 16547 1.813017e-04
## 8143     3 16547 1.813017e-04
## 8144     3 16547 1.813017e-04
## 8145     3 16547 1.813017e-04
## 8146     3 16547 1.813017e-04
## 8147     3 16547 1.813017e-04
## 8148     3 16547 1.813017e-04
## 8149     3 16547 1.813017e-04
## 8150     3 16547 1.813017e-04
## 8151     3 16547 1.813017e-04
## 8152     3 16547 1.813017e-04
## 8153     3 16547 1.813017e-04
## 8154     3 16547 1.813017e-04
## 8155     3 16547 1.813017e-04
## 8156     3 16547 1.813017e-04
## 8157     3 16547 1.813017e-04
## 8158     3 16547 1.813017e-04
## 8159     3 16547 1.813017e-04
## 8160     3 16547 1.813017e-04
## 8161     3 16547 1.813017e-04
## 8162     3 16547 1.813017e-04
## 8163     3 16547 1.813017e-04
## 8164     3 16547 1.813017e-04
## 8165     3 16547 1.813017e-04
## 8166     3 16547 1.813017e-04
## 8167     3 16547 1.813017e-04
## 8168     3 16547 1.813017e-04
## 8169     3 16547 1.813017e-04
## 8170     3 16547 1.813017e-04
## 8171     3 16547 1.813017e-04
## 8172     3 16547 1.813017e-04
## 8173     3 16547 1.813017e-04
## 8174     3 16547 1.813017e-04
## 8175     3 16547 1.813017e-04
## 8176     3 16547 1.813017e-04
## 8177     3 16547 1.813017e-04
## 8178     3 16547 1.813017e-04
## 8179     3 16547 1.813017e-04
## 8180     3 16547 1.813017e-04
## 8181     3 16547 1.813017e-04
## 8182     3 16547 1.813017e-04
## 8183     3 16547 1.813017e-04
## 8184     3 16547 1.813017e-04
## 8185     3 16547 1.813017e-04
## 8186     3 16547 1.813017e-04
## 8187     3 16547 1.813017e-04
## 8188     3 16547 1.813017e-04
## 8189     3 16547 1.813017e-04
## 8190     3 16547 1.813017e-04
## 8191     3 16547 1.813017e-04
## 8192     3 16547 1.813017e-04
## 8193     3 16547 1.813017e-04
## 8194     3 16547 1.813017e-04
## 8195     3 16547 1.813017e-04
## 8196     3 16547 1.813017e-04
## 8197     3 16547 1.813017e-04
## 8198     3 16547 1.813017e-04
## 8199     3 16547 1.813017e-04
## 8200     3 16547 1.813017e-04
## 8201     3 16547 1.813017e-04
## 8202     3 16547 1.813017e-04
## 8203     3 16547 1.813017e-04
## 8204     3 16547 1.813017e-04
## 8205     3 16547 1.813017e-04
## 8206     3 16547 1.813017e-04
## 8207     3 16547 1.813017e-04
## 8208     3 16547 1.813017e-04
## 8209     3 16547 1.813017e-04
## 8210     3 16547 1.813017e-04
## 8211     3 16547 1.813017e-04
## 8212     3 16547 1.813017e-04
## 8213     3 16547 1.813017e-04
## 8214     3 16547 1.813017e-04
## 8215     3 16547 1.813017e-04
## 8216     3 16547 1.813017e-04
## 8217     3 16547 1.813017e-04
## 8218     3 16547 1.813017e-04
## 8219     3 16547 1.813017e-04
## 8220     3 16547 1.813017e-04
## 8221     3 16547 1.813017e-04
## 8222     3 16547 1.813017e-04
## 8223     3 16547 1.813017e-04
## 8224     3 16547 1.813017e-04
## 8225     3 16547 1.813017e-04
## 8226     3 16547 1.813017e-04
## 8227     3 16547 1.813017e-04
## 8228     3 16547 1.813017e-04
## 8229     3 16547 1.813017e-04
## 8230     3 16547 1.813017e-04
## 8231     3 16547 1.813017e-04
## 8232     3 16547 1.813017e-04
## 8233     3 16547 1.813017e-04
## 8234     3 16547 1.813017e-04
## 8235     3 16547 1.813017e-04
## 8236     3 16547 1.813017e-04
## 8237     3 16547 1.813017e-04
## 8238     3 16547 1.813017e-04
## 8239     3 16547 1.813017e-04
## 8240     3 16547 1.813017e-04
## 8241     3 16547 1.813017e-04
## 8242     3 16547 1.813017e-04
## 8243     3 16547 1.813017e-04
## 8244     3 16547 1.813017e-04
## 8245     3 16547 1.813017e-04
## 8246     3 16547 1.813017e-04
## 8247     3 16547 1.813017e-04
## 8248     3 16547 1.813017e-04
## 8249     3 16547 1.813017e-04
## 8250     3 16547 1.813017e-04
## 8251     3 16547 1.813017e-04
## 8252     3 16547 1.813017e-04
## 8253     3 16547 1.813017e-04
## 8254     3 16547 1.813017e-04
## 8255     3 16547 1.813017e-04
## 8256     3 16547 1.813017e-04
## 8257     3 16547 1.813017e-04
## 8258     3 16547 1.813017e-04
## 8259     3 16547 1.813017e-04
## 8260     3 16547 1.813017e-04
## 8261     3 16547 1.813017e-04
## 8262     3 16547 1.813017e-04
## 8263     3 16547 1.813017e-04
## 8264     3 16547 1.813017e-04
## 8265     3 16547 1.813017e-04
## 8266     3 16547 1.813017e-04
## 8267     3 16547 1.813017e-04
## 8268     3 16547 1.813017e-04
## 8269     3 16547 1.813017e-04
## 8270     3 16547 1.813017e-04
## 8271     3 16547 1.813017e-04
## 8272     3 16547 1.813017e-04
## 8273     3 16547 1.813017e-04
## 8274     3 16547 1.813017e-04
## 8275     3 16547 1.813017e-04
## 8276     3 16547 1.813017e-04
## 8277     3 16547 1.813017e-04
## 8278     3 16547 1.813017e-04
## 8279     3 16547 1.813017e-04
## 8280     3 16547 1.813017e-04
## 8281     3 16547 1.813017e-04
## 8282     3 16547 1.813017e-04
## 8283     3 16547 1.813017e-04
## 8284     3 16547 1.813017e-04
## 8285     3 16547 1.813017e-04
## 8286     3 16547 1.813017e-04
## 8287     3 16547 1.813017e-04
## 8288     3 16547 1.813017e-04
## 8289     3 16547 1.813017e-04
## 8290     3 16547 1.813017e-04
## 8291     3 16547 1.813017e-04
## 8292     3 16547 1.813017e-04
## 8293     3 16547 1.813017e-04
## 8294     3 16547 1.813017e-04
## 8295     3 16547 1.813017e-04
## 8296     3 16547 1.813017e-04
## 8297     3 16547 1.813017e-04
## 8298     3 16547 1.813017e-04
## 8299     3 16547 1.813017e-04
## 8300     3 16547 1.813017e-04
## 8301     3 16547 1.813017e-04
## 8302     3 16547 1.813017e-04
## 8303     3 16547 1.813017e-04
## 8304     3 16547 1.813017e-04
## 8305     3 16547 1.813017e-04
## 8306     3 16547 1.813017e-04
## 8307     3 16547 1.813017e-04
## 8308     3 16547 1.813017e-04
## 8309     3 16547 1.813017e-04
## 8310     3 16547 1.813017e-04
## 8311     3 16547 1.813017e-04
## 8312     3 16547 1.813017e-04
## 8313     3 16547 1.813017e-04
## 8314     3 16547 1.813017e-04
## 8315     3 16547 1.813017e-04
## 8316     3 16547 1.813017e-04
## 8317     3 16547 1.813017e-04
## 8318     3 16547 1.813017e-04
## 8319     3 16547 1.813017e-04
## 8320     3 16547 1.813017e-04
## 8321     3 16547 1.813017e-04
## 8322     3 16547 1.813017e-04
## 8323     3 16547 1.813017e-04
## 8324     3 16547 1.813017e-04
## 8325     3 16547 1.813017e-04
## 8326     3 16547 1.813017e-04
## 8327     3 16547 1.813017e-04
## 8328     3 16547 1.813017e-04
## 8329     3 16547 1.813017e-04
## 8330     3 16547 1.813017e-04
## 8331     3 16547 1.813017e-04
## 8332     3 16547 1.813017e-04
## 8333     3 16547 1.813017e-04
## 8334     3 16547 1.813017e-04
## 8335     3 16547 1.813017e-04
## 8336     3 16547 1.813017e-04
## 8337     3 16547 1.813017e-04
## 8338     2 70067 2.854411e-05
## 8339     2 70067 2.854411e-05
## 8340     2 70067 2.854411e-05
## 8341     2 70067 2.854411e-05
## 8342     2 70067 2.854411e-05
## 8343     2 70067 2.854411e-05
## 8344     2 70067 2.854411e-05
## 8345     2 70067 2.854411e-05
## 8346     2 70067 2.854411e-05
## 8347     2 70067 2.854411e-05
## 8348     2 70067 2.854411e-05
## 8349     2 70067 2.854411e-05
## 8350     2 70067 2.854411e-05
## 8351     2 70067 2.854411e-05
## 8352     2 70067 2.854411e-05
## 8353     2 70067 2.854411e-05
## 8354     2 70067 2.854411e-05
## 8355     2 70067 2.854411e-05
## 8356     2 70067 2.854411e-05
## 8357     2 70067 2.854411e-05
## 8358     2 70067 2.854411e-05
## 8359     2 70067 2.854411e-05
## 8360     2 70067 2.854411e-05
## 8361     2 70067 2.854411e-05
## 8362     2 70067 2.854411e-05
## 8363     2 70067 2.854411e-05
## 8364     2 70067 2.854411e-05
## 8365     2 70067 2.854411e-05
## 8366     2 70067 2.854411e-05
## 8367     2 70067 2.854411e-05
## 8368     2 70067 2.854411e-05
## 8369     2 70067 2.854411e-05
## 8370     2 70067 2.854411e-05
## 8371     2 70067 2.854411e-05
## 8372     2 70067 2.854411e-05
## 8373     2 70067 2.854411e-05
## 8374     2 70067 2.854411e-05
## 8375     2 70067 2.854411e-05
## 8376     2 70067 2.854411e-05
## 8377     2 70067 2.854411e-05
## 8378     2 70067 2.854411e-05
## 8379     2 70067 2.854411e-05
## 8380     2 70067 2.854411e-05
## 8381     2 70067 2.854411e-05
## 8382     2 70067 2.854411e-05
## 8383     2 70067 2.854411e-05
## 8384     2 70067 2.854411e-05
## 8385     2 70067 2.854411e-05
## 8386     2 70067 2.854411e-05
## 8387     2 70067 2.854411e-05
## 8388     2 70067 2.854411e-05
## 8389     2 70067 2.854411e-05
## 8390     2 70067 2.854411e-05
## 8391     2 70067 2.854411e-05
## 8392     2 70067 2.854411e-05
## 8393     2 70067 2.854411e-05
## 8394     2 70067 2.854411e-05
## 8395     2 70067 2.854411e-05
## 8396     2 70067 2.854411e-05
## 8397     2 70067 2.854411e-05
## 8398     2 70067 2.854411e-05
## 8399     2 70067 2.854411e-05
## 8400     2 70067 2.854411e-05
## 8401     2 70067 2.854411e-05
## 8402     2 70067 2.854411e-05
## 8403     2 70067 2.854411e-05
## 8404     2 70067 2.854411e-05
## 8405     2 70067 2.854411e-05
## 8406     2 70067 2.854411e-05
## 8407     2 70067 2.854411e-05
## 8408     2 70067 2.854411e-05
## 8409     2 70067 2.854411e-05
## 8410     2 70067 2.854411e-05
## 8411     2 70067 2.854411e-05
## 8412     2 70067 2.854411e-05
## 8413     2 70067 2.854411e-05
## 8414     2 70067 2.854411e-05
## 8415     2 70067 2.854411e-05
## 8416     2 70067 2.854411e-05
## 8417     2 70067 2.854411e-05
## 8418     2 70067 2.854411e-05
## 8419     2 70067 2.854411e-05
## 8420     2 70067 2.854411e-05
## 8421     2 70067 2.854411e-05
## 8422     2 70067 2.854411e-05
## 8423     2 70067 2.854411e-05
## 8424     2 70067 2.854411e-05
## 8425     2 70067 2.854411e-05
## 8426     2 70067 2.854411e-05
## 8427     2 70067 2.854411e-05
## 8428     2 70067 2.854411e-05
## 8429     2 70067 2.854411e-05
## 8430     2 70067 2.854411e-05
## 8431     2 70067 2.854411e-05
## 8432     2 70067 2.854411e-05
## 8433     2 70067 2.854411e-05
## 8434     2 70067 2.854411e-05
## 8435     2 70067 2.854411e-05
## 8436     2 70067 2.854411e-05
## 8437     2 70067 2.854411e-05
## 8438     2 70067 2.854411e-05
## 8439     2 70067 2.854411e-05
## 8440     2 70067 2.854411e-05
## 8441     2 70067 2.854411e-05
## 8442     2 70067 2.854411e-05
## 8443     2 70067 2.854411e-05
## 8444     2 70067 2.854411e-05
## 8445     2 70067 2.854411e-05
## 8446     2 70067 2.854411e-05
## 8447     2 70067 2.854411e-05
## 8448     2 70067 2.854411e-05
## 8449     2 70067 2.854411e-05
## 8450     2 70067 2.854411e-05
## 8451     2 70067 2.854411e-05
## 8452     2 70067 2.854411e-05
## 8453     2 70067 2.854411e-05
## 8454     2 70067 2.854411e-05
## 8455     2 70067 2.854411e-05
## 8456     2 70067 2.854411e-05
## 8457     2 70067 2.854411e-05
## 8458     2 70067 2.854411e-05
## 8459     2 70067 2.854411e-05
## 8460     2 70067 2.854411e-05
## 8461     2 70067 2.854411e-05
## 8462     2 70067 2.854411e-05
## 8463     2 70067 2.854411e-05
## 8464     2 70067 2.854411e-05
## 8465     2 70067 2.854411e-05
## 8466     2 70067 2.854411e-05
## 8467     2 70067 2.854411e-05
## 8468     2 70067 2.854411e-05
## 8469     2 70067 2.854411e-05
## 8470     2 70067 2.854411e-05
## 8471     2 70067 2.854411e-05
## 8472     2 70067 2.854411e-05
## 8473     2 70067 2.854411e-05
## 8474     2 70067 2.854411e-05
## 8475     2 70067 2.854411e-05
## 8476     2 70067 2.854411e-05
## 8477     2 70067 2.854411e-05
## 8478     2 70067 2.854411e-05
## 8479     2 70067 2.854411e-05
## 8480     2 70067 2.854411e-05
## 8481     2 70067 2.854411e-05
## 8482     2 70067 2.854411e-05
## 8483     2 70067 2.854411e-05
## 8484     2 70067 2.854411e-05
## 8485     2 70067 2.854411e-05
## 8486     2 70067 2.854411e-05
## 8487     2 70067 2.854411e-05
## 8488     2 70067 2.854411e-05
## 8489     2 70067 2.854411e-05
## 8490     2 70067 2.854411e-05
## 8491     2 70067 2.854411e-05
## 8492     2 70067 2.854411e-05
## 8493     2 70067 2.854411e-05
## 8494     2 70067 2.854411e-05
## 8495     2 70067 2.854411e-05
## 8496     2 70067 2.854411e-05
## 8497     2 70067 2.854411e-05
## 8498     2 70067 2.854411e-05
## 8499     2 70067 2.854411e-05
## 8500     2 70067 2.854411e-05
## 8501     2 70067 2.854411e-05
## 8502     2 70067 2.854411e-05
## 8503     2 70067 2.854411e-05
## 8504     2 70067 2.854411e-05
## 8505     2 70067 2.854411e-05
## 8506     2 70067 2.854411e-05
## 8507     2 70067 2.854411e-05
## 8508     2 70067 2.854411e-05
## 8509     2 70067 2.854411e-05
## 8510     2 70067 2.854411e-05
## 8511     2 70067 2.854411e-05
## 8512     2 70067 2.854411e-05
## 8513     2 70067 2.854411e-05
## 8514     2 70067 2.854411e-05
## 8515     2 70067 2.854411e-05
## 8516     2 70067 2.854411e-05
## 8517     2 70067 2.854411e-05
## 8518     2 70067 2.854411e-05
## 8519     2 70067 2.854411e-05
## 8520     2 70067 2.854411e-05
## 8521     2 70067 2.854411e-05
## 8522     2 70067 2.854411e-05
## 8523     2 70067 2.854411e-05
## 8524     2 70067 2.854411e-05
## 8525     2 70067 2.854411e-05
## 8526     2 70067 2.854411e-05
## 8527     2 70067 2.854411e-05
## 8528     2 70067 2.854411e-05
## 8529     2 70067 2.854411e-05
## 8530     2 70067 2.854411e-05
## 8531     2 70067 2.854411e-05
## 8532     2 70067 2.854411e-05
## 8533     2 70067 2.854411e-05
## 8534     2 70067 2.854411e-05
## 8535     2 70067 2.854411e-05
## 8536     2 70067 2.854411e-05
## 8537     2 70067 2.854411e-05
## 8538     2 70067 2.854411e-05
## 8539     2 70067 2.854411e-05
## 8540     2 70067 2.854411e-05
## 8541     2 70067 2.854411e-05
## 8542     2 70067 2.854411e-05
## 8543     2 70067 2.854411e-05
## 8544     2 70067 2.854411e-05
## 8545     2 70067 2.854411e-05
## 8546     2 70067 2.854411e-05
## 8547     2 70067 2.854411e-05
## 8548     2 70067 2.854411e-05
## 8549     2 70067 2.854411e-05
## 8550     2 70067 2.854411e-05
## 8551     2 70067 2.854411e-05
## 8552     2 70067 2.854411e-05
## 8553     2 70067 2.854411e-05
## 8554     2 70067 2.854411e-05
## 8555     2 70067 2.854411e-05
## 8556     2 70067 2.854411e-05
## 8557     2 70067 2.854411e-05
## 8558     2 70067 2.854411e-05
## 8559     2 70067 2.854411e-05
## 8560     2 70067 2.854411e-05
## 8561     2 70067 2.854411e-05
## 8562     2 70067 2.854411e-05
## 8563     2 70067 2.854411e-05
## 8564     2 70067 2.854411e-05
## 8565     2 70067 2.854411e-05
## 8566     2 70067 2.854411e-05
## 8567     2 70067 2.854411e-05
## 8568     2 70067 2.854411e-05
## 8569     2 70067 2.854411e-05
## 8570     2 70067 2.854411e-05
## 8571     2 70067 2.854411e-05
## 8572     2 70067 2.854411e-05
## 8573     2 70067 2.854411e-05
## 8574     2 70067 2.854411e-05
## 8575     2 70067 2.854411e-05
## 8576     2 70067 2.854411e-05
## 8577     2 70067 2.854411e-05
## 8578     2 70067 2.854411e-05
## 8579     2 70067 2.854411e-05
## 8580     2 70067 2.854411e-05
## 8581     2 70067 2.854411e-05
## 8582     2 70067 2.854411e-05
## 8583     2 70067 2.854411e-05
## 8584     2 70067 2.854411e-05
## 8585     2 70067 2.854411e-05
## 8586     2 70067 2.854411e-05
## 8587     2 70067 2.854411e-05
## 8588     2 70067 2.854411e-05
## 8589     2 70067 2.854411e-05
## 8590     2 70067 2.854411e-05
## 8591     2 70067 2.854411e-05
## 8592     2 70067 2.854411e-05
## 8593     2 70067 2.854411e-05
## 8594     2 70067 2.854411e-05
## 8595     2 70067 2.854411e-05
## 8596     2 70067 2.854411e-05
## 8597     2 70067 2.854411e-05
## 8598     2 70067 2.854411e-05
## 8599     2 70067 2.854411e-05
## 8600     2 70067 2.854411e-05
## 8601     2 70067 2.854411e-05
## 8602     2 70067 2.854411e-05
## 8603     2 70067 2.854411e-05
## 8604     2 70067 2.854411e-05
## 8605     2 70067 2.854411e-05
## 8606     2 70067 2.854411e-05
## 8607     2 70067 2.854411e-05
## 8608     2 70067 2.854411e-05
## 8609     2 70067 2.854411e-05
## 8610     2 70067 2.854411e-05
## 8611     2 70067 2.854411e-05
## 8612     2 70067 2.854411e-05
## 8613     2 70067 2.854411e-05
## 8614     2 70067 2.854411e-05
## 8615     2 70067 2.854411e-05
## 8616     2 70067 2.854411e-05
## 8617     2 70067 2.854411e-05
## 8618     2 70067 2.854411e-05
## 8619     2 70067 2.854411e-05
## 8620     2 70067 2.854411e-05
## 8621     2 70067 2.854411e-05
## 8622     2 70067 2.854411e-05
## 8623     2 70067 2.854411e-05
## 8624     2 70067 2.854411e-05
## 8625     2 70067 2.854411e-05
## 8626     2 70067 2.854411e-05
## 8627     2 70067 2.854411e-05
## 8628     2 70067 2.854411e-05
## 8629     2 70067 2.854411e-05
## 8630     2 70067 2.854411e-05
## 8631     2 70067 2.854411e-05
## 8632     2 70067 2.854411e-05
## 8633     2 70067 2.854411e-05
## 8634     2 70067 2.854411e-05
## 8635     2 70067 2.854411e-05
## 8636     2 70067 2.854411e-05
## 8637     2 70067 2.854411e-05
## 8638     2 70067 2.854411e-05
## 8639     2 70067 2.854411e-05
## 8640     2 70067 2.854411e-05
## 8641     2 70067 2.854411e-05
## 8642     2 70067 2.854411e-05
## 8643     2 70067 2.854411e-05
## 8644     2 70067 2.854411e-05
## 8645     2 70067 2.854411e-05
## 8646     2 70067 2.854411e-05
## 8647     2 70067 2.854411e-05
## 8648     2 70067 2.854411e-05
## 8649     2 70067 2.854411e-05
## 8650     2 70067 2.854411e-05
## 8651     2 70067 2.854411e-05
## 8652     2 70067 2.854411e-05
## 8653     2 70067 2.854411e-05
## 8654     2 70067 2.854411e-05
## 8655     2 70067 2.854411e-05
## 8656     2 70067 2.854411e-05
## 8657     2 70067 2.854411e-05
## 8658     2 70067 2.854411e-05
## 8659     2 70067 2.854411e-05
## 8660     2 70067 2.854411e-05
## 8661     2 70067 2.854411e-05
## 8662     2 70067 2.854411e-05
## 8663     2 70067 2.854411e-05
## 8664     2 70067 2.854411e-05
## 8665     2 70067 2.854411e-05
## 8666     2 70067 2.854411e-05
## 8667     2 70067 2.854411e-05
## 8668     2 70067 2.854411e-05
## 8669     2 70067 2.854411e-05
## 8670     2 70067 2.854411e-05
## 8671     2 70067 2.854411e-05
## 8672     2 70067 2.854411e-05
## 8673     2 70067 2.854411e-05
## 8674     2 70067 2.854411e-05
## 8675     2 70067 2.854411e-05
## 8676     2 70067 2.854411e-05
## 8677     2 70067 2.854411e-05
## 8678     2 70067 2.854411e-05
## 8679     2 70067 2.854411e-05
## 8680     2 70067 2.854411e-05
## 8681     2 70067 2.854411e-05
## 8682     2 70067 2.854411e-05
## 8683     2 70067 2.854411e-05
## 8684     2 70067 2.854411e-05
## 8685     2 70067 2.854411e-05
## 8686     2 70067 2.854411e-05
## 8687     2 70067 2.854411e-05
## 8688     2 70067 2.854411e-05
## 8689     2 70067 2.854411e-05
## 8690     2 70067 2.854411e-05
## 8691     2 70067 2.854411e-05
## 8692     2 70067 2.854411e-05
## 8693     2 70067 2.854411e-05
## 8694     2 70067 2.854411e-05
## 8695     2 70067 2.854411e-05
## 8696     2 70067 2.854411e-05
## 8697     2 70067 2.854411e-05
## 8698     2 70067 2.854411e-05
## 8699     2 70067 2.854411e-05
## 8700     2 70067 2.854411e-05
## 8701     2 70067 2.854411e-05
## 8702     2 70067 2.854411e-05
## 8703     2 70067 2.854411e-05
## 8704     2 70067 2.854411e-05
## 8705     2 70067 2.854411e-05
## 8706     2 70067 2.854411e-05
## 8707     2 70067 2.854411e-05
## 8708     2 70067 2.854411e-05
## 8709     2 70067 2.854411e-05
## 8710     2 70067 2.854411e-05
## 8711     2 70067 2.854411e-05
## 8712     2 70067 2.854411e-05
## 8713     2 70067 2.854411e-05
## 8714     2 70067 2.854411e-05
## 8715     2 70067 2.854411e-05
## 8716     2 70067 2.854411e-05
## 8717     2 70067 2.854411e-05
## 8718     2 70067 2.854411e-05
## 8719     2 70067 2.854411e-05
## 8720     2 70067 2.854411e-05
## 8721     2 70067 2.854411e-05
## 8722     2 70067 2.854411e-05
## 8723     2 70067 2.854411e-05
## 8724     2 70067 2.854411e-05
## 8725     2 70067 2.854411e-05
## 8726     2 70067 2.854411e-05
## 8727     2 70067 2.854411e-05
## 8728     2 70067 2.854411e-05
## 8729     2 70067 2.854411e-05
## 8730     2 70067 2.854411e-05
## 8731     2 70067 2.854411e-05
## 8732     2 70067 2.854411e-05
## 8733     2 70067 2.854411e-05
## 8734     2 70067 2.854411e-05
## 8735     2 70067 2.854411e-05
## 8736     2 70067 2.854411e-05
## 8737     2 70067 2.854411e-05
## 8738     2 70067 2.854411e-05
## 8739     2 70067 2.854411e-05
## 8740     2 70067 2.854411e-05
## 8741     2 70067 2.854411e-05
## 8742     2 70067 2.854411e-05
## 8743     2 70067 2.854411e-05
## 8744     2 70067 2.854411e-05
## 8745     2 70067 2.854411e-05
## 8746     2 70067 2.854411e-05
## 8747     2 70067 2.854411e-05
## 8748     2 70067 2.854411e-05
## 8749     2 70067 2.854411e-05
## 8750     2 70067 2.854411e-05
## 8751     2 70067 2.854411e-05
## 8752     2 70067 2.854411e-05
## 8753     2 70067 2.854411e-05
## 8754     2 70067 2.854411e-05
## 8755     2 70067 2.854411e-05
## 8756     2 70067 2.854411e-05
## 8757     2 70067 2.854411e-05
## 8758     2 70067 2.854411e-05
## 8759     2 70067 2.854411e-05
## 8760     2 70067 2.854411e-05
## 8761     2 70067 2.854411e-05
## 8762     2 70067 2.854411e-05
## 8763     2 70067 2.854411e-05
## 8764     2 70067 2.854411e-05
## 8765     2 70067 2.854411e-05
## 8766     2 70067 2.854411e-05
## 8767     2 70067 2.854411e-05
## 8768     2 70067 2.854411e-05
## 8769     2 70067 2.854411e-05
## 8770     2 70067 2.854411e-05
## 8771     2 70067 2.854411e-05
## 8772     2 70067 2.854411e-05
## 8773     2 70067 2.854411e-05
## 8774     2 70067 2.854411e-05
## 8775     2 70067 2.854411e-05
## 8776     2 70067 2.854411e-05
## 8777     2 70067 2.854411e-05
## 8778     2 70067 2.854411e-05
## 8779     2 70067 2.854411e-05
## 8780     2 70067 2.854411e-05
## 8781     2 70067 2.854411e-05
## 8782     2 70067 2.854411e-05
## 8783     2 70067 2.854411e-05
## 8784     2 70067 2.854411e-05
## 8785     2 70067 2.854411e-05
## 8786     2 70067 2.854411e-05
## 8787     2 70067 2.854411e-05
## 8788     2 70067 2.854411e-05
## 8789     2 70067 2.854411e-05
## 8790     2 70067 2.854411e-05
## 8791     2 70067 2.854411e-05
## 8792     2 70067 2.854411e-05
## 8793     2 70067 2.854411e-05
## 8794     2 70067 2.854411e-05
## 8795     2 70067 2.854411e-05
## 8796     2 70067 2.854411e-05
## 8797     2 70067 2.854411e-05
## 8798     2 70067 2.854411e-05
## 8799     2 70067 2.854411e-05
## 8800     2 70067 2.854411e-05
## 8801     2 70067 2.854411e-05
## 8802     2 70067 2.854411e-05
## 8803     2 70067 2.854411e-05
## 8804     2 70067 2.854411e-05
## 8805     2 70067 2.854411e-05
## 8806     2 70067 2.854411e-05
## 8807     2 70067 2.854411e-05
## 8808     2 70067 2.854411e-05
## 8809     2 70067 2.854411e-05
## 8810     2 70067 2.854411e-05
## 8811     2 70067 2.854411e-05
## 8812     2 70067 2.854411e-05
## 8813     2 70067 2.854411e-05
## 8814     2 70067 2.854411e-05
## 8815     2 70067 2.854411e-05
## 8816     2 70067 2.854411e-05
## 8817     2 70067 2.854411e-05
## 8818     2 70067 2.854411e-05
## 8819     2 70067 2.854411e-05
## 8820     2 70067 2.854411e-05
## 8821     2 70067 2.854411e-05
## 8822     2 70067 2.854411e-05
## 8823     2 70067 2.854411e-05
## 8824     2 70067 2.854411e-05
## 8825     2 70067 2.854411e-05
## 8826     2 70067 2.854411e-05
## 8827     2 70067 2.854411e-05
## 8828     2 70067 2.854411e-05
## 8829     2 70067 2.854411e-05
## 8830     2 70067 2.854411e-05
## 8831     2 70067 2.854411e-05
## 8832     2 70067 2.854411e-05
## 8833     2 70067 2.854411e-05
## 8834     2 70067 2.854411e-05
## 8835     2 70067 2.854411e-05
## 8836     2 70067 2.854411e-05
## 8837     2 70067 2.854411e-05
## 8838     2 70067 2.854411e-05
## 8839     2 70067 2.854411e-05
## 8840     2 70067 2.854411e-05
## 8841     2 70067 2.854411e-05
## 8842     2 70067 2.854411e-05
## 8843     2 70067 2.854411e-05
## 8844     2 70067 2.854411e-05
## 8845     2 70067 2.854411e-05
## 8846     2 70067 2.854411e-05
## 8847     2 70067 2.854411e-05
## 8848     2 70067 2.854411e-05
## 8849     2 70067 2.854411e-05
## 8850     2 70067 2.854411e-05
## 8851     2 70067 2.854411e-05
## 8852     2 70067 2.854411e-05
## 8853     2 70067 2.854411e-05
## 8854     2 70067 2.854411e-05
## 8855     2 70067 2.854411e-05
## 8856     2 70067 2.854411e-05
## 8857     2 70067 2.854411e-05
## 8858     2 70067 2.854411e-05
## 8859     2 70067 2.854411e-05
## 8860     2 70067 2.854411e-05
## 8861     2 70067 2.854411e-05
## 8862     2 70067 2.854411e-05
## 8863     2 70067 2.854411e-05
## 8864     2 70067 2.854411e-05
## 8865     2 70067 2.854411e-05
## 8866     2 70067 2.854411e-05
## 8867     2 70067 2.854411e-05
## 8868     2 70067 2.854411e-05
## 8869     2 70067 2.854411e-05
## 8870     2 70067 2.854411e-05
## 8871     2 70067 2.854411e-05
## 8872     2 70067 2.854411e-05
## 8873     2 70067 2.854411e-05
## 8874     2 70067 2.854411e-05
## 8875     2 70067 2.854411e-05
## 8876     2 70067 2.854411e-05
## 8877     2 70067 2.854411e-05
## 8878     2 70067 2.854411e-05
## 8879     2 70067 2.854411e-05
## 8880     2 70067 2.854411e-05
## 8881     2 70067 2.854411e-05
## 8882     2 70067 2.854411e-05
## 8883     2 70067 2.854411e-05
## 8884     2 70067 2.854411e-05
## 8885     2 70067 2.854411e-05
## 8886     2 70067 2.854411e-05
## 8887     2 70067 2.854411e-05
## 8888     2 70067 2.854411e-05
## 8889     2 70067 2.854411e-05
## 8890     2 70067 2.854411e-05
## 8891     2 70067 2.854411e-05
## 8892     2 70067 2.854411e-05
## 8893     2 70067 2.854411e-05
## 8894     2 70067 2.854411e-05
## 8895     2 70067 2.854411e-05
## 8896     2 70067 2.854411e-05
## 8897     2 70067 2.854411e-05
## 8898     2 70067 2.854411e-05
## 8899     2 70067 2.854411e-05
## 8900     2 70067 2.854411e-05
## 8901     2 70067 2.854411e-05
## 8902     2 70067 2.854411e-05
## 8903     2 70067 2.854411e-05
## 8904     2 70067 2.854411e-05
## 8905     2 70067 2.854411e-05
## 8906     2 70067 2.854411e-05
## 8907     2 70067 2.854411e-05
## 8908     2 70067 2.854411e-05
## 8909     2 70067 2.854411e-05
## 8910     2 70067 2.854411e-05
## 8911     2 70067 2.854411e-05
## 8912     2 70067 2.854411e-05
## 8913     2 70067 2.854411e-05
## 8914     2 70067 2.854411e-05
## 8915     2 70067 2.854411e-05
## 8916     2 70067 2.854411e-05
## 8917     2 70067 2.854411e-05
## 8918     2 70067 2.854411e-05
## 8919     2 70067 2.854411e-05
## 8920     2 70067 2.854411e-05
## 8921     2 70067 2.854411e-05
## 8922     2 70067 2.854411e-05
## 8923     2 70067 2.854411e-05
## 8924     2 70067 2.854411e-05
## 8925     2 70067 2.854411e-05
## 8926     2 70067 2.854411e-05
## 8927     2 70067 2.854411e-05
## 8928     2 70067 2.854411e-05
## 8929     2 70067 2.854411e-05
## 8930     2 70067 2.854411e-05
## 8931     2 70067 2.854411e-05
## 8932     2 70067 2.854411e-05
## 8933     2 70067 2.854411e-05
## 8934     2 70067 2.854411e-05
## 8935     2 70067 2.854411e-05
## 8936     2 70067 2.854411e-05
## 8937     2 70067 2.854411e-05
## 8938     2 70067 2.854411e-05
## 8939     2 70067 2.854411e-05
## 8940     2 70067 2.854411e-05
## 8941     2 70067 2.854411e-05
## 8942     2 70067 2.854411e-05
## 8943     2 70067 2.854411e-05
## 8944     2 70067 2.854411e-05
## 8945     2 70067 2.854411e-05
## 8946     2 70067 2.854411e-05
## 8947     2 70067 2.854411e-05
## 8948     2 70067 2.854411e-05
## 8949     2 70067 2.854411e-05
## 8950     2 70067 2.854411e-05
## 8951     2 70067 2.854411e-05
## 8952     2 70067 2.854411e-05
## 8953     2 70067 2.854411e-05
## 8954     2 70067 2.854411e-05
## 8955     2 70067 2.854411e-05
## 8956     2 70067 2.854411e-05
## 8957     2 70067 2.854411e-05
## 8958     2 70067 2.854411e-05
## 8959     2 70067 2.854411e-05
## 8960     2 70067 2.854411e-05
## 8961     2 70067 2.854411e-05
## 8962     2 70067 2.854411e-05
## 8963     2 70067 2.854411e-05
## 8964     2 70067 2.854411e-05
## 8965     2 70067 2.854411e-05
## 8966     2 70067 2.854411e-05
## 8967     2 70067 2.854411e-05
## 8968     2 70067 2.854411e-05
## 8969     2 70067 2.854411e-05
## 8970     2 70067 2.854411e-05
## 8971     2 70067 2.854411e-05
## 8972     2 70067 2.854411e-05
## 8973     2 70067 2.854411e-05
## 8974     2 70067 2.854411e-05
## 8975     2 70067 2.854411e-05
## 8976     2 70067 2.854411e-05
## 8977     2 70067 2.854411e-05
## 8978     2 70067 2.854411e-05
## 8979     2 70067 2.854411e-05
## 8980     2 70067 2.854411e-05
## 8981     2 70067 2.854411e-05
## 8982     2 70067 2.854411e-05
## 8983     2 70067 2.854411e-05
## 8984     2 70067 2.854411e-05
## 8985     2 70067 2.854411e-05
## 8986     2 70067 2.854411e-05
## 8987     2 70067 2.854411e-05
## 8988     2 70067 2.854411e-05
## 8989     2 70067 2.854411e-05
## 8990     2 70067 2.854411e-05
## 8991     2 70067 2.854411e-05
## 8992     2 70067 2.854411e-05
## 8993     2 70067 2.854411e-05
## 8994     2 70067 2.854411e-05
## 8995     2 70067 2.854411e-05
## 8996     2 70067 2.854411e-05
## 8997     2 70067 2.854411e-05
## 8998     2 70067 2.854411e-05
## 8999     2 70067 2.854411e-05
## 9000     2 70067 2.854411e-05
## 9001     2 70067 2.854411e-05
## 9002     2 70067 2.854411e-05
## 9003     2 70067 2.854411e-05
## 9004     2 70067 2.854411e-05
## 9005     2 70067 2.854411e-05
## 9006     2 70067 2.854411e-05
## 9007     2 70067 2.854411e-05
## 9008     2 70067 2.854411e-05
## 9009     2 70067 2.854411e-05
## 9010     2 70067 2.854411e-05
## 9011     2 70067 2.854411e-05
## 9012     2 70067 2.854411e-05
## 9013     2 70067 2.854411e-05
## 9014     2 70067 2.854411e-05
## 9015     2 70067 2.854411e-05
## 9016     2 70067 2.854411e-05
## 9017     2 70067 2.854411e-05
## 9018     2 70067 2.854411e-05
## 9019     2 70067 2.854411e-05
## 9020     2 70067 2.854411e-05
## 9021     2 70067 2.854411e-05
## 9022     2 70067 2.854411e-05
## 9023     2 70067 2.854411e-05
## 9024     2 70067 2.854411e-05
## 9025     2 70067 2.854411e-05
## 9026     2 70067 2.854411e-05
## 9027     2 70067 2.854411e-05
## 9028     2 70067 2.854411e-05
## 9029     2 70067 2.854411e-05
## 9030     2 70067 2.854411e-05
## 9031     2 70067 2.854411e-05
## 9032     2 70067 2.854411e-05
## 9033     2 70067 2.854411e-05
## 9034     2 70067 2.854411e-05
## 9035     2 70067 2.854411e-05
## 9036     2 70067 2.854411e-05
## 9037     2 70067 2.854411e-05
## 9038     2 70067 2.854411e-05
## 9039     2 70067 2.854411e-05
## 9040     2 70067 2.854411e-05
## 9041     2 70067 2.854411e-05
## 9042     2 70067 2.854411e-05
## 9043     2 70067 2.854411e-05
## 9044     2 70067 2.854411e-05
## 9045     2 70067 2.854411e-05
## 9046     2 70067 2.854411e-05
## 9047     2 70067 2.854411e-05
## 9048     2 70067 2.854411e-05
## 9049     2 70067 2.854411e-05
## 9050     2 70067 2.854411e-05
## 9051     2 70067 2.854411e-05
## 9052     2 70067 2.854411e-05
## 9053     2 70067 2.854411e-05
## 9054     2 70067 2.854411e-05
## 9055     2 70067 2.854411e-05
## 9056     2 70067 2.854411e-05
## 9057     2 70067 2.854411e-05
## 9058     2 70067 2.854411e-05
## 9059     2 70067 2.854411e-05
## 9060     2 70067 2.854411e-05
## 9061     2 70067 2.854411e-05
## 9062     2 70067 2.854411e-05
## 9063     2 70067 2.854411e-05
## 9064     2 70067 2.854411e-05
## 9065     2 70067 2.854411e-05
## 9066     2 70067 2.854411e-05
## 9067     2 70067 2.854411e-05
## 9068     2 70067 2.854411e-05
## 9069     2 70067 2.854411e-05
## 9070     2 70067 2.854411e-05
## 9071     2 70067 2.854411e-05
## 9072     2 70067 2.854411e-05
## 9073     2 70067 2.854411e-05
## 9074     2 70067 2.854411e-05
## 9075     2 70067 2.854411e-05
## 9076     2 70067 2.854411e-05
## 9077     2 70067 2.854411e-05
## 9078     2 70067 2.854411e-05
## 9079     2 70067 2.854411e-05
## 9080     2 70067 2.854411e-05
## 9081     2 70067 2.854411e-05
## 9082     2 70067 2.854411e-05
## 9083     2 70067 2.854411e-05
## 9084     2 70067 2.854411e-05
## 9085     2 70067 2.854411e-05
## 9086     2 70067 2.854411e-05
## 9087     2 70067 2.854411e-05
## 9088     2 70067 2.854411e-05
## 9089     2 70067 2.854411e-05
## 9090     2 70067 2.854411e-05
## 9091     2 70067 2.854411e-05
## 9092     2 70067 2.854411e-05
## 9093     2 70067 2.854411e-05
## 9094     2 70067 2.854411e-05
## 9095     2 70067 2.854411e-05
## 9096     2 70067 2.854411e-05
## 9097     2 70067 2.854411e-05
## 9098     2 70067 2.854411e-05
## 9099     2 70067 2.854411e-05
## 9100     2 70067 2.854411e-05
## 9101     2 70067 2.854411e-05
## 9102     2 70067 2.854411e-05
## 9103     2 70067 2.854411e-05
## 9104     2 70067 2.854411e-05
## 9105     2 70067 2.854411e-05
## 9106     2 70067 2.854411e-05
## 9107     2 70067 2.854411e-05
## 9108     2 70067 2.854411e-05
## 9109     2 70067 2.854411e-05
## 9110     2 70067 2.854411e-05
## 9111     2 70067 2.854411e-05
## 9112     2 70067 2.854411e-05
## 9113     2 70067 2.854411e-05
## 9114     2 70067 2.854411e-05
## 9115     2 70067 2.854411e-05
## 9116     2 70067 2.854411e-05
## 9117     2 70067 2.854411e-05
## 9118     2 70067 2.854411e-05
## 9119     2 70067 2.854411e-05
## 9120     2 70067 2.854411e-05
## 9121     2 70067 2.854411e-05
## 9122     2 70067 2.854411e-05
## 9123     2 70067 2.854411e-05
## 9124     2 70067 2.854411e-05
## 9125     2 70067 2.854411e-05
## 9126     2 70067 2.854411e-05
## 9127     2 70067 2.854411e-05
## 9128     2 70067 2.854411e-05
## 9129     2 70067 2.854411e-05
## 9130     2 70067 2.854411e-05
## 9131     2 70067 2.854411e-05
## 9132     2 70067 2.854411e-05
## 9133     2 70067 2.854411e-05
## 9134     2 70067 2.854411e-05
## 9135     2 70067 2.854411e-05
## 9136     2 70067 2.854411e-05
## 9137     2 70067 2.854411e-05
## 9138     2 70067 2.854411e-05
## 9139     2 70067 2.854411e-05
## 9140     2 70067 2.854411e-05
## 9141     2 70067 2.854411e-05
## 9142     2 70067 2.854411e-05
## 9143     2 70067 2.854411e-05
## 9144     2 70067 2.854411e-05
## 9145     2 70067 2.854411e-05
## 9146     2 70067 2.854411e-05
## 9147     2 70067 2.854411e-05
## 9148     2 70067 2.854411e-05
## 9149     2 70067 2.854411e-05
## 9150     2 70067 2.854411e-05
## 9151     2 70067 2.854411e-05
## 9152     2 70067 2.854411e-05
## 9153     2 70067 2.854411e-05
## 9154     2 70067 2.854411e-05
## 9155     2 70067 2.854411e-05
## 9156     2 70067 2.854411e-05
## 9157     2 70067 2.854411e-05
## 9158     2 70067 2.854411e-05
## 9159     2 70067 2.854411e-05
## 9160     2 70067 2.854411e-05
## 9161     2 70067 2.854411e-05
## 9162     2 70067 2.854411e-05
## 9163     2 70067 2.854411e-05
## 9164     2 70067 2.854411e-05
## 9165     2 70067 2.854411e-05
## 9166     2 70067 2.854411e-05
## 9167     2 70067 2.854411e-05
## 9168     2 70067 2.854411e-05
## 9169     2 70067 2.854411e-05
## 9170     2 70067 2.854411e-05
## 9171     2 70067 2.854411e-05
## 9172     2 70067 2.854411e-05
## 9173     2 70067 2.854411e-05
## 9174     2 70067 2.854411e-05
## 9175     2 70067 2.854411e-05
## 9176     2 70067 2.854411e-05
## 9177     2 70067 2.854411e-05
## 9178     2 70067 2.854411e-05
## 9179     2 70067 2.854411e-05
## 9180     2 70067 2.854411e-05
## 9181     2 70067 2.854411e-05
## 9182     2 70067 2.854411e-05
## 9183     2 70067 2.854411e-05
## 9184     2 70067 2.854411e-05
## 9185     2 70067 2.854411e-05
## 9186     2 70067 2.854411e-05
## 9187     2 70067 2.854411e-05
## 9188     2 70067 2.854411e-05
## 9189     2 70067 2.854411e-05
## 9190     2 70067 2.854411e-05
## 9191     2 70067 2.854411e-05
## 9192     2 70067 2.854411e-05
## 9193     2 70067 2.854411e-05
## 9194     2 70067 2.854411e-05
## 9195     2 70067 2.854411e-05
## 9196     2 70067 2.854411e-05
## 9197     2 70067 2.854411e-05
## 9198     2 70067 2.854411e-05
## 9199     2 70067 2.854411e-05
## 9200     2 70067 2.854411e-05
## 9201     2 70067 2.854411e-05
## 9202     2 70067 2.854411e-05
## 9203     2 70067 2.854411e-05
## 9204     2 70067 2.854411e-05
## 9205     2 70067 2.854411e-05
## 9206     2 70067 2.854411e-05
## 9207     2 70067 2.854411e-05
## 9208     2 70067 2.854411e-05
## 9209     2 70067 2.854411e-05
## 9210     2 70067 2.854411e-05
## 9211     2 70067 2.854411e-05
## 9212     2 70067 2.854411e-05
## 9213     2 70067 2.854411e-05
## 9214     2 70067 2.854411e-05
## 9215     2 70067 2.854411e-05
## 9216     2 70067 2.854411e-05
## 9217     2 70067 2.854411e-05
## 9218     2 70067 2.854411e-05
## 9219     2 70067 2.854411e-05
## 9220     2 70067 2.854411e-05
## 9221     2 70067 2.854411e-05
## 9222     2 70067 2.854411e-05
## 9223     2 70067 2.854411e-05
## 9224     2 70067 2.854411e-05
## 9225     2 70067 2.854411e-05
## 9226     2 70067 2.854411e-05
## 9227     2 70067 2.854411e-05
## 9228     2 70067 2.854411e-05
## 9229     2 70067 2.854411e-05
## 9230     2 70067 2.854411e-05
## 9231     2 70067 2.854411e-05
## 9232     2 70067 2.854411e-05
## 9233     2 70067 2.854411e-05
## 9234     2 70067 2.854411e-05
## 9235     2 70067 2.854411e-05
## 9236     2 70067 2.854411e-05
## 9237     2 70067 2.854411e-05
## 9238     2 70067 2.854411e-05
## 9239     2 70067 2.854411e-05
## 9240     2 70067 2.854411e-05
## 9241     2 70067 2.854411e-05
## 9242     2 70067 2.854411e-05
## 9243     2 70067 2.854411e-05
## 9244     2 70067 2.854411e-05
## 9245     2 70067 2.854411e-05
## 9246     2 70067 2.854411e-05
## 9247     2 70067 2.854411e-05
## 9248     2 70067 2.854411e-05
## 9249     2 70067 2.854411e-05
## 9250     2 70067 2.854411e-05
## 9251     2 70067 2.854411e-05
## 9252     2 70067 2.854411e-05
## 9253     2 70067 2.854411e-05
## 9254     2 70067 2.854411e-05
## 9255     2 70067 2.854411e-05
## 9256     2 70067 2.854411e-05
## 9257     2 70067 2.854411e-05
## 9258     2 70067 2.854411e-05
## 9259     2 70067 2.854411e-05
## 9260     2 70067 2.854411e-05
## 9261     2 70067 2.854411e-05
## 9262     2 70067 2.854411e-05
## 9263     2 70067 2.854411e-05
## 9264     2 70067 2.854411e-05
## 9265     2 70067 2.854411e-05
## 9266     2 70067 2.854411e-05
## 9267     2 70067 2.854411e-05
## 9268     2 70067 2.854411e-05
## 9269     2 70067 2.854411e-05
## 9270     2 70067 2.854411e-05
## 9271     2 70067 2.854411e-05
## 9272     2 70067 2.854411e-05
## 9273     2 70067 2.854411e-05
## 9274     2 70067 2.854411e-05
## 9275     2 70067 2.854411e-05
## 9276     2 70067 2.854411e-05
## 9277     2 70067 2.854411e-05
## 9278     2 70067 2.854411e-05
## 9279     2 70067 2.854411e-05
## 9280     2 70067 2.854411e-05
## 9281     2 70067 2.854411e-05
## 9282     2 70067 2.854411e-05
## 9283     2 70067 2.854411e-05
## 9284     2 70067 2.854411e-05
## 9285     2 70067 2.854411e-05
## 9286     2 70067 2.854411e-05
## 9287     2 70067 2.854411e-05
## 9288     2 70067 2.854411e-05
## 9289     2 70067 2.854411e-05
## 9290     2 70067 2.854411e-05
## 9291     2 70067 2.854411e-05
## 9292     2 70067 2.854411e-05
## 9293     2 70067 2.854411e-05
## 9294     2 70067 2.854411e-05
## 9295     2 70067 2.854411e-05
## 9296     2 70067 2.854411e-05
## 9297     2 70067 2.854411e-05
## 9298     2 70067 2.854411e-05
## 9299     2 70067 2.854411e-05
## 9300     2 70067 2.854411e-05
## 9301     2 70067 2.854411e-05
## 9302     2 70067 2.854411e-05
## 9303     2 70067 2.854411e-05
## 9304     2 70067 2.854411e-05
## 9305     2 70067 2.854411e-05
## 9306     2 70067 2.854411e-05
## 9307     2 70067 2.854411e-05
## 9308     2 70067 2.854411e-05
## 9309     2 70067 2.854411e-05
## 9310     2 70067 2.854411e-05
## 9311     2 70067 2.854411e-05
## 9312     2 70067 2.854411e-05
## 9313     2 70067 2.854411e-05
## 9314     2 70067 2.854411e-05
## 9315     2 70067 2.854411e-05
## 9316     2 70067 2.854411e-05
## 9317     2 70067 2.854411e-05
## 9318     2 70067 2.854411e-05
## 9319     2 70067 2.854411e-05
## 9320     2 70067 2.854411e-05
## 9321     2 70067 2.854411e-05
## 9322     2 70067 2.854411e-05
## 9323     2 70067 2.854411e-05
## 9324     2 70067 2.854411e-05
## 9325     2 70067 2.854411e-05
## 9326     2 70067 2.854411e-05
## 9327     2 70067 2.854411e-05
## 9328     2 70067 2.854411e-05
## 9329     2 70067 2.854411e-05
## 9330     2 70067 2.854411e-05
## 9331     2 70067 2.854411e-05
## 9332     2 70067 2.854411e-05
## 9333     2 70067 2.854411e-05
## 9334     2 70067 2.854411e-05
## 9335     2 70067 2.854411e-05
## 9336     2 70067 2.854411e-05
## 9337     2 70067 2.854411e-05
## 9338     2 70067 2.854411e-05
## 9339     2 70067 2.854411e-05
## 9340     2 70067 2.854411e-05
## 9341     2 70067 2.854411e-05
## 9342     2 70067 2.854411e-05
## 9343     2 70067 2.854411e-05
## 9344     2 70067 2.854411e-05
## 9345     2 70067 2.854411e-05
## 9346     2 70067 2.854411e-05
## 9347     2 70067 2.854411e-05
## 9348     2 70067 2.854411e-05
## 9349     2 70067 2.854411e-05
## 9350     2 70067 2.854411e-05
## 9351     2 70067 2.854411e-05
## 9352     2 70067 2.854411e-05
## 9353     2 70067 2.854411e-05
## 9354     2 70067 2.854411e-05
## 9355     2 70067 2.854411e-05
## 9356     2 70067 2.854411e-05
## 9357     2 70067 2.854411e-05
## 9358     2 70067 2.854411e-05
## 9359     2 70067 2.854411e-05
## 9360     2 70067 2.854411e-05
## 9361     2 70067 2.854411e-05
## 9362     2 70067 2.854411e-05
## 9363     2 70067 2.854411e-05
## 9364     2 70067 2.854411e-05
## 9365     2 70067 2.854411e-05
## 9366     2 70067 2.854411e-05
## 9367     2 70067 2.854411e-05
## 9368     2 70067 2.854411e-05
## 9369     2 70067 2.854411e-05
## 9370     2 70067 2.854411e-05
## 9371     2 70067 2.854411e-05
## 9372     2 70067 2.854411e-05
## 9373     2 70067 2.854411e-05
## 9374     2 70067 2.854411e-05
## 9375     2 70067 2.854411e-05
## 9376     2 70067 2.854411e-05
## 9377     2 70067 2.854411e-05
## 9378     2 70067 2.854411e-05
## 9379     2 70067 2.854411e-05
## 9380     2 70067 2.854411e-05
## 9381     2 70067 2.854411e-05
## 9382     2 70067 2.854411e-05
## 9383     2 70067 2.854411e-05
## 9384     2 70067 2.854411e-05
## 9385     2 70067 2.854411e-05
## 9386     2 70067 2.854411e-05
## 9387     2 70067 2.854411e-05
## 9388     2 70067 2.854411e-05
## 9389     2 70067 2.854411e-05
## 9390     2 70067 2.854411e-05
## 9391     2 70067 2.854411e-05
## 9392     2 70067 2.854411e-05
## 9393     2 70067 2.854411e-05
## 9394     2 70067 2.854411e-05
## 9395     2 70067 2.854411e-05
## 9396     2 70067 2.854411e-05
## 9397     2 70067 2.854411e-05
## 9398     2 70067 2.854411e-05
## 9399     2 70067 2.854411e-05
## 9400     2 70067 2.854411e-05
## 9401     2 70067 2.854411e-05
## 9402     2 70067 2.854411e-05
## 9403     2 70067 2.854411e-05
## 9404     2 70067 2.854411e-05
## 9405     2 70067 2.854411e-05
## 9406     2 70067 2.854411e-05
## 9407     2 70067 2.854411e-05
## 9408     2 70067 2.854411e-05
## 9409     2 70067 2.854411e-05
## 9410     2 70067 2.854411e-05
## 9411     2 70067 2.854411e-05
## 9412     2 70067 2.854411e-05
## 9413     2 70067 2.854411e-05
## 9414     2 70067 2.854411e-05
## 9415     2 70067 2.854411e-05
## 9416     2 70067 2.854411e-05
## 9417     2 70067 2.854411e-05
## 9418     2 70067 2.854411e-05
## 9419     2 70067 2.854411e-05
## 9420     2 70067 2.854411e-05
## 9421     2 70067 2.854411e-05
## 9422     2 70067 2.854411e-05
## 9423     2 70067 2.854411e-05
## 9424     2 70067 2.854411e-05
## 9425     2 70067 2.854411e-05
## 9426     2 70067 2.854411e-05
## 9427     2 70067 2.854411e-05
## 9428     2 70067 2.854411e-05
## 9429     2 70067 2.854411e-05
## 9430     2 70067 2.854411e-05
## 9431     2 70067 2.854411e-05
## 9432     2 70067 2.854411e-05
## 9433     2 70067 2.854411e-05
## 9434     2 70067 2.854411e-05
## 9435     2 70067 2.854411e-05
## 9436     2 70067 2.854411e-05
## 9437     2 70067 2.854411e-05
## 9438     2 70067 2.854411e-05
## 9439     2 70067 2.854411e-05
## 9440     2 70067 2.854411e-05
## 9441     2 70067 2.854411e-05
## 9442     2 70067 2.854411e-05
## 9443     2 70067 2.854411e-05
## 9444     2 70067 2.854411e-05
## 9445     2 70067 2.854411e-05
## 9446     2 70067 2.854411e-05
## 9447     2 70067 2.854411e-05
## 9448     2 70067 2.854411e-05
## 9449     2 70067 2.854411e-05
## 9450     2 70067 2.854411e-05
## 9451     2 70067 2.854411e-05
## 9452     2 70067 2.854411e-05
## 9453     2 70067 2.854411e-05
## 9454     2 70067 2.854411e-05
## 9455     2 70067 2.854411e-05
## 9456     2 70067 2.854411e-05
## 9457     2 70067 2.854411e-05
## 9458     2 70067 2.854411e-05
## 9459     2 70067 2.854411e-05
## 9460     2 70067 2.854411e-05
## 9461     2 70067 2.854411e-05
## 9462     2 70067 2.854411e-05
## 9463     2 70067 2.854411e-05
## 9464     2 70067 2.854411e-05
## 9465     2 70067 2.854411e-05
## 9466     2 70067 2.854411e-05
## 9467     2 70067 2.854411e-05
## 9468     2 70067 2.854411e-05
## 9469     2 70067 2.854411e-05
## 9470     2 70067 2.854411e-05
## 9471     2 70067 2.854411e-05
## 9472     2 70067 2.854411e-05
## 9473     2 70067 2.854411e-05
## 9474     2 70067 2.854411e-05
## 9475     2 70067 2.854411e-05
## 9476     2 70067 2.854411e-05
## 9477     2 70067 2.854411e-05
## 9478     2 70067 2.854411e-05
## 9479     2 70067 2.854411e-05
## 9480     2 70067 2.854411e-05
## 9481     2 70067 2.854411e-05
## 9482     2 70067 2.854411e-05
## 9483     2 70067 2.854411e-05
## 9484     2 70067 2.854411e-05
## 9485     2 70067 2.854411e-05
## 9486     2 70067 2.854411e-05
## 9487     2 70067 2.854411e-05
## 9488     2 70067 2.854411e-05
## 9489     2 70067 2.854411e-05
## 9490     2 70067 2.854411e-05
## 9491     2 70067 2.854411e-05
## 9492     2 70067 2.854411e-05
## 9493     2 70067 2.854411e-05
## 9494     2 70067 2.854411e-05
## 9495     2 70067 2.854411e-05
## 9496     2 70067 2.854411e-05
## 9497     2 70067 2.854411e-05
## 9498     2 70067 2.854411e-05
## 9499     2 70067 2.854411e-05
## 9500     2 70067 2.854411e-05
## 9501     2 70067 2.854411e-05
## 9502     2 70067 2.854411e-05
## 9503     2 70067 2.854411e-05
## 9504     2 70067 2.854411e-05
## 9505     2 70067 2.854411e-05
## 9506     2 70067 2.854411e-05
## 9507     2 70067 2.854411e-05
## 9508     2 70067 2.854411e-05
## 9509     2 70067 2.854411e-05
## 9510     2 70067 2.854411e-05
## 9511     2 70067 2.854411e-05
## 9512     2 70067 2.854411e-05
## 9513     2 70067 2.854411e-05
## 9514     2 70067 2.854411e-05
## 9515     2 70067 2.854411e-05
## 9516     2 70067 2.854411e-05
## 9517     2 70067 2.854411e-05
## 9518     2 70067 2.854411e-05
## 9519     2 70067 2.854411e-05
## 9520     2 70067 2.854411e-05
## 9521     2 70067 2.854411e-05
## 9522     2 70067 2.854411e-05
## 9523     2 70067 2.854411e-05
## 9524     2 70067 2.854411e-05
## 9525     2 70067 2.854411e-05
## 9526     2 70067 2.854411e-05
## 9527     2 70067 2.854411e-05
## 9528     2 70067 2.854411e-05
## 9529     2 70067 2.854411e-05
## 9530     2 70067 2.854411e-05
## 9531     2 70067 2.854411e-05
## 9532     2 70067 2.854411e-05
## 9533     2 70067 2.854411e-05
## 9534     2 70067 2.854411e-05
## 9535     2 70067 2.854411e-05
## 9536     2 70067 2.854411e-05
## 9537     2 70067 2.854411e-05
## 9538     2 70067 2.854411e-05
## 9539     2 70067 2.854411e-05
## 9540     2 70067 2.854411e-05
## 9541     2 70067 2.854411e-05
## 9542     2 70067 2.854411e-05
## 9543     2 70067 2.854411e-05
## 9544     2 70067 2.854411e-05
## 9545     2 70067 2.854411e-05
## 9546     2 70067 2.854411e-05
## 9547     2 70067 2.854411e-05
## 9548     2 70067 2.854411e-05
## 9549     2 70067 2.854411e-05
## 9550     2 70067 2.854411e-05
## 9551     2 70067 2.854411e-05
## 9552     2 70067 2.854411e-05
## 9553     2 70067 2.854411e-05
## 9554     2 70067 2.854411e-05
## 9555     2 70067 2.854411e-05
## 9556     2 70067 2.854411e-05
## 9557     2 70067 2.854411e-05
## 9558     2 70067 2.854411e-05
## 9559     2 70067 2.854411e-05
## 9560     2 70067 2.854411e-05
## 9561     2 70067 2.854411e-05
## 9562     2 70067 2.854411e-05
## 9563     2 70067 2.854411e-05
## 9564     2 70067 2.854411e-05
## 9565     2 70067 2.854411e-05
## 9566     2 70067 2.854411e-05
## 9567     2 70067 2.854411e-05
## 9568     2 70067 2.854411e-05
## 9569     2 70067 2.854411e-05
## 9570     2 70067 2.854411e-05
## 9571     2 70067 2.854411e-05
## 9572     2 70067 2.854411e-05
## 9573     2 70067 2.854411e-05
## 9574     2 70067 2.854411e-05
## 9575     2 70067 2.854411e-05
## 9576     2 70067 2.854411e-05
## 9577     2 70067 2.854411e-05
## 9578     2 70067 2.854411e-05
## 9579     2 70067 2.854411e-05
## 9580     2 70067 2.854411e-05
## 9581     2 70067 2.854411e-05
## 9582     2 70067 2.854411e-05
## 9583     2 70067 2.854411e-05
## 9584     2 70067 2.854411e-05
## 9585     2 70067 2.854411e-05
## 9586     2 70067 2.854411e-05
## 9587     2 70067 2.854411e-05
## 9588     2 70067 2.854411e-05
## 9589     2 70067 2.854411e-05
## 9590     2 70067 2.854411e-05
## 9591     2 70067 2.854411e-05
## 9592     2 70067 2.854411e-05
## 9593     2 70067 2.854411e-05
## 9594     2 70067 2.854411e-05
## 9595     2 70067 2.854411e-05
## 9596     2 70067 2.854411e-05
## 9597     2 70067 2.854411e-05
## 9598     2 70067 2.854411e-05
## 9599     2 70067 2.854411e-05
## 9600     2 70067 2.854411e-05
## 9601     2 70067 2.854411e-05
## 9602     2 70067 2.854411e-05
## 9603     2 70067 2.854411e-05
## 9604     2 70067 2.854411e-05
## 9605     2 70067 2.854411e-05
## 9606     2 70067 2.854411e-05
## 9607     2 70067 2.854411e-05
## 9608     2 70067 2.854411e-05
## 9609     2 70067 2.854411e-05
## 9610     2 70067 2.854411e-05
## 9611     2 70067 2.854411e-05
## 9612     2 70067 2.854411e-05
## 9613     2 70067 2.854411e-05
## 9614     2 70067 2.854411e-05
## 9615     2 70067 2.854411e-05
## 9616     2 70067 2.854411e-05
## 9617     2 70067 2.854411e-05
## 9618     2 70067 2.854411e-05
## 9619     2 70067 2.854411e-05
## 9620     2 70067 2.854411e-05
## 9621     2 70067 2.854411e-05
## 9622     2 70067 2.854411e-05
## 9623     2 70067 2.854411e-05
## 9624     2 70067 2.854411e-05
## 9625     2 70067 2.854411e-05
## 9626     2 70067 2.854411e-05
## 9627     2 70067 2.854411e-05
## 9628     2 70067 2.854411e-05
## 9629     2 70067 2.854411e-05
## 9630     2 70067 2.854411e-05
## 9631     2 70067 2.854411e-05
## 9632     2 70067 2.854411e-05
## 9633     2 70067 2.854411e-05
## 9634     2 70067 2.854411e-05
## 9635     2 70067 2.854411e-05
## 9636     2 70067 2.854411e-05
## 9637     2 70067 2.854411e-05
## 9638     2 70067 2.854411e-05
## 9639     2 70067 2.854411e-05
## 9640     2 70067 2.854411e-05
## 9641     2 70067 2.854411e-05
## 9642     2 70067 2.854411e-05
## 9643     2 70067 2.854411e-05
## 9644     2 70067 2.854411e-05
## 9645     2 70067 2.854411e-05
## 9646     2 70067 2.854411e-05
## 9647     2 70067 2.854411e-05
## 9648     2 70067 2.854411e-05
## 9649     2 70067 2.854411e-05
## 9650     2 70067 2.854411e-05
## 9651     2 70067 2.854411e-05
## 9652     2 70067 2.854411e-05
## 9653     2 70067 2.854411e-05
## 9654     2 70067 2.854411e-05
## 9655     2 70067 2.854411e-05
## 9656     2 70067 2.854411e-05
## 9657     2 70067 2.854411e-05
## 9658     2 70067 2.854411e-05
## 9659     2 70067 2.854411e-05
## 9660     2 70067 2.854411e-05
## 9661     2 70067 2.854411e-05
## 9662     2 70067 2.854411e-05
## 9663     2 70067 2.854411e-05
## 9664     2 70067 2.854411e-05
## 9665     2 70067 2.854411e-05
## 9666     2 70067 2.854411e-05
## 9667     2 70067 2.854411e-05
## 9668     2 70067 2.854411e-05
## 9669     2 70067 2.854411e-05
## 9670     2 70067 2.854411e-05
## 9671     2 70067 2.854411e-05
## 9672     2 70067 2.854411e-05
## 9673     2 70067 2.854411e-05
## 9674     2 70067 2.854411e-05
## 9675     2 70067 2.854411e-05
## 9676     2 70067 2.854411e-05
## 9677     2 70067 2.854411e-05
## 9678     2 70067 2.854411e-05
## 9679     2 70067 2.854411e-05
## 9680     2 70067 2.854411e-05
## 9681     2 70067 2.854411e-05
## 9682     2 70067 2.854411e-05
## 9683     2 70067 2.854411e-05
## 9684     2 70067 2.854411e-05
## 9685     2 70067 2.854411e-05
## 9686     2 70067 2.854411e-05
## 9687     2 70067 2.854411e-05
## 9688     2 70067 2.854411e-05
## 9689     2 70067 2.854411e-05
## 9690     2 70067 2.854411e-05
## 9691     2 70067 2.854411e-05
## 9692     2 70067 2.854411e-05
## 9693     2 70067 2.854411e-05
## 9694     2 70067 2.854411e-05
## 9695     2 70067 2.854411e-05
## 9696     2 70067 2.854411e-05
## 9697     2 70067 2.854411e-05
## 9698     2 70067 2.854411e-05
## 9699     2 70067 2.854411e-05
## 9700     2 70067 2.854411e-05
## 9701     2 70067 2.854411e-05
## 9702     2 70067 2.854411e-05
## 9703     2 70067 2.854411e-05
## 9704     2 70067 2.854411e-05
## 9705     2 70067 2.854411e-05
## 9706     2 70067 2.854411e-05
## 9707     2 70067 2.854411e-05
## 9708     2 70067 2.854411e-05
## 9709     2 70067 2.854411e-05
## 9710     2 70067 2.854411e-05
## 9711     2 70067 2.854411e-05
## 9712     2 70067 2.854411e-05
## 9713     2 70067 2.854411e-05
## 9714     2 70067 2.854411e-05
## 9715     2 70067 2.854411e-05
## 9716     2 70067 2.854411e-05
## 9717     2 70067 2.854411e-05
## 9718     2 70067 2.854411e-05
## 9719     2 70067 2.854411e-05
## 9720     2 70067 2.854411e-05
## 9721     2 70067 2.854411e-05
## 9722     2 70067 2.854411e-05
## 9723     2 70067 2.854411e-05
## 9724     2 70067 2.854411e-05
## 9725     2 70067 2.854411e-05
## 9726     2 70067 2.854411e-05
## 9727     2 70067 2.854411e-05
## 9728     2 70067 2.854411e-05
## 9729     2 70067 2.854411e-05
## 9730     2 70067 2.854411e-05
## 9731     2 70067 2.854411e-05
## 9732     2 70067 2.854411e-05
## 9733     2 70067 2.854411e-05
## 9734     2 70067 2.854411e-05
## 9735     2 70067 2.854411e-05
## 9736     2 70067 2.854411e-05
## 9737     2 70067 2.854411e-05
## 9738     2 70067 2.854411e-05
## 9739     2 70067 2.854411e-05
## 9740     2 70067 2.854411e-05
## 9741     2 70067 2.854411e-05
## 9742     2 70067 2.854411e-05
## 9743     2 70067 2.854411e-05
## 9744     2 70067 2.854411e-05
## 9745     2 70067 2.854411e-05
## 9746     2 70067 2.854411e-05
## 9747     2 70067 2.854411e-05
## 9748     2 70067 2.854411e-05
## 9749     2 70067 2.854411e-05
## 9750     2 70067 2.854411e-05
## 9751     2 70067 2.854411e-05
## 9752     2 70067 2.854411e-05
## 9753     2 70067 2.854411e-05
## 9754     2 70067 2.854411e-05
## 9755     2 70067 2.854411e-05
## 9756     2 70067 2.854411e-05
## 9757     2 70067 2.854411e-05
## 9758     2 70067 2.854411e-05
## 9759     2 70067 2.854411e-05
## 9760     2 70067 2.854411e-05
## 9761     2 70067 2.854411e-05
## 9762     2 70067 2.854411e-05
## 9763     2 70067 2.854411e-05
## 9764     2 70067 2.854411e-05
## 9765     2 70067 2.854411e-05
## 9766     2 70067 2.854411e-05
## 9767     2 70067 2.854411e-05
## 9768     2 70067 2.854411e-05
## 9769     2 70067 2.854411e-05
## 9770     2 70067 2.854411e-05
## 9771     2 70067 2.854411e-05
## 9772     2 70067 2.854411e-05
## 9773     2 70067 2.854411e-05
## 9774     2 70067 2.854411e-05
## 9775     2 70067 2.854411e-05
## 9776     2 70067 2.854411e-05
## 9777     2 70067 2.854411e-05
## 9778     2 70067 2.854411e-05
## 9779     2 70067 2.854411e-05
## 9780     2 70067 2.854411e-05
## 9781     2 70067 2.854411e-05
## 9782     2 70067 2.854411e-05
## 9783     2 70067 2.854411e-05
## 9784     2 70067 2.854411e-05
## 9785     2 70067 2.854411e-05
## 9786     2 70067 2.854411e-05
## 9787     2 70067 2.854411e-05
## 9788     2 70067 2.854411e-05
## 9789     2 70067 2.854411e-05
## 9790     2 70067 2.854411e-05
## 9791     2 70067 2.854411e-05
## 9792     2 70067 2.854411e-05
## 9793     2 70067 2.854411e-05
## 9794     2 70067 2.854411e-05
## 9795     2 70067 2.854411e-05
## 9796     2 70067 2.854411e-05
## 9797     2 70067 2.854411e-05
## 9798     2 70067 2.854411e-05
## 9799     2 70067 2.854411e-05
## 9800     2 70067 2.854411e-05
## 9801     2 70067 2.854411e-05
## 9802     2 70067 2.854411e-05
## 9803     2 70067 2.854411e-05
## 9804     2 70067 2.854411e-05
## 9805     2 70067 2.854411e-05
## 9806     2 70067 2.854411e-05
## 9807     2 70067 2.854411e-05
## 9808     2 70067 2.854411e-05
## 9809     2 70067 2.854411e-05
## 9810     2 70067 2.854411e-05
## 9811     2 70067 2.854411e-05
## 9812     2 70067 2.854411e-05
## 9813     2 70067 2.854411e-05
## 9814     2 70067 2.854411e-05
## 9815     2 70067 2.854411e-05
## 9816     2 70067 2.854411e-05
## 9817     2 70067 2.854411e-05
## 9818     2 70067 2.854411e-05
## 9819     2 70067 2.854411e-05
## 9820     2 70067 2.854411e-05
## 9821     2 70067 2.854411e-05
## 9822     2 70067 2.854411e-05
## 9823     2 70067 2.854411e-05
## 9824     2 70067 2.854411e-05
## 9825     2 70067 2.854411e-05
## 9826     2 70067 2.854411e-05
## 9827     2 70067 2.854411e-05
## 9828     2 70067 2.854411e-05
## 9829     2 70067 2.854411e-05
## 9830     2 70067 2.854411e-05
## 9831     2 70067 2.854411e-05
## 9832     2 70067 2.854411e-05
## 9833     2 70067 2.854411e-05
## 9834     2 70067 2.854411e-05
## 9835     2 70067 2.854411e-05
## 9836     2 70067 2.854411e-05
## 9837     2 70067 2.854411e-05
## 9838     2 70067 2.854411e-05
## 9839     2 70067 2.854411e-05
## 9840     2 70067 2.854411e-05
## 9841     2 70067 2.854411e-05
## 9842     2 70067 2.854411e-05
## 9843     2 70067 2.854411e-05
## 9844     2 70067 2.854411e-05
## 9845     2 70067 2.854411e-05
## 9846     2 70067 2.854411e-05
## 9847     2 70067 2.854411e-05
## 9848     2 70067 2.854411e-05
## 9849     2 70067 2.854411e-05
## 9850     2 70067 2.854411e-05
## 9851     2 70067 2.854411e-05
## 9852     2 70067 2.854411e-05
## 9853     2 70067 2.854411e-05
## 9854     2 70067 2.854411e-05
## 9855     2 70067 2.854411e-05
## 9856     2 70067 2.854411e-05
## 9857     2 70067 2.854411e-05
## 9858     2 70067 2.854411e-05
## 9859     2 70067 2.854411e-05
## 9860     2 70067 2.854411e-05
## 9861     2 70067 2.854411e-05
## 9862     2 70067 2.854411e-05
## 9863     2 70067 2.854411e-05
## 9864     2 70067 2.854411e-05
## 9865     2 70067 2.854411e-05
## 9866     2 70067 2.854411e-05
## 9867     2 70067 2.854411e-05
## 9868     2 70067 2.854411e-05
## 9869     2 70067 2.854411e-05
## 9870     2 70067 2.854411e-05
## 9871     2 70067 2.854411e-05
## 9872     2 70067 2.854411e-05
## 9873     2 70067 2.854411e-05
## 9874     2 70067 2.854411e-05
## 9875     2 70067 2.854411e-05
## 9876     2 70067 2.854411e-05
## 9877     2 70067 2.854411e-05
## 9878     2 70067 2.854411e-05
## 9879     2 70067 2.854411e-05
## 9880     2 70067 2.854411e-05
## 9881     2 70067 2.854411e-05
## 9882     2 70067 2.854411e-05
## 9883     2 70067 2.854411e-05
## 9884     2 70067 2.854411e-05
## 9885     2 70067 2.854411e-05
## 9886     2 70067 2.854411e-05
## 9887     2 70067 2.854411e-05
## 9888     2 70067 2.854411e-05
## 9889     2 70067 2.854411e-05
## 9890     2 70067 2.854411e-05
## 9891     2 70067 2.854411e-05
## 9892     2 70067 2.854411e-05
## 9893     2 70067 2.854411e-05
## 9894     2 70067 2.854411e-05
## 9895     2 70067 2.854411e-05
## 9896     2 70067 2.854411e-05
## 9897     2 70067 2.854411e-05
## 9898     2 70067 2.854411e-05
## 9899     2 70067 2.854411e-05
## 9900     2 70067 2.854411e-05
## 9901     2 70067 2.854411e-05
## 9902     2 70067 2.854411e-05
## 9903     2 70067 2.854411e-05
## 9904     2 70067 2.854411e-05
## 9905     2 70067 2.854411e-05
## 9906     2 70067 2.854411e-05
## 9907     2 70067 2.854411e-05
## 9908     2 70067 2.854411e-05
## 9909     2 70067 2.854411e-05
## 9910     2 70067 2.854411e-05
## 9911     2 70067 2.854411e-05
## 9912     2 70067 2.854411e-05
## 9913     2 70067 2.854411e-05
## 9914     2 70067 2.854411e-05
## 9915     2 70067 2.854411e-05
## 9916     2 70067 2.854411e-05
## 9917     2 70067 2.854411e-05
## 9918     2 70067 2.854411e-05
## 9919     2 70067 2.854411e-05
## 9920     2 70067 2.854411e-05
## 9921     2 70067 2.854411e-05
## 9922     2 70067 2.854411e-05
## 9923     2 70067 2.854411e-05
## 9924     2 70067 2.854411e-05
## 9925     2 70067 2.854411e-05
## 9926     2 70067 2.854411e-05
## 9927     2 70067 2.854411e-05
## 9928     2 70067 2.854411e-05
## 9929     2 70067 2.854411e-05
## 9930     2 70067 2.854411e-05
## 9931     2 70067 2.854411e-05
## 9932     2 70067 2.854411e-05
## 9933     2 70067 2.854411e-05
## 9934     2 70067 2.854411e-05
## 9935     2 70067 2.854411e-05
## 9936     2 70067 2.854411e-05
## 9937     2 70067 2.854411e-05
## 9938     2 70067 2.854411e-05
## 9939     2 70067 2.854411e-05
## 9940     2 70067 2.854411e-05
## 9941     2 70067 2.854411e-05
## 9942     2 70067 2.854411e-05
## 9943     2 70067 2.854411e-05
## 9944     2 70067 2.854411e-05
## 9945     2 70067 2.854411e-05
## 9946     2 70067 2.854411e-05
## 9947     2 70067 2.854411e-05
## 9948     2 70067 2.854411e-05
## 9949     2 70067 2.854411e-05
## 9950     2 70067 2.854411e-05
## 9951     2 70067 2.854411e-05
## 9952     2 70067 2.854411e-05
## 9953     2 70067 2.854411e-05
## 9954     2 70067 2.854411e-05
## 9955     2 70067 2.854411e-05
## 9956     2 70067 2.854411e-05
## 9957     2 70067 2.854411e-05
## 9958     2 70067 2.854411e-05
## 9959     2 70067 2.854411e-05
## 9960     2 70067 2.854411e-05
## 9961     2 70067 2.854411e-05
## 9962     2 70067 2.854411e-05
## 9963     2 70067 2.854411e-05
## 9964     2 70067 2.854411e-05
## 9965     2 70067 2.854411e-05
## 9966     2 70067 2.854411e-05
## 9967     2 70067 2.854411e-05
## 9968     2 70067 2.854411e-05
## 9969     2 70067 2.854411e-05
## 9970     2 70067 2.854411e-05
## 9971     2 70067 2.854411e-05
## 9972     2 70067 2.854411e-05
## 9973     2 70067 2.854411e-05
## 9974     2 70067 2.854411e-05
## 9975     2 70067 2.854411e-05
## 9976     2 70067 2.854411e-05
## 9977     2 70067 2.854411e-05
## 9978     2 70067 2.854411e-05
## 9979     2 70067 2.854411e-05
## 9980     2 70067 2.854411e-05
## 9981     2 70067 2.854411e-05
## 9982     2 70067 2.854411e-05
## 9983     2 70067 2.854411e-05
## 9984     2 70067 2.854411e-05
## 9985     2 70067 2.854411e-05
## 9986     2 70067 2.854411e-05
## 9987     2 70067 2.854411e-05
## 9988     2 70067 2.854411e-05
## 9989     2 70067 2.854411e-05
## 9990     2 70067 2.854411e-05
## 9991     2 70067 2.854411e-05
## 9992     2 70067 2.854411e-05
## 9993     2 70067 2.854411e-05
## 9994     2 70067 2.854411e-05
## 9995     2 70067 2.854411e-05
## 9996     2 70067 2.854411e-05
## 9997     2 70067 2.854411e-05
## 9998     2 70067 2.854411e-05
## 9999     2 70067 2.854411e-05
## 10000    2 70067 2.854411e-05
## 10001    2 70067 2.854411e-05
## 10002    2 70067 2.854411e-05
## 10003    2 70067 2.854411e-05
## 10004    2 70067 2.854411e-05
## 10005    2 70067 2.854411e-05
## 10006    2 70067 2.854411e-05
## 10007    2 70067 2.854411e-05
## 10008    2 70067 2.854411e-05
## 10009    2 70067 2.854411e-05
## 10010    2 70067 2.854411e-05
## 10011    2 70067 2.854411e-05
## 10012    2 70067 2.854411e-05
## 10013    2 70067 2.854411e-05
## 10014    2 70067 2.854411e-05
## 10015    2 70067 2.854411e-05
## 10016    2 70067 2.854411e-05
## 10017    2 70067 2.854411e-05
## 10018    2 70067 2.854411e-05
## 10019    2 70067 2.854411e-05
## 10020    2 70067 2.854411e-05
## 10021    2 70067 2.854411e-05
## 10022    2 70067 2.854411e-05
## 10023    2 70067 2.854411e-05
## 10024    2 70067 2.854411e-05
## 10025    2 70067 2.854411e-05
## 10026    2 70067 2.854411e-05
## 10027    2 70067 2.854411e-05
## 10028    2 70067 2.854411e-05
## 10029    2 70067 2.854411e-05
## 10030    2 70067 2.854411e-05
## 10031    2 70067 2.854411e-05
## 10032    2 70067 2.854411e-05
## 10033    2 70067 2.854411e-05
## 10034    2 70067 2.854411e-05
## 10035    2 70067 2.854411e-05
## 10036    2 70067 2.854411e-05
## 10037    2 70067 2.854411e-05
## 10038    2 70067 2.854411e-05
## 10039    2 70067 2.854411e-05
## 10040    2 70067 2.854411e-05
## 10041    2 70067 2.854411e-05
## 10042    2 70067 2.854411e-05
## 10043    2 70067 2.854411e-05
## 10044    2 70067 2.854411e-05
## 10045    2 70067 2.854411e-05
## 10046    2 70067 2.854411e-05
## 10047    2 70067 2.854411e-05
## 10048    2 70067 2.854411e-05
## 10049    2 70067 2.854411e-05
## 10050    2 70067 2.854411e-05
## 10051    2 70067 2.854411e-05
## 10052    2 70067 2.854411e-05
## 10053    2 70067 2.854411e-05
## 10054    2 70067 2.854411e-05
## 10055    2 70067 2.854411e-05
## 10056    2 70067 2.854411e-05
## 10057    2 70067 2.854411e-05
## 10058    2 70067 2.854411e-05
## 10059    2 70067 2.854411e-05
## 10060    2 70067 2.854411e-05
## 10061    2 70067 2.854411e-05
## 10062    2 70067 2.854411e-05
## 10063    2 70067 2.854411e-05
## 10064    2 70067 2.854411e-05
## 10065    2 70067 2.854411e-05
## 10066    2 70067 2.854411e-05
## 10067    2 70067 2.854411e-05
## 10068    2 70067 2.854411e-05
## 10069    2 70067 2.854411e-05
## 10070    2 70067 2.854411e-05
## 10071    2 70067 2.854411e-05
## 10072    2 70067 2.854411e-05
## 10073    2 70067 2.854411e-05
## 10074    2 70067 2.854411e-05
## 10075    2 70067 2.854411e-05
## 10076    2 70067 2.854411e-05
## 10077    2 70067 2.854411e-05
## 10078    2 70067 2.854411e-05
## 10079    2 70067 2.854411e-05
## 10080    2 70067 2.854411e-05
## 10081    2 70067 2.854411e-05
## 10082    2 70067 2.854411e-05
## 10083    2 70067 2.854411e-05
## 10084    2 70067 2.854411e-05
## 10085    2 70067 2.854411e-05
## 10086    2 70067 2.854411e-05
## 10087    2 70067 2.854411e-05
## 10088    2 70067 2.854411e-05
## 10089    2 70067 2.854411e-05
## 10090    2 70067 2.854411e-05
## 10091    2 70067 2.854411e-05
## 10092    2 70067 2.854411e-05
## 10093    2 70067 2.854411e-05
## 10094    2 70067 2.854411e-05
## 10095    2 70067 2.854411e-05
## 10096    2 70067 2.854411e-05
## 10097    2 70067 2.854411e-05
## 10098    2 70067 2.854411e-05
## 10099    2 70067 2.854411e-05
## 10100    2 70067 2.854411e-05
## 10101    2 70067 2.854411e-05
## 10102    2 70067 2.854411e-05
## 10103    2 70067 2.854411e-05
## 10104    2 70067 2.854411e-05
## 10105    2 70067 2.854411e-05
## 10106    2 70067 2.854411e-05
## 10107    2 70067 2.854411e-05
## 10108    2 70067 2.854411e-05
## 10109    2 70067 2.854411e-05
## 10110    2 70067 2.854411e-05
## 10111    2 70067 2.854411e-05
## 10112    2 70067 2.854411e-05
## 10113    2 70067 2.854411e-05
## 10114    2 70067 2.854411e-05
## 10115    2 70067 2.854411e-05
## 10116    2 70067 2.854411e-05
## 10117    2 70067 2.854411e-05
## 10118    2 70067 2.854411e-05
## 10119    2 70067 2.854411e-05
## 10120    2 70067 2.854411e-05
## 10121    2 70067 2.854411e-05
## 10122    2 70067 2.854411e-05
## 10123    2 70067 2.854411e-05
## 10124    2 70067 2.854411e-05
## 10125    2 70067 2.854411e-05
## 10126    2 70067 2.854411e-05
## 10127    2 70067 2.854411e-05
## 10128    2 70067 2.854411e-05
## 10129    2 70067 2.854411e-05
## 10130    2 70067 2.854411e-05
## 10131    2 70067 2.854411e-05
## 10132    2 70067 2.854411e-05
## 10133    2 70067 2.854411e-05
## 10134    2 70067 2.854411e-05
## 10135    2 70067 2.854411e-05
## 10136    2 70067 2.854411e-05
## 10137    2 70067 2.854411e-05
## 10138    2 70067 2.854411e-05
## 10139    2 70067 2.854411e-05
## 10140    2 70067 2.854411e-05
## 10141    2 70067 2.854411e-05
## 10142    2 70067 2.854411e-05
## 10143    2 70067 2.854411e-05
## 10144    2 70067 2.854411e-05
## 10145    2 70067 2.854411e-05
## 10146    2 70067 2.854411e-05
## 10147    2 70067 2.854411e-05
## 10148    2 70067 2.854411e-05
## 10149    2 70067 2.854411e-05
## 10150    2 70067 2.854411e-05
## 10151    2 70067 2.854411e-05
## 10152    2 70067 2.854411e-05
## 10153    2 70067 2.854411e-05
## 10154    2 70067 2.854411e-05
## 10155    2 70067 2.854411e-05
## 10156    2 70067 2.854411e-05
## 10157    2 70067 2.854411e-05
## 10158    2 70067 2.854411e-05
## 10159    2 70067 2.854411e-05
## 10160    2 70067 2.854411e-05
## 10161    2 70067 2.854411e-05
## 10162    2 70067 2.854411e-05
## 10163    2 70067 2.854411e-05
## 10164    2 70067 2.854411e-05
## 10165    2 70067 2.854411e-05
## 10166    2 70067 2.854411e-05
## 10167    2 70067 2.854411e-05
## 10168    2 70067 2.854411e-05
## 10169    2 70067 2.854411e-05
## 10170    2 70067 2.854411e-05
## 10171    2 70067 2.854411e-05
## 10172    2 70067 2.854411e-05
## 10173    2 70067 2.854411e-05
## 10174    2 70067 2.854411e-05
## 10175    2 70067 2.854411e-05
## 10176    2 70067 2.854411e-05
## 10177    2 70067 2.854411e-05
## 10178    2 70067 2.854411e-05
## 10179    2 70067 2.854411e-05
## 10180    2 70067 2.854411e-05
## 10181    2 70067 2.854411e-05
## 10182    2 70067 2.854411e-05
## 10183    2 70067 2.854411e-05
## 10184    2 70067 2.854411e-05
## 10185    2 70067 2.854411e-05
## 10186    2 70067 2.854411e-05
## 10187    2 70067 2.854411e-05
## 10188    2 70067 2.854411e-05
## 10189    2 70067 2.854411e-05
## 10190    2 70067 2.854411e-05
## 10191    2 70067 2.854411e-05
## 10192    2 70067 2.854411e-05
## 10193    2 70067 2.854411e-05
## 10194    2 70067 2.854411e-05
## 10195    2 70067 2.854411e-05
## 10196    2 70067 2.854411e-05
## 10197    2 70067 2.854411e-05
## 10198    2 70067 2.854411e-05
## 10199    2 70067 2.854411e-05
## 10200    2 70067 2.854411e-05
## 10201    2 70067 2.854411e-05
## 10202    2 70067 2.854411e-05
## 10203    2 70067 2.854411e-05
## 10204    2 70067 2.854411e-05
## 10205    2 70067 2.854411e-05
## 10206    2 70067 2.854411e-05
## 10207    2 70067 2.854411e-05
## 10208    2 70067 2.854411e-05
## 10209    2 70067 2.854411e-05
## 10210    2 70067 2.854411e-05
## 10211    2 70067 2.854411e-05
## 10212    2 70067 2.854411e-05
## 10213    2 70067 2.854411e-05
## 10214    2 70067 2.854411e-05
## 10215    2 70067 2.854411e-05
## 10216    2 70067 2.854411e-05
## 10217    2 70067 2.854411e-05
## 10218    2 70067 2.854411e-05
## 10219    2 70067 2.854411e-05
## 10220    2 70067 2.854411e-05
## 10221    2 70067 2.854411e-05
## 10222    2 70067 2.854411e-05
## 10223    2 70067 2.854411e-05
## 10224    2 70067 2.854411e-05
## 10225    2 70067 2.854411e-05
## 10226    2 70067 2.854411e-05
## 10227    2 70067 2.854411e-05
## 10228    2 70067 2.854411e-05
## 10229    2 70067 2.854411e-05
## 10230    2 70067 2.854411e-05
## 10231    2 70067 2.854411e-05
## 10232    2 70067 2.854411e-05
## 10233    2 70067 2.854411e-05
## 10234    2 70067 2.854411e-05
## 10235    2 70067 2.854411e-05
## 10236    2 70067 2.854411e-05
## 10237    2 70067 2.854411e-05
## 10238    2 70067 2.854411e-05
## 10239    2 70067 2.854411e-05
## 10240    2 70067 2.854411e-05
## 10241    2 70067 2.854411e-05
## 10242    2 70067 2.854411e-05
## 10243    2 70067 2.854411e-05
## 10244    2 70067 2.854411e-05
## 10245    2 70067 2.854411e-05
## 10246    2 70067 2.854411e-05
## 10247    2 70067 2.854411e-05
## 10248    2 70067 2.854411e-05
## 10249    2 70067 2.854411e-05
## 10250    2 70067 2.854411e-05
## 10251    2 70067 2.854411e-05
## 10252    2 70067 2.854411e-05
## 10253    2 70067 2.854411e-05
## 10254    2 70067 2.854411e-05
## 10255    2 70067 2.854411e-05
## 10256    2 70067 2.854411e-05
## 10257    2 70067 2.854411e-05
## 10258    2 70067 2.854411e-05
## 10259    2 70067 2.854411e-05
## 10260    2 70067 2.854411e-05
## 10261    2 70067 2.854411e-05
## 10262    2 70067 2.854411e-05
## 10263    2 70067 2.854411e-05
## 10264    2 70067 2.854411e-05
## 10265    2 70067 2.854411e-05
## 10266    2 70067 2.854411e-05
## 10267    2 70067 2.854411e-05
## 10268    2 70067 2.854411e-05
## 10269    2 70067 2.854411e-05
## 10270    2 70067 2.854411e-05
## 10271    2 70067 2.854411e-05
## 10272    2 70067 2.854411e-05
## 10273    2 70067 2.854411e-05
## 10274    2 70067 2.854411e-05
## 10275    2 70067 2.854411e-05
## 10276    2 70067 2.854411e-05
## 10277    2 70067 2.854411e-05
## 10278    2 70067 2.854411e-05
## 10279    2 70067 2.854411e-05
## 10280    2 70067 2.854411e-05
## 10281    2 70067 2.854411e-05
## 10282    2 70067 2.854411e-05
## 10283    2 70067 2.854411e-05
## 10284    2 70067 2.854411e-05
## 10285    2 70067 2.854411e-05
## 10286    2 70067 2.854411e-05
## 10287    2 70067 2.854411e-05
## 10288    2 70067 2.854411e-05
## 10289    2 70067 2.854411e-05
## 10290    2 70067 2.854411e-05
## 10291    2 70067 2.854411e-05
## 10292    2 70067 2.854411e-05
## 10293    2 70067 2.854411e-05
## 10294    2 70067 2.854411e-05
## 10295    2 70067 2.854411e-05
## 10296    2 70067 2.854411e-05
## 10297    2 70067 2.854411e-05
## 10298    2 70067 2.854411e-05
## 10299    2 70067 2.854411e-05
## 10300    2 70067 2.854411e-05
## 10301    2 70067 2.854411e-05
## 10302    2 70067 2.854411e-05
## 10303    2 70067 2.854411e-05
## 10304    2 70067 2.854411e-05
## 10305    2 70067 2.854411e-05
## 10306    2 70067 2.854411e-05
## 10307    2 70067 2.854411e-05
## 10308    2 70067 2.854411e-05
## 10309    2 70067 2.854411e-05
## 10310    2 70067 2.854411e-05
## 10311    2 70067 2.854411e-05
## 10312    2 70067 2.854411e-05
## 10313    2 70067 2.854411e-05
## 10314    2 70067 2.854411e-05
## 10315    2 70067 2.854411e-05
## 10316    2 70067 2.854411e-05
## 10317    2 70067 2.854411e-05
## 10318    2 70067 2.854411e-05
## 10319    2 70067 2.854411e-05
## 10320    2 70067 2.854411e-05
## 10321    2 70067 2.854411e-05
## 10322    2 70067 2.854411e-05
## 10323    2 70067 2.854411e-05
## 10324    2 70067 2.854411e-05
## 10325    2 70067 2.854411e-05
## 10326    2 70067 2.854411e-05
## 10327    2 70067 2.854411e-05
## 10328    2 70067 2.854411e-05
## 10329    2 70067 2.854411e-05
## 10330    2 70067 2.854411e-05
## 10331    2 70067 2.854411e-05
## 10332    2 70067 2.854411e-05
## 10333    2 70067 2.854411e-05
## 10334    2 70067 2.854411e-05
## 10335    2 70067 2.854411e-05
## 10336    2 70067 2.854411e-05
## 10337    2 70067 2.854411e-05
## 10338    2 70067 2.854411e-05
## 10339    2 70067 2.854411e-05
## 10340    2 70067 2.854411e-05
## 10341    2 70067 2.854411e-05
## 10342    2 70067 2.854411e-05
## 10343    2 70067 2.854411e-05
## 10344    2 70067 2.854411e-05
## 10345    2 70067 2.854411e-05
## 10346    2 70067 2.854411e-05
## 10347    2 70067 2.854411e-05
## 10348    2 70067 2.854411e-05
## 10349    2 70067 2.854411e-05
## 10350    2 70067 2.854411e-05
## 10351    2 70067 2.854411e-05
## 10352    2 70067 2.854411e-05
## 10353    2 70067 2.854411e-05
## 10354    2 70067 2.854411e-05
## 10355    2 70067 2.854411e-05
## 10356    2 70067 2.854411e-05
## 10357    2 70067 2.854411e-05
## 10358    2 70067 2.854411e-05
## 10359    2 70067 2.854411e-05
## 10360    2 70067 2.854411e-05
## 10361    2 70067 2.854411e-05
## 10362    2 70067 2.854411e-05
## 10363    2 70067 2.854411e-05
## 10364    2 70067 2.854411e-05
## 10365    2 70067 2.854411e-05
## 10366    2 70067 2.854411e-05
## 10367    2 70067 2.854411e-05
## 10368    2 70067 2.854411e-05
## 10369    2 70067 2.854411e-05
## 10370    2 70067 2.854411e-05
## 10371    2 70067 2.854411e-05
## 10372    2 70067 2.854411e-05
## 10373    2 70067 2.854411e-05
## 10374    2 70067 2.854411e-05
## 10375    2 70067 2.854411e-05
## 10376    2 70067 2.854411e-05
## 10377    2 70067 2.854411e-05
## 10378    2 70067 2.854411e-05
## 10379    2 70067 2.854411e-05
## 10380    2 70067 2.854411e-05
## 10381    2 70067 2.854411e-05
## 10382    2 70067 2.854411e-05
## 10383    2 70067 2.854411e-05
## 10384    2 70067 2.854411e-05
## 10385    2 70067 2.854411e-05
## 10386    2 70067 2.854411e-05
## 10387    2 70067 2.854411e-05
## 10388    2 70067 2.854411e-05
## 10389    2 70067 2.854411e-05
## 10390    2 70067 2.854411e-05
## 10391    2 70067 2.854411e-05
## 10392    2 70067 2.854411e-05
## 10393    2 70067 2.854411e-05
## 10394    2 70067 2.854411e-05
## 10395    2 70067 2.854411e-05
## 10396    2 70067 2.854411e-05
## 10397    2 70067 2.854411e-05
## 10398    2 70067 2.854411e-05
## 10399    2 70067 2.854411e-05
## 10400    2 70067 2.854411e-05
## 10401    2 70067 2.854411e-05
## 10402    2 70067 2.854411e-05
## 10403    2 70067 2.854411e-05
## 10404    2 70067 2.854411e-05
## 10405    2 70067 2.854411e-05
## 10406    2 70067 2.854411e-05
## 10407    2 70067 2.854411e-05
## 10408    2 70067 2.854411e-05
## 10409    2 70067 2.854411e-05
## 10410    2 70067 2.854411e-05
## 10411    2 70067 2.854411e-05
## 10412    2 70067 2.854411e-05
## 10413    2 70067 2.854411e-05
## 10414    2 70067 2.854411e-05
## 10415    2 70067 2.854411e-05
## 10416    2 70067 2.854411e-05
## 10417    2 70067 2.854411e-05
## 10418    2 70067 2.854411e-05
## 10419    2 70067 2.854411e-05
## 10420    2 70067 2.854411e-05
## 10421    2 70067 2.854411e-05
## 10422    2 70067 2.854411e-05
## 10423    2 70067 2.854411e-05
## 10424    2 70067 2.854411e-05
## 10425    2 70067 2.854411e-05
## 10426    2 70067 2.854411e-05
## 10427    2 70067 2.854411e-05
## 10428    2 70067 2.854411e-05
## 10429    2 70067 2.854411e-05
## 10430    2 70067 2.854411e-05
## 10431    2 70067 2.854411e-05
## 10432    2 70067 2.854411e-05
## 10433    2 70067 2.854411e-05
## 10434    2 70067 2.854411e-05
## 10435    2 70067 2.854411e-05
## 10436    2 70067 2.854411e-05
## 10437    2 70067 2.854411e-05
## 10438    2 70067 2.854411e-05
## 10439    2 70067 2.854411e-05
## 10440    2 70067 2.854411e-05
## 10441    2 70067 2.854411e-05
## 10442    2 70067 2.854411e-05
## 10443    2 70067 2.854411e-05
## 10444    2 70067 2.854411e-05
## 10445    2 70067 2.854411e-05
## 10446    2 70067 2.854411e-05
## 10447    2 70067 2.854411e-05
## 10448    2 70067 2.854411e-05
## 10449    2 70067 2.854411e-05
## 10450    2 70067 2.854411e-05
## 10451    2 70067 2.854411e-05
## 10452    2 70067 2.854411e-05
## 10453    2 70067 2.854411e-05
## 10454    2 70067 2.854411e-05
## 10455    2 70067 2.854411e-05
## 10456    2 70067 2.854411e-05
## 10457    2 70067 2.854411e-05
## 10458    2 70067 2.854411e-05
## 10459    2 70067 2.854411e-05
## 10460    2 70067 2.854411e-05
## 10461    2 70067 2.854411e-05
## 10462    2 70067 2.854411e-05
## 10463    2 70067 2.854411e-05
## 10464    2 70067 2.854411e-05
## 10465    2 70067 2.854411e-05
## 10466    2 70067 2.854411e-05
## 10467    2 70067 2.854411e-05
## 10468    2 70067 2.854411e-05
## 10469    2 70067 2.854411e-05
## 10470    2 70067 2.854411e-05
## 10471    2 70067 2.854411e-05
## 10472    2 70067 2.854411e-05
## 10473    2 70067 2.854411e-05
## 10474    2 70067 2.854411e-05
## 10475    2 70067 2.854411e-05
## 10476    2 70067 2.854411e-05
## 10477    2 70067 2.854411e-05
## 10478    2 70067 2.854411e-05
## 10479    2 70067 2.854411e-05
## 10480    2 70067 2.854411e-05
## 10481    2 70067 2.854411e-05
## 10482    2 70067 2.854411e-05
## 10483    2 70067 2.854411e-05
## 10484    2 70067 2.854411e-05
## 10485    2 70067 2.854411e-05
## 10486    2 70067 2.854411e-05
## 10487    2 70067 2.854411e-05
## 10488    2 70067 2.854411e-05
## 10489    2 70067 2.854411e-05
## 10490    2 70067 2.854411e-05
## 10491    2 70067 2.854411e-05
## 10492    2 70067 2.854411e-05
## 10493    2 70067 2.854411e-05
## 10494    2 70067 2.854411e-05
## 10495    2 70067 2.854411e-05
## 10496    2 70067 2.854411e-05
## 10497    2 70067 2.854411e-05
## 10498    2 70067 2.854411e-05
## 10499    2 70067 2.854411e-05
## 10500    2 70067 2.854411e-05
## 10501    2 70067 2.854411e-05
## 10502    2 70067 2.854411e-05
## 10503    2 70067 2.854411e-05
## 10504    2 70067 2.854411e-05
## 10505    2 70067 2.854411e-05
## 10506    2 70067 2.854411e-05
## 10507    2 70067 2.854411e-05
## 10508    2 70067 2.854411e-05
## 10509    2 70067 2.854411e-05
## 10510    2 70067 2.854411e-05
## 10511    2 70067 2.854411e-05
## 10512    2 70067 2.854411e-05
## 10513    2 70067 2.854411e-05
## 10514    2 70067 2.854411e-05
## 10515    2 70067 2.854411e-05
## 10516    2 70067 2.854411e-05
## 10517    2 70067 2.854411e-05
## 10518    2 70067 2.854411e-05
## 10519    2 70067 2.854411e-05
## 10520    2 70067 2.854411e-05
## 10521    2 70067 2.854411e-05
## 10522    2 70067 2.854411e-05
## 10523    2 70067 2.854411e-05
## 10524    2 70067 2.854411e-05
## 10525    2 70067 2.854411e-05
## 10526    2 70067 2.854411e-05
## 10527    2 70067 2.854411e-05
## 10528    2 70067 2.854411e-05
## 10529    2 70067 2.854411e-05
## 10530    2 70067 2.854411e-05
## 10531    2 70067 2.854411e-05
## 10532    2 70067 2.854411e-05
## 10533    2 70067 2.854411e-05
## 10534    2 70067 2.854411e-05
## 10535    2 70067 2.854411e-05
## 10536    2 70067 2.854411e-05
## 10537    2 70067 2.854411e-05
## 10538    2 70067 2.854411e-05
## 10539    2 70067 2.854411e-05
## 10540    2 70067 2.854411e-05
## 10541    2 70067 2.854411e-05
## 10542    2 70067 2.854411e-05
## 10543    2 70067 2.854411e-05
## 10544    2 70067 2.854411e-05
## 10545    2 70067 2.854411e-05
## 10546    2 70067 2.854411e-05
## 10547    2 70067 2.854411e-05
## 10548    2 70067 2.854411e-05
## 10549    2 70067 2.854411e-05
## 10550    2 70067 2.854411e-05
## 10551    2 70067 2.854411e-05
## 10552    2 70067 2.854411e-05
## 10553    2 70067 2.854411e-05
## 10554    2 70067 2.854411e-05
## 10555    2 70067 2.854411e-05
## 10556    2 70067 2.854411e-05
## 10557    2 70067 2.854411e-05
## 10558    2 70067 2.854411e-05
## 10559    2 70067 2.854411e-05
## 10560    2 70067 2.854411e-05
## 10561    2 70067 2.854411e-05
## 10562    2 70067 2.854411e-05
## 10563    2 70067 2.854411e-05
## 10564    2 70067 2.854411e-05
## 10565    2 70067 2.854411e-05
## 10566    2 70067 2.854411e-05
## 10567    2 70067 2.854411e-05
## 10568    2 70067 2.854411e-05
## 10569    2 70067 2.854411e-05
## 10570    2 70067 2.854411e-05
## 10571    2 70067 2.854411e-05
## 10572    2 70067 2.854411e-05
## 10573    2 70067 2.854411e-05
## 10574    2 70067 2.854411e-05
## 10575    2 70067 2.854411e-05
## 10576    2 70067 2.854411e-05
## 10577    2 70067 2.854411e-05
## 10578    2 70067 2.854411e-05
## 10579    2 70067 2.854411e-05
## 10580    2 70067 2.854411e-05
## 10581    2 70067 2.854411e-05
## 10582    2 70067 2.854411e-05
## 10583    2 70067 2.854411e-05
## 10584    2 70067 2.854411e-05
## 10585    2 70067 2.854411e-05
## 10586    2 70067 2.854411e-05
## 10587    2 70067 2.854411e-05
## 10588    2 70067 2.854411e-05
## 10589    2 70067 2.854411e-05
## 10590    2 70067 2.854411e-05
## 10591    2 70067 2.854411e-05
## 10592    2 70067 2.854411e-05
## 10593    2 70067 2.854411e-05
## 10594    2 70067 2.854411e-05
## 10595    2 70067 2.854411e-05
## 10596    2 70067 2.854411e-05
## 10597    2 70067 2.854411e-05
## 10598    2 70067 2.854411e-05
## 10599    2 70067 2.854411e-05
## 10600    2 70067 2.854411e-05
## 10601    2 70067 2.854411e-05
## 10602    2 70067 2.854411e-05
## 10603    2 70067 2.854411e-05
## 10604    2 70067 2.854411e-05
## 10605    2 70067 2.854411e-05
## 10606    2 70067 2.854411e-05
## 10607    2 70067 2.854411e-05
## 10608    2 70067 2.854411e-05
## 10609    2 70067 2.854411e-05
## 10610    2 70067 2.854411e-05
## 10611    2 70067 2.854411e-05
## 10612    2 70067 2.854411e-05
## 10613    2 70067 2.854411e-05
## 10614    2 70067 2.854411e-05
## 10615    2 70067 2.854411e-05
## 10616    2 70067 2.854411e-05
## 10617    2 70067 2.854411e-05
## 10618    2 70067 2.854411e-05
## 10619    2 70067 2.854411e-05
## 10620    2 70067 2.854411e-05
## 10621    2 70067 2.854411e-05
## 10622    2 70067 2.854411e-05
## 10623    2 70067 2.854411e-05
## 10624    2 70067 2.854411e-05
## 10625    2 70067 2.854411e-05
## 10626    2 70067 2.854411e-05
## 10627    2 70067 2.854411e-05
## 10628    2 70067 2.854411e-05
## 10629    2 70067 2.854411e-05
## 10630    2 70067 2.854411e-05
## 10631    2 70067 2.854411e-05
## 10632    2 70067 2.854411e-05
## 10633    2 70067 2.854411e-05
## 10634    2 70067 2.854411e-05
## 10635    2 70067 2.854411e-05
## 10636    2 70067 2.854411e-05
## 10637    2 70067 2.854411e-05
## 10638    2 70067 2.854411e-05
## 10639    2 70067 2.854411e-05
## 10640    2 70067 2.854411e-05
## 10641    2 70067 2.854411e-05
## 10642    2 70067 2.854411e-05
## 10643    2 70067 2.854411e-05
## 10644    2 70067 2.854411e-05
## 10645    2 70067 2.854411e-05
## 10646    2 70067 2.854411e-05
## 10647    2 70067 2.854411e-05
## 10648    2 70067 2.854411e-05
## 10649    2 70067 2.854411e-05
## 10650    2 70067 2.854411e-05
## 10651    2 70067 2.854411e-05
## 10652    2 70067 2.854411e-05
## 10653    2 70067 2.854411e-05
## 10654    2 70067 2.854411e-05
## 10655    2 70067 2.854411e-05
## 10656    2 70067 2.854411e-05
## 10657    2 70067 2.854411e-05
## 10658    2 70067 2.854411e-05
## 10659    2 70067 2.854411e-05
## 10660    2 70067 2.854411e-05
## 10661    2 70067 2.854411e-05
## 10662    2 70067 2.854411e-05
## 10663    2 70067 2.854411e-05
## 10664    2 70067 2.854411e-05
## 10665    2 70067 2.854411e-05
## 10666    2 70067 2.854411e-05
## 10667    2 70067 2.854411e-05
## 10668    2 70067 2.854411e-05
## 10669    2 70067 2.854411e-05
## 10670    2 70067 2.854411e-05
## 10671    2 70067 2.854411e-05
## 10672    2 70067 2.854411e-05
## 10673    2 70067 2.854411e-05
## 10674    2 70067 2.854411e-05
## 10675    2 70067 2.854411e-05
## 10676    2 70067 2.854411e-05
## 10677    2 70067 2.854411e-05
## 10678    2 70067 2.854411e-05
## 10679    2 70067 2.854411e-05
## 10680    2 70067 2.854411e-05
## 10681    2 70067 2.854411e-05
## 10682    2 70067 2.854411e-05
## 10683    2 70067 2.854411e-05
## 10684    2 70067 2.854411e-05
## 10685    2 70067 2.854411e-05
## 10686    2 70067 2.854411e-05
## 10687    2 70067 2.854411e-05
## 10688    2 70067 2.854411e-05
## 10689    2 70067 2.854411e-05
## 10690    2 70067 2.854411e-05
## 10691    2 70067 2.854411e-05
## 10692    2 70067 2.854411e-05
## 10693    2 70067 2.854411e-05
## 10694    2 70067 2.854411e-05
## 10695    2 70067 2.854411e-05
## 10696    2 70067 2.854411e-05
## 10697    2 70067 2.854411e-05
## 10698    2 70067 2.854411e-05
## 10699    2 70067 2.854411e-05
## 10700    2 70067 2.854411e-05
## 10701    2 70067 2.854411e-05
## 10702    2 70067 2.854411e-05
## 10703    2 70067 2.854411e-05
## 10704    2 70067 2.854411e-05
## 10705    2 70067 2.854411e-05
## 10706    2 70067 2.854411e-05
## 10707    2 70067 2.854411e-05
## 10708    2 70067 2.854411e-05
## 10709    2 70067 2.854411e-05
## 10710    2 70067 2.854411e-05
## 10711    2 70067 2.854411e-05
## 10712    2 70067 2.854411e-05
## 10713    2 70067 2.854411e-05
## 10714    2 70067 2.854411e-05
## 10715    2 70067 2.854411e-05
## 10716    2 70067 2.854411e-05
## 10717    2 70067 2.854411e-05
## 10718    2 70067 2.854411e-05
## 10719    2 70067 2.854411e-05
## 10720    2 70067 2.854411e-05
## 10721    2 70067 2.854411e-05
## 10722    2 70067 2.854411e-05
## 10723    2 70067 2.854411e-05
## 10724    2 70067 2.854411e-05
## 10725    2 70067 2.854411e-05
## 10726    2 70067 2.854411e-05
## 10727    2 70067 2.854411e-05
## 10728    2 70067 2.854411e-05
## 10729    2 70067 2.854411e-05
## 10730    2 70067 2.854411e-05
## 10731    2 70067 2.854411e-05
## 10732    2 70067 2.854411e-05
## 10733    2 70067 2.854411e-05
## 10734    2 70067 2.854411e-05
## 10735    2 70067 2.854411e-05
## 10736    2 70067 2.854411e-05
## 10737    2 70067 2.854411e-05
## 10738    2 70067 2.854411e-05
## 10739    2 70067 2.854411e-05
## 10740    2 70067 2.854411e-05
## 10741    2 70067 2.854411e-05
## 10742    2 70067 2.854411e-05
## 10743    2 70067 2.854411e-05
## 10744    2 70067 2.854411e-05
## 10745    2 70067 2.854411e-05
## 10746    2 70067 2.854411e-05
## 10747    2 70067 2.854411e-05
## 10748    2 70067 2.854411e-05
## 10749    2 70067 2.854411e-05
## 10750    2 70067 2.854411e-05
## 10751    2 70067 2.854411e-05
## 10752    2 70067 2.854411e-05
## 10753    2 70067 2.854411e-05
## 10754    2 70067 2.854411e-05
## 10755    2 70067 2.854411e-05
## 10756    2 70067 2.854411e-05
## 10757    2 70067 2.854411e-05
## 10758    2 70067 2.854411e-05
## 10759    2 70067 2.854411e-05
## 10760    2 70067 2.854411e-05
## 10761    2 70067 2.854411e-05
## 10762    2 70067 2.854411e-05
## 10763    2 70067 2.854411e-05
## 10764    2 70067 2.854411e-05
## 10765    2 70067 2.854411e-05
## 10766    2 70067 2.854411e-05
## 10767    2 70067 2.854411e-05
## 10768    2 70067 2.854411e-05
## 10769    2 70067 2.854411e-05
## 10770    2 70067 2.854411e-05
## 10771    2 70067 2.854411e-05
## 10772    2 70067 2.854411e-05
## 10773    2 70067 2.854411e-05
## 10774    2 70067 2.854411e-05
## 10775    2 70067 2.854411e-05
## 10776    2 70067 2.854411e-05
## 10777    2 70067 2.854411e-05
## 10778    2 70067 2.854411e-05
## 10779    2 70067 2.854411e-05
## 10780    2 70067 2.854411e-05
## 10781    2 70067 2.854411e-05
## 10782    2 70067 2.854411e-05
## 10783    2 70067 2.854411e-05
## 10784    2 70067 2.854411e-05
## 10785    2 70067 2.854411e-05
## 10786    2 70067 2.854411e-05
## 10787    2 70067 2.854411e-05
## 10788    2 70067 2.854411e-05
## 10789    2 70067 2.854411e-05
## 10790    2 70067 2.854411e-05
## 10791    2 70067 2.854411e-05
## 10792    2 70067 2.854411e-05
## 10793    2 70067 2.854411e-05
## 10794    2 70067 2.854411e-05
## 10795    2 70067 2.854411e-05
## 10796    2 70067 2.854411e-05
## 10797    2 70067 2.854411e-05
## 10798    2 70067 2.854411e-05
## 10799    2 70067 2.854411e-05
## 10800    2 70067 2.854411e-05
## 10801    2 70067 2.854411e-05
## 10802    2 70067 2.854411e-05
## 10803    2 70067 2.854411e-05
## 10804    2 70067 2.854411e-05
## 10805    2 70067 2.854411e-05
## 10806    2 70067 2.854411e-05
## 10807    2 70067 2.854411e-05
## 10808    2 70067 2.854411e-05
## 10809    2 70067 2.854411e-05
## 10810    2 70067 2.854411e-05
## 10811    2 70067 2.854411e-05
## 10812    2 70067 2.854411e-05
## 10813    2 70067 2.854411e-05
## 10814    2 70067 2.854411e-05
## 10815    2 70067 2.854411e-05
## 10816    2 70067 2.854411e-05
## 10817    2 70067 2.854411e-05
## 10818    2 70067 2.854411e-05
## 10819    2 70067 2.854411e-05
## 10820    2 70067 2.854411e-05
## 10821    2 70067 2.854411e-05
## 10822    2 70067 2.854411e-05
## 10823    2 70067 2.854411e-05
## 10824    2 70067 2.854411e-05
## 10825    2 70067 2.854411e-05
## 10826    2 70067 2.854411e-05
## 10827    2 70067 2.854411e-05
## 10828    2 70067 2.854411e-05
## 10829    2 70067 2.854411e-05
## 10830    2 70067 2.854411e-05
## 10831    2 70067 2.854411e-05
## 10832    2 70067 2.854411e-05
## 10833    2 70067 2.854411e-05
## 10834    2 70067 2.854411e-05
## 10835    2 70067 2.854411e-05
## 10836    2 70067 2.854411e-05
## 10837    2 70067 2.854411e-05
## 10838    2 70067 2.854411e-05
## 10839    2 70067 2.854411e-05
## 10840    2 70067 2.854411e-05
## 10841    2 70067 2.854411e-05
## 10842    2 70067 2.854411e-05
## 10843    2 70067 2.854411e-05
## 10844    2 70067 2.854411e-05
## 10845    2 70067 2.854411e-05
## 10846    2 53016 3.772446e-05
## 10847    2 53016 3.772446e-05
## 10848    2 53016 3.772446e-05
## 10849    2 53016 3.772446e-05
## 10850    2 53016 3.772446e-05
## 10851    2 53016 3.772446e-05
## 10852    2 53016 3.772446e-05
## 10853    2 53016 3.772446e-05
## 10854    2 53016 3.772446e-05
## 10855    2 53016 3.772446e-05
## 10856    2 53016 3.772446e-05
## 10857    2 53016 3.772446e-05
## 10858    2 53016 3.772446e-05
## 10859    2 53016 3.772446e-05
## 10860    2 53016 3.772446e-05
## 10861    2 53016 3.772446e-05
## 10862    2 53016 3.772446e-05
## 10863    2 53016 3.772446e-05
## 10864    2 53016 3.772446e-05
## 10865    2 53016 3.772446e-05
## 10866    2 53016 3.772446e-05
## 10867    2 53016 3.772446e-05
## 10868    2 53016 3.772446e-05
## 10869    2 53016 3.772446e-05
## 10870    2 53016 3.772446e-05
## 10871    2 53016 3.772446e-05
## 10872    2 53016 3.772446e-05
## 10873    2 53016 3.772446e-05
## 10874    2 53016 3.772446e-05
## 10875    2 53016 3.772446e-05
## 10876    2 53016 3.772446e-05
## 10877    2 53016 3.772446e-05
## 10878    2 53016 3.772446e-05
## 10879    2 53016 3.772446e-05
## 10880    2 53016 3.772446e-05
## 10881    2 53016 3.772446e-05
## 10882    2 53016 3.772446e-05
## 10883    2 53016 3.772446e-05
## 10884    2 53016 3.772446e-05
## 10885    2 53016 3.772446e-05
## 10886    2 53016 3.772446e-05
## 10887    2 53016 3.772446e-05
## 10888    2 53016 3.772446e-05
## 10889    2 53016 3.772446e-05
## 10890    2 53016 3.772446e-05
## 10891    2 53016 3.772446e-05
## 10892    2 53016 3.772446e-05
## 10893    2 53016 3.772446e-05
## 10894    2 53016 3.772446e-05
## 10895    2 53016 3.772446e-05
## 10896    2 53016 3.772446e-05
## 10897    2 53016 3.772446e-05
## 10898    2 53016 3.772446e-05
## 10899    2 53016 3.772446e-05
## 10900    2 53016 3.772446e-05
## 10901    2 53016 3.772446e-05
## 10902    2 53016 3.772446e-05
## 10903    2 53016 3.772446e-05
## 10904    2 53016 3.772446e-05
## 10905    2 53016 3.772446e-05
## 10906    2 53016 3.772446e-05
## 10907    2 53016 3.772446e-05
## 10908    2 53016 3.772446e-05
## 10909    2 53016 3.772446e-05
## 10910    2 53016 3.772446e-05
## 10911    2 53016 3.772446e-05
## 10912    2 53016 3.772446e-05
## 10913    2 53016 3.772446e-05
## 10914    2 53016 3.772446e-05
## 10915    2 53016 3.772446e-05
## 10916    2 53016 3.772446e-05
## 10917    2 53016 3.772446e-05
## 10918    2 53016 3.772446e-05
## 10919    2 53016 3.772446e-05
## 10920    2 53016 3.772446e-05
## 10921    2 53016 3.772446e-05
## 10922    2 53016 3.772446e-05
## 10923    2 53016 3.772446e-05
## 10924    2 53016 3.772446e-05
## 10925    2 53016 3.772446e-05
## 10926    2 53016 3.772446e-05
## 10927    2 53016 3.772446e-05
## 10928    2 53016 3.772446e-05
## 10929    2 53016 3.772446e-05
## 10930    2 53016 3.772446e-05
## 10931    2 53016 3.772446e-05
## 10932    2 53016 3.772446e-05
## 10933    2 53016 3.772446e-05
## 10934    2 53016 3.772446e-05
## 10935    2 53016 3.772446e-05
## 10936    2 53016 3.772446e-05
## 10937    2 53016 3.772446e-05
## 10938    2 53016 3.772446e-05
## 10939    2 53016 3.772446e-05
## 10940    2 53016 3.772446e-05
## 10941    2 53016 3.772446e-05
## 10942    2 53016 3.772446e-05
## 10943    2 53016 3.772446e-05
## 10944    2 53016 3.772446e-05
## 10945    2 53016 3.772446e-05
## 10946    2 53016 3.772446e-05
## 10947    2 53016 3.772446e-05
## 10948    2 53016 3.772446e-05
## 10949    2 53016 3.772446e-05
## 10950    2 53016 3.772446e-05
## 10951    2 53016 3.772446e-05
## 10952    2 53016 3.772446e-05
## 10953    2 53016 3.772446e-05
## 10954    2 53016 3.772446e-05
## 10955    2 53016 3.772446e-05
## 10956    2 53016 3.772446e-05
## 10957    2 53016 3.772446e-05
## 10958    2 53016 3.772446e-05
## 10959    2 53016 3.772446e-05
## 10960    2 53016 3.772446e-05
## 10961    2 53016 3.772446e-05
## 10962    2 53016 3.772446e-05
## 10963    2 53016 3.772446e-05
## 10964    2 53016 3.772446e-05
## 10965    2 53016 3.772446e-05
## 10966    2 53016 3.772446e-05
## 10967    2 53016 3.772446e-05
## 10968    2 53016 3.772446e-05
## 10969    2 53016 3.772446e-05
## 10970    2 53016 3.772446e-05
## 10971    2 53016 3.772446e-05
## 10972    2 53016 3.772446e-05
## 10973    2 53016 3.772446e-05
## 10974    2 53016 3.772446e-05
## 10975    2 53016 3.772446e-05
## 10976    2 53016 3.772446e-05
## 10977    2 53016 3.772446e-05
## 10978    2 53016 3.772446e-05
## 10979    2 53016 3.772446e-05
## 10980    2 53016 3.772446e-05
## 10981    2 53016 3.772446e-05
## 10982    2 53016 3.772446e-05
## 10983    2 53016 3.772446e-05
## 10984    2 53016 3.772446e-05
## 10985    2 53016 3.772446e-05
## 10986    2 53016 3.772446e-05
## 10987    2 53016 3.772446e-05
## 10988    2 53016 3.772446e-05
## 10989    2 53016 3.772446e-05
## 10990    2 53016 3.772446e-05
## 10991    2 53016 3.772446e-05
## 10992    2 53016 3.772446e-05
## 10993    2 53016 3.772446e-05
## 10994    2 53016 3.772446e-05
## 10995    2 53016 3.772446e-05
## 10996    2 53016 3.772446e-05
## 10997    2 53016 3.772446e-05
## 10998    2 53016 3.772446e-05
## 10999    2 53016 3.772446e-05
## 11000    2 53016 3.772446e-05
## 11001    2 53016 3.772446e-05
## 11002    2 53016 3.772446e-05
## 11003    2 53016 3.772446e-05
## 11004    2 53016 3.772446e-05
## 11005    2 53016 3.772446e-05
## 11006    2 53016 3.772446e-05
## 11007    2 53016 3.772446e-05
## 11008    2 53016 3.772446e-05
## 11009    2 53016 3.772446e-05
## 11010    2 53016 3.772446e-05
## 11011    2 53016 3.772446e-05
## 11012    2 53016 3.772446e-05
## 11013    2 53016 3.772446e-05
## 11014    2 53016 3.772446e-05
## 11015    2 53016 3.772446e-05
## 11016    2 53016 3.772446e-05
## 11017    2 53016 3.772446e-05
## 11018    2 53016 3.772446e-05
## 11019    2 53016 3.772446e-05
## 11020    2 53016 3.772446e-05
## 11021    2 53016 3.772446e-05
## 11022    2 53016 3.772446e-05
## 11023    2 53016 3.772446e-05
## 11024    2 53016 3.772446e-05
## 11025    2 53016 3.772446e-05
## 11026    2 53016 3.772446e-05
## 11027    2 53016 3.772446e-05
## 11028    2 53016 3.772446e-05
## 11029    2 53016 3.772446e-05
## 11030    2 53016 3.772446e-05
## 11031    2 53016 3.772446e-05
## 11032    2 53016 3.772446e-05
## 11033    2 53016 3.772446e-05
## 11034    2 53016 3.772446e-05
## 11035    2 53016 3.772446e-05
## 11036    2 53016 3.772446e-05
## 11037    2 53016 3.772446e-05
## 11038    2 53016 3.772446e-05
## 11039    2 53016 3.772446e-05
## 11040    2 53016 3.772446e-05
## 11041    2 53016 3.772446e-05
## 11042    2 53016 3.772446e-05
## 11043    2 53016 3.772446e-05
## 11044    2 53016 3.772446e-05
## 11045    2 53016 3.772446e-05
## 11046    2 53016 3.772446e-05
## 11047    2 53016 3.772446e-05
## 11048    2 53016 3.772446e-05
## 11049    2 53016 3.772446e-05
## 11050    2 53016 3.772446e-05
## 11051    2 53016 3.772446e-05
## 11052    2 53016 3.772446e-05
## 11053    2 53016 3.772446e-05
## 11054    2 53016 3.772446e-05
## 11055    2 53016 3.772446e-05
## 11056    2 53016 3.772446e-05
## 11057    2 53016 3.772446e-05
## 11058    2 53016 3.772446e-05
## 11059    2 53016 3.772446e-05
## 11060    2 53016 3.772446e-05
## 11061    2 53016 3.772446e-05
## 11062    2 53016 3.772446e-05
## 11063    2 53016 3.772446e-05
## 11064    2 53016 3.772446e-05
## 11065    2 53016 3.772446e-05
## 11066    2 53016 3.772446e-05
## 11067    2 53016 3.772446e-05
## 11068    2 53016 3.772446e-05
## 11069    2 53016 3.772446e-05
## 11070    2 53016 3.772446e-05
## 11071    2 53016 3.772446e-05
## 11072    2 53016 3.772446e-05
## 11073    2 53016 3.772446e-05
## 11074    2 53016 3.772446e-05
## 11075    2 53016 3.772446e-05
## 11076    2 53016 3.772446e-05
## 11077    2 53016 3.772446e-05
## 11078    2 53016 3.772446e-05
## 11079    2 53016 3.772446e-05
## 11080    2 53016 3.772446e-05
## 11081    2 53016 3.772446e-05
## 11082    2 53016 3.772446e-05
## 11083    2 53016 3.772446e-05
## 11084    2 53016 3.772446e-05
## 11085    2 53016 3.772446e-05
## 11086    2 53016 3.772446e-05
## 11087    2 53016 3.772446e-05
## 11088    2 53016 3.772446e-05
## 11089    2 53016 3.772446e-05
## 11090    2 53016 3.772446e-05
## 11091    2 53016 3.772446e-05
## 11092    2 53016 3.772446e-05
## 11093    2 53016 3.772446e-05
## 11094    2 53016 3.772446e-05
## 11095    2 53016 3.772446e-05
## 11096    2 53016 3.772446e-05
## 11097    2 53016 3.772446e-05
## 11098    2 53016 3.772446e-05
## 11099    2 53016 3.772446e-05
## 11100    2 53016 3.772446e-05
## 11101    2 53016 3.772446e-05
## 11102    2 53016 3.772446e-05
## 11103    2 53016 3.772446e-05
## 11104    2 53016 3.772446e-05
## 11105    2 53016 3.772446e-05
## 11106    2 53016 3.772446e-05
## 11107    2 53016 3.772446e-05
## 11108    2 53016 3.772446e-05
## 11109    2 53016 3.772446e-05
## 11110    2 53016 3.772446e-05
## 11111    2 53016 3.772446e-05
## 11112    2 53016 3.772446e-05
## 11113    2 53016 3.772446e-05
## 11114    2 53016 3.772446e-05
## 11115    2 53016 3.772446e-05
## 11116    2 53016 3.772446e-05
## 11117    2 53016 3.772446e-05
## 11118    2 53016 3.772446e-05
## 11119    2 53016 3.772446e-05
## 11120    2 53016 3.772446e-05
## 11121    2 53016 3.772446e-05
## 11122    2 53016 3.772446e-05
## 11123    2 53016 3.772446e-05
## 11124    2 53016 3.772446e-05
## 11125    2 53016 3.772446e-05
## 11126    2 53016 3.772446e-05
## 11127    2 53016 3.772446e-05
## 11128    2 53016 3.772446e-05
## 11129    2 53016 3.772446e-05
## 11130    2 53016 3.772446e-05
## 11131    2 53016 3.772446e-05
## 11132    2 53016 3.772446e-05
## 11133    2 53016 3.772446e-05
## 11134    2 53016 3.772446e-05
## 11135    2 53016 3.772446e-05
## 11136    2 53016 3.772446e-05
## 11137    2 53016 3.772446e-05
## 11138    2 53016 3.772446e-05
## 11139    2 53016 3.772446e-05
## 11140    2 53016 3.772446e-05
## 11141    2 53016 3.772446e-05
## 11142    2 53016 3.772446e-05
## 11143    2 53016 3.772446e-05
## 11144    2 53016 3.772446e-05
## 11145    2 53016 3.772446e-05
## 11146    2 53016 3.772446e-05
## 11147    2 53016 3.772446e-05
## 11148    2 53016 3.772446e-05
## 11149    2 53016 3.772446e-05
## 11150    2 53016 3.772446e-05
## 11151    2 53016 3.772446e-05
## 11152    2 53016 3.772446e-05
## 11153    2 53016 3.772446e-05
## 11154    2 53016 3.772446e-05
## 11155    2 53016 3.772446e-05
## 11156    2 53016 3.772446e-05
## 11157    2 53016 3.772446e-05
## 11158    2 53016 3.772446e-05
## 11159    2 53016 3.772446e-05
## 11160    2 53016 3.772446e-05
## 11161    2 53016 3.772446e-05
## 11162    2 53016 3.772446e-05
## 11163    2 53016 3.772446e-05
## 11164    2 53016 3.772446e-05
## 11165    2 53016 3.772446e-05
## 11166    2 53016 3.772446e-05
## 11167    2 53016 3.772446e-05
## 11168    2 53016 3.772446e-05
## 11169    2 53016 3.772446e-05
## 11170    2 53016 3.772446e-05
## 11171    2 53016 3.772446e-05
## 11172    2 53016 3.772446e-05
## 11173    2 53016 3.772446e-05
## 11174    2 53016 3.772446e-05
## 11175    2 53016 3.772446e-05
## 11176    2 53016 3.772446e-05
## 11177    2 53016 3.772446e-05
## 11178    2 53016 3.772446e-05
## 11179    2 53016 3.772446e-05
## 11180    2 53016 3.772446e-05
## 11181    2 53016 3.772446e-05
## 11182    2 53016 3.772446e-05
## 11183    2 53016 3.772446e-05
## 11184    2 53016 3.772446e-05
## 11185    2 53016 3.772446e-05
## 11186    2 53016 3.772446e-05
## 11187    2 53016 3.772446e-05
## 11188    2 53016 3.772446e-05
## 11189    2 53016 3.772446e-05
## 11190    2 53016 3.772446e-05
## 11191    2 53016 3.772446e-05
## 11192    2 53016 3.772446e-05
## 11193    2 53016 3.772446e-05
## 11194    2 53016 3.772446e-05
## 11195    2 53016 3.772446e-05
## 11196    2 53016 3.772446e-05
## 11197    2 53016 3.772446e-05
## 11198    2 53016 3.772446e-05
## 11199    2 53016 3.772446e-05
## 11200    2 53016 3.772446e-05
## 11201    2 53016 3.772446e-05
## 11202    2 53016 3.772446e-05
## 11203    2 53016 3.772446e-05
## 11204    2 53016 3.772446e-05
## 11205    2 53016 3.772446e-05
## 11206    2 53016 3.772446e-05
## 11207    2 53016 3.772446e-05
## 11208    2 53016 3.772446e-05
## 11209    2 53016 3.772446e-05
## 11210    2 53016 3.772446e-05
## 11211    2 53016 3.772446e-05
## 11212    2 53016 3.772446e-05
## 11213    2 53016 3.772446e-05
## 11214    2 53016 3.772446e-05
## 11215    2 53016 3.772446e-05
## 11216    2 53016 3.772446e-05
## 11217    2 53016 3.772446e-05
## 11218    2 53016 3.772446e-05
## 11219    2 53016 3.772446e-05
## 11220    2 53016 3.772446e-05
## 11221    2 53016 3.772446e-05
## 11222    2 53016 3.772446e-05
## 11223    2 53016 3.772446e-05
## 11224    2 53016 3.772446e-05
## 11225    2 53016 3.772446e-05
## 11226    2 53016 3.772446e-05
## 11227    2 53016 3.772446e-05
## 11228    2 53016 3.772446e-05
## 11229    2 53016 3.772446e-05
## 11230    2 53016 3.772446e-05
## 11231    2 53016 3.772446e-05
## 11232    2 53016 3.772446e-05
## 11233    2 53016 3.772446e-05
## 11234    2 53016 3.772446e-05
## 11235    2 53016 3.772446e-05
## 11236    2 53016 3.772446e-05
## 11237    2 53016 3.772446e-05
## 11238    2 53016 3.772446e-05
## 11239    2 53016 3.772446e-05
## 11240    2 53016 3.772446e-05
## 11241    2 53016 3.772446e-05
## 11242    2 53016 3.772446e-05
## 11243    2 53016 3.772446e-05
## 11244    2 53016 3.772446e-05
## 11245    2 53016 3.772446e-05
## 11246    2 53016 3.772446e-05
## 11247    2 53016 3.772446e-05
## 11248    2 53016 3.772446e-05
## 11249    2 53016 3.772446e-05
## 11250    2 53016 3.772446e-05
## 11251    2 53016 3.772446e-05
## 11252    2 53016 3.772446e-05
## 11253    2 53016 3.772446e-05
## 11254    2 53016 3.772446e-05
## 11255    2 53016 3.772446e-05
## 11256    2 53016 3.772446e-05
## 11257    2 53016 3.772446e-05
## 11258    2 53016 3.772446e-05
## 11259    2 53016 3.772446e-05
## 11260    2 53016 3.772446e-05
## 11261    2 53016 3.772446e-05
## 11262    2 53016 3.772446e-05
## 11263    2 53016 3.772446e-05
## 11264    2 53016 3.772446e-05
## 11265    2 53016 3.772446e-05
## 11266    2 53016 3.772446e-05
## 11267    2 53016 3.772446e-05
## 11268    2 53016 3.772446e-05
## 11269    2 53016 3.772446e-05
## 11270    2 53016 3.772446e-05
## 11271    2 53016 3.772446e-05
## 11272    2 53016 3.772446e-05
## 11273    2 53016 3.772446e-05
## 11274    2 53016 3.772446e-05
## 11275    2 53016 3.772446e-05
## 11276    2 53016 3.772446e-05
## 11277    2 53016 3.772446e-05
## 11278    2 53016 3.772446e-05
## 11279    2 53016 3.772446e-05
## 11280    2 53016 3.772446e-05
## 11281    2 53016 3.772446e-05
## 11282    2 53016 3.772446e-05
## 11283    2 53016 3.772446e-05
## 11284    2 53016 3.772446e-05
## 11285    2 53016 3.772446e-05
## 11286    2 53016 3.772446e-05
## 11287    2 53016 3.772446e-05
## 11288    2 53016 3.772446e-05
## 11289    2 53016 3.772446e-05
## 11290    2 53016 3.772446e-05
## 11291    2 53016 3.772446e-05
## 11292    2 53016 3.772446e-05
## 11293    2 53016 3.772446e-05
## 11294    2 53016 3.772446e-05
## 11295    2 53016 3.772446e-05
## 11296    2 53016 3.772446e-05
## 11297    2 53016 3.772446e-05
## 11298    2 53016 3.772446e-05
## 11299    2 53016 3.772446e-05
## 11300    2 53016 3.772446e-05
## 11301    2 53016 3.772446e-05
## 11302    2 53016 3.772446e-05
## 11303    2 53016 3.772446e-05
## 11304    2 53016 3.772446e-05
## 11305    2 53016 3.772446e-05
## 11306    2 53016 3.772446e-05
## 11307    2 53016 3.772446e-05
## 11308    2 53016 3.772446e-05
## 11309    2 53016 3.772446e-05
## 11310    2 53016 3.772446e-05
## 11311    2 53016 3.772446e-05
## 11312    2 53016 3.772446e-05
## 11313    2 53016 3.772446e-05
## 11314    2 53016 3.772446e-05
## 11315    2 53016 3.772446e-05
## 11316    2 53016 3.772446e-05
## 11317    2 53016 3.772446e-05
## 11318    2 53016 3.772446e-05
## 11319    2 53016 3.772446e-05
## 11320    2 53016 3.772446e-05
## 11321    2 53016 3.772446e-05
## 11322    2 53016 3.772446e-05
## 11323    2 53016 3.772446e-05
## 11324    2 53016 3.772446e-05
## 11325    2 53016 3.772446e-05
## 11326    2 53016 3.772446e-05
## 11327    2 53016 3.772446e-05
## 11328    2 53016 3.772446e-05
## 11329    2 53016 3.772446e-05
## 11330    2 53016 3.772446e-05
## 11331    2 53016 3.772446e-05
## 11332    2 53016 3.772446e-05
## 11333    2 53016 3.772446e-05
## 11334    2 53016 3.772446e-05
## 11335    2 53016 3.772446e-05
## 11336    2 53016 3.772446e-05
## 11337    2 53016 3.772446e-05
## 11338    2 53016 3.772446e-05
## 11339    2 53016 3.772446e-05
## 11340    2 53016 3.772446e-05
## 11341    2 53016 3.772446e-05
## 11342    2 53016 3.772446e-05
## 11343    2 53016 3.772446e-05
## 11344    2 53016 3.772446e-05
## 11345    2 53016 3.772446e-05
## 11346    2 53016 3.772446e-05
## 11347    2 53016 3.772446e-05
## 11348    2 53016 3.772446e-05
## 11349    2 53016 3.772446e-05
## 11350    2 53016 3.772446e-05
## 11351    2 53016 3.772446e-05
## 11352    2 53016 3.772446e-05
## 11353    2 53016 3.772446e-05
## 11354    2 53016 3.772446e-05
## 11355    2 53016 3.772446e-05
## 11356    2 53016 3.772446e-05
## 11357    2 53016 3.772446e-05
## 11358    2 53016 3.772446e-05
## 11359    2 53016 3.772446e-05
## 11360    2 53016 3.772446e-05
## 11361    2 53016 3.772446e-05
## 11362    2 53016 3.772446e-05
## 11363    2 53016 3.772446e-05
## 11364    2 53016 3.772446e-05
## 11365    2 53016 3.772446e-05
## 11366    2 53016 3.772446e-05
## 11367    2 53016 3.772446e-05
## 11368    2 53016 3.772446e-05
## 11369    2 53016 3.772446e-05
## 11370    2 53016 3.772446e-05
## 11371    2 53016 3.772446e-05
## 11372    2 53016 3.772446e-05
## 11373    2 53016 3.772446e-05
## 11374    2 53016 3.772446e-05
## 11375    2 53016 3.772446e-05
## 11376    2 53016 3.772446e-05
## 11377    2 53016 3.772446e-05
## 11378    2 53016 3.772446e-05
## 11379    2 53016 3.772446e-05
## 11380    2 53016 3.772446e-05
## 11381    2 53016 3.772446e-05
## 11382    2 53016 3.772446e-05
## 11383    2 53016 3.772446e-05
## 11384    2 53016 3.772446e-05
## 11385    2 53016 3.772446e-05
## 11386    2 53016 3.772446e-05
## 11387    2 53016 3.772446e-05
## 11388    2 53016 3.772446e-05
## 11389    2 53016 3.772446e-05
## 11390    2 53016 3.772446e-05
## 11391    2 53016 3.772446e-05
## 11392    2 53016 3.772446e-05
## 11393    2 53016 3.772446e-05
## 11394    2 53016 3.772446e-05
## 11395    2 53016 3.772446e-05
## 11396    2 53016 3.772446e-05
## 11397    2 53016 3.772446e-05
## 11398    2 53016 3.772446e-05
## 11399    2 53016 3.772446e-05
## 11400    2 53016 3.772446e-05
## 11401    2 53016 3.772446e-05
## 11402    2 53016 3.772446e-05
## 11403    2 53016 3.772446e-05
## 11404    2 53016 3.772446e-05
## 11405    2 53016 3.772446e-05
## 11406    2 53016 3.772446e-05
## 11407    2 53016 3.772446e-05
## 11408    2 53016 3.772446e-05
## 11409    2 53016 3.772446e-05
## 11410    2 53016 3.772446e-05
## 11411    2 53016 3.772446e-05
## 11412    2 53016 3.772446e-05
## 11413    2 53016 3.772446e-05
## 11414    2 53016 3.772446e-05
## 11415    2 53016 3.772446e-05
## 11416    2 53016 3.772446e-05
## 11417    2 53016 3.772446e-05
## 11418    2 53016 3.772446e-05
## 11419    2 53016 3.772446e-05
## 11420    2 53016 3.772446e-05
## 11421    2 53016 3.772446e-05
## 11422    2 53016 3.772446e-05
## 11423    2 53016 3.772446e-05
## 11424    2 53016 3.772446e-05
## 11425    2 53016 3.772446e-05
## 11426    2 53016 3.772446e-05
## 11427    2 53016 3.772446e-05
## 11428    2 53016 3.772446e-05
## 11429    2 53016 3.772446e-05
## 11430    2 53016 3.772446e-05
## 11431    2 53016 3.772446e-05
## 11432    2 53016 3.772446e-05
## 11433    2 53016 3.772446e-05
## 11434    2 53016 3.772446e-05
## 11435    2 53016 3.772446e-05
## 11436    2 53016 3.772446e-05
## 11437    2 53016 3.772446e-05
## 11438    2 53016 3.772446e-05
## 11439    2 53016 3.772446e-05
## 11440    2 53016 3.772446e-05
## 11441    2 53016 3.772446e-05
## 11442    2 53016 3.772446e-05
## 11443    2 53016 3.772446e-05
## 11444    2 53016 3.772446e-05
## 11445    2 53016 3.772446e-05
## 11446    2 53016 3.772446e-05
## 11447    2 53016 3.772446e-05
## 11448    2 53016 3.772446e-05
## 11449    2 53016 3.772446e-05
## 11450    2 53016 3.772446e-05
## 11451    2 53016 3.772446e-05
## 11452    2 53016 3.772446e-05
## 11453    2 53016 3.772446e-05
## 11454    2 53016 3.772446e-05
## 11455    2 53016 3.772446e-05
## 11456    2 53016 3.772446e-05
## 11457    2 53016 3.772446e-05
## 11458    2 53016 3.772446e-05
## 11459    2 53016 3.772446e-05
## 11460    2 53016 3.772446e-05
## 11461    2 53016 3.772446e-05
## 11462    2 53016 3.772446e-05
## 11463    2 53016 3.772446e-05
## 11464    2 53016 3.772446e-05
## 11465    2 53016 3.772446e-05
## 11466    2 53016 3.772446e-05
## 11467    2 53016 3.772446e-05
## 11468    2 53016 3.772446e-05
## 11469    2 53016 3.772446e-05
## 11470    2 53016 3.772446e-05
## 11471    2 53016 3.772446e-05
## 11472    2 53016 3.772446e-05
## 11473    2 53016 3.772446e-05
## 11474    2 53016 3.772446e-05
## 11475    2 53016 3.772446e-05
## 11476    2 53016 3.772446e-05
## 11477    2 53016 3.772446e-05
## 11478    2 53016 3.772446e-05
## 11479    2 53016 3.772446e-05
## 11480    2 53016 3.772446e-05
## 11481    2 53016 3.772446e-05
## 11482    2 53016 3.772446e-05
## 11483    2 53016 3.772446e-05
## 11484    2 53016 3.772446e-05
## 11485    2 53016 3.772446e-05
## 11486    2 53016 3.772446e-05
## 11487    2 53016 3.772446e-05
## 11488    2 53016 3.772446e-05
## 11489    2 53016 3.772446e-05
## 11490    2 53016 3.772446e-05
## 11491    2 53016 3.772446e-05
## 11492    2 53016 3.772446e-05
## 11493    2 53016 3.772446e-05
## 11494    2 53016 3.772446e-05
## 11495    2 53016 3.772446e-05
## 11496    2 53016 3.772446e-05
## 11497    2 53016 3.772446e-05
## 11498    2 53016 3.772446e-05
## 11499    2 53016 3.772446e-05
## 11500    2 53016 3.772446e-05
## 11501    2 53016 3.772446e-05
## 11502    2 53016 3.772446e-05
## 11503    2 53016 3.772446e-05
## 11504    2 53016 3.772446e-05
## 11505    2 53016 3.772446e-05
## 11506    2 53016 3.772446e-05
## 11507    2 53016 3.772446e-05
## 11508    2 53016 3.772446e-05
## 11509    2 53016 3.772446e-05
## 11510    2 53016 3.772446e-05
## 11511    2 53016 3.772446e-05
## 11512    2 53016 3.772446e-05
## 11513    2 53016 3.772446e-05
## 11514    2 53016 3.772446e-05
## 11515    2 53016 3.772446e-05
## 11516    2 53016 3.772446e-05
## 11517    2 53016 3.772446e-05
## 11518    2 53016 3.772446e-05
## 11519    2 53016 3.772446e-05
## 11520    2 53016 3.772446e-05
## 11521    2 53016 3.772446e-05
## 11522    2 53016 3.772446e-05
## 11523    2 53016 3.772446e-05
## 11524    2 53016 3.772446e-05
## 11525    2 53016 3.772446e-05
## 11526    2 53016 3.772446e-05
## 11527    2 53016 3.772446e-05
## 11528    2 53016 3.772446e-05
## 11529    2 53016 3.772446e-05
## 11530    2 53016 3.772446e-05
## 11531    2 53016 3.772446e-05
## 11532    2 53016 3.772446e-05
## 11533    2 53016 3.772446e-05
## 11534    2 53016 3.772446e-05
## 11535    2 53016 3.772446e-05
## 11536    2 53016 3.772446e-05
## 11537    2 53016 3.772446e-05
## 11538    2 53016 3.772446e-05
## 11539    2 53016 3.772446e-05
## 11540    2 53016 3.772446e-05
## 11541    2 53016 3.772446e-05
## 11542    2 53016 3.772446e-05
## 11543    2 53016 3.772446e-05
## 11544    2 53016 3.772446e-05
## 11545    2 53016 3.772446e-05
## 11546    2 53016 3.772446e-05
## 11547    2 53016 3.772446e-05
## 11548    2 53016 3.772446e-05
## 11549    2 53016 3.772446e-05
## 11550    2 53016 3.772446e-05
## 11551    2 53016 3.772446e-05
## 11552    2 53016 3.772446e-05
## 11553    2 53016 3.772446e-05
## 11554    2 53016 3.772446e-05
## 11555    2 53016 3.772446e-05
## 11556    2 53016 3.772446e-05
## 11557    2 53016 3.772446e-05
## 11558    2 53016 3.772446e-05
## 11559    2 53016 3.772446e-05
## 11560    2 53016 3.772446e-05
## 11561    2 53016 3.772446e-05
## 11562    2 53016 3.772446e-05
## 11563    2 53016 3.772446e-05
## 11564    2 53016 3.772446e-05
## 11565    2 53016 3.772446e-05
## 11566    2 53016 3.772446e-05
## 11567    2 53016 3.772446e-05
## 11568    2 53016 3.772446e-05
## 11569    2 53016 3.772446e-05
## 11570    2 53016 3.772446e-05
## 11571    2 53016 3.772446e-05
## 11572    2 53016 3.772446e-05
## 11573    2 53016 3.772446e-05
## 11574    2 53016 3.772446e-05
## 11575    2 53016 3.772446e-05
## 11576    2 53016 3.772446e-05
## 11577    2 53016 3.772446e-05
## 11578    2 53016 3.772446e-05
## 11579    2 53016 3.772446e-05
## 11580    2 53016 3.772446e-05
## 11581    2 53016 3.772446e-05
## 11582    2 53016 3.772446e-05
## 11583    2 53016 3.772446e-05
## 11584    2 53016 3.772446e-05
## 11585    2 53016 3.772446e-05
## 11586    2 53016 3.772446e-05
## 11587    2 53016 3.772446e-05
## 11588    2 53016 3.772446e-05
## 11589    2 53016 3.772446e-05
## 11590    2 53016 3.772446e-05
## 11591    2 53016 3.772446e-05
## 11592    2 53016 3.772446e-05
## 11593    2 53016 3.772446e-05
## 11594    2 53016 3.772446e-05
## 11595    2 53016 3.772446e-05
## 11596    2 53016 3.772446e-05
## 11597    2 53016 3.772446e-05
## 11598    2 53016 3.772446e-05
## 11599    2 53016 3.772446e-05
## 11600    2 53016 3.772446e-05
## 11601    2 53016 3.772446e-05
## 11602    2 53016 3.772446e-05
## 11603    2 53016 3.772446e-05
## 11604    2 53016 3.772446e-05
## 11605    2 53016 3.772446e-05
## 11606    2 53016 3.772446e-05
## 11607    2 53016 3.772446e-05
## 11608    2 53016 3.772446e-05
## 11609    2 53016 3.772446e-05
## 11610    2 53016 3.772446e-05
## 11611    2 53016 3.772446e-05
## 11612    2 53016 3.772446e-05
## 11613    2 53016 3.772446e-05
## 11614    2 53016 3.772446e-05
## 11615    2 53016 3.772446e-05
## 11616    2 53016 3.772446e-05
## 11617    2 53016 3.772446e-05
## 11618    2 53016 3.772446e-05
## 11619    2 53016 3.772446e-05
## 11620    2 53016 3.772446e-05
## 11621    2 53016 3.772446e-05
## 11622    2 53016 3.772446e-05
## 11623    2 53016 3.772446e-05
## 11624    2 53016 3.772446e-05
## 11625    2 53016 3.772446e-05
## 11626    2 53016 3.772446e-05
## 11627    2 53016 3.772446e-05
## 11628    2 53016 3.772446e-05
## 11629    2 53016 3.772446e-05
## 11630    2 53016 3.772446e-05
## 11631    2 53016 3.772446e-05
## 11632    2 53016 3.772446e-05
## 11633    2 53016 3.772446e-05
## 11634    2 53016 3.772446e-05
## 11635    2 53016 3.772446e-05
## 11636    2 53016 3.772446e-05
## 11637    2 53016 3.772446e-05
## 11638    2 53016 3.772446e-05
## 11639    2 53016 3.772446e-05
## 11640    2 53016 3.772446e-05
## 11641    2 53016 3.772446e-05
## 11642    2 53016 3.772446e-05
## 11643    2 53016 3.772446e-05
## 11644    2 53016 3.772446e-05
## 11645    2 53016 3.772446e-05
## 11646    2 53016 3.772446e-05
## 11647    2 53016 3.772446e-05
## 11648    2 53016 3.772446e-05
## 11649    2 53016 3.772446e-05
## 11650    2 53016 3.772446e-05
## 11651    2 53016 3.772446e-05
## 11652    2 53016 3.772446e-05
## 11653    2 53016 3.772446e-05
## 11654    2 53016 3.772446e-05
## 11655    2 53016 3.772446e-05
## 11656    2 53016 3.772446e-05
## 11657    2 53016 3.772446e-05
## 11658    2 53016 3.772446e-05
## 11659    2 53016 3.772446e-05
## 11660    2 53016 3.772446e-05
## 11661    2 53016 3.772446e-05
## 11662    2 53016 3.772446e-05
## 11663    2 53016 3.772446e-05
## 11664    2 53016 3.772446e-05
## 11665    2 53016 3.772446e-05
## 11666    2 53016 3.772446e-05
## 11667    2 53016 3.772446e-05
## 11668    2 53016 3.772446e-05
## 11669    2 53016 3.772446e-05
## 11670    2 53016 3.772446e-05
## 11671    2 53016 3.772446e-05
## 11672    2 53016 3.772446e-05
## 11673    2 53016 3.772446e-05
## 11674    2 53016 3.772446e-05
## 11675    2 53016 3.772446e-05
## 11676    2 53016 3.772446e-05
## 11677    2 53016 3.772446e-05
## 11678    2 53016 3.772446e-05
## 11679    2 53016 3.772446e-05
## 11680    2 53016 3.772446e-05
## 11681    2 53016 3.772446e-05
## 11682    2 53016 3.772446e-05
## 11683    2 53016 3.772446e-05
## 11684    2 53016 3.772446e-05
## 11685    2 53016 3.772446e-05
## 11686    2 53016 3.772446e-05
## 11687    2 53016 3.772446e-05
## 11688    2 53016 3.772446e-05
## 11689    2 53016 3.772446e-05
## 11690    2 53016 3.772446e-05
## 11691    2 53016 3.772446e-05
## 11692    2 53016 3.772446e-05
## 11693    2 53016 3.772446e-05
## 11694    2 53016 3.772446e-05
## 11695    2 53016 3.772446e-05
## 11696    2 53016 3.772446e-05
## 11697    2 53016 3.772446e-05
## 11698    2 53016 3.772446e-05
## 11699    2 53016 3.772446e-05
## 11700    2 53016 3.772446e-05
## 11701    2 53016 3.772446e-05
## 11702    2 53016 3.772446e-05
## 11703    2 53016 3.772446e-05
## 11704    2 53016 3.772446e-05
## 11705    2 53016 3.772446e-05
## 11706    2 53016 3.772446e-05
## 11707    2 53016 3.772446e-05
## 11708    2 53016 3.772446e-05
## 11709    2 53016 3.772446e-05
## 11710    2 53016 3.772446e-05
## 11711    2 53016 3.772446e-05
## 11712    2 53016 3.772446e-05
## 11713    2 53016 3.772446e-05
## 11714    2 53016 3.772446e-05
## 11715    2 53016 3.772446e-05
## 11716    2 53016 3.772446e-05
## 11717    2 53016 3.772446e-05
## 11718    2 53016 3.772446e-05
## 11719    2 53016 3.772446e-05
## 11720    2 53016 3.772446e-05
## 11721    2 53016 3.772446e-05
## 11722    2 53016 3.772446e-05
## 11723    2 53016 3.772446e-05
## 11724    2 53016 3.772446e-05
## 11725    2 53016 3.772446e-05
## 11726    2 53016 3.772446e-05
## 11727    2 53016 3.772446e-05
## 11728    2 53016 3.772446e-05
## 11729    2 53016 3.772446e-05
## 11730    2 53016 3.772446e-05
## 11731    2 53016 3.772446e-05
## 11732    2 53016 3.772446e-05
## 11733    2 53016 3.772446e-05
## 11734    2 53016 3.772446e-05
## 11735    2 53016 3.772446e-05
## 11736    2 53016 3.772446e-05
## 11737    2 53016 3.772446e-05
## 11738    2 53016 3.772446e-05
## 11739    2 53016 3.772446e-05
## 11740    2 53016 3.772446e-05
## 11741    2 53016 3.772446e-05
## 11742    2 53016 3.772446e-05
## 11743    2 53016 3.772446e-05
## 11744    2 53016 3.772446e-05
## 11745    2 53016 3.772446e-05
## 11746    2 53016 3.772446e-05
## 11747    2 53016 3.772446e-05
## 11748    2 53016 3.772446e-05
## 11749    2 53016 3.772446e-05
## 11750    2 53016 3.772446e-05
## 11751    2 53016 3.772446e-05
## 11752    2 53016 3.772446e-05
## 11753    2 53016 3.772446e-05
## 11754    2 53016 3.772446e-05
## 11755    2 53016 3.772446e-05
## 11756    2 53016 3.772446e-05
## 11757    2 53016 3.772446e-05
## 11758    2 53016 3.772446e-05
## 11759    2 53016 3.772446e-05
## 11760    2 53016 3.772446e-05
## 11761    2 53016 3.772446e-05
## 11762    2 53016 3.772446e-05
## 11763    2 53016 3.772446e-05
## 11764    2 53016 3.772446e-05
## 11765    2 53016 3.772446e-05
## 11766    2 53016 3.772446e-05
## 11767    2 53016 3.772446e-05
## 11768    2 53016 3.772446e-05
## 11769    2 53016 3.772446e-05
## 11770    2 53016 3.772446e-05
## 11771    2 53016 3.772446e-05
## 11772    2 53016 3.772446e-05
## 11773    2 53016 3.772446e-05
## 11774    2 53016 3.772446e-05
## 11775    2 53016 3.772446e-05
## 11776    2 53016 3.772446e-05
## 11777    2 53016 3.772446e-05
## 11778    2 53016 3.772446e-05
## 11779    2 53016 3.772446e-05
## 11780    2 53016 3.772446e-05
## 11781    2 53016 3.772446e-05
## 11782    2 53016 3.772446e-05
## 11783    2 53016 3.772446e-05
## 11784    2 53016 3.772446e-05
## 11785    2 53016 3.772446e-05
## 11786    2 53016 3.772446e-05
## 11787    2 53016 3.772446e-05
## 11788    2 53016 3.772446e-05
## 11789    2 53016 3.772446e-05
## 11790    2 53016 3.772446e-05
## 11791    2 53016 3.772446e-05
## 11792    2 53016 3.772446e-05
## 11793    2 53016 3.772446e-05
## 11794    2 53016 3.772446e-05
## 11795    2 53016 3.772446e-05
## 11796    2 53016 3.772446e-05
## 11797    2 53016 3.772446e-05
## 11798    2 53016 3.772446e-05
## 11799    2 53016 3.772446e-05
## 11800    2 53016 3.772446e-05
## 11801    2 53016 3.772446e-05
## 11802    2 53016 3.772446e-05
## 11803    2 53016 3.772446e-05
## 11804    2 53016 3.772446e-05
## 11805    2 53016 3.772446e-05
## 11806    2 53016 3.772446e-05
## 11807    2 53016 3.772446e-05
## 11808    2 53016 3.772446e-05
## 11809    2 53016 3.772446e-05
## 11810    2 53016 3.772446e-05
## 11811    2 53016 3.772446e-05
## 11812    2 53016 3.772446e-05
## 11813    2 53016 3.772446e-05
## 11814    2 53016 3.772446e-05
## 11815    2 53016 3.772446e-05
## 11816    2 53016 3.772446e-05
## 11817    2 53016 3.772446e-05
## 11818    2 53016 3.772446e-05
## 11819    2 53016 3.772446e-05
## 11820    2 53016 3.772446e-05
## 11821    2 53016 3.772446e-05
## 11822    2 53016 3.772446e-05
## 11823    2 53016 3.772446e-05
## 11824    2 53016 3.772446e-05
## 11825    2 53016 3.772446e-05
## 11826    2 53016 3.772446e-05
## 11827    2 53016 3.772446e-05
## 11828    2 53016 3.772446e-05
## 11829    2 53016 3.772446e-05
## 11830    2 53016 3.772446e-05
## 11831    2 53016 3.772446e-05
## 11832    2 53016 3.772446e-05
## 11833    2 53016 3.772446e-05
## 11834    2 53016 3.772446e-05
## 11835    2 53016 3.772446e-05
## 11836    2 53016 3.772446e-05
## 11837    2 53016 3.772446e-05
## 11838    2 53016 3.772446e-05
## 11839    2 53016 3.772446e-05
## 11840    2 53016 3.772446e-05
## 11841    2 53016 3.772446e-05
## 11842    2 53016 3.772446e-05
## 11843    2 53016 3.772446e-05
## 11844    2 53016 3.772446e-05
## 11845    2 53016 3.772446e-05
## 11846    2 53016 3.772446e-05
## 11847    2 53016 3.772446e-05
## 11848    2 53016 3.772446e-05
## 11849    2 53016 3.772446e-05
## 11850    2 53016 3.772446e-05
## 11851    2 53016 3.772446e-05
## 11852    2 53016 3.772446e-05
## 11853    2 53016 3.772446e-05
## 11854    2 53016 3.772446e-05
## 11855    2 53016 3.772446e-05
## 11856    2 53016 3.772446e-05
## 11857    2 53016 3.772446e-05
## 11858    2 53016 3.772446e-05
## 11859    2 53016 3.772446e-05
## 11860    2 53016 3.772446e-05
## 11861    2 53016 3.772446e-05
## 11862    2 53016 3.772446e-05
## 11863    2 53016 3.772446e-05
## 11864    2 53016 3.772446e-05
## 11865    2 53016 3.772446e-05
## 11866    2 53016 3.772446e-05
## 11867    2 53016 3.772446e-05
## 11868    2 53016 3.772446e-05
## 11869    2 53016 3.772446e-05
## 11870    2 53016 3.772446e-05
## 11871    2 53016 3.772446e-05
## 11872    2 53016 3.772446e-05
## 11873    2 53016 3.772446e-05
## 11874    2 53016 3.772446e-05
## 11875    2 53016 3.772446e-05
## 11876    2 53016 3.772446e-05
## 11877    2 53016 3.772446e-05
## 11878    2 53016 3.772446e-05
## 11879    2 53016 3.772446e-05
## 11880    2 53016 3.772446e-05
## 11881    2 53016 3.772446e-05
## 11882    2 53016 3.772446e-05
## 11883    2 53016 3.772446e-05
## 11884    2 53016 3.772446e-05
## 11885    2 53016 3.772446e-05
## 11886    2 53016 3.772446e-05
## 11887    2 53016 3.772446e-05
## 11888    2 53016 3.772446e-05
## 11889    2 53016 3.772446e-05
## 11890    2 53016 3.772446e-05
## 11891    2 53016 3.772446e-05
## 11892    2 53016 3.772446e-05
## 11893    2 53016 3.772446e-05
## 11894    2 53016 3.772446e-05
## 11895    2 53016 3.772446e-05
## 11896    2 53016 3.772446e-05
## 11897    2 53016 3.772446e-05
## 11898    2 53016 3.772446e-05
## 11899    2 53016 3.772446e-05
## 11900    2 53016 3.772446e-05
## 11901    2 53016 3.772446e-05
## 11902    2 53016 3.772446e-05
## 11903    2 53016 3.772446e-05
## 11904    2 53016 3.772446e-05
## 11905    2 53016 3.772446e-05
## 11906    2 53016 3.772446e-05
## 11907    2 53016 3.772446e-05
## 11908    2 53016 3.772446e-05
## 11909    2 53016 3.772446e-05
## 11910    2 53016 3.772446e-05
## 11911    2 53016 3.772446e-05
## 11912    2 53016 3.772446e-05
## 11913    2 53016 3.772446e-05
## 11914    2 53016 3.772446e-05
## 11915    2 53016 3.772446e-05
## 11916    2 53016 3.772446e-05
## 11917    2 53016 3.772446e-05
## 11918    2 53016 3.772446e-05
## 11919    2 53016 3.772446e-05
## 11920    2 53016 3.772446e-05
## 11921    2 53016 3.772446e-05
## 11922    2 53016 3.772446e-05
## 11923    2 53016 3.772446e-05
## 11924    2 53016 3.772446e-05
## 11925    2 53016 3.772446e-05
## 11926    2 53016 3.772446e-05
## 11927    2 53016 3.772446e-05
## 11928    2 53016 3.772446e-05
## 11929    2 53016 3.772446e-05
## 11930    2 53016 3.772446e-05
## 11931    2 53016 3.772446e-05
## 11932    2 53016 3.772446e-05
## 11933    2 53016 3.772446e-05
## 11934    2 53016 3.772446e-05
## 11935    2 53016 3.772446e-05
## 11936    2 53016 3.772446e-05
## 11937    2 53016 3.772446e-05
## 11938    2 53016 3.772446e-05
## 11939    2 53016 3.772446e-05
## 11940    2 53016 3.772446e-05
## 11941    2 53016 3.772446e-05
## 11942    2 53016 3.772446e-05
## 11943    2 53016 3.772446e-05
## 11944    2 53016 3.772446e-05
## 11945    2 53016 3.772446e-05
## 11946    2 53016 3.772446e-05
## 11947    2 53016 3.772446e-05
## 11948    2 53016 3.772446e-05
## 11949    2 53016 3.772446e-05
## 11950    2 53016 3.772446e-05
## 11951    2 53016 3.772446e-05
## 11952    2 53016 3.772446e-05
## 11953    2 53016 3.772446e-05
## 11954    2 53016 3.772446e-05
## 11955    2 53016 3.772446e-05
## 11956    2 53016 3.772446e-05
## 11957    2 53016 3.772446e-05
## 11958    2 53016 3.772446e-05
## 11959    2 53016 3.772446e-05
## 11960    2 53016 3.772446e-05
## 11961    2 53016 3.772446e-05
## 11962    2 53016 3.772446e-05
## 11963    2 53016 3.772446e-05
## 11964    2 53016 3.772446e-05
## 11965    2 53016 3.772446e-05
## 11966    2 53016 3.772446e-05
## 11967    2 53016 3.772446e-05
## 11968    2 53016 3.772446e-05
## 11969    2 53016 3.772446e-05
## 11970    2 53016 3.772446e-05
## 11971    2 53016 3.772446e-05
## 11972    2 53016 3.772446e-05
## 11973    2 53016 3.772446e-05
## 11974    2 53016 3.772446e-05
## 11975    2 53016 3.772446e-05
## 11976    2 53016 3.772446e-05
## 11977    2 53016 3.772446e-05
## 11978    2 53016 3.772446e-05
## 11979    2 53016 3.772446e-05
## 11980    2 53016 3.772446e-05
## 11981    2 53016 3.772446e-05
## 11982    2 53016 3.772446e-05
## 11983    2 53016 3.772446e-05
## 11984    2 53016 3.772446e-05
## 11985    2 53016 3.772446e-05
## 11986    2 53016 3.772446e-05
## 11987    2 53016 3.772446e-05
## 11988    2 53016 3.772446e-05
## 11989    2 53016 3.772446e-05
## 11990    2 53016 3.772446e-05
## 11991    2 53016 3.772446e-05
## 11992    2 53016 3.772446e-05
## 11993    2 53016 3.772446e-05
## 11994    2 53016 3.772446e-05
## 11995    2 53016 3.772446e-05
## 11996    2 53016 3.772446e-05
## 11997    2 53016 3.772446e-05
## 11998    2 53016 3.772446e-05
## 11999    2 53016 3.772446e-05
## 12000    2 53016 3.772446e-05
## 12001    2 53016 3.772446e-05
## 12002    2 53016 3.772446e-05
## 12003    2 53016 3.772446e-05
## 12004    2 53016 3.772446e-05
## 12005    2 53016 3.772446e-05
## 12006    2 53016 3.772446e-05
## 12007    2 53016 3.772446e-05
## 12008    2 53016 3.772446e-05
## 12009    2 53016 3.772446e-05
## 12010    2 53016 3.772446e-05
## 12011    2 53016 3.772446e-05
## 12012    2 53016 3.772446e-05
## 12013    2 53016 3.772446e-05
## 12014    2 53016 3.772446e-05
## 12015    2 53016 3.772446e-05
## 12016    2 53016 3.772446e-05
## 12017    2 53016 3.772446e-05
## 12018    2 53016 3.772446e-05
## 12019    2 53016 3.772446e-05
## 12020    2 53016 3.772446e-05
## 12021    2 53016 3.772446e-05
## 12022    2 53016 3.772446e-05
## 12023    2 53016 3.772446e-05
## 12024    2 53016 3.772446e-05
## 12025    2 53016 3.772446e-05
## 12026    2 53016 3.772446e-05
## 12027    2 53016 3.772446e-05
## 12028    2 53016 3.772446e-05
## 12029    2 53016 3.772446e-05
## 12030    2 53016 3.772446e-05
## 12031    2 53016 3.772446e-05
## 12032    2 53016 3.772446e-05
## 12033    2 53016 3.772446e-05
## 12034    2 53016 3.772446e-05
## 12035    2 53016 3.772446e-05
## 12036    2 53016 3.772446e-05
## 12037    2 53016 3.772446e-05
## 12038    2 53016 3.772446e-05
## 12039    2 53016 3.772446e-05
## 12040    2 53016 3.772446e-05
## 12041    2 53016 3.772446e-05
## 12042    2 53016 3.772446e-05
## 12043    2 53016 3.772446e-05
## 12044    2 53016 3.772446e-05
## 12045    2 53016 3.772446e-05
## 12046    2 53016 3.772446e-05
## 12047    2 53016 3.772446e-05
## 12048    2 53016 3.772446e-05
## 12049    2 53016 3.772446e-05
## 12050    2 53016 3.772446e-05
## 12051    2 53016 3.772446e-05
## 12052    2 53016 3.772446e-05
## 12053    2 53016 3.772446e-05
## 12054    2 53016 3.772446e-05
## 12055    2 53016 3.772446e-05
## 12056    2 53016 3.772446e-05
## 12057    2 53016 3.772446e-05
## 12058    2 53016 3.772446e-05
## 12059    2 53016 3.772446e-05
## 12060    2 53016 3.772446e-05
## 12061    2 53016 3.772446e-05
## 12062    2 53016 3.772446e-05
## 12063    2 53016 3.772446e-05
## 12064    2 53016 3.772446e-05
## 12065    2 53016 3.772446e-05
## 12066    2 53016 3.772446e-05
## 12067    2 53016 3.772446e-05
## 12068    2 53016 3.772446e-05
## 12069    2 53016 3.772446e-05
## 12070    2 53016 3.772446e-05
## 12071    2 53016 3.772446e-05
## 12072    2 53016 3.772446e-05
## 12073    2 53016 3.772446e-05
## 12074    2 53016 3.772446e-05
## 12075    2 53016 3.772446e-05
## 12076    2 53016 3.772446e-05
## 12077    2 53016 3.772446e-05
## 12078    2 53016 3.772446e-05
## 12079    2 53016 3.772446e-05
## 12080    2 53016 3.772446e-05
## 12081    2 53016 3.772446e-05
## 12082    2 53016 3.772446e-05
## 12083    2 53016 3.772446e-05
## 12084    2 53016 3.772446e-05
## 12085    2 53016 3.772446e-05
## 12086    2 53016 3.772446e-05
## 12087    2 53016 3.772446e-05
## 12088    2 53016 3.772446e-05
## 12089    2 53016 3.772446e-05
## 12090    2 53016 3.772446e-05
## 12091    2 53016 3.772446e-05
## 12092    2 53016 3.772446e-05
## 12093    2 53016 3.772446e-05
## 12094    2 53016 3.772446e-05
## 12095    2 53016 3.772446e-05
## 12096    2 53016 3.772446e-05
## 12097    2 53016 3.772446e-05
## 12098    2 53016 3.772446e-05
## 12099    2 53016 3.772446e-05
## 12100    2 53016 3.772446e-05
## 12101    2 53016 3.772446e-05
## 12102    2 53016 3.772446e-05
## 12103    2 53016 3.772446e-05
## 12104    2 53016 3.772446e-05
## 12105    2 53016 3.772446e-05
## 12106    2 53016 3.772446e-05
## 12107    2 53016 3.772446e-05
## 12108    2 53016 3.772446e-05
## 12109    2 53016 3.772446e-05
## 12110    2 53016 3.772446e-05
## 12111    2 53016 3.772446e-05
## 12112    2 53016 3.772446e-05
## 12113    2 53016 3.772446e-05
## 12114    2 53016 3.772446e-05
## 12115    2 53016 3.772446e-05
## 12116    2 53016 3.772446e-05
## 12117    2 53016 3.772446e-05
## 12118    2 53016 3.772446e-05
## 12119    2 53016 3.772446e-05
## 12120    2 53016 3.772446e-05
## 12121    2 53016 3.772446e-05
## 12122    2 53016 3.772446e-05
## 12123    2 53016 3.772446e-05
## 12124    2 53016 3.772446e-05
## 12125    2 53016 3.772446e-05
## 12126    2 53016 3.772446e-05
## 12127    2 53016 3.772446e-05
## 12128    2 53016 3.772446e-05
## 12129    2 53016 3.772446e-05
## 12130    2 53016 3.772446e-05
## 12131    2 53016 3.772446e-05
## 12132    2 53016 3.772446e-05
## 12133    2 53016 3.772446e-05
## 12134    2 53016 3.772446e-05
## 12135    2 53016 3.772446e-05
## 12136    2 53016 3.772446e-05
## 12137    2 53016 3.772446e-05
## 12138    2 53016 3.772446e-05
## 12139    2 53016 3.772446e-05
## 12140    2 53016 3.772446e-05
## 12141    2 53016 3.772446e-05
## 12142    2 53016 3.772446e-05
## 12143    2 53016 3.772446e-05
## 12144    2 53016 3.772446e-05
## 12145    2 53016 3.772446e-05
## 12146    2 53016 3.772446e-05
## 12147    2 53016 3.772446e-05
## 12148    2 53016 3.772446e-05
## 12149    2 53016 3.772446e-05
## 12150    2 53016 3.772446e-05
## 12151    2 53016 3.772446e-05
## 12152    2 53016 3.772446e-05
## 12153    2 53016 3.772446e-05
## 12154    2 53016 3.772446e-05
## 12155    2 53016 3.772446e-05
## 12156    2 53016 3.772446e-05
## 12157    2 53016 3.772446e-05
## 12158    2 53016 3.772446e-05
## 12159    2 53016 3.772446e-05
## 12160    2 53016 3.772446e-05
## 12161    2 53016 3.772446e-05
## 12162    2 53016 3.772446e-05
## 12163    2 53016 3.772446e-05
## 12164    2 53016 3.772446e-05
## 12165    2 53016 3.772446e-05
## 12166    2 53016 3.772446e-05
## 12167    2 53016 3.772446e-05
## 12168    2 53016 3.772446e-05
## 12169    2 53016 3.772446e-05
## 12170    2 53016 3.772446e-05
## 12171    2 53016 3.772446e-05
## 12172    2 53016 3.772446e-05
## 12173    2 53016 3.772446e-05
## 12174    2 53016 3.772446e-05
## 12175    2 53016 3.772446e-05
## 12176    2 53016 3.772446e-05
## 12177    2 53016 3.772446e-05
## 12178    2 53016 3.772446e-05
## 12179    2 53016 3.772446e-05
## 12180    2 53016 3.772446e-05
## 12181    2 53016 3.772446e-05
## 12182    2 53016 3.772446e-05
## 12183    2 53016 3.772446e-05
## 12184    2 53016 3.772446e-05
## 12185    2 53016 3.772446e-05
## 12186    2 53016 3.772446e-05
## 12187    2 53016 3.772446e-05
## 12188    2 53016 3.772446e-05
## 12189    2 53016 3.772446e-05
## 12190    2 53016 3.772446e-05
## 12191    2 53016 3.772446e-05
## 12192    2 53016 3.772446e-05
## 12193    2 53016 3.772446e-05
## 12194    2 53016 3.772446e-05
## 12195    2 53016 3.772446e-05
## 12196    2 53016 3.772446e-05
## 12197    2 53016 3.772446e-05
## 12198    2 53016 3.772446e-05
## 12199    2 53016 3.772446e-05
## 12200    2 53016 3.772446e-05
## 12201    2 53016 3.772446e-05
## 12202    2 53016 3.772446e-05
## 12203    2 53016 3.772446e-05
## 12204    2 53016 3.772446e-05
## 12205    2 53016 3.772446e-05
## 12206    2 53016 3.772446e-05
## 12207    2 53016 3.772446e-05
## 12208    2 53016 3.772446e-05
## 12209    2 53016 3.772446e-05
## 12210    2 53016 3.772446e-05
## 12211    2 53016 3.772446e-05
## 12212    2 53016 3.772446e-05
## 12213    2 53016 3.772446e-05
## 12214    2 53016 3.772446e-05
## 12215    2 53016 3.772446e-05
## 12216    2 53016 3.772446e-05
## 12217    2 53016 3.772446e-05
## 12218    2 53016 3.772446e-05
## 12219    2 53016 3.772446e-05
## 12220    2 53016 3.772446e-05
## 12221    2 53016 3.772446e-05
## 12222    2 53016 3.772446e-05
## 12223    2 53016 3.772446e-05
## 12224    2 53016 3.772446e-05
## 12225    2 53016 3.772446e-05
## 12226    2 53016 3.772446e-05
## 12227    2 53016 3.772446e-05
## 12228    2 53016 3.772446e-05
## 12229    2 53016 3.772446e-05
## 12230    2 53016 3.772446e-05
## 12231    2 53016 3.772446e-05
## 12232    2 53016 3.772446e-05
## 12233    2 53016 3.772446e-05
## 12234    2 53016 3.772446e-05
## 12235    2 53016 3.772446e-05
## 12236    2 53016 3.772446e-05
## 12237    2 53016 3.772446e-05
## 12238    2 53016 3.772446e-05
## 12239    2 53016 3.772446e-05
## 12240    2 53016 3.772446e-05
## 12241    2 53016 3.772446e-05
## 12242    2 53016 3.772446e-05
## 12243    2 53016 3.772446e-05
## 12244    2 53016 3.772446e-05
## 12245    2 53016 3.772446e-05
## 12246    2 53016 3.772446e-05
## 12247    2 53016 3.772446e-05
## 12248    2 53016 3.772446e-05
## 12249    2 53016 3.772446e-05
## 12250    2 53016 3.772446e-05
## 12251    2 53016 3.772446e-05
## 12252    2 53016 3.772446e-05
## 12253    2 53016 3.772446e-05
## 12254    2 53016 3.772446e-05
## 12255    2 53016 3.772446e-05
## 12256    2 53016 3.772446e-05
## 12257    2 53016 3.772446e-05
## 12258    2 53016 3.772446e-05
## 12259    2 53016 3.772446e-05
## 12260    2 53016 3.772446e-05
## 12261    2 53016 3.772446e-05
## 12262    2 53016 3.772446e-05
## 12263    2 53016 3.772446e-05
## 12264    2 53016 3.772446e-05
## 12265    2 53016 3.772446e-05
## 12266    2 53016 3.772446e-05
## 12267    2 53016 3.772446e-05
## 12268    2 53016 3.772446e-05
## 12269    2 53016 3.772446e-05
## 12270    2 53016 3.772446e-05
## 12271    2 53016 3.772446e-05
## 12272    2 53016 3.772446e-05
## 12273    2 53016 3.772446e-05
## 12274    2 53016 3.772446e-05
## 12275    2 53016 3.772446e-05
## 12276    2 53016 3.772446e-05
## 12277    2 53016 3.772446e-05
## 12278    2 53016 3.772446e-05
## 12279    2 53016 3.772446e-05
## 12280    2 53016 3.772446e-05
## 12281    2 53016 3.772446e-05
## 12282    2 53016 3.772446e-05
## 12283    2 53016 3.772446e-05
## 12284    2 53016 3.772446e-05
## 12285    2 53016 3.772446e-05
## 12286    2 53016 3.772446e-05
## 12287    2 53016 3.772446e-05
## 12288    2 53016 3.772446e-05
## 12289    2 53016 3.772446e-05
## 12290    2 53016 3.772446e-05
## 12291    2 53016 3.772446e-05
## 12292    2 53016 3.772446e-05
## 12293    2 53016 3.772446e-05
## 12294    2 53016 3.772446e-05
## 12295    2 53016 3.772446e-05
## 12296    2 53016 3.772446e-05
## 12297    2 53016 3.772446e-05
## 12298    2 53016 3.772446e-05
## 12299    2 53016 3.772446e-05
## 12300    2 53016 3.772446e-05
## 12301    2 53016 3.772446e-05
## 12302    2 53016 3.772446e-05
## 12303    2 53016 3.772446e-05
## 12304    2 53016 3.772446e-05
## 12305    2 53016 3.772446e-05
## 12306    2 53016 3.772446e-05
## 12307    2 53016 3.772446e-05
## 12308    2 53016 3.772446e-05
## 12309    2 53016 3.772446e-05
## 12310    2 53016 3.772446e-05
## 12311    2 53016 3.772446e-05
## 12312    2 53016 3.772446e-05
## 12313    2 53016 3.772446e-05
## 12314    2 53016 3.772446e-05
## 12315    2 53016 3.772446e-05
## 12316    2 53016 3.772446e-05
## 12317    2 53016 3.772446e-05
## 12318    2 53016 3.772446e-05
## 12319    2 53016 3.772446e-05
## 12320    2 53016 3.772446e-05
## 12321    2 53016 3.772446e-05
## 12322    2 53016 3.772446e-05
## 12323    2 53016 3.772446e-05
## 12324    2 53016 3.772446e-05
## 12325    2 53016 3.772446e-05
## 12326    2 53016 3.772446e-05
## 12327    2 53016 3.772446e-05
## 12328    2 53016 3.772446e-05
## 12329    2 53016 3.772446e-05
## 12330    2 53016 3.772446e-05
## 12331    2 53016 3.772446e-05
## 12332    2 53016 3.772446e-05
## 12333    2 53016 3.772446e-05
## 12334    2 53016 3.772446e-05
## 12335    2 53016 3.772446e-05
## 12336    2 53016 3.772446e-05
## 12337    2 53016 3.772446e-05
## 12338    2 53016 3.772446e-05
## 12339    2 53016 3.772446e-05
## 12340    2 53016 3.772446e-05
## 12341    2 53016 3.772446e-05
## 12342    2 53016 3.772446e-05
## 12343    2 53016 3.772446e-05
## 12344    2 53016 3.772446e-05
## 12345    2 53016 3.772446e-05
## 12346    2 53016 3.772446e-05
## 12347    2 53016 3.772446e-05
## 12348    2 53016 3.772446e-05
## 12349    2 53016 3.772446e-05
## 12350    2 53016 3.772446e-05
## 12351    2 53016 3.772446e-05
## 12352    2 53016 3.772446e-05
## 12353    2 53016 3.772446e-05
## 12354    2 53016 3.772446e-05
## 12355    2 53016 3.772446e-05
## 12356    2 53016 3.772446e-05
## 12357    2 53016 3.772446e-05
## 12358    2 53016 3.772446e-05
## 12359    2 53016 3.772446e-05
## 12360    2 53016 3.772446e-05
## 12361    2 53016 3.772446e-05
## 12362    2 53016 3.772446e-05
## 12363    2 53016 3.772446e-05
## 12364    2 53016 3.772446e-05
## 12365    2 53016 3.772446e-05
## 12366    2 53016 3.772446e-05
## 12367    2 53016 3.772446e-05
## 12368    2 53016 3.772446e-05
## 12369    2 53016 3.772446e-05
## 12370    2 53016 3.772446e-05
## 12371    2 53016 3.772446e-05
## 12372    2 53016 3.772446e-05
## 12373    2 53016 3.772446e-05
## 12374    2 53016 3.772446e-05
## 12375    2 53016 3.772446e-05
## 12376    2 53016 3.772446e-05
## 12377    2 53016 3.772446e-05
## 12378    2 53016 3.772446e-05
## 12379    2 53016 3.772446e-05
## 12380    2 53016 3.772446e-05
## 12381    2 53016 3.772446e-05
## 12382    2 53016 3.772446e-05
## 12383    2 53016 3.772446e-05
## 12384    2 53016 3.772446e-05
## 12385    2 53016 3.772446e-05
## 12386    2 53016 3.772446e-05
## 12387    2 53016 3.772446e-05
## 12388    2 53016 3.772446e-05
## 12389    2 53016 3.772446e-05
## 12390    2 53016 3.772446e-05
## 12391    2 53016 3.772446e-05
## 12392    2 53016 3.772446e-05
## 12393    2 53016 3.772446e-05
## 12394    2 53016 3.772446e-05
## 12395    2 53016 3.772446e-05
## 12396    2 53016 3.772446e-05
## 12397    2 53016 3.772446e-05
## 12398    2 53016 3.772446e-05
## 12399    2 53016 3.772446e-05
## 12400    2 53016 3.772446e-05
## 12401    2 53016 3.772446e-05
## 12402    2 53016 3.772446e-05
## 12403    2 53016 3.772446e-05
## 12404    2 53016 3.772446e-05
## 12405    2 53016 3.772446e-05
## 12406    2 53016 3.772446e-05
## 12407    2 53016 3.772446e-05
## 12408    2 53016 3.772446e-05
## 12409    2 53016 3.772446e-05
## 12410    2 53016 3.772446e-05
## 12411    2 53016 3.772446e-05
## 12412    2 53016 3.772446e-05
## 12413    2 53016 3.772446e-05
## 12414    2 53016 3.772446e-05
## 12415    2 53016 3.772446e-05
## 12416    2 53016 3.772446e-05
## 12417    2 53016 3.772446e-05
## 12418    2 53016 3.772446e-05
## 12419    2 53016 3.772446e-05
## 12420    2 53016 3.772446e-05
## 12421    2 53016 3.772446e-05
## 12422    2 53016 3.772446e-05
## 12423    2 53016 3.772446e-05
## 12424    2 53016 3.772446e-05
## 12425    2 53016 3.772446e-05
## 12426    2 53016 3.772446e-05
## 12427    2 53016 3.772446e-05
## 12428    2 53016 3.772446e-05
## 12429    2 53016 3.772446e-05
## 12430    2 53016 3.772446e-05
## 12431    2 53016 3.772446e-05
## 12432    2 53016 3.772446e-05
## 12433    2 53016 3.772446e-05
## 12434    2 53016 3.772446e-05
## 12435    2 53016 3.772446e-05
## 12436    2 53016 3.772446e-05
## 12437    2 53016 3.772446e-05
## 12438    2 53016 3.772446e-05
## 12439    2 53016 3.772446e-05
## 12440    2 53016 3.772446e-05
## 12441    2 53016 3.772446e-05
## 12442    2 53016 3.772446e-05
## 12443    2 53016 3.772446e-05
## 12444    2 53016 3.772446e-05
## 12445    2 53016 3.772446e-05
## 12446    2 53016 3.772446e-05
## 12447    2 53016 3.772446e-05
## 12448    2 53016 3.772446e-05
## 12449    2 53016 3.772446e-05
## 12450    2 53016 3.772446e-05
## 12451    2 53016 3.772446e-05
## 12452    2 53016 3.772446e-05
## 12453    2 53016 3.772446e-05
## 12454    2 53016 3.772446e-05
## 12455    2 53016 3.772446e-05
## 12456    2 53016 3.772446e-05
## 12457    2 53016 3.772446e-05
## 12458    2 53016 3.772446e-05
## 12459    2 53016 3.772446e-05
## 12460    2 53016 3.772446e-05
## 12461    2 53016 3.772446e-05
## 12462    2 53016 3.772446e-05
## 12463    2 53016 3.772446e-05
## 12464    2 53016 3.772446e-05
## 12465    2 53016 3.772446e-05
## 12466    2 53016 3.772446e-05
## 12467    2 53016 3.772446e-05
## 12468    2 53016 3.772446e-05
## 12469    2 53016 3.772446e-05
## 12470    2 53016 3.772446e-05
## 12471    2 53016 3.772446e-05
## 12472    2 53016 3.772446e-05
## 12473    2 53016 3.772446e-05
## 12474    2 53016 3.772446e-05
## 12475    2 53016 3.772446e-05
## 12476    2 53016 3.772446e-05
## 12477    2 53016 3.772446e-05
## 12478    2 53016 3.772446e-05
## 12479    2 53016 3.772446e-05
## 12480    2 53016 3.772446e-05
## 12481    2 53016 3.772446e-05
## 12482    2 53016 3.772446e-05
## 12483    2 53016 3.772446e-05
## 12484    2 53016 3.772446e-05
## 12485    2 53016 3.772446e-05
## 12486    2 53016 3.772446e-05
## 12487    2 53016 3.772446e-05
## 12488    2 53016 3.772446e-05
## 12489    2 53016 3.772446e-05
## 12490    2 53016 3.772446e-05
## 12491    2 53016 3.772446e-05
## 12492    2 53016 3.772446e-05
## 12493    2 53016 3.772446e-05
## 12494    2 53016 3.772446e-05
## 12495    2 53016 3.772446e-05
## 12496    2 53016 3.772446e-05
## 12497    2 53016 3.772446e-05
## 12498    2 53016 3.772446e-05
## 12499    2 53016 3.772446e-05
## 12500    2 53016 3.772446e-05
## 12501    2 53016 3.772446e-05
## 12502    2 53016 3.772446e-05
## 12503    2 53016 3.772446e-05
## 12504    2 53016 3.772446e-05
## 12505    2 53016 3.772446e-05
## 12506    2 53016 3.772446e-05
## 12507    2 53016 3.772446e-05
## 12508    2 53016 3.772446e-05
## 12509    2 53016 3.772446e-05
## 12510    2 53016 3.772446e-05
## 12511    2 53016 3.772446e-05
## 12512    2 53016 3.772446e-05
## 12513    2 53016 3.772446e-05
## 12514    2 53016 3.772446e-05
## 12515    2 53016 3.772446e-05
## 12516    2 53016 3.772446e-05
## 12517    2 53016 3.772446e-05
## 12518    2 53016 3.772446e-05
## 12519    2 53016 3.772446e-05
## 12520    2 53016 3.772446e-05
## 12521    2 53016 3.772446e-05
## 12522    2 53016 3.772446e-05
## 12523    2 53016 3.772446e-05
## 12524    2 53016 3.772446e-05
## 12525    2 53016 3.772446e-05
## 12526    2 53016 3.772446e-05
## 12527    2 53016 3.772446e-05
## 12528    2 53016 3.772446e-05
## 12529    2 53016 3.772446e-05
## 12530    2 53016 3.772446e-05
## 12531    2 53016 3.772446e-05
## 12532    2 53016 3.772446e-05
## 12533    2 53016 3.772446e-05
## 12534    2 53016 3.772446e-05
## 12535    2 53016 3.772446e-05
## 12536    2 53016 3.772446e-05
## 12537    2 53016 3.772446e-05
## 12538    2 53016 3.772446e-05
## 12539    2 53016 3.772446e-05
## 12540    2 53016 3.772446e-05
## 12541    2 53016 3.772446e-05
## 12542    2 53016 3.772446e-05
## 12543    2 53016 3.772446e-05
## 12544    2 53016 3.772446e-05
## 12545    2 53016 3.772446e-05
## 12546    2 53016 3.772446e-05
## 12547    2 53016 3.772446e-05
## 12548    2 53016 3.772446e-05
## 12549    2 53016 3.772446e-05
## 12550    2 53016 3.772446e-05
## 12551    2 53016 3.772446e-05
## 12552    2 53016 3.772446e-05
## 12553    2 53016 3.772446e-05
## 12554    2 53016 3.772446e-05
## 12555    2 53016 3.772446e-05
## 12556    2 53016 3.772446e-05
## 12557    2 53016 3.772446e-05
## 12558    2 53016 3.772446e-05
## 12559    2 53016 3.772446e-05
## 12560    2 53016 3.772446e-05
## 12561    2 53016 3.772446e-05
## 12562    2 53016 3.772446e-05
## 12563    2 53016 3.772446e-05
## 12564    2 53016 3.772446e-05
## 12565    2 53016 3.772446e-05
## 12566    2 53016 3.772446e-05
## 12567    2 53016 3.772446e-05
## 12568    2 53016 3.772446e-05
## 12569    2 53016 3.772446e-05
## 12570    2 53016 3.772446e-05
## 12571    2 53016 3.772446e-05
## 12572    2 53016 3.772446e-05
## 12573    2 53016 3.772446e-05
## 12574    2 53016 3.772446e-05
## 12575    2 53016 3.772446e-05
## 12576    2 53016 3.772446e-05
## 12577    2 53016 3.772446e-05
## 12578    2 53016 3.772446e-05
## 12579    2 53016 3.772446e-05
## 12580    2 53016 3.772446e-05
## 12581    2 53016 3.772446e-05
## 12582    2 53016 3.772446e-05
## 12583    2 53016 3.772446e-05
## 12584    2 53016 3.772446e-05
## 12585    2 53016 3.772446e-05
## 12586    2 53016 3.772446e-05
## 12587    2 53016 3.772446e-05
## 12588    2 53016 3.772446e-05
## 12589    2 53016 3.772446e-05
## 12590    2 53016 3.772446e-05
## 12591    2 53016 3.772446e-05
## 12592    2 53016 3.772446e-05
## 12593    2 53016 3.772446e-05
## 12594    2 53016 3.772446e-05
## 12595    2 53016 3.772446e-05
## 12596    2 53016 3.772446e-05
## 12597    2 53016 3.772446e-05
## 12598    2 53016 3.772446e-05
## 12599    2 53016 3.772446e-05
## 12600    2 53016 3.772446e-05
## 12601    2 53016 3.772446e-05
## 12602    2 53016 3.772446e-05
## 12603    2 53016 3.772446e-05
## 12604    2 53016 3.772446e-05
## 12605    2 53016 3.772446e-05
## 12606    2 53016 3.772446e-05
## 12607    2 53016 3.772446e-05
## 12608    2 53016 3.772446e-05
## 12609    2 53016 3.772446e-05
## 12610    2 53016 3.772446e-05
## 12611    2 53016 3.772446e-05
## 12612    2 53016 3.772446e-05
## 12613    2 53016 3.772446e-05
## 12614    2 53016 3.772446e-05
## 12615    2 53016 3.772446e-05
## 12616    2 53016 3.772446e-05
## 12617    2 53016 3.772446e-05
## 12618    2 53016 3.772446e-05
## 12619    2 53016 3.772446e-05
## 12620    2 53016 3.772446e-05
## 12621    2 53016 3.772446e-05
## 12622    2 53016 3.772446e-05
## 12623    2 53016 3.772446e-05
## 12624    2 53016 3.772446e-05
## 12625    2 53016 3.772446e-05
## 12626    2 53016 3.772446e-05
## 12627    2 53016 3.772446e-05
## 12628    2 53016 3.772446e-05
## 12629    2 53016 3.772446e-05
## 12630    2 53016 3.772446e-05
## 12631    2 53016 3.772446e-05
## 12632    2 53016 3.772446e-05
## 12633    2 53016 3.772446e-05
## 12634    2 53016 3.772446e-05
## 12635    2 53016 3.772446e-05
## 12636    2 53016 3.772446e-05
## 12637    2 53016 3.772446e-05
## 12638    2 53016 3.772446e-05
## 12639    2 53016 3.772446e-05
## 12640    2 53016 3.772446e-05
## 12641    2 53016 3.772446e-05
## 12642    2 53016 3.772446e-05
## 12643    2 53016 3.772446e-05
## 12644    2 53016 3.772446e-05
## 12645    2 53016 3.772446e-05
## 12646    2 53016 3.772446e-05
## 12647    2 53016 3.772446e-05
## 12648    2 53016 3.772446e-05
## 12649    2 53016 3.772446e-05
## 12650    2 53016 3.772446e-05
## 12651    2 53016 3.772446e-05
## 12652    2 53016 3.772446e-05
## 12653    2 53016 3.772446e-05
## 12654    2 53016 3.772446e-05
## 12655    2 53016 3.772446e-05
## 12656    2 53016 3.772446e-05
## 12657    2 53016 3.772446e-05
## 12658    2 53016 3.772446e-05
## 12659    2 53016 3.772446e-05
## 12660    2 53016 3.772446e-05
## 12661    2 53016 3.772446e-05
## 12662    2 53016 3.772446e-05
## 12663    2 53016 3.772446e-05
## 12664    2 53016 3.772446e-05
## 12665    2 53016 3.772446e-05
## 12666    2 53016 3.772446e-05
## 12667    2 53016 3.772446e-05
## 12668    2 53016 3.772446e-05
## 12669    2 53016 3.772446e-05
## 12670    2 53016 3.772446e-05
## 12671    2 53016 3.772446e-05
## 12672    2 53016 3.772446e-05
## 12673    2 53016 3.772446e-05
## 12674    2 53016 3.772446e-05
## 12675    2 53016 3.772446e-05
## 12676    2 53016 3.772446e-05
## 12677    2 53016 3.772446e-05
## 12678    2 53016 3.772446e-05
## 12679    2 53016 3.772446e-05
## 12680    2 53016 3.772446e-05
## 12681    2 53016 3.772446e-05
## 12682    2 53016 3.772446e-05
## 12683    2 53016 3.772446e-05
## 12684    2 53016 3.772446e-05
## 12685    2 53016 3.772446e-05
## 12686    2 53016 3.772446e-05
## 12687    2 53016 3.772446e-05
## 12688    2 53016 3.772446e-05
## 12689    2 53016 3.772446e-05
## 12690    2 53016 3.772446e-05
## 12691    2 53016 3.772446e-05
## 12692    2 53016 3.772446e-05
## 12693    2 53016 3.772446e-05
## 12694    2 53016 3.772446e-05
## 12695    2 53016 3.772446e-05
## 12696    2 53016 3.772446e-05
## 12697    2 53016 3.772446e-05
## 12698    2 53016 3.772446e-05
## 12699    2 53016 3.772446e-05
## 12700    2 53016 3.772446e-05
## 12701    2 53016 3.772446e-05
## 12702    2 53016 3.772446e-05
## 12703    2 53016 3.772446e-05
## 12704    2 53016 3.772446e-05
## 12705    2 53016 3.772446e-05
## 12706    2 53016 3.772446e-05
## 12707    2 53016 3.772446e-05
## 12708    2 53016 3.772446e-05
## 12709    2 53016 3.772446e-05
## 12710    2 53016 3.772446e-05
## 12711    2 53016 3.772446e-05
## 12712    2 53016 3.772446e-05
## 12713    2 53016 3.772446e-05
## 12714    2 53016 3.772446e-05
## 12715    2 53016 3.772446e-05
## 12716    2 53016 3.772446e-05
## 12717    2 53016 3.772446e-05
## 12718    2 53016 3.772446e-05
## 12719    2 53016 3.772446e-05
## 12720    2 53016 3.772446e-05
## 12721    2 53016 3.772446e-05
## 12722    2 53016 3.772446e-05
## 12723    2 53016 3.772446e-05
## 12724    2 53016 3.772446e-05
## 12725    2 53016 3.772446e-05
## 12726    2 53016 3.772446e-05
## 12727    2 53016 3.772446e-05
## 12728    2 53016 3.772446e-05
## 12729    2 53016 3.772446e-05
## 12730    2 53016 3.772446e-05
## 12731    2 53016 3.772446e-05
## 12732    2 53016 3.772446e-05
## 12733    2 53016 3.772446e-05
## 12734    2 53016 3.772446e-05
## 12735    2 53016 3.772446e-05
## 12736    2 53016 3.772446e-05
## 12737    2 53016 3.772446e-05
## 12738    2 53016 3.772446e-05
## 12739    2 53016 3.772446e-05
## 12740    2 53016 3.772446e-05
## 12741    2 53016 3.772446e-05
## 12742    2 16547 1.208678e-04
## 12743    2 16547 1.208678e-04
## 12744    2 16547 1.208678e-04
## 12745    2 16547 1.208678e-04
## 12746    2 16547 1.208678e-04
## 12747    2 16547 1.208678e-04
## 12748    2 16547 1.208678e-04
## 12749    2 16547 1.208678e-04
## 12750    2 16547 1.208678e-04
## 12751    2 16547 1.208678e-04
## 12752    2 16547 1.208678e-04
## 12753    2 16547 1.208678e-04
## 12754    2 16547 1.208678e-04
## 12755    2 16547 1.208678e-04
## 12756    2 16547 1.208678e-04
## 12757    2 16547 1.208678e-04
## 12758    2 16547 1.208678e-04
## 12759    2 16547 1.208678e-04
## 12760    2 16547 1.208678e-04
## 12761    2 16547 1.208678e-04
## 12762    2 16547 1.208678e-04
## 12763    2 16547 1.208678e-04
## 12764    2 16547 1.208678e-04
## 12765    2 16547 1.208678e-04
## 12766    2 16547 1.208678e-04
## 12767    2 16547 1.208678e-04
## 12768    2 16547 1.208678e-04
## 12769    2 16547 1.208678e-04
## 12770    2 16547 1.208678e-04
## 12771    2 16547 1.208678e-04
## 12772    2 16547 1.208678e-04
## 12773    2 16547 1.208678e-04
## 12774    2 16547 1.208678e-04
## 12775    2 16547 1.208678e-04
## 12776    2 16547 1.208678e-04
## 12777    2 16547 1.208678e-04
## 12778    2 16547 1.208678e-04
## 12779    2 16547 1.208678e-04
## 12780    2 16547 1.208678e-04
## 12781    2 16547 1.208678e-04
## 12782    2 16547 1.208678e-04
## 12783    2 16547 1.208678e-04
## 12784    2 16547 1.208678e-04
## 12785    2 16547 1.208678e-04
## 12786    2 16547 1.208678e-04
## 12787    2 16547 1.208678e-04
## 12788    2 16547 1.208678e-04
## 12789    2 16547 1.208678e-04
## 12790    2 16547 1.208678e-04
## 12791    2 16547 1.208678e-04
## 12792    2 16547 1.208678e-04
## 12793    2 16547 1.208678e-04
## 12794    2 16547 1.208678e-04
## 12795    2 16547 1.208678e-04
## 12796    2 16547 1.208678e-04
## 12797    2 16547 1.208678e-04
## 12798    2 16547 1.208678e-04
## 12799    2 16547 1.208678e-04
## 12800    2 16547 1.208678e-04
## 12801    2 16547 1.208678e-04
## 12802    2 16547 1.208678e-04
## 12803    2 16547 1.208678e-04
## 12804    2 16547 1.208678e-04
## 12805    2 16547 1.208678e-04
## 12806    2 16547 1.208678e-04
## 12807    2 16547 1.208678e-04
## 12808    2 16547 1.208678e-04
## 12809    2 16547 1.208678e-04
## 12810    2 16547 1.208678e-04
## 12811    2 16547 1.208678e-04
## 12812    2 16547 1.208678e-04
## 12813    2 16547 1.208678e-04
## 12814    2 16547 1.208678e-04
## 12815    2 16547 1.208678e-04
## 12816    2 16547 1.208678e-04
## 12817    2 16547 1.208678e-04
## 12818    2 16547 1.208678e-04
## 12819    2 16547 1.208678e-04
## 12820    2 16547 1.208678e-04
## 12821    2 16547 1.208678e-04
## 12822    2 16547 1.208678e-04
## 12823    2 16547 1.208678e-04
## 12824    2 16547 1.208678e-04
## 12825    2 16547 1.208678e-04
## 12826    2 16547 1.208678e-04
## 12827    2 16547 1.208678e-04
## 12828    2 16547 1.208678e-04
## 12829    2 16547 1.208678e-04
## 12830    2 16547 1.208678e-04
## 12831    2 16547 1.208678e-04
## 12832    2 16547 1.208678e-04
## 12833    2 16547 1.208678e-04
## 12834    2 16547 1.208678e-04
## 12835    2 16547 1.208678e-04
## 12836    2 16547 1.208678e-04
## 12837    2 16547 1.208678e-04
## 12838    2 16547 1.208678e-04
## 12839    2 16547 1.208678e-04
## 12840    2 16547 1.208678e-04
## 12841    2 16547 1.208678e-04
## 12842    2 16547 1.208678e-04
## 12843    2 16547 1.208678e-04
## 12844    2 16547 1.208678e-04
## 12845    2 16547 1.208678e-04
## 12846    2 16547 1.208678e-04
## 12847    2 16547 1.208678e-04
## 12848    2 16547 1.208678e-04
## 12849    2 16547 1.208678e-04
## 12850    2 16547 1.208678e-04
## 12851    2 16547 1.208678e-04
## 12852    2 16547 1.208678e-04
## 12853    2 16547 1.208678e-04
## 12854    2 16547 1.208678e-04
## 12855    2 16547 1.208678e-04
## 12856    2 16547 1.208678e-04
## 12857    2 16547 1.208678e-04
## 12858    2 16547 1.208678e-04
## 12859    2 16547 1.208678e-04
## 12860    2 16547 1.208678e-04
## 12861    2 16547 1.208678e-04
## 12862    2 16547 1.208678e-04
## 12863    2 16547 1.208678e-04
## 12864    2 16547 1.208678e-04
## 12865    2 16547 1.208678e-04
## 12866    2 16547 1.208678e-04
## 12867    2 16547 1.208678e-04
## 12868    2 16547 1.208678e-04
## 12869    2 16547 1.208678e-04
## 12870    2 16547 1.208678e-04
## 12871    2 16547 1.208678e-04
## 12872    2 16547 1.208678e-04
## 12873    2 16547 1.208678e-04
## 12874    2 16547 1.208678e-04
## 12875    2 16547 1.208678e-04
## 12876    2 16547 1.208678e-04
## 12877    2 16547 1.208678e-04
## 12878    2 16547 1.208678e-04
## 12879    2 16547 1.208678e-04
## 12880    2 16547 1.208678e-04
## 12881    2 16547 1.208678e-04
## 12882    2 16547 1.208678e-04
## 12883    2 16547 1.208678e-04
## 12884    2 16547 1.208678e-04
## 12885    2 16547 1.208678e-04
## 12886    2 16547 1.208678e-04
## 12887    2 16547 1.208678e-04
## 12888    2 16547 1.208678e-04
## 12889    2 16547 1.208678e-04
## 12890    2 16547 1.208678e-04
## 12891    2 16547 1.208678e-04
## 12892    2 16547 1.208678e-04
## 12893    2 16547 1.208678e-04
## 12894    2 16547 1.208678e-04
## 12895    2 16547 1.208678e-04
## 12896    2 16547 1.208678e-04
## 12897    2 16547 1.208678e-04
## 12898    2 16547 1.208678e-04
## 12899    2 16547 1.208678e-04
## 12900    2 16547 1.208678e-04
## 12901    2 16547 1.208678e-04
## 12902    2 16547 1.208678e-04
## 12903    2 16547 1.208678e-04
## 12904    2 16547 1.208678e-04
## 12905    2 16547 1.208678e-04
## 12906    2 16547 1.208678e-04
## 12907    2 16547 1.208678e-04
## 12908    2 16547 1.208678e-04
## 12909    2 16547 1.208678e-04
## 12910    2 16547 1.208678e-04
## 12911    2 16547 1.208678e-04
## 12912    2 16547 1.208678e-04
## 12913    2 16547 1.208678e-04
## 12914    2 16547 1.208678e-04
## 12915    2 16547 1.208678e-04
## 12916    2 16547 1.208678e-04
## 12917    2 16547 1.208678e-04
## 12918    2 16547 1.208678e-04
## 12919    2 16547 1.208678e-04
## 12920    2 16547 1.208678e-04
## 12921    2 16547 1.208678e-04
## 12922    2 16547 1.208678e-04
## 12923    2 16547 1.208678e-04
## 12924    2 16547 1.208678e-04
## 12925    2 16547 1.208678e-04
## 12926    2 16547 1.208678e-04
## 12927    2 16547 1.208678e-04
## 12928    2 16547 1.208678e-04
## 12929    2 16547 1.208678e-04
## 12930    2 16547 1.208678e-04
## 12931    2 16547 1.208678e-04
## 12932    2 16547 1.208678e-04
## 12933    2 16547 1.208678e-04
## 12934    2 16547 1.208678e-04
## 12935    2 16547 1.208678e-04
## 12936    2 16547 1.208678e-04
## 12937    2 16547 1.208678e-04
## 12938    2 16547 1.208678e-04
## 12939    2 16547 1.208678e-04
## 12940    2 16547 1.208678e-04
## 12941    2 16547 1.208678e-04
## 12942    2 16547 1.208678e-04
## 12943    2 16547 1.208678e-04
## 12944    2 16547 1.208678e-04
## 12945    2 16547 1.208678e-04
## 12946    2 16547 1.208678e-04
## 12947    2 16547 1.208678e-04
## 12948    2 16547 1.208678e-04
## 12949    2 16547 1.208678e-04
## 12950    2 16547 1.208678e-04
## 12951    2 16547 1.208678e-04
## 12952    2 16547 1.208678e-04
## 12953    2 16547 1.208678e-04
## 12954    2 16547 1.208678e-04
## 12955    2 16547 1.208678e-04
## 12956    2 16547 1.208678e-04
## 12957    2 16547 1.208678e-04
## 12958    2 16547 1.208678e-04
## 12959    2 16547 1.208678e-04
## 12960    2 16547 1.208678e-04
## 12961    2 16547 1.208678e-04
## 12962    2 16547 1.208678e-04
## 12963    2 16547 1.208678e-04
## 12964    2 16547 1.208678e-04
## 12965    2 16547 1.208678e-04
## 12966    2 16547 1.208678e-04
## 12967    2 16547 1.208678e-04
## 12968    2 16547 1.208678e-04
## 12969    2 16547 1.208678e-04
## 12970    2 16547 1.208678e-04
## 12971    2 16547 1.208678e-04
## 12972    2 16547 1.208678e-04
## 12973    2 16547 1.208678e-04
## 12974    2 16547 1.208678e-04
## 12975    2 16547 1.208678e-04
## 12976    2 16547 1.208678e-04
## 12977    2 16547 1.208678e-04
## 12978    2 16547 1.208678e-04
## 12979    2 16547 1.208678e-04
## 12980    2 16547 1.208678e-04
## 12981    2 16547 1.208678e-04
## 12982    2 16547 1.208678e-04
## 12983    2 16547 1.208678e-04
## 12984    2 16547 1.208678e-04
## 12985    2 16547 1.208678e-04
## 12986    2 16547 1.208678e-04
## 12987    2 16547 1.208678e-04
## 12988    2 16547 1.208678e-04
## 12989    2 16547 1.208678e-04
## 12990    2 16547 1.208678e-04
## 12991    2 16547 1.208678e-04
## 12992    2 16547 1.208678e-04
## 12993    2 16547 1.208678e-04
## 12994    2 16547 1.208678e-04
## 12995    2 16547 1.208678e-04
## 12996    2 16547 1.208678e-04
## 12997    2 16547 1.208678e-04
## 12998    2 16547 1.208678e-04
## 12999    2 16547 1.208678e-04
## 13000    2 16547 1.208678e-04
## 13001    2 16547 1.208678e-04
## 13002    2 16547 1.208678e-04
## 13003    2 16547 1.208678e-04
## 13004    2 16547 1.208678e-04
## 13005    2 16547 1.208678e-04
## 13006    2 16547 1.208678e-04
## 13007    2 16547 1.208678e-04
## 13008    2 16547 1.208678e-04
## 13009    2 16547 1.208678e-04
## 13010    2 16547 1.208678e-04
## 13011    2 16547 1.208678e-04
## 13012    2 16547 1.208678e-04
## 13013    2 16547 1.208678e-04
## 13014    2 16547 1.208678e-04
## 13015    2 16547 1.208678e-04
## 13016    2 16547 1.208678e-04
## 13017    2 16547 1.208678e-04
## 13018    2 16547 1.208678e-04
## 13019    2 16547 1.208678e-04
## 13020    2 16547 1.208678e-04
## 13021    2 16547 1.208678e-04
## 13022    2 16547 1.208678e-04
## 13023    2 16547 1.208678e-04
## 13024    2 16547 1.208678e-04
## 13025    2 16547 1.208678e-04
## 13026    2 16547 1.208678e-04
## 13027    2 16547 1.208678e-04
## 13028    2 16547 1.208678e-04
## 13029    2 16547 1.208678e-04
## 13030    2 16547 1.208678e-04
## 13031    2 16547 1.208678e-04
## 13032    2 16547 1.208678e-04
## 13033    2 16547 1.208678e-04
## 13034    2 16547 1.208678e-04
## 13035    2 16547 1.208678e-04
## 13036    2 16547 1.208678e-04
## 13037    2 16547 1.208678e-04
## 13038    2 16547 1.208678e-04
## 13039    2 16547 1.208678e-04
## 13040    2 16547 1.208678e-04
## 13041    2 16547 1.208678e-04
## 13042    2 16547 1.208678e-04
## 13043    2 16547 1.208678e-04
## 13044    2 16547 1.208678e-04
## 13045    2 16547 1.208678e-04
## 13046    2 16547 1.208678e-04
## 13047    2 16547 1.208678e-04
## 13048    2 16547 1.208678e-04
## 13049    2 16547 1.208678e-04
## 13050    2 16547 1.208678e-04
## 13051    2 16547 1.208678e-04
## 13052    2 16547 1.208678e-04
## 13053    2 16547 1.208678e-04
## 13054    2 16547 1.208678e-04
## 13055    2 16547 1.208678e-04
## 13056    2 16547 1.208678e-04
## 13057    2 16547 1.208678e-04
## 13058    2 16547 1.208678e-04
## 13059    2 16547 1.208678e-04
## 13060    2 16547 1.208678e-04
## 13061    2 16547 1.208678e-04
## 13062    2 16547 1.208678e-04
## 13063    2 16547 1.208678e-04
## 13064    2 16547 1.208678e-04
## 13065    2 16547 1.208678e-04
## 13066    2 16547 1.208678e-04
## 13067    2 16547 1.208678e-04
## 13068    2 16547 1.208678e-04
## 13069    2 16547 1.208678e-04
## 13070    2 16547 1.208678e-04
## 13071    2 16547 1.208678e-04
## 13072    2 16547 1.208678e-04
## 13073    2 16547 1.208678e-04
## 13074    2 16547 1.208678e-04
## 13075    2 16547 1.208678e-04
## 13076    2 16547 1.208678e-04
## 13077    2 16547 1.208678e-04
## 13078    2 16547 1.208678e-04
## 13079    2 16547 1.208678e-04
## 13080    2 16547 1.208678e-04
## 13081    2 16547 1.208678e-04
## 13082    2 16547 1.208678e-04
## 13083    2 16547 1.208678e-04
## 13084    2 16547 1.208678e-04
## 13085    2 16547 1.208678e-04
## 13086    2 16547 1.208678e-04
## 13087    2 16547 1.208678e-04
## 13088    2 16547 1.208678e-04
## 13089    2 16547 1.208678e-04
## 13090    2 16547 1.208678e-04
## 13091    2 16547 1.208678e-04
## 13092    2 16547 1.208678e-04
## 13093    2 16547 1.208678e-04
## 13094    2 16547 1.208678e-04
## 13095    2 16547 1.208678e-04
## 13096    2 16547 1.208678e-04
## 13097    2 16547 1.208678e-04
## 13098    2 16547 1.208678e-04
## 13099    2 16547 1.208678e-04
## 13100    2 16547 1.208678e-04
## 13101    2 16547 1.208678e-04
## 13102    2 16547 1.208678e-04
## 13103    2 16547 1.208678e-04
## 13104    2 16547 1.208678e-04
## 13105    2 16547 1.208678e-04
## 13106    2 16547 1.208678e-04
## 13107    2 16547 1.208678e-04
## 13108    2 16547 1.208678e-04
## 13109    2 16547 1.208678e-04
## 13110    2 16547 1.208678e-04
## 13111    2 16547 1.208678e-04
## 13112    2 16547 1.208678e-04
## 13113    2 16547 1.208678e-04
## 13114    2 16547 1.208678e-04
## 13115    2 16547 1.208678e-04
## 13116    2 16547 1.208678e-04
## 13117    2 16547 1.208678e-04
## 13118    2 16547 1.208678e-04
## 13119    2 16547 1.208678e-04
## 13120    2 16547 1.208678e-04
## 13121    2 16547 1.208678e-04
## 13122    2 16547 1.208678e-04
## 13123    2 16547 1.208678e-04
## 13124    2 16547 1.208678e-04
## 13125    2 16547 1.208678e-04
## 13126    2 16547 1.208678e-04
## 13127    2 16547 1.208678e-04
## 13128    2 16547 1.208678e-04
## 13129    2 16547 1.208678e-04
## 13130    2 16547 1.208678e-04
## 13131    2 16547 1.208678e-04
## 13132    2 16547 1.208678e-04
## 13133    2 16547 1.208678e-04
## 13134    2 16547 1.208678e-04
## 13135    2 16547 1.208678e-04
## 13136    2 16547 1.208678e-04
## 13137    2 16547 1.208678e-04
## 13138    2 16547 1.208678e-04
## 13139    2 16547 1.208678e-04
## 13140    2 16547 1.208678e-04
## 13141    2 16547 1.208678e-04
## 13142    2 16547 1.208678e-04
## 13143    2 16547 1.208678e-04
## 13144    2 16547 1.208678e-04
## 13145    2 16547 1.208678e-04
## 13146    2 16547 1.208678e-04
## 13147    2 16547 1.208678e-04
## 13148    2 16547 1.208678e-04
## 13149    2 16547 1.208678e-04
## 13150    2 16547 1.208678e-04
## 13151    2 16547 1.208678e-04
## 13152    2 16547 1.208678e-04
## 13153    2 16547 1.208678e-04
## 13154    2 16547 1.208678e-04
## 13155    2 16547 1.208678e-04
## 13156    2 16547 1.208678e-04
## 13157    2 16547 1.208678e-04
## 13158    2 16547 1.208678e-04
## 13159    2 16547 1.208678e-04
## 13160    2 16547 1.208678e-04
## 13161    2 16547 1.208678e-04
## 13162    2 16547 1.208678e-04
## 13163    2 16547 1.208678e-04
## 13164    2 16547 1.208678e-04
## 13165    2 16547 1.208678e-04
## 13166    2 16547 1.208678e-04
## 13167    2 16547 1.208678e-04
## 13168    2 16547 1.208678e-04
## 13169    2 16547 1.208678e-04
## 13170    2 16547 1.208678e-04
## 13171    2 16547 1.208678e-04
## 13172    2 16547 1.208678e-04
## 13173    2 16547 1.208678e-04
## 13174    2 16547 1.208678e-04
## 13175    2 16547 1.208678e-04
## 13176    2 16547 1.208678e-04
## 13177    2 16547 1.208678e-04
## 13178    2 16547 1.208678e-04
## 13179    2 16547 1.208678e-04
## 13180    2 16547 1.208678e-04
## 13181    2 16547 1.208678e-04
## 13182    2 16547 1.208678e-04
## 13183    2 16547 1.208678e-04
## 13184    2 16547 1.208678e-04
## 13185    2 16547 1.208678e-04
## 13186    2 16547 1.208678e-04
## 13187    2 16547 1.208678e-04
## 13188    2 16547 1.208678e-04
## 13189    2 16547 1.208678e-04
## 13190    2 16547 1.208678e-04
## 13191    2 16547 1.208678e-04
## 13192    2 16547 1.208678e-04
## 13193    2 16547 1.208678e-04
## 13194    2 16547 1.208678e-04
## 13195    2 16547 1.208678e-04
## 13196    2 16547 1.208678e-04
## 13197    2 16547 1.208678e-04
## 13198    2 16547 1.208678e-04
## 13199    2 16547 1.208678e-04
## 13200    2 16547 1.208678e-04
## 13201    2 16547 1.208678e-04
## 13202    2 16547 1.208678e-04
## 13203    2 16547 1.208678e-04
## 13204    2 16547 1.208678e-04
## 13205    2 16547 1.208678e-04
## 13206    2 16547 1.208678e-04
## 13207    2 16547 1.208678e-04
## 13208    2 16547 1.208678e-04
## 13209    2 16547 1.208678e-04
## 13210    2 16547 1.208678e-04
## 13211    2 16547 1.208678e-04
## 13212    2 16547 1.208678e-04
## 13213    2 16547 1.208678e-04
## 13214    2 16547 1.208678e-04
## 13215    2 16547 1.208678e-04
## 13216    2 16547 1.208678e-04
## 13217    2 16547 1.208678e-04
## 13218    2 16547 1.208678e-04
## 13219    2 16547 1.208678e-04
## 13220    2 16547 1.208678e-04
## 13221    2 16547 1.208678e-04
## 13222    2 16547 1.208678e-04
## 13223    2 16547 1.208678e-04
## 13224    2 16547 1.208678e-04
## 13225    2 16547 1.208678e-04
## 13226    2 16547 1.208678e-04
## 13227    2 16547 1.208678e-04
## 13228    2 16547 1.208678e-04
## 13229    2 16547 1.208678e-04
## 13230    2 16547 1.208678e-04
## 13231    2 16547 1.208678e-04
## 13232    2 16547 1.208678e-04
## 13233    2 16547 1.208678e-04
## 13234    2 16547 1.208678e-04
## 13235    2 16547 1.208678e-04
## 13236    2 16547 1.208678e-04
## 13237    2 16547 1.208678e-04
## 13238    2 16547 1.208678e-04
## 13239    2 16547 1.208678e-04
## 13240    2 16547 1.208678e-04
## 13241    2 16547 1.208678e-04
## 13242    2 16547 1.208678e-04
## 13243    2 16547 1.208678e-04
## 13244    2 16547 1.208678e-04
## 13245    2 16547 1.208678e-04
## 13246    2 16547 1.208678e-04
## 13247    2 16547 1.208678e-04
## 13248    2 16547 1.208678e-04
## 13249    2 16547 1.208678e-04
## 13250    2 16547 1.208678e-04
## 13251    2 16547 1.208678e-04
## 13252    2 16547 1.208678e-04
## 13253    2 16547 1.208678e-04
## 13254    2 16547 1.208678e-04
## 13255    2 16547 1.208678e-04
## 13256    2 16547 1.208678e-04
## 13257    2 16547 1.208678e-04
## 13258    2 16547 1.208678e-04
## 13259    2 16547 1.208678e-04
## 13260    2 16547 1.208678e-04
## 13261    2 16547 1.208678e-04
## 13262    2 16547 1.208678e-04
## 13263    2 16547 1.208678e-04
## 13264    2 16547 1.208678e-04
## 13265    2 16547 1.208678e-04
## 13266    2 16547 1.208678e-04
## 13267    2 16547 1.208678e-04
## 13268    2 16547 1.208678e-04
## 13269    2 16547 1.208678e-04
## 13270    2 16547 1.208678e-04
## 13271    2 16547 1.208678e-04
## 13272    2 16547 1.208678e-04
## 13273    2 16547 1.208678e-04
## 13274    2 16547 1.208678e-04
## 13275    2 16547 1.208678e-04
## 13276    2 16547 1.208678e-04
## 13277    2 16547 1.208678e-04
## 13278    2 16547 1.208678e-04
## 13279    2 16547 1.208678e-04
## 13280    2 16547 1.208678e-04
## 13281    2 16547 1.208678e-04
## 13282    2 16547 1.208678e-04
## 13283    2 16547 1.208678e-04
## 13284    2 16547 1.208678e-04
## 13285    2 16547 1.208678e-04
## 13286    2 16547 1.208678e-04
## 13287    2 16547 1.208678e-04
## 13288    2 16547 1.208678e-04
## 13289    2 16547 1.208678e-04
## 13290    2 16547 1.208678e-04
## 13291    2 16547 1.208678e-04
## 13292    2 16547 1.208678e-04
## 13293    2 16547 1.208678e-04
## 13294    2 16547 1.208678e-04
## 13295    2 16547 1.208678e-04
## 13296    2 16547 1.208678e-04
## 13297    2 16547 1.208678e-04
## 13298    2 16547 1.208678e-04
## 13299    2 16547 1.208678e-04
## 13300    2 16547 1.208678e-04
## 13301    2 16547 1.208678e-04
## 13302    2 16547 1.208678e-04
## 13303    2 16547 1.208678e-04
## 13304    2 16547 1.208678e-04
## 13305    2 16547 1.208678e-04
## 13306    2 16547 1.208678e-04
## 13307    2 16547 1.208678e-04
## 13308    2 16547 1.208678e-04
## 13309    2 16547 1.208678e-04
## 13310    2 16547 1.208678e-04
## 13311    2 16547 1.208678e-04
## 13312    2 16547 1.208678e-04
## 13313    2 16547 1.208678e-04
## 13314    2 16547 1.208678e-04
## 13315    2 16547 1.208678e-04
## 13316    2 16547 1.208678e-04
## 13317    2 16547 1.208678e-04
## 13318    2 16547 1.208678e-04
## 13319    2 16547 1.208678e-04
## 13320    2 16547 1.208678e-04
## 13321    2 16547 1.208678e-04
## 13322    2 16547 1.208678e-04
## 13323    2 16547 1.208678e-04
## 13324    2 16547 1.208678e-04
## 13325    2 16547 1.208678e-04
## 13326    2 16547 1.208678e-04
## 13327    2 16547 1.208678e-04
## 13328    2 16547 1.208678e-04
## 13329    2 16547 1.208678e-04
## 13330    2 16547 1.208678e-04
## 13331    2 16547 1.208678e-04
## 13332    2 16547 1.208678e-04
## 13333    2 16547 1.208678e-04
## 13334    2 16547 1.208678e-04
## 13335    2 16547 1.208678e-04
## 13336    2 16547 1.208678e-04
## 13337    2 16547 1.208678e-04
## 13338    2 16547 1.208678e-04
## 13339    2 16547 1.208678e-04
## 13340    2 16547 1.208678e-04
## 13341    2 16547 1.208678e-04
## 13342    2 16547 1.208678e-04
## 13343    2 16547 1.208678e-04
## 13344    2 16547 1.208678e-04
## 13345    2 16547 1.208678e-04
## 13346    2 16547 1.208678e-04
## 13347    2 16547 1.208678e-04
## 13348    2 16547 1.208678e-04
## 13349    2 16547 1.208678e-04
## 13350    2 16547 1.208678e-04
## 13351    2 16547 1.208678e-04
## 13352    2 16547 1.208678e-04
## 13353    2 16547 1.208678e-04
## 13354    2 16547 1.208678e-04
## 13355    2 16547 1.208678e-04
## 13356    2 16547 1.208678e-04
## 13357    2 16547 1.208678e-04
## 13358    2 16547 1.208678e-04
## 13359    2 16547 1.208678e-04
## 13360    2 16547 1.208678e-04
## 13361    2 16547 1.208678e-04
## 13362    2 16547 1.208678e-04
## 13363    2 16547 1.208678e-04
## 13364    2 16547 1.208678e-04
## 13365    2 16547 1.208678e-04
## 13366    2 16547 1.208678e-04
## 13367    2 16547 1.208678e-04
## 13368    2 16547 1.208678e-04
## 13369    2 16547 1.208678e-04
## 13370    2 16547 1.208678e-04
## 13371    2 16547 1.208678e-04
## 13372    2 16547 1.208678e-04
## 13373    2 16547 1.208678e-04
## 13374    2 16547 1.208678e-04
## 13375    2 16547 1.208678e-04
## 13376    2 16547 1.208678e-04
## 13377    2 16547 1.208678e-04
## 13378    2 16547 1.208678e-04
## 13379    2 16547 1.208678e-04
## 13380    2 16547 1.208678e-04
## 13381    2 16547 1.208678e-04
## 13382    2 16547 1.208678e-04
## 13383    2 16547 1.208678e-04
## 13384    2 16547 1.208678e-04
## 13385    2 16547 1.208678e-04
## 13386    2 16547 1.208678e-04
## 13387    2 16547 1.208678e-04
## 13388    2 16547 1.208678e-04
## 13389    2 16547 1.208678e-04
## 13390    2 16547 1.208678e-04
## 13391    2 16547 1.208678e-04
## 13392    2 16547 1.208678e-04
## 13393    2 16547 1.208678e-04
## 13394    2 16547 1.208678e-04
## 13395    2 16547 1.208678e-04
## 13396    2 16547 1.208678e-04
## 13397    2 16547 1.208678e-04
## 13398    2 16547 1.208678e-04
## 13399    2 16547 1.208678e-04
## 13400    2 16547 1.208678e-04
## 13401    2 16547 1.208678e-04
## 13402    2 16547 1.208678e-04
## 13403    2 16547 1.208678e-04
## 13404    2 16547 1.208678e-04
## 13405    2 16547 1.208678e-04
## 13406    2 16547 1.208678e-04
## 13407    2 16547 1.208678e-04
## 13408    2 16547 1.208678e-04
## 13409    2 16547 1.208678e-04
## 13410    2 16547 1.208678e-04
## 13411    2 16547 1.208678e-04
## 13412    2 16547 1.208678e-04
## 13413    2 16547 1.208678e-04
## 13414    2 16547 1.208678e-04
## 13415    2 16547 1.208678e-04
## 13416    2 16547 1.208678e-04
## 13417    2 16547 1.208678e-04
## 13418    2 16547 1.208678e-04
## 13419    2 16547 1.208678e-04
## 13420    2 16547 1.208678e-04
## 13421    2 16547 1.208678e-04
## 13422    2 16547 1.208678e-04
## 13423    2 16547 1.208678e-04
## 13424    2 16547 1.208678e-04
## 13425    2 16547 1.208678e-04
## 13426    2 16547 1.208678e-04
## 13427    2 16547 1.208678e-04
## 13428    2 16547 1.208678e-04
## 13429    2 16547 1.208678e-04
## 13430    2 16547 1.208678e-04
## 13431    2 16547 1.208678e-04
## 13432    2 16547 1.208678e-04
## 13433    2 16547 1.208678e-04
## 13434    2 16547 1.208678e-04
## 13435    2 16547 1.208678e-04
## 13436    2 16547 1.208678e-04
## 13437    2 16547 1.208678e-04
## 13438    2 16547 1.208678e-04
## 13439    2 16547 1.208678e-04
## 13440    2 16547 1.208678e-04
## 13441    2 16547 1.208678e-04
## 13442    2 16547 1.208678e-04
## 13443    2 16547 1.208678e-04
## 13444    2 16547 1.208678e-04
## 13445    2 16547 1.208678e-04
## 13446    2 16547 1.208678e-04
## 13447    2 16547 1.208678e-04
## 13448    2 16547 1.208678e-04
## 13449    2 16547 1.208678e-04
## 13450    2 16547 1.208678e-04
## 13451    2 16547 1.208678e-04
## 13452    2 16547 1.208678e-04
## 13453    2 16547 1.208678e-04
## 13454    2 16547 1.208678e-04
## 13455    2 16547 1.208678e-04
## 13456    2 16547 1.208678e-04
## 13457    2 16547 1.208678e-04
## 13458    2 16547 1.208678e-04
## 13459    2 16547 1.208678e-04
## 13460    2 16547 1.208678e-04
## 13461    2 16547 1.208678e-04
## 13462    2 16547 1.208678e-04
## 13463    2 16547 1.208678e-04
## 13464    2 16547 1.208678e-04
## 13465    2 16547 1.208678e-04
## 13466    2 16547 1.208678e-04
## 13467    2 16547 1.208678e-04
## 13468    2 16547 1.208678e-04
## 13469    2 16547 1.208678e-04
## 13470    2 16547 1.208678e-04
## 13471    2 16547 1.208678e-04
## 13472    2 16547 1.208678e-04
## 13473    2 16547 1.208678e-04
## 13474    2 16547 1.208678e-04
## 13475    2 16547 1.208678e-04
## 13476    2 16547 1.208678e-04
## 13477    2 16547 1.208678e-04
## 13478    2 16547 1.208678e-04
## 13479    2 16547 1.208678e-04
## 13480    2 16547 1.208678e-04
## 13481    2 16547 1.208678e-04
## 13482    2 16547 1.208678e-04
## 13483    2 16547 1.208678e-04
## 13484    2 16547 1.208678e-04
## 13485    2 16547 1.208678e-04
## 13486    2 16547 1.208678e-04
## 13487    2 16547 1.208678e-04
## 13488    2 16547 1.208678e-04
## 13489    2 16547 1.208678e-04
## 13490    2 16547 1.208678e-04
## 13491    2 16547 1.208678e-04
## 13492    2 16547 1.208678e-04
## 13493    2 16547 1.208678e-04
## 13494    2 16547 1.208678e-04
## 13495    2 16547 1.208678e-04
## 13496    2 16547 1.208678e-04
## 13497    2 16547 1.208678e-04
## 13498    2 16547 1.208678e-04
## 13499    2 16547 1.208678e-04
## 13500    2 16547 1.208678e-04
## 13501    2 16547 1.208678e-04
## 13502    2 16547 1.208678e-04
## 13503    2 16547 1.208678e-04
## 13504    2 16547 1.208678e-04
## 13505    2 16547 1.208678e-04
## 13506    2 16547 1.208678e-04
## 13507    2 16547 1.208678e-04
## 13508    2 16547 1.208678e-04
## 13509    2 16547 1.208678e-04
## 13510    2 16547 1.208678e-04
## 13511    2 16547 1.208678e-04
## 13512    2 16547 1.208678e-04
## 13513    2 16547 1.208678e-04
## 13514    2 16547 1.208678e-04
## 13515    2 16547 1.208678e-04
## 13516    2 16547 1.208678e-04
## 13517    2 16547 1.208678e-04
## 13518    2 16547 1.208678e-04
## 13519    2 16547 1.208678e-04
## 13520    2 16547 1.208678e-04
## 13521    2 16547 1.208678e-04
## 13522    2 16547 1.208678e-04
## 13523    2 16547 1.208678e-04
## 13524    2 16547 1.208678e-04
## 13525    2 16547 1.208678e-04
## 13526    2 16547 1.208678e-04
## 13527    2 16547 1.208678e-04
## 13528    2 16547 1.208678e-04
## 13529    2 16547 1.208678e-04
## 13530    2 16547 1.208678e-04
## 13531    2 16547 1.208678e-04
## 13532    2 16547 1.208678e-04
## 13533    2 16547 1.208678e-04
## 13534    2 16547 1.208678e-04
## 13535    2 16547 1.208678e-04
## 13536    2 16547 1.208678e-04
## 13537    2 16547 1.208678e-04
## 13538    2 16547 1.208678e-04
## 13539    2 16547 1.208678e-04
## 13540    2 16547 1.208678e-04
## 13541    2 16547 1.208678e-04
## 13542    2 16547 1.208678e-04
## 13543    2 16547 1.208678e-04
## 13544    2 16547 1.208678e-04
## 13545    2 16547 1.208678e-04
## 13546    2 16547 1.208678e-04
## 13547    2 16547 1.208678e-04
## 13548    2 16547 1.208678e-04
## 13549    2 16547 1.208678e-04
## 13550    2 16547 1.208678e-04
## 13551    2 16547 1.208678e-04
## 13552    2 16547 1.208678e-04
## 13553    2 16547 1.208678e-04
## 13554    2 16547 1.208678e-04
## 13555    2 16547 1.208678e-04
## 13556    2 16547 1.208678e-04
## 13557    2 16547 1.208678e-04
## 13558    2 16547 1.208678e-04
## 13559    2 16547 1.208678e-04
## 13560    2 16547 1.208678e-04
## 13561    2 16547 1.208678e-04
## 13562    2 16547 1.208678e-04
## 13563    2 16547 1.208678e-04
## 13564    2 16547 1.208678e-04
## 13565    2 16547 1.208678e-04
## 13566    2 16547 1.208678e-04
## 13567    2 16547 1.208678e-04
## 13568    2 16547 1.208678e-04
## 13569    2 16547 1.208678e-04
## 13570    2 16547 1.208678e-04
## 13571    2 16547 1.208678e-04
## 13572    2 16547 1.208678e-04
## 13573    2 16547 1.208678e-04
## 13574    2 16547 1.208678e-04
## 13575    2 16547 1.208678e-04
## 13576    2 16547 1.208678e-04
## 13577    2 16547 1.208678e-04
## 13578    2 16547 1.208678e-04
## 13579    2 16547 1.208678e-04
## 13580    2 16547 1.208678e-04
## 13581    2 16547 1.208678e-04
## 13582    2 16547 1.208678e-04
## 13583    2 16547 1.208678e-04
## 13584    2 16547 1.208678e-04
## 13585    2 16547 1.208678e-04
## 13586    2 16547 1.208678e-04
## 13587    2 16547 1.208678e-04
## 13588    2 16547 1.208678e-04
## 13589    2 16547 1.208678e-04
## 13590    2 16547 1.208678e-04
## 13591    2 16547 1.208678e-04
## 13592    2 16547 1.208678e-04
## 13593    2 16547 1.208678e-04
## 13594    2 16547 1.208678e-04
## 13595    2 16547 1.208678e-04
## 13596    2 16547 1.208678e-04
## 13597    2 16547 1.208678e-04
## 13598    2 16547 1.208678e-04
## 13599    2 16547 1.208678e-04
## 13600    2 16547 1.208678e-04
## 13601    2 16547 1.208678e-04
## 13602    2 16547 1.208678e-04
## 13603    2 16547 1.208678e-04
## 13604    2 16547 1.208678e-04
## 13605    2 16547 1.208678e-04
## 13606    2 16547 1.208678e-04
## 13607    2 16547 1.208678e-04
## 13608    2 16547 1.208678e-04
## 13609    2 16547 1.208678e-04
## 13610    2 16547 1.208678e-04
## 13611    2 16547 1.208678e-04
## 13612    1 70067 1.427205e-05
## 13613    1 70067 1.427205e-05
## 13614    1 70067 1.427205e-05
## 13615    1 70067 1.427205e-05
## 13616    1 70067 1.427205e-05
## 13617    1 70067 1.427205e-05
## 13618    1 70067 1.427205e-05
## 13619    1 70067 1.427205e-05
## 13620    1 70067 1.427205e-05
## 13621    1 70067 1.427205e-05
## 13622    1 70067 1.427205e-05
## 13623    1 70067 1.427205e-05
## 13624    1 70067 1.427205e-05
## 13625    1 70067 1.427205e-05
## 13626    1 70067 1.427205e-05
## 13627    1 70067 1.427205e-05
## 13628    1 70067 1.427205e-05
## 13629    1 70067 1.427205e-05
## 13630    1 70067 1.427205e-05
## 13631    1 70067 1.427205e-05
## 13632    1 70067 1.427205e-05
## 13633    1 70067 1.427205e-05
## 13634    1 70067 1.427205e-05
## 13635    1 70067 1.427205e-05
## 13636    1 70067 1.427205e-05
## 13637    1 70067 1.427205e-05
## 13638    1 70067 1.427205e-05
## 13639    1 70067 1.427205e-05
## 13640    1 70067 1.427205e-05
## 13641    1 70067 1.427205e-05
## 13642    1 70067 1.427205e-05
## 13643    1 70067 1.427205e-05
## 13644    1 70067 1.427205e-05
## 13645    1 70067 1.427205e-05
## 13646    1 70067 1.427205e-05
## 13647    1 70067 1.427205e-05
## 13648    1 70067 1.427205e-05
## 13649    1 70067 1.427205e-05
## 13650    1 70067 1.427205e-05
## 13651    1 70067 1.427205e-05
## 13652    1 70067 1.427205e-05
## 13653    1 70067 1.427205e-05
## 13654    1 70067 1.427205e-05
## 13655    1 70067 1.427205e-05
## 13656    1 70067 1.427205e-05
## 13657    1 70067 1.427205e-05
## 13658    1 70067 1.427205e-05
## 13659    1 70067 1.427205e-05
## 13660    1 70067 1.427205e-05
## 13661    1 70067 1.427205e-05
## 13662    1 70067 1.427205e-05
## 13663    1 70067 1.427205e-05
## 13664    1 70067 1.427205e-05
## 13665    1 70067 1.427205e-05
## 13666    1 70067 1.427205e-05
## 13667    1 70067 1.427205e-05
## 13668    1 70067 1.427205e-05
## 13669    1 70067 1.427205e-05
## 13670    1 70067 1.427205e-05
## 13671    1 70067 1.427205e-05
## 13672    1 70067 1.427205e-05
## 13673    1 70067 1.427205e-05
## 13674    1 70067 1.427205e-05
## 13675    1 70067 1.427205e-05
## 13676    1 70067 1.427205e-05
## 13677    1 70067 1.427205e-05
## 13678    1 70067 1.427205e-05
## 13679    1 70067 1.427205e-05
## 13680    1 70067 1.427205e-05
## 13681    1 70067 1.427205e-05
## 13682    1 70067 1.427205e-05
## 13683    1 70067 1.427205e-05
## 13684    1 70067 1.427205e-05
## 13685    1 70067 1.427205e-05
## 13686    1 70067 1.427205e-05
## 13687    1 70067 1.427205e-05
## 13688    1 70067 1.427205e-05
## 13689    1 70067 1.427205e-05
## 13690    1 70067 1.427205e-05
## 13691    1 70067 1.427205e-05
## 13692    1 70067 1.427205e-05
## 13693    1 70067 1.427205e-05
## 13694    1 70067 1.427205e-05
## 13695    1 70067 1.427205e-05
## 13696    1 70067 1.427205e-05
## 13697    1 70067 1.427205e-05
## 13698    1 70067 1.427205e-05
## 13699    1 70067 1.427205e-05
## 13700    1 70067 1.427205e-05
## 13701    1 70067 1.427205e-05
## 13702    1 70067 1.427205e-05
## 13703    1 70067 1.427205e-05
## 13704    1 70067 1.427205e-05
## 13705    1 70067 1.427205e-05
## 13706    1 70067 1.427205e-05
## 13707    1 70067 1.427205e-05
## 13708    1 70067 1.427205e-05
## 13709    1 70067 1.427205e-05
## 13710    1 70067 1.427205e-05
## 13711    1 70067 1.427205e-05
## 13712    1 70067 1.427205e-05
## 13713    1 70067 1.427205e-05
## 13714    1 70067 1.427205e-05
## 13715    1 70067 1.427205e-05
## 13716    1 70067 1.427205e-05
## 13717    1 70067 1.427205e-05
## 13718    1 70067 1.427205e-05
## 13719    1 70067 1.427205e-05
## 13720    1 70067 1.427205e-05
## 13721    1 70067 1.427205e-05
## 13722    1 70067 1.427205e-05
## 13723    1 70067 1.427205e-05
## 13724    1 70067 1.427205e-05
## 13725    1 70067 1.427205e-05
## 13726    1 70067 1.427205e-05
## 13727    1 70067 1.427205e-05
## 13728    1 70067 1.427205e-05
## 13729    1 70067 1.427205e-05
## 13730    1 70067 1.427205e-05
## 13731    1 70067 1.427205e-05
## 13732    1 70067 1.427205e-05
## 13733    1 70067 1.427205e-05
## 13734    1 70067 1.427205e-05
## 13735    1 70067 1.427205e-05
## 13736    1 70067 1.427205e-05
## 13737    1 70067 1.427205e-05
## 13738    1 70067 1.427205e-05
## 13739    1 70067 1.427205e-05
## 13740    1 70067 1.427205e-05
## 13741    1 70067 1.427205e-05
## 13742    1 70067 1.427205e-05
## 13743    1 70067 1.427205e-05
## 13744    1 70067 1.427205e-05
## 13745    1 70067 1.427205e-05
## 13746    1 70067 1.427205e-05
## 13747    1 70067 1.427205e-05
## 13748    1 70067 1.427205e-05
## 13749    1 70067 1.427205e-05
## 13750    1 70067 1.427205e-05
## 13751    1 70067 1.427205e-05
## 13752    1 70067 1.427205e-05
## 13753    1 70067 1.427205e-05
## 13754    1 70067 1.427205e-05
## 13755    1 70067 1.427205e-05
## 13756    1 70067 1.427205e-05
## 13757    1 70067 1.427205e-05
## 13758    1 70067 1.427205e-05
## 13759    1 70067 1.427205e-05
## 13760    1 70067 1.427205e-05
## 13761    1 70067 1.427205e-05
## 13762    1 70067 1.427205e-05
## 13763    1 70067 1.427205e-05
## 13764    1 70067 1.427205e-05
## 13765    1 70067 1.427205e-05
## 13766    1 70067 1.427205e-05
## 13767    1 70067 1.427205e-05
## 13768    1 70067 1.427205e-05
## 13769    1 70067 1.427205e-05
## 13770    1 70067 1.427205e-05
## 13771    1 70067 1.427205e-05
## 13772    1 70067 1.427205e-05
## 13773    1 70067 1.427205e-05
## 13774    1 70067 1.427205e-05
## 13775    1 70067 1.427205e-05
## 13776    1 70067 1.427205e-05
## 13777    1 70067 1.427205e-05
## 13778    1 70067 1.427205e-05
## 13779    1 70067 1.427205e-05
## 13780    1 70067 1.427205e-05
## 13781    1 70067 1.427205e-05
## 13782    1 70067 1.427205e-05
## 13783    1 70067 1.427205e-05
## 13784    1 70067 1.427205e-05
## 13785    1 70067 1.427205e-05
## 13786    1 70067 1.427205e-05
## 13787    1 70067 1.427205e-05
## 13788    1 70067 1.427205e-05
## 13789    1 70067 1.427205e-05
## 13790    1 70067 1.427205e-05
## 13791    1 70067 1.427205e-05
## 13792    1 70067 1.427205e-05
## 13793    1 70067 1.427205e-05
## 13794    1 70067 1.427205e-05
## 13795    1 70067 1.427205e-05
## 13796    1 70067 1.427205e-05
## 13797    1 70067 1.427205e-05
## 13798    1 70067 1.427205e-05
## 13799    1 70067 1.427205e-05
## 13800    1 70067 1.427205e-05
## 13801    1 70067 1.427205e-05
## 13802    1 70067 1.427205e-05
## 13803    1 70067 1.427205e-05
## 13804    1 70067 1.427205e-05
## 13805    1 70067 1.427205e-05
## 13806    1 70067 1.427205e-05
## 13807    1 70067 1.427205e-05
## 13808    1 70067 1.427205e-05
## 13809    1 70067 1.427205e-05
## 13810    1 70067 1.427205e-05
## 13811    1 70067 1.427205e-05
## 13812    1 70067 1.427205e-05
## 13813    1 70067 1.427205e-05
## 13814    1 70067 1.427205e-05
## 13815    1 70067 1.427205e-05
## 13816    1 70067 1.427205e-05
## 13817    1 70067 1.427205e-05
## 13818    1 70067 1.427205e-05
## 13819    1 70067 1.427205e-05
## 13820    1 70067 1.427205e-05
## 13821    1 70067 1.427205e-05
## 13822    1 70067 1.427205e-05
## 13823    1 70067 1.427205e-05
## 13824    1 70067 1.427205e-05
## 13825    1 70067 1.427205e-05
## 13826    1 70067 1.427205e-05
## 13827    1 70067 1.427205e-05
## 13828    1 70067 1.427205e-05
## 13829    1 70067 1.427205e-05
## 13830    1 70067 1.427205e-05
## 13831    1 70067 1.427205e-05
## 13832    1 70067 1.427205e-05
## 13833    1 70067 1.427205e-05
## 13834    1 70067 1.427205e-05
## 13835    1 70067 1.427205e-05
## 13836    1 70067 1.427205e-05
## 13837    1 70067 1.427205e-05
## 13838    1 70067 1.427205e-05
## 13839    1 70067 1.427205e-05
## 13840    1 70067 1.427205e-05
## 13841    1 70067 1.427205e-05
## 13842    1 70067 1.427205e-05
## 13843    1 70067 1.427205e-05
## 13844    1 70067 1.427205e-05
## 13845    1 70067 1.427205e-05
## 13846    1 70067 1.427205e-05
## 13847    1 70067 1.427205e-05
## 13848    1 70067 1.427205e-05
## 13849    1 70067 1.427205e-05
## 13850    1 70067 1.427205e-05
## 13851    1 70067 1.427205e-05
## 13852    1 70067 1.427205e-05
## 13853    1 70067 1.427205e-05
## 13854    1 70067 1.427205e-05
## 13855    1 70067 1.427205e-05
## 13856    1 70067 1.427205e-05
## 13857    1 70067 1.427205e-05
## 13858    1 70067 1.427205e-05
## 13859    1 70067 1.427205e-05
## 13860    1 70067 1.427205e-05
## 13861    1 70067 1.427205e-05
## 13862    1 70067 1.427205e-05
## 13863    1 70067 1.427205e-05
## 13864    1 70067 1.427205e-05
## 13865    1 70067 1.427205e-05
## 13866    1 70067 1.427205e-05
## 13867    1 70067 1.427205e-05
## 13868    1 70067 1.427205e-05
## 13869    1 70067 1.427205e-05
## 13870    1 70067 1.427205e-05
## 13871    1 70067 1.427205e-05
## 13872    1 70067 1.427205e-05
## 13873    1 70067 1.427205e-05
## 13874    1 70067 1.427205e-05
## 13875    1 70067 1.427205e-05
## 13876    1 70067 1.427205e-05
## 13877    1 70067 1.427205e-05
## 13878    1 70067 1.427205e-05
## 13879    1 70067 1.427205e-05
## 13880    1 70067 1.427205e-05
## 13881    1 70067 1.427205e-05
## 13882    1 70067 1.427205e-05
## 13883    1 70067 1.427205e-05
## 13884    1 70067 1.427205e-05
## 13885    1 70067 1.427205e-05
## 13886    1 70067 1.427205e-05
## 13887    1 70067 1.427205e-05
## 13888    1 70067 1.427205e-05
## 13889    1 70067 1.427205e-05
## 13890    1 70067 1.427205e-05
## 13891    1 70067 1.427205e-05
## 13892    1 70067 1.427205e-05
## 13893    1 70067 1.427205e-05
## 13894    1 70067 1.427205e-05
## 13895    1 70067 1.427205e-05
## 13896    1 70067 1.427205e-05
## 13897    1 70067 1.427205e-05
## 13898    1 70067 1.427205e-05
## 13899    1 70067 1.427205e-05
## 13900    1 70067 1.427205e-05
## 13901    1 70067 1.427205e-05
## 13902    1 70067 1.427205e-05
## 13903    1 70067 1.427205e-05
## 13904    1 70067 1.427205e-05
## 13905    1 70067 1.427205e-05
## 13906    1 70067 1.427205e-05
## 13907    1 70067 1.427205e-05
## 13908    1 70067 1.427205e-05
## 13909    1 70067 1.427205e-05
## 13910    1 70067 1.427205e-05
## 13911    1 70067 1.427205e-05
## 13912    1 70067 1.427205e-05
## 13913    1 70067 1.427205e-05
## 13914    1 70067 1.427205e-05
## 13915    1 70067 1.427205e-05
## 13916    1 70067 1.427205e-05
## 13917    1 70067 1.427205e-05
## 13918    1 70067 1.427205e-05
## 13919    1 70067 1.427205e-05
## 13920    1 70067 1.427205e-05
## 13921    1 70067 1.427205e-05
## 13922    1 70067 1.427205e-05
## 13923    1 70067 1.427205e-05
## 13924    1 70067 1.427205e-05
## 13925    1 70067 1.427205e-05
## 13926    1 70067 1.427205e-05
## 13927    1 70067 1.427205e-05
## 13928    1 70067 1.427205e-05
## 13929    1 70067 1.427205e-05
## 13930    1 70067 1.427205e-05
## 13931    1 70067 1.427205e-05
## 13932    1 70067 1.427205e-05
## 13933    1 70067 1.427205e-05
## 13934    1 70067 1.427205e-05
## 13935    1 70067 1.427205e-05
## 13936    1 70067 1.427205e-05
## 13937    1 70067 1.427205e-05
## 13938    1 70067 1.427205e-05
## 13939    1 70067 1.427205e-05
## 13940    1 70067 1.427205e-05
## 13941    1 70067 1.427205e-05
## 13942    1 70067 1.427205e-05
## 13943    1 70067 1.427205e-05
## 13944    1 70067 1.427205e-05
## 13945    1 70067 1.427205e-05
## 13946    1 70067 1.427205e-05
## 13947    1 70067 1.427205e-05
## 13948    1 70067 1.427205e-05
## 13949    1 70067 1.427205e-05
## 13950    1 70067 1.427205e-05
## 13951    1 70067 1.427205e-05
## 13952    1 70067 1.427205e-05
## 13953    1 70067 1.427205e-05
## 13954    1 70067 1.427205e-05
## 13955    1 70067 1.427205e-05
## 13956    1 70067 1.427205e-05
## 13957    1 70067 1.427205e-05
## 13958    1 70067 1.427205e-05
## 13959    1 70067 1.427205e-05
## 13960    1 70067 1.427205e-05
## 13961    1 70067 1.427205e-05
## 13962    1 70067 1.427205e-05
## 13963    1 70067 1.427205e-05
## 13964    1 70067 1.427205e-05
## 13965    1 70067 1.427205e-05
## 13966    1 70067 1.427205e-05
## 13967    1 70067 1.427205e-05
## 13968    1 70067 1.427205e-05
## 13969    1 70067 1.427205e-05
## 13970    1 70067 1.427205e-05
## 13971    1 70067 1.427205e-05
## 13972    1 70067 1.427205e-05
## 13973    1 70067 1.427205e-05
## 13974    1 70067 1.427205e-05
## 13975    1 70067 1.427205e-05
## 13976    1 70067 1.427205e-05
## 13977    1 70067 1.427205e-05
## 13978    1 70067 1.427205e-05
## 13979    1 70067 1.427205e-05
## 13980    1 70067 1.427205e-05
## 13981    1 70067 1.427205e-05
## 13982    1 70067 1.427205e-05
## 13983    1 70067 1.427205e-05
## 13984    1 70067 1.427205e-05
## 13985    1 70067 1.427205e-05
## 13986    1 70067 1.427205e-05
## 13987    1 70067 1.427205e-05
## 13988    1 70067 1.427205e-05
## 13989    1 70067 1.427205e-05
## 13990    1 70067 1.427205e-05
## 13991    1 70067 1.427205e-05
## 13992    1 70067 1.427205e-05
## 13993    1 70067 1.427205e-05
## 13994    1 70067 1.427205e-05
## 13995    1 70067 1.427205e-05
## 13996    1 70067 1.427205e-05
## 13997    1 70067 1.427205e-05
## 13998    1 70067 1.427205e-05
## 13999    1 70067 1.427205e-05
## 14000    1 70067 1.427205e-05
## 14001    1 70067 1.427205e-05
## 14002    1 70067 1.427205e-05
## 14003    1 70067 1.427205e-05
## 14004    1 70067 1.427205e-05
## 14005    1 70067 1.427205e-05
## 14006    1 70067 1.427205e-05
## 14007    1 70067 1.427205e-05
## 14008    1 70067 1.427205e-05
## 14009    1 70067 1.427205e-05
## 14010    1 70067 1.427205e-05
## 14011    1 70067 1.427205e-05
## 14012    1 70067 1.427205e-05
## 14013    1 70067 1.427205e-05
## 14014    1 70067 1.427205e-05
## 14015    1 70067 1.427205e-05
## 14016    1 70067 1.427205e-05
## 14017    1 70067 1.427205e-05
## 14018    1 70067 1.427205e-05
## 14019    1 70067 1.427205e-05
## 14020    1 70067 1.427205e-05
## 14021    1 70067 1.427205e-05
## 14022    1 70067 1.427205e-05
## 14023    1 70067 1.427205e-05
## 14024    1 70067 1.427205e-05
## 14025    1 70067 1.427205e-05
## 14026    1 70067 1.427205e-05
## 14027    1 70067 1.427205e-05
## 14028    1 70067 1.427205e-05
## 14029    1 70067 1.427205e-05
## 14030    1 70067 1.427205e-05
## 14031    1 70067 1.427205e-05
## 14032    1 70067 1.427205e-05
## 14033    1 70067 1.427205e-05
## 14034    1 70067 1.427205e-05
## 14035    1 70067 1.427205e-05
## 14036    1 70067 1.427205e-05
## 14037    1 70067 1.427205e-05
## 14038    1 70067 1.427205e-05
## 14039    1 70067 1.427205e-05
## 14040    1 70067 1.427205e-05
## 14041    1 70067 1.427205e-05
## 14042    1 70067 1.427205e-05
## 14043    1 70067 1.427205e-05
## 14044    1 70067 1.427205e-05
## 14045    1 70067 1.427205e-05
## 14046    1 70067 1.427205e-05
## 14047    1 70067 1.427205e-05
## 14048    1 70067 1.427205e-05
## 14049    1 70067 1.427205e-05
## 14050    1 70067 1.427205e-05
## 14051    1 70067 1.427205e-05
## 14052    1 70067 1.427205e-05
## 14053    1 70067 1.427205e-05
## 14054    1 70067 1.427205e-05
## 14055    1 70067 1.427205e-05
## 14056    1 70067 1.427205e-05
## 14057    1 70067 1.427205e-05
## 14058    1 70067 1.427205e-05
## 14059    1 70067 1.427205e-05
## 14060    1 70067 1.427205e-05
## 14061    1 70067 1.427205e-05
## 14062    1 70067 1.427205e-05
## 14063    1 70067 1.427205e-05
## 14064    1 70067 1.427205e-05
## 14065    1 70067 1.427205e-05
## 14066    1 70067 1.427205e-05
## 14067    1 70067 1.427205e-05
## 14068    1 70067 1.427205e-05
## 14069    1 70067 1.427205e-05
## 14070    1 70067 1.427205e-05
## 14071    1 70067 1.427205e-05
## 14072    1 70067 1.427205e-05
## 14073    1 70067 1.427205e-05
## 14074    1 70067 1.427205e-05
## 14075    1 70067 1.427205e-05
## 14076    1 70067 1.427205e-05
## 14077    1 70067 1.427205e-05
## 14078    1 70067 1.427205e-05
## 14079    1 70067 1.427205e-05
## 14080    1 70067 1.427205e-05
## 14081    1 70067 1.427205e-05
## 14082    1 70067 1.427205e-05
## 14083    1 70067 1.427205e-05
## 14084    1 70067 1.427205e-05
## 14085    1 70067 1.427205e-05
## 14086    1 70067 1.427205e-05
## 14087    1 70067 1.427205e-05
## 14088    1 70067 1.427205e-05
## 14089    1 70067 1.427205e-05
## 14090    1 70067 1.427205e-05
## 14091    1 70067 1.427205e-05
## 14092    1 70067 1.427205e-05
## 14093    1 70067 1.427205e-05
## 14094    1 70067 1.427205e-05
## 14095    1 70067 1.427205e-05
## 14096    1 70067 1.427205e-05
## 14097    1 70067 1.427205e-05
## 14098    1 70067 1.427205e-05
## 14099    1 70067 1.427205e-05
## 14100    1 70067 1.427205e-05
## 14101    1 70067 1.427205e-05
## 14102    1 70067 1.427205e-05
## 14103    1 70067 1.427205e-05
## 14104    1 70067 1.427205e-05
## 14105    1 70067 1.427205e-05
## 14106    1 70067 1.427205e-05
## 14107    1 70067 1.427205e-05
## 14108    1 70067 1.427205e-05
## 14109    1 70067 1.427205e-05
## 14110    1 70067 1.427205e-05
## 14111    1 70067 1.427205e-05
## 14112    1 70067 1.427205e-05
## 14113    1 70067 1.427205e-05
## 14114    1 70067 1.427205e-05
## 14115    1 70067 1.427205e-05
## 14116    1 70067 1.427205e-05
## 14117    1 70067 1.427205e-05
## 14118    1 70067 1.427205e-05
## 14119    1 70067 1.427205e-05
## 14120    1 70067 1.427205e-05
## 14121    1 70067 1.427205e-05
## 14122    1 70067 1.427205e-05
## 14123    1 70067 1.427205e-05
## 14124    1 70067 1.427205e-05
## 14125    1 70067 1.427205e-05
## 14126    1 70067 1.427205e-05
## 14127    1 70067 1.427205e-05
## 14128    1 70067 1.427205e-05
## 14129    1 70067 1.427205e-05
## 14130    1 70067 1.427205e-05
## 14131    1 70067 1.427205e-05
## 14132    1 70067 1.427205e-05
## 14133    1 70067 1.427205e-05
## 14134    1 70067 1.427205e-05
## 14135    1 70067 1.427205e-05
## 14136    1 70067 1.427205e-05
## 14137    1 70067 1.427205e-05
## 14138    1 70067 1.427205e-05
## 14139    1 70067 1.427205e-05
## 14140    1 70067 1.427205e-05
## 14141    1 70067 1.427205e-05
## 14142    1 70067 1.427205e-05
## 14143    1 70067 1.427205e-05
## 14144    1 70067 1.427205e-05
## 14145    1 70067 1.427205e-05
## 14146    1 70067 1.427205e-05
## 14147    1 70067 1.427205e-05
## 14148    1 70067 1.427205e-05
## 14149    1 70067 1.427205e-05
## 14150    1 70067 1.427205e-05
## 14151    1 70067 1.427205e-05
## 14152    1 70067 1.427205e-05
## 14153    1 70067 1.427205e-05
## 14154    1 70067 1.427205e-05
## 14155    1 70067 1.427205e-05
## 14156    1 70067 1.427205e-05
## 14157    1 70067 1.427205e-05
## 14158    1 70067 1.427205e-05
## 14159    1 70067 1.427205e-05
## 14160    1 70067 1.427205e-05
## 14161    1 70067 1.427205e-05
## 14162    1 70067 1.427205e-05
## 14163    1 70067 1.427205e-05
## 14164    1 70067 1.427205e-05
## 14165    1 70067 1.427205e-05
## 14166    1 70067 1.427205e-05
## 14167    1 70067 1.427205e-05
## 14168    1 70067 1.427205e-05
## 14169    1 70067 1.427205e-05
## 14170    1 70067 1.427205e-05
## 14171    1 70067 1.427205e-05
## 14172    1 70067 1.427205e-05
## 14173    1 70067 1.427205e-05
## 14174    1 70067 1.427205e-05
## 14175    1 70067 1.427205e-05
## 14176    1 70067 1.427205e-05
## 14177    1 70067 1.427205e-05
## 14178    1 70067 1.427205e-05
## 14179    1 70067 1.427205e-05
## 14180    1 70067 1.427205e-05
## 14181    1 70067 1.427205e-05
## 14182    1 70067 1.427205e-05
## 14183    1 70067 1.427205e-05
## 14184    1 70067 1.427205e-05
## 14185    1 70067 1.427205e-05
## 14186    1 70067 1.427205e-05
## 14187    1 70067 1.427205e-05
## 14188    1 70067 1.427205e-05
## 14189    1 70067 1.427205e-05
## 14190    1 70067 1.427205e-05
## 14191    1 70067 1.427205e-05
## 14192    1 70067 1.427205e-05
## 14193    1 70067 1.427205e-05
## 14194    1 70067 1.427205e-05
## 14195    1 70067 1.427205e-05
## 14196    1 70067 1.427205e-05
## 14197    1 70067 1.427205e-05
## 14198    1 70067 1.427205e-05
## 14199    1 70067 1.427205e-05
## 14200    1 70067 1.427205e-05
## 14201    1 70067 1.427205e-05
## 14202    1 70067 1.427205e-05
## 14203    1 70067 1.427205e-05
## 14204    1 70067 1.427205e-05
## 14205    1 70067 1.427205e-05
## 14206    1 70067 1.427205e-05
## 14207    1 70067 1.427205e-05
## 14208    1 70067 1.427205e-05
## 14209    1 70067 1.427205e-05
## 14210    1 70067 1.427205e-05
## 14211    1 70067 1.427205e-05
## 14212    1 70067 1.427205e-05
## 14213    1 70067 1.427205e-05
## 14214    1 70067 1.427205e-05
## 14215    1 70067 1.427205e-05
## 14216    1 70067 1.427205e-05
## 14217    1 70067 1.427205e-05
## 14218    1 70067 1.427205e-05
## 14219    1 70067 1.427205e-05
## 14220    1 70067 1.427205e-05
## 14221    1 70067 1.427205e-05
## 14222    1 70067 1.427205e-05
## 14223    1 70067 1.427205e-05
## 14224    1 70067 1.427205e-05
## 14225    1 70067 1.427205e-05
## 14226    1 70067 1.427205e-05
## 14227    1 70067 1.427205e-05
## 14228    1 70067 1.427205e-05
## 14229    1 70067 1.427205e-05
## 14230    1 70067 1.427205e-05
## 14231    1 70067 1.427205e-05
## 14232    1 70067 1.427205e-05
## 14233    1 70067 1.427205e-05
## 14234    1 70067 1.427205e-05
## 14235    1 70067 1.427205e-05
## 14236    1 70067 1.427205e-05
## 14237    1 70067 1.427205e-05
## 14238    1 70067 1.427205e-05
## 14239    1 70067 1.427205e-05
## 14240    1 70067 1.427205e-05
## 14241    1 70067 1.427205e-05
## 14242    1 70067 1.427205e-05
## 14243    1 70067 1.427205e-05
## 14244    1 70067 1.427205e-05
## 14245    1 70067 1.427205e-05
## 14246    1 70067 1.427205e-05
## 14247    1 70067 1.427205e-05
## 14248    1 70067 1.427205e-05
## 14249    1 70067 1.427205e-05
## 14250    1 70067 1.427205e-05
## 14251    1 70067 1.427205e-05
## 14252    1 70067 1.427205e-05
## 14253    1 70067 1.427205e-05
## 14254    1 70067 1.427205e-05
## 14255    1 70067 1.427205e-05
## 14256    1 70067 1.427205e-05
## 14257    1 70067 1.427205e-05
## 14258    1 70067 1.427205e-05
## 14259    1 70067 1.427205e-05
## 14260    1 70067 1.427205e-05
## 14261    1 70067 1.427205e-05
## 14262    1 70067 1.427205e-05
## 14263    1 70067 1.427205e-05
## 14264    1 70067 1.427205e-05
## 14265    1 70067 1.427205e-05
## 14266    1 70067 1.427205e-05
## 14267    1 70067 1.427205e-05
## 14268    1 70067 1.427205e-05
## 14269    1 70067 1.427205e-05
## 14270    1 70067 1.427205e-05
## 14271    1 70067 1.427205e-05
## 14272    1 70067 1.427205e-05
## 14273    1 70067 1.427205e-05
## 14274    1 70067 1.427205e-05
## 14275    1 70067 1.427205e-05
## 14276    1 70067 1.427205e-05
## 14277    1 70067 1.427205e-05
## 14278    1 70067 1.427205e-05
## 14279    1 70067 1.427205e-05
## 14280    1 70067 1.427205e-05
## 14281    1 70067 1.427205e-05
## 14282    1 70067 1.427205e-05
## 14283    1 70067 1.427205e-05
## 14284    1 70067 1.427205e-05
## 14285    1 70067 1.427205e-05
## 14286    1 70067 1.427205e-05
## 14287    1 70067 1.427205e-05
## 14288    1 70067 1.427205e-05
## 14289    1 70067 1.427205e-05
## 14290    1 70067 1.427205e-05
## 14291    1 70067 1.427205e-05
## 14292    1 70067 1.427205e-05
## 14293    1 70067 1.427205e-05
## 14294    1 70067 1.427205e-05
## 14295    1 70067 1.427205e-05
## 14296    1 70067 1.427205e-05
## 14297    1 70067 1.427205e-05
## 14298    1 70067 1.427205e-05
## 14299    1 70067 1.427205e-05
## 14300    1 70067 1.427205e-05
## 14301    1 70067 1.427205e-05
## 14302    1 70067 1.427205e-05
## 14303    1 70067 1.427205e-05
## 14304    1 70067 1.427205e-05
## 14305    1 70067 1.427205e-05
## 14306    1 70067 1.427205e-05
## 14307    1 70067 1.427205e-05
## 14308    1 70067 1.427205e-05
## 14309    1 70067 1.427205e-05
## 14310    1 70067 1.427205e-05
## 14311    1 70067 1.427205e-05
## 14312    1 70067 1.427205e-05
## 14313    1 70067 1.427205e-05
## 14314    1 70067 1.427205e-05
## 14315    1 70067 1.427205e-05
## 14316    1 70067 1.427205e-05
## 14317    1 70067 1.427205e-05
## 14318    1 70067 1.427205e-05
## 14319    1 70067 1.427205e-05
## 14320    1 70067 1.427205e-05
## 14321    1 70067 1.427205e-05
## 14322    1 70067 1.427205e-05
## 14323    1 70067 1.427205e-05
## 14324    1 70067 1.427205e-05
## 14325    1 70067 1.427205e-05
## 14326    1 70067 1.427205e-05
## 14327    1 70067 1.427205e-05
## 14328    1 70067 1.427205e-05
## 14329    1 70067 1.427205e-05
## 14330    1 70067 1.427205e-05
## 14331    1 70067 1.427205e-05
## 14332    1 70067 1.427205e-05
## 14333    1 70067 1.427205e-05
## 14334    1 70067 1.427205e-05
## 14335    1 70067 1.427205e-05
## 14336    1 70067 1.427205e-05
## 14337    1 70067 1.427205e-05
## 14338    1 70067 1.427205e-05
## 14339    1 70067 1.427205e-05
## 14340    1 70067 1.427205e-05
## 14341    1 70067 1.427205e-05
## 14342    1 70067 1.427205e-05
## 14343    1 70067 1.427205e-05
## 14344    1 70067 1.427205e-05
## 14345    1 70067 1.427205e-05
## 14346    1 70067 1.427205e-05
## 14347    1 70067 1.427205e-05
## 14348    1 70067 1.427205e-05
## 14349    1 70067 1.427205e-05
## 14350    1 70067 1.427205e-05
## 14351    1 70067 1.427205e-05
## 14352    1 70067 1.427205e-05
## 14353    1 70067 1.427205e-05
## 14354    1 70067 1.427205e-05
## 14355    1 70067 1.427205e-05
## 14356    1 70067 1.427205e-05
## 14357    1 70067 1.427205e-05
## 14358    1 70067 1.427205e-05
## 14359    1 70067 1.427205e-05
## 14360    1 70067 1.427205e-05
## 14361    1 70067 1.427205e-05
## 14362    1 70067 1.427205e-05
## 14363    1 70067 1.427205e-05
## 14364    1 70067 1.427205e-05
## 14365    1 70067 1.427205e-05
## 14366    1 70067 1.427205e-05
## 14367    1 70067 1.427205e-05
## 14368    1 70067 1.427205e-05
## 14369    1 70067 1.427205e-05
## 14370    1 70067 1.427205e-05
## 14371    1 70067 1.427205e-05
## 14372    1 70067 1.427205e-05
## 14373    1 70067 1.427205e-05
## 14374    1 70067 1.427205e-05
## 14375    1 70067 1.427205e-05
## 14376    1 70067 1.427205e-05
## 14377    1 70067 1.427205e-05
## 14378    1 70067 1.427205e-05
## 14379    1 70067 1.427205e-05
## 14380    1 70067 1.427205e-05
## 14381    1 70067 1.427205e-05
## 14382    1 70067 1.427205e-05
## 14383    1 70067 1.427205e-05
## 14384    1 70067 1.427205e-05
## 14385    1 70067 1.427205e-05
## 14386    1 70067 1.427205e-05
## 14387    1 70067 1.427205e-05
## 14388    1 70067 1.427205e-05
## 14389    1 70067 1.427205e-05
## 14390    1 70067 1.427205e-05
## 14391    1 70067 1.427205e-05
## 14392    1 70067 1.427205e-05
## 14393    1 70067 1.427205e-05
## 14394    1 70067 1.427205e-05
## 14395    1 70067 1.427205e-05
## 14396    1 70067 1.427205e-05
## 14397    1 70067 1.427205e-05
## 14398    1 70067 1.427205e-05
## 14399    1 70067 1.427205e-05
## 14400    1 70067 1.427205e-05
## 14401    1 70067 1.427205e-05
## 14402    1 70067 1.427205e-05
## 14403    1 70067 1.427205e-05
## 14404    1 70067 1.427205e-05
## 14405    1 70067 1.427205e-05
## 14406    1 70067 1.427205e-05
## 14407    1 70067 1.427205e-05
## 14408    1 70067 1.427205e-05
## 14409    1 70067 1.427205e-05
## 14410    1 70067 1.427205e-05
## 14411    1 70067 1.427205e-05
## 14412    1 70067 1.427205e-05
## 14413    1 70067 1.427205e-05
## 14414    1 70067 1.427205e-05
## 14415    1 70067 1.427205e-05
## 14416    1 70067 1.427205e-05
## 14417    1 70067 1.427205e-05
## 14418    1 70067 1.427205e-05
## 14419    1 70067 1.427205e-05
## 14420    1 70067 1.427205e-05
## 14421    1 70067 1.427205e-05
## 14422    1 70067 1.427205e-05
## 14423    1 70067 1.427205e-05
## 14424    1 70067 1.427205e-05
## 14425    1 70067 1.427205e-05
## 14426    1 70067 1.427205e-05
## 14427    1 70067 1.427205e-05
## 14428    1 70067 1.427205e-05
## 14429    1 70067 1.427205e-05
## 14430    1 70067 1.427205e-05
## 14431    1 70067 1.427205e-05
## 14432    1 70067 1.427205e-05
## 14433    1 70067 1.427205e-05
## 14434    1 70067 1.427205e-05
## 14435    1 70067 1.427205e-05
## 14436    1 70067 1.427205e-05
## 14437    1 70067 1.427205e-05
## 14438    1 70067 1.427205e-05
## 14439    1 70067 1.427205e-05
## 14440    1 70067 1.427205e-05
## 14441    1 70067 1.427205e-05
## 14442    1 70067 1.427205e-05
## 14443    1 70067 1.427205e-05
## 14444    1 70067 1.427205e-05
## 14445    1 70067 1.427205e-05
## 14446    1 70067 1.427205e-05
## 14447    1 70067 1.427205e-05
## 14448    1 70067 1.427205e-05
## 14449    1 70067 1.427205e-05
## 14450    1 70067 1.427205e-05
## 14451    1 70067 1.427205e-05
## 14452    1 70067 1.427205e-05
## 14453    1 70067 1.427205e-05
## 14454    1 70067 1.427205e-05
## 14455    1 70067 1.427205e-05
## 14456    1 70067 1.427205e-05
## 14457    1 70067 1.427205e-05
## 14458    1 70067 1.427205e-05
## 14459    1 70067 1.427205e-05
## 14460    1 70067 1.427205e-05
## 14461    1 70067 1.427205e-05
## 14462    1 70067 1.427205e-05
## 14463    1 70067 1.427205e-05
## 14464    1 70067 1.427205e-05
## 14465    1 70067 1.427205e-05
## 14466    1 70067 1.427205e-05
## 14467    1 70067 1.427205e-05
## 14468    1 70067 1.427205e-05
## 14469    1 70067 1.427205e-05
## 14470    1 70067 1.427205e-05
## 14471    1 70067 1.427205e-05
## 14472    1 70067 1.427205e-05
## 14473    1 70067 1.427205e-05
## 14474    1 70067 1.427205e-05
## 14475    1 70067 1.427205e-05
## 14476    1 70067 1.427205e-05
## 14477    1 70067 1.427205e-05
## 14478    1 70067 1.427205e-05
## 14479    1 70067 1.427205e-05
## 14480    1 70067 1.427205e-05
## 14481    1 70067 1.427205e-05
## 14482    1 70067 1.427205e-05
## 14483    1 70067 1.427205e-05
## 14484    1 70067 1.427205e-05
## 14485    1 70067 1.427205e-05
## 14486    1 70067 1.427205e-05
## 14487    1 70067 1.427205e-05
## 14488    1 70067 1.427205e-05
## 14489    1 70067 1.427205e-05
## 14490    1 70067 1.427205e-05
## 14491    1 70067 1.427205e-05
## 14492    1 70067 1.427205e-05
## 14493    1 70067 1.427205e-05
## 14494    1 70067 1.427205e-05
## 14495    1 70067 1.427205e-05
## 14496    1 70067 1.427205e-05
## 14497    1 70067 1.427205e-05
## 14498    1 70067 1.427205e-05
## 14499    1 70067 1.427205e-05
## 14500    1 70067 1.427205e-05
## 14501    1 70067 1.427205e-05
## 14502    1 70067 1.427205e-05
## 14503    1 70067 1.427205e-05
## 14504    1 70067 1.427205e-05
## 14505    1 70067 1.427205e-05
## 14506    1 70067 1.427205e-05
## 14507    1 70067 1.427205e-05
## 14508    1 70067 1.427205e-05
## 14509    1 70067 1.427205e-05
## 14510    1 70067 1.427205e-05
## 14511    1 70067 1.427205e-05
## 14512    1 70067 1.427205e-05
## 14513    1 70067 1.427205e-05
## 14514    1 70067 1.427205e-05
## 14515    1 70067 1.427205e-05
## 14516    1 70067 1.427205e-05
## 14517    1 70067 1.427205e-05
## 14518    1 70067 1.427205e-05
## 14519    1 70067 1.427205e-05
## 14520    1 70067 1.427205e-05
## 14521    1 70067 1.427205e-05
## 14522    1 70067 1.427205e-05
## 14523    1 70067 1.427205e-05
## 14524    1 70067 1.427205e-05
## 14525    1 70067 1.427205e-05
## 14526    1 70067 1.427205e-05
## 14527    1 70067 1.427205e-05
## 14528    1 70067 1.427205e-05
## 14529    1 70067 1.427205e-05
## 14530    1 70067 1.427205e-05
## 14531    1 70067 1.427205e-05
## 14532    1 70067 1.427205e-05
## 14533    1 70067 1.427205e-05
## 14534    1 70067 1.427205e-05
## 14535    1 70067 1.427205e-05
## 14536    1 70067 1.427205e-05
## 14537    1 70067 1.427205e-05
## 14538    1 70067 1.427205e-05
## 14539    1 70067 1.427205e-05
## 14540    1 70067 1.427205e-05
## 14541    1 70067 1.427205e-05
## 14542    1 70067 1.427205e-05
## 14543    1 70067 1.427205e-05
## 14544    1 70067 1.427205e-05
## 14545    1 70067 1.427205e-05
## 14546    1 70067 1.427205e-05
## 14547    1 70067 1.427205e-05
## 14548    1 70067 1.427205e-05
## 14549    1 70067 1.427205e-05
## 14550    1 70067 1.427205e-05
## 14551    1 70067 1.427205e-05
## 14552    1 70067 1.427205e-05
## 14553    1 70067 1.427205e-05
## 14554    1 70067 1.427205e-05
## 14555    1 70067 1.427205e-05
## 14556    1 70067 1.427205e-05
## 14557    1 70067 1.427205e-05
## 14558    1 70067 1.427205e-05
## 14559    1 70067 1.427205e-05
## 14560    1 70067 1.427205e-05
## 14561    1 70067 1.427205e-05
## 14562    1 70067 1.427205e-05
## 14563    1 70067 1.427205e-05
## 14564    1 70067 1.427205e-05
## 14565    1 70067 1.427205e-05
## 14566    1 70067 1.427205e-05
## 14567    1 70067 1.427205e-05
## 14568    1 70067 1.427205e-05
## 14569    1 70067 1.427205e-05
## 14570    1 70067 1.427205e-05
## 14571    1 70067 1.427205e-05
## 14572    1 70067 1.427205e-05
## 14573    1 70067 1.427205e-05
## 14574    1 70067 1.427205e-05
## 14575    1 70067 1.427205e-05
## 14576    1 70067 1.427205e-05
## 14577    1 70067 1.427205e-05
## 14578    1 70067 1.427205e-05
## 14579    1 70067 1.427205e-05
## 14580    1 70067 1.427205e-05
## 14581    1 70067 1.427205e-05
## 14582    1 70067 1.427205e-05
## 14583    1 70067 1.427205e-05
## 14584    1 70067 1.427205e-05
## 14585    1 70067 1.427205e-05
## 14586    1 70067 1.427205e-05
## 14587    1 70067 1.427205e-05
## 14588    1 70067 1.427205e-05
## 14589    1 70067 1.427205e-05
## 14590    1 70067 1.427205e-05
## 14591    1 70067 1.427205e-05
## 14592    1 70067 1.427205e-05
## 14593    1 70067 1.427205e-05
## 14594    1 70067 1.427205e-05
## 14595    1 70067 1.427205e-05
## 14596    1 70067 1.427205e-05
## 14597    1 70067 1.427205e-05
## 14598    1 70067 1.427205e-05
## 14599    1 70067 1.427205e-05
## 14600    1 70067 1.427205e-05
## 14601    1 70067 1.427205e-05
## 14602    1 70067 1.427205e-05
## 14603    1 70067 1.427205e-05
## 14604    1 70067 1.427205e-05
## 14605    1 70067 1.427205e-05
## 14606    1 70067 1.427205e-05
## 14607    1 70067 1.427205e-05
## 14608    1 70067 1.427205e-05
## 14609    1 70067 1.427205e-05
## 14610    1 70067 1.427205e-05
## 14611    1 70067 1.427205e-05
## 14612    1 70067 1.427205e-05
## 14613    1 70067 1.427205e-05
## 14614    1 70067 1.427205e-05
## 14615    1 70067 1.427205e-05
## 14616    1 70067 1.427205e-05
## 14617    1 70067 1.427205e-05
## 14618    1 70067 1.427205e-05
## 14619    1 70067 1.427205e-05
## 14620    1 70067 1.427205e-05
## 14621    1 70067 1.427205e-05
## 14622    1 70067 1.427205e-05
## 14623    1 70067 1.427205e-05
## 14624    1 70067 1.427205e-05
## 14625    1 70067 1.427205e-05
## 14626    1 70067 1.427205e-05
## 14627    1 70067 1.427205e-05
## 14628    1 70067 1.427205e-05
## 14629    1 70067 1.427205e-05
## 14630    1 70067 1.427205e-05
## 14631    1 70067 1.427205e-05
## 14632    1 70067 1.427205e-05
## 14633    1 70067 1.427205e-05
## 14634    1 70067 1.427205e-05
## 14635    1 70067 1.427205e-05
## 14636    1 70067 1.427205e-05
## 14637    1 70067 1.427205e-05
## 14638    1 70067 1.427205e-05
## 14639    1 70067 1.427205e-05
## 14640    1 70067 1.427205e-05
## 14641    1 70067 1.427205e-05
## 14642    1 70067 1.427205e-05
## 14643    1 70067 1.427205e-05
## 14644    1 70067 1.427205e-05
## 14645    1 70067 1.427205e-05
## 14646    1 70067 1.427205e-05
## 14647    1 70067 1.427205e-05
## 14648    1 70067 1.427205e-05
## 14649    1 70067 1.427205e-05
## 14650    1 70067 1.427205e-05
## 14651    1 70067 1.427205e-05
## 14652    1 70067 1.427205e-05
## 14653    1 70067 1.427205e-05
## 14654    1 70067 1.427205e-05
## 14655    1 70067 1.427205e-05
## 14656    1 70067 1.427205e-05
## 14657    1 70067 1.427205e-05
## 14658    1 70067 1.427205e-05
## 14659    1 70067 1.427205e-05
## 14660    1 70067 1.427205e-05
## 14661    1 70067 1.427205e-05
## 14662    1 70067 1.427205e-05
## 14663    1 70067 1.427205e-05
## 14664    1 70067 1.427205e-05
## 14665    1 70067 1.427205e-05
## 14666    1 70067 1.427205e-05
## 14667    1 70067 1.427205e-05
## 14668    1 70067 1.427205e-05
## 14669    1 70067 1.427205e-05
## 14670    1 70067 1.427205e-05
## 14671    1 70067 1.427205e-05
## 14672    1 70067 1.427205e-05
## 14673    1 70067 1.427205e-05
## 14674    1 70067 1.427205e-05
## 14675    1 70067 1.427205e-05
## 14676    1 70067 1.427205e-05
## 14677    1 70067 1.427205e-05
## 14678    1 70067 1.427205e-05
## 14679    1 70067 1.427205e-05
## 14680    1 70067 1.427205e-05
## 14681    1 70067 1.427205e-05
## 14682    1 70067 1.427205e-05
## 14683    1 70067 1.427205e-05
## 14684    1 70067 1.427205e-05
## 14685    1 70067 1.427205e-05
## 14686    1 70067 1.427205e-05
## 14687    1 70067 1.427205e-05
## 14688    1 70067 1.427205e-05
## 14689    1 70067 1.427205e-05
## 14690    1 70067 1.427205e-05
## 14691    1 70067 1.427205e-05
## 14692    1 70067 1.427205e-05
## 14693    1 70067 1.427205e-05
## 14694    1 70067 1.427205e-05
## 14695    1 70067 1.427205e-05
## 14696    1 70067 1.427205e-05
## 14697    1 70067 1.427205e-05
## 14698    1 70067 1.427205e-05
## 14699    1 70067 1.427205e-05
## 14700    1 70067 1.427205e-05
## 14701    1 70067 1.427205e-05
## 14702    1 70067 1.427205e-05
## 14703    1 70067 1.427205e-05
## 14704    1 70067 1.427205e-05
## 14705    1 70067 1.427205e-05
## 14706    1 70067 1.427205e-05
## 14707    1 70067 1.427205e-05
## 14708    1 70067 1.427205e-05
## 14709    1 70067 1.427205e-05
## 14710    1 70067 1.427205e-05
## 14711    1 70067 1.427205e-05
## 14712    1 70067 1.427205e-05
## 14713    1 70067 1.427205e-05
## 14714    1 70067 1.427205e-05
## 14715    1 70067 1.427205e-05
## 14716    1 70067 1.427205e-05
## 14717    1 70067 1.427205e-05
## 14718    1 70067 1.427205e-05
## 14719    1 70067 1.427205e-05
## 14720    1 70067 1.427205e-05
## 14721    1 70067 1.427205e-05
## 14722    1 70067 1.427205e-05
## 14723    1 70067 1.427205e-05
## 14724    1 70067 1.427205e-05
## 14725    1 70067 1.427205e-05
## 14726    1 70067 1.427205e-05
## 14727    1 70067 1.427205e-05
## 14728    1 70067 1.427205e-05
## 14729    1 70067 1.427205e-05
## 14730    1 70067 1.427205e-05
## 14731    1 70067 1.427205e-05
## 14732    1 70067 1.427205e-05
## 14733    1 70067 1.427205e-05
## 14734    1 70067 1.427205e-05
## 14735    1 70067 1.427205e-05
## 14736    1 70067 1.427205e-05
## 14737    1 70067 1.427205e-05
## 14738    1 70067 1.427205e-05
## 14739    1 70067 1.427205e-05
## 14740    1 70067 1.427205e-05
## 14741    1 70067 1.427205e-05
## 14742    1 70067 1.427205e-05
## 14743    1 70067 1.427205e-05
## 14744    1 70067 1.427205e-05
## 14745    1 70067 1.427205e-05
## 14746    1 70067 1.427205e-05
## 14747    1 70067 1.427205e-05
## 14748    1 70067 1.427205e-05
## 14749    1 70067 1.427205e-05
## 14750    1 70067 1.427205e-05
## 14751    1 70067 1.427205e-05
## 14752    1 70067 1.427205e-05
## 14753    1 70067 1.427205e-05
## 14754    1 70067 1.427205e-05
## 14755    1 70067 1.427205e-05
## 14756    1 70067 1.427205e-05
## 14757    1 70067 1.427205e-05
## 14758    1 70067 1.427205e-05
## 14759    1 70067 1.427205e-05
## 14760    1 70067 1.427205e-05
## 14761    1 70067 1.427205e-05
## 14762    1 70067 1.427205e-05
## 14763    1 70067 1.427205e-05
## 14764    1 70067 1.427205e-05
## 14765    1 70067 1.427205e-05
## 14766    1 70067 1.427205e-05
## 14767    1 70067 1.427205e-05
## 14768    1 70067 1.427205e-05
## 14769    1 70067 1.427205e-05
## 14770    1 70067 1.427205e-05
## 14771    1 70067 1.427205e-05
## 14772    1 70067 1.427205e-05
## 14773    1 70067 1.427205e-05
## 14774    1 70067 1.427205e-05
## 14775    1 70067 1.427205e-05
## 14776    1 70067 1.427205e-05
## 14777    1 70067 1.427205e-05
## 14778    1 70067 1.427205e-05
## 14779    1 70067 1.427205e-05
## 14780    1 70067 1.427205e-05
## 14781    1 70067 1.427205e-05
## 14782    1 70067 1.427205e-05
## 14783    1 70067 1.427205e-05
## 14784    1 70067 1.427205e-05
## 14785    1 70067 1.427205e-05
## 14786    1 70067 1.427205e-05
## 14787    1 70067 1.427205e-05
## 14788    1 70067 1.427205e-05
## 14789    1 70067 1.427205e-05
## 14790    1 70067 1.427205e-05
## 14791    1 70067 1.427205e-05
## 14792    1 70067 1.427205e-05
## 14793    1 70067 1.427205e-05
## 14794    1 70067 1.427205e-05
## 14795    1 70067 1.427205e-05
## 14796    1 70067 1.427205e-05
## 14797    1 70067 1.427205e-05
## 14798    1 70067 1.427205e-05
## 14799    1 70067 1.427205e-05
## 14800    1 70067 1.427205e-05
## 14801    1 70067 1.427205e-05
## 14802    1 70067 1.427205e-05
## 14803    1 70067 1.427205e-05
## 14804    1 70067 1.427205e-05
## 14805    1 70067 1.427205e-05
## 14806    1 70067 1.427205e-05
## 14807    1 70067 1.427205e-05
## 14808    1 70067 1.427205e-05
## 14809    1 70067 1.427205e-05
## 14810    1 70067 1.427205e-05
## 14811    1 70067 1.427205e-05
## 14812    1 70067 1.427205e-05
## 14813    1 70067 1.427205e-05
## 14814    1 70067 1.427205e-05
## 14815    1 70067 1.427205e-05
## 14816    1 70067 1.427205e-05
## 14817    1 70067 1.427205e-05
## 14818    1 70067 1.427205e-05
## 14819    1 70067 1.427205e-05
## 14820    1 70067 1.427205e-05
## 14821    1 70067 1.427205e-05
## 14822    1 70067 1.427205e-05
## 14823    1 70067 1.427205e-05
## 14824    1 70067 1.427205e-05
## 14825    1 70067 1.427205e-05
## 14826    1 70067 1.427205e-05
## 14827    1 70067 1.427205e-05
## 14828    1 70067 1.427205e-05
## 14829    1 70067 1.427205e-05
## 14830    1 70067 1.427205e-05
## 14831    1 70067 1.427205e-05
## 14832    1 70067 1.427205e-05
## 14833    1 70067 1.427205e-05
## 14834    1 70067 1.427205e-05
## 14835    1 70067 1.427205e-05
## 14836    1 70067 1.427205e-05
## 14837    1 70067 1.427205e-05
## 14838    1 70067 1.427205e-05
## 14839    1 70067 1.427205e-05
## 14840    1 70067 1.427205e-05
## 14841    1 70067 1.427205e-05
## 14842    1 70067 1.427205e-05
## 14843    1 70067 1.427205e-05
## 14844    1 70067 1.427205e-05
## 14845    1 70067 1.427205e-05
## 14846    1 70067 1.427205e-05
## 14847    1 70067 1.427205e-05
## 14848    1 70067 1.427205e-05
## 14849    1 70067 1.427205e-05
## 14850    1 70067 1.427205e-05
## 14851    1 70067 1.427205e-05
## 14852    1 70067 1.427205e-05
## 14853    1 70067 1.427205e-05
## 14854    1 70067 1.427205e-05
## 14855    1 70067 1.427205e-05
## 14856    1 70067 1.427205e-05
## 14857    1 70067 1.427205e-05
## 14858    1 70067 1.427205e-05
## 14859    1 70067 1.427205e-05
## 14860    1 70067 1.427205e-05
## 14861    1 70067 1.427205e-05
## 14862    1 70067 1.427205e-05
## 14863    1 70067 1.427205e-05
## 14864    1 70067 1.427205e-05
## 14865    1 70067 1.427205e-05
## 14866    1 70067 1.427205e-05
## 14867    1 70067 1.427205e-05
## 14868    1 70067 1.427205e-05
## 14869    1 70067 1.427205e-05
## 14870    1 70067 1.427205e-05
## 14871    1 70067 1.427205e-05
## 14872    1 70067 1.427205e-05
## 14873    1 70067 1.427205e-05
## 14874    1 70067 1.427205e-05
## 14875    1 70067 1.427205e-05
## 14876    1 70067 1.427205e-05
## 14877    1 70067 1.427205e-05
## 14878    1 70067 1.427205e-05
## 14879    1 70067 1.427205e-05
## 14880    1 70067 1.427205e-05
## 14881    1 70067 1.427205e-05
## 14882    1 70067 1.427205e-05
## 14883    1 70067 1.427205e-05
## 14884    1 70067 1.427205e-05
## 14885    1 70067 1.427205e-05
## 14886    1 70067 1.427205e-05
## 14887    1 70067 1.427205e-05
## 14888    1 70067 1.427205e-05
## 14889    1 70067 1.427205e-05
## 14890    1 70067 1.427205e-05
## 14891    1 70067 1.427205e-05
## 14892    1 70067 1.427205e-05
## 14893    1 70067 1.427205e-05
## 14894    1 70067 1.427205e-05
## 14895    1 70067 1.427205e-05
## 14896    1 70067 1.427205e-05
## 14897    1 70067 1.427205e-05
## 14898    1 70067 1.427205e-05
## 14899    1 70067 1.427205e-05
## 14900    1 70067 1.427205e-05
## 14901    1 70067 1.427205e-05
## 14902    1 70067 1.427205e-05
## 14903    1 70067 1.427205e-05
## 14904    1 70067 1.427205e-05
## 14905    1 70067 1.427205e-05
## 14906    1 70067 1.427205e-05
## 14907    1 70067 1.427205e-05
## 14908    1 70067 1.427205e-05
## 14909    1 70067 1.427205e-05
## 14910    1 70067 1.427205e-05
## 14911    1 70067 1.427205e-05
## 14912    1 70067 1.427205e-05
## 14913    1 70067 1.427205e-05
## 14914    1 70067 1.427205e-05
## 14915    1 70067 1.427205e-05
## 14916    1 70067 1.427205e-05
## 14917    1 70067 1.427205e-05
## 14918    1 70067 1.427205e-05
## 14919    1 70067 1.427205e-05
## 14920    1 70067 1.427205e-05
## 14921    1 70067 1.427205e-05
## 14922    1 70067 1.427205e-05
## 14923    1 70067 1.427205e-05
## 14924    1 70067 1.427205e-05
## 14925    1 70067 1.427205e-05
## 14926    1 70067 1.427205e-05
## 14927    1 70067 1.427205e-05
## 14928    1 70067 1.427205e-05
## 14929    1 70067 1.427205e-05
## 14930    1 70067 1.427205e-05
## 14931    1 70067 1.427205e-05
## 14932    1 70067 1.427205e-05
## 14933    1 70067 1.427205e-05
## 14934    1 70067 1.427205e-05
## 14935    1 70067 1.427205e-05
## 14936    1 70067 1.427205e-05
## 14937    1 70067 1.427205e-05
## 14938    1 70067 1.427205e-05
## 14939    1 70067 1.427205e-05
## 14940    1 70067 1.427205e-05
## 14941    1 70067 1.427205e-05
## 14942    1 70067 1.427205e-05
## 14943    1 70067 1.427205e-05
## 14944    1 70067 1.427205e-05
## 14945    1 70067 1.427205e-05
## 14946    1 70067 1.427205e-05
## 14947    1 70067 1.427205e-05
## 14948    1 70067 1.427205e-05
## 14949    1 70067 1.427205e-05
## 14950    1 70067 1.427205e-05
## 14951    1 70067 1.427205e-05
## 14952    1 70067 1.427205e-05
## 14953    1 70067 1.427205e-05
## 14954    1 70067 1.427205e-05
## 14955    1 70067 1.427205e-05
## 14956    1 70067 1.427205e-05
## 14957    1 70067 1.427205e-05
## 14958    1 70067 1.427205e-05
## 14959    1 70067 1.427205e-05
## 14960    1 70067 1.427205e-05
## 14961    1 70067 1.427205e-05
## 14962    1 70067 1.427205e-05
## 14963    1 70067 1.427205e-05
## 14964    1 70067 1.427205e-05
## 14965    1 70067 1.427205e-05
## 14966    1 70067 1.427205e-05
## 14967    1 70067 1.427205e-05
## 14968    1 70067 1.427205e-05
## 14969    1 70067 1.427205e-05
## 14970    1 70067 1.427205e-05
## 14971    1 70067 1.427205e-05
## 14972    1 70067 1.427205e-05
## 14973    1 70067 1.427205e-05
## 14974    1 70067 1.427205e-05
## 14975    1 70067 1.427205e-05
## 14976    1 70067 1.427205e-05
## 14977    1 70067 1.427205e-05
## 14978    1 70067 1.427205e-05
## 14979    1 70067 1.427205e-05
## 14980    1 70067 1.427205e-05
## 14981    1 70067 1.427205e-05
## 14982    1 70067 1.427205e-05
## 14983    1 70067 1.427205e-05
## 14984    1 70067 1.427205e-05
## 14985    1 70067 1.427205e-05
## 14986    1 70067 1.427205e-05
## 14987    1 70067 1.427205e-05
## 14988    1 70067 1.427205e-05
## 14989    1 70067 1.427205e-05
## 14990    1 70067 1.427205e-05
## 14991    1 70067 1.427205e-05
## 14992    1 70067 1.427205e-05
## 14993    1 70067 1.427205e-05
## 14994    1 70067 1.427205e-05
## 14995    1 70067 1.427205e-05
## 14996    1 70067 1.427205e-05
## 14997    1 70067 1.427205e-05
## 14998    1 70067 1.427205e-05
## 14999    1 70067 1.427205e-05
## 15000    1 70067 1.427205e-05
## 15001    1 70067 1.427205e-05
## 15002    1 70067 1.427205e-05
## 15003    1 70067 1.427205e-05
## 15004    1 70067 1.427205e-05
## 15005    1 70067 1.427205e-05
## 15006    1 70067 1.427205e-05
## 15007    1 70067 1.427205e-05
## 15008    1 70067 1.427205e-05
## 15009    1 70067 1.427205e-05
## 15010    1 70067 1.427205e-05
## 15011    1 70067 1.427205e-05
## 15012    1 70067 1.427205e-05
## 15013    1 70067 1.427205e-05
## 15014    1 70067 1.427205e-05
## 15015    1 70067 1.427205e-05
## 15016    1 70067 1.427205e-05
## 15017    1 70067 1.427205e-05
## 15018    1 70067 1.427205e-05
## 15019    1 70067 1.427205e-05
## 15020    1 70067 1.427205e-05
## 15021    1 70067 1.427205e-05
## 15022    1 70067 1.427205e-05
## 15023    1 70067 1.427205e-05
## 15024    1 70067 1.427205e-05
## 15025    1 70067 1.427205e-05
## 15026    1 70067 1.427205e-05
## 15027    1 70067 1.427205e-05
## 15028    1 70067 1.427205e-05
## 15029    1 70067 1.427205e-05
## 15030    1 70067 1.427205e-05
## 15031    1 70067 1.427205e-05
## 15032    1 70067 1.427205e-05
## 15033    1 70067 1.427205e-05
## 15034    1 70067 1.427205e-05
## 15035    1 70067 1.427205e-05
## 15036    1 70067 1.427205e-05
## 15037    1 70067 1.427205e-05
## 15038    1 70067 1.427205e-05
## 15039    1 70067 1.427205e-05
## 15040    1 70067 1.427205e-05
## 15041    1 70067 1.427205e-05
## 15042    1 70067 1.427205e-05
## 15043    1 70067 1.427205e-05
## 15044    1 70067 1.427205e-05
## 15045    1 70067 1.427205e-05
## 15046    1 70067 1.427205e-05
## 15047    1 70067 1.427205e-05
## 15048    1 70067 1.427205e-05
## 15049    1 70067 1.427205e-05
## 15050    1 70067 1.427205e-05
## 15051    1 70067 1.427205e-05
## 15052    1 70067 1.427205e-05
## 15053    1 70067 1.427205e-05
## 15054    1 70067 1.427205e-05
## 15055    1 70067 1.427205e-05
## 15056    1 70067 1.427205e-05
## 15057    1 70067 1.427205e-05
## 15058    1 70067 1.427205e-05
## 15059    1 70067 1.427205e-05
## 15060    1 70067 1.427205e-05
## 15061    1 70067 1.427205e-05
## 15062    1 70067 1.427205e-05
## 15063    1 70067 1.427205e-05
## 15064    1 70067 1.427205e-05
## 15065    1 70067 1.427205e-05
## 15066    1 70067 1.427205e-05
## 15067    1 70067 1.427205e-05
## 15068    1 70067 1.427205e-05
## 15069    1 70067 1.427205e-05
## 15070    1 70067 1.427205e-05
## 15071    1 70067 1.427205e-05
## 15072    1 70067 1.427205e-05
## 15073    1 70067 1.427205e-05
## 15074    1 70067 1.427205e-05
## 15075    1 70067 1.427205e-05
## 15076    1 70067 1.427205e-05
## 15077    1 70067 1.427205e-05
## 15078    1 70067 1.427205e-05
## 15079    1 70067 1.427205e-05
## 15080    1 70067 1.427205e-05
## 15081    1 70067 1.427205e-05
## 15082    1 70067 1.427205e-05
## 15083    1 70067 1.427205e-05
## 15084    1 70067 1.427205e-05
## 15085    1 70067 1.427205e-05
## 15086    1 70067 1.427205e-05
## 15087    1 70067 1.427205e-05
## 15088    1 70067 1.427205e-05
## 15089    1 70067 1.427205e-05
## 15090    1 70067 1.427205e-05
## 15091    1 70067 1.427205e-05
## 15092    1 70067 1.427205e-05
## 15093    1 70067 1.427205e-05
## 15094    1 70067 1.427205e-05
## 15095    1 70067 1.427205e-05
## 15096    1 70067 1.427205e-05
## 15097    1 70067 1.427205e-05
## 15098    1 70067 1.427205e-05
## 15099    1 70067 1.427205e-05
## 15100    1 70067 1.427205e-05
## 15101    1 70067 1.427205e-05
## 15102    1 70067 1.427205e-05
## 15103    1 70067 1.427205e-05
## 15104    1 70067 1.427205e-05
## 15105    1 70067 1.427205e-05
## 15106    1 70067 1.427205e-05
## 15107    1 70067 1.427205e-05
## 15108    1 70067 1.427205e-05
## 15109    1 70067 1.427205e-05
## 15110    1 70067 1.427205e-05
## 15111    1 70067 1.427205e-05
## 15112    1 70067 1.427205e-05
## 15113    1 70067 1.427205e-05
## 15114    1 70067 1.427205e-05
## 15115    1 70067 1.427205e-05
## 15116    1 70067 1.427205e-05
## 15117    1 70067 1.427205e-05
## 15118    1 70067 1.427205e-05
## 15119    1 70067 1.427205e-05
## 15120    1 70067 1.427205e-05
## 15121    1 70067 1.427205e-05
## 15122    1 70067 1.427205e-05
## 15123    1 70067 1.427205e-05
## 15124    1 70067 1.427205e-05
## 15125    1 70067 1.427205e-05
## 15126    1 70067 1.427205e-05
## 15127    1 70067 1.427205e-05
## 15128    1 70067 1.427205e-05
## 15129    1 70067 1.427205e-05
## 15130    1 70067 1.427205e-05
## 15131    1 70067 1.427205e-05
## 15132    1 70067 1.427205e-05
## 15133    1 70067 1.427205e-05
## 15134    1 70067 1.427205e-05
## 15135    1 70067 1.427205e-05
## 15136    1 70067 1.427205e-05
## 15137    1 70067 1.427205e-05
## 15138    1 70067 1.427205e-05
## 15139    1 70067 1.427205e-05
## 15140    1 70067 1.427205e-05
## 15141    1 70067 1.427205e-05
## 15142    1 70067 1.427205e-05
## 15143    1 70067 1.427205e-05
## 15144    1 70067 1.427205e-05
## 15145    1 70067 1.427205e-05
## 15146    1 70067 1.427205e-05
## 15147    1 70067 1.427205e-05
## 15148    1 70067 1.427205e-05
## 15149    1 70067 1.427205e-05
## 15150    1 70067 1.427205e-05
## 15151    1 70067 1.427205e-05
## 15152    1 70067 1.427205e-05
## 15153    1 70067 1.427205e-05
## 15154    1 70067 1.427205e-05
## 15155    1 70067 1.427205e-05
## 15156    1 70067 1.427205e-05
## 15157    1 70067 1.427205e-05
## 15158    1 70067 1.427205e-05
## 15159    1 70067 1.427205e-05
## 15160    1 70067 1.427205e-05
## 15161    1 70067 1.427205e-05
## 15162    1 70067 1.427205e-05
## 15163    1 70067 1.427205e-05
## 15164    1 70067 1.427205e-05
## 15165    1 70067 1.427205e-05
## 15166    1 70067 1.427205e-05
## 15167    1 70067 1.427205e-05
## 15168    1 70067 1.427205e-05
## 15169    1 70067 1.427205e-05
## 15170    1 70067 1.427205e-05
## 15171    1 70067 1.427205e-05
## 15172    1 70067 1.427205e-05
## 15173    1 70067 1.427205e-05
## 15174    1 70067 1.427205e-05
## 15175    1 70067 1.427205e-05
## 15176    1 70067 1.427205e-05
## 15177    1 70067 1.427205e-05
## 15178    1 70067 1.427205e-05
## 15179    1 70067 1.427205e-05
## 15180    1 70067 1.427205e-05
## 15181    1 70067 1.427205e-05
## 15182    1 70067 1.427205e-05
## 15183    1 70067 1.427205e-05
## 15184    1 70067 1.427205e-05
## 15185    1 70067 1.427205e-05
## 15186    1 70067 1.427205e-05
## 15187    1 70067 1.427205e-05
## 15188    1 70067 1.427205e-05
## 15189    1 70067 1.427205e-05
## 15190    1 70067 1.427205e-05
## 15191    1 70067 1.427205e-05
## 15192    1 70067 1.427205e-05
## 15193    1 70067 1.427205e-05
## 15194    1 70067 1.427205e-05
## 15195    1 70067 1.427205e-05
## 15196    1 70067 1.427205e-05
## 15197    1 70067 1.427205e-05
## 15198    1 70067 1.427205e-05
## 15199    1 70067 1.427205e-05
## 15200    1 70067 1.427205e-05
## 15201    1 70067 1.427205e-05
## 15202    1 70067 1.427205e-05
## 15203    1 70067 1.427205e-05
## 15204    1 70067 1.427205e-05
## 15205    1 70067 1.427205e-05
## 15206    1 70067 1.427205e-05
## 15207    1 70067 1.427205e-05
## 15208    1 70067 1.427205e-05
## 15209    1 70067 1.427205e-05
## 15210    1 70067 1.427205e-05
## 15211    1 70067 1.427205e-05
## 15212    1 70067 1.427205e-05
## 15213    1 70067 1.427205e-05
## 15214    1 70067 1.427205e-05
## 15215    1 70067 1.427205e-05
## 15216    1 70067 1.427205e-05
## 15217    1 70067 1.427205e-05
## 15218    1 70067 1.427205e-05
## 15219    1 70067 1.427205e-05
## 15220    1 70067 1.427205e-05
## 15221    1 70067 1.427205e-05
## 15222    1 70067 1.427205e-05
## 15223    1 70067 1.427205e-05
## 15224    1 70067 1.427205e-05
## 15225    1 70067 1.427205e-05
## 15226    1 70067 1.427205e-05
## 15227    1 70067 1.427205e-05
## 15228    1 70067 1.427205e-05
## 15229    1 70067 1.427205e-05
## 15230    1 70067 1.427205e-05
## 15231    1 70067 1.427205e-05
## 15232    1 70067 1.427205e-05
## 15233    1 70067 1.427205e-05
## 15234    1 70067 1.427205e-05
## 15235    1 70067 1.427205e-05
## 15236    1 70067 1.427205e-05
## 15237    1 70067 1.427205e-05
## 15238    1 70067 1.427205e-05
## 15239    1 70067 1.427205e-05
## 15240    1 70067 1.427205e-05
## 15241    1 70067 1.427205e-05
## 15242    1 70067 1.427205e-05
## 15243    1 70067 1.427205e-05
## 15244    1 70067 1.427205e-05
## 15245    1 70067 1.427205e-05
## 15246    1 70067 1.427205e-05
## 15247    1 70067 1.427205e-05
## 15248    1 70067 1.427205e-05
## 15249    1 70067 1.427205e-05
## 15250    1 70067 1.427205e-05
## 15251    1 70067 1.427205e-05
## 15252    1 70067 1.427205e-05
## 15253    1 70067 1.427205e-05
## 15254    1 70067 1.427205e-05
## 15255    1 70067 1.427205e-05
## 15256    1 70067 1.427205e-05
## 15257    1 70067 1.427205e-05
## 15258    1 70067 1.427205e-05
## 15259    1 70067 1.427205e-05
## 15260    1 70067 1.427205e-05
## 15261    1 70067 1.427205e-05
## 15262    1 70067 1.427205e-05
## 15263    1 70067 1.427205e-05
## 15264    1 70067 1.427205e-05
## 15265    1 70067 1.427205e-05
## 15266    1 70067 1.427205e-05
## 15267    1 70067 1.427205e-05
## 15268    1 70067 1.427205e-05
## 15269    1 70067 1.427205e-05
## 15270    1 70067 1.427205e-05
## 15271    1 70067 1.427205e-05
## 15272    1 70067 1.427205e-05
## 15273    1 70067 1.427205e-05
## 15274    1 70067 1.427205e-05
## 15275    1 70067 1.427205e-05
## 15276    1 70067 1.427205e-05
## 15277    1 70067 1.427205e-05
## 15278    1 70067 1.427205e-05
## 15279    1 70067 1.427205e-05
## 15280    1 70067 1.427205e-05
## 15281    1 70067 1.427205e-05
## 15282    1 70067 1.427205e-05
## 15283    1 70067 1.427205e-05
## 15284    1 70067 1.427205e-05
## 15285    1 70067 1.427205e-05
## 15286    1 70067 1.427205e-05
## 15287    1 70067 1.427205e-05
## 15288    1 70067 1.427205e-05
## 15289    1 70067 1.427205e-05
## 15290    1 70067 1.427205e-05
## 15291    1 70067 1.427205e-05
## 15292    1 70067 1.427205e-05
## 15293    1 70067 1.427205e-05
## 15294    1 70067 1.427205e-05
## 15295    1 70067 1.427205e-05
## 15296    1 70067 1.427205e-05
## 15297    1 70067 1.427205e-05
## 15298    1 70067 1.427205e-05
## 15299    1 70067 1.427205e-05
## 15300    1 70067 1.427205e-05
## 15301    1 70067 1.427205e-05
## 15302    1 70067 1.427205e-05
## 15303    1 70067 1.427205e-05
## 15304    1 70067 1.427205e-05
## 15305    1 70067 1.427205e-05
## 15306    1 70067 1.427205e-05
## 15307    1 70067 1.427205e-05
## 15308    1 70067 1.427205e-05
## 15309    1 70067 1.427205e-05
## 15310    1 70067 1.427205e-05
## 15311    1 70067 1.427205e-05
## 15312    1 70067 1.427205e-05
## 15313    1 70067 1.427205e-05
## 15314    1 70067 1.427205e-05
## 15315    1 70067 1.427205e-05
## 15316    1 70067 1.427205e-05
## 15317    1 70067 1.427205e-05
## 15318    1 70067 1.427205e-05
## 15319    1 70067 1.427205e-05
## 15320    1 70067 1.427205e-05
## 15321    1 70067 1.427205e-05
## 15322    1 70067 1.427205e-05
## 15323    1 70067 1.427205e-05
## 15324    1 70067 1.427205e-05
## 15325    1 70067 1.427205e-05
## 15326    1 70067 1.427205e-05
## 15327    1 70067 1.427205e-05
## 15328    1 70067 1.427205e-05
## 15329    1 70067 1.427205e-05
## 15330    1 70067 1.427205e-05
## 15331    1 70067 1.427205e-05
## 15332    1 70067 1.427205e-05
## 15333    1 70067 1.427205e-05
## 15334    1 70067 1.427205e-05
## 15335    1 70067 1.427205e-05
## 15336    1 70067 1.427205e-05
## 15337    1 70067 1.427205e-05
## 15338    1 70067 1.427205e-05
## 15339    1 70067 1.427205e-05
## 15340    1 70067 1.427205e-05
## 15341    1 70067 1.427205e-05
## 15342    1 70067 1.427205e-05
## 15343    1 70067 1.427205e-05
## 15344    1 70067 1.427205e-05
## 15345    1 70067 1.427205e-05
## 15346    1 70067 1.427205e-05
## 15347    1 70067 1.427205e-05
## 15348    1 70067 1.427205e-05
## 15349    1 70067 1.427205e-05
## 15350    1 70067 1.427205e-05
## 15351    1 70067 1.427205e-05
## 15352    1 70067 1.427205e-05
## 15353    1 70067 1.427205e-05
## 15354    1 70067 1.427205e-05
## 15355    1 70067 1.427205e-05
## 15356    1 70067 1.427205e-05
## 15357    1 70067 1.427205e-05
## 15358    1 70067 1.427205e-05
## 15359    1 70067 1.427205e-05
## 15360    1 70067 1.427205e-05
## 15361    1 70067 1.427205e-05
## 15362    1 70067 1.427205e-05
## 15363    1 70067 1.427205e-05
## 15364    1 70067 1.427205e-05
## 15365    1 70067 1.427205e-05
## 15366    1 70067 1.427205e-05
## 15367    1 70067 1.427205e-05
## 15368    1 70067 1.427205e-05
## 15369    1 70067 1.427205e-05
## 15370    1 70067 1.427205e-05
## 15371    1 70067 1.427205e-05
## 15372    1 70067 1.427205e-05
## 15373    1 70067 1.427205e-05
## 15374    1 70067 1.427205e-05
## 15375    1 70067 1.427205e-05
## 15376    1 70067 1.427205e-05
## 15377    1 70067 1.427205e-05
## 15378    1 70067 1.427205e-05
## 15379    1 70067 1.427205e-05
## 15380    1 70067 1.427205e-05
## 15381    1 70067 1.427205e-05
## 15382    1 70067 1.427205e-05
## 15383    1 70067 1.427205e-05
## 15384    1 70067 1.427205e-05
## 15385    1 70067 1.427205e-05
## 15386    1 70067 1.427205e-05
## 15387    1 70067 1.427205e-05
## 15388    1 70067 1.427205e-05
## 15389    1 70067 1.427205e-05
## 15390    1 70067 1.427205e-05
## 15391    1 70067 1.427205e-05
## 15392    1 70067 1.427205e-05
## 15393    1 70067 1.427205e-05
## 15394    1 70067 1.427205e-05
## 15395    1 70067 1.427205e-05
## 15396    1 70067 1.427205e-05
## 15397    1 70067 1.427205e-05
## 15398    1 70067 1.427205e-05
## 15399    1 70067 1.427205e-05
## 15400    1 70067 1.427205e-05
## 15401    1 70067 1.427205e-05
## 15402    1 70067 1.427205e-05
## 15403    1 70067 1.427205e-05
## 15404    1 70067 1.427205e-05
## 15405    1 70067 1.427205e-05
## 15406    1 70067 1.427205e-05
## 15407    1 70067 1.427205e-05
## 15408    1 70067 1.427205e-05
## 15409    1 70067 1.427205e-05
## 15410    1 70067 1.427205e-05
## 15411    1 70067 1.427205e-05
## 15412    1 70067 1.427205e-05
## 15413    1 70067 1.427205e-05
## 15414    1 70067 1.427205e-05
## 15415    1 70067 1.427205e-05
## 15416    1 70067 1.427205e-05
## 15417    1 70067 1.427205e-05
## 15418    1 70067 1.427205e-05
## 15419    1 70067 1.427205e-05
## 15420    1 70067 1.427205e-05
## 15421    1 70067 1.427205e-05
## 15422    1 70067 1.427205e-05
## 15423    1 70067 1.427205e-05
## 15424    1 70067 1.427205e-05
## 15425    1 70067 1.427205e-05
## 15426    1 70067 1.427205e-05
## 15427    1 70067 1.427205e-05
## 15428    1 70067 1.427205e-05
## 15429    1 70067 1.427205e-05
## 15430    1 70067 1.427205e-05
## 15431    1 70067 1.427205e-05
## 15432    1 70067 1.427205e-05
## 15433    1 70067 1.427205e-05
## 15434    1 70067 1.427205e-05
## 15435    1 70067 1.427205e-05
## 15436    1 70067 1.427205e-05
## 15437    1 70067 1.427205e-05
## 15438    1 70067 1.427205e-05
## 15439    1 70067 1.427205e-05
## 15440    1 70067 1.427205e-05
## 15441    1 70067 1.427205e-05
## 15442    1 70067 1.427205e-05
## 15443    1 70067 1.427205e-05
## 15444    1 70067 1.427205e-05
## 15445    1 70067 1.427205e-05
## 15446    1 70067 1.427205e-05
## 15447    1 70067 1.427205e-05
## 15448    1 70067 1.427205e-05
## 15449    1 70067 1.427205e-05
## 15450    1 70067 1.427205e-05
## 15451    1 70067 1.427205e-05
## 15452    1 70067 1.427205e-05
## 15453    1 70067 1.427205e-05
## 15454    1 70067 1.427205e-05
## 15455    1 70067 1.427205e-05
## 15456    1 70067 1.427205e-05
## 15457    1 70067 1.427205e-05
## 15458    1 70067 1.427205e-05
## 15459    1 70067 1.427205e-05
## 15460    1 70067 1.427205e-05
## 15461    1 70067 1.427205e-05
## 15462    1 70067 1.427205e-05
## 15463    1 70067 1.427205e-05
## 15464    1 70067 1.427205e-05
## 15465    1 70067 1.427205e-05
## 15466    1 70067 1.427205e-05
## 15467    1 70067 1.427205e-05
## 15468    1 70067 1.427205e-05
## 15469    1 70067 1.427205e-05
## 15470    1 70067 1.427205e-05
## 15471    1 70067 1.427205e-05
## 15472    1 70067 1.427205e-05
## 15473    1 70067 1.427205e-05
## 15474    1 70067 1.427205e-05
## 15475    1 70067 1.427205e-05
## 15476    1 70067 1.427205e-05
## 15477    1 70067 1.427205e-05
## 15478    1 70067 1.427205e-05
## 15479    1 70067 1.427205e-05
## 15480    1 70067 1.427205e-05
## 15481    1 70067 1.427205e-05
## 15482    1 70067 1.427205e-05
## 15483    1 70067 1.427205e-05
## 15484    1 70067 1.427205e-05
## 15485    1 70067 1.427205e-05
## 15486    1 70067 1.427205e-05
## 15487    1 70067 1.427205e-05
## 15488    1 70067 1.427205e-05
## 15489    1 70067 1.427205e-05
## 15490    1 70067 1.427205e-05
## 15491    1 70067 1.427205e-05
## 15492    1 70067 1.427205e-05
## 15493    1 70067 1.427205e-05
## 15494    1 70067 1.427205e-05
## 15495    1 70067 1.427205e-05
## 15496    1 70067 1.427205e-05
## 15497    1 70067 1.427205e-05
## 15498    1 70067 1.427205e-05
## 15499    1 70067 1.427205e-05
## 15500    1 70067 1.427205e-05
## 15501    1 70067 1.427205e-05
## 15502    1 70067 1.427205e-05
## 15503    1 70067 1.427205e-05
## 15504    1 70067 1.427205e-05
## 15505    1 70067 1.427205e-05
## 15506    1 70067 1.427205e-05
## 15507    1 70067 1.427205e-05
## 15508    1 70067 1.427205e-05
## 15509    1 70067 1.427205e-05
## 15510    1 70067 1.427205e-05
## 15511    1 70067 1.427205e-05
## 15512    1 70067 1.427205e-05
## 15513    1 70067 1.427205e-05
## 15514    1 70067 1.427205e-05
## 15515    1 70067 1.427205e-05
## 15516    1 70067 1.427205e-05
## 15517    1 70067 1.427205e-05
## 15518    1 70067 1.427205e-05
## 15519    1 70067 1.427205e-05
## 15520    1 70067 1.427205e-05
## 15521    1 70067 1.427205e-05
## 15522    1 70067 1.427205e-05
## 15523    1 70067 1.427205e-05
## 15524    1 70067 1.427205e-05
## 15525    1 70067 1.427205e-05
## 15526    1 70067 1.427205e-05
## 15527    1 70067 1.427205e-05
## 15528    1 70067 1.427205e-05
## 15529    1 70067 1.427205e-05
## 15530    1 70067 1.427205e-05
## 15531    1 70067 1.427205e-05
## 15532    1 70067 1.427205e-05
## 15533    1 70067 1.427205e-05
## 15534    1 70067 1.427205e-05
## 15535    1 70067 1.427205e-05
## 15536    1 70067 1.427205e-05
## 15537    1 70067 1.427205e-05
## 15538    1 70067 1.427205e-05
## 15539    1 70067 1.427205e-05
## 15540    1 70067 1.427205e-05
## 15541    1 70067 1.427205e-05
## 15542    1 70067 1.427205e-05
## 15543    1 70067 1.427205e-05
## 15544    1 70067 1.427205e-05
## 15545    1 70067 1.427205e-05
## 15546    1 70067 1.427205e-05
## 15547    1 70067 1.427205e-05
## 15548    1 70067 1.427205e-05
## 15549    1 70067 1.427205e-05
## 15550    1 70067 1.427205e-05
## 15551    1 70067 1.427205e-05
## 15552    1 70067 1.427205e-05
## 15553    1 70067 1.427205e-05
## 15554    1 70067 1.427205e-05
## 15555    1 70067 1.427205e-05
## 15556    1 70067 1.427205e-05
## 15557    1 70067 1.427205e-05
## 15558    1 70067 1.427205e-05
## 15559    1 70067 1.427205e-05
## 15560    1 70067 1.427205e-05
## 15561    1 70067 1.427205e-05
## 15562    1 70067 1.427205e-05
## 15563    1 70067 1.427205e-05
## 15564    1 70067 1.427205e-05
## 15565    1 70067 1.427205e-05
## 15566    1 70067 1.427205e-05
## 15567    1 70067 1.427205e-05
## 15568    1 70067 1.427205e-05
## 15569    1 70067 1.427205e-05
## 15570    1 70067 1.427205e-05
## 15571    1 70067 1.427205e-05
## 15572    1 70067 1.427205e-05
## 15573    1 70067 1.427205e-05
## 15574    1 70067 1.427205e-05
## 15575    1 70067 1.427205e-05
## 15576    1 70067 1.427205e-05
## 15577    1 70067 1.427205e-05
## 15578    1 70067 1.427205e-05
## 15579    1 70067 1.427205e-05
## 15580    1 70067 1.427205e-05
## 15581    1 70067 1.427205e-05
## 15582    1 70067 1.427205e-05
## 15583    1 70067 1.427205e-05
## 15584    1 70067 1.427205e-05
## 15585    1 70067 1.427205e-05
## 15586    1 70067 1.427205e-05
## 15587    1 70067 1.427205e-05
## 15588    1 70067 1.427205e-05
## 15589    1 70067 1.427205e-05
## 15590    1 70067 1.427205e-05
## 15591    1 70067 1.427205e-05
## 15592    1 70067 1.427205e-05
## 15593    1 70067 1.427205e-05
## 15594    1 70067 1.427205e-05
## 15595    1 70067 1.427205e-05
## 15596    1 70067 1.427205e-05
## 15597    1 70067 1.427205e-05
## 15598    1 70067 1.427205e-05
## 15599    1 70067 1.427205e-05
## 15600    1 70067 1.427205e-05
## 15601    1 70067 1.427205e-05
## 15602    1 70067 1.427205e-05
## 15603    1 70067 1.427205e-05
## 15604    1 70067 1.427205e-05
## 15605    1 70067 1.427205e-05
## 15606    1 70067 1.427205e-05
## 15607    1 70067 1.427205e-05
## 15608    1 70067 1.427205e-05
## 15609    1 70067 1.427205e-05
## 15610    1 70067 1.427205e-05
## 15611    1 70067 1.427205e-05
## 15612    1 70067 1.427205e-05
## 15613    1 70067 1.427205e-05
## 15614    1 70067 1.427205e-05
## 15615    1 70067 1.427205e-05
## 15616    1 70067 1.427205e-05
## 15617    1 70067 1.427205e-05
## 15618    1 70067 1.427205e-05
## 15619    1 70067 1.427205e-05
## 15620    1 70067 1.427205e-05
## 15621    1 70067 1.427205e-05
## 15622    1 70067 1.427205e-05
## 15623    1 70067 1.427205e-05
## 15624    1 70067 1.427205e-05
## 15625    1 70067 1.427205e-05
## 15626    1 70067 1.427205e-05
## 15627    1 70067 1.427205e-05
## 15628    1 70067 1.427205e-05
## 15629    1 70067 1.427205e-05
## 15630    1 70067 1.427205e-05
## 15631    1 70067 1.427205e-05
## 15632    1 70067 1.427205e-05
## 15633    1 70067 1.427205e-05
## 15634    1 70067 1.427205e-05
## 15635    1 70067 1.427205e-05
## 15636    1 70067 1.427205e-05
## 15637    1 70067 1.427205e-05
## 15638    1 70067 1.427205e-05
## 15639    1 70067 1.427205e-05
## 15640    1 70067 1.427205e-05
## 15641    1 70067 1.427205e-05
## 15642    1 70067 1.427205e-05
## 15643    1 70067 1.427205e-05
## 15644    1 70067 1.427205e-05
## 15645    1 70067 1.427205e-05
## 15646    1 70067 1.427205e-05
## 15647    1 70067 1.427205e-05
## 15648    1 70067 1.427205e-05
## 15649    1 70067 1.427205e-05
## 15650    1 70067 1.427205e-05
## 15651    1 70067 1.427205e-05
## 15652    1 70067 1.427205e-05
## 15653    1 70067 1.427205e-05
## 15654    1 70067 1.427205e-05
## 15655    1 70067 1.427205e-05
## 15656    1 70067 1.427205e-05
## 15657    1 70067 1.427205e-05
## 15658    1 70067 1.427205e-05
## 15659    1 70067 1.427205e-05
## 15660    1 70067 1.427205e-05
## 15661    1 70067 1.427205e-05
## 15662    1 70067 1.427205e-05
## 15663    1 70067 1.427205e-05
## 15664    1 70067 1.427205e-05
## 15665    1 70067 1.427205e-05
## 15666    1 70067 1.427205e-05
## 15667    1 70067 1.427205e-05
## 15668    1 70067 1.427205e-05
## 15669    1 70067 1.427205e-05
## 15670    1 70067 1.427205e-05
## 15671    1 70067 1.427205e-05
## 15672    1 70067 1.427205e-05
## 15673    1 70067 1.427205e-05
## 15674    1 70067 1.427205e-05
## 15675    1 70067 1.427205e-05
## 15676    1 70067 1.427205e-05
## 15677    1 70067 1.427205e-05
## 15678    1 70067 1.427205e-05
## 15679    1 70067 1.427205e-05
## 15680    1 70067 1.427205e-05
## 15681    1 70067 1.427205e-05
## 15682    1 70067 1.427205e-05
## 15683    1 70067 1.427205e-05
## 15684    1 70067 1.427205e-05
## 15685    1 70067 1.427205e-05
## 15686    1 70067 1.427205e-05
## 15687    1 70067 1.427205e-05
## 15688    1 70067 1.427205e-05
## 15689    1 70067 1.427205e-05
## 15690    1 70067 1.427205e-05
## 15691    1 70067 1.427205e-05
## 15692    1 70067 1.427205e-05
## 15693    1 70067 1.427205e-05
## 15694    1 70067 1.427205e-05
## 15695    1 70067 1.427205e-05
## 15696    1 70067 1.427205e-05
## 15697    1 70067 1.427205e-05
## 15698    1 70067 1.427205e-05
## 15699    1 70067 1.427205e-05
## 15700    1 70067 1.427205e-05
## 15701    1 70067 1.427205e-05
## 15702    1 70067 1.427205e-05
## 15703    1 70067 1.427205e-05
## 15704    1 70067 1.427205e-05
## 15705    1 70067 1.427205e-05
## 15706    1 70067 1.427205e-05
## 15707    1 70067 1.427205e-05
## 15708    1 70067 1.427205e-05
## 15709    1 70067 1.427205e-05
## 15710    1 70067 1.427205e-05
## 15711    1 70067 1.427205e-05
## 15712    1 70067 1.427205e-05
## 15713    1 70067 1.427205e-05
## 15714    1 70067 1.427205e-05
## 15715    1 70067 1.427205e-05
## 15716    1 70067 1.427205e-05
## 15717    1 70067 1.427205e-05
## 15718    1 70067 1.427205e-05
## 15719    1 70067 1.427205e-05
## 15720    1 70067 1.427205e-05
## 15721    1 70067 1.427205e-05
## 15722    1 70067 1.427205e-05
## 15723    1 70067 1.427205e-05
## 15724    1 70067 1.427205e-05
## 15725    1 70067 1.427205e-05
## 15726    1 70067 1.427205e-05
## 15727    1 70067 1.427205e-05
## 15728    1 70067 1.427205e-05
## 15729    1 70067 1.427205e-05
## 15730    1 70067 1.427205e-05
## 15731    1 70067 1.427205e-05
## 15732    1 70067 1.427205e-05
## 15733    1 70067 1.427205e-05
## 15734    1 70067 1.427205e-05
## 15735    1 70067 1.427205e-05
## 15736    1 70067 1.427205e-05
## 15737    1 70067 1.427205e-05
## 15738    1 70067 1.427205e-05
## 15739    1 70067 1.427205e-05
## 15740    1 70067 1.427205e-05
## 15741    1 70067 1.427205e-05
## 15742    1 70067 1.427205e-05
## 15743    1 70067 1.427205e-05
## 15744    1 70067 1.427205e-05
## 15745    1 70067 1.427205e-05
## 15746    1 70067 1.427205e-05
## 15747    1 70067 1.427205e-05
## 15748    1 70067 1.427205e-05
## 15749    1 70067 1.427205e-05
## 15750    1 70067 1.427205e-05
## 15751    1 70067 1.427205e-05
## 15752    1 70067 1.427205e-05
## 15753    1 70067 1.427205e-05
## 15754    1 70067 1.427205e-05
## 15755    1 70067 1.427205e-05
## 15756    1 70067 1.427205e-05
## 15757    1 70067 1.427205e-05
## 15758    1 70067 1.427205e-05
## 15759    1 70067 1.427205e-05
## 15760    1 70067 1.427205e-05
## 15761    1 70067 1.427205e-05
## 15762    1 70067 1.427205e-05
## 15763    1 70067 1.427205e-05
## 15764    1 70067 1.427205e-05
## 15765    1 70067 1.427205e-05
## 15766    1 70067 1.427205e-05
## 15767    1 70067 1.427205e-05
## 15768    1 70067 1.427205e-05
## 15769    1 70067 1.427205e-05
## 15770    1 70067 1.427205e-05
## 15771    1 70067 1.427205e-05
## 15772    1 70067 1.427205e-05
## 15773    1 70067 1.427205e-05
## 15774    1 70067 1.427205e-05
## 15775    1 70067 1.427205e-05
## 15776    1 70067 1.427205e-05
## 15777    1 70067 1.427205e-05
## 15778    1 70067 1.427205e-05
## 15779    1 70067 1.427205e-05
## 15780    1 70067 1.427205e-05
## 15781    1 70067 1.427205e-05
## 15782    1 70067 1.427205e-05
## 15783    1 70067 1.427205e-05
## 15784    1 70067 1.427205e-05
## 15785    1 70067 1.427205e-05
## 15786    1 70067 1.427205e-05
## 15787    1 70067 1.427205e-05
## 15788    1 70067 1.427205e-05
## 15789    1 70067 1.427205e-05
## 15790    1 70067 1.427205e-05
## 15791    1 70067 1.427205e-05
## 15792    1 70067 1.427205e-05
## 15793    1 70067 1.427205e-05
## 15794    1 70067 1.427205e-05
## 15795    1 70067 1.427205e-05
## 15796    1 70067 1.427205e-05
## 15797    1 70067 1.427205e-05
## 15798    1 70067 1.427205e-05
## 15799    1 70067 1.427205e-05
## 15800    1 70067 1.427205e-05
## 15801    1 70067 1.427205e-05
## 15802    1 70067 1.427205e-05
## 15803    1 70067 1.427205e-05
## 15804    1 70067 1.427205e-05
## 15805    1 70067 1.427205e-05
## 15806    1 70067 1.427205e-05
## 15807    1 70067 1.427205e-05
## 15808    1 70067 1.427205e-05
## 15809    1 70067 1.427205e-05
## 15810    1 70067 1.427205e-05
## 15811    1 70067 1.427205e-05
## 15812    1 70067 1.427205e-05
## 15813    1 70067 1.427205e-05
## 15814    1 70067 1.427205e-05
## 15815    1 70067 1.427205e-05
## 15816    1 70067 1.427205e-05
## 15817    1 70067 1.427205e-05
## 15818    1 70067 1.427205e-05
## 15819    1 70067 1.427205e-05
## 15820    1 70067 1.427205e-05
## 15821    1 70067 1.427205e-05
## 15822    1 70067 1.427205e-05
## 15823    1 70067 1.427205e-05
## 15824    1 70067 1.427205e-05
## 15825    1 70067 1.427205e-05
## 15826    1 70067 1.427205e-05
## 15827    1 70067 1.427205e-05
## 15828    1 70067 1.427205e-05
## 15829    1 70067 1.427205e-05
## 15830    1 70067 1.427205e-05
## 15831    1 70067 1.427205e-05
## 15832    1 70067 1.427205e-05
## 15833    1 70067 1.427205e-05
## 15834    1 70067 1.427205e-05
## 15835    1 70067 1.427205e-05
## 15836    1 70067 1.427205e-05
## 15837    1 70067 1.427205e-05
## 15838    1 70067 1.427205e-05
## 15839    1 70067 1.427205e-05
## 15840    1 70067 1.427205e-05
## 15841    1 70067 1.427205e-05
## 15842    1 70067 1.427205e-05
## 15843    1 70067 1.427205e-05
## 15844    1 70067 1.427205e-05
## 15845    1 70067 1.427205e-05
## 15846    1 70067 1.427205e-05
## 15847    1 70067 1.427205e-05
## 15848    1 70067 1.427205e-05
## 15849    1 70067 1.427205e-05
## 15850    1 70067 1.427205e-05
## 15851    1 70067 1.427205e-05
## 15852    1 70067 1.427205e-05
## 15853    1 70067 1.427205e-05
## 15854    1 70067 1.427205e-05
## 15855    1 70067 1.427205e-05
## 15856    1 70067 1.427205e-05
## 15857    1 70067 1.427205e-05
## 15858    1 70067 1.427205e-05
## 15859    1 70067 1.427205e-05
## 15860    1 70067 1.427205e-05
## 15861    1 70067 1.427205e-05
## 15862    1 70067 1.427205e-05
## 15863    1 70067 1.427205e-05
## 15864    1 70067 1.427205e-05
## 15865    1 70067 1.427205e-05
## 15866    1 70067 1.427205e-05
## 15867    1 70067 1.427205e-05
## 15868    1 70067 1.427205e-05
## 15869    1 70067 1.427205e-05
## 15870    1 70067 1.427205e-05
## 15871    1 70067 1.427205e-05
## 15872    1 70067 1.427205e-05
## 15873    1 70067 1.427205e-05
## 15874    1 70067 1.427205e-05
## 15875    1 70067 1.427205e-05
## 15876    1 70067 1.427205e-05
## 15877    1 70067 1.427205e-05
## 15878    1 70067 1.427205e-05
## 15879    1 70067 1.427205e-05
## 15880    1 70067 1.427205e-05
## 15881    1 70067 1.427205e-05
## 15882    1 70067 1.427205e-05
## 15883    1 70067 1.427205e-05
## 15884    1 70067 1.427205e-05
## 15885    1 70067 1.427205e-05
## 15886    1 70067 1.427205e-05
## 15887    1 70067 1.427205e-05
## 15888    1 70067 1.427205e-05
## 15889    1 70067 1.427205e-05
## 15890    1 70067 1.427205e-05
## 15891    1 70067 1.427205e-05
## 15892    1 70067 1.427205e-05
## 15893    1 70067 1.427205e-05
## 15894    1 70067 1.427205e-05
## 15895    1 70067 1.427205e-05
## 15896    1 70067 1.427205e-05
## 15897    1 70067 1.427205e-05
## 15898    1 70067 1.427205e-05
## 15899    1 70067 1.427205e-05
## 15900    1 70067 1.427205e-05
## 15901    1 70067 1.427205e-05
## 15902    1 70067 1.427205e-05
## 15903    1 70067 1.427205e-05
## 15904    1 70067 1.427205e-05
## 15905    1 70067 1.427205e-05
## 15906    1 70067 1.427205e-05
## 15907    1 70067 1.427205e-05
## 15908    1 70067 1.427205e-05
## 15909    1 70067 1.427205e-05
## 15910    1 70067 1.427205e-05
## 15911    1 70067 1.427205e-05
## 15912    1 70067 1.427205e-05
## 15913    1 70067 1.427205e-05
## 15914    1 70067 1.427205e-05
## 15915    1 70067 1.427205e-05
## 15916    1 70067 1.427205e-05
## 15917    1 70067 1.427205e-05
## 15918    1 70067 1.427205e-05
## 15919    1 70067 1.427205e-05
## 15920    1 70067 1.427205e-05
## 15921    1 70067 1.427205e-05
## 15922    1 70067 1.427205e-05
## 15923    1 70067 1.427205e-05
## 15924    1 70067 1.427205e-05
## 15925    1 70067 1.427205e-05
## 15926    1 70067 1.427205e-05
## 15927    1 70067 1.427205e-05
## 15928    1 70067 1.427205e-05
## 15929    1 70067 1.427205e-05
## 15930    1 70067 1.427205e-05
## 15931    1 70067 1.427205e-05
## 15932    1 70067 1.427205e-05
## 15933    1 70067 1.427205e-05
## 15934    1 70067 1.427205e-05
## 15935    1 70067 1.427205e-05
## 15936    1 70067 1.427205e-05
## 15937    1 70067 1.427205e-05
## 15938    1 70067 1.427205e-05
## 15939    1 70067 1.427205e-05
## 15940    1 70067 1.427205e-05
## 15941    1 70067 1.427205e-05
## 15942    1 70067 1.427205e-05
## 15943    1 70067 1.427205e-05
## 15944    1 70067 1.427205e-05
## 15945    1 70067 1.427205e-05
## 15946    1 70067 1.427205e-05
## 15947    1 70067 1.427205e-05
## 15948    1 70067 1.427205e-05
## 15949    1 70067 1.427205e-05
## 15950    1 70067 1.427205e-05
## 15951    1 70067 1.427205e-05
## 15952    1 70067 1.427205e-05
## 15953    1 70067 1.427205e-05
## 15954    1 70067 1.427205e-05
## 15955    1 70067 1.427205e-05
## 15956    1 70067 1.427205e-05
## 15957    1 70067 1.427205e-05
## 15958    1 70067 1.427205e-05
## 15959    1 70067 1.427205e-05
## 15960    1 70067 1.427205e-05
## 15961    1 70067 1.427205e-05
## 15962    1 70067 1.427205e-05
## 15963    1 70067 1.427205e-05
## 15964    1 70067 1.427205e-05
## 15965    1 70067 1.427205e-05
## 15966    1 70067 1.427205e-05
## 15967    1 70067 1.427205e-05
## 15968    1 70067 1.427205e-05
## 15969    1 70067 1.427205e-05
## 15970    1 70067 1.427205e-05
## 15971    1 70067 1.427205e-05
## 15972    1 70067 1.427205e-05
## 15973    1 70067 1.427205e-05
## 15974    1 70067 1.427205e-05
## 15975    1 70067 1.427205e-05
## 15976    1 70067 1.427205e-05
## 15977    1 70067 1.427205e-05
## 15978    1 70067 1.427205e-05
## 15979    1 70067 1.427205e-05
## 15980    1 70067 1.427205e-05
## 15981    1 70067 1.427205e-05
## 15982    1 70067 1.427205e-05
## 15983    1 70067 1.427205e-05
## 15984    1 70067 1.427205e-05
## 15985    1 70067 1.427205e-05
## 15986    1 70067 1.427205e-05
## 15987    1 70067 1.427205e-05
## 15988    1 70067 1.427205e-05
## 15989    1 70067 1.427205e-05
## 15990    1 70067 1.427205e-05
## 15991    1 70067 1.427205e-05
## 15992    1 70067 1.427205e-05
## 15993    1 70067 1.427205e-05
## 15994    1 70067 1.427205e-05
## 15995    1 70067 1.427205e-05
## 15996    1 70067 1.427205e-05
## 15997    1 70067 1.427205e-05
## 15998    1 70067 1.427205e-05
## 15999    1 70067 1.427205e-05
## 16000    1 70067 1.427205e-05
## 16001    1 70067 1.427205e-05
## 16002    1 70067 1.427205e-05
## 16003    1 70067 1.427205e-05
## 16004    1 70067 1.427205e-05
## 16005    1 70067 1.427205e-05
## 16006    1 70067 1.427205e-05
## 16007    1 70067 1.427205e-05
## 16008    1 70067 1.427205e-05
## 16009    1 70067 1.427205e-05
## 16010    1 70067 1.427205e-05
## 16011    1 70067 1.427205e-05
## 16012    1 70067 1.427205e-05
## 16013    1 70067 1.427205e-05
## 16014    1 70067 1.427205e-05
## 16015    1 70067 1.427205e-05
## 16016    1 70067 1.427205e-05
## 16017    1 70067 1.427205e-05
## 16018    1 70067 1.427205e-05
## 16019    1 70067 1.427205e-05
## 16020    1 70067 1.427205e-05
## 16021    1 70067 1.427205e-05
## 16022    1 70067 1.427205e-05
## 16023    1 70067 1.427205e-05
## 16024    1 70067 1.427205e-05
## 16025    1 70067 1.427205e-05
## 16026    1 70067 1.427205e-05
## 16027    1 70067 1.427205e-05
## 16028    1 70067 1.427205e-05
## 16029    1 70067 1.427205e-05
## 16030    1 70067 1.427205e-05
## 16031    1 70067 1.427205e-05
## 16032    1 70067 1.427205e-05
## 16033    1 70067 1.427205e-05
## 16034    1 70067 1.427205e-05
## 16035    1 70067 1.427205e-05
## 16036    1 70067 1.427205e-05
## 16037    1 70067 1.427205e-05
## 16038    1 70067 1.427205e-05
## 16039    1 70067 1.427205e-05
## 16040    1 70067 1.427205e-05
## 16041    1 70067 1.427205e-05
## 16042    1 70067 1.427205e-05
## 16043    1 70067 1.427205e-05
## 16044    1 70067 1.427205e-05
## 16045    1 70067 1.427205e-05
## 16046    1 70067 1.427205e-05
## 16047    1 70067 1.427205e-05
## 16048    1 70067 1.427205e-05
## 16049    1 70067 1.427205e-05
## 16050    1 70067 1.427205e-05
## 16051    1 70067 1.427205e-05
## 16052    1 70067 1.427205e-05
## 16053    1 70067 1.427205e-05
## 16054    1 70067 1.427205e-05
## 16055    1 70067 1.427205e-05
## 16056    1 70067 1.427205e-05
## 16057    1 70067 1.427205e-05
## 16058    1 70067 1.427205e-05
## 16059    1 70067 1.427205e-05
## 16060    1 70067 1.427205e-05
## 16061    1 70067 1.427205e-05
## 16062    1 70067 1.427205e-05
## 16063    1 70067 1.427205e-05
## 16064    1 70067 1.427205e-05
## 16065    1 70067 1.427205e-05
## 16066    1 70067 1.427205e-05
## 16067    1 70067 1.427205e-05
## 16068    1 70067 1.427205e-05
## 16069    1 70067 1.427205e-05
## 16070    1 70067 1.427205e-05
## 16071    1 70067 1.427205e-05
## 16072    1 70067 1.427205e-05
## 16073    1 70067 1.427205e-05
## 16074    1 70067 1.427205e-05
## 16075    1 70067 1.427205e-05
## 16076    1 70067 1.427205e-05
## 16077    1 70067 1.427205e-05
## 16078    1 70067 1.427205e-05
## 16079    1 70067 1.427205e-05
## 16080    1 70067 1.427205e-05
## 16081    1 70067 1.427205e-05
## 16082    1 70067 1.427205e-05
## 16083    1 70067 1.427205e-05
## 16084    1 70067 1.427205e-05
## 16085    1 70067 1.427205e-05
## 16086    1 70067 1.427205e-05
## 16087    1 70067 1.427205e-05
## 16088    1 70067 1.427205e-05
## 16089    1 70067 1.427205e-05
## 16090    1 70067 1.427205e-05
## 16091    1 70067 1.427205e-05
## 16092    1 70067 1.427205e-05
## 16093    1 70067 1.427205e-05
## 16094    1 70067 1.427205e-05
## 16095    1 70067 1.427205e-05
## 16096    1 70067 1.427205e-05
## 16097    1 70067 1.427205e-05
## 16098    1 70067 1.427205e-05
## 16099    1 70067 1.427205e-05
## 16100    1 70067 1.427205e-05
## 16101    1 70067 1.427205e-05
## 16102    1 70067 1.427205e-05
## 16103    1 70067 1.427205e-05
## 16104    1 70067 1.427205e-05
## 16105    1 70067 1.427205e-05
## 16106    1 70067 1.427205e-05
## 16107    1 70067 1.427205e-05
## 16108    1 70067 1.427205e-05
## 16109    1 70067 1.427205e-05
## 16110    1 70067 1.427205e-05
## 16111    1 70067 1.427205e-05
## 16112    1 70067 1.427205e-05
## 16113    1 70067 1.427205e-05
## 16114    1 70067 1.427205e-05
## 16115    1 70067 1.427205e-05
## 16116    1 70067 1.427205e-05
## 16117    1 70067 1.427205e-05
## 16118    1 70067 1.427205e-05
## 16119    1 70067 1.427205e-05
## 16120    1 70067 1.427205e-05
## 16121    1 70067 1.427205e-05
## 16122    1 70067 1.427205e-05
## 16123    1 70067 1.427205e-05
## 16124    1 70067 1.427205e-05
## 16125    1 70067 1.427205e-05
## 16126    1 70067 1.427205e-05
## 16127    1 70067 1.427205e-05
## 16128    1 70067 1.427205e-05
## 16129    1 70067 1.427205e-05
## 16130    1 70067 1.427205e-05
## 16131    1 70067 1.427205e-05
## 16132    1 70067 1.427205e-05
## 16133    1 70067 1.427205e-05
## 16134    1 70067 1.427205e-05
## 16135    1 70067 1.427205e-05
## 16136    1 70067 1.427205e-05
## 16137    1 70067 1.427205e-05
## 16138    1 70067 1.427205e-05
## 16139    1 70067 1.427205e-05
## 16140    1 70067 1.427205e-05
## 16141    1 70067 1.427205e-05
## 16142    1 70067 1.427205e-05
## 16143    1 70067 1.427205e-05
## 16144    1 70067 1.427205e-05
## 16145    1 70067 1.427205e-05
## 16146    1 70067 1.427205e-05
## 16147    1 70067 1.427205e-05
## 16148    1 70067 1.427205e-05
## 16149    1 70067 1.427205e-05
## 16150    1 70067 1.427205e-05
## 16151    1 70067 1.427205e-05
## 16152    1 70067 1.427205e-05
## 16153    1 70067 1.427205e-05
## 16154    1 70067 1.427205e-05
## 16155    1 70067 1.427205e-05
## 16156    1 70067 1.427205e-05
## 16157    1 70067 1.427205e-05
## 16158    1 70067 1.427205e-05
## 16159    1 70067 1.427205e-05
## 16160    1 70067 1.427205e-05
## 16161    1 70067 1.427205e-05
## 16162    1 70067 1.427205e-05
## 16163    1 70067 1.427205e-05
## 16164    1 70067 1.427205e-05
## 16165    1 70067 1.427205e-05
## 16166    1 70067 1.427205e-05
## 16167    1 70067 1.427205e-05
## 16168    1 70067 1.427205e-05
## 16169    1 70067 1.427205e-05
## 16170    1 70067 1.427205e-05
## 16171    1 70067 1.427205e-05
## 16172    1 70067 1.427205e-05
## 16173    1 70067 1.427205e-05
## 16174    1 70067 1.427205e-05
## 16175    1 70067 1.427205e-05
## 16176    1 70067 1.427205e-05
## 16177    1 70067 1.427205e-05
## 16178    1 70067 1.427205e-05
## 16179    1 70067 1.427205e-05
## 16180    1 70067 1.427205e-05
## 16181    1 70067 1.427205e-05
## 16182    1 70067 1.427205e-05
## 16183    1 70067 1.427205e-05
## 16184    1 70067 1.427205e-05
## 16185    1 70067 1.427205e-05
## 16186    1 70067 1.427205e-05
## 16187    1 70067 1.427205e-05
## 16188    1 70067 1.427205e-05
## 16189    1 70067 1.427205e-05
## 16190    1 70067 1.427205e-05
## 16191    1 70067 1.427205e-05
## 16192    1 70067 1.427205e-05
## 16193    1 70067 1.427205e-05
## 16194    1 70067 1.427205e-05
## 16195    1 70067 1.427205e-05
## 16196    1 70067 1.427205e-05
## 16197    1 70067 1.427205e-05
## 16198    1 70067 1.427205e-05
## 16199    1 70067 1.427205e-05
## 16200    1 70067 1.427205e-05
## 16201    1 70067 1.427205e-05
## 16202    1 70067 1.427205e-05
## 16203    1 70067 1.427205e-05
## 16204    1 70067 1.427205e-05
## 16205    1 70067 1.427205e-05
## 16206    1 70067 1.427205e-05
## 16207    1 70067 1.427205e-05
## 16208    1 70067 1.427205e-05
## 16209    1 70067 1.427205e-05
## 16210    1 70067 1.427205e-05
## 16211    1 70067 1.427205e-05
## 16212    1 70067 1.427205e-05
## 16213    1 70067 1.427205e-05
## 16214    1 70067 1.427205e-05
## 16215    1 70067 1.427205e-05
## 16216    1 70067 1.427205e-05
## 16217    1 70067 1.427205e-05
## 16218    1 70067 1.427205e-05
## 16219    1 70067 1.427205e-05
## 16220    1 70067 1.427205e-05
## 16221    1 70067 1.427205e-05
## 16222    1 70067 1.427205e-05
## 16223    1 70067 1.427205e-05
## 16224    1 70067 1.427205e-05
## 16225    1 70067 1.427205e-05
## 16226    1 70067 1.427205e-05
## 16227    1 70067 1.427205e-05
## 16228    1 70067 1.427205e-05
## 16229    1 70067 1.427205e-05
## 16230    1 70067 1.427205e-05
## 16231    1 70067 1.427205e-05
## 16232    1 70067 1.427205e-05
## 16233    1 70067 1.427205e-05
## 16234    1 70067 1.427205e-05
## 16235    1 70067 1.427205e-05
## 16236    1 70067 1.427205e-05
## 16237    1 70067 1.427205e-05
## 16238    1 70067 1.427205e-05
## 16239    1 70067 1.427205e-05
## 16240    1 70067 1.427205e-05
## 16241    1 70067 1.427205e-05
## 16242    1 70067 1.427205e-05
## 16243    1 70067 1.427205e-05
## 16244    1 70067 1.427205e-05
## 16245    1 70067 1.427205e-05
## 16246    1 70067 1.427205e-05
## 16247    1 70067 1.427205e-05
## 16248    1 70067 1.427205e-05
## 16249    1 70067 1.427205e-05
## 16250    1 70067 1.427205e-05
## 16251    1 70067 1.427205e-05
## 16252    1 70067 1.427205e-05
## 16253    1 70067 1.427205e-05
## 16254    1 70067 1.427205e-05
## 16255    1 70067 1.427205e-05
## 16256    1 70067 1.427205e-05
## 16257    1 70067 1.427205e-05
## 16258    1 70067 1.427205e-05
## 16259    1 70067 1.427205e-05
## 16260    1 70067 1.427205e-05
## 16261    1 70067 1.427205e-05
## 16262    1 70067 1.427205e-05
## 16263    1 70067 1.427205e-05
## 16264    1 70067 1.427205e-05
## 16265    1 70067 1.427205e-05
## 16266    1 70067 1.427205e-05
## 16267    1 70067 1.427205e-05
## 16268    1 70067 1.427205e-05
## 16269    1 70067 1.427205e-05
## 16270    1 70067 1.427205e-05
## 16271    1 70067 1.427205e-05
## 16272    1 70067 1.427205e-05
## 16273    1 70067 1.427205e-05
## 16274    1 70067 1.427205e-05
## 16275    1 70067 1.427205e-05
## 16276    1 70067 1.427205e-05
## 16277    1 70067 1.427205e-05
## 16278    1 70067 1.427205e-05
## 16279    1 70067 1.427205e-05
## 16280    1 70067 1.427205e-05
## 16281    1 70067 1.427205e-05
## 16282    1 70067 1.427205e-05
## 16283    1 70067 1.427205e-05
## 16284    1 70067 1.427205e-05
## 16285    1 70067 1.427205e-05
## 16286    1 70067 1.427205e-05
## 16287    1 70067 1.427205e-05
## 16288    1 70067 1.427205e-05
## 16289    1 70067 1.427205e-05
## 16290    1 70067 1.427205e-05
## 16291    1 70067 1.427205e-05
## 16292    1 70067 1.427205e-05
## 16293    1 70067 1.427205e-05
## 16294    1 70067 1.427205e-05
## 16295    1 70067 1.427205e-05
## 16296    1 70067 1.427205e-05
## 16297    1 70067 1.427205e-05
## 16298    1 70067 1.427205e-05
## 16299    1 70067 1.427205e-05
## 16300    1 70067 1.427205e-05
## 16301    1 70067 1.427205e-05
## 16302    1 70067 1.427205e-05
## 16303    1 70067 1.427205e-05
## 16304    1 70067 1.427205e-05
## 16305    1 70067 1.427205e-05
## 16306    1 70067 1.427205e-05
## 16307    1 70067 1.427205e-05
## 16308    1 70067 1.427205e-05
## 16309    1 70067 1.427205e-05
## 16310    1 70067 1.427205e-05
## 16311    1 70067 1.427205e-05
## 16312    1 70067 1.427205e-05
## 16313    1 70067 1.427205e-05
## 16314    1 70067 1.427205e-05
## 16315    1 70067 1.427205e-05
## 16316    1 70067 1.427205e-05
## 16317    1 70067 1.427205e-05
## 16318    1 70067 1.427205e-05
## 16319    1 70067 1.427205e-05
## 16320    1 70067 1.427205e-05
## 16321    1 70067 1.427205e-05
## 16322    1 70067 1.427205e-05
## 16323    1 70067 1.427205e-05
## 16324    1 70067 1.427205e-05
## 16325    1 70067 1.427205e-05
## 16326    1 70067 1.427205e-05
## 16327    1 70067 1.427205e-05
## 16328    1 70067 1.427205e-05
## 16329    1 70067 1.427205e-05
## 16330    1 70067 1.427205e-05
## 16331    1 70067 1.427205e-05
## 16332    1 70067 1.427205e-05
## 16333    1 70067 1.427205e-05
## 16334    1 70067 1.427205e-05
## 16335    1 70067 1.427205e-05
## 16336    1 70067 1.427205e-05
## 16337    1 70067 1.427205e-05
## 16338    1 70067 1.427205e-05
## 16339    1 70067 1.427205e-05
## 16340    1 70067 1.427205e-05
## 16341    1 70067 1.427205e-05
## 16342    1 70067 1.427205e-05
## 16343    1 70067 1.427205e-05
## 16344    1 70067 1.427205e-05
## 16345    1 70067 1.427205e-05
## 16346    1 70067 1.427205e-05
## 16347    1 70067 1.427205e-05
## 16348    1 70067 1.427205e-05
## 16349    1 70067 1.427205e-05
## 16350    1 70067 1.427205e-05
## 16351    1 70067 1.427205e-05
## 16352    1 70067 1.427205e-05
## 16353    1 70067 1.427205e-05
## 16354    1 70067 1.427205e-05
## 16355    1 70067 1.427205e-05
## 16356    1 70067 1.427205e-05
## 16357    1 70067 1.427205e-05
## 16358    1 70067 1.427205e-05
## 16359    1 70067 1.427205e-05
## 16360    1 70067 1.427205e-05
## 16361    1 70067 1.427205e-05
## 16362    1 70067 1.427205e-05
## 16363    1 70067 1.427205e-05
## 16364    1 70067 1.427205e-05
## 16365    1 70067 1.427205e-05
## 16366    1 70067 1.427205e-05
## 16367    1 70067 1.427205e-05
## 16368    1 70067 1.427205e-05
## 16369    1 70067 1.427205e-05
## 16370    1 70067 1.427205e-05
## 16371    1 70067 1.427205e-05
## 16372    1 70067 1.427205e-05
## 16373    1 70067 1.427205e-05
## 16374    1 70067 1.427205e-05
## 16375    1 70067 1.427205e-05
## 16376    1 70067 1.427205e-05
## 16377    1 70067 1.427205e-05
## 16378    1 70067 1.427205e-05
## 16379    1 70067 1.427205e-05
## 16380    1 70067 1.427205e-05
## 16381    1 70067 1.427205e-05
## 16382    1 70067 1.427205e-05
## 16383    1 70067 1.427205e-05
## 16384    1 70067 1.427205e-05
## 16385    1 70067 1.427205e-05
## 16386    1 70067 1.427205e-05
## 16387    1 70067 1.427205e-05
## 16388    1 70067 1.427205e-05
## 16389    1 70067 1.427205e-05
## 16390    1 70067 1.427205e-05
## 16391    1 70067 1.427205e-05
## 16392    1 70067 1.427205e-05
## 16393    1 70067 1.427205e-05
## 16394    1 70067 1.427205e-05
## 16395    1 70067 1.427205e-05
## 16396    1 70067 1.427205e-05
## 16397    1 70067 1.427205e-05
## 16398    1 70067 1.427205e-05
## 16399    1 70067 1.427205e-05
## 16400    1 70067 1.427205e-05
## 16401    1 70067 1.427205e-05
## 16402    1 70067 1.427205e-05
## 16403    1 70067 1.427205e-05
## 16404    1 70067 1.427205e-05
## 16405    1 70067 1.427205e-05
## 16406    1 70067 1.427205e-05
## 16407    1 70067 1.427205e-05
## 16408    1 70067 1.427205e-05
## 16409    1 70067 1.427205e-05
## 16410    1 70067 1.427205e-05
## 16411    1 70067 1.427205e-05
## 16412    1 70067 1.427205e-05
## 16413    1 70067 1.427205e-05
## 16414    1 70067 1.427205e-05
## 16415    1 70067 1.427205e-05
## 16416    1 70067 1.427205e-05
## 16417    1 70067 1.427205e-05
## 16418    1 70067 1.427205e-05
## 16419    1 70067 1.427205e-05
## 16420    1 70067 1.427205e-05
## 16421    1 70067 1.427205e-05
## 16422    1 70067 1.427205e-05
## 16423    1 70067 1.427205e-05
## 16424    1 70067 1.427205e-05
## 16425    1 70067 1.427205e-05
## 16426    1 70067 1.427205e-05
## 16427    1 70067 1.427205e-05
## 16428    1 70067 1.427205e-05
## 16429    1 70067 1.427205e-05
## 16430    1 70067 1.427205e-05
## 16431    1 70067 1.427205e-05
## 16432    1 70067 1.427205e-05
## 16433    1 70067 1.427205e-05
## 16434    1 70067 1.427205e-05
## 16435    1 70067 1.427205e-05
## 16436    1 70067 1.427205e-05
## 16437    1 70067 1.427205e-05
## 16438    1 70067 1.427205e-05
## 16439    1 70067 1.427205e-05
## 16440    1 70067 1.427205e-05
## 16441    1 70067 1.427205e-05
## 16442    1 70067 1.427205e-05
## 16443    1 70067 1.427205e-05
## 16444    1 70067 1.427205e-05
## 16445    1 70067 1.427205e-05
## 16446    1 70067 1.427205e-05
## 16447    1 70067 1.427205e-05
## 16448    1 70067 1.427205e-05
## 16449    1 70067 1.427205e-05
## 16450    1 70067 1.427205e-05
## 16451    1 70067 1.427205e-05
## 16452    1 70067 1.427205e-05
## 16453    1 70067 1.427205e-05
## 16454    1 70067 1.427205e-05
## 16455    1 70067 1.427205e-05
## 16456    1 70067 1.427205e-05
## 16457    1 70067 1.427205e-05
## 16458    1 70067 1.427205e-05
## 16459    1 70067 1.427205e-05
## 16460    1 70067 1.427205e-05
## 16461    1 70067 1.427205e-05
## 16462    1 70067 1.427205e-05
## 16463    1 70067 1.427205e-05
## 16464    1 70067 1.427205e-05
## 16465    1 70067 1.427205e-05
## 16466    1 70067 1.427205e-05
## 16467    1 70067 1.427205e-05
## 16468    1 70067 1.427205e-05
## 16469    1 70067 1.427205e-05
## 16470    1 70067 1.427205e-05
## 16471    1 70067 1.427205e-05
## 16472    1 70067 1.427205e-05
## 16473    1 70067 1.427205e-05
## 16474    1 70067 1.427205e-05
## 16475    1 70067 1.427205e-05
## 16476    1 70067 1.427205e-05
## 16477    1 70067 1.427205e-05
## 16478    1 70067 1.427205e-05
## 16479    1 70067 1.427205e-05
## 16480    1 70067 1.427205e-05
## 16481    1 70067 1.427205e-05
## 16482    1 70067 1.427205e-05
## 16483    1 70067 1.427205e-05
## 16484    1 70067 1.427205e-05
## 16485    1 70067 1.427205e-05
## 16486    1 70067 1.427205e-05
## 16487    1 70067 1.427205e-05
## 16488    1 70067 1.427205e-05
## 16489    1 70067 1.427205e-05
## 16490    1 70067 1.427205e-05
## 16491    1 70067 1.427205e-05
## 16492    1 70067 1.427205e-05
## 16493    1 70067 1.427205e-05
## 16494    1 70067 1.427205e-05
## 16495    1 70067 1.427205e-05
## 16496    1 70067 1.427205e-05
## 16497    1 70067 1.427205e-05
## 16498    1 70067 1.427205e-05
## 16499    1 70067 1.427205e-05
## 16500    1 70067 1.427205e-05
## 16501    1 70067 1.427205e-05
## 16502    1 70067 1.427205e-05
## 16503    1 70067 1.427205e-05
## 16504    1 70067 1.427205e-05
## 16505    1 70067 1.427205e-05
## 16506    1 70067 1.427205e-05
## 16507    1 70067 1.427205e-05
## 16508    1 70067 1.427205e-05
## 16509    1 70067 1.427205e-05
## 16510    1 70067 1.427205e-05
## 16511    1 70067 1.427205e-05
## 16512    1 70067 1.427205e-05
## 16513    1 70067 1.427205e-05
## 16514    1 70067 1.427205e-05
## 16515    1 70067 1.427205e-05
## 16516    1 70067 1.427205e-05
## 16517    1 70067 1.427205e-05
## 16518    1 70067 1.427205e-05
## 16519    1 70067 1.427205e-05
## 16520    1 70067 1.427205e-05
## 16521    1 70067 1.427205e-05
## 16522    1 70067 1.427205e-05
## 16523    1 70067 1.427205e-05
## 16524    1 70067 1.427205e-05
## 16525    1 70067 1.427205e-05
## 16526    1 70067 1.427205e-05
## 16527    1 70067 1.427205e-05
## 16528    1 70067 1.427205e-05
## 16529    1 70067 1.427205e-05
## 16530    1 70067 1.427205e-05
## 16531    1 70067 1.427205e-05
## 16532    1 70067 1.427205e-05
## 16533    1 70067 1.427205e-05
## 16534    1 70067 1.427205e-05
## 16535    1 70067 1.427205e-05
## 16536    1 70067 1.427205e-05
## 16537    1 70067 1.427205e-05
## 16538    1 70067 1.427205e-05
## 16539    1 70067 1.427205e-05
## 16540    1 70067 1.427205e-05
## 16541    1 70067 1.427205e-05
## 16542    1 70067 1.427205e-05
## 16543    1 70067 1.427205e-05
## 16544    1 70067 1.427205e-05
## 16545    1 70067 1.427205e-05
## 16546    1 70067 1.427205e-05
## 16547    1 70067 1.427205e-05
## 16548    1 70067 1.427205e-05
## 16549    1 70067 1.427205e-05
## 16550    1 70067 1.427205e-05
## 16551    1 70067 1.427205e-05
## 16552    1 70067 1.427205e-05
## 16553    1 70067 1.427205e-05
## 16554    1 70067 1.427205e-05
## 16555    1 70067 1.427205e-05
## 16556    1 70067 1.427205e-05
## 16557    1 70067 1.427205e-05
## 16558    1 70067 1.427205e-05
## 16559    1 70067 1.427205e-05
## 16560    1 70067 1.427205e-05
## 16561    1 70067 1.427205e-05
## 16562    1 70067 1.427205e-05
## 16563    1 70067 1.427205e-05
## 16564    1 70067 1.427205e-05
## 16565    1 70067 1.427205e-05
## 16566    1 70067 1.427205e-05
## 16567    1 70067 1.427205e-05
## 16568    1 70067 1.427205e-05
## 16569    1 70067 1.427205e-05
## 16570    1 70067 1.427205e-05
## 16571    1 70067 1.427205e-05
## 16572    1 70067 1.427205e-05
## 16573    1 70067 1.427205e-05
## 16574    1 70067 1.427205e-05
## 16575    1 70067 1.427205e-05
## 16576    1 70067 1.427205e-05
## 16577    1 70067 1.427205e-05
## 16578    1 70067 1.427205e-05
## 16579    1 70067 1.427205e-05
## 16580    1 70067 1.427205e-05
## 16581    1 70067 1.427205e-05
## 16582    1 70067 1.427205e-05
## 16583    1 70067 1.427205e-05
## 16584    1 70067 1.427205e-05
## 16585    1 70067 1.427205e-05
## 16586    1 70067 1.427205e-05
## 16587    1 70067 1.427205e-05
## 16588    1 70067 1.427205e-05
## 16589    1 70067 1.427205e-05
## 16590    1 70067 1.427205e-05
## 16591    1 70067 1.427205e-05
## 16592    1 70067 1.427205e-05
## 16593    1 70067 1.427205e-05
## 16594    1 70067 1.427205e-05
## 16595    1 70067 1.427205e-05
## 16596    1 70067 1.427205e-05
## 16597    1 70067 1.427205e-05
## 16598    1 70067 1.427205e-05
## 16599    1 70067 1.427205e-05
## 16600    1 70067 1.427205e-05
## 16601    1 70067 1.427205e-05
## 16602    1 70067 1.427205e-05
## 16603    1 70067 1.427205e-05
## 16604    1 70067 1.427205e-05
## 16605    1 70067 1.427205e-05
## 16606    1 70067 1.427205e-05
## 16607    1 70067 1.427205e-05
## 16608    1 70067 1.427205e-05
## 16609    1 70067 1.427205e-05
## 16610    1 70067 1.427205e-05
## 16611    1 70067 1.427205e-05
## 16612    1 70067 1.427205e-05
## 16613    1 70067 1.427205e-05
## 16614    1 70067 1.427205e-05
## 16615    1 70067 1.427205e-05
## 16616    1 70067 1.427205e-05
## 16617    1 70067 1.427205e-05
## 16618    1 70067 1.427205e-05
## 16619    1 70067 1.427205e-05
## 16620    1 70067 1.427205e-05
## 16621    1 70067 1.427205e-05
## 16622    1 70067 1.427205e-05
## 16623    1 70067 1.427205e-05
## 16624    1 70067 1.427205e-05
## 16625    1 70067 1.427205e-05
## 16626    1 70067 1.427205e-05
## 16627    1 70067 1.427205e-05
## 16628    1 70067 1.427205e-05
## 16629    1 70067 1.427205e-05
## 16630    1 70067 1.427205e-05
## 16631    1 70067 1.427205e-05
## 16632    1 70067 1.427205e-05
## 16633    1 70067 1.427205e-05
## 16634    1 70067 1.427205e-05
## 16635    1 70067 1.427205e-05
## 16636    1 70067 1.427205e-05
## 16637    1 70067 1.427205e-05
## 16638    1 70067 1.427205e-05
## 16639    1 70067 1.427205e-05
## 16640    1 70067 1.427205e-05
## 16641    1 70067 1.427205e-05
## 16642    1 70067 1.427205e-05
## 16643    1 70067 1.427205e-05
## 16644    1 70067 1.427205e-05
## 16645    1 70067 1.427205e-05
## 16646    1 70067 1.427205e-05
## 16647    1 70067 1.427205e-05
## 16648    1 70067 1.427205e-05
## 16649    1 70067 1.427205e-05
## 16650    1 70067 1.427205e-05
## 16651    1 70067 1.427205e-05
## 16652    1 70067 1.427205e-05
## 16653    1 70067 1.427205e-05
## 16654    1 70067 1.427205e-05
## 16655    1 70067 1.427205e-05
## 16656    1 70067 1.427205e-05
## 16657    1 70067 1.427205e-05
## 16658    1 70067 1.427205e-05
## 16659    1 70067 1.427205e-05
## 16660    1 70067 1.427205e-05
## 16661    1 70067 1.427205e-05
## 16662    1 70067 1.427205e-05
## 16663    1 70067 1.427205e-05
## 16664    1 70067 1.427205e-05
## 16665    1 70067 1.427205e-05
## 16666    1 70067 1.427205e-05
## 16667    1 70067 1.427205e-05
## 16668    1 70067 1.427205e-05
## 16669    1 70067 1.427205e-05
## 16670    1 70067 1.427205e-05
## 16671    1 70067 1.427205e-05
## 16672    1 70067 1.427205e-05
## 16673    1 70067 1.427205e-05
## 16674    1 70067 1.427205e-05
## 16675    1 70067 1.427205e-05
## 16676    1 70067 1.427205e-05
## 16677    1 70067 1.427205e-05
## 16678    1 70067 1.427205e-05
## 16679    1 70067 1.427205e-05
## 16680    1 70067 1.427205e-05
## 16681    1 70067 1.427205e-05
## 16682    1 70067 1.427205e-05
## 16683    1 70067 1.427205e-05
## 16684    1 70067 1.427205e-05
## 16685    1 70067 1.427205e-05
## 16686    1 70067 1.427205e-05
## 16687    1 70067 1.427205e-05
## 16688    1 70067 1.427205e-05
## 16689    1 70067 1.427205e-05
## 16690    1 70067 1.427205e-05
## 16691    1 70067 1.427205e-05
## 16692    1 70067 1.427205e-05
## 16693    1 70067 1.427205e-05
## 16694    1 70067 1.427205e-05
## 16695    1 70067 1.427205e-05
## 16696    1 70067 1.427205e-05
## 16697    1 70067 1.427205e-05
## 16698    1 70067 1.427205e-05
## 16699    1 70067 1.427205e-05
## 16700    1 70067 1.427205e-05
## 16701    1 70067 1.427205e-05
## 16702    1 70067 1.427205e-05
## 16703    1 70067 1.427205e-05
## 16704    1 70067 1.427205e-05
## 16705    1 70067 1.427205e-05
## 16706    1 70067 1.427205e-05
## 16707    1 70067 1.427205e-05
## 16708    1 70067 1.427205e-05
## 16709    1 70067 1.427205e-05
## 16710    1 70067 1.427205e-05
## 16711    1 70067 1.427205e-05
## 16712    1 70067 1.427205e-05
## 16713    1 70067 1.427205e-05
## 16714    1 70067 1.427205e-05
## 16715    1 70067 1.427205e-05
## 16716    1 70067 1.427205e-05
## 16717    1 70067 1.427205e-05
## 16718    1 70067 1.427205e-05
## 16719    1 70067 1.427205e-05
## 16720    1 70067 1.427205e-05
## 16721    1 70067 1.427205e-05
## 16722    1 70067 1.427205e-05
## 16723    1 70067 1.427205e-05
## 16724    1 70067 1.427205e-05
## 16725    1 70067 1.427205e-05
## 16726    1 70067 1.427205e-05
## 16727    1 70067 1.427205e-05
## 16728    1 70067 1.427205e-05
## 16729    1 70067 1.427205e-05
## 16730    1 70067 1.427205e-05
## 16731    1 70067 1.427205e-05
## 16732    1 70067 1.427205e-05
## 16733    1 70067 1.427205e-05
## 16734    1 70067 1.427205e-05
## 16735    1 70067 1.427205e-05
## 16736    1 70067 1.427205e-05
## 16737    1 70067 1.427205e-05
## 16738    1 70067 1.427205e-05
## 16739    1 70067 1.427205e-05
## 16740    1 70067 1.427205e-05
## 16741    1 70067 1.427205e-05
## 16742    1 70067 1.427205e-05
## 16743    1 70067 1.427205e-05
## 16744    1 70067 1.427205e-05
## 16745    1 70067 1.427205e-05
## 16746    1 70067 1.427205e-05
## 16747    1 70067 1.427205e-05
## 16748    1 70067 1.427205e-05
## 16749    1 70067 1.427205e-05
## 16750    1 70067 1.427205e-05
## 16751    1 70067 1.427205e-05
## 16752    1 70067 1.427205e-05
## 16753    1 70067 1.427205e-05
## 16754    1 70067 1.427205e-05
## 16755    1 70067 1.427205e-05
## 16756    1 70067 1.427205e-05
## 16757    1 70067 1.427205e-05
## 16758    1 70067 1.427205e-05
## 16759    1 70067 1.427205e-05
## 16760    1 70067 1.427205e-05
## 16761    1 70067 1.427205e-05
## 16762    1 70067 1.427205e-05
## 16763    1 70067 1.427205e-05
## 16764    1 70067 1.427205e-05
## 16765    1 70067 1.427205e-05
## 16766    1 70067 1.427205e-05
## 16767    1 70067 1.427205e-05
## 16768    1 70067 1.427205e-05
## 16769    1 70067 1.427205e-05
## 16770    1 70067 1.427205e-05
## 16771    1 70067 1.427205e-05
## 16772    1 70067 1.427205e-05
## 16773    1 70067 1.427205e-05
## 16774    1 70067 1.427205e-05
## 16775    1 70067 1.427205e-05
## 16776    1 70067 1.427205e-05
## 16777    1 70067 1.427205e-05
## 16778    1 70067 1.427205e-05
## 16779    1 70067 1.427205e-05
## 16780    1 70067 1.427205e-05
## 16781    1 70067 1.427205e-05
## 16782    1 70067 1.427205e-05
## 16783    1 70067 1.427205e-05
## 16784    1 70067 1.427205e-05
## 16785    1 70067 1.427205e-05
## 16786    1 70067 1.427205e-05
## 16787    1 70067 1.427205e-05
## 16788    1 70067 1.427205e-05
## 16789    1 70067 1.427205e-05
## 16790    1 70067 1.427205e-05
## 16791    1 70067 1.427205e-05
## 16792    1 70067 1.427205e-05
## 16793    1 70067 1.427205e-05
## 16794    1 70067 1.427205e-05
## 16795    1 70067 1.427205e-05
## 16796    1 70067 1.427205e-05
## 16797    1 70067 1.427205e-05
## 16798    1 70067 1.427205e-05
## 16799    1 70067 1.427205e-05
## 16800    1 70067 1.427205e-05
## 16801    1 70067 1.427205e-05
## 16802    1 70067 1.427205e-05
## 16803    1 70067 1.427205e-05
## 16804    1 70067 1.427205e-05
## 16805    1 70067 1.427205e-05
## 16806    1 70067 1.427205e-05
## 16807    1 70067 1.427205e-05
## 16808    1 70067 1.427205e-05
## 16809    1 70067 1.427205e-05
## 16810    1 70067 1.427205e-05
## 16811    1 70067 1.427205e-05
## 16812    1 70067 1.427205e-05
## 16813    1 70067 1.427205e-05
## 16814    1 70067 1.427205e-05
## 16815    1 70067 1.427205e-05
## 16816    1 70067 1.427205e-05
## 16817    1 70067 1.427205e-05
## 16818    1 70067 1.427205e-05
## 16819    1 70067 1.427205e-05
## 16820    1 70067 1.427205e-05
## 16821    1 70067 1.427205e-05
## 16822    1 70067 1.427205e-05
## 16823    1 70067 1.427205e-05
## 16824    1 70067 1.427205e-05
## 16825    1 70067 1.427205e-05
## 16826    1 70067 1.427205e-05
## 16827    1 70067 1.427205e-05
## 16828    1 70067 1.427205e-05
## 16829    1 70067 1.427205e-05
## 16830    1 70067 1.427205e-05
## 16831    1 70067 1.427205e-05
## 16832    1 70067 1.427205e-05
## 16833    1 70067 1.427205e-05
## 16834    1 70067 1.427205e-05
## 16835    1 70067 1.427205e-05
## 16836    1 70067 1.427205e-05
## 16837    1 70067 1.427205e-05
## 16838    1 70067 1.427205e-05
## 16839    1 70067 1.427205e-05
## 16840    1 70067 1.427205e-05
## 16841    1 70067 1.427205e-05
## 16842    1 70067 1.427205e-05
## 16843    1 70067 1.427205e-05
## 16844    1 70067 1.427205e-05
## 16845    1 70067 1.427205e-05
## 16846    1 70067 1.427205e-05
## 16847    1 70067 1.427205e-05
## 16848    1 70067 1.427205e-05
## 16849    1 70067 1.427205e-05
## 16850    1 70067 1.427205e-05
## 16851    1 70067 1.427205e-05
## 16852    1 70067 1.427205e-05
## 16853    1 70067 1.427205e-05
## 16854    1 70067 1.427205e-05
## 16855    1 70067 1.427205e-05
## 16856    1 70067 1.427205e-05
## 16857    1 70067 1.427205e-05
## 16858    1 70067 1.427205e-05
## 16859    1 70067 1.427205e-05
## 16860    1 70067 1.427205e-05
## 16861    1 70067 1.427205e-05
## 16862    1 70067 1.427205e-05
## 16863    1 70067 1.427205e-05
## 16864    1 70067 1.427205e-05
## 16865    1 70067 1.427205e-05
## 16866    1 70067 1.427205e-05
## 16867    1 70067 1.427205e-05
## 16868    1 70067 1.427205e-05
## 16869    1 70067 1.427205e-05
## 16870    1 70067 1.427205e-05
## 16871    1 70067 1.427205e-05
## 16872    1 70067 1.427205e-05
## 16873    1 70067 1.427205e-05
## 16874    1 70067 1.427205e-05
## 16875    1 70067 1.427205e-05
## 16876    1 70067 1.427205e-05
## 16877    1 70067 1.427205e-05
## 16878    1 70067 1.427205e-05
## 16879    1 70067 1.427205e-05
## 16880    1 70067 1.427205e-05
## 16881    1 70067 1.427205e-05
## 16882    1 70067 1.427205e-05
## 16883    1 70067 1.427205e-05
## 16884    1 70067 1.427205e-05
## 16885    1 70067 1.427205e-05
## 16886    1 70067 1.427205e-05
## 16887    1 70067 1.427205e-05
## 16888    1 70067 1.427205e-05
## 16889    1 70067 1.427205e-05
## 16890    1 70067 1.427205e-05
## 16891    1 70067 1.427205e-05
## 16892    1 70067 1.427205e-05
## 16893    1 70067 1.427205e-05
## 16894    1 70067 1.427205e-05
## 16895    1 70067 1.427205e-05
## 16896    1 70067 1.427205e-05
## 16897    1 70067 1.427205e-05
## 16898    1 70067 1.427205e-05
## 16899    1 70067 1.427205e-05
## 16900    1 70067 1.427205e-05
## 16901    1 70067 1.427205e-05
## 16902    1 70067 1.427205e-05
## 16903    1 70067 1.427205e-05
## 16904    1 70067 1.427205e-05
## 16905    1 70067 1.427205e-05
## 16906    1 70067 1.427205e-05
## 16907    1 70067 1.427205e-05
## 16908    1 70067 1.427205e-05
## 16909    1 70067 1.427205e-05
## 16910    1 70067 1.427205e-05
## 16911    1 70067 1.427205e-05
## 16912    1 70067 1.427205e-05
## 16913    1 70067 1.427205e-05
## 16914    1 70067 1.427205e-05
## 16915    1 70067 1.427205e-05
## 16916    1 70067 1.427205e-05
## 16917    1 70067 1.427205e-05
## 16918    1 70067 1.427205e-05
## 16919    1 70067 1.427205e-05
## 16920    1 70067 1.427205e-05
## 16921    1 70067 1.427205e-05
## 16922    1 70067 1.427205e-05
## 16923    1 70067 1.427205e-05
## 16924    1 70067 1.427205e-05
## 16925    1 70067 1.427205e-05
## 16926    1 70067 1.427205e-05
## 16927    1 70067 1.427205e-05
## 16928    1 70067 1.427205e-05
## 16929    1 70067 1.427205e-05
## 16930    1 70067 1.427205e-05
## 16931    1 70067 1.427205e-05
## 16932    1 70067 1.427205e-05
## 16933    1 70067 1.427205e-05
## 16934    1 70067 1.427205e-05
## 16935    1 70067 1.427205e-05
## 16936    1 70067 1.427205e-05
## 16937    1 70067 1.427205e-05
## 16938    1 70067 1.427205e-05
## 16939    1 70067 1.427205e-05
## 16940    1 70067 1.427205e-05
## 16941    1 70067 1.427205e-05
## 16942    1 70067 1.427205e-05
## 16943    1 70067 1.427205e-05
## 16944    1 70067 1.427205e-05
## 16945    1 70067 1.427205e-05
## 16946    1 70067 1.427205e-05
## 16947    1 70067 1.427205e-05
## 16948    1 70067 1.427205e-05
## 16949    1 70067 1.427205e-05
## 16950    1 70067 1.427205e-05
## 16951    1 70067 1.427205e-05
## 16952    1 70067 1.427205e-05
## 16953    1 70067 1.427205e-05
## 16954    1 70067 1.427205e-05
## 16955    1 70067 1.427205e-05
## 16956    1 70067 1.427205e-05
## 16957    1 70067 1.427205e-05
## 16958    1 70067 1.427205e-05
## 16959    1 70067 1.427205e-05
## 16960    1 70067 1.427205e-05
## 16961    1 70067 1.427205e-05
## 16962    1 70067 1.427205e-05
## 16963    1 70067 1.427205e-05
## 16964    1 70067 1.427205e-05
## 16965    1 70067 1.427205e-05
## 16966    1 70067 1.427205e-05
## 16967    1 70067 1.427205e-05
## 16968    1 70067 1.427205e-05
## 16969    1 70067 1.427205e-05
## 16970    1 70067 1.427205e-05
## 16971    1 70067 1.427205e-05
## 16972    1 70067 1.427205e-05
## 16973    1 70067 1.427205e-05
## 16974    1 70067 1.427205e-05
## 16975    1 70067 1.427205e-05
## 16976    1 70067 1.427205e-05
## 16977    1 70067 1.427205e-05
## 16978    1 70067 1.427205e-05
## 16979    1 70067 1.427205e-05
## 16980    1 70067 1.427205e-05
## 16981    1 70067 1.427205e-05
## 16982    1 70067 1.427205e-05
## 16983    1 70067 1.427205e-05
## 16984    1 70067 1.427205e-05
## 16985    1 70067 1.427205e-05
## 16986    1 70067 1.427205e-05
## 16987    1 70067 1.427205e-05
## 16988    1 70067 1.427205e-05
## 16989    1 70067 1.427205e-05
## 16990    1 70067 1.427205e-05
## 16991    1 70067 1.427205e-05
## 16992    1 70067 1.427205e-05
## 16993    1 70067 1.427205e-05
## 16994    1 70067 1.427205e-05
## 16995    1 70067 1.427205e-05
## 16996    1 70067 1.427205e-05
## 16997    1 70067 1.427205e-05
## 16998    1 70067 1.427205e-05
## 16999    1 70067 1.427205e-05
## 17000    1 70067 1.427205e-05
## 17001    1 70067 1.427205e-05
## 17002    1 70067 1.427205e-05
## 17003    1 70067 1.427205e-05
## 17004    1 70067 1.427205e-05
## 17005    1 70067 1.427205e-05
## 17006    1 70067 1.427205e-05
## 17007    1 70067 1.427205e-05
## 17008    1 70067 1.427205e-05
## 17009    1 70067 1.427205e-05
## 17010    1 70067 1.427205e-05
## 17011    1 70067 1.427205e-05
## 17012    1 70067 1.427205e-05
## 17013    1 70067 1.427205e-05
## 17014    1 70067 1.427205e-05
## 17015    1 70067 1.427205e-05
## 17016    1 70067 1.427205e-05
## 17017    1 70067 1.427205e-05
## 17018    1 70067 1.427205e-05
## 17019    1 70067 1.427205e-05
## 17020    1 70067 1.427205e-05
## 17021    1 70067 1.427205e-05
## 17022    1 70067 1.427205e-05
## 17023    1 70067 1.427205e-05
## 17024    1 70067 1.427205e-05
## 17025    1 70067 1.427205e-05
## 17026    1 70067 1.427205e-05
## 17027    1 70067 1.427205e-05
## 17028    1 70067 1.427205e-05
## 17029    1 70067 1.427205e-05
## 17030    1 70067 1.427205e-05
## 17031    1 70067 1.427205e-05
## 17032    1 70067 1.427205e-05
## 17033    1 70067 1.427205e-05
## 17034    1 70067 1.427205e-05
## 17035    1 70067 1.427205e-05
## 17036    1 70067 1.427205e-05
## 17037    1 70067 1.427205e-05
## 17038    1 70067 1.427205e-05
## 17039    1 70067 1.427205e-05
## 17040    1 70067 1.427205e-05
## 17041    1 70067 1.427205e-05
## 17042    1 70067 1.427205e-05
## 17043    1 70067 1.427205e-05
## 17044    1 70067 1.427205e-05
## 17045    1 70067 1.427205e-05
## 17046    1 70067 1.427205e-05
## 17047    1 70067 1.427205e-05
## 17048    1 70067 1.427205e-05
## 17049    1 70067 1.427205e-05
## 17050    1 70067 1.427205e-05
## 17051    1 70067 1.427205e-05
## 17052    1 70067 1.427205e-05
## 17053    1 70067 1.427205e-05
## 17054    1 70067 1.427205e-05
## 17055    1 70067 1.427205e-05
## 17056    1 70067 1.427205e-05
## 17057    1 70067 1.427205e-05
## 17058    1 70067 1.427205e-05
## 17059    1 70067 1.427205e-05
## 17060    1 70067 1.427205e-05
## 17061    1 70067 1.427205e-05
## 17062    1 70067 1.427205e-05
## 17063    1 70067 1.427205e-05
## 17064    1 70067 1.427205e-05
## 17065    1 70067 1.427205e-05
## 17066    1 70067 1.427205e-05
## 17067    1 70067 1.427205e-05
## 17068    1 70067 1.427205e-05
## 17069    1 70067 1.427205e-05
## 17070    1 70067 1.427205e-05
## 17071    1 70067 1.427205e-05
## 17072    1 70067 1.427205e-05
## 17073    1 70067 1.427205e-05
## 17074    1 70067 1.427205e-05
## 17075    1 70067 1.427205e-05
## 17076    1 70067 1.427205e-05
## 17077    1 70067 1.427205e-05
## 17078    1 70067 1.427205e-05
## 17079    1 70067 1.427205e-05
## 17080    1 70067 1.427205e-05
## 17081    1 70067 1.427205e-05
## 17082    1 70067 1.427205e-05
## 17083    1 70067 1.427205e-05
## 17084    1 70067 1.427205e-05
## 17085    1 70067 1.427205e-05
## 17086    1 70067 1.427205e-05
## 17087    1 70067 1.427205e-05
## 17088    1 70067 1.427205e-05
## 17089    1 70067 1.427205e-05
## 17090    1 70067 1.427205e-05
## 17091    1 70067 1.427205e-05
## 17092    1 70067 1.427205e-05
## 17093    1 70067 1.427205e-05
## 17094    1 70067 1.427205e-05
## 17095    1 70067 1.427205e-05
## 17096    1 70067 1.427205e-05
## 17097    1 70067 1.427205e-05
## 17098    1 70067 1.427205e-05
## 17099    1 70067 1.427205e-05
## 17100    1 70067 1.427205e-05
## 17101    1 70067 1.427205e-05
## 17102    1 70067 1.427205e-05
## 17103    1 70067 1.427205e-05
## 17104    1 70067 1.427205e-05
## 17105    1 70067 1.427205e-05
## 17106    1 70067 1.427205e-05
## 17107    1 70067 1.427205e-05
## 17108    1 70067 1.427205e-05
## 17109    1 70067 1.427205e-05
## 17110    1 70067 1.427205e-05
## 17111    1 70067 1.427205e-05
## 17112    1 70067 1.427205e-05
## 17113    1 70067 1.427205e-05
## 17114    1 70067 1.427205e-05
## 17115    1 70067 1.427205e-05
## 17116    1 70067 1.427205e-05
## 17117    1 70067 1.427205e-05
## 17118    1 70067 1.427205e-05
## 17119    1 70067 1.427205e-05
## 17120    1 70067 1.427205e-05
## 17121    1 70067 1.427205e-05
## 17122    1 70067 1.427205e-05
## 17123    1 70067 1.427205e-05
## 17124    1 70067 1.427205e-05
## 17125    1 70067 1.427205e-05
## 17126    1 70067 1.427205e-05
## 17127    1 70067 1.427205e-05
## 17128    1 70067 1.427205e-05
## 17129    1 70067 1.427205e-05
## 17130    1 70067 1.427205e-05
## 17131    1 70067 1.427205e-05
## 17132    1 70067 1.427205e-05
## 17133    1 70067 1.427205e-05
## 17134    1 70067 1.427205e-05
## 17135    1 70067 1.427205e-05
## 17136    1 70067 1.427205e-05
## 17137    1 70067 1.427205e-05
## 17138    1 70067 1.427205e-05
## 17139    1 70067 1.427205e-05
## 17140    1 70067 1.427205e-05
## 17141    1 70067 1.427205e-05
## 17142    1 70067 1.427205e-05
## 17143    1 70067 1.427205e-05
## 17144    1 70067 1.427205e-05
## 17145    1 70067 1.427205e-05
## 17146    1 70067 1.427205e-05
## 17147    1 70067 1.427205e-05
## 17148    1 70067 1.427205e-05
## 17149    1 70067 1.427205e-05
## 17150    1 70067 1.427205e-05
## 17151    1 70067 1.427205e-05
## 17152    1 70067 1.427205e-05
## 17153    1 70067 1.427205e-05
## 17154    1 70067 1.427205e-05
## 17155    1 70067 1.427205e-05
## 17156    1 70067 1.427205e-05
## 17157    1 70067 1.427205e-05
## 17158    1 70067 1.427205e-05
## 17159    1 70067 1.427205e-05
## 17160    1 70067 1.427205e-05
## 17161    1 70067 1.427205e-05
## 17162    1 70067 1.427205e-05
## 17163    1 70067 1.427205e-05
## 17164    1 70067 1.427205e-05
## 17165    1 70067 1.427205e-05
## 17166    1 70067 1.427205e-05
## 17167    1 70067 1.427205e-05
## 17168    1 70067 1.427205e-05
## 17169    1 70067 1.427205e-05
## 17170    1 70067 1.427205e-05
## 17171    1 70067 1.427205e-05
## 17172    1 70067 1.427205e-05
## 17173    1 70067 1.427205e-05
## 17174    1 70067 1.427205e-05
## 17175    1 70067 1.427205e-05
## 17176    1 70067 1.427205e-05
## 17177    1 70067 1.427205e-05
## 17178    1 70067 1.427205e-05
## 17179    1 70067 1.427205e-05
## 17180    1 70067 1.427205e-05
## 17181    1 70067 1.427205e-05
## 17182    1 70067 1.427205e-05
## 17183    1 70067 1.427205e-05
## 17184    1 70067 1.427205e-05
## 17185    1 70067 1.427205e-05
## 17186    1 70067 1.427205e-05
## 17187    1 70067 1.427205e-05
## 17188    1 70067 1.427205e-05
## 17189    1 70067 1.427205e-05
## 17190    1 70067 1.427205e-05
## 17191    1 70067 1.427205e-05
## 17192    1 70067 1.427205e-05
## 17193    1 70067 1.427205e-05
## 17194    1 70067 1.427205e-05
## 17195    1 70067 1.427205e-05
## 17196    1 70067 1.427205e-05
## 17197    1 70067 1.427205e-05
## 17198    1 70067 1.427205e-05
## 17199    1 70067 1.427205e-05
## 17200    1 70067 1.427205e-05
## 17201    1 70067 1.427205e-05
## 17202    1 70067 1.427205e-05
## 17203    1 70067 1.427205e-05
## 17204    1 70067 1.427205e-05
## 17205    1 70067 1.427205e-05
## 17206    1 70067 1.427205e-05
## 17207    1 70067 1.427205e-05
## 17208    1 70067 1.427205e-05
## 17209    1 70067 1.427205e-05
## 17210    1 70067 1.427205e-05
## 17211    1 70067 1.427205e-05
## 17212    1 70067 1.427205e-05
## 17213    1 70067 1.427205e-05
## 17214    1 70067 1.427205e-05
## 17215    1 70067 1.427205e-05
## 17216    1 70067 1.427205e-05
## 17217    1 70067 1.427205e-05
## 17218    1 70067 1.427205e-05
## 17219    1 70067 1.427205e-05
## 17220    1 70067 1.427205e-05
## 17221    1 70067 1.427205e-05
## 17222    1 70067 1.427205e-05
## 17223    1 70067 1.427205e-05
## 17224    1 70067 1.427205e-05
## 17225    1 70067 1.427205e-05
## 17226    1 70067 1.427205e-05
## 17227    1 70067 1.427205e-05
## 17228    1 70067 1.427205e-05
## 17229    1 70067 1.427205e-05
## 17230    1 70067 1.427205e-05
## 17231    1 70067 1.427205e-05
## 17232    1 70067 1.427205e-05
## 17233    1 70067 1.427205e-05
## 17234    1 70067 1.427205e-05
## 17235    1 70067 1.427205e-05
## 17236    1 70067 1.427205e-05
## 17237    1 70067 1.427205e-05
## 17238    1 70067 1.427205e-05
## 17239    1 70067 1.427205e-05
## 17240    1 70067 1.427205e-05
## 17241    1 70067 1.427205e-05
## 17242    1 70067 1.427205e-05
## 17243    1 70067 1.427205e-05
## 17244    1 70067 1.427205e-05
## 17245    1 70067 1.427205e-05
## 17246    1 70067 1.427205e-05
## 17247    1 70067 1.427205e-05
## 17248    1 70067 1.427205e-05
## 17249    1 70067 1.427205e-05
## 17250    1 70067 1.427205e-05
## 17251    1 70067 1.427205e-05
## 17252    1 70067 1.427205e-05
## 17253    1 70067 1.427205e-05
## 17254    1 70067 1.427205e-05
## 17255    1 70067 1.427205e-05
## 17256    1 70067 1.427205e-05
## 17257    1 70067 1.427205e-05
## 17258    1 70067 1.427205e-05
## 17259    1 70067 1.427205e-05
## 17260    1 70067 1.427205e-05
## 17261    1 70067 1.427205e-05
## 17262    1 70067 1.427205e-05
## 17263    1 70067 1.427205e-05
## 17264    1 70067 1.427205e-05
## 17265    1 70067 1.427205e-05
## 17266    1 70067 1.427205e-05
## 17267    1 70067 1.427205e-05
## 17268    1 70067 1.427205e-05
## 17269    1 70067 1.427205e-05
## 17270    1 70067 1.427205e-05
## 17271    1 70067 1.427205e-05
## 17272    1 70067 1.427205e-05
## 17273    1 70067 1.427205e-05
## 17274    1 70067 1.427205e-05
## 17275    1 70067 1.427205e-05
## 17276    1 70067 1.427205e-05
## 17277    1 70067 1.427205e-05
## 17278    1 70067 1.427205e-05
## 17279    1 70067 1.427205e-05
## 17280    1 70067 1.427205e-05
## 17281    1 70067 1.427205e-05
## 17282    1 70067 1.427205e-05
## 17283    1 70067 1.427205e-05
## 17284    1 70067 1.427205e-05
## 17285    1 70067 1.427205e-05
## 17286    1 70067 1.427205e-05
## 17287    1 70067 1.427205e-05
## 17288    1 70067 1.427205e-05
## 17289    1 70067 1.427205e-05
## 17290    1 70067 1.427205e-05
## 17291    1 70067 1.427205e-05
## 17292    1 70067 1.427205e-05
## 17293    1 70067 1.427205e-05
## 17294    1 70067 1.427205e-05
## 17295    1 70067 1.427205e-05
## 17296    1 70067 1.427205e-05
## 17297    1 70067 1.427205e-05
## 17298    1 70067 1.427205e-05
## 17299    1 70067 1.427205e-05
## 17300    1 70067 1.427205e-05
## 17301    1 70067 1.427205e-05
## 17302    1 70067 1.427205e-05
## 17303    1 70067 1.427205e-05
## 17304    1 70067 1.427205e-05
## 17305    1 70067 1.427205e-05
## 17306    1 70067 1.427205e-05
## 17307    1 70067 1.427205e-05
## 17308    1 70067 1.427205e-05
## 17309    1 70067 1.427205e-05
## 17310    1 70067 1.427205e-05
## 17311    1 70067 1.427205e-05
## 17312    1 70067 1.427205e-05
## 17313    1 70067 1.427205e-05
## 17314    1 70067 1.427205e-05
## 17315    1 70067 1.427205e-05
## 17316    1 70067 1.427205e-05
## 17317    1 70067 1.427205e-05
## 17318    1 70067 1.427205e-05
## 17319    1 70067 1.427205e-05
## 17320    1 70067 1.427205e-05
## 17321    1 70067 1.427205e-05
## 17322    1 70067 1.427205e-05
## 17323    1 70067 1.427205e-05
## 17324    1 70067 1.427205e-05
## 17325    1 70067 1.427205e-05
## 17326    1 70067 1.427205e-05
## 17327    1 70067 1.427205e-05
## 17328    1 70067 1.427205e-05
## 17329    1 70067 1.427205e-05
## 17330    1 70067 1.427205e-05
## 17331    1 70067 1.427205e-05
## 17332    1 70067 1.427205e-05
## 17333    1 70067 1.427205e-05
## 17334    1 70067 1.427205e-05
## 17335    1 70067 1.427205e-05
## 17336    1 70067 1.427205e-05
## 17337    1 70067 1.427205e-05
## 17338    1 70067 1.427205e-05
## 17339    1 70067 1.427205e-05
## 17340    1 70067 1.427205e-05
## 17341    1 70067 1.427205e-05
## 17342    1 70067 1.427205e-05
## 17343    1 70067 1.427205e-05
## 17344    1 70067 1.427205e-05
## 17345    1 70067 1.427205e-05
## 17346    1 70067 1.427205e-05
## 17347    1 70067 1.427205e-05
## 17348    1 70067 1.427205e-05
## 17349    1 70067 1.427205e-05
## 17350    1 70067 1.427205e-05
## 17351    1 70067 1.427205e-05
## 17352    1 70067 1.427205e-05
## 17353    1 70067 1.427205e-05
## 17354    1 70067 1.427205e-05
## 17355    1 70067 1.427205e-05
## 17356    1 70067 1.427205e-05
## 17357    1 70067 1.427205e-05
## 17358    1 70067 1.427205e-05
## 17359    1 70067 1.427205e-05
## 17360    1 70067 1.427205e-05
## 17361    1 70067 1.427205e-05
## 17362    1 70067 1.427205e-05
## 17363    1 70067 1.427205e-05
## 17364    1 70067 1.427205e-05
## 17365    1 70067 1.427205e-05
## 17366    1 70067 1.427205e-05
## 17367    1 70067 1.427205e-05
## 17368    1 70067 1.427205e-05
## 17369    1 70067 1.427205e-05
## 17370    1 70067 1.427205e-05
## 17371    1 70067 1.427205e-05
## 17372    1 70067 1.427205e-05
## 17373    1 70067 1.427205e-05
## 17374    1 70067 1.427205e-05
## 17375    1 70067 1.427205e-05
## 17376    1 70067 1.427205e-05
## 17377    1 70067 1.427205e-05
## 17378    1 70067 1.427205e-05
## 17379    1 70067 1.427205e-05
## 17380    1 70067 1.427205e-05
## 17381    1 70067 1.427205e-05
## 17382    1 70067 1.427205e-05
## 17383    1 70067 1.427205e-05
## 17384    1 70067 1.427205e-05
## 17385    1 70067 1.427205e-05
## 17386    1 70067 1.427205e-05
## 17387    1 70067 1.427205e-05
## 17388    1 70067 1.427205e-05
## 17389    1 70067 1.427205e-05
## 17390    1 70067 1.427205e-05
## 17391    1 70067 1.427205e-05
## 17392    1 70067 1.427205e-05
## 17393    1 70067 1.427205e-05
## 17394    1 70067 1.427205e-05
## 17395    1 70067 1.427205e-05
## 17396    1 70067 1.427205e-05
## 17397    1 70067 1.427205e-05
## 17398    1 70067 1.427205e-05
## 17399    1 70067 1.427205e-05
## 17400    1 70067 1.427205e-05
## 17401    1 70067 1.427205e-05
## 17402    1 70067 1.427205e-05
## 17403    1 70067 1.427205e-05
## 17404    1 70067 1.427205e-05
## 17405    1 70067 1.427205e-05
## 17406    1 70067 1.427205e-05
## 17407    1 70067 1.427205e-05
## 17408    1 70067 1.427205e-05
## 17409    1 70067 1.427205e-05
## 17410    1 70067 1.427205e-05
## 17411    1 70067 1.427205e-05
## 17412    1 70067 1.427205e-05
## 17413    1 70067 1.427205e-05
## 17414    1 70067 1.427205e-05
## 17415    1 70067 1.427205e-05
## 17416    1 70067 1.427205e-05
## 17417    1 70067 1.427205e-05
## 17418    1 70067 1.427205e-05
## 17419    1 70067 1.427205e-05
## 17420    1 70067 1.427205e-05
## 17421    1 70067 1.427205e-05
## 17422    1 70067 1.427205e-05
## 17423    1 70067 1.427205e-05
## 17424    1 70067 1.427205e-05
## 17425    1 70067 1.427205e-05
## 17426    1 70067 1.427205e-05
## 17427    1 70067 1.427205e-05
## 17428    1 70067 1.427205e-05
## 17429    1 70067 1.427205e-05
## 17430    1 70067 1.427205e-05
## 17431    1 70067 1.427205e-05
## 17432    1 70067 1.427205e-05
## 17433    1 70067 1.427205e-05
## 17434    1 70067 1.427205e-05
## 17435    1 70067 1.427205e-05
## 17436    1 70067 1.427205e-05
## 17437    1 70067 1.427205e-05
## 17438    1 70067 1.427205e-05
## 17439    1 70067 1.427205e-05
## 17440    1 70067 1.427205e-05
## 17441    1 70067 1.427205e-05
## 17442    1 70067 1.427205e-05
## 17443    1 70067 1.427205e-05
## 17444    1 70067 1.427205e-05
## 17445    1 70067 1.427205e-05
## 17446    1 70067 1.427205e-05
## 17447    1 70067 1.427205e-05
## 17448    1 70067 1.427205e-05
## 17449    1 70067 1.427205e-05
## 17450    1 70067 1.427205e-05
## 17451    1 70067 1.427205e-05
## 17452    1 70067 1.427205e-05
## 17453    1 70067 1.427205e-05
## 17454    1 70067 1.427205e-05
## 17455    1 70067 1.427205e-05
## 17456    1 70067 1.427205e-05
## 17457    1 70067 1.427205e-05
## 17458    1 70067 1.427205e-05
## 17459    1 70067 1.427205e-05
## 17460    1 70067 1.427205e-05
## 17461    1 70067 1.427205e-05
## 17462    1 70067 1.427205e-05
## 17463    1 70067 1.427205e-05
## 17464    1 70067 1.427205e-05
## 17465    1 70067 1.427205e-05
## 17466    1 70067 1.427205e-05
## 17467    1 70067 1.427205e-05
## 17468    1 70067 1.427205e-05
## 17469    1 70067 1.427205e-05
## 17470    1 70067 1.427205e-05
## 17471    1 70067 1.427205e-05
## 17472    1 70067 1.427205e-05
## 17473    1 70067 1.427205e-05
## 17474    1 70067 1.427205e-05
## 17475    1 70067 1.427205e-05
## 17476    1 70067 1.427205e-05
## 17477    1 70067 1.427205e-05
## 17478    1 70067 1.427205e-05
## 17479    1 70067 1.427205e-05
## 17480    1 70067 1.427205e-05
## 17481    1 70067 1.427205e-05
## 17482    1 70067 1.427205e-05
## 17483    1 70067 1.427205e-05
## 17484    1 70067 1.427205e-05
## 17485    1 70067 1.427205e-05
## 17486    1 70067 1.427205e-05
## 17487    1 70067 1.427205e-05
## 17488    1 70067 1.427205e-05
## 17489    1 70067 1.427205e-05
## 17490    1 70067 1.427205e-05
## 17491    1 70067 1.427205e-05
## 17492    1 70067 1.427205e-05
## 17493    1 70067 1.427205e-05
## 17494    1 70067 1.427205e-05
## 17495    1 70067 1.427205e-05
## 17496    1 70067 1.427205e-05
## 17497    1 70067 1.427205e-05
## 17498    1 70067 1.427205e-05
## 17499    1 70067 1.427205e-05
## 17500    1 70067 1.427205e-05
## 17501    1 70067 1.427205e-05
## 17502    1 70067 1.427205e-05
## 17503    1 70067 1.427205e-05
## 17504    1 70067 1.427205e-05
## 17505    1 70067 1.427205e-05
## 17506    1 70067 1.427205e-05
## 17507    1 70067 1.427205e-05
## 17508    1 70067 1.427205e-05
## 17509    1 70067 1.427205e-05
## 17510    1 70067 1.427205e-05
## 17511    1 70067 1.427205e-05
## 17512    1 70067 1.427205e-05
## 17513    1 70067 1.427205e-05
## 17514    1 70067 1.427205e-05
## 17515    1 70067 1.427205e-05
## 17516    1 70067 1.427205e-05
## 17517    1 70067 1.427205e-05
## 17518    1 70067 1.427205e-05
## 17519    1 70067 1.427205e-05
## 17520    1 70067 1.427205e-05
## 17521    1 70067 1.427205e-05
## 17522    1 70067 1.427205e-05
## 17523    1 70067 1.427205e-05
## 17524    1 70067 1.427205e-05
## 17525    1 70067 1.427205e-05
## 17526    1 70067 1.427205e-05
## 17527    1 70067 1.427205e-05
## 17528    1 70067 1.427205e-05
## 17529    1 70067 1.427205e-05
## 17530    1 70067 1.427205e-05
## 17531    1 70067 1.427205e-05
## 17532    1 70067 1.427205e-05
## 17533    1 70067 1.427205e-05
## 17534    1 70067 1.427205e-05
## 17535    1 70067 1.427205e-05
## 17536    1 70067 1.427205e-05
## 17537    1 70067 1.427205e-05
## 17538    1 70067 1.427205e-05
## 17539    1 70067 1.427205e-05
## 17540    1 70067 1.427205e-05
## 17541    1 70067 1.427205e-05
## 17542    1 70067 1.427205e-05
## 17543    1 70067 1.427205e-05
## 17544    1 70067 1.427205e-05
## 17545    1 70067 1.427205e-05
## 17546    1 70067 1.427205e-05
## 17547    1 70067 1.427205e-05
## 17548    1 70067 1.427205e-05
## 17549    1 70067 1.427205e-05
## 17550    1 70067 1.427205e-05
## 17551    1 70067 1.427205e-05
## 17552    1 70067 1.427205e-05
## 17553    1 70067 1.427205e-05
## 17554    1 70067 1.427205e-05
## 17555    1 70067 1.427205e-05
## 17556    1 70067 1.427205e-05
## 17557    1 70067 1.427205e-05
## 17558    1 70067 1.427205e-05
## 17559    1 70067 1.427205e-05
## 17560    1 70067 1.427205e-05
## 17561    1 70067 1.427205e-05
## 17562    1 70067 1.427205e-05
## 17563    1 70067 1.427205e-05
## 17564    1 70067 1.427205e-05
## 17565    1 70067 1.427205e-05
## 17566    1 70067 1.427205e-05
## 17567    1 70067 1.427205e-05
## 17568    1 70067 1.427205e-05
## 17569    1 70067 1.427205e-05
## 17570    1 70067 1.427205e-05
## 17571    1 70067 1.427205e-05
## 17572    1 70067 1.427205e-05
## 17573    1 70067 1.427205e-05
## 17574    1 70067 1.427205e-05
## 17575    1 70067 1.427205e-05
## 17576    1 70067 1.427205e-05
## 17577    1 70067 1.427205e-05
## 17578    1 70067 1.427205e-05
## 17579    1 70067 1.427205e-05
## 17580    1 70067 1.427205e-05
## 17581    1 70067 1.427205e-05
## 17582    1 70067 1.427205e-05
## 17583    1 70067 1.427205e-05
## 17584    1 70067 1.427205e-05
## 17585    1 70067 1.427205e-05
## 17586    1 70067 1.427205e-05
## 17587    1 70067 1.427205e-05
## 17588    1 70067 1.427205e-05
## 17589    1 70067 1.427205e-05
## 17590    1 70067 1.427205e-05
## 17591    1 70067 1.427205e-05
## 17592    1 70067 1.427205e-05
## 17593    1 70067 1.427205e-05
## 17594    1 70067 1.427205e-05
## 17595    1 70067 1.427205e-05
## 17596    1 70067 1.427205e-05
## 17597    1 70067 1.427205e-05
## 17598    1 70067 1.427205e-05
## 17599    1 70067 1.427205e-05
## 17600    1 70067 1.427205e-05
## 17601    1 70067 1.427205e-05
## 17602    1 70067 1.427205e-05
## 17603    1 70067 1.427205e-05
## 17604    1 70067 1.427205e-05
## 17605    1 70067 1.427205e-05
## 17606    1 70067 1.427205e-05
## 17607    1 70067 1.427205e-05
## 17608    1 70067 1.427205e-05
## 17609    1 70067 1.427205e-05
## 17610    1 70067 1.427205e-05
## 17611    1 70067 1.427205e-05
## 17612    1 70067 1.427205e-05
## 17613    1 70067 1.427205e-05
## 17614    1 70067 1.427205e-05
## 17615    1 70067 1.427205e-05
## 17616    1 70067 1.427205e-05
## 17617    1 70067 1.427205e-05
## 17618    1 70067 1.427205e-05
## 17619    1 70067 1.427205e-05
## 17620    1 70067 1.427205e-05
## 17621    1 70067 1.427205e-05
## 17622    1 70067 1.427205e-05
## 17623    1 70067 1.427205e-05
## 17624    1 70067 1.427205e-05
## 17625    1 70067 1.427205e-05
## 17626    1 70067 1.427205e-05
## 17627    1 70067 1.427205e-05
## 17628    1 70067 1.427205e-05
## 17629    1 70067 1.427205e-05
## 17630    1 70067 1.427205e-05
## 17631    1 70067 1.427205e-05
## 17632    1 70067 1.427205e-05
## 17633    1 70067 1.427205e-05
## 17634    1 70067 1.427205e-05
## 17635    1 70067 1.427205e-05
## 17636    1 70067 1.427205e-05
## 17637    1 70067 1.427205e-05
## 17638    1 70067 1.427205e-05
## 17639    1 70067 1.427205e-05
## 17640    1 70067 1.427205e-05
## 17641    1 70067 1.427205e-05
## 17642    1 70067 1.427205e-05
## 17643    1 70067 1.427205e-05
## 17644    1 70067 1.427205e-05
## 17645    1 70067 1.427205e-05
## 17646    1 70067 1.427205e-05
## 17647    1 70067 1.427205e-05
## 17648    1 70067 1.427205e-05
## 17649    1 70067 1.427205e-05
## 17650    1 70067 1.427205e-05
## 17651    1 70067 1.427205e-05
## 17652    1 70067 1.427205e-05
## 17653    1 70067 1.427205e-05
## 17654    1 70067 1.427205e-05
## 17655    1 70067 1.427205e-05
## 17656    1 70067 1.427205e-05
## 17657    1 70067 1.427205e-05
## 17658    1 70067 1.427205e-05
## 17659    1 70067 1.427205e-05
## 17660    1 70067 1.427205e-05
## 17661    1 70067 1.427205e-05
## 17662    1 70067 1.427205e-05
## 17663    1 70067 1.427205e-05
## 17664    1 70067 1.427205e-05
## 17665    1 70067 1.427205e-05
## 17666    1 70067 1.427205e-05
## 17667    1 70067 1.427205e-05
## 17668    1 70067 1.427205e-05
## 17669    1 70067 1.427205e-05
## 17670    1 70067 1.427205e-05
## 17671    1 70067 1.427205e-05
## 17672    1 70067 1.427205e-05
## 17673    1 70067 1.427205e-05
## 17674    1 70067 1.427205e-05
## 17675    1 70067 1.427205e-05
## 17676    1 70067 1.427205e-05
## 17677    1 70067 1.427205e-05
## 17678    1 70067 1.427205e-05
## 17679    1 70067 1.427205e-05
## 17680    1 70067 1.427205e-05
## 17681    1 70067 1.427205e-05
## 17682    1 70067 1.427205e-05
## 17683    1 70067 1.427205e-05
## 17684    1 70067 1.427205e-05
## 17685    1 70067 1.427205e-05
## 17686    1 70067 1.427205e-05
## 17687    1 70067 1.427205e-05
## 17688    1 70067 1.427205e-05
## 17689    1 70067 1.427205e-05
## 17690    1 70067 1.427205e-05
## 17691    1 70067 1.427205e-05
## 17692    1 70067 1.427205e-05
## 17693    1 70067 1.427205e-05
## 17694    1 70067 1.427205e-05
## 17695    1 70067 1.427205e-05
## 17696    1 70067 1.427205e-05
## 17697    1 70067 1.427205e-05
## 17698    1 70067 1.427205e-05
## 17699    1 70067 1.427205e-05
## 17700    1 70067 1.427205e-05
## 17701    1 70067 1.427205e-05
## 17702    1 70067 1.427205e-05
## 17703    1 70067 1.427205e-05
## 17704    1 70067 1.427205e-05
## 17705    1 70067 1.427205e-05
## 17706    1 70067 1.427205e-05
## 17707    1 70067 1.427205e-05
## 17708    1 70067 1.427205e-05
## 17709    1 70067 1.427205e-05
## 17710    1 70067 1.427205e-05
## 17711    1 70067 1.427205e-05
## 17712    1 70067 1.427205e-05
## 17713    1 70067 1.427205e-05
## 17714    1 70067 1.427205e-05
## 17715    1 70067 1.427205e-05
## 17716    1 70067 1.427205e-05
## 17717    1 70067 1.427205e-05
## 17718    1 70067 1.427205e-05
## 17719    1 70067 1.427205e-05
## 17720    1 70067 1.427205e-05
## 17721    1 70067 1.427205e-05
## 17722    1 70067 1.427205e-05
## 17723    1 70067 1.427205e-05
## 17724    1 70067 1.427205e-05
## 17725    1 70067 1.427205e-05
## 17726    1 70067 1.427205e-05
## 17727    1 70067 1.427205e-05
## 17728    1 70067 1.427205e-05
## 17729    1 70067 1.427205e-05
## 17730    1 70067 1.427205e-05
## 17731    1 70067 1.427205e-05
## 17732    1 70067 1.427205e-05
## 17733    1 70067 1.427205e-05
## 17734    1 70067 1.427205e-05
## 17735    1 70067 1.427205e-05
## 17736    1 70067 1.427205e-05
## 17737    1 70067 1.427205e-05
## 17738    1 70067 1.427205e-05
## 17739    1 70067 1.427205e-05
## 17740    1 70067 1.427205e-05
## 17741    1 70067 1.427205e-05
## 17742    1 70067 1.427205e-05
## 17743    1 70067 1.427205e-05
## 17744    1 70067 1.427205e-05
## 17745    1 70067 1.427205e-05
## 17746    1 70067 1.427205e-05
## 17747    1 70067 1.427205e-05
## 17748    1 70067 1.427205e-05
## 17749    1 70067 1.427205e-05
## 17750    1 70067 1.427205e-05
## 17751    1 70067 1.427205e-05
## 17752    1 70067 1.427205e-05
## 17753    1 70067 1.427205e-05
## 17754    1 70067 1.427205e-05
## 17755    1 70067 1.427205e-05
## 17756    1 70067 1.427205e-05
## 17757    1 70067 1.427205e-05
## 17758    1 70067 1.427205e-05
## 17759    1 70067 1.427205e-05
## 17760    1 70067 1.427205e-05
## 17761    1 70067 1.427205e-05
## 17762    1 70067 1.427205e-05
## 17763    1 70067 1.427205e-05
## 17764    1 70067 1.427205e-05
## 17765    1 70067 1.427205e-05
## 17766    1 70067 1.427205e-05
## 17767    1 70067 1.427205e-05
## 17768    1 70067 1.427205e-05
## 17769    1 70067 1.427205e-05
## 17770    1 70067 1.427205e-05
## 17771    1 70067 1.427205e-05
## 17772    1 70067 1.427205e-05
## 17773    1 70067 1.427205e-05
## 17774    1 70067 1.427205e-05
## 17775    1 70067 1.427205e-05
## 17776    1 70067 1.427205e-05
## 17777    1 70067 1.427205e-05
## 17778    1 70067 1.427205e-05
## 17779    1 70067 1.427205e-05
## 17780    1 70067 1.427205e-05
## 17781    1 70067 1.427205e-05
## 17782    1 70067 1.427205e-05
## 17783    1 70067 1.427205e-05
## 17784    1 70067 1.427205e-05
## 17785    1 70067 1.427205e-05
## 17786    1 70067 1.427205e-05
## 17787    1 70067 1.427205e-05
## 17788    1 70067 1.427205e-05
## 17789    1 70067 1.427205e-05
## 17790    1 70067 1.427205e-05
## 17791    1 70067 1.427205e-05
## 17792    1 70067 1.427205e-05
## 17793    1 70067 1.427205e-05
## 17794    1 70067 1.427205e-05
## 17795    1 70067 1.427205e-05
## 17796    1 70067 1.427205e-05
## 17797    1 70067 1.427205e-05
## 17798    1 70067 1.427205e-05
## 17799    1 70067 1.427205e-05
## 17800    1 70067 1.427205e-05
## 17801    1 70067 1.427205e-05
## 17802    1 70067 1.427205e-05
## 17803    1 70067 1.427205e-05
## 17804    1 70067 1.427205e-05
## 17805    1 70067 1.427205e-05
## 17806    1 70067 1.427205e-05
## 17807    1 70067 1.427205e-05
## 17808    1 70067 1.427205e-05
## 17809    1 70067 1.427205e-05
## 17810    1 70067 1.427205e-05
## 17811    1 70067 1.427205e-05
## 17812    1 70067 1.427205e-05
## 17813    1 70067 1.427205e-05
## 17814    1 70067 1.427205e-05
## 17815    1 70067 1.427205e-05
## 17816    1 70067 1.427205e-05
## 17817    1 70067 1.427205e-05
## 17818    1 70067 1.427205e-05
## 17819    1 70067 1.427205e-05
## 17820    1 70067 1.427205e-05
## 17821    1 70067 1.427205e-05
## 17822    1 70067 1.427205e-05
## 17823    1 70067 1.427205e-05
## 17824    1 70067 1.427205e-05
## 17825    1 70067 1.427205e-05
## 17826    1 70067 1.427205e-05
## 17827    1 70067 1.427205e-05
## 17828    1 70067 1.427205e-05
## 17829    1 70067 1.427205e-05
## 17830    1 70067 1.427205e-05
## 17831    1 70067 1.427205e-05
## 17832    1 70067 1.427205e-05
## 17833    1 70067 1.427205e-05
## 17834    1 70067 1.427205e-05
## 17835    1 70067 1.427205e-05
## 17836    1 70067 1.427205e-05
## 17837    1 70067 1.427205e-05
## 17838    1 70067 1.427205e-05
## 17839    1 70067 1.427205e-05
## 17840    1 70067 1.427205e-05
## 17841    1 70067 1.427205e-05
## 17842    1 70067 1.427205e-05
## 17843    1 70067 1.427205e-05
## 17844    1 70067 1.427205e-05
## 17845    1 70067 1.427205e-05
## 17846    1 70067 1.427205e-05
## 17847    1 70067 1.427205e-05
## 17848    1 70067 1.427205e-05
## 17849    1 70067 1.427205e-05
## 17850    1 70067 1.427205e-05
## 17851    1 70067 1.427205e-05
## 17852    1 70067 1.427205e-05
## 17853    1 70067 1.427205e-05
## 17854    1 70067 1.427205e-05
## 17855    1 70067 1.427205e-05
## 17856    1 70067 1.427205e-05
## 17857    1 70067 1.427205e-05
## 17858    1 70067 1.427205e-05
## 17859    1 70067 1.427205e-05
## 17860    1 70067 1.427205e-05
## 17861    1 70067 1.427205e-05
## 17862    1 70067 1.427205e-05
## 17863    1 70067 1.427205e-05
## 17864    1 70067 1.427205e-05
## 17865    1 70067 1.427205e-05
## 17866    1 70067 1.427205e-05
## 17867    1 70067 1.427205e-05
## 17868    1 70067 1.427205e-05
## 17869    1 70067 1.427205e-05
## 17870    1 70067 1.427205e-05
## 17871    1 70067 1.427205e-05
## 17872    1 70067 1.427205e-05
## 17873    1 70067 1.427205e-05
## 17874    1 70067 1.427205e-05
## 17875    1 70067 1.427205e-05
## 17876    1 70067 1.427205e-05
## 17877    1 70067 1.427205e-05
## 17878    1 70067 1.427205e-05
## 17879    1 70067 1.427205e-05
## 17880    1 70067 1.427205e-05
## 17881    1 70067 1.427205e-05
## 17882    1 70067 1.427205e-05
## 17883    1 70067 1.427205e-05
## 17884    1 70067 1.427205e-05
## 17885    1 70067 1.427205e-05
## 17886    1 70067 1.427205e-05
## 17887    1 70067 1.427205e-05
## 17888    1 70067 1.427205e-05
## 17889    1 70067 1.427205e-05
## 17890    1 70067 1.427205e-05
## 17891    1 70067 1.427205e-05
## 17892    1 70067 1.427205e-05
## 17893    1 70067 1.427205e-05
## 17894    1 70067 1.427205e-05
## 17895    1 70067 1.427205e-05
## 17896    1 70067 1.427205e-05
## 17897    1 70067 1.427205e-05
## 17898    1 70067 1.427205e-05
## 17899    1 70067 1.427205e-05
## 17900    1 70067 1.427205e-05
## 17901    1 70067 1.427205e-05
## 17902    1 70067 1.427205e-05
## 17903    1 70067 1.427205e-05
## 17904    1 70067 1.427205e-05
## 17905    1 70067 1.427205e-05
## 17906    1 70067 1.427205e-05
## 17907    1 70067 1.427205e-05
## 17908    1 70067 1.427205e-05
## 17909    1 70067 1.427205e-05
## 17910    1 70067 1.427205e-05
## 17911    1 70067 1.427205e-05
## 17912    1 70067 1.427205e-05
## 17913    1 70067 1.427205e-05
## 17914    1 70067 1.427205e-05
## 17915    1 70067 1.427205e-05
## 17916    1 70067 1.427205e-05
## 17917    1 70067 1.427205e-05
## 17918    1 70067 1.427205e-05
## 17919    1 70067 1.427205e-05
## 17920    1 70067 1.427205e-05
## 17921    1 70067 1.427205e-05
## 17922    1 70067 1.427205e-05
## 17923    1 70067 1.427205e-05
## 17924    1 70067 1.427205e-05
## 17925    1 70067 1.427205e-05
## 17926    1 70067 1.427205e-05
## 17927    1 70067 1.427205e-05
## 17928    1 70067 1.427205e-05
## 17929    1 70067 1.427205e-05
## 17930    1 70067 1.427205e-05
## 17931    1 70067 1.427205e-05
## 17932    1 70067 1.427205e-05
## 17933    1 70067 1.427205e-05
## 17934    1 70067 1.427205e-05
## 17935    1 70067 1.427205e-05
## 17936    1 70067 1.427205e-05
## 17937    1 70067 1.427205e-05
## 17938    1 70067 1.427205e-05
## 17939    1 70067 1.427205e-05
## 17940    1 70067 1.427205e-05
## 17941    1 70067 1.427205e-05
## 17942    1 70067 1.427205e-05
## 17943    1 70067 1.427205e-05
## 17944    1 70067 1.427205e-05
## 17945    1 70067 1.427205e-05
## 17946    1 70067 1.427205e-05
## 17947    1 70067 1.427205e-05
## 17948    1 70067 1.427205e-05
## 17949    1 70067 1.427205e-05
## 17950    1 70067 1.427205e-05
## 17951    1 70067 1.427205e-05
## 17952    1 70067 1.427205e-05
## 17953    1 70067 1.427205e-05
## 17954    1 70067 1.427205e-05
## 17955    1 70067 1.427205e-05
## 17956    1 70067 1.427205e-05
## 17957    1 70067 1.427205e-05
## 17958    1 70067 1.427205e-05
## 17959    1 70067 1.427205e-05
## 17960    1 70067 1.427205e-05
## 17961    1 70067 1.427205e-05
## 17962    1 70067 1.427205e-05
## 17963    1 70067 1.427205e-05
## 17964    1 70067 1.427205e-05
## 17965    1 70067 1.427205e-05
## 17966    1 70067 1.427205e-05
## 17967    1 70067 1.427205e-05
## 17968    1 70067 1.427205e-05
## 17969    1 70067 1.427205e-05
## 17970    1 70067 1.427205e-05
## 17971    1 70067 1.427205e-05
## 17972    1 70067 1.427205e-05
## 17973    1 70067 1.427205e-05
## 17974    1 70067 1.427205e-05
## 17975    1 70067 1.427205e-05
## 17976    1 70067 1.427205e-05
## 17977    1 70067 1.427205e-05
## 17978    1 70067 1.427205e-05
## 17979    1 70067 1.427205e-05
## 17980    1 70067 1.427205e-05
## 17981    1 70067 1.427205e-05
## 17982    1 70067 1.427205e-05
## 17983    1 70067 1.427205e-05
## 17984    1 70067 1.427205e-05
## 17985    1 70067 1.427205e-05
## 17986    1 70067 1.427205e-05
## 17987    1 70067 1.427205e-05
## 17988    1 70067 1.427205e-05
## 17989    1 70067 1.427205e-05
## 17990    1 70067 1.427205e-05
## 17991    1 70067 1.427205e-05
## 17992    1 70067 1.427205e-05
## 17993    1 70067 1.427205e-05
## 17994    1 70067 1.427205e-05
## 17995    1 70067 1.427205e-05
## 17996    1 70067 1.427205e-05
## 17997    1 70067 1.427205e-05
## 17998    1 70067 1.427205e-05
## 17999    1 70067 1.427205e-05
## 18000    1 70067 1.427205e-05
## 18001    1 70067 1.427205e-05
## 18002    1 70067 1.427205e-05
## 18003    1 70067 1.427205e-05
## 18004    1 70067 1.427205e-05
## 18005    1 70067 1.427205e-05
## 18006    1 70067 1.427205e-05
## 18007    1 70067 1.427205e-05
## 18008    1 70067 1.427205e-05
## 18009    1 70067 1.427205e-05
## 18010    1 70067 1.427205e-05
## 18011    1 70067 1.427205e-05
## 18012    1 70067 1.427205e-05
## 18013    1 70067 1.427205e-05
## 18014    1 70067 1.427205e-05
## 18015    1 70067 1.427205e-05
## 18016    1 70067 1.427205e-05
## 18017    1 70067 1.427205e-05
## 18018    1 70067 1.427205e-05
## 18019    1 70067 1.427205e-05
## 18020    1 70067 1.427205e-05
## 18021    1 70067 1.427205e-05
## 18022    1 70067 1.427205e-05
## 18023    1 70067 1.427205e-05
## 18024    1 70067 1.427205e-05
## 18025    1 70067 1.427205e-05
## 18026    1 70067 1.427205e-05
## 18027    1 70067 1.427205e-05
## 18028    1 70067 1.427205e-05
## 18029    1 70067 1.427205e-05
## 18030    1 70067 1.427205e-05
## 18031    1 70067 1.427205e-05
## 18032    1 70067 1.427205e-05
## 18033    1 70067 1.427205e-05
## 18034    1 70067 1.427205e-05
## 18035    1 70067 1.427205e-05
## 18036    1 70067 1.427205e-05
## 18037    1 70067 1.427205e-05
## 18038    1 70067 1.427205e-05
## 18039    1 70067 1.427205e-05
## 18040    1 70067 1.427205e-05
## 18041    1 70067 1.427205e-05
## 18042    1 70067 1.427205e-05
## 18043    1 70067 1.427205e-05
## 18044    1 70067 1.427205e-05
## 18045    1 70067 1.427205e-05
## 18046    1 70067 1.427205e-05
## 18047    1 70067 1.427205e-05
## 18048    1 70067 1.427205e-05
## 18049    1 70067 1.427205e-05
## 18050    1 70067 1.427205e-05
## 18051    1 70067 1.427205e-05
## 18052    1 70067 1.427205e-05
## 18053    1 70067 1.427205e-05
## 18054    1 70067 1.427205e-05
## 18055    1 70067 1.427205e-05
## 18056    1 70067 1.427205e-05
## 18057    1 70067 1.427205e-05
## 18058    1 70067 1.427205e-05
## 18059    1 70067 1.427205e-05
## 18060    1 70067 1.427205e-05
## 18061    1 70067 1.427205e-05
## 18062    1 70067 1.427205e-05
## 18063    1 70067 1.427205e-05
## 18064    1 70067 1.427205e-05
## 18065    1 70067 1.427205e-05
## 18066    1 70067 1.427205e-05
## 18067    1 70067 1.427205e-05
## 18068    1 70067 1.427205e-05
## 18069    1 70067 1.427205e-05
## 18070    1 70067 1.427205e-05
## 18071    1 70067 1.427205e-05
## 18072    1 70067 1.427205e-05
## 18073    1 70067 1.427205e-05
## 18074    1 70067 1.427205e-05
## 18075    1 70067 1.427205e-05
## 18076    1 70067 1.427205e-05
## 18077    1 70067 1.427205e-05
## 18078    1 70067 1.427205e-05
## 18079    1 70067 1.427205e-05
## 18080    1 70067 1.427205e-05
## 18081    1 70067 1.427205e-05
## 18082    1 70067 1.427205e-05
## 18083    1 70067 1.427205e-05
## 18084    1 70067 1.427205e-05
## 18085    1 70067 1.427205e-05
## 18086    1 70067 1.427205e-05
## 18087    1 70067 1.427205e-05
## 18088    1 70067 1.427205e-05
## 18089    1 70067 1.427205e-05
## 18090    1 70067 1.427205e-05
## 18091    1 70067 1.427205e-05
## 18092    1 70067 1.427205e-05
## 18093    1 70067 1.427205e-05
## 18094    1 70067 1.427205e-05
## 18095    1 70067 1.427205e-05
## 18096    1 70067 1.427205e-05
## 18097    1 70067 1.427205e-05
## 18098    1 70067 1.427205e-05
## 18099    1 70067 1.427205e-05
## 18100    1 70067 1.427205e-05
## 18101    1 70067 1.427205e-05
## 18102    1 70067 1.427205e-05
## 18103    1 70067 1.427205e-05
## 18104    1 70067 1.427205e-05
## 18105    1 70067 1.427205e-05
## 18106    1 70067 1.427205e-05
## 18107    1 70067 1.427205e-05
## 18108    1 70067 1.427205e-05
## 18109    1 70067 1.427205e-05
## 18110    1 70067 1.427205e-05
## 18111    1 70067 1.427205e-05
## 18112    1 70067 1.427205e-05
## 18113    1 70067 1.427205e-05
## 18114    1 70067 1.427205e-05
## 18115    1 70067 1.427205e-05
## 18116    1 70067 1.427205e-05
## 18117    1 70067 1.427205e-05
## 18118    1 70067 1.427205e-05
## 18119    1 70067 1.427205e-05
## 18120    1 70067 1.427205e-05
## 18121    1 70067 1.427205e-05
## 18122    1 70067 1.427205e-05
## 18123    1 70067 1.427205e-05
## 18124    1 70067 1.427205e-05
## 18125    1 70067 1.427205e-05
## 18126    1 70067 1.427205e-05
## 18127    1 70067 1.427205e-05
## 18128    1 70067 1.427205e-05
## 18129    1 70067 1.427205e-05
## 18130    1 70067 1.427205e-05
## 18131    1 70067 1.427205e-05
## 18132    1 70067 1.427205e-05
## 18133    1 70067 1.427205e-05
## 18134    1 70067 1.427205e-05
## 18135    1 70067 1.427205e-05
## 18136    1 70067 1.427205e-05
## 18137    1 70067 1.427205e-05
## 18138    1 70067 1.427205e-05
## 18139    1 70067 1.427205e-05
## 18140    1 70067 1.427205e-05
## 18141    1 70067 1.427205e-05
## 18142    1 70067 1.427205e-05
## 18143    1 70067 1.427205e-05
## 18144    1 70067 1.427205e-05
## 18145    1 70067 1.427205e-05
## 18146    1 70067 1.427205e-05
## 18147    1 70067 1.427205e-05
## 18148    1 70067 1.427205e-05
## 18149    1 70067 1.427205e-05
## 18150    1 70067 1.427205e-05
## 18151    1 70067 1.427205e-05
## 18152    1 70067 1.427205e-05
## 18153    1 70067 1.427205e-05
## 18154    1 70067 1.427205e-05
## 18155    1 70067 1.427205e-05
## 18156    1 70067 1.427205e-05
## 18157    1 70067 1.427205e-05
## 18158    1 70067 1.427205e-05
## 18159    1 70067 1.427205e-05
## 18160    1 70067 1.427205e-05
## 18161    1 70067 1.427205e-05
## 18162    1 70067 1.427205e-05
## 18163    1 70067 1.427205e-05
## 18164    1 70067 1.427205e-05
## 18165    1 70067 1.427205e-05
## 18166    1 70067 1.427205e-05
## 18167    1 70067 1.427205e-05
## 18168    1 70067 1.427205e-05
## 18169    1 70067 1.427205e-05
## 18170    1 70067 1.427205e-05
## 18171    1 70067 1.427205e-05
## 18172    1 70067 1.427205e-05
## 18173    1 70067 1.427205e-05
## 18174    1 70067 1.427205e-05
## 18175    1 70067 1.427205e-05
## 18176    1 70067 1.427205e-05
## 18177    1 70067 1.427205e-05
## 18178    1 70067 1.427205e-05
## 18179    1 70067 1.427205e-05
## 18180    1 70067 1.427205e-05
## 18181    1 70067 1.427205e-05
## 18182    1 70067 1.427205e-05
## 18183    1 70067 1.427205e-05
## 18184    1 70067 1.427205e-05
## 18185    1 70067 1.427205e-05
## 18186    1 70067 1.427205e-05
## 18187    1 70067 1.427205e-05
## 18188    1 70067 1.427205e-05
## 18189    1 70067 1.427205e-05
## 18190    1 70067 1.427205e-05
## 18191    1 70067 1.427205e-05
## 18192    1 70067 1.427205e-05
## 18193    1 70067 1.427205e-05
## 18194    1 70067 1.427205e-05
## 18195    1 70067 1.427205e-05
## 18196    1 70067 1.427205e-05
## 18197    1 70067 1.427205e-05
## 18198    1 70067 1.427205e-05
## 18199    1 70067 1.427205e-05
## 18200    1 70067 1.427205e-05
## 18201    1 70067 1.427205e-05
## 18202    1 70067 1.427205e-05
## 18203    1 70067 1.427205e-05
## 18204    1 70067 1.427205e-05
## 18205    1 70067 1.427205e-05
## 18206    1 70067 1.427205e-05
## 18207    1 70067 1.427205e-05
## 18208    1 70067 1.427205e-05
## 18209    1 70067 1.427205e-05
## 18210    1 70067 1.427205e-05
## 18211    1 70067 1.427205e-05
## 18212    1 70067 1.427205e-05
## 18213    1 70067 1.427205e-05
## 18214    1 70067 1.427205e-05
## 18215    1 70067 1.427205e-05
## 18216    1 70067 1.427205e-05
## 18217    1 70067 1.427205e-05
## 18218    1 70067 1.427205e-05
## 18219    1 70067 1.427205e-05
## 18220    1 70067 1.427205e-05
## 18221    1 70067 1.427205e-05
## 18222    1 70067 1.427205e-05
## 18223    1 70067 1.427205e-05
## 18224    1 70067 1.427205e-05
## 18225    1 70067 1.427205e-05
## 18226    1 70067 1.427205e-05
## 18227    1 70067 1.427205e-05
## 18228    1 70067 1.427205e-05
## 18229    1 70067 1.427205e-05
## 18230    1 70067 1.427205e-05
## 18231    1 70067 1.427205e-05
## 18232    1 70067 1.427205e-05
## 18233    1 70067 1.427205e-05
## 18234    1 70067 1.427205e-05
## 18235    1 70067 1.427205e-05
## 18236    1 70067 1.427205e-05
## 18237    1 70067 1.427205e-05
## 18238    1 70067 1.427205e-05
## 18239    1 70067 1.427205e-05
## 18240    1 70067 1.427205e-05
## 18241    1 70067 1.427205e-05
## 18242    1 70067 1.427205e-05
## 18243    1 70067 1.427205e-05
## 18244    1 70067 1.427205e-05
## 18245    1 70067 1.427205e-05
## 18246    1 70067 1.427205e-05
## 18247    1 70067 1.427205e-05
## 18248    1 70067 1.427205e-05
## 18249    1 70067 1.427205e-05
## 18250    1 70067 1.427205e-05
## 18251    1 70067 1.427205e-05
## 18252    1 70067 1.427205e-05
## 18253    1 70067 1.427205e-05
## 18254    1 70067 1.427205e-05
## 18255    1 70067 1.427205e-05
## 18256    1 70067 1.427205e-05
## 18257    1 70067 1.427205e-05
## 18258    1 70067 1.427205e-05
## 18259    1 70067 1.427205e-05
## 18260    1 70067 1.427205e-05
## 18261    1 70067 1.427205e-05
## 18262    1 70067 1.427205e-05
## 18263    1 70067 1.427205e-05
## 18264    1 70067 1.427205e-05
## 18265    1 70067 1.427205e-05
## 18266    1 70067 1.427205e-05
## 18267    1 70067 1.427205e-05
## 18268    1 70067 1.427205e-05
## 18269    1 70067 1.427205e-05
## 18270    1 70067 1.427205e-05
## 18271    1 70067 1.427205e-05
## 18272    1 70067 1.427205e-05
## 18273    1 70067 1.427205e-05
## 18274    1 70067 1.427205e-05
## 18275    1 70067 1.427205e-05
## 18276    1 70067 1.427205e-05
## 18277    1 70067 1.427205e-05
## 18278    1 70067 1.427205e-05
## 18279    1 70067 1.427205e-05
## 18280    1 70067 1.427205e-05
## 18281    1 70067 1.427205e-05
## 18282    1 70067 1.427205e-05
## 18283    1 70067 1.427205e-05
## 18284    1 70067 1.427205e-05
## 18285    1 70067 1.427205e-05
## 18286    1 70067 1.427205e-05
## 18287    1 70067 1.427205e-05
## 18288    1 70067 1.427205e-05
## 18289    1 70067 1.427205e-05
## 18290    1 70067 1.427205e-05
## 18291    1 70067 1.427205e-05
## 18292    1 70067 1.427205e-05
## 18293    1 70067 1.427205e-05
## 18294    1 70067 1.427205e-05
## 18295    1 70067 1.427205e-05
## 18296    1 70067 1.427205e-05
## 18297    1 70067 1.427205e-05
## 18298    1 70067 1.427205e-05
## 18299    1 70067 1.427205e-05
## 18300    1 70067 1.427205e-05
## 18301    1 70067 1.427205e-05
## 18302    1 70067 1.427205e-05
## 18303    1 70067 1.427205e-05
## 18304    1 70067 1.427205e-05
## 18305    1 70067 1.427205e-05
## 18306    1 70067 1.427205e-05
## 18307    1 70067 1.427205e-05
## 18308    1 70067 1.427205e-05
## 18309    1 70067 1.427205e-05
## 18310    1 70067 1.427205e-05
## 18311    1 70067 1.427205e-05
## 18312    1 70067 1.427205e-05
## 18313    1 70067 1.427205e-05
## 18314    1 70067 1.427205e-05
## 18315    1 70067 1.427205e-05
## 18316    1 70067 1.427205e-05
## 18317    1 70067 1.427205e-05
## 18318    1 70067 1.427205e-05
## 18319    1 70067 1.427205e-05
## 18320    1 70067 1.427205e-05
## 18321    1 70067 1.427205e-05
## 18322    1 70067 1.427205e-05
## 18323    1 70067 1.427205e-05
## 18324    1 70067 1.427205e-05
## 18325    1 70067 1.427205e-05
## 18326    1 70067 1.427205e-05
## 18327    1 70067 1.427205e-05
## 18328    1 70067 1.427205e-05
## 18329    1 70067 1.427205e-05
## 18330    1 70067 1.427205e-05
## 18331    1 70067 1.427205e-05
## 18332    1 70067 1.427205e-05
## 18333    1 70067 1.427205e-05
## 18334    1 70067 1.427205e-05
## 18335    1 70067 1.427205e-05
## 18336    1 70067 1.427205e-05
## 18337    1 70067 1.427205e-05
## 18338    1 70067 1.427205e-05
## 18339    1 70067 1.427205e-05
## 18340    1 70067 1.427205e-05
## 18341    1 70067 1.427205e-05
## 18342    1 70067 1.427205e-05
## 18343    1 70067 1.427205e-05
## 18344    1 70067 1.427205e-05
## 18345    1 70067 1.427205e-05
## 18346    1 70067 1.427205e-05
## 18347    1 70067 1.427205e-05
## 18348    1 70067 1.427205e-05
## 18349    1 70067 1.427205e-05
## 18350    1 70067 1.427205e-05
## 18351    1 70067 1.427205e-05
## 18352    1 70067 1.427205e-05
## 18353    1 70067 1.427205e-05
## 18354    1 70067 1.427205e-05
## 18355    1 70067 1.427205e-05
## 18356    1 70067 1.427205e-05
## 18357    1 70067 1.427205e-05
## 18358    1 70067 1.427205e-05
## 18359    1 70067 1.427205e-05
## 18360    1 70067 1.427205e-05
## 18361    1 70067 1.427205e-05
## 18362    1 70067 1.427205e-05
## 18363    1 70067 1.427205e-05
## 18364    1 70067 1.427205e-05
## 18365    1 70067 1.427205e-05
## 18366    1 70067 1.427205e-05
## 18367    1 70067 1.427205e-05
## 18368    1 70067 1.427205e-05
## 18369    1 70067 1.427205e-05
## 18370    1 70067 1.427205e-05
## 18371    1 70067 1.427205e-05
## 18372    1 70067 1.427205e-05
## 18373    1 70067 1.427205e-05
## 18374    1 70067 1.427205e-05
## 18375    1 70067 1.427205e-05
## 18376    1 70067 1.427205e-05
## 18377    1 70067 1.427205e-05
## 18378    1 70067 1.427205e-05
## 18379    1 70067 1.427205e-05
## 18380    1 70067 1.427205e-05
## 18381    1 70067 1.427205e-05
## 18382    1 70067 1.427205e-05
## 18383    1 70067 1.427205e-05
## 18384    1 70067 1.427205e-05
## 18385    1 70067 1.427205e-05
## 18386    1 70067 1.427205e-05
## 18387    1 70067 1.427205e-05
## 18388    1 70067 1.427205e-05
## 18389    1 70067 1.427205e-05
## 18390    1 70067 1.427205e-05
## 18391    1 70067 1.427205e-05
## 18392    1 70067 1.427205e-05
## 18393    1 70067 1.427205e-05
## 18394    1 70067 1.427205e-05
## 18395    1 70067 1.427205e-05
## 18396    1 70067 1.427205e-05
## 18397    1 70067 1.427205e-05
## 18398    1 70067 1.427205e-05
## 18399    1 70067 1.427205e-05
## 18400    1 70067 1.427205e-05
## 18401    1 70067 1.427205e-05
## 18402    1 70067 1.427205e-05
## 18403    1 70067 1.427205e-05
## 18404    1 70067 1.427205e-05
## 18405    1 70067 1.427205e-05
## 18406    1 70067 1.427205e-05
## 18407    1 70067 1.427205e-05
## 18408    1 70067 1.427205e-05
## 18409    1 70067 1.427205e-05
## 18410    1 70067 1.427205e-05
## 18411    1 70067 1.427205e-05
## 18412    1 70067 1.427205e-05
## 18413    1 70067 1.427205e-05
## 18414    1 70067 1.427205e-05
## 18415    1 70067 1.427205e-05
## 18416    1 70067 1.427205e-05
## 18417    1 70067 1.427205e-05
## 18418    1 70067 1.427205e-05
## 18419    1 70067 1.427205e-05
## 18420    1 70067 1.427205e-05
## 18421    1 70067 1.427205e-05
## 18422    1 70067 1.427205e-05
## 18423    1 70067 1.427205e-05
## 18424    1 70067 1.427205e-05
## 18425    1 70067 1.427205e-05
## 18426    1 70067 1.427205e-05
## 18427    1 70067 1.427205e-05
## 18428    1 70067 1.427205e-05
## 18429    1 70067 1.427205e-05
## 18430    1 70067 1.427205e-05
## 18431    1 70067 1.427205e-05
## 18432    1 70067 1.427205e-05
## 18433    1 70067 1.427205e-05
## 18434    1 70067 1.427205e-05
## 18435    1 70067 1.427205e-05
## 18436    1 70067 1.427205e-05
## 18437    1 70067 1.427205e-05
## 18438    1 70067 1.427205e-05
## 18439    1 70067 1.427205e-05
## 18440    1 70067 1.427205e-05
## 18441    1 70067 1.427205e-05
## 18442    1 70067 1.427205e-05
## 18443    1 70067 1.427205e-05
## 18444    1 70067 1.427205e-05
## 18445    1 70067 1.427205e-05
## 18446    1 70067 1.427205e-05
## 18447    1 70067 1.427205e-05
## 18448    1 70067 1.427205e-05
## 18449    1 70067 1.427205e-05
## 18450    1 70067 1.427205e-05
## 18451    1 70067 1.427205e-05
## 18452    1 70067 1.427205e-05
## 18453    1 70067 1.427205e-05
## 18454    1 70067 1.427205e-05
## 18455    1 70067 1.427205e-05
## 18456    1 70067 1.427205e-05
## 18457    1 70067 1.427205e-05
## 18458    1 70067 1.427205e-05
## 18459    1 70067 1.427205e-05
## 18460    1 70067 1.427205e-05
## 18461    1 70067 1.427205e-05
## 18462    1 70067 1.427205e-05
## 18463    1 70067 1.427205e-05
## 18464    1 70067 1.427205e-05
## 18465    1 70067 1.427205e-05
## 18466    1 70067 1.427205e-05
## 18467    1 70067 1.427205e-05
## 18468    1 70067 1.427205e-05
## 18469    1 70067 1.427205e-05
## 18470    1 70067 1.427205e-05
## 18471    1 70067 1.427205e-05
## 18472    1 70067 1.427205e-05
## 18473    1 70067 1.427205e-05
## 18474    1 70067 1.427205e-05
## 18475    1 70067 1.427205e-05
## 18476    1 70067 1.427205e-05
## 18477    1 70067 1.427205e-05
## 18478    1 70067 1.427205e-05
## 18479    1 70067 1.427205e-05
## 18480    1 70067 1.427205e-05
## 18481    1 70067 1.427205e-05
## 18482    1 70067 1.427205e-05
## 18483    1 70067 1.427205e-05
## 18484    1 70067 1.427205e-05
## 18485    1 70067 1.427205e-05
## 18486    1 70067 1.427205e-05
## 18487    1 70067 1.427205e-05
## 18488    1 70067 1.427205e-05
## 18489    1 70067 1.427205e-05
## 18490    1 70067 1.427205e-05
## 18491    1 70067 1.427205e-05
## 18492    1 70067 1.427205e-05
## 18493    1 70067 1.427205e-05
## 18494    1 70067 1.427205e-05
## 18495    1 70067 1.427205e-05
## 18496    1 70067 1.427205e-05
## 18497    1 70067 1.427205e-05
## 18498    1 70067 1.427205e-05
## 18499    1 70067 1.427205e-05
## 18500    1 70067 1.427205e-05
## 18501    1 70067 1.427205e-05
## 18502    1 70067 1.427205e-05
## 18503    1 70067 1.427205e-05
## 18504    1 70067 1.427205e-05
## 18505    1 70067 1.427205e-05
## 18506    1 70067 1.427205e-05
## 18507    1 70067 1.427205e-05
## 18508    1 70067 1.427205e-05
## 18509    1 70067 1.427205e-05
## 18510    1 70067 1.427205e-05
## 18511    1 70067 1.427205e-05
## 18512    1 70067 1.427205e-05
## 18513    1 70067 1.427205e-05
## 18514    1 70067 1.427205e-05
## 18515    1 70067 1.427205e-05
## 18516    1 70067 1.427205e-05
## 18517    1 70067 1.427205e-05
## 18518    1 70067 1.427205e-05
## 18519    1 70067 1.427205e-05
## 18520    1 70067 1.427205e-05
## 18521    1 70067 1.427205e-05
## 18522    1 70067 1.427205e-05
## 18523    1 70067 1.427205e-05
## 18524    1 70067 1.427205e-05
## 18525    1 70067 1.427205e-05
## 18526    1 70067 1.427205e-05
## 18527    1 70067 1.427205e-05
## 18528    1 70067 1.427205e-05
## 18529    1 70067 1.427205e-05
## 18530    1 70067 1.427205e-05
## 18531    1 70067 1.427205e-05
## 18532    1 70067 1.427205e-05
## 18533    1 70067 1.427205e-05
## 18534    1 70067 1.427205e-05
## 18535    1 70067 1.427205e-05
## 18536    1 70067 1.427205e-05
## 18537    1 70067 1.427205e-05
## 18538    1 70067 1.427205e-05
## 18539    1 70067 1.427205e-05
## 18540    1 70067 1.427205e-05
## 18541    1 70067 1.427205e-05
## 18542    1 70067 1.427205e-05
## 18543    1 70067 1.427205e-05
## 18544    1 70067 1.427205e-05
## 18545    1 70067 1.427205e-05
## 18546    1 70067 1.427205e-05
## 18547    1 70067 1.427205e-05
## 18548    1 70067 1.427205e-05
## 18549    1 70067 1.427205e-05
## 18550    1 70067 1.427205e-05
## 18551    1 70067 1.427205e-05
## 18552    1 70067 1.427205e-05
## 18553    1 70067 1.427205e-05
## 18554    1 70067 1.427205e-05
## 18555    1 70067 1.427205e-05
## 18556    1 70067 1.427205e-05
## 18557    1 70067 1.427205e-05
## 18558    1 70067 1.427205e-05
## 18559    1 70067 1.427205e-05
## 18560    1 70067 1.427205e-05
## 18561    1 70067 1.427205e-05
## 18562    1 70067 1.427205e-05
## 18563    1 70067 1.427205e-05
## 18564    1 70067 1.427205e-05
## 18565    1 70067 1.427205e-05
## 18566    1 70067 1.427205e-05
## 18567    1 70067 1.427205e-05
## 18568    1 70067 1.427205e-05
## 18569    1 70067 1.427205e-05
## 18570    1 70067 1.427205e-05
## 18571    1 70067 1.427205e-05
## 18572    1 70067 1.427205e-05
## 18573    1 70067 1.427205e-05
## 18574    1 70067 1.427205e-05
## 18575    1 70067 1.427205e-05
## 18576    1 70067 1.427205e-05
## 18577    1 70067 1.427205e-05
## 18578    1 70067 1.427205e-05
## 18579    1 70067 1.427205e-05
## 18580    1 70067 1.427205e-05
## 18581    1 70067 1.427205e-05
## 18582    1 70067 1.427205e-05
## 18583    1 70067 1.427205e-05
## 18584    1 70067 1.427205e-05
## 18585    1 70067 1.427205e-05
## 18586    1 70067 1.427205e-05
## 18587    1 70067 1.427205e-05
## 18588    1 70067 1.427205e-05
## 18589    1 70067 1.427205e-05
## 18590    1 70067 1.427205e-05
## 18591    1 70067 1.427205e-05
## 18592    1 70067 1.427205e-05
## 18593    1 70067 1.427205e-05
## 18594    1 70067 1.427205e-05
## 18595    1 70067 1.427205e-05
## 18596    1 70067 1.427205e-05
## 18597    1 70067 1.427205e-05
## 18598    1 70067 1.427205e-05
## 18599    1 70067 1.427205e-05
## 18600    1 70067 1.427205e-05
## 18601    1 70067 1.427205e-05
## 18602    1 70067 1.427205e-05
## 18603    1 70067 1.427205e-05
## 18604    1 70067 1.427205e-05
## 18605    1 70067 1.427205e-05
## 18606    1 70067 1.427205e-05
## 18607    1 70067 1.427205e-05
## 18608    1 70067 1.427205e-05
## 18609    1 70067 1.427205e-05
## 18610    1 70067 1.427205e-05
## 18611    1 70067 1.427205e-05
## 18612    1 70067 1.427205e-05
## 18613    1 70067 1.427205e-05
## 18614    1 70067 1.427205e-05
## 18615    1 70067 1.427205e-05
## 18616    1 70067 1.427205e-05
## 18617    1 70067 1.427205e-05
## 18618    1 70067 1.427205e-05
## 18619    1 70067 1.427205e-05
## 18620    1 70067 1.427205e-05
## 18621    1 70067 1.427205e-05
## 18622    1 70067 1.427205e-05
## 18623    1 70067 1.427205e-05
## 18624    1 70067 1.427205e-05
## 18625    1 70067 1.427205e-05
## 18626    1 70067 1.427205e-05
## 18627    1 70067 1.427205e-05
## 18628    1 70067 1.427205e-05
## 18629    1 70067 1.427205e-05
## 18630    1 70067 1.427205e-05
## 18631    1 70067 1.427205e-05
## 18632    1 70067 1.427205e-05
## 18633    1 70067 1.427205e-05
## 18634    1 70067 1.427205e-05
## 18635    1 70067 1.427205e-05
## 18636    1 70067 1.427205e-05
## 18637    1 70067 1.427205e-05
## 18638    1 70067 1.427205e-05
## 18639    1 70067 1.427205e-05
## 18640    1 70067 1.427205e-05
## 18641    1 70067 1.427205e-05
## 18642    1 70067 1.427205e-05
## 18643    1 70067 1.427205e-05
## 18644    1 70067 1.427205e-05
## 18645    1 70067 1.427205e-05
## 18646    1 70067 1.427205e-05
## 18647    1 70067 1.427205e-05
## 18648    1 70067 1.427205e-05
## 18649    1 70067 1.427205e-05
## 18650    1 70067 1.427205e-05
## 18651    1 70067 1.427205e-05
## 18652    1 70067 1.427205e-05
## 18653    1 70067 1.427205e-05
## 18654    1 70067 1.427205e-05
## 18655    1 70067 1.427205e-05
## 18656    1 70067 1.427205e-05
## 18657    1 70067 1.427205e-05
## 18658    1 70067 1.427205e-05
## 18659    1 70067 1.427205e-05
## 18660    1 70067 1.427205e-05
## 18661    1 70067 1.427205e-05
## 18662    1 70067 1.427205e-05
## 18663    1 70067 1.427205e-05
## 18664    1 70067 1.427205e-05
## 18665    1 70067 1.427205e-05
## 18666    1 70067 1.427205e-05
## 18667    1 70067 1.427205e-05
## 18668    1 70067 1.427205e-05
## 18669    1 70067 1.427205e-05
## 18670    1 70067 1.427205e-05
## 18671    1 70067 1.427205e-05
## 18672    1 70067 1.427205e-05
## 18673    1 70067 1.427205e-05
## 18674    1 70067 1.427205e-05
## 18675    1 70067 1.427205e-05
## 18676    1 70067 1.427205e-05
## 18677    1 70067 1.427205e-05
## 18678    1 70067 1.427205e-05
## 18679    1 70067 1.427205e-05
## 18680    1 70067 1.427205e-05
## 18681    1 70067 1.427205e-05
## 18682    1 70067 1.427205e-05
## 18683    1 70067 1.427205e-05
## 18684    1 70067 1.427205e-05
## 18685    1 70067 1.427205e-05
## 18686    1 70067 1.427205e-05
## 18687    1 70067 1.427205e-05
## 18688    1 70067 1.427205e-05
## 18689    1 70067 1.427205e-05
## 18690    1 70067 1.427205e-05
## 18691    1 70067 1.427205e-05
## 18692    1 70067 1.427205e-05
## 18693    1 70067 1.427205e-05
## 18694    1 70067 1.427205e-05
## 18695    1 70067 1.427205e-05
## 18696    1 70067 1.427205e-05
## 18697    1 70067 1.427205e-05
## 18698    1 70067 1.427205e-05
## 18699    1 70067 1.427205e-05
## 18700    1 70067 1.427205e-05
## 18701    1 70067 1.427205e-05
## 18702    1 70067 1.427205e-05
## 18703    1 70067 1.427205e-05
## 18704    1 70067 1.427205e-05
## 18705    1 70067 1.427205e-05
## 18706    1 70067 1.427205e-05
## 18707    1 70067 1.427205e-05
## 18708    1 70067 1.427205e-05
## 18709    1 70067 1.427205e-05
## 18710    1 70067 1.427205e-05
## 18711    1 70067 1.427205e-05
## 18712    1 70067 1.427205e-05
## 18713    1 70067 1.427205e-05
## 18714    1 70067 1.427205e-05
## 18715    1 70067 1.427205e-05
## 18716    1 70067 1.427205e-05
## 18717    1 70067 1.427205e-05
## 18718    1 70067 1.427205e-05
## 18719    1 70067 1.427205e-05
## 18720    1 70067 1.427205e-05
## 18721    1 70067 1.427205e-05
## 18722    1 70067 1.427205e-05
## 18723    1 70067 1.427205e-05
## 18724    1 70067 1.427205e-05
## 18725    1 70067 1.427205e-05
## 18726    1 70067 1.427205e-05
## 18727    1 70067 1.427205e-05
## 18728    1 70067 1.427205e-05
## 18729    1 70067 1.427205e-05
## 18730    1 70067 1.427205e-05
## 18731    1 70067 1.427205e-05
## 18732    1 70067 1.427205e-05
## 18733    1 70067 1.427205e-05
## 18734    1 70067 1.427205e-05
## 18735    1 70067 1.427205e-05
## 18736    1 70067 1.427205e-05
## 18737    1 70067 1.427205e-05
## 18738    1 70067 1.427205e-05
## 18739    1 70067 1.427205e-05
## 18740    1 70067 1.427205e-05
## 18741    1 70067 1.427205e-05
## 18742    1 70067 1.427205e-05
## 18743    1 70067 1.427205e-05
## 18744    1 70067 1.427205e-05
## 18745    1 70067 1.427205e-05
## 18746    1 70067 1.427205e-05
## 18747    1 70067 1.427205e-05
## 18748    1 70067 1.427205e-05
## 18749    1 70067 1.427205e-05
## 18750    1 70067 1.427205e-05
## 18751    1 70067 1.427205e-05
## 18752    1 70067 1.427205e-05
## 18753    1 70067 1.427205e-05
## 18754    1 70067 1.427205e-05
## 18755    1 70067 1.427205e-05
## 18756    1 70067 1.427205e-05
## 18757    1 70067 1.427205e-05
## 18758    1 70067 1.427205e-05
## 18759    1 70067 1.427205e-05
## 18760    1 70067 1.427205e-05
## 18761    1 70067 1.427205e-05
## 18762    1 70067 1.427205e-05
## 18763    1 70067 1.427205e-05
## 18764    1 70067 1.427205e-05
## 18765    1 70067 1.427205e-05
## 18766    1 70067 1.427205e-05
## 18767    1 70067 1.427205e-05
## 18768    1 70067 1.427205e-05
## 18769    1 70067 1.427205e-05
## 18770    1 70067 1.427205e-05
## 18771    1 70067 1.427205e-05
## 18772    1 70067 1.427205e-05
## 18773    1 70067 1.427205e-05
## 18774    1 70067 1.427205e-05
## 18775    1 70067 1.427205e-05
## 18776    1 70067 1.427205e-05
## 18777    1 70067 1.427205e-05
## 18778    1 70067 1.427205e-05
## 18779    1 70067 1.427205e-05
## 18780    1 70067 1.427205e-05
## 18781    1 70067 1.427205e-05
## 18782    1 70067 1.427205e-05
## 18783    1 70067 1.427205e-05
## 18784    1 70067 1.427205e-05
## 18785    1 70067 1.427205e-05
## 18786    1 70067 1.427205e-05
## 18787    1 70067 1.427205e-05
## 18788    1 70067 1.427205e-05
## 18789    1 70067 1.427205e-05
## 18790    1 70067 1.427205e-05
## 18791    1 70067 1.427205e-05
## 18792    1 70067 1.427205e-05
## 18793    1 70067 1.427205e-05
## 18794    1 70067 1.427205e-05
## 18795    1 70067 1.427205e-05
## 18796    1 70067 1.427205e-05
## 18797    1 70067 1.427205e-05
## 18798    1 70067 1.427205e-05
## 18799    1 70067 1.427205e-05
## 18800    1 70067 1.427205e-05
## 18801    1 70067 1.427205e-05
## 18802    1 70067 1.427205e-05
## 18803    1 70067 1.427205e-05
## 18804    1 70067 1.427205e-05
## 18805    1 70067 1.427205e-05
## 18806    1 70067 1.427205e-05
## 18807    1 70067 1.427205e-05
## 18808    1 70067 1.427205e-05
## 18809    1 70067 1.427205e-05
## 18810    1 70067 1.427205e-05
## 18811    1 70067 1.427205e-05
## 18812    1 70067 1.427205e-05
## 18813    1 70067 1.427205e-05
## 18814    1 70067 1.427205e-05
## 18815    1 70067 1.427205e-05
## 18816    1 70067 1.427205e-05
## 18817    1 70067 1.427205e-05
## 18818    1 70067 1.427205e-05
## 18819    1 70067 1.427205e-05
## 18820    1 70067 1.427205e-05
## 18821    1 70067 1.427205e-05
## 18822    1 70067 1.427205e-05
## 18823    1 70067 1.427205e-05
## 18824    1 70067 1.427205e-05
## 18825    1 70067 1.427205e-05
## 18826    1 70067 1.427205e-05
## 18827    1 70067 1.427205e-05
## 18828    1 70067 1.427205e-05
## 18829    1 70067 1.427205e-05
## 18830    1 70067 1.427205e-05
## 18831    1 70067 1.427205e-05
## 18832    1 70067 1.427205e-05
## 18833    1 70067 1.427205e-05
## 18834    1 70067 1.427205e-05
## 18835    1 70067 1.427205e-05
## 18836    1 70067 1.427205e-05
## 18837    1 70067 1.427205e-05
## 18838    1 70067 1.427205e-05
## 18839    1 70067 1.427205e-05
## 18840    1 70067 1.427205e-05
## 18841    1 70067 1.427205e-05
## 18842    1 70067 1.427205e-05
## 18843    1 70067 1.427205e-05
## 18844    1 70067 1.427205e-05
## 18845    1 70067 1.427205e-05
## 18846    1 70067 1.427205e-05
## 18847    1 70067 1.427205e-05
## 18848    1 70067 1.427205e-05
## 18849    1 70067 1.427205e-05
## 18850    1 70067 1.427205e-05
## 18851    1 70067 1.427205e-05
## 18852    1 70067 1.427205e-05
## 18853    1 70067 1.427205e-05
## 18854    1 70067 1.427205e-05
## 18855    1 70067 1.427205e-05
## 18856    1 70067 1.427205e-05
## 18857    1 70067 1.427205e-05
## 18858    1 70067 1.427205e-05
## 18859    1 70067 1.427205e-05
## 18860    1 70067 1.427205e-05
## 18861    1 70067 1.427205e-05
## 18862    1 70067 1.427205e-05
## 18863    1 70067 1.427205e-05
## 18864    1 70067 1.427205e-05
## 18865    1 70067 1.427205e-05
## 18866    1 70067 1.427205e-05
## 18867    1 70067 1.427205e-05
## 18868    1 70067 1.427205e-05
## 18869    1 70067 1.427205e-05
## 18870    1 70067 1.427205e-05
## 18871    1 70067 1.427205e-05
## 18872    1 70067 1.427205e-05
## 18873    1 70067 1.427205e-05
## 18874    1 70067 1.427205e-05
## 18875    1 70067 1.427205e-05
## 18876    1 70067 1.427205e-05
## 18877    1 70067 1.427205e-05
## 18878    1 70067 1.427205e-05
## 18879    1 70067 1.427205e-05
## 18880    1 70067 1.427205e-05
## 18881    1 70067 1.427205e-05
## 18882    1 70067 1.427205e-05
## 18883    1 70067 1.427205e-05
## 18884    1 70067 1.427205e-05
## 18885    1 70067 1.427205e-05
## 18886    1 70067 1.427205e-05
## 18887    1 70067 1.427205e-05
## 18888    1 70067 1.427205e-05
## 18889    1 70067 1.427205e-05
## 18890    1 70067 1.427205e-05
## 18891    1 70067 1.427205e-05
## 18892    1 70067 1.427205e-05
## 18893    1 70067 1.427205e-05
## 18894    1 70067 1.427205e-05
## 18895    1 70067 1.427205e-05
## 18896    1 70067 1.427205e-05
## 18897    1 70067 1.427205e-05
## 18898    1 70067 1.427205e-05
## 18899    1 70067 1.427205e-05
## 18900    1 70067 1.427205e-05
## 18901    1 70067 1.427205e-05
## 18902    1 70067 1.427205e-05
## 18903    1 70067 1.427205e-05
## 18904    1 70067 1.427205e-05
## 18905    1 70067 1.427205e-05
## 18906    1 70067 1.427205e-05
## 18907    1 70067 1.427205e-05
## 18908    1 70067 1.427205e-05
## 18909    1 70067 1.427205e-05
## 18910    1 70067 1.427205e-05
## 18911    1 70067 1.427205e-05
## 18912    1 70067 1.427205e-05
## 18913    1 70067 1.427205e-05
## 18914    1 70067 1.427205e-05
## 18915    1 70067 1.427205e-05
## 18916    1 70067 1.427205e-05
## 18917    1 70067 1.427205e-05
## 18918    1 70067 1.427205e-05
## 18919    1 70067 1.427205e-05
## 18920    1 70067 1.427205e-05
## 18921    1 70067 1.427205e-05
## 18922    1 70067 1.427205e-05
## 18923    1 70067 1.427205e-05
## 18924    1 70067 1.427205e-05
## 18925    1 70067 1.427205e-05
## 18926    1 70067 1.427205e-05
## 18927    1 70067 1.427205e-05
## 18928    1 70067 1.427205e-05
## 18929    1 70067 1.427205e-05
## 18930    1 70067 1.427205e-05
## 18931    1 70067 1.427205e-05
## 18932    1 70067 1.427205e-05
## 18933    1 70067 1.427205e-05
## 18934    1 70067 1.427205e-05
## 18935    1 70067 1.427205e-05
## 18936    1 70067 1.427205e-05
## 18937    1 70067 1.427205e-05
## 18938    1 70067 1.427205e-05
## 18939    1 70067 1.427205e-05
## 18940    1 70067 1.427205e-05
## 18941    1 70067 1.427205e-05
## 18942    1 70067 1.427205e-05
## 18943    1 70067 1.427205e-05
## 18944    1 70067 1.427205e-05
## 18945    1 70067 1.427205e-05
## 18946    1 70067 1.427205e-05
## 18947    1 70067 1.427205e-05
## 18948    1 70067 1.427205e-05
## 18949    1 70067 1.427205e-05
## 18950    1 70067 1.427205e-05
## 18951    1 70067 1.427205e-05
## 18952    1 70067 1.427205e-05
## 18953    1 70067 1.427205e-05
## 18954    1 70067 1.427205e-05
## 18955    1 70067 1.427205e-05
## 18956    1 70067 1.427205e-05
## 18957    1 70067 1.427205e-05
## 18958    1 70067 1.427205e-05
## 18959    1 70067 1.427205e-05
## 18960    1 70067 1.427205e-05
## 18961    1 70067 1.427205e-05
## 18962    1 70067 1.427205e-05
## 18963    1 70067 1.427205e-05
## 18964    1 70067 1.427205e-05
## 18965    1 70067 1.427205e-05
## 18966    1 70067 1.427205e-05
## 18967    1 70067 1.427205e-05
## 18968    1 70067 1.427205e-05
## 18969    1 70067 1.427205e-05
## 18970    1 70067 1.427205e-05
## 18971    1 70067 1.427205e-05
## 18972    1 70067 1.427205e-05
## 18973    1 70067 1.427205e-05
## 18974    1 70067 1.427205e-05
## 18975    1 70067 1.427205e-05
## 18976    1 70067 1.427205e-05
## 18977    1 70067 1.427205e-05
## 18978    1 70067 1.427205e-05
## 18979    1 70067 1.427205e-05
## 18980    1 70067 1.427205e-05
## 18981    1 70067 1.427205e-05
## 18982    1 70067 1.427205e-05
## 18983    1 70067 1.427205e-05
## 18984    1 70067 1.427205e-05
## 18985    1 70067 1.427205e-05
## 18986    1 70067 1.427205e-05
## 18987    1 70067 1.427205e-05
## 18988    1 70067 1.427205e-05
## 18989    1 70067 1.427205e-05
## 18990    1 70067 1.427205e-05
## 18991    1 70067 1.427205e-05
## 18992    1 70067 1.427205e-05
## 18993    1 70067 1.427205e-05
## 18994    1 70067 1.427205e-05
## 18995    1 70067 1.427205e-05
## 18996    1 70067 1.427205e-05
## 18997    1 70067 1.427205e-05
## 18998    1 70067 1.427205e-05
## 18999    1 70067 1.427205e-05
## 19000    1 70067 1.427205e-05
## 19001    1 70067 1.427205e-05
## 19002    1 70067 1.427205e-05
## 19003    1 70067 1.427205e-05
## 19004    1 70067 1.427205e-05
## 19005    1 70067 1.427205e-05
## 19006    1 70067 1.427205e-05
## 19007    1 70067 1.427205e-05
## 19008    1 70067 1.427205e-05
## 19009    1 70067 1.427205e-05
## 19010    1 70067 1.427205e-05
## 19011    1 70067 1.427205e-05
## 19012    1 70067 1.427205e-05
## 19013    1 70067 1.427205e-05
## 19014    1 70067 1.427205e-05
## 19015    1 70067 1.427205e-05
## 19016    1 70067 1.427205e-05
## 19017    1 70067 1.427205e-05
## 19018    1 70067 1.427205e-05
## 19019    1 70067 1.427205e-05
## 19020    1 70067 1.427205e-05
## 19021    1 70067 1.427205e-05
## 19022    1 70067 1.427205e-05
## 19023    1 70067 1.427205e-05
## 19024    1 70067 1.427205e-05
## 19025    1 70067 1.427205e-05
## 19026    1 70067 1.427205e-05
## 19027    1 70067 1.427205e-05
## 19028    1 70067 1.427205e-05
## 19029    1 70067 1.427205e-05
## 19030    1 70067 1.427205e-05
## 19031    1 70067 1.427205e-05
## 19032    1 70067 1.427205e-05
## 19033    1 70067 1.427205e-05
## 19034    1 70067 1.427205e-05
## 19035    1 70067 1.427205e-05
## 19036    1 70067 1.427205e-05
## 19037    1 70067 1.427205e-05
## 19038    1 70067 1.427205e-05
## 19039    1 70067 1.427205e-05
## 19040    1 70067 1.427205e-05
## 19041    1 70067 1.427205e-05
## 19042    1 70067 1.427205e-05
## 19043    1 70067 1.427205e-05
## 19044    1 70067 1.427205e-05
## 19045    1 70067 1.427205e-05
## 19046    1 70067 1.427205e-05
## 19047    1 70067 1.427205e-05
## 19048    1 70067 1.427205e-05
## 19049    1 70067 1.427205e-05
## 19050    1 70067 1.427205e-05
## 19051    1 70067 1.427205e-05
## 19052    1 70067 1.427205e-05
## 19053    1 70067 1.427205e-05
## 19054    1 70067 1.427205e-05
## 19055    1 70067 1.427205e-05
## 19056    1 70067 1.427205e-05
## 19057    1 70067 1.427205e-05
## 19058    1 70067 1.427205e-05
## 19059    1 70067 1.427205e-05
## 19060    1 70067 1.427205e-05
## 19061    1 70067 1.427205e-05
## 19062    1 70067 1.427205e-05
## 19063    1 70067 1.427205e-05
## 19064    1 70067 1.427205e-05
## 19065    1 70067 1.427205e-05
## 19066    1 70067 1.427205e-05
## 19067    1 70067 1.427205e-05
## 19068    1 70067 1.427205e-05
## 19069    1 70067 1.427205e-05
## 19070    1 70067 1.427205e-05
## 19071    1 70067 1.427205e-05
## 19072    1 70067 1.427205e-05
## 19073    1 70067 1.427205e-05
## 19074    1 70067 1.427205e-05
## 19075    1 70067 1.427205e-05
## 19076    1 70067 1.427205e-05
## 19077    1 70067 1.427205e-05
## 19078    1 70067 1.427205e-05
## 19079    1 70067 1.427205e-05
## 19080    1 70067 1.427205e-05
## 19081    1 70067 1.427205e-05
## 19082    1 70067 1.427205e-05
## 19083    1 70067 1.427205e-05
## 19084    1 70067 1.427205e-05
## 19085    1 70067 1.427205e-05
## 19086    1 70067 1.427205e-05
## 19087    1 70067 1.427205e-05
## 19088    1 70067 1.427205e-05
## 19089    1 70067 1.427205e-05
## 19090    1 70067 1.427205e-05
## 19091    1 70067 1.427205e-05
## 19092    1 70067 1.427205e-05
## 19093    1 70067 1.427205e-05
## 19094    1 70067 1.427205e-05
## 19095    1 70067 1.427205e-05
## 19096    1 70067 1.427205e-05
## 19097    1 70067 1.427205e-05
## 19098    1 70067 1.427205e-05
## 19099    1 70067 1.427205e-05
## 19100    1 70067 1.427205e-05
## 19101    1 70067 1.427205e-05
## 19102    1 70067 1.427205e-05
## 19103    1 70067 1.427205e-05
## 19104    1 70067 1.427205e-05
## 19105    1 70067 1.427205e-05
## 19106    1 70067 1.427205e-05
## 19107    1 70067 1.427205e-05
## 19108    1 70067 1.427205e-05
## 19109    1 70067 1.427205e-05
## 19110    1 70067 1.427205e-05
## 19111    1 70067 1.427205e-05
## 19112    1 70067 1.427205e-05
## 19113    1 70067 1.427205e-05
## 19114    1 70067 1.427205e-05
## 19115    1 70067 1.427205e-05
## 19116    1 70067 1.427205e-05
## 19117    1 70067 1.427205e-05
## 19118    1 70067 1.427205e-05
## 19119    1 70067 1.427205e-05
## 19120    1 70067 1.427205e-05
## 19121    1 70067 1.427205e-05
## 19122    1 70067 1.427205e-05
## 19123    1 70067 1.427205e-05
## 19124    1 70067 1.427205e-05
## 19125    1 70067 1.427205e-05
## 19126    1 70067 1.427205e-05
## 19127    1 70067 1.427205e-05
## 19128    1 70067 1.427205e-05
## 19129    1 70067 1.427205e-05
## 19130    1 70067 1.427205e-05
## 19131    1 70067 1.427205e-05
## 19132    1 70067 1.427205e-05
## 19133    1 70067 1.427205e-05
## 19134    1 70067 1.427205e-05
## 19135    1 70067 1.427205e-05
## 19136    1 70067 1.427205e-05
## 19137    1 70067 1.427205e-05
## 19138    1 70067 1.427205e-05
## 19139    1 70067 1.427205e-05
## 19140    1 70067 1.427205e-05
## 19141    1 70067 1.427205e-05
## 19142    1 70067 1.427205e-05
## 19143    1 70067 1.427205e-05
## 19144    1 70067 1.427205e-05
## 19145    1 70067 1.427205e-05
## 19146    1 70067 1.427205e-05
## 19147    1 70067 1.427205e-05
## 19148    1 70067 1.427205e-05
## 19149    1 70067 1.427205e-05
## 19150    1 70067 1.427205e-05
## 19151    1 70067 1.427205e-05
## 19152    1 70067 1.427205e-05
## 19153    1 70067 1.427205e-05
## 19154    1 70067 1.427205e-05
## 19155    1 70067 1.427205e-05
## 19156    1 70067 1.427205e-05
## 19157    1 70067 1.427205e-05
## 19158    1 70067 1.427205e-05
## 19159    1 70067 1.427205e-05
## 19160    1 70067 1.427205e-05
## 19161    1 70067 1.427205e-05
## 19162    1 70067 1.427205e-05
## 19163    1 70067 1.427205e-05
## 19164    1 70067 1.427205e-05
## 19165    1 70067 1.427205e-05
## 19166    1 70067 1.427205e-05
## 19167    1 70067 1.427205e-05
## 19168    1 70067 1.427205e-05
## 19169    1 70067 1.427205e-05
## 19170    1 70067 1.427205e-05
## 19171    1 70067 1.427205e-05
## 19172    1 70067 1.427205e-05
## 19173    1 70067 1.427205e-05
## 19174    1 70067 1.427205e-05
## 19175    1 70067 1.427205e-05
## 19176    1 70067 1.427205e-05
## 19177    1 70067 1.427205e-05
## 19178    1 70067 1.427205e-05
## 19179    1 70067 1.427205e-05
## 19180    1 70067 1.427205e-05
## 19181    1 70067 1.427205e-05
## 19182    1 70067 1.427205e-05
## 19183    1 70067 1.427205e-05
## 19184    1 70067 1.427205e-05
## 19185    1 70067 1.427205e-05
## 19186    1 70067 1.427205e-05
## 19187    1 70067 1.427205e-05
## 19188    1 70067 1.427205e-05
## 19189    1 70067 1.427205e-05
## 19190    1 70067 1.427205e-05
## 19191    1 70067 1.427205e-05
## 19192    1 70067 1.427205e-05
## 19193    1 70067 1.427205e-05
## 19194    1 70067 1.427205e-05
## 19195    1 70067 1.427205e-05
## 19196    1 70067 1.427205e-05
## 19197    1 70067 1.427205e-05
## 19198    1 70067 1.427205e-05
## 19199    1 70067 1.427205e-05
## 19200    1 70067 1.427205e-05
## 19201    1 70067 1.427205e-05
## 19202    1 70067 1.427205e-05
## 19203    1 70067 1.427205e-05
## 19204    1 70067 1.427205e-05
## 19205    1 70067 1.427205e-05
## 19206    1 70067 1.427205e-05
## 19207    1 70067 1.427205e-05
## 19208    1 70067 1.427205e-05
## 19209    1 70067 1.427205e-05
## 19210    1 70067 1.427205e-05
## 19211    1 70067 1.427205e-05
## 19212    1 70067 1.427205e-05
## 19213    1 70067 1.427205e-05
## 19214    1 70067 1.427205e-05
## 19215    1 70067 1.427205e-05
## 19216    1 70067 1.427205e-05
## 19217    1 70067 1.427205e-05
## 19218    1 70067 1.427205e-05
## 19219    1 70067 1.427205e-05
## 19220    1 70067 1.427205e-05
## 19221    1 70067 1.427205e-05
## 19222    1 70067 1.427205e-05
## 19223    1 70067 1.427205e-05
## 19224    1 70067 1.427205e-05
## 19225    1 70067 1.427205e-05
## 19226    1 70067 1.427205e-05
## 19227    1 70067 1.427205e-05
## 19228    1 70067 1.427205e-05
## 19229    1 70067 1.427205e-05
## 19230    1 70067 1.427205e-05
## 19231    1 70067 1.427205e-05
## 19232    1 70067 1.427205e-05
## 19233    1 70067 1.427205e-05
## 19234    1 70067 1.427205e-05
## 19235    1 70067 1.427205e-05
## 19236    1 70067 1.427205e-05
## 19237    1 70067 1.427205e-05
## 19238    1 70067 1.427205e-05
## 19239    1 70067 1.427205e-05
## 19240    1 70067 1.427205e-05
## 19241    1 70067 1.427205e-05
## 19242    1 70067 1.427205e-05
## 19243    1 70067 1.427205e-05
## 19244    1 70067 1.427205e-05
## 19245    1 70067 1.427205e-05
## 19246    1 70067 1.427205e-05
## 19247    1 70067 1.427205e-05
## 19248    1 70067 1.427205e-05
## 19249    1 70067 1.427205e-05
## 19250    1 70067 1.427205e-05
## 19251    1 70067 1.427205e-05
## 19252    1 70067 1.427205e-05
## 19253    1 70067 1.427205e-05
## 19254    1 70067 1.427205e-05
## 19255    1 70067 1.427205e-05
## 19256    1 70067 1.427205e-05
## 19257    1 70067 1.427205e-05
## 19258    1 70067 1.427205e-05
## 19259    1 70067 1.427205e-05
## 19260    1 70067 1.427205e-05
## 19261    1 70067 1.427205e-05
## 19262    1 70067 1.427205e-05
## 19263    1 70067 1.427205e-05
## 19264    1 70067 1.427205e-05
## 19265    1 70067 1.427205e-05
## 19266    1 70067 1.427205e-05
## 19267    1 70067 1.427205e-05
## 19268    1 70067 1.427205e-05
## 19269    1 70067 1.427205e-05
## 19270    1 70067 1.427205e-05
## 19271    1 70067 1.427205e-05
## 19272    1 70067 1.427205e-05
## 19273    1 70067 1.427205e-05
## 19274    1 70067 1.427205e-05
## 19275    1 70067 1.427205e-05
## 19276    1 70067 1.427205e-05
## 19277    1 70067 1.427205e-05
## 19278    1 70067 1.427205e-05
## 19279    1 70067 1.427205e-05
## 19280    1 70067 1.427205e-05
## 19281    1 70067 1.427205e-05
## 19282    1 70067 1.427205e-05
## 19283    1 70067 1.427205e-05
## 19284    1 70067 1.427205e-05
## 19285    1 70067 1.427205e-05
## 19286    1 70067 1.427205e-05
## 19287    1 70067 1.427205e-05
## 19288    1 70067 1.427205e-05
## 19289    1 70067 1.427205e-05
## 19290    1 70067 1.427205e-05
## 19291    1 70067 1.427205e-05
## 19292    1 70067 1.427205e-05
## 19293    1 70067 1.427205e-05
## 19294    1 70067 1.427205e-05
## 19295    1 70067 1.427205e-05
## 19296    1 70067 1.427205e-05
## 19297    1 70067 1.427205e-05
## 19298    1 70067 1.427205e-05
## 19299    1 70067 1.427205e-05
## 19300    1 70067 1.427205e-05
## 19301    1 70067 1.427205e-05
## 19302    1 70067 1.427205e-05
## 19303    1 70067 1.427205e-05
## 19304    1 70067 1.427205e-05
## 19305    1 70067 1.427205e-05
## 19306    1 70067 1.427205e-05
## 19307    1 70067 1.427205e-05
## 19308    1 70067 1.427205e-05
## 19309    1 70067 1.427205e-05
## 19310    1 70067 1.427205e-05
## 19311    1 70067 1.427205e-05
## 19312    1 70067 1.427205e-05
## 19313    1 70067 1.427205e-05
## 19314    1 70067 1.427205e-05
## 19315    1 70067 1.427205e-05
## 19316    1 70067 1.427205e-05
## 19317    1 70067 1.427205e-05
## 19318    1 70067 1.427205e-05
## 19319    1 70067 1.427205e-05
## 19320    1 70067 1.427205e-05
## 19321    1 70067 1.427205e-05
## 19322    1 70067 1.427205e-05
## 19323    1 70067 1.427205e-05
## 19324    1 70067 1.427205e-05
## 19325    1 70067 1.427205e-05
## 19326    1 70067 1.427205e-05
## 19327    1 70067 1.427205e-05
## 19328    1 70067 1.427205e-05
## 19329    1 70067 1.427205e-05
## 19330    1 70067 1.427205e-05
## 19331    1 70067 1.427205e-05
## 19332    1 70067 1.427205e-05
## 19333    1 70067 1.427205e-05
## 19334    1 70067 1.427205e-05
## 19335    1 70067 1.427205e-05
## 19336    1 70067 1.427205e-05
## 19337    1 70067 1.427205e-05
## 19338    1 70067 1.427205e-05
## 19339    1 70067 1.427205e-05
## 19340    1 70067 1.427205e-05
## 19341    1 70067 1.427205e-05
## 19342    1 70067 1.427205e-05
## 19343    1 70067 1.427205e-05
## 19344    1 70067 1.427205e-05
## 19345    1 70067 1.427205e-05
## 19346    1 70067 1.427205e-05
## 19347    1 70067 1.427205e-05
## 19348    1 70067 1.427205e-05
## 19349    1 70067 1.427205e-05
## 19350    1 70067 1.427205e-05
## 19351    1 70067 1.427205e-05
## 19352    1 70067 1.427205e-05
## 19353    1 70067 1.427205e-05
## 19354    1 70067 1.427205e-05
## 19355    1 70067 1.427205e-05
## 19356    1 70067 1.427205e-05
## 19357    1 70067 1.427205e-05
## 19358    1 70067 1.427205e-05
## 19359    1 70067 1.427205e-05
## 19360    1 70067 1.427205e-05
## 19361    1 70067 1.427205e-05
## 19362    1 70067 1.427205e-05
## 19363    1 70067 1.427205e-05
## 19364    1 70067 1.427205e-05
## 19365    1 70067 1.427205e-05
## 19366    1 70067 1.427205e-05
## 19367    1 70067 1.427205e-05
## 19368    1 70067 1.427205e-05
## 19369    1 70067 1.427205e-05
## 19370    1 70067 1.427205e-05
## 19371    1 70067 1.427205e-05
## 19372    1 70067 1.427205e-05
## 19373    1 70067 1.427205e-05
## 19374    1 70067 1.427205e-05
## 19375    1 70067 1.427205e-05
## 19376    1 70067 1.427205e-05
## 19377    1 70067 1.427205e-05
## 19378    1 70067 1.427205e-05
## 19379    1 70067 1.427205e-05
## 19380    1 70067 1.427205e-05
## 19381    1 70067 1.427205e-05
## 19382    1 70067 1.427205e-05
## 19383    1 70067 1.427205e-05
## 19384    1 70067 1.427205e-05
## 19385    1 70067 1.427205e-05
## 19386    1 70067 1.427205e-05
## 19387    1 70067 1.427205e-05
## 19388    1 70067 1.427205e-05
## 19389    1 70067 1.427205e-05
## 19390    1 70067 1.427205e-05
## 19391    1 70067 1.427205e-05
## 19392    1 70067 1.427205e-05
## 19393    1 70067 1.427205e-05
## 19394    1 70067 1.427205e-05
## 19395    1 70067 1.427205e-05
## 19396    1 70067 1.427205e-05
## 19397    1 70067 1.427205e-05
## 19398    1 70067 1.427205e-05
## 19399    1 70067 1.427205e-05
## 19400    1 70067 1.427205e-05
## 19401    1 70067 1.427205e-05
## 19402    1 70067 1.427205e-05
## 19403    1 70067 1.427205e-05
## 19404    1 70067 1.427205e-05
## 19405    1 70067 1.427205e-05
## 19406    1 70067 1.427205e-05
## 19407    1 70067 1.427205e-05
## 19408    1 70067 1.427205e-05
## 19409    1 70067 1.427205e-05
## 19410    1 70067 1.427205e-05
## 19411    1 70067 1.427205e-05
## 19412    1 70067 1.427205e-05
## 19413    1 70067 1.427205e-05
## 19414    1 70067 1.427205e-05
## 19415    1 70067 1.427205e-05
## 19416    1 70067 1.427205e-05
## 19417    1 70067 1.427205e-05
## 19418    1 70067 1.427205e-05
## 19419    1 70067 1.427205e-05
## 19420    1 70067 1.427205e-05
## 19421    1 70067 1.427205e-05
## 19422    1 70067 1.427205e-05
## 19423    1 70067 1.427205e-05
## 19424    1 70067 1.427205e-05
## 19425    1 70067 1.427205e-05
## 19426    1 70067 1.427205e-05
## 19427    1 70067 1.427205e-05
## 19428    1 70067 1.427205e-05
## 19429    1 70067 1.427205e-05
## 19430    1 70067 1.427205e-05
## 19431    1 70067 1.427205e-05
## 19432    1 70067 1.427205e-05
## 19433    1 70067 1.427205e-05
## 19434    1 70067 1.427205e-05
## 19435    1 70067 1.427205e-05
## 19436    1 70067 1.427205e-05
## 19437    1 70067 1.427205e-05
## 19438    1 70067 1.427205e-05
## 19439    1 70067 1.427205e-05
## 19440    1 70067 1.427205e-05
## 19441    1 70067 1.427205e-05
## 19442    1 70067 1.427205e-05
## 19443    1 70067 1.427205e-05
## 19444    1 70067 1.427205e-05
## 19445    1 70067 1.427205e-05
## 19446    1 70067 1.427205e-05
## 19447    1 70067 1.427205e-05
## 19448    1 70067 1.427205e-05
## 19449    1 70067 1.427205e-05
## 19450    1 70067 1.427205e-05
## 19451    1 70067 1.427205e-05
## 19452    1 70067 1.427205e-05
## 19453    1 70067 1.427205e-05
## 19454    1 70067 1.427205e-05
## 19455    1 70067 1.427205e-05
## 19456    1 70067 1.427205e-05
## 19457    1 70067 1.427205e-05
## 19458    1 70067 1.427205e-05
## 19459    1 70067 1.427205e-05
## 19460    1 70067 1.427205e-05
## 19461    1 70067 1.427205e-05
## 19462    1 70067 1.427205e-05
## 19463    1 70067 1.427205e-05
## 19464    1 70067 1.427205e-05
## 19465    1 70067 1.427205e-05
## 19466    1 70067 1.427205e-05
## 19467    1 70067 1.427205e-05
## 19468    1 70067 1.427205e-05
## 19469    1 70067 1.427205e-05
## 19470    1 70067 1.427205e-05
## 19471    1 70067 1.427205e-05
## 19472    1 70067 1.427205e-05
## 19473    1 70067 1.427205e-05
## 19474    1 70067 1.427205e-05
## 19475    1 70067 1.427205e-05
## 19476    1 70067 1.427205e-05
## 19477    1 70067 1.427205e-05
## 19478    1 70067 1.427205e-05
## 19479    1 70067 1.427205e-05
## 19480    1 70067 1.427205e-05
## 19481    1 70067 1.427205e-05
## 19482    1 70067 1.427205e-05
## 19483    1 70067 1.427205e-05
## 19484    1 70067 1.427205e-05
## 19485    1 70067 1.427205e-05
## 19486    1 70067 1.427205e-05
## 19487    1 70067 1.427205e-05
## 19488    1 70067 1.427205e-05
## 19489    1 70067 1.427205e-05
## 19490    1 70067 1.427205e-05
## 19491    1 70067 1.427205e-05
## 19492    1 70067 1.427205e-05
## 19493    1 70067 1.427205e-05
## 19494    1 70067 1.427205e-05
## 19495    1 70067 1.427205e-05
## 19496    1 70067 1.427205e-05
## 19497    1 70067 1.427205e-05
## 19498    1 70067 1.427205e-05
## 19499    1 70067 1.427205e-05
## 19500    1 70067 1.427205e-05
## 19501    1 70067 1.427205e-05
## 19502    1 70067 1.427205e-05
## 19503    1 70067 1.427205e-05
## 19504    1 70067 1.427205e-05
## 19505    1 70067 1.427205e-05
## 19506    1 70067 1.427205e-05
## 19507    1 70067 1.427205e-05
## 19508    1 70067 1.427205e-05
## 19509    1 70067 1.427205e-05
## 19510    1 70067 1.427205e-05
## 19511    1 70067 1.427205e-05
## 19512    1 70067 1.427205e-05
## 19513    1 70067 1.427205e-05
## 19514    1 70067 1.427205e-05
## 19515    1 70067 1.427205e-05
## 19516    1 70067 1.427205e-05
## 19517    1 70067 1.427205e-05
## 19518    1 70067 1.427205e-05
## 19519    1 70067 1.427205e-05
## 19520    1 70067 1.427205e-05
## 19521    1 70067 1.427205e-05
## 19522    1 70067 1.427205e-05
## 19523    1 70067 1.427205e-05
## 19524    1 70067 1.427205e-05
## 19525    1 70067 1.427205e-05
## 19526    1 70067 1.427205e-05
## 19527    1 70067 1.427205e-05
## 19528    1 70067 1.427205e-05
## 19529    1 70067 1.427205e-05
## 19530    1 70067 1.427205e-05
## 19531    1 70067 1.427205e-05
## 19532    1 70067 1.427205e-05
## 19533    1 70067 1.427205e-05
## 19534    1 70067 1.427205e-05
## 19535    1 70067 1.427205e-05
## 19536    1 70067 1.427205e-05
## 19537    1 70067 1.427205e-05
## 19538    1 70067 1.427205e-05
## 19539    1 70067 1.427205e-05
## 19540    1 70067 1.427205e-05
## 19541    1 70067 1.427205e-05
## 19542    1 70067 1.427205e-05
## 19543    1 70067 1.427205e-05
## 19544    1 70067 1.427205e-05
## 19545    1 70067 1.427205e-05
## 19546    1 70067 1.427205e-05
## 19547    1 70067 1.427205e-05
## 19548    1 70067 1.427205e-05
## 19549    1 70067 1.427205e-05
## 19550    1 70067 1.427205e-05
## 19551    1 70067 1.427205e-05
## 19552    1 70067 1.427205e-05
## 19553    1 70067 1.427205e-05
## 19554    1 70067 1.427205e-05
## 19555    1 70067 1.427205e-05
## 19556    1 70067 1.427205e-05
## 19557    1 70067 1.427205e-05
## 19558    1 70067 1.427205e-05
## 19559    1 70067 1.427205e-05
## 19560    1 70067 1.427205e-05
## 19561    1 70067 1.427205e-05
## 19562    1 70067 1.427205e-05
## 19563    1 70067 1.427205e-05
## 19564    1 70067 1.427205e-05
## 19565    1 70067 1.427205e-05
## 19566    1 70067 1.427205e-05
## 19567    1 70067 1.427205e-05
## 19568    1 70067 1.427205e-05
## 19569    1 70067 1.427205e-05
## 19570    1 70067 1.427205e-05
## 19571    1 70067 1.427205e-05
## 19572    1 70067 1.427205e-05
## 19573    1 70067 1.427205e-05
## 19574    1 70067 1.427205e-05
## 19575    1 70067 1.427205e-05
## 19576    1 70067 1.427205e-05
## 19577    1 70067 1.427205e-05
## 19578    1 70067 1.427205e-05
## 19579    1 70067 1.427205e-05
## 19580    1 70067 1.427205e-05
## 19581    1 70067 1.427205e-05
## 19582    1 70067 1.427205e-05
## 19583    1 70067 1.427205e-05
## 19584    1 70067 1.427205e-05
## 19585    1 70067 1.427205e-05
## 19586    1 70067 1.427205e-05
## 19587    1 70067 1.427205e-05
## 19588    1 70067 1.427205e-05
## 19589    1 70067 1.427205e-05
## 19590    1 70067 1.427205e-05
## 19591    1 70067 1.427205e-05
## 19592    1 70067 1.427205e-05
## 19593    1 70067 1.427205e-05
## 19594    1 70067 1.427205e-05
## 19595    1 70067 1.427205e-05
## 19596    1 70067 1.427205e-05
## 19597    1 70067 1.427205e-05
## 19598    1 70067 1.427205e-05
## 19599    1 70067 1.427205e-05
## 19600    1 70067 1.427205e-05
## 19601    1 70067 1.427205e-05
## 19602    1 70067 1.427205e-05
## 19603    1 70067 1.427205e-05
## 19604    1 70067 1.427205e-05
## 19605    1 70067 1.427205e-05
## 19606    1 70067 1.427205e-05
## 19607    1 70067 1.427205e-05
## 19608    1 70067 1.427205e-05
## 19609    1 70067 1.427205e-05
## 19610    1 70067 1.427205e-05
## 19611    1 70067 1.427205e-05
## 19612    1 70067 1.427205e-05
## 19613    1 70067 1.427205e-05
## 19614    1 70067 1.427205e-05
## 19615    1 70067 1.427205e-05
## 19616    1 70067 1.427205e-05
## 19617    1 70067 1.427205e-05
## 19618    1 70067 1.427205e-05
## 19619    1 70067 1.427205e-05
## 19620    1 70067 1.427205e-05
## 19621    1 70067 1.427205e-05
## 19622    1 70067 1.427205e-05
## 19623    1 70067 1.427205e-05
## 19624    1 70067 1.427205e-05
## 19625    1 70067 1.427205e-05
## 19626    1 70067 1.427205e-05
## 19627    1 70067 1.427205e-05
## 19628    1 70067 1.427205e-05
## 19629    1 70067 1.427205e-05
## 19630    1 70067 1.427205e-05
## 19631    1 70067 1.427205e-05
## 19632    1 70067 1.427205e-05
## 19633    1 70067 1.427205e-05
## 19634    1 70067 1.427205e-05
## 19635    1 70067 1.427205e-05
## 19636    1 70067 1.427205e-05
## 19637    1 70067 1.427205e-05
## 19638    1 70067 1.427205e-05
## 19639    1 70067 1.427205e-05
## 19640    1 70067 1.427205e-05
## 19641    1 70067 1.427205e-05
## 19642    1 70067 1.427205e-05
## 19643    1 70067 1.427205e-05
## 19644    1 70067 1.427205e-05
## 19645    1 70067 1.427205e-05
## 19646    1 70067 1.427205e-05
## 19647    1 70067 1.427205e-05
## 19648    1 70067 1.427205e-05
## 19649    1 70067 1.427205e-05
## 19650    1 70067 1.427205e-05
## 19651    1 70067 1.427205e-05
## 19652    1 70067 1.427205e-05
## 19653    1 70067 1.427205e-05
## 19654    1 70067 1.427205e-05
## 19655    1 70067 1.427205e-05
## 19656    1 70067 1.427205e-05
## 19657    1 70067 1.427205e-05
## 19658    1 70067 1.427205e-05
## 19659    1 70067 1.427205e-05
## 19660    1 70067 1.427205e-05
## 19661    1 70067 1.427205e-05
## 19662    1 70067 1.427205e-05
## 19663    1 70067 1.427205e-05
## 19664    1 70067 1.427205e-05
## 19665    1 70067 1.427205e-05
## 19666    1 70067 1.427205e-05
## 19667    1 70067 1.427205e-05
## 19668    1 70067 1.427205e-05
## 19669    1 70067 1.427205e-05
## 19670    1 70067 1.427205e-05
## 19671    1 70067 1.427205e-05
## 19672    1 70067 1.427205e-05
## 19673    1 70067 1.427205e-05
## 19674    1 70067 1.427205e-05
## 19675    1 70067 1.427205e-05
## 19676    1 70067 1.427205e-05
## 19677    1 70067 1.427205e-05
## 19678    1 70067 1.427205e-05
## 19679    1 70067 1.427205e-05
## 19680    1 70067 1.427205e-05
## 19681    1 70067 1.427205e-05
## 19682    1 70067 1.427205e-05
## 19683    1 70067 1.427205e-05
## 19684    1 70067 1.427205e-05
## 19685    1 70067 1.427205e-05
## 19686    1 70067 1.427205e-05
## 19687    1 70067 1.427205e-05
## 19688    1 70067 1.427205e-05
## 19689    1 70067 1.427205e-05
## 19690    1 70067 1.427205e-05
## 19691    1 70067 1.427205e-05
## 19692    1 70067 1.427205e-05
## 19693    1 70067 1.427205e-05
## 19694    1 70067 1.427205e-05
## 19695    1 70067 1.427205e-05
## 19696    1 70067 1.427205e-05
## 19697    1 70067 1.427205e-05
## 19698    1 70067 1.427205e-05
## 19699    1 70067 1.427205e-05
## 19700    1 70067 1.427205e-05
## 19701    1 70067 1.427205e-05
## 19702    1 70067 1.427205e-05
## 19703    1 70067 1.427205e-05
## 19704    1 70067 1.427205e-05
## 19705    1 70067 1.427205e-05
## 19706    1 70067 1.427205e-05
## 19707    1 70067 1.427205e-05
## 19708    1 70067 1.427205e-05
## 19709    1 70067 1.427205e-05
## 19710    1 70067 1.427205e-05
## 19711    1 70067 1.427205e-05
## 19712    1 70067 1.427205e-05
## 19713    1 70067 1.427205e-05
## 19714    1 70067 1.427205e-05
## 19715    1 70067 1.427205e-05
## 19716    1 70067 1.427205e-05
## 19717    1 70067 1.427205e-05
## 19718    1 70067 1.427205e-05
## 19719    1 70067 1.427205e-05
## 19720    1 70067 1.427205e-05
## 19721    1 70067 1.427205e-05
## 19722    1 70067 1.427205e-05
## 19723    1 70067 1.427205e-05
## 19724    1 70067 1.427205e-05
## 19725    1 70067 1.427205e-05
## 19726    1 70067 1.427205e-05
## 19727    1 70067 1.427205e-05
## 19728    1 70067 1.427205e-05
## 19729    1 70067 1.427205e-05
## 19730    1 70067 1.427205e-05
## 19731    1 70067 1.427205e-05
## 19732    1 70067 1.427205e-05
## 19733    1 70067 1.427205e-05
## 19734    1 70067 1.427205e-05
## 19735    1 70067 1.427205e-05
## 19736    1 70067 1.427205e-05
## 19737    1 70067 1.427205e-05
## 19738    1 70067 1.427205e-05
## 19739    1 70067 1.427205e-05
## 19740    1 70067 1.427205e-05
## 19741    1 70067 1.427205e-05
## 19742    1 70067 1.427205e-05
## 19743    1 70067 1.427205e-05
## 19744    1 70067 1.427205e-05
## 19745    1 70067 1.427205e-05
## 19746    1 70067 1.427205e-05
## 19747    1 70067 1.427205e-05
## 19748    1 70067 1.427205e-05
## 19749    1 70067 1.427205e-05
## 19750    1 70067 1.427205e-05
## 19751    1 70067 1.427205e-05
## 19752    1 70067 1.427205e-05
## 19753    1 70067 1.427205e-05
## 19754    1 70067 1.427205e-05
## 19755    1 70067 1.427205e-05
## 19756    1 70067 1.427205e-05
## 19757    1 70067 1.427205e-05
## 19758    1 70067 1.427205e-05
## 19759    1 70067 1.427205e-05
## 19760    1 70067 1.427205e-05
## 19761    1 70067 1.427205e-05
## 19762    1 70067 1.427205e-05
## 19763    1 70067 1.427205e-05
## 19764    1 70067 1.427205e-05
## 19765    1 70067 1.427205e-05
## 19766    1 70067 1.427205e-05
## 19767    1 70067 1.427205e-05
## 19768    1 70067 1.427205e-05
## 19769    1 70067 1.427205e-05
## 19770    1 70067 1.427205e-05
## 19771    1 70067 1.427205e-05
## 19772    1 70067 1.427205e-05
## 19773    1 70067 1.427205e-05
## 19774    1 70067 1.427205e-05
## 19775    1 70067 1.427205e-05
## 19776    1 70067 1.427205e-05
## 19777    1 70067 1.427205e-05
## 19778    1 70067 1.427205e-05
## 19779    1 70067 1.427205e-05
## 19780    1 70067 1.427205e-05
## 19781    1 70067 1.427205e-05
## 19782    1 70067 1.427205e-05
## 19783    1 70067 1.427205e-05
## 19784    1 70067 1.427205e-05
## 19785    1 70067 1.427205e-05
## 19786    1 70067 1.427205e-05
## 19787    1 70067 1.427205e-05
## 19788    1 70067 1.427205e-05
## 19789    1 70067 1.427205e-05
## 19790    1 70067 1.427205e-05
## 19791    1 70067 1.427205e-05
## 19792    1 70067 1.427205e-05
## 19793    1 70067 1.427205e-05
## 19794    1 70067 1.427205e-05
## 19795    1 70067 1.427205e-05
## 19796    1 70067 1.427205e-05
## 19797    1 70067 1.427205e-05
## 19798    1 70067 1.427205e-05
## 19799    1 70067 1.427205e-05
## 19800    1 70067 1.427205e-05
## 19801    1 70067 1.427205e-05
## 19802    1 70067 1.427205e-05
## 19803    1 70067 1.427205e-05
## 19804    1 70067 1.427205e-05
## 19805    1 70067 1.427205e-05
## 19806    1 70067 1.427205e-05
## 19807    1 70067 1.427205e-05
## 19808    1 70067 1.427205e-05
## 19809    1 70067 1.427205e-05
## 19810    1 70067 1.427205e-05
## 19811    1 70067 1.427205e-05
## 19812    1 70067 1.427205e-05
## 19813    1 70067 1.427205e-05
## 19814    1 70067 1.427205e-05
## 19815    1 70067 1.427205e-05
## 19816    1 70067 1.427205e-05
## 19817    1 70067 1.427205e-05
## 19818    1 70067 1.427205e-05
## 19819    1 70067 1.427205e-05
## 19820    1 70067 1.427205e-05
## 19821    1 70067 1.427205e-05
## 19822    1 70067 1.427205e-05
## 19823    1 70067 1.427205e-05
## 19824    1 70067 1.427205e-05
## 19825    1 70067 1.427205e-05
## 19826    1 70067 1.427205e-05
## 19827    1 70067 1.427205e-05
## 19828    1 70067 1.427205e-05
## 19829    1 70067 1.427205e-05
## 19830    1 70067 1.427205e-05
## 19831    1 70067 1.427205e-05
## 19832    1 70067 1.427205e-05
## 19833    1 70067 1.427205e-05
## 19834    1 70067 1.427205e-05
## 19835    1 70067 1.427205e-05
## 19836    1 70067 1.427205e-05
## 19837    1 70067 1.427205e-05
## 19838    1 70067 1.427205e-05
## 19839    1 70067 1.427205e-05
## 19840    1 70067 1.427205e-05
## 19841    1 70067 1.427205e-05
## 19842    1 70067 1.427205e-05
## 19843    1 70067 1.427205e-05
## 19844    1 70067 1.427205e-05
## 19845    1 70067 1.427205e-05
## 19846    1 70067 1.427205e-05
## 19847    1 70067 1.427205e-05
## 19848    1 70067 1.427205e-05
## 19849    1 70067 1.427205e-05
## 19850    1 70067 1.427205e-05
## 19851    1 70067 1.427205e-05
## 19852    1 70067 1.427205e-05
## 19853    1 70067 1.427205e-05
## 19854    1 70067 1.427205e-05
## 19855    1 70067 1.427205e-05
## 19856    1 70067 1.427205e-05
## 19857    1 70067 1.427205e-05
## 19858    1 70067 1.427205e-05
## 19859    1 70067 1.427205e-05
## 19860    1 70067 1.427205e-05
## 19861    1 70067 1.427205e-05
## 19862    1 70067 1.427205e-05
## 19863    1 70067 1.427205e-05
## 19864    1 70067 1.427205e-05
## 19865    1 70067 1.427205e-05
## 19866    1 70067 1.427205e-05
## 19867    1 70067 1.427205e-05
## 19868    1 70067 1.427205e-05
## 19869    1 70067 1.427205e-05
## 19870    1 70067 1.427205e-05
## 19871    1 70067 1.427205e-05
## 19872    1 70067 1.427205e-05
## 19873    1 70067 1.427205e-05
## 19874    1 70067 1.427205e-05
## 19875    1 70067 1.427205e-05
## 19876    1 70067 1.427205e-05
## 19877    1 70067 1.427205e-05
## 19878    1 70067 1.427205e-05
## 19879    1 70067 1.427205e-05
## 19880    1 70067 1.427205e-05
## 19881    1 70067 1.427205e-05
## 19882    1 70067 1.427205e-05
## 19883    1 70067 1.427205e-05
## 19884    1 70067 1.427205e-05
## 19885    1 70067 1.427205e-05
## 19886    1 70067 1.427205e-05
## 19887    1 70067 1.427205e-05
## 19888    1 70067 1.427205e-05
## 19889    1 70067 1.427205e-05
## 19890    1 70067 1.427205e-05
## 19891    1 70067 1.427205e-05
## 19892    1 70067 1.427205e-05
## 19893    1 70067 1.427205e-05
## 19894    1 70067 1.427205e-05
## 19895    1 70067 1.427205e-05
## 19896    1 70067 1.427205e-05
## 19897    1 70067 1.427205e-05
## 19898    1 70067 1.427205e-05
## 19899    1 70067 1.427205e-05
## 19900    1 70067 1.427205e-05
## 19901    1 70067 1.427205e-05
## 19902    1 70067 1.427205e-05
## 19903    1 70067 1.427205e-05
## 19904    1 70067 1.427205e-05
## 19905    1 70067 1.427205e-05
## 19906    1 70067 1.427205e-05
## 19907    1 70067 1.427205e-05
## 19908    1 70067 1.427205e-05
## 19909    1 70067 1.427205e-05
## 19910    1 70067 1.427205e-05
## 19911    1 70067 1.427205e-05
## 19912    1 70067 1.427205e-05
## 19913    1 70067 1.427205e-05
## 19914    1 70067 1.427205e-05
## 19915    1 70067 1.427205e-05
## 19916    1 70067 1.427205e-05
## 19917    1 70067 1.427205e-05
## 19918    1 70067 1.427205e-05
## 19919    1 70067 1.427205e-05
## 19920    1 70067 1.427205e-05
## 19921    1 70067 1.427205e-05
## 19922    1 70067 1.427205e-05
## 19923    1 70067 1.427205e-05
## 19924    1 70067 1.427205e-05
## 19925    1 70067 1.427205e-05
## 19926    1 70067 1.427205e-05
## 19927    1 70067 1.427205e-05
## 19928    1 70067 1.427205e-05
## 19929    1 70067 1.427205e-05
## 19930    1 70067 1.427205e-05
## 19931    1 70067 1.427205e-05
## 19932    1 70067 1.427205e-05
## 19933    1 70067 1.427205e-05
## 19934    1 70067 1.427205e-05
## 19935    1 70067 1.427205e-05
## 19936    1 70067 1.427205e-05
## 19937    1 70067 1.427205e-05
## 19938    1 70067 1.427205e-05
## 19939    1 70067 1.427205e-05
## 19940    1 70067 1.427205e-05
## 19941    1 70067 1.427205e-05
## 19942    1 70067 1.427205e-05
## 19943    1 70067 1.427205e-05
## 19944    1 70067 1.427205e-05
## 19945    1 70067 1.427205e-05
## 19946    1 70067 1.427205e-05
## 19947    1 70067 1.427205e-05
## 19948    1 70067 1.427205e-05
## 19949    1 70067 1.427205e-05
## 19950    1 70067 1.427205e-05
## 19951    1 70067 1.427205e-05
## 19952    1 70067 1.427205e-05
## 19953    1 70067 1.427205e-05
## 19954    1 70067 1.427205e-05
## 19955    1 70067 1.427205e-05
## 19956    1 70067 1.427205e-05
## 19957    1 70067 1.427205e-05
## 19958    1 70067 1.427205e-05
## 19959    1 70067 1.427205e-05
## 19960    1 70067 1.427205e-05
## 19961    1 70067 1.427205e-05
## 19962    1 70067 1.427205e-05
## 19963    1 70067 1.427205e-05
## 19964    1 70067 1.427205e-05
## 19965    1 70067 1.427205e-05
## 19966    1 70067 1.427205e-05
## 19967    1 70067 1.427205e-05
## 19968    1 70067 1.427205e-05
## 19969    1 70067 1.427205e-05
## 19970    1 70067 1.427205e-05
## 19971    1 70067 1.427205e-05
## 19972    1 70067 1.427205e-05
## 19973    1 70067 1.427205e-05
## 19974    1 70067 1.427205e-05
## 19975    1 70067 1.427205e-05
## 19976    1 70067 1.427205e-05
## 19977    1 70067 1.427205e-05
## 19978    1 70067 1.427205e-05
## 19979    1 70067 1.427205e-05
## 19980    1 70067 1.427205e-05
## 19981    1 70067 1.427205e-05
## 19982    1 70067 1.427205e-05
## 19983    1 70067 1.427205e-05
## 19984    1 70067 1.427205e-05
## 19985    1 70067 1.427205e-05
## 19986    1 70067 1.427205e-05
## 19987    1 70067 1.427205e-05
## 19988    1 70067 1.427205e-05
## 19989    1 70067 1.427205e-05
## 19990    1 70067 1.427205e-05
## 19991    1 70067 1.427205e-05
## 19992    1 70067 1.427205e-05
## 19993    1 70067 1.427205e-05
## 19994    1 70067 1.427205e-05
## 19995    1 70067 1.427205e-05
## 19996    1 70067 1.427205e-05
## 19997    1 70067 1.427205e-05
## 19998    1 70067 1.427205e-05
## 19999    1 70067 1.427205e-05
##  [ reached 'max' / getOption("max.print") -- omitted 27297 rows ]

Let’s look at the word frequencies for the Canada COVID data.

frequencyCA <- tidy_tweetsCA %>%
  count(year, word, sort = TRUE) %>%
  left_join(tidy_tweetsCA %>%
              count(year, name = "total")) %>%
  dplyr::mutate(freq = n/total) 
## Joining, by = "year"
frequencyCA
##        year
## 1     y2020
## 2     y2021
## 3     y2022
## 4     y2020
## 5     y2020
## 6     y2020
## 7     y2020
## 8     y2021
## 9     y2020
## 10    y2021
## 11    y2021
## 12    y2020
## 13    y2020
## 14    y2022
## 15    y2021
## 16    y2020
## 17    y2020
## 18    y2020
## 19    y2021
## 20    y2021
## 21    y2021
## 22    y2020
## 23    y2021
## 24    y2021
## 25    y2021
## 26    y2020
## 27    y2021
## 28    y2020
## 29    y2020
## 30    y2020
## 31    y2021
## 32    y2020
## 33    y2020
## 34    y2022
## 35    y2022
## 36    y2020
## 37    y2021
## 38    y2020
## 39    y2022
## 40    y2020
## 41    y2020
## 42    y2021
## 43    y2021
## 44    y2021
## 45    y2021
## 46    y2020
## 47    y2020
## 48    y2020
## 49    y2020
## 50    y2020
## 51    y2020
## 52    y2020
## 53    y2021
## 54    y2020
## 55    y2021
## 56    y2022
## 57    y2020
## 58    y2020
## 59    y2020
## 60    y2020
## 61    y2020
## 62    y2020
## 63    y2022
## 64    y2020
## 65    y2020
## 66    y2020
## 67    y2021
## 68    y2020
## 69    y2020
## 70    y2020
## 71    y2020
## 72    y2022
## 73    y2021
## 74    y2021
## 75    y2022
## 76    y2022
## 77    y2020
## 78    y2020
## 79    y2020
## 80    y2020
## 81    y2021
## 82    y2021
## 83    y2020
## 84    y2020
## 85    y2022
## 86    y2021
## 87    y2020
## 88    y2020
## 89    y2020
## 90    y2020
## 91    y2020
## 92    y2021
## 93    y2021
## 94    y2020
## 95    y2020
## 96    y2020
## 97    y2022
## 98    y2020
## 99    y2020
## 100   y2020
## 101   y2021
## 102   y2020
## 103   y2020
## 104   y2020
## 105   y2020
## 106   y2021
## 107   y2021
## 108   y2021
## 109   y2022
## 110   y2020
## 111   y2020
## 112   y2020
## 113   y2021
## 114   y2021
## 115   y2021
## 116   y2021
## 117   y2020
## 118   y2020
## 119   y2021
## 120   y2021
## 121   y2021
## 122   y2020
## 123   y2020
## 124   y2020
## 125   y2021
## 126   y2020
## 127   y2020
## 128   y2020
## 129   y2020
## 130   y2020
## 131   y2021
## 132   y2021
## 133   y2022
## 134   y2020
## 135   y2020
## 136   y2020
## 137   y2020
## 138   y2021
## 139   y2021
## 140   y2021
## 141   y2020
## 142   y2020
## 143   y2020
## 144   y2020
## 145   y2020
## 146   y2021
## 147   y2021
## 148   y2022
## 149   y2020
## 150   y2021
## 151   y2022
## 152   y2020
## 153   y2020
## 154   y2020
## 155   y2020
## 156   y2020
## 157   y2020
## 158   y2021
## 159   y2021
## 160   y2022
## 161   y2020
## 162   y2020
## 163   y2021
## 164   y2021
## 165   y2021
## 166   y2020
## 167   y2020
## 168   y2020
## 169   y2020
## 170   y2022
## 171   y2022
## 172   y2020
## 173   y2020
## 174   y2020
## 175   y2022
## 176   y2020
## 177   y2021
## 178   y2022
## 179   y2022
## 180   y2020
## 181   y2020
## 182   y2021
## 183   y2021
## 184   y2020
## 185   y2020
## 186   y2020
## 187   y2020
## 188   y2020
## 189   y2021
## 190   y2021
## 191   y2020
## 192   y2021
## 193   y2021
## 194   y2021
## 195   y2021
## 196   y2020
## 197   y2020
## 198   y2020
## 199   y2020
## 200   y2020
## 201   y2020
## 202   y2020
## 203   y2020
## 204   y2020
## 205   y2020
## 206   y2021
## 207   y2021
## 208   y2021
## 209   y2022
## 210   y2022
## 211   y2020
## 212   y2020
## 213   y2020
## 214   y2021
## 215   y2021
## 216   y2022
## 217   y2022
## 218   y2020
## 219   y2020
## 220   y2020
## 221   y2020
## 222   y2020
## 223   y2020
## 224   y2020
## 225   y2021
## 226   y2021
## 227   y2021
## 228   y2021
## 229   y2022
## 230   y2022
## 231   y2022
## 232   y2020
## 233   y2020
## 234   y2020
## 235   y2021
## 236   y2021
## 237   y2021
## 238   y2022
## 239   y2022
## 240   y2022
## 241   y2020
## 242   y2020
## 243   y2020
## 244   y2020
## 245   y2021
## 246   y2021
## 247   y2021
## 248   y2021
## 249   y2021
## 250   y2021
## 251   y2022
## 252   y2022
## 253   y2020
## 254   y2020
## 255   y2020
## 256   y2020
## 257   y2020
## 258   y2021
## 259   y2021
## 260   y2022
## 261   y2022
## 262   y2020
## 263   y2020
## 264   y2020
## 265   y2020
## 266   y2020
## 267   y2021
## 268   y2021
## 269   y2021
## 270   y2021
## 271   y2021
## 272   y2021
## 273   y2022
## 274   y2020
## 275   y2020
## 276   y2020
## 277   y2020
## 278   y2020
## 279   y2020
## 280   y2020
## 281   y2020
## 282   y2021
## 283   y2021
## 284   y2021
## 285   y2021
## 286   y2022
## 287   y2022
## 288   y2020
## 289   y2020
## 290   y2020
## 291   y2020
## 292   y2020
## 293   y2020
## 294   y2020
## 295   y2020
## 296   y2020
## 297   y2020
## 298   y2020
## 299   y2020
## 300   y2020
## 301   y2021
## 302   y2021
## 303   y2021
## 304   y2021
## 305   y2022
## 306   y2022
## 307   y2022
## 308   y2020
## 309   y2020
## 310   y2020
## 311   y2020
## 312   y2020
## 313   y2021
## 314   y2021
## 315   y2021
## 316   y2022
## 317   y2022
## 318   y2020
## 319   y2020
## 320   y2020
## 321   y2020
## 322   y2020
## 323   y2020
## 324   y2020
## 325   y2020
## 326   y2020
## 327   y2021
## 328   y2021
## 329   y2021
## 330   y2021
## 331   y2021
## 332   y2021
## 333   y2022
## 334   y2022
## 335   y2022
## 336   y2020
## 337   y2020
## 338   y2020
## 339   y2020
## 340   y2020
## 341   y2020
## 342   y2020
## 343   y2020
## 344   y2020
## 345   y2020
## 346   y2020
## 347   y2020
## 348   y2021
## 349   y2021
## 350   y2021
## 351   y2022
## 352   y2022
## 353   y2022
## 354   y2020
## 355   y2020
## 356   y2020
## 357   y2020
## 358   y2020
## 359   y2020
## 360   y2020
## 361   y2020
## 362   y2021
## 363   y2021
## 364   y2021
## 365   y2021
## 366   y2021
## 367   y2021
## 368   y2022
## 369   y2022
## 370   y2022
## 371   y2022
## 372   y2020
## 373   y2020
## 374   y2020
## 375   y2020
## 376   y2020
## 377   y2020
## 378   y2020
## 379   y2020
## 380   y2020
## 381   y2020
## 382   y2021
## 383   y2021
## 384   y2021
## 385   y2021
## 386   y2022
## 387   y2022
## 388   y2020
## 389   y2020
## 390   y2020
## 391   y2020
## 392   y2020
## 393   y2020
## 394   y2020
## 395   y2020
## 396   y2020
## 397   y2021
## 398   y2021
## 399   y2021
## 400   y2021
## 401   y2021
## 402   y2021
## 403   y2021
## 404   y2022
## 405   y2022
## 406   y2022
## 407   y2020
## 408   y2020
## 409   y2020
## 410   y2020
## 411   y2020
## 412   y2020
## 413   y2020
## 414   y2020
## 415   y2020
## 416   y2020
## 417   y2021
## 418   y2021
## 419   y2021
## 420   y2021
## 421   y2021
## 422   y2021
## 423   y2021
## 424   y2022
## 425   y2020
## 426   y2020
## 427   y2020
## 428   y2020
## 429   y2020
## 430   y2020
## 431   y2020
## 432   y2020
## 433   y2020
## 434   y2020
## 435   y2021
## 436   y2021
## 437   y2021
## 438   y2021
## 439   y2021
## 440   y2021
## 441   y2021
## 442   y2022
## 443   y2022
## 444   y2022
## 445   y2020
## 446   y2020
## 447   y2020
## 448   y2020
## 449   y2020
## 450   y2020
## 451   y2020
## 452   y2020
## 453   y2020
## 454   y2020
## 455   y2020
## 456   y2020
## 457   y2020
## 458   y2020
## 459   y2020
## 460   y2020
## 461   y2020
## 462   y2021
## 463   y2021
## 464   y2021
## 465   y2021
## 466   y2021
## 467   y2021
## 468   y2021
## 469   y2021
## 470   y2021
## 471   y2021
## 472   y2021
## 473   y2021
## 474   y2022
## 475   y2022
## 476   y2022
## 477   y2022
## 478   y2022
## 479   y2020
## 480   y2020
## 481   y2020
## 482   y2020
## 483   y2020
## 484   y2020
## 485   y2020
## 486   y2020
## 487   y2020
## 488   y2020
## 489   y2020
## 490   y2020
## 491   y2020
## 492   y2020
## 493   y2020
## 494   y2020
## 495   y2020
## 496   y2020
## 497   y2020
## 498   y2020
## 499   y2020
## 500   y2020
## 501   y2020
## 502   y2020
## 503   y2020
## 504   y2021
## 505   y2021
## 506   y2021
## 507   y2021
## 508   y2021
## 509   y2021
## 510   y2021
## 511   y2022
## 512   y2022
## 513   y2022
## 514   y2022
## 515   y2022
## 516   y2022
## 517   y2020
## 518   y2020
## 519   y2020
## 520   y2020
## 521   y2020
## 522   y2020
## 523   y2020
## 524   y2020
## 525   y2020
## 526   y2020
## 527   y2020
## 528   y2020
## 529   y2020
## 530   y2020
## 531   y2020
## 532   y2020
## 533   y2020
## 534   y2020
## 535   y2020
## 536   y2020
## 537   y2021
## 538   y2021
## 539   y2021
## 540   y2021
## 541   y2021
## 542   y2021
## 543   y2021
## 544   y2021
## 545   y2021
## 546   y2021
## 547   y2021
## 548   y2021
## 549   y2021
## 550   y2022
## 551   y2022
## 552   y2022
## 553   y2022
## 554   y2022
## 555   y2022
## 556   y2020
## 557   y2020
## 558   y2020
## 559   y2020
## 560   y2020
## 561   y2020
## 562   y2020
## 563   y2020
## 564   y2020
## 565   y2020
## 566   y2020
## 567   y2020
## 568   y2020
## 569   y2020
## 570   y2020
## 571   y2020
## 572   y2020
## 573   y2020
## 574   y2020
## 575   y2020
## 576   y2020
## 577   y2020
## 578   y2020
## 579   y2020
## 580   y2020
## 581   y2021
## 582   y2021
## 583   y2021
## 584   y2021
## 585   y2021
## 586   y2021
## 587   y2021
## 588   y2021
## 589   y2021
## 590   y2021
## 591   y2021
## 592   y2021
## 593   y2022
## 594   y2022
## 595   y2022
## 596   y2022
## 597   y2022
## 598   y2022
## 599   y2022
## 600   y2022
## 601   y2022
## 602   y2020
## 603   y2020
## 604   y2020
## 605   y2020
## 606   y2020
## 607   y2020
## 608   y2020
## 609   y2020
## 610   y2020
## 611   y2020
## 612   y2020
## 613   y2020
## 614   y2020
## 615   y2020
## 616   y2020
## 617   y2020
## 618   y2020
## 619   y2020
## 620   y2020
## 621   y2020
## 622   y2020
## 623   y2020
## 624   y2020
## 625   y2020
## 626   y2020
## 627   y2020
## 628   y2020
## 629   y2020
## 630   y2020
## 631   y2020
## 632   y2021
## 633   y2021
## 634   y2021
## 635   y2021
## 636   y2021
## 637   y2021
## 638   y2021
## 639   y2021
## 640   y2021
## 641   y2021
## 642   y2021
## 643   y2021
## 644   y2021
## 645   y2021
## 646   y2021
## 647   y2021
## 648   y2021
## 649   y2021
## 650   y2022
## 651   y2022
## 652   y2022
## 653   y2022
## 654   y2022
## 655   y2022
## 656   y2022
## 657   y2022
## 658   y2022
## 659   y2020
## 660   y2020
## 661   y2020
## 662   y2020
## 663   y2020
## 664   y2020
## 665   y2020
## 666   y2020
## 667   y2020
## 668   y2020
## 669   y2020
## 670   y2020
## 671   y2020
## 672   y2020
## 673   y2020
## 674   y2020
## 675   y2020
## 676   y2020
## 677   y2020
## 678   y2020
## 679   y2020
## 680   y2020
## 681   y2020
## 682   y2020
## 683   y2020
## 684   y2020
## 685   y2020
## 686   y2020
## 687   y2020
## 688   y2020
## 689   y2021
## 690   y2021
## 691   y2021
## 692   y2021
## 693   y2021
## 694   y2021
## 695   y2021
## 696   y2021
## 697   y2021
## 698   y2021
## 699   y2021
## 700   y2021
## 701   y2021
## 702   y2021
## 703   y2021
## 704   y2022
## 705   y2022
## 706   y2022
## 707   y2022
## 708   y2022
## 709   y2022
## 710   y2022
## 711   y2022
## 712   y2022
## 713   y2022
## 714   y2022
## 715   y2020
## 716   y2020
## 717   y2020
## 718   y2020
## 719   y2020
## 720   y2020
## 721   y2020
## 722   y2020
## 723   y2020
## 724   y2020
## 725   y2020
## 726   y2020
## 727   y2020
## 728   y2020
## 729   y2020
## 730   y2020
## 731   y2020
## 732   y2020
## 733   y2020
## 734   y2020
## 735   y2020
## 736   y2020
## 737   y2020
## 738   y2020
## 739   y2020
## 740   y2020
## 741   y2020
## 742   y2020
## 743   y2020
## 744   y2020
## 745   y2020
## 746   y2020
## 747   y2020
## 748   y2020
## 749   y2020
## 750   y2020
## 751   y2020
## 752   y2020
## 753   y2020
## 754   y2020
## 755   y2020
## 756   y2021
## 757   y2021
## 758   y2021
## 759   y2021
## 760   y2021
## 761   y2021
## 762   y2021
## 763   y2021
## 764   y2021
## 765   y2021
## 766   y2021
## 767   y2021
## 768   y2021
## 769   y2021
## 770   y2021
## 771   y2021
## 772   y2021
## 773   y2021
## 774   y2021
## 775   y2021
## 776   y2021
## 777   y2021
## 778   y2021
## 779   y2021
## 780   y2021
## 781   y2022
## 782   y2022
## 783   y2022
## 784   y2022
## 785   y2022
## 786   y2022
## 787   y2022
## 788   y2022
## 789   y2022
## 790   y2022
## 791   y2020
## 792   y2020
## 793   y2020
## 794   y2020
## 795   y2020
## 796   y2020
## 797   y2020
## 798   y2020
## 799   y2020
## 800   y2020
## 801   y2020
## 802   y2020
## 803   y2020
## 804   y2020
## 805   y2020
## 806   y2020
## 807   y2020
## 808   y2020
## 809   y2020
## 810   y2020
## 811   y2020
## 812   y2020
## 813   y2020
## 814   y2020
## 815   y2020
## 816   y2020
## 817   y2020
## 818   y2020
## 819   y2020
## 820   y2020
## 821   y2020
## 822   y2020
## 823   y2020
## 824   y2020
## 825   y2020
## 826   y2021
## 827   y2021
## 828   y2021
## 829   y2021
## 830   y2021
## 831   y2021
## 832   y2021
## 833   y2021
## 834   y2021
## 835   y2021
## 836   y2021
## 837   y2021
## 838   y2021
## 839   y2021
## 840   y2021
## 841   y2021
## 842   y2021
## 843   y2021
## 844   y2022
## 845   y2022
## 846   y2022
## 847   y2022
## 848   y2022
## 849   y2022
## 850   y2022
## 851   y2022
## 852   y2020
## 853   y2020
## 854   y2020
## 855   y2020
## 856   y2020
## 857   y2020
## 858   y2020
## 859   y2020
## 860   y2020
## 861   y2020
## 862   y2020
## 863   y2020
## 864   y2020
## 865   y2020
## 866   y2020
## 867   y2020
## 868   y2020
## 869   y2020
## 870   y2020
## 871   y2020
## 872   y2020
## 873   y2020
## 874   y2020
## 875   y2020
## 876   y2020
## 877   y2020
## 878   y2020
## 879   y2020
## 880   y2020
## 881   y2020
## 882   y2020
## 883   y2020
## 884   y2020
## 885   y2020
## 886   y2020
## 887   y2020
## 888   y2020
## 889   y2020
## 890   y2020
## 891   y2020
## 892   y2020
## 893   y2020
## 894   y2020
## 895   y2020
## 896   y2020
## 897   y2020
## 898   y2020
## 899   y2020
## 900   y2020
## 901   y2020
## 902   y2020
## 903   y2020
## 904   y2020
## 905   y2020
## 906   y2020
## 907   y2020
## 908   y2020
## 909   y2020
## 910   y2020
## 911   y2020
## 912   y2020
## 913   y2020
## 914   y2021
## 915   y2021
## 916   y2021
## 917   y2021
## 918   y2021
## 919   y2021
## 920   y2021
## 921   y2021
## 922   y2021
## 923   y2021
## 924   y2021
## 925   y2021
## 926   y2021
## 927   y2021
## 928   y2021
## 929   y2021
## 930   y2021
## 931   y2021
## 932   y2021
## 933   y2021
## 934   y2021
## 935   y2021
## 936   y2021
## 937   y2021
## 938   y2021
## 939   y2021
## 940   y2021
## 941   y2021
## 942   y2021
## 943   y2021
## 944   y2021
## 945   y2021
## 946   y2021
## 947   y2021
## 948   y2021
## 949   y2021
## 950   y2021
## 951   y2021
## 952   y2021
## 953   y2022
## 954   y2022
## 955   y2022
## 956   y2022
## 957   y2022
## 958   y2022
## 959   y2022
## 960   y2022
## 961   y2022
## 962   y2022
## 963   y2022
## 964   y2022
## 965   y2022
## 966   y2022
## 967   y2022
## 968   y2022
## 969   y2022
## 970   y2022
## 971   y2022
## 972   y2020
## 973   y2020
## 974   y2020
## 975   y2020
## 976   y2020
## 977   y2020
## 978   y2020
## 979   y2020
## 980   y2020
## 981   y2020
## 982   y2020
## 983   y2020
## 984   y2020
## 985   y2020
## 986   y2020
## 987   y2020
## 988   y2020
## 989   y2020
## 990   y2020
## 991   y2020
## 992   y2020
## 993   y2020
## 994   y2020
## 995   y2020
## 996   y2020
## 997   y2020
## 998   y2020
## 999   y2020
## 1000  y2020
## 1001  y2020
## 1002  y2020
## 1003  y2020
## 1004  y2020
## 1005  y2020
## 1006  y2020
## 1007  y2020
## 1008  y2020
## 1009  y2020
## 1010  y2020
## 1011  y2020
## 1012  y2020
## 1013  y2020
## 1014  y2020
## 1015  y2020
## 1016  y2020
## 1017  y2020
## 1018  y2020
## 1019  y2020
## 1020  y2020
## 1021  y2021
## 1022  y2021
## 1023  y2021
## 1024  y2021
## 1025  y2021
## 1026  y2021
## 1027  y2021
## 1028  y2021
## 1029  y2021
## 1030  y2021
## 1031  y2021
## 1032  y2021
## 1033  y2021
## 1034  y2021
## 1035  y2021
## 1036  y2021
## 1037  y2021
## 1038  y2021
## 1039  y2021
## 1040  y2021
## 1041  y2021
## 1042  y2021
## 1043  y2021
## 1044  y2021
## 1045  y2021
## 1046  y2021
## 1047  y2021
## 1048  y2021
## 1049  y2021
## 1050  y2021
## 1051  y2021
## 1052  y2021
## 1053  y2021
## 1054  y2021
## 1055  y2021
## 1056  y2021
## 1057  y2022
## 1058  y2022
## 1059  y2022
## 1060  y2022
## 1061  y2022
## 1062  y2022
## 1063  y2022
## 1064  y2022
## 1065  y2022
## 1066  y2022
## 1067  y2022
## 1068  y2022
## 1069  y2022
## 1070  y2022
## 1071  y2022
## 1072  y2022
## 1073  y2022
## 1074  y2022
## 1075  y2022
## 1076  y2020
## 1077  y2020
## 1078  y2020
## 1079  y2020
## 1080  y2020
## 1081  y2020
## 1082  y2020
## 1083  y2020
## 1084  y2020
## 1085  y2020
## 1086  y2020
## 1087  y2020
## 1088  y2020
## 1089  y2020
## 1090  y2020
## 1091  y2020
## 1092  y2020
## 1093  y2020
## 1094  y2020
## 1095  y2020
## 1096  y2020
## 1097  y2020
## 1098  y2020
## 1099  y2020
## 1100  y2020
## 1101  y2020
## 1102  y2020
## 1103  y2020
## 1104  y2020
## 1105  y2020
## 1106  y2020
## 1107  y2020
## 1108  y2020
## 1109  y2020
## 1110  y2020
## 1111  y2020
## 1112  y2020
## 1113  y2020
## 1114  y2020
## 1115  y2020
## 1116  y2020
## 1117  y2020
## 1118  y2020
## 1119  y2020
## 1120  y2020
## 1121  y2020
## 1122  y2020
## 1123  y2020
## 1124  y2020
## 1125  y2020
## 1126  y2020
## 1127  y2020
## 1128  y2020
## 1129  y2020
## 1130  y2020
## 1131  y2020
## 1132  y2020
## 1133  y2020
## 1134  y2020
## 1135  y2020
## 1136  y2020
## 1137  y2020
## 1138  y2020
## 1139  y2020
## 1140  y2020
## 1141  y2020
## 1142  y2020
## 1143  y2020
## 1144  y2020
## 1145  y2021
## 1146  y2021
## 1147  y2021
## 1148  y2021
## 1149  y2021
## 1150  y2021
## 1151  y2021
## 1152  y2021
## 1153  y2021
## 1154  y2021
## 1155  y2021
## 1156  y2021
## 1157  y2021
## 1158  y2021
## 1159  y2021
## 1160  y2021
## 1161  y2021
## 1162  y2021
## 1163  y2021
## 1164  y2021
## 1165  y2021
## 1166  y2021
## 1167  y2021
## 1168  y2021
## 1169  y2021
## 1170  y2021
## 1171  y2021
## 1172  y2021
## 1173  y2021
## 1174  y2021
## 1175  y2021
## 1176  y2021
## 1177  y2021
## 1178  y2021
## 1179  y2021
## 1180  y2021
## 1181  y2021
## 1182  y2021
## 1183  y2021
## 1184  y2021
## 1185  y2021
## 1186  y2021
## 1187  y2021
## 1188  y2021
## 1189  y2021
## 1190  y2021
## 1191  y2022
## 1192  y2022
## 1193  y2022
## 1194  y2022
## 1195  y2022
## 1196  y2022
## 1197  y2022
## 1198  y2022
## 1199  y2022
## 1200  y2022
## 1201  y2022
## 1202  y2022
## 1203  y2020
## 1204  y2020
## 1205  y2020
## 1206  y2020
## 1207  y2020
## 1208  y2020
## 1209  y2020
## 1210  y2020
## 1211  y2020
## 1212  y2020
## 1213  y2020
## 1214  y2020
## 1215  y2020
## 1216  y2020
## 1217  y2020
## 1218  y2020
## 1219  y2020
## 1220  y2020
## 1221  y2020
## 1222  y2020
## 1223  y2020
## 1224  y2020
## 1225  y2020
## 1226  y2020
## 1227  y2020
## 1228  y2020
## 1229  y2020
## 1230  y2020
## 1231  y2020
## 1232  y2020
## 1233  y2020
## 1234  y2020
## 1235  y2020
## 1236  y2020
## 1237  y2020
## 1238  y2020
## 1239  y2020
## 1240  y2020
## 1241  y2020
## 1242  y2020
## 1243  y2020
## 1244  y2020
## 1245  y2020
## 1246  y2020
## 1247  y2020
## 1248  y2020
## 1249  y2020
## 1250  y2020
## 1251  y2020
## 1252  y2020
## 1253  y2020
## 1254  y2020
## 1255  y2020
## 1256  y2020
## 1257  y2020
## 1258  y2020
## 1259  y2020
## 1260  y2020
## 1261  y2020
## 1262  y2020
## 1263  y2020
## 1264  y2020
## 1265  y2020
## 1266  y2020
## 1267  y2020
## 1268  y2020
## 1269  y2020
## 1270  y2020
## 1271  y2020
## 1272  y2020
## 1273  y2020
## 1274  y2020
## 1275  y2020
## 1276  y2020
## 1277  y2020
## 1278  y2020
## 1279  y2020
## 1280  y2020
## 1281  y2020
## 1282  y2020
## 1283  y2020
## 1284  y2021
## 1285  y2021
## 1286  y2021
## 1287  y2021
## 1288  y2021
## 1289  y2021
## 1290  y2021
## 1291  y2021
## 1292  y2021
## 1293  y2021
## 1294  y2021
## 1295  y2021
## 1296  y2021
## 1297  y2021
## 1298  y2021
## 1299  y2021
## 1300  y2021
## 1301  y2021
## 1302  y2021
## 1303  y2021
## 1304  y2021
## 1305  y2021
## 1306  y2021
## 1307  y2021
## 1308  y2021
## 1309  y2021
## 1310  y2021
## 1311  y2021
## 1312  y2021
## 1313  y2021
## 1314  y2021
## 1315  y2021
## 1316  y2021
## 1317  y2021
## 1318  y2021
## 1319  y2021
## 1320  y2021
## 1321  y2021
## 1322  y2021
## 1323  y2021
## 1324  y2021
## 1325  y2021
## 1326  y2021
## 1327  y2021
## 1328  y2022
## 1329  y2022
## 1330  y2022
## 1331  y2022
## 1332  y2022
## 1333  y2022
## 1334  y2022
## 1335  y2022
## 1336  y2022
## 1337  y2022
## 1338  y2022
## 1339  y2022
## 1340  y2022
## 1341  y2022
## 1342  y2022
## 1343  y2022
## 1344  y2022
## 1345  y2022
## 1346  y2022
## 1347  y2022
## 1348  y2022
## 1349  y2022
## 1350  y2022
## 1351  y2022
## 1352  y2022
## 1353  y2022
## 1354  y2022
## 1355  y2022
## 1356  y2020
## 1357  y2020
## 1358  y2020
## 1359  y2020
## 1360  y2020
## 1361  y2020
## 1362  y2020
## 1363  y2020
## 1364  y2020
## 1365  y2020
## 1366  y2020
## 1367  y2020
## 1368  y2020
## 1369  y2020
## 1370  y2020
## 1371  y2020
## 1372  y2020
## 1373  y2020
## 1374  y2020
## 1375  y2020
## 1376  y2020
## 1377  y2020
## 1378  y2020
## 1379  y2020
## 1380  y2020
## 1381  y2020
## 1382  y2020
## 1383  y2020
## 1384  y2020
## 1385  y2020
## 1386  y2020
## 1387  y2020
## 1388  y2020
## 1389  y2020
## 1390  y2020
## 1391  y2020
## 1392  y2020
## 1393  y2020
## 1394  y2020
## 1395  y2020
## 1396  y2020
## 1397  y2020
## 1398  y2020
## 1399  y2020
## 1400  y2020
## 1401  y2020
## 1402  y2020
## 1403  y2020
## 1404  y2020
## 1405  y2020
## 1406  y2020
## 1407  y2020
## 1408  y2020
## 1409  y2020
## 1410  y2020
## 1411  y2020
## 1412  y2020
## 1413  y2020
## 1414  y2020
## 1415  y2020
## 1416  y2020
## 1417  y2020
## 1418  y2020
## 1419  y2020
## 1420  y2020
## 1421  y2020
## 1422  y2020
## 1423  y2020
## 1424  y2020
## 1425  y2020
## 1426  y2020
## 1427  y2020
## 1428  y2020
## 1429  y2020
## 1430  y2020
## 1431  y2020
## 1432  y2020
## 1433  y2020
## 1434  y2020
## 1435  y2020
## 1436  y2020
## 1437  y2020
## 1438  y2020
## 1439  y2020
## 1440  y2020
## 1441  y2020
## 1442  y2020
## 1443  y2020
## 1444  y2020
## 1445  y2020
## 1446  y2020
## 1447  y2020
## 1448  y2020
## 1449  y2020
## 1450  y2021
## 1451  y2021
## 1452  y2021
## 1453  y2021
## 1454  y2021
## 1455  y2021
## 1456  y2021
## 1457  y2021
## 1458  y2021
## 1459  y2021
## 1460  y2021
## 1461  y2021
## 1462  y2021
## 1463  y2021
## 1464  y2021
## 1465  y2021
## 1466  y2021
## 1467  y2021
## 1468  y2021
## 1469  y2021
## 1470  y2021
## 1471  y2021
## 1472  y2021
## 1473  y2021
## 1474  y2021
## 1475  y2021
## 1476  y2021
## 1477  y2021
## 1478  y2021
## 1479  y2021
## 1480  y2021
## 1481  y2021
## 1482  y2021
## 1483  y2021
## 1484  y2021
## 1485  y2021
## 1486  y2021
## 1487  y2021
## 1488  y2021
## 1489  y2021
## 1490  y2021
## 1491  y2021
## 1492  y2021
## 1493  y2021
## 1494  y2021
## 1495  y2021
## 1496  y2021
## 1497  y2021
## 1498  y2021
## 1499  y2021
## 1500  y2021
## 1501  y2021
## 1502  y2021
## 1503  y2021
## 1504  y2021
## 1505  y2021
## 1506  y2021
## 1507  y2021
## 1508  y2021
## 1509  y2021
## 1510  y2021
## 1511  y2021
## 1512  y2021
## 1513  y2021
## 1514  y2021
## 1515  y2021
## 1516  y2021
## 1517  y2021
## 1518  y2021
## 1519  y2021
## 1520  y2021
## 1521  y2021
## 1522  y2021
## 1523  y2021
## 1524  y2021
## 1525  y2021
## 1526  y2021
## 1527  y2021
## 1528  y2022
## 1529  y2022
## 1530  y2022
## 1531  y2022
## 1532  y2022
## 1533  y2022
## 1534  y2022
## 1535  y2022
## 1536  y2022
## 1537  y2022
## 1538  y2022
## 1539  y2022
## 1540  y2022
## 1541  y2022
## 1542  y2022
## 1543  y2022
## 1544  y2022
## 1545  y2022
## 1546  y2022
## 1547  y2022
## 1548  y2022
## 1549  y2022
## 1550  y2022
## 1551  y2022
## 1552  y2022
## 1553  y2022
## 1554  y2022
## 1555  y2022
## 1556  y2022
## 1557  y2022
## 1558  y2022
## 1559  y2022
## 1560  y2022
## 1561  y2022
## 1562  y2020
## 1563  y2020
## 1564  y2020
## 1565  y2020
## 1566  y2020
## 1567  y2020
## 1568  y2020
## 1569  y2020
## 1570  y2020
## 1571  y2020
## 1572  y2020
## 1573  y2020
## 1574  y2020
## 1575  y2020
## 1576  y2020
## 1577  y2020
## 1578  y2020
## 1579  y2020
## 1580  y2020
## 1581  y2020
## 1582  y2020
## 1583  y2020
## 1584  y2020
## 1585  y2020
## 1586  y2020
## 1587  y2020
## 1588  y2020
## 1589  y2020
## 1590  y2020
## 1591  y2020
## 1592  y2020
## 1593  y2020
## 1594  y2020
## 1595  y2020
## 1596  y2020
## 1597  y2020
## 1598  y2020
## 1599  y2020
## 1600  y2020
## 1601  y2020
## 1602  y2020
## 1603  y2020
## 1604  y2020
## 1605  y2020
## 1606  y2020
## 1607  y2020
## 1608  y2020
## 1609  y2020
## 1610  y2020
## 1611  y2020
## 1612  y2020
## 1613  y2020
## 1614  y2020
## 1615  y2020
## 1616  y2020
## 1617  y2020
## 1618  y2020
## 1619  y2020
## 1620  y2020
## 1621  y2020
## 1622  y2020
## 1623  y2020
## 1624  y2020
## 1625  y2020
## 1626  y2020
## 1627  y2020
## 1628  y2020
## 1629  y2020
## 1630  y2020
## 1631  y2020
## 1632  y2020
## 1633  y2020
## 1634  y2020
## 1635  y2020
## 1636  y2020
## 1637  y2020
## 1638  y2020
## 1639  y2020
## 1640  y2020
## 1641  y2020
## 1642  y2020
## 1643  y2020
## 1644  y2020
## 1645  y2020
## 1646  y2020
## 1647  y2020
## 1648  y2020
## 1649  y2020
## 1650  y2020
## 1651  y2020
## 1652  y2020
## 1653  y2020
## 1654  y2020
## 1655  y2020
## 1656  y2020
## 1657  y2020
## 1658  y2020
## 1659  y2020
## 1660  y2020
## 1661  y2020
## 1662  y2020
## 1663  y2020
## 1664  y2020
## 1665  y2020
## 1666  y2020
## 1667  y2020
## 1668  y2020
## 1669  y2020
## 1670  y2020
## 1671  y2020
## 1672  y2020
## 1673  y2020
## 1674  y2020
## 1675  y2020
## 1676  y2020
## 1677  y2020
## 1678  y2020
## 1679  y2020
## 1680  y2020
## 1681  y2020
## 1682  y2020
## 1683  y2020
## 1684  y2020
## 1685  y2020
## 1686  y2020
## 1687  y2020
## 1688  y2020
## 1689  y2020
## 1690  y2020
## 1691  y2020
## 1692  y2020
## 1693  y2020
## 1694  y2020
## 1695  y2020
## 1696  y2021
## 1697  y2021
## 1698  y2021
## 1699  y2021
## 1700  y2021
## 1701  y2021
## 1702  y2021
## 1703  y2021
## 1704  y2021
## 1705  y2021
## 1706  y2021
## 1707  y2021
## 1708  y2021
## 1709  y2021
## 1710  y2021
## 1711  y2021
## 1712  y2021
## 1713  y2021
## 1714  y2021
## 1715  y2021
## 1716  y2021
## 1717  y2021
## 1718  y2021
## 1719  y2021
## 1720  y2021
## 1721  y2021
## 1722  y2021
## 1723  y2021
## 1724  y2021
## 1725  y2021
## 1726  y2021
## 1727  y2021
## 1728  y2021
## 1729  y2021
## 1730  y2021
## 1731  y2021
## 1732  y2021
## 1733  y2021
## 1734  y2021
## 1735  y2021
## 1736  y2021
## 1737  y2021
## 1738  y2021
## 1739  y2021
## 1740  y2021
## 1741  y2021
## 1742  y2021
## 1743  y2021
## 1744  y2021
## 1745  y2021
## 1746  y2021
## 1747  y2021
## 1748  y2021
## 1749  y2021
## 1750  y2021
## 1751  y2021
## 1752  y2021
## 1753  y2021
## 1754  y2021
## 1755  y2021
## 1756  y2021
## 1757  y2021
## 1758  y2021
## 1759  y2021
## 1760  y2021
## 1761  y2021
## 1762  y2021
## 1763  y2021
## 1764  y2021
## 1765  y2021
## 1766  y2021
## 1767  y2021
## 1768  y2021
## 1769  y2021
## 1770  y2021
## 1771  y2021
## 1772  y2022
## 1773  y2022
## 1774  y2022
## 1775  y2022
## 1776  y2022
## 1777  y2022
## 1778  y2022
## 1779  y2022
## 1780  y2022
## 1781  y2022
## 1782  y2022
## 1783  y2022
## 1784  y2022
## 1785  y2022
## 1786  y2022
## 1787  y2022
## 1788  y2022
## 1789  y2022
## 1790  y2022
## 1791  y2022
## 1792  y2022
## 1793  y2022
## 1794  y2022
## 1795  y2022
## 1796  y2022
## 1797  y2022
## 1798  y2022
## 1799  y2022
## 1800  y2022
## 1801  y2022
## 1802  y2022
## 1803  y2022
## 1804  y2022
## 1805  y2022
## 1806  y2022
## 1807  y2022
## 1808  y2022
## 1809  y2022
## 1810  y2022
## 1811  y2022
## 1812  y2022
## 1813  y2022
## 1814  y2022
## 1815  y2022
## 1816  y2022
## 1817  y2022
## 1818  y2022
## 1819  y2022
## 1820  y2022
## 1821  y2022
## 1822  y2022
## 1823  y2022
## 1824  y2022
## 1825  y2020
## 1826  y2020
## 1827  y2020
## 1828  y2020
## 1829  y2020
## 1830  y2020
## 1831  y2020
## 1832  y2020
## 1833  y2020
## 1834  y2020
## 1835  y2020
## 1836  y2020
## 1837  y2020
## 1838  y2020
## 1839  y2020
## 1840  y2020
## 1841  y2020
## 1842  y2020
## 1843  y2020
## 1844  y2020
## 1845  y2020
## 1846  y2020
## 1847  y2020
## 1848  y2020
## 1849  y2020
## 1850  y2020
## 1851  y2020
## 1852  y2020
## 1853  y2020
## 1854  y2020
## 1855  y2020
## 1856  y2020
## 1857  y2020
## 1858  y2020
## 1859  y2020
## 1860  y2020
## 1861  y2020
## 1862  y2020
## 1863  y2020
## 1864  y2020
## 1865  y2020
## 1866  y2020
## 1867  y2020
## 1868  y2020
## 1869  y2020
## 1870  y2020
## 1871  y2020
## 1872  y2020
## 1873  y2020
## 1874  y2020
## 1875  y2020
## 1876  y2020
## 1877  y2020
## 1878  y2020
## 1879  y2020
## 1880  y2020
## 1881  y2020
## 1882  y2020
## 1883  y2020
## 1884  y2020
## 1885  y2020
## 1886  y2020
## 1887  y2020
## 1888  y2020
## 1889  y2020
## 1890  y2020
## 1891  y2020
## 1892  y2020
## 1893  y2020
## 1894  y2020
## 1895  y2020
## 1896  y2020
## 1897  y2020
## 1898  y2020
## 1899  y2020
## 1900  y2020
## 1901  y2020
## 1902  y2020
## 1903  y2020
## 1904  y2020
## 1905  y2020
## 1906  y2020
## 1907  y2020
## 1908  y2020
## 1909  y2020
## 1910  y2020
## 1911  y2020
## 1912  y2020
## 1913  y2020
## 1914  y2020
## 1915  y2020
## 1916  y2020
## 1917  y2020
## 1918  y2020
## 1919  y2020
## 1920  y2020
## 1921  y2020
## 1922  y2020
## 1923  y2020
## 1924  y2020
## 1925  y2020
## 1926  y2020
## 1927  y2020
## 1928  y2020
## 1929  y2020
## 1930  y2020
## 1931  y2020
## 1932  y2020
## 1933  y2020
## 1934  y2020
## 1935  y2020
## 1936  y2020
## 1937  y2020
## 1938  y2020
## 1939  y2020
## 1940  y2020
## 1941  y2020
## 1942  y2020
## 1943  y2020
## 1944  y2020
## 1945  y2020
## 1946  y2020
## 1947  y2020
## 1948  y2020
## 1949  y2020
## 1950  y2020
## 1951  y2020
## 1952  y2020
## 1953  y2020
## 1954  y2020
## 1955  y2020
## 1956  y2020
## 1957  y2020
## 1958  y2020
## 1959  y2020
## 1960  y2020
## 1961  y2020
## 1962  y2020
## 1963  y2020
## 1964  y2020
## 1965  y2020
## 1966  y2020
## 1967  y2020
## 1968  y2020
## 1969  y2020
## 1970  y2020
## 1971  y2020
## 1972  y2020
## 1973  y2020
## 1974  y2020
## 1975  y2020
## 1976  y2020
## 1977  y2020
## 1978  y2020
## 1979  y2020
## 1980  y2020
## 1981  y2020
## 1982  y2020
## 1983  y2020
## 1984  y2020
## 1985  y2020
## 1986  y2020
## 1987  y2020
## 1988  y2020
## 1989  y2020
## 1990  y2020
## 1991  y2020
## 1992  y2020
## 1993  y2020
## 1994  y2021
## 1995  y2021
## 1996  y2021
## 1997  y2021
## 1998  y2021
## 1999  y2021
## 2000  y2021
## 2001  y2021
## 2002  y2021
## 2003  y2021
## 2004  y2021
## 2005  y2021
## 2006  y2021
## 2007  y2021
## 2008  y2021
## 2009  y2021
## 2010  y2021
## 2011  y2021
## 2012  y2021
## 2013  y2021
## 2014  y2021
## 2015  y2021
## 2016  y2021
## 2017  y2021
## 2018  y2021
## 2019  y2021
## 2020  y2021
## 2021  y2021
## 2022  y2021
## 2023  y2021
## 2024  y2021
## 2025  y2021
## 2026  y2021
## 2027  y2021
## 2028  y2021
## 2029  y2021
## 2030  y2021
## 2031  y2021
## 2032  y2021
## 2033  y2021
## 2034  y2021
## 2035  y2021
## 2036  y2021
## 2037  y2021
## 2038  y2021
## 2039  y2021
## 2040  y2021
## 2041  y2021
## 2042  y2021
## 2043  y2021
## 2044  y2021
## 2045  y2021
## 2046  y2021
## 2047  y2021
## 2048  y2021
## 2049  y2021
## 2050  y2021
## 2051  y2021
## 2052  y2021
## 2053  y2021
## 2054  y2021
## 2055  y2021
## 2056  y2021
## 2057  y2021
## 2058  y2021
## 2059  y2021
## 2060  y2021
## 2061  y2021
## 2062  y2021
## 2063  y2021
## 2064  y2021
## 2065  y2021
## 2066  y2021
## 2067  y2021
## 2068  y2021
## 2069  y2021
## 2070  y2021
## 2071  y2021
## 2072  y2021
## 2073  y2021
## 2074  y2021
## 2075  y2021
## 2076  y2021
## 2077  y2021
## 2078  y2021
## 2079  y2021
## 2080  y2021
## 2081  y2021
## 2082  y2021
## 2083  y2021
## 2084  y2021
## 2085  y2021
## 2086  y2021
## 2087  y2021
## 2088  y2021
## 2089  y2021
## 2090  y2021
## 2091  y2021
## 2092  y2021
## 2093  y2021
## 2094  y2021
## 2095  y2021
## 2096  y2021
## 2097  y2022
## 2098  y2022
## 2099  y2022
## 2100  y2022
## 2101  y2022
## 2102  y2022
## 2103  y2022
## 2104  y2022
## 2105  y2022
## 2106  y2022
## 2107  y2022
## 2108  y2022
## 2109  y2022
## 2110  y2022
## 2111  y2022
## 2112  y2022
## 2113  y2022
## 2114  y2022
## 2115  y2022
## 2116  y2022
## 2117  y2022
## 2118  y2022
## 2119  y2022
## 2120  y2022
## 2121  y2022
## 2122  y2022
## 2123  y2022
## 2124  y2022
## 2125  y2022
## 2126  y2022
## 2127  y2022
## 2128  y2022
## 2129  y2022
## 2130  y2022
## 2131  y2022
## 2132  y2022
## 2133  y2022
## 2134  y2022
## 2135  y2022
## 2136  y2022
## 2137  y2022
## 2138  y2022
## 2139  y2022
## 2140  y2022
## 2141  y2022
## 2142  y2022
## 2143  y2022
## 2144  y2022
## 2145  y2022
## 2146  y2022
## 2147  y2022
## 2148  y2022
## 2149  y2022
## 2150  y2022
## 2151  y2022
## 2152  y2022
## 2153  y2022
## 2154  y2022
## 2155  y2022
## 2156  y2022
## 2157  y2022
## 2158  y2022
## 2159  y2022
## 2160  y2022
## 2161  y2022
## 2162  y2022
## 2163  y2020
## 2164  y2020
## 2165  y2020
## 2166  y2020
## 2167  y2020
## 2168  y2020
## 2169  y2020
## 2170  y2020
## 2171  y2020
## 2172  y2020
## 2173  y2020
## 2174  y2020
## 2175  y2020
## 2176  y2020
## 2177  y2020
## 2178  y2020
## 2179  y2020
## 2180  y2020
## 2181  y2020
## 2182  y2020
## 2183  y2020
## 2184  y2020
## 2185  y2020
## 2186  y2020
## 2187  y2020
## 2188  y2020
## 2189  y2020
## 2190  y2020
## 2191  y2020
## 2192  y2020
## 2193  y2020
## 2194  y2020
## 2195  y2020
## 2196  y2020
## 2197  y2020
## 2198  y2020
## 2199  y2020
## 2200  y2020
## 2201  y2020
## 2202  y2020
## 2203  y2020
## 2204  y2020
## 2205  y2020
## 2206  y2020
## 2207  y2020
## 2208  y2020
## 2209  y2020
## 2210  y2020
## 2211  y2020
## 2212  y2020
## 2213  y2020
## 2214  y2020
## 2215  y2020
## 2216  y2020
## 2217  y2020
## 2218  y2020
## 2219  y2020
## 2220  y2020
## 2221  y2020
## 2222  y2020
## 2223  y2020
## 2224  y2020
## 2225  y2020
## 2226  y2020
## 2227  y2020
## 2228  y2020
## 2229  y2020
## 2230  y2020
## 2231  y2020
## 2232  y2020
## 2233  y2020
## 2234  y2020
## 2235  y2020
## 2236  y2020
## 2237  y2020
## 2238  y2020
## 2239  y2020
## 2240  y2020
## 2241  y2020
## 2242  y2020
## 2243  y2020
## 2244  y2020
## 2245  y2020
## 2246  y2020
## 2247  y2020
## 2248  y2020
## 2249  y2020
## 2250  y2020
## 2251  y2020
## 2252  y2020
## 2253  y2020
## 2254  y2020
## 2255  y2020
## 2256  y2020
## 2257  y2020
## 2258  y2020
## 2259  y2020
## 2260  y2020
## 2261  y2020
## 2262  y2020
## 2263  y2020
## 2264  y2020
## 2265  y2020
## 2266  y2020
## 2267  y2020
## 2268  y2020
## 2269  y2020
## 2270  y2020
## 2271  y2020
## 2272  y2020
## 2273  y2020
## 2274  y2020
## 2275  y2020
## 2276  y2020
## 2277  y2020
## 2278  y2020
## 2279  y2020
## 2280  y2020
## 2281  y2020
## 2282  y2020
## 2283  y2020
## 2284  y2020
## 2285  y2020
## 2286  y2020
## 2287  y2020
## 2288  y2020
## 2289  y2020
## 2290  y2020
## 2291  y2020
## 2292  y2020
## 2293  y2020
## 2294  y2020
## 2295  y2020
## 2296  y2020
## 2297  y2020
## 2298  y2020
## 2299  y2020
## 2300  y2020
## 2301  y2020
## 2302  y2020
## 2303  y2020
## 2304  y2020
## 2305  y2020
## 2306  y2020
## 2307  y2020
## 2308  y2020
## 2309  y2020
## 2310  y2020
## 2311  y2020
## 2312  y2020
## 2313  y2020
## 2314  y2020
## 2315  y2020
## 2316  y2020
## 2317  y2020
## 2318  y2020
## 2319  y2020
## 2320  y2020
## 2321  y2020
## 2322  y2020
## 2323  y2020
## 2324  y2020
## 2325  y2020
## 2326  y2020
## 2327  y2020
## 2328  y2020
## 2329  y2020
## 2330  y2020
## 2331  y2020
## 2332  y2020
## 2333  y2020
## 2334  y2020
## 2335  y2020
## 2336  y2020
## 2337  y2020
## 2338  y2020
## 2339  y2020
## 2340  y2020
## 2341  y2020
## 2342  y2020
## 2343  y2020
## 2344  y2020
## 2345  y2020
## 2346  y2020
## 2347  y2020
## 2348  y2020
## 2349  y2020
## 2350  y2020
## 2351  y2020
## 2352  y2020
## 2353  y2020
## 2354  y2020
## 2355  y2020
## 2356  y2020
## 2357  y2020
## 2358  y2020
## 2359  y2020
## 2360  y2020
## 2361  y2020
## 2362  y2020
## 2363  y2020
## 2364  y2020
## 2365  y2020
## 2366  y2020
## 2367  y2020
## 2368  y2020
## 2369  y2020
## 2370  y2020
## 2371  y2020
## 2372  y2020
## 2373  y2020
## 2374  y2020
## 2375  y2020
## 2376  y2020
## 2377  y2020
## 2378  y2020
## 2379  y2020
## 2380  y2020
## 2381  y2020
## 2382  y2020
## 2383  y2020
## 2384  y2020
## 2385  y2020
## 2386  y2020
## 2387  y2020
## 2388  y2020
## 2389  y2020
## 2390  y2020
## 2391  y2020
## 2392  y2021
## 2393  y2021
## 2394  y2021
## 2395  y2021
## 2396  y2021
## 2397  y2021
## 2398  y2021
## 2399  y2021
## 2400  y2021
## 2401  y2021
## 2402  y2021
## 2403  y2021
## 2404  y2021
## 2405  y2021
## 2406  y2021
## 2407  y2021
## 2408  y2021
## 2409  y2021
## 2410  y2021
## 2411  y2021
## 2412  y2021
## 2413  y2021
## 2414  y2021
## 2415  y2021
## 2416  y2021
## 2417  y2021
## 2418  y2021
## 2419  y2021
## 2420  y2021
## 2421  y2021
## 2422  y2021
## 2423  y2021
## 2424  y2021
## 2425  y2021
## 2426  y2021
## 2427  y2021
## 2428  y2021
## 2429  y2021
## 2430  y2021
## 2431  y2021
## 2432  y2021
## 2433  y2021
## 2434  y2021
## 2435  y2021
## 2436  y2021
## 2437  y2021
## 2438  y2021
## 2439  y2021
## 2440  y2021
## 2441  y2021
## 2442  y2021
## 2443  y2021
## 2444  y2021
## 2445  y2021
## 2446  y2021
## 2447  y2021
## 2448  y2021
## 2449  y2021
## 2450  y2021
## 2451  y2021
## 2452  y2021
## 2453  y2021
## 2454  y2021
## 2455  y2021
## 2456  y2021
## 2457  y2021
## 2458  y2021
## 2459  y2021
## 2460  y2021
## 2461  y2021
## 2462  y2021
## 2463  y2021
## 2464  y2021
## 2465  y2021
## 2466  y2021
## 2467  y2021
## 2468  y2021
## 2469  y2021
## 2470  y2021
## 2471  y2021
## 2472  y2021
## 2473  y2021
## 2474  y2021
## 2475  y2021
## 2476  y2021
## 2477  y2021
## 2478  y2021
## 2479  y2021
## 2480  y2021
## 2481  y2021
## 2482  y2021
## 2483  y2021
## 2484  y2021
## 2485  y2021
## 2486  y2021
## 2487  y2021
## 2488  y2021
## 2489  y2021
## 2490  y2021
## 2491  y2021
## 2492  y2021
## 2493  y2021
## 2494  y2021
## 2495  y2021
## 2496  y2021
## 2497  y2021
## 2498  y2021
## 2499  y2021
## 2500  y2021
## 2501  y2021
## 2502  y2021
## 2503  y2021
## 2504  y2021
## 2505  y2021
## 2506  y2021
## 2507  y2021
## 2508  y2021
## 2509  y2021
## 2510  y2021
## 2511  y2021
## 2512  y2021
## 2513  y2021
## 2514  y2021
## 2515  y2021
## 2516  y2021
## 2517  y2021
## 2518  y2021
## 2519  y2021
## 2520  y2021
## 2521  y2021
## 2522  y2021
## 2523  y2021
## 2524  y2021
## 2525  y2021
## 2526  y2021
## 2527  y2021
## 2528  y2021
## 2529  y2021
## 2530  y2021
## 2531  y2021
## 2532  y2021
## 2533  y2021
## 2534  y2021
## 2535  y2021
## 2536  y2021
## 2537  y2021
## 2538  y2021
## 2539  y2021
## 2540  y2021
## 2541  y2022
## 2542  y2022
## 2543  y2022
## 2544  y2022
## 2545  y2022
## 2546  y2022
## 2547  y2022
## 2548  y2022
## 2549  y2022
## 2550  y2022
## 2551  y2022
## 2552  y2022
## 2553  y2022
## 2554  y2022
## 2555  y2022
## 2556  y2022
## 2557  y2022
## 2558  y2022
## 2559  y2022
## 2560  y2022
## 2561  y2022
## 2562  y2022
## 2563  y2022
## 2564  y2022
## 2565  y2022
## 2566  y2022
## 2567  y2022
## 2568  y2022
## 2569  y2022
## 2570  y2022
## 2571  y2022
## 2572  y2022
## 2573  y2022
## 2574  y2022
## 2575  y2022
## 2576  y2022
## 2577  y2022
## 2578  y2022
## 2579  y2022
## 2580  y2022
## 2581  y2022
## 2582  y2022
## 2583  y2022
## 2584  y2022
## 2585  y2022
## 2586  y2022
## 2587  y2022
## 2588  y2022
## 2589  y2022
## 2590  y2022
## 2591  y2022
## 2592  y2022
## 2593  y2022
## 2594  y2022
## 2595  y2022
## 2596  y2022
## 2597  y2022
## 2598  y2022
## 2599  y2022
## 2600  y2022
## 2601  y2022
## 2602  y2022
## 2603  y2022
## 2604  y2022
## 2605  y2022
## 2606  y2022
## 2607  y2022
## 2608  y2022
## 2609  y2022
## 2610  y2022
## 2611  y2022
## 2612  y2022
## 2613  y2022
## 2614  y2022
## 2615  y2022
## 2616  y2022
## 2617  y2022
## 2618  y2022
## 2619  y2022
## 2620  y2022
## 2621  y2022
## 2622  y2022
## 2623  y2022
## 2624  y2022
## 2625  y2022
## 2626  y2022
## 2627  y2022
## 2628  y2022
## 2629  y2022
## 2630  y2022
## 2631  y2022
## 2632  y2022
## 2633  y2022
## 2634  y2022
## 2635  y2022
## 2636  y2022
## 2637  y2022
## 2638  y2022
## 2639  y2022
## 2640  y2020
## 2641  y2020
## 2642  y2020
## 2643  y2020
## 2644  y2020
## 2645  y2020
## 2646  y2020
## 2647  y2020
## 2648  y2020
## 2649  y2020
## 2650  y2020
## 2651  y2020
## 2652  y2020
## 2653  y2020
## 2654  y2020
## 2655  y2020
## 2656  y2020
## 2657  y2020
## 2658  y2020
## 2659  y2020
## 2660  y2020
## 2661  y2020
## 2662  y2020
## 2663  y2020
## 2664  y2020
## 2665  y2020
## 2666  y2020
## 2667  y2020
## 2668  y2020
## 2669  y2020
## 2670  y2020
## 2671  y2020
## 2672  y2020
## 2673  y2020
## 2674  y2020
## 2675  y2020
## 2676  y2020
## 2677  y2020
## 2678  y2020
## 2679  y2020
## 2680  y2020
## 2681  y2020
## 2682  y2020
## 2683  y2020
## 2684  y2020
## 2685  y2020
## 2686  y2020
## 2687  y2020
## 2688  y2020
## 2689  y2020
## 2690  y2020
## 2691  y2020
## 2692  y2020
## 2693  y2020
## 2694  y2020
## 2695  y2020
## 2696  y2020
## 2697  y2020
## 2698  y2020
## 2699  y2020
## 2700  y2020
## 2701  y2020
## 2702  y2020
## 2703  y2020
## 2704  y2020
## 2705  y2020
## 2706  y2020
## 2707  y2020
## 2708  y2020
## 2709  y2020
## 2710  y2020
## 2711  y2020
## 2712  y2020
## 2713  y2020
## 2714  y2020
## 2715  y2020
## 2716  y2020
## 2717  y2020
## 2718  y2020
## 2719  y2020
## 2720  y2020
## 2721  y2020
## 2722  y2020
## 2723  y2020
## 2724  y2020
## 2725  y2020
## 2726  y2020
## 2727  y2020
## 2728  y2020
## 2729  y2020
## 2730  y2020
## 2731  y2020
## 2732  y2020
## 2733  y2020
## 2734  y2020
## 2735  y2020
## 2736  y2020
## 2737  y2020
## 2738  y2020
## 2739  y2020
## 2740  y2020
## 2741  y2020
## 2742  y2020
## 2743  y2020
## 2744  y2020
## 2745  y2020
## 2746  y2020
## 2747  y2020
## 2748  y2020
## 2749  y2020
## 2750  y2020
## 2751  y2020
## 2752  y2020
## 2753  y2020
## 2754  y2020
## 2755  y2020
## 2756  y2020
## 2757  y2020
## 2758  y2020
## 2759  y2020
## 2760  y2020
## 2761  y2020
## 2762  y2020
## 2763  y2020
## 2764  y2020
## 2765  y2020
## 2766  y2020
## 2767  y2020
## 2768  y2020
## 2769  y2020
## 2770  y2020
## 2771  y2020
## 2772  y2020
## 2773  y2020
## 2774  y2020
## 2775  y2020
## 2776  y2020
## 2777  y2020
## 2778  y2020
## 2779  y2020
## 2780  y2020
## 2781  y2020
## 2782  y2020
## 2783  y2020
## 2784  y2020
## 2785  y2020
## 2786  y2020
## 2787  y2020
## 2788  y2020
## 2789  y2020
## 2790  y2020
## 2791  y2020
## 2792  y2020
## 2793  y2020
## 2794  y2020
## 2795  y2020
## 2796  y2020
## 2797  y2020
## 2798  y2020
## 2799  y2020
## 2800  y2020
## 2801  y2020
## 2802  y2020
## 2803  y2020
## 2804  y2020
## 2805  y2020
## 2806  y2020
## 2807  y2020
## 2808  y2020
## 2809  y2020
## 2810  y2020
## 2811  y2020
## 2812  y2020
## 2813  y2020
## 2814  y2020
## 2815  y2020
## 2816  y2020
## 2817  y2020
## 2818  y2020
## 2819  y2020
## 2820  y2020
## 2821  y2020
## 2822  y2020
## 2823  y2020
## 2824  y2020
## 2825  y2020
## 2826  y2020
## 2827  y2020
## 2828  y2020
## 2829  y2020
## 2830  y2020
## 2831  y2020
## 2832  y2020
## 2833  y2020
## 2834  y2020
## 2835  y2020
## 2836  y2020
## 2837  y2020
## 2838  y2020
## 2839  y2020
## 2840  y2020
## 2841  y2020
## 2842  y2020
## 2843  y2020
## 2844  y2020
## 2845  y2020
## 2846  y2020
## 2847  y2020
## 2848  y2020
## 2849  y2020
## 2850  y2020
## 2851  y2020
## 2852  y2020
## 2853  y2020
## 2854  y2020
## 2855  y2020
## 2856  y2020
## 2857  y2020
## 2858  y2020
## 2859  y2020
## 2860  y2020
## 2861  y2020
## 2862  y2020
## 2863  y2020
## 2864  y2020
## 2865  y2020
## 2866  y2020
## 2867  y2020
## 2868  y2020
## 2869  y2020
## 2870  y2020
## 2871  y2020
## 2872  y2020
## 2873  y2020
## 2874  y2020
## 2875  y2020
## 2876  y2020
## 2877  y2020
## 2878  y2020
## 2879  y2020
## 2880  y2020
## 2881  y2020
## 2882  y2020
## 2883  y2020
## 2884  y2020
## 2885  y2020
## 2886  y2020
## 2887  y2020
## 2888  y2020
## 2889  y2020
## 2890  y2020
## 2891  y2020
## 2892  y2020
## 2893  y2020
## 2894  y2020
## 2895  y2020
## 2896  y2020
## 2897  y2020
## 2898  y2020
## 2899  y2020
## 2900  y2020
## 2901  y2020
## 2902  y2020
## 2903  y2020
## 2904  y2020
## 2905  y2020
## 2906  y2020
## 2907  y2020
## 2908  y2020
## 2909  y2020
## 2910  y2020
## 2911  y2020
## 2912  y2020
## 2913  y2020
## 2914  y2020
## 2915  y2020
## 2916  y2020
## 2917  y2020
## 2918  y2020
## 2919  y2020
## 2920  y2020
## 2921  y2020
## 2922  y2020
## 2923  y2020
## 2924  y2020
## 2925  y2020
## 2926  y2020
## 2927  y2020
## 2928  y2020
## 2929  y2020
## 2930  y2020
## 2931  y2020
## 2932  y2020
## 2933  y2020
## 2934  y2020
## 2935  y2020
## 2936  y2020
## 2937  y2020
## 2938  y2020
## 2939  y2020
## 2940  y2020
## 2941  y2020
## 2942  y2020
## 2943  y2020
## 2944  y2020
## 2945  y2020
## 2946  y2020
## 2947  y2020
## 2948  y2020
## 2949  y2020
## 2950  y2020
## 2951  y2020
## 2952  y2020
## 2953  y2020
## 2954  y2020
## 2955  y2020
## 2956  y2020
## 2957  y2020
## 2958  y2020
## 2959  y2020
## 2960  y2021
## 2961  y2021
## 2962  y2021
## 2963  y2021
## 2964  y2021
## 2965  y2021
## 2966  y2021
## 2967  y2021
## 2968  y2021
## 2969  y2021
## 2970  y2021
## 2971  y2021
## 2972  y2021
## 2973  y2021
## 2974  y2021
## 2975  y2021
## 2976  y2021
## 2977  y2021
## 2978  y2021
## 2979  y2021
## 2980  y2021
## 2981  y2021
## 2982  y2021
## 2983  y2021
## 2984  y2021
## 2985  y2021
## 2986  y2021
## 2987  y2021
## 2988  y2021
## 2989  y2021
## 2990  y2021
## 2991  y2021
## 2992  y2021
## 2993  y2021
## 2994  y2021
## 2995  y2021
## 2996  y2021
## 2997  y2021
## 2998  y2021
## 2999  y2021
## 3000  y2021
## 3001  y2021
## 3002  y2021
## 3003  y2021
## 3004  y2021
## 3005  y2021
## 3006  y2021
## 3007  y2021
## 3008  y2021
## 3009  y2021
## 3010  y2021
## 3011  y2021
## 3012  y2021
## 3013  y2021
## 3014  y2021
## 3015  y2021
## 3016  y2021
## 3017  y2021
## 3018  y2021
## 3019  y2021
## 3020  y2021
## 3021  y2021
## 3022  y2021
## 3023  y2021
## 3024  y2021
## 3025  y2021
## 3026  y2021
## 3027  y2021
## 3028  y2021
## 3029  y2021
## 3030  y2021
## 3031  y2021
## 3032  y2021
## 3033  y2021
## 3034  y2021
## 3035  y2021
## 3036  y2021
## 3037  y2021
## 3038  y2021
## 3039  y2021
## 3040  y2021
## 3041  y2021
## 3042  y2021
## 3043  y2021
## 3044  y2021
## 3045  y2021
## 3046  y2021
## 3047  y2021
## 3048  y2021
## 3049  y2021
## 3050  y2021
## 3051  y2021
## 3052  y2021
## 3053  y2021
## 3054  y2021
## 3055  y2021
## 3056  y2021
## 3057  y2021
## 3058  y2021
## 3059  y2021
## 3060  y2021
## 3061  y2021
## 3062  y2021
## 3063  y2021
## 3064  y2021
## 3065  y2021
## 3066  y2021
## 3067  y2021
## 3068  y2021
## 3069  y2021
## 3070  y2021
## 3071  y2021
## 3072  y2021
## 3073  y2021
## 3074  y2021
## 3075  y2021
## 3076  y2021
## 3077  y2021
## 3078  y2021
## 3079  y2021
## 3080  y2021
## 3081  y2021
## 3082  y2021
## 3083  y2021
## 3084  y2021
## 3085  y2021
## 3086  y2021
## 3087  y2021
## 3088  y2021
## 3089  y2021
## 3090  y2021
## 3091  y2021
## 3092  y2021
## 3093  y2021
## 3094  y2021
## 3095  y2021
## 3096  y2021
## 3097  y2021
## 3098  y2021
## 3099  y2021
## 3100  y2021
## 3101  y2021
## 3102  y2021
## 3103  y2021
## 3104  y2021
## 3105  y2021
## 3106  y2021
## 3107  y2021
## 3108  y2021
## 3109  y2021
## 3110  y2021
## 3111  y2021
## 3112  y2021
## 3113  y2021
## 3114  y2021
## 3115  y2021
## 3116  y2021
## 3117  y2021
## 3118  y2021
## 3119  y2021
## 3120  y2021
## 3121  y2021
## 3122  y2021
## 3123  y2021
## 3124  y2021
## 3125  y2021
## 3126  y2021
## 3127  y2021
## 3128  y2021
## 3129  y2021
## 3130  y2021
## 3131  y2021
## 3132  y2021
## 3133  y2021
## 3134  y2021
## 3135  y2021
## 3136  y2021
## 3137  y2021
## 3138  y2021
## 3139  y2021
## 3140  y2021
## 3141  y2021
## 3142  y2021
## 3143  y2021
## 3144  y2021
## 3145  y2021
## 3146  y2021
## 3147  y2021
## 3148  y2021
## 3149  y2021
## 3150  y2021
## 3151  y2021
## 3152  y2021
## 3153  y2021
## 3154  y2021
## 3155  y2021
## 3156  y2021
## 3157  y2021
## 3158  y2021
## 3159  y2021
## 3160  y2021
## 3161  y2021
## 3162  y2021
## 3163  y2021
## 3164  y2021
## 3165  y2021
## 3166  y2021
## 3167  y2021
## 3168  y2021
## 3169  y2021
## 3170  y2021
## 3171  y2021
## 3172  y2021
## 3173  y2021
## 3174  y2021
## 3175  y2021
## 3176  y2021
## 3177  y2021
## 3178  y2021
## 3179  y2021
## 3180  y2021
## 3181  y2021
## 3182  y2021
## 3183  y2022
## 3184  y2022
## 3185  y2022
## 3186  y2022
## 3187  y2022
## 3188  y2022
## 3189  y2022
## 3190  y2022
## 3191  y2022
## 3192  y2022
## 3193  y2022
## 3194  y2022
## 3195  y2022
## 3196  y2022
## 3197  y2022
## 3198  y2022
## 3199  y2022
## 3200  y2022
## 3201  y2022
## 3202  y2022
## 3203  y2022
## 3204  y2022
## 3205  y2022
## 3206  y2022
## 3207  y2022
## 3208  y2022
## 3209  y2022
## 3210  y2022
## 3211  y2022
## 3212  y2022
## 3213  y2022
## 3214  y2022
## 3215  y2022
## 3216  y2022
## 3217  y2022
## 3218  y2022
## 3219  y2022
## 3220  y2022
## 3221  y2022
## 3222  y2022
## 3223  y2022
## 3224  y2022
## 3225  y2022
## 3226  y2022
## 3227  y2022
## 3228  y2022
## 3229  y2022
## 3230  y2022
## 3231  y2022
## 3232  y2022
## 3233  y2022
## 3234  y2022
## 3235  y2022
## 3236  y2022
## 3237  y2022
## 3238  y2022
## 3239  y2022
## 3240  y2022
## 3241  y2022
## 3242  y2022
## 3243  y2022
## 3244  y2022
## 3245  y2022
## 3246  y2022
## 3247  y2022
## 3248  y2022
## 3249  y2022
## 3250  y2022
## 3251  y2022
## 3252  y2022
## 3253  y2022
## 3254  y2022
## 3255  y2022
## 3256  y2022
## 3257  y2022
## 3258  y2022
## 3259  y2022
## 3260  y2022
## 3261  y2022
## 3262  y2022
## 3263  y2022
## 3264  y2022
## 3265  y2022
## 3266  y2022
## 3267  y2022
## 3268  y2022
## 3269  y2022
## 3270  y2022
## 3271  y2022
## 3272  y2022
## 3273  y2022
## 3274  y2022
## 3275  y2022
## 3276  y2022
## 3277  y2022
## 3278  y2022
## 3279  y2022
## 3280  y2022
## 3281  y2022
## 3282  y2022
## 3283  y2022
## 3284  y2022
## 3285  y2022
## 3286  y2022
## 3287  y2022
## 3288  y2022
## 3289  y2022
## 3290  y2022
## 3291  y2022
## 3292  y2022
## 3293  y2020
## 3294  y2020
## 3295  y2020
## 3296  y2020
## 3297  y2020
## 3298  y2020
## 3299  y2020
## 3300  y2020
## 3301  y2020
## 3302  y2020
## 3303  y2020
## 3304  y2020
## 3305  y2020
## 3306  y2020
## 3307  y2020
## 3308  y2020
## 3309  y2020
## 3310  y2020
## 3311  y2020
## 3312  y2020
## 3313  y2020
## 3314  y2020
## 3315  y2020
## 3316  y2020
## 3317  y2020
## 3318  y2020
## 3319  y2020
## 3320  y2020
## 3321  y2020
## 3322  y2020
## 3323  y2020
## 3324  y2020
## 3325  y2020
## 3326  y2020
## 3327  y2020
## 3328  y2020
## 3329  y2020
## 3330  y2020
## 3331  y2020
## 3332  y2020
## 3333  y2020
## 3334  y2020
## 3335  y2020
## 3336  y2020
## 3337  y2020
## 3338  y2020
## 3339  y2020
## 3340  y2020
## 3341  y2020
## 3342  y2020
## 3343  y2020
## 3344  y2020
## 3345  y2020
## 3346  y2020
## 3347  y2020
## 3348  y2020
## 3349  y2020
## 3350  y2020
## 3351  y2020
## 3352  y2020
## 3353  y2020
## 3354  y2020
## 3355  y2020
## 3356  y2020
## 3357  y2020
## 3358  y2020
## 3359  y2020
## 3360  y2020
## 3361  y2020
## 3362  y2020
## 3363  y2020
## 3364  y2020
## 3365  y2020
## 3366  y2020
## 3367  y2020
## 3368  y2020
## 3369  y2020
## 3370  y2020
## 3371  y2020
## 3372  y2020
## 3373  y2020
## 3374  y2020
## 3375  y2020
## 3376  y2020
## 3377  y2020
## 3378  y2020
## 3379  y2020
## 3380  y2020
## 3381  y2020
## 3382  y2020
## 3383  y2020
## 3384  y2020
## 3385  y2020
## 3386  y2020
## 3387  y2020
## 3388  y2020
## 3389  y2020
## 3390  y2020
## 3391  y2020
## 3392  y2020
## 3393  y2020
## 3394  y2020
## 3395  y2020
## 3396  y2020
## 3397  y2020
## 3398  y2020
## 3399  y2020
## 3400  y2020
## 3401  y2020
## 3402  y2020
## 3403  y2020
## 3404  y2020
## 3405  y2020
## 3406  y2020
## 3407  y2020
## 3408  y2020
## 3409  y2020
## 3410  y2020
## 3411  y2020
## 3412  y2020
## 3413  y2020
## 3414  y2020
## 3415  y2020
## 3416  y2020
## 3417  y2020
## 3418  y2020
## 3419  y2020
## 3420  y2020
## 3421  y2020
## 3422  y2020
## 3423  y2020
## 3424  y2020
## 3425  y2020
## 3426  y2020
## 3427  y2020
## 3428  y2020
## 3429  y2020
## 3430  y2020
## 3431  y2020
## 3432  y2020
## 3433  y2020
## 3434  y2020
## 3435  y2020
## 3436  y2020
## 3437  y2020
## 3438  y2020
## 3439  y2020
## 3440  y2020
## 3441  y2020
## 3442  y2020
## 3443  y2020
## 3444  y2020
## 3445  y2020
## 3446  y2020
## 3447  y2020
## 3448  y2020
## 3449  y2020
## 3450  y2020
## 3451  y2020
## 3452  y2020
## 3453  y2020
## 3454  y2020
## 3455  y2020
## 3456  y2020
## 3457  y2020
## 3458  y2020
## 3459  y2020
## 3460  y2020
## 3461  y2020
## 3462  y2020
## 3463  y2020
## 3464  y2020
## 3465  y2020
## 3466  y2020
## 3467  y2020
## 3468  y2020
## 3469  y2020
## 3470  y2020
## 3471  y2020
## 3472  y2020
## 3473  y2020
## 3474  y2020
## 3475  y2020
## 3476  y2020
## 3477  y2020
## 3478  y2020
## 3479  y2020
## 3480  y2020
## 3481  y2020
## 3482  y2020
## 3483  y2020
## 3484  y2020
## 3485  y2020
## 3486  y2020
## 3487  y2020
## 3488  y2020
## 3489  y2020
## 3490  y2020
## 3491  y2020
## 3492  y2020
## 3493  y2020
## 3494  y2020
## 3495  y2020
## 3496  y2020
## 3497  y2020
## 3498  y2020
## 3499  y2020
## 3500  y2020
## 3501  y2020
## 3502  y2020
## 3503  y2020
## 3504  y2020
## 3505  y2020
## 3506  y2020
## 3507  y2020
## 3508  y2020
## 3509  y2020
## 3510  y2020
## 3511  y2020
## 3512  y2020
## 3513  y2020
## 3514  y2020
## 3515  y2020
## 3516  y2020
## 3517  y2020
## 3518  y2020
## 3519  y2020
## 3520  y2020
## 3521  y2020
## 3522  y2020
## 3523  y2020
## 3524  y2020
## 3525  y2020
## 3526  y2020
## 3527  y2020
## 3528  y2020
## 3529  y2020
## 3530  y2020
## 3531  y2020
## 3532  y2020
## 3533  y2020
## 3534  y2020
## 3535  y2020
## 3536  y2020
## 3537  y2020
## 3538  y2020
## 3539  y2020
## 3540  y2020
## 3541  y2020
## 3542  y2020
## 3543  y2020
## 3544  y2020
## 3545  y2020
## 3546  y2020
## 3547  y2020
## 3548  y2020
## 3549  y2020
## 3550  y2020
## 3551  y2020
## 3552  y2020
## 3553  y2020
## 3554  y2020
## 3555  y2020
## 3556  y2020
## 3557  y2020
## 3558  y2020
## 3559  y2020
## 3560  y2020
## 3561  y2020
## 3562  y2020
## 3563  y2020
## 3564  y2020
## 3565  y2020
## 3566  y2020
## 3567  y2020
## 3568  y2020
## 3569  y2020
## 3570  y2020
## 3571  y2020
## 3572  y2020
## 3573  y2020
## 3574  y2020
## 3575  y2020
## 3576  y2020
## 3577  y2020
## 3578  y2020
## 3579  y2020
## 3580  y2020
## 3581  y2020
## 3582  y2020
## 3583  y2020
## 3584  y2020
## 3585  y2020
## 3586  y2020
## 3587  y2020
## 3588  y2020
## 3589  y2020
## 3590  y2020
## 3591  y2020
## 3592  y2020
## 3593  y2020
## 3594  y2020
## 3595  y2020
## 3596  y2020
## 3597  y2020
## 3598  y2020
## 3599  y2020
## 3600  y2020
## 3601  y2020
## 3602  y2020
## 3603  y2020
## 3604  y2020
## 3605  y2020
## 3606  y2020
## 3607  y2020
## 3608  y2020
## 3609  y2020
## 3610  y2020
## 3611  y2020
## 3612  y2020
## 3613  y2020
## 3614  y2020
## 3615  y2020
## 3616  y2020
## 3617  y2020
## 3618  y2020
## 3619  y2020
## 3620  y2020
## 3621  y2020
## 3622  y2020
## 3623  y2020
## 3624  y2020
## 3625  y2020
## 3626  y2020
## 3627  y2020
## 3628  y2020
## 3629  y2020
## 3630  y2020
## 3631  y2020
## 3632  y2020
## 3633  y2020
## 3634  y2020
## 3635  y2020
## 3636  y2020
## 3637  y2020
## 3638  y2020
## 3639  y2020
## 3640  y2020
## 3641  y2020
## 3642  y2020
## 3643  y2020
## 3644  y2020
## 3645  y2020
## 3646  y2020
## 3647  y2020
## 3648  y2020
## 3649  y2020
## 3650  y2020
## 3651  y2020
## 3652  y2020
## 3653  y2020
## 3654  y2020
## 3655  y2020
## 3656  y2020
## 3657  y2020
## 3658  y2020
## 3659  y2020
## 3660  y2020
## 3661  y2020
## 3662  y2020
## 3663  y2020
## 3664  y2020
## 3665  y2020
## 3666  y2020
## 3667  y2020
## 3668  y2020
## 3669  y2020
## 3670  y2020
## 3671  y2020
## 3672  y2020
## 3673  y2020
## 3674  y2020
## 3675  y2020
## 3676  y2020
## 3677  y2020
## 3678  y2020
## 3679  y2020
## 3680  y2020
## 3681  y2020
## 3682  y2020
## 3683  y2020
## 3684  y2020
## 3685  y2020
## 3686  y2020
## 3687  y2020
## 3688  y2020
## 3689  y2020
## 3690  y2020
## 3691  y2020
## 3692  y2020
## 3693  y2020
## 3694  y2020
## 3695  y2020
## 3696  y2020
## 3697  y2020
## 3698  y2020
## 3699  y2020
## 3700  y2020
## 3701  y2020
## 3702  y2020
## 3703  y2020
## 3704  y2020
## 3705  y2020
## 3706  y2020
## 3707  y2020
## 3708  y2020
## 3709  y2020
## 3710  y2020
## 3711  y2020
## 3712  y2020
## 3713  y2020
## 3714  y2020
## 3715  y2020
## 3716  y2020
## 3717  y2020
## 3718  y2020
## 3719  y2020
## 3720  y2020
## 3721  y2020
## 3722  y2020
## 3723  y2020
## 3724  y2020
## 3725  y2020
## 3726  y2020
## 3727  y2020
## 3728  y2020
## 3729  y2020
## 3730  y2020
## 3731  y2020
## 3732  y2020
## 3733  y2020
## 3734  y2020
## 3735  y2020
## 3736  y2020
## 3737  y2020
## 3738  y2020
## 3739  y2020
## 3740  y2020
## 3741  y2020
## 3742  y2020
## 3743  y2020
## 3744  y2020
## 3745  y2020
## 3746  y2020
## 3747  y2020
## 3748  y2020
## 3749  y2020
## 3750  y2020
## 3751  y2020
## 3752  y2020
## 3753  y2020
## 3754  y2020
## 3755  y2020
## 3756  y2021
## 3757  y2021
## 3758  y2021
## 3759  y2021
## 3760  y2021
## 3761  y2021
## 3762  y2021
## 3763  y2021
## 3764  y2021
## 3765  y2021
## 3766  y2021
## 3767  y2021
## 3768  y2021
## 3769  y2021
## 3770  y2021
## 3771  y2021
## 3772  y2021
## 3773  y2021
## 3774  y2021
## 3775  y2021
## 3776  y2021
## 3777  y2021
## 3778  y2021
## 3779  y2021
## 3780  y2021
## 3781  y2021
## 3782  y2021
## 3783  y2021
## 3784  y2021
## 3785  y2021
## 3786  y2021
## 3787  y2021
## 3788  y2021
## 3789  y2021
## 3790  y2021
## 3791  y2021
## 3792  y2021
## 3793  y2021
## 3794  y2021
## 3795  y2021
## 3796  y2021
## 3797  y2021
## 3798  y2021
## 3799  y2021
## 3800  y2021
## 3801  y2021
## 3802  y2021
## 3803  y2021
## 3804  y2021
## 3805  y2021
## 3806  y2021
## 3807  y2021
## 3808  y2021
## 3809  y2021
## 3810  y2021
## 3811  y2021
## 3812  y2021
## 3813  y2021
## 3814  y2021
## 3815  y2021
## 3816  y2021
## 3817  y2021
## 3818  y2021
## 3819  y2021
## 3820  y2021
## 3821  y2021
## 3822  y2021
## 3823  y2021
## 3824  y2021
## 3825  y2021
## 3826  y2021
## 3827  y2021
## 3828  y2021
## 3829  y2021
## 3830  y2021
## 3831  y2021
## 3832  y2021
## 3833  y2021
## 3834  y2021
## 3835  y2021
## 3836  y2021
## 3837  y2021
## 3838  y2021
## 3839  y2021
## 3840  y2021
## 3841  y2021
## 3842  y2021
## 3843  y2021
## 3844  y2021
## 3845  y2021
## 3846  y2021
## 3847  y2021
## 3848  y2021
## 3849  y2021
## 3850  y2021
## 3851  y2021
## 3852  y2021
## 3853  y2021
## 3854  y2021
## 3855  y2021
## 3856  y2021
## 3857  y2021
## 3858  y2021
## 3859  y2021
## 3860  y2021
## 3861  y2021
## 3862  y2021
## 3863  y2021
## 3864  y2021
## 3865  y2021
## 3866  y2021
## 3867  y2021
## 3868  y2021
## 3869  y2021
## 3870  y2021
## 3871  y2021
## 3872  y2021
## 3873  y2021
## 3874  y2021
## 3875  y2021
## 3876  y2021
## 3877  y2021
## 3878  y2021
## 3879  y2021
## 3880  y2021
## 3881  y2021
## 3882  y2021
## 3883  y2021
## 3884  y2021
## 3885  y2021
## 3886  y2021
## 3887  y2021
## 3888  y2021
## 3889  y2021
## 3890  y2021
## 3891  y2021
## 3892  y2021
## 3893  y2021
## 3894  y2021
## 3895  y2021
## 3896  y2021
## 3897  y2021
## 3898  y2021
## 3899  y2021
## 3900  y2021
## 3901  y2021
## 3902  y2021
## 3903  y2021
## 3904  y2021
## 3905  y2021
## 3906  y2021
## 3907  y2021
## 3908  y2021
## 3909  y2021
## 3910  y2021
## 3911  y2021
## 3912  y2021
## 3913  y2021
## 3914  y2021
## 3915  y2021
## 3916  y2021
## 3917  y2021
## 3918  y2021
## 3919  y2021
## 3920  y2021
## 3921  y2021
## 3922  y2021
## 3923  y2021
## 3924  y2021
## 3925  y2021
## 3926  y2021
## 3927  y2021
## 3928  y2021
## 3929  y2021
## 3930  y2021
## 3931  y2021
## 3932  y2021
## 3933  y2021
## 3934  y2021
## 3935  y2021
## 3936  y2021
## 3937  y2021
## 3938  y2021
## 3939  y2021
## 3940  y2021
## 3941  y2021
## 3942  y2021
## 3943  y2021
## 3944  y2021
## 3945  y2021
## 3946  y2021
## 3947  y2021
## 3948  y2021
## 3949  y2021
## 3950  y2021
## 3951  y2021
## 3952  y2021
## 3953  y2021
## 3954  y2021
## 3955  y2021
## 3956  y2021
## 3957  y2021
## 3958  y2021
## 3959  y2021
## 3960  y2021
## 3961  y2021
## 3962  y2021
## 3963  y2021
## 3964  y2021
## 3965  y2021
## 3966  y2021
## 3967  y2021
## 3968  y2021
## 3969  y2021
## 3970  y2021
## 3971  y2021
## 3972  y2021
## 3973  y2021
## 3974  y2021
## 3975  y2021
## 3976  y2021
## 3977  y2021
## 3978  y2021
## 3979  y2021
## 3980  y2021
## 3981  y2021
## 3982  y2021
## 3983  y2021
## 3984  y2021
## 3985  y2021
## 3986  y2021
## 3987  y2021
## 3988  y2021
## 3989  y2021
## 3990  y2021
## 3991  y2021
## 3992  y2021
## 3993  y2021
## 3994  y2021
## 3995  y2021
## 3996  y2021
## 3997  y2021
## 3998  y2021
## 3999  y2021
## 4000  y2021
## 4001  y2021
## 4002  y2021
## 4003  y2021
## 4004  y2021
## 4005  y2021
## 4006  y2021
## 4007  y2021
## 4008  y2021
## 4009  y2021
## 4010  y2021
## 4011  y2021
## 4012  y2021
## 4013  y2021
## 4014  y2021
## 4015  y2021
## 4016  y2021
## 4017  y2021
## 4018  y2021
## 4019  y2021
## 4020  y2021
## 4021  y2021
## 4022  y2021
## 4023  y2021
## 4024  y2021
## 4025  y2021
## 4026  y2021
## 4027  y2021
## 4028  y2021
## 4029  y2021
## 4030  y2021
## 4031  y2021
## 4032  y2021
## 4033  y2021
## 4034  y2021
## 4035  y2021
## 4036  y2021
## 4037  y2021
## 4038  y2021
## 4039  y2021
## 4040  y2021
## 4041  y2021
## 4042  y2021
## 4043  y2021
## 4044  y2021
## 4045  y2021
## 4046  y2021
## 4047  y2021
## 4048  y2021
## 4049  y2021
## 4050  y2021
## 4051  y2021
## 4052  y2021
## 4053  y2021
## 4054  y2021
## 4055  y2021
## 4056  y2021
## 4057  y2021
## 4058  y2021
## 4059  y2021
## 4060  y2021
## 4061  y2021
## 4062  y2021
## 4063  y2021
## 4064  y2021
## 4065  y2021
## 4066  y2021
## 4067  y2021
## 4068  y2021
## 4069  y2021
## 4070  y2021
## 4071  y2021
## 4072  y2021
## 4073  y2021
## 4074  y2021
## 4075  y2021
## 4076  y2021
## 4077  y2021
## 4078  y2021
## 4079  y2021
## 4080  y2021
## 4081  y2021
## 4082  y2021
## 4083  y2021
## 4084  y2021
## 4085  y2021
## 4086  y2021
## 4087  y2021
## 4088  y2021
## 4089  y2021
## 4090  y2022
## 4091  y2022
## 4092  y2022
## 4093  y2022
## 4094  y2022
## 4095  y2022
## 4096  y2022
## 4097  y2022
## 4098  y2022
## 4099  y2022
## 4100  y2022
## 4101  y2022
## 4102  y2022
## 4103  y2022
## 4104  y2022
## 4105  y2022
## 4106  y2022
## 4107  y2022
## 4108  y2022
## 4109  y2022
## 4110  y2022
## 4111  y2022
## 4112  y2022
## 4113  y2022
## 4114  y2022
## 4115  y2022
## 4116  y2022
## 4117  y2022
## 4118  y2022
## 4119  y2022
## 4120  y2022
## 4121  y2022
## 4122  y2022
## 4123  y2022
## 4124  y2022
## 4125  y2022
## 4126  y2022
## 4127  y2022
## 4128  y2022
## 4129  y2022
## 4130  y2022
## 4131  y2022
## 4132  y2022
## 4133  y2022
## 4134  y2022
## 4135  y2022
## 4136  y2022
## 4137  y2022
## 4138  y2022
## 4139  y2022
## 4140  y2022
## 4141  y2022
## 4142  y2022
## 4143  y2022
## 4144  y2022
## 4145  y2022
## 4146  y2022
## 4147  y2022
## 4148  y2022
## 4149  y2022
## 4150  y2022
## 4151  y2022
## 4152  y2022
## 4153  y2022
## 4154  y2022
## 4155  y2022
## 4156  y2022
## 4157  y2022
## 4158  y2022
## 4159  y2022
## 4160  y2022
## 4161  y2022
## 4162  y2022
## 4163  y2022
## 4164  y2022
## 4165  y2022
## 4166  y2022
## 4167  y2022
## 4168  y2022
## 4169  y2022
## 4170  y2022
## 4171  y2022
## 4172  y2022
## 4173  y2022
## 4174  y2022
## 4175  y2022
## 4176  y2022
## 4177  y2022
## 4178  y2022
## 4179  y2022
## 4180  y2022
## 4181  y2022
## 4182  y2022
## 4183  y2022
## 4184  y2022
## 4185  y2022
## 4186  y2022
## 4187  y2022
## 4188  y2022
## 4189  y2022
## 4190  y2022
## 4191  y2022
## 4192  y2022
## 4193  y2022
## 4194  y2022
## 4195  y2022
## 4196  y2022
## 4197  y2022
## 4198  y2022
## 4199  y2022
## 4200  y2022
## 4201  y2022
## 4202  y2022
## 4203  y2022
## 4204  y2022
## 4205  y2022
## 4206  y2022
## 4207  y2022
## 4208  y2022
## 4209  y2022
## 4210  y2022
## 4211  y2022
## 4212  y2022
## 4213  y2022
## 4214  y2022
## 4215  y2022
## 4216  y2022
## 4217  y2022
## 4218  y2022
## 4219  y2022
## 4220  y2022
## 4221  y2022
## 4222  y2022
## 4223  y2022
## 4224  y2022
## 4225  y2022
## 4226  y2022
## 4227  y2022
## 4228  y2022
## 4229  y2022
## 4230  y2022
## 4231  y2022
## 4232  y2022
## 4233  y2022
## 4234  y2022
## 4235  y2022
## 4236  y2022
## 4237  y2022
## 4238  y2022
## 4239  y2022
## 4240  y2022
## 4241  y2022
## 4242  y2022
## 4243  y2022
## 4244  y2022
## 4245  y2022
## 4246  y2022
## 4247  y2022
## 4248  y2022
## 4249  y2022
## 4250  y2022
## 4251  y2022
## 4252  y2022
## 4253  y2022
## 4254  y2022
## 4255  y2022
## 4256  y2022
## 4257  y2022
## 4258  y2022
## 4259  y2022
## 4260  y2022
## 4261  y2022
## 4262  y2022
## 4263  y2022
## 4264  y2022
## 4265  y2022
## 4266  y2022
## 4267  y2022
## 4268  y2022
## 4269  y2022
## 4270  y2022
## 4271  y2022
## 4272  y2022
## 4273  y2020
## 4274  y2020
## 4275  y2020
## 4276  y2020
## 4277  y2020
## 4278  y2020
## 4279  y2020
## 4280  y2020
## 4281  y2020
## 4282  y2020
## 4283  y2020
## 4284  y2020
## 4285  y2020
## 4286  y2020
## 4287  y2020
## 4288  y2020
## 4289  y2020
## 4290  y2020
## 4291  y2020
## 4292  y2020
## 4293  y2020
## 4294  y2020
## 4295  y2020
## 4296  y2020
## 4297  y2020
## 4298  y2020
## 4299  y2020
## 4300  y2020
## 4301  y2020
## 4302  y2020
## 4303  y2020
## 4304  y2020
## 4305  y2020
## 4306  y2020
## 4307  y2020
## 4308  y2020
## 4309  y2020
## 4310  y2020
## 4311  y2020
## 4312  y2020
## 4313  y2020
## 4314  y2020
## 4315  y2020
## 4316  y2020
## 4317  y2020
## 4318  y2020
## 4319  y2020
## 4320  y2020
## 4321  y2020
## 4322  y2020
## 4323  y2020
## 4324  y2020
## 4325  y2020
## 4326  y2020
## 4327  y2020
## 4328  y2020
## 4329  y2020
## 4330  y2020
## 4331  y2020
## 4332  y2020
## 4333  y2020
## 4334  y2020
## 4335  y2020
## 4336  y2020
## 4337  y2020
## 4338  y2020
## 4339  y2020
## 4340  y2020
## 4341  y2020
## 4342  y2020
## 4343  y2020
## 4344  y2020
## 4345  y2020
## 4346  y2020
## 4347  y2020
## 4348  y2020
## 4349  y2020
## 4350  y2020
## 4351  y2020
## 4352  y2020
## 4353  y2020
## 4354  y2020
## 4355  y2020
## 4356  y2020
## 4357  y2020
## 4358  y2020
## 4359  y2020
## 4360  y2020
## 4361  y2020
## 4362  y2020
## 4363  y2020
## 4364  y2020
## 4365  y2020
## 4366  y2020
## 4367  y2020
## 4368  y2020
## 4369  y2020
## 4370  y2020
## 4371  y2020
## 4372  y2020
## 4373  y2020
## 4374  y2020
## 4375  y2020
## 4376  y2020
## 4377  y2020
## 4378  y2020
## 4379  y2020
## 4380  y2020
## 4381  y2020
## 4382  y2020
## 4383  y2020
## 4384  y2020
## 4385  y2020
## 4386  y2020
## 4387  y2020
## 4388  y2020
## 4389  y2020
## 4390  y2020
## 4391  y2020
## 4392  y2020
## 4393  y2020
## 4394  y2020
## 4395  y2020
## 4396  y2020
## 4397  y2020
## 4398  y2020
## 4399  y2020
## 4400  y2020
## 4401  y2020
## 4402  y2020
## 4403  y2020
## 4404  y2020
## 4405  y2020
## 4406  y2020
## 4407  y2020
## 4408  y2020
## 4409  y2020
## 4410  y2020
## 4411  y2020
## 4412  y2020
## 4413  y2020
## 4414  y2020
## 4415  y2020
## 4416  y2020
## 4417  y2020
## 4418  y2020
## 4419  y2020
## 4420  y2020
## 4421  y2020
## 4422  y2020
## 4423  y2020
## 4424  y2020
## 4425  y2020
## 4426  y2020
## 4427  y2020
## 4428  y2020
## 4429  y2020
## 4430  y2020
## 4431  y2020
## 4432  y2020
## 4433  y2020
## 4434  y2020
## 4435  y2020
## 4436  y2020
## 4437  y2020
## 4438  y2020
## 4439  y2020
## 4440  y2020
## 4441  y2020
## 4442  y2020
## 4443  y2020
## 4444  y2020
## 4445  y2020
## 4446  y2020
## 4447  y2020
## 4448  y2020
## 4449  y2020
## 4450  y2020
## 4451  y2020
## 4452  y2020
## 4453  y2020
## 4454  y2020
## 4455  y2020
## 4456  y2020
## 4457  y2020
## 4458  y2020
## 4459  y2020
## 4460  y2020
## 4461  y2020
## 4462  y2020
## 4463  y2020
## 4464  y2020
## 4465  y2020
## 4466  y2020
## 4467  y2020
## 4468  y2020
## 4469  y2020
## 4470  y2020
## 4471  y2020
## 4472  y2020
## 4473  y2020
## 4474  y2020
## 4475  y2020
## 4476  y2020
## 4477  y2020
## 4478  y2020
## 4479  y2020
## 4480  y2020
## 4481  y2020
## 4482  y2020
## 4483  y2020
## 4484  y2020
## 4485  y2020
## 4486  y2020
## 4487  y2020
## 4488  y2020
## 4489  y2020
## 4490  y2020
## 4491  y2020
## 4492  y2020
## 4493  y2020
## 4494  y2020
## 4495  y2020
## 4496  y2020
## 4497  y2020
## 4498  y2020
## 4499  y2020
## 4500  y2020
## 4501  y2020
## 4502  y2020
## 4503  y2020
## 4504  y2020
## 4505  y2020
## 4506  y2020
## 4507  y2020
## 4508  y2020
## 4509  y2020
## 4510  y2020
## 4511  y2020
## 4512  y2020
## 4513  y2020
## 4514  y2020
## 4515  y2020
## 4516  y2020
## 4517  y2020
## 4518  y2020
## 4519  y2020
## 4520  y2020
## 4521  y2020
## 4522  y2020
## 4523  y2020
## 4524  y2020
## 4525  y2020
## 4526  y2020
## 4527  y2020
## 4528  y2020
## 4529  y2020
## 4530  y2020
## 4531  y2020
## 4532  y2020
## 4533  y2020
## 4534  y2020
## 4535  y2020
## 4536  y2020
## 4537  y2020
## 4538  y2020
## 4539  y2020
## 4540  y2020
## 4541  y2020
## 4542  y2020
## 4543  y2020
## 4544  y2020
## 4545  y2020
## 4546  y2020
## 4547  y2020
## 4548  y2020
## 4549  y2020
## 4550  y2020
## 4551  y2020
## 4552  y2020
## 4553  y2020
## 4554  y2020
## 4555  y2020
## 4556  y2020
## 4557  y2020
## 4558  y2020
## 4559  y2020
## 4560  y2020
## 4561  y2020
## 4562  y2020
## 4563  y2020
## 4564  y2020
## 4565  y2020
## 4566  y2020
## 4567  y2020
## 4568  y2020
## 4569  y2020
## 4570  y2020
## 4571  y2020
## 4572  y2020
## 4573  y2020
## 4574  y2020
## 4575  y2020
## 4576  y2020
## 4577  y2020
## 4578  y2020
## 4579  y2020
## 4580  y2020
## 4581  y2020
## 4582  y2020
## 4583  y2020
## 4584  y2020
## 4585  y2020
## 4586  y2020
## 4587  y2020
## 4588  y2020
## 4589  y2020
## 4590  y2020
## 4591  y2020
## 4592  y2020
## 4593  y2020
## 4594  y2020
## 4595  y2020
## 4596  y2020
## 4597  y2020
## 4598  y2020
## 4599  y2020
## 4600  y2020
## 4601  y2020
## 4602  y2020
## 4603  y2020
## 4604  y2020
## 4605  y2020
## 4606  y2020
## 4607  y2020
## 4608  y2020
## 4609  y2020
## 4610  y2020
## 4611  y2020
## 4612  y2020
## 4613  y2020
## 4614  y2020
## 4615  y2020
## 4616  y2020
## 4617  y2020
## 4618  y2020
## 4619  y2020
## 4620  y2020
## 4621  y2020
## 4622  y2020
## 4623  y2020
## 4624  y2020
## 4625  y2020
## 4626  y2020
## 4627  y2020
## 4628  y2020
## 4629  y2020
## 4630  y2020
## 4631  y2020
## 4632  y2020
## 4633  y2020
## 4634  y2020
## 4635  y2020
## 4636  y2020
## 4637  y2020
## 4638  y2020
## 4639  y2020
## 4640  y2020
## 4641  y2020
## 4642  y2020
## 4643  y2020
## 4644  y2020
## 4645  y2020
## 4646  y2020
## 4647  y2020
## 4648  y2020
## 4649  y2020
## 4650  y2020
## 4651  y2020
## 4652  y2020
## 4653  y2020
## 4654  y2020
## 4655  y2020
## 4656  y2020
## 4657  y2020
## 4658  y2020
## 4659  y2020
## 4660  y2020
## 4661  y2020
## 4662  y2020
## 4663  y2020
## 4664  y2020
## 4665  y2020
## 4666  y2020
## 4667  y2020
## 4668  y2020
## 4669  y2020
## 4670  y2020
## 4671  y2020
## 4672  y2020
## 4673  y2020
## 4674  y2020
## 4675  y2020
## 4676  y2020
## 4677  y2020
## 4678  y2020
## 4679  y2020
## 4680  y2020
## 4681  y2020
## 4682  y2020
## 4683  y2020
## 4684  y2020
## 4685  y2020
## 4686  y2020
## 4687  y2020
## 4688  y2020
## 4689  y2020
## 4690  y2020
## 4691  y2020
## 4692  y2020
## 4693  y2020
## 4694  y2020
## 4695  y2020
## 4696  y2020
## 4697  y2020
## 4698  y2020
## 4699  y2020
## 4700  y2020
## 4701  y2020
## 4702  y2020
## 4703  y2020
## 4704  y2020
## 4705  y2020
## 4706  y2020
## 4707  y2020
## 4708  y2020
## 4709  y2020
## 4710  y2020
## 4711  y2020
## 4712  y2020
## 4713  y2020
## 4714  y2020
## 4715  y2020
## 4716  y2020
## 4717  y2020
## 4718  y2020
## 4719  y2020
## 4720  y2020
## 4721  y2020
## 4722  y2020
## 4723  y2020
## 4724  y2020
## 4725  y2020
## 4726  y2020
## 4727  y2020
## 4728  y2020
## 4729  y2020
## 4730  y2020
## 4731  y2020
## 4732  y2020
## 4733  y2020
## 4734  y2020
## 4735  y2020
## 4736  y2020
## 4737  y2020
## 4738  y2020
## 4739  y2020
## 4740  y2020
## 4741  y2020
## 4742  y2020
## 4743  y2020
## 4744  y2020
## 4745  y2020
## 4746  y2020
## 4747  y2020
## 4748  y2020
## 4749  y2020
## 4750  y2020
## 4751  y2020
## 4752  y2020
## 4753  y2020
## 4754  y2020
## 4755  y2020
## 4756  y2020
## 4757  y2020
## 4758  y2020
## 4759  y2020
## 4760  y2020
## 4761  y2020
## 4762  y2020
## 4763  y2020
## 4764  y2020
## 4765  y2020
## 4766  y2020
## 4767  y2020
## 4768  y2020
## 4769  y2020
## 4770  y2020
## 4771  y2020
## 4772  y2020
## 4773  y2020
## 4774  y2020
## 4775  y2020
## 4776  y2020
## 4777  y2020
## 4778  y2020
## 4779  y2020
## 4780  y2020
## 4781  y2020
## 4782  y2020
## 4783  y2020
## 4784  y2020
## 4785  y2020
## 4786  y2020
## 4787  y2020
## 4788  y2020
## 4789  y2020
## 4790  y2020
## 4791  y2020
## 4792  y2020
## 4793  y2020
## 4794  y2020
## 4795  y2020
## 4796  y2020
## 4797  y2020
## 4798  y2020
## 4799  y2020
## 4800  y2020
## 4801  y2020
## 4802  y2020
## 4803  y2020
## 4804  y2020
## 4805  y2020
## 4806  y2020
## 4807  y2020
## 4808  y2020
## 4809  y2020
## 4810  y2020
## 4811  y2020
## 4812  y2020
## 4813  y2020
## 4814  y2020
## 4815  y2020
## 4816  y2020
## 4817  y2020
## 4818  y2020
## 4819  y2020
## 4820  y2020
## 4821  y2020
## 4822  y2020
## 4823  y2020
## 4824  y2020
## 4825  y2020
## 4826  y2020
## 4827  y2020
## 4828  y2020
## 4829  y2020
## 4830  y2020
## 4831  y2020
## 4832  y2020
## 4833  y2020
## 4834  y2020
## 4835  y2020
## 4836  y2020
## 4837  y2020
## 4838  y2020
## 4839  y2020
## 4840  y2020
## 4841  y2020
## 4842  y2020
## 4843  y2020
## 4844  y2020
## 4845  y2020
## 4846  y2020
## 4847  y2020
## 4848  y2020
## 4849  y2020
## 4850  y2020
## 4851  y2020
## 4852  y2020
## 4853  y2020
## 4854  y2020
## 4855  y2020
## 4856  y2020
## 4857  y2020
## 4858  y2020
## 4859  y2020
## 4860  y2020
## 4861  y2020
## 4862  y2020
## 4863  y2020
## 4864  y2020
## 4865  y2020
## 4866  y2020
## 4867  y2020
## 4868  y2020
## 4869  y2020
## 4870  y2020
## 4871  y2020
## 4872  y2020
## 4873  y2020
## 4874  y2020
## 4875  y2020
## 4876  y2020
## 4877  y2020
## 4878  y2020
## 4879  y2020
## 4880  y2020
## 4881  y2020
## 4882  y2020
## 4883  y2020
## 4884  y2020
## 4885  y2020
## 4886  y2020
## 4887  y2020
## 4888  y2020
## 4889  y2020
## 4890  y2020
## 4891  y2020
## 4892  y2020
## 4893  y2020
## 4894  y2020
## 4895  y2020
## 4896  y2020
## 4897  y2020
## 4898  y2020
## 4899  y2020
## 4900  y2020
## 4901  y2020
## 4902  y2020
## 4903  y2020
## 4904  y2020
## 4905  y2020
## 4906  y2020
## 4907  y2020
## 4908  y2020
## 4909  y2020
## 4910  y2020
## 4911  y2020
## 4912  y2020
## 4913  y2020
## 4914  y2020
## 4915  y2020
## 4916  y2020
## 4917  y2020
## 4918  y2020
## 4919  y2020
## 4920  y2020
## 4921  y2020
## 4922  y2020
## 4923  y2020
## 4924  y2020
## 4925  y2020
## 4926  y2020
## 4927  y2020
## 4928  y2020
## 4929  y2020
## 4930  y2020
## 4931  y2020
## 4932  y2020
## 4933  y2020
## 4934  y2020
## 4935  y2020
## 4936  y2020
## 4937  y2020
## 4938  y2020
## 4939  y2020
## 4940  y2020
## 4941  y2020
## 4942  y2020
## 4943  y2020
## 4944  y2020
## 4945  y2020
## 4946  y2020
## 4947  y2020
## 4948  y2020
## 4949  y2020
## 4950  y2020
## 4951  y2020
## 4952  y2020
## 4953  y2020
## 4954  y2020
## 4955  y2020
## 4956  y2020
## 4957  y2020
## 4958  y2020
## 4959  y2020
## 4960  y2020
## 4961  y2020
## 4962  y2020
## 4963  y2020
## 4964  y2020
## 4965  y2020
## 4966  y2020
## 4967  y2020
## 4968  y2020
## 4969  y2020
## 4970  y2020
## 4971  y2020
## 4972  y2020
## 4973  y2020
## 4974  y2020
## 4975  y2020
## 4976  y2020
## 4977  y2020
## 4978  y2020
## 4979  y2020
## 4980  y2020
## 4981  y2020
## 4982  y2020
## 4983  y2020
## 4984  y2020
## 4985  y2020
## 4986  y2020
## 4987  y2020
## 4988  y2020
## 4989  y2020
## 4990  y2020
## 4991  y2020
## 4992  y2020
## 4993  y2020
## 4994  y2020
## 4995  y2020
## 4996  y2020
## 4997  y2020
## 4998  y2020
## 4999  y2020
## 5000  y2020
## 5001  y2020
## 5002  y2020
## 5003  y2020
## 5004  y2020
## 5005  y2020
## 5006  y2020
## 5007  y2020
## 5008  y2020
## 5009  y2020
## 5010  y2020
## 5011  y2020
## 5012  y2020
## 5013  y2020
## 5014  y2020
## 5015  y2020
## 5016  y2020
## 5017  y2020
## 5018  y2020
## 5019  y2020
## 5020  y2020
## 5021  y2020
## 5022  y2020
## 5023  y2020
## 5024  y2020
## 5025  y2020
## 5026  y2020
## 5027  y2020
## 5028  y2020
## 5029  y2020
## 5030  y2020
## 5031  y2020
## 5032  y2020
## 5033  y2020
## 5034  y2021
## 5035  y2021
## 5036  y2021
## 5037  y2021
## 5038  y2021
## 5039  y2021
## 5040  y2021
## 5041  y2021
## 5042  y2021
## 5043  y2021
## 5044  y2021
## 5045  y2021
## 5046  y2021
## 5047  y2021
## 5048  y2021
## 5049  y2021
## 5050  y2021
## 5051  y2021
## 5052  y2021
## 5053  y2021
## 5054  y2021
## 5055  y2021
## 5056  y2021
## 5057  y2021
## 5058  y2021
## 5059  y2021
## 5060  y2021
## 5061  y2021
## 5062  y2021
## 5063  y2021
## 5064  y2021
## 5065  y2021
## 5066  y2021
## 5067  y2021
## 5068  y2021
## 5069  y2021
## 5070  y2021
## 5071  y2021
## 5072  y2021
## 5073  y2021
## 5074  y2021
## 5075  y2021
## 5076  y2021
## 5077  y2021
## 5078  y2021
## 5079  y2021
## 5080  y2021
## 5081  y2021
## 5082  y2021
## 5083  y2021
## 5084  y2021
## 5085  y2021
## 5086  y2021
## 5087  y2021
## 5088  y2021
## 5089  y2021
## 5090  y2021
## 5091  y2021
## 5092  y2021
## 5093  y2021
## 5094  y2021
## 5095  y2021
## 5096  y2021
## 5097  y2021
## 5098  y2021
## 5099  y2021
## 5100  y2021
## 5101  y2021
## 5102  y2021
## 5103  y2021
## 5104  y2021
## 5105  y2021
## 5106  y2021
## 5107  y2021
## 5108  y2021
## 5109  y2021
## 5110  y2021
## 5111  y2021
## 5112  y2021
## 5113  y2021
## 5114  y2021
## 5115  y2021
## 5116  y2021
## 5117  y2021
## 5118  y2021
## 5119  y2021
## 5120  y2021
## 5121  y2021
## 5122  y2021
## 5123  y2021
## 5124  y2021
## 5125  y2021
## 5126  y2021
## 5127  y2021
## 5128  y2021
## 5129  y2021
## 5130  y2021
## 5131  y2021
## 5132  y2021
## 5133  y2021
## 5134  y2021
## 5135  y2021
## 5136  y2021
## 5137  y2021
## 5138  y2021
## 5139  y2021
## 5140  y2021
## 5141  y2021
## 5142  y2021
## 5143  y2021
## 5144  y2021
## 5145  y2021
## 5146  y2021
## 5147  y2021
## 5148  y2021
## 5149  y2021
## 5150  y2021
## 5151  y2021
## 5152  y2021
## 5153  y2021
## 5154  y2021
## 5155  y2021
## 5156  y2021
## 5157  y2021
## 5158  y2021
## 5159  y2021
## 5160  y2021
## 5161  y2021
## 5162  y2021
## 5163  y2021
## 5164  y2021
## 5165  y2021
## 5166  y2021
## 5167  y2021
## 5168  y2021
## 5169  y2021
## 5170  y2021
## 5171  y2021
## 5172  y2021
## 5173  y2021
## 5174  y2021
## 5175  y2021
## 5176  y2021
## 5177  y2021
## 5178  y2021
## 5179  y2021
## 5180  y2021
## 5181  y2021
## 5182  y2021
## 5183  y2021
## 5184  y2021
## 5185  y2021
## 5186  y2021
## 5187  y2021
## 5188  y2021
## 5189  y2021
## 5190  y2021
## 5191  y2021
## 5192  y2021
## 5193  y2021
## 5194  y2021
## 5195  y2021
## 5196  y2021
## 5197  y2021
## 5198  y2021
## 5199  y2021
## 5200  y2021
## 5201  y2021
## 5202  y2021
## 5203  y2021
## 5204  y2021
## 5205  y2021
## 5206  y2021
## 5207  y2021
## 5208  y2021
## 5209  y2021
## 5210  y2021
## 5211  y2021
## 5212  y2021
## 5213  y2021
## 5214  y2021
## 5215  y2021
## 5216  y2021
## 5217  y2021
## 5218  y2021
## 5219  y2021
## 5220  y2021
## 5221  y2021
## 5222  y2021
## 5223  y2021
## 5224  y2021
## 5225  y2021
## 5226  y2021
## 5227  y2021
## 5228  y2021
## 5229  y2021
## 5230  y2021
## 5231  y2021
## 5232  y2021
## 5233  y2021
## 5234  y2021
## 5235  y2021
## 5236  y2021
## 5237  y2021
## 5238  y2021
## 5239  y2021
## 5240  y2021
## 5241  y2021
## 5242  y2021
## 5243  y2021
## 5244  y2021
## 5245  y2021
## 5246  y2021
## 5247  y2021
## 5248  y2021
## 5249  y2021
## 5250  y2021
## 5251  y2021
## 5252  y2021
## 5253  y2021
## 5254  y2021
## 5255  y2021
## 5256  y2021
## 5257  y2021
## 5258  y2021
## 5259  y2021
## 5260  y2021
## 5261  y2021
## 5262  y2021
## 5263  y2021
## 5264  y2021
## 5265  y2021
## 5266  y2021
## 5267  y2021
## 5268  y2021
## 5269  y2021
## 5270  y2021
## 5271  y2021
## 5272  y2021
## 5273  y2021
## 5274  y2021
## 5275  y2021
## 5276  y2021
## 5277  y2021
## 5278  y2021
## 5279  y2021
## 5280  y2021
## 5281  y2021
## 5282  y2021
## 5283  y2021
## 5284  y2021
## 5285  y2021
## 5286  y2021
## 5287  y2021
## 5288  y2021
## 5289  y2021
## 5290  y2021
## 5291  y2021
## 5292  y2021
## 5293  y2021
## 5294  y2021
## 5295  y2021
## 5296  y2021
## 5297  y2021
## 5298  y2021
## 5299  y2021
## 5300  y2021
## 5301  y2021
## 5302  y2021
## 5303  y2021
## 5304  y2021
## 5305  y2021
## 5306  y2021
## 5307  y2021
## 5308  y2021
## 5309  y2021
## 5310  y2021
## 5311  y2021
## 5312  y2021
## 5313  y2021
## 5314  y2021
## 5315  y2021
## 5316  y2021
## 5317  y2021
## 5318  y2021
## 5319  y2021
## 5320  y2021
## 5321  y2021
## 5322  y2021
## 5323  y2021
## 5324  y2021
## 5325  y2021
## 5326  y2021
## 5327  y2021
## 5328  y2021
## 5329  y2021
## 5330  y2021
## 5331  y2021
## 5332  y2021
## 5333  y2021
## 5334  y2021
## 5335  y2021
## 5336  y2021
## 5337  y2021
## 5338  y2021
## 5339  y2021
## 5340  y2021
## 5341  y2021
## 5342  y2021
## 5343  y2021
## 5344  y2021
## 5345  y2021
## 5346  y2021
## 5347  y2021
## 5348  y2021
## 5349  y2021
## 5350  y2021
## 5351  y2021
## 5352  y2021
## 5353  y2021
## 5354  y2021
## 5355  y2021
## 5356  y2021
## 5357  y2021
## 5358  y2021
## 5359  y2021
## 5360  y2021
## 5361  y2021
## 5362  y2021
## 5363  y2021
## 5364  y2021
## 5365  y2021
## 5366  y2021
## 5367  y2021
## 5368  y2021
## 5369  y2021
## 5370  y2021
## 5371  y2021
## 5372  y2021
## 5373  y2021
## 5374  y2021
## 5375  y2021
## 5376  y2021
## 5377  y2021
## 5378  y2021
## 5379  y2021
## 5380  y2021
## 5381  y2021
## 5382  y2021
## 5383  y2021
## 5384  y2021
## 5385  y2021
## 5386  y2021
## 5387  y2021
## 5388  y2021
## 5389  y2021
## 5390  y2021
## 5391  y2021
## 5392  y2021
## 5393  y2021
## 5394  y2021
## 5395  y2021
## 5396  y2021
## 5397  y2021
## 5398  y2021
## 5399  y2021
## 5400  y2021
## 5401  y2021
## 5402  y2021
## 5403  y2021
## 5404  y2021
## 5405  y2021
## 5406  y2021
## 5407  y2021
## 5408  y2021
## 5409  y2021
## 5410  y2021
## 5411  y2021
## 5412  y2021
## 5413  y2021
## 5414  y2021
## 5415  y2021
## 5416  y2021
## 5417  y2021
## 5418  y2021
## 5419  y2021
## 5420  y2021
## 5421  y2021
## 5422  y2021
## 5423  y2021
## 5424  y2021
## 5425  y2021
## 5426  y2021
## 5427  y2021
## 5428  y2021
## 5429  y2021
## 5430  y2021
## 5431  y2021
## 5432  y2021
## 5433  y2021
## 5434  y2021
## 5435  y2021
## 5436  y2021
## 5437  y2021
## 5438  y2021
## 5439  y2021
## 5440  y2021
## 5441  y2021
## 5442  y2021
## 5443  y2021
## 5444  y2021
## 5445  y2021
## 5446  y2021
## 5447  y2021
## 5448  y2021
## 5449  y2021
## 5450  y2021
## 5451  y2021
## 5452  y2021
## 5453  y2021
## 5454  y2021
## 5455  y2021
## 5456  y2021
## 5457  y2021
## 5458  y2021
## 5459  y2021
## 5460  y2021
## 5461  y2021
## 5462  y2021
## 5463  y2021
## 5464  y2021
## 5465  y2021
## 5466  y2021
## 5467  y2021
## 5468  y2021
## 5469  y2021
## 5470  y2021
## 5471  y2021
## 5472  y2021
## 5473  y2021
## 5474  y2021
## 5475  y2021
## 5476  y2021
## 5477  y2021
## 5478  y2021
## 5479  y2021
## 5480  y2021
## 5481  y2021
## 5482  y2021
## 5483  y2021
## 5484  y2021
## 5485  y2021
## 5486  y2021
## 5487  y2021
## 5488  y2021
## 5489  y2021
## 5490  y2021
## 5491  y2021
## 5492  y2021
## 5493  y2021
## 5494  y2021
## 5495  y2021
## 5496  y2021
## 5497  y2021
## 5498  y2021
## 5499  y2021
## 5500  y2021
## 5501  y2021
## 5502  y2021
## 5503  y2021
## 5504  y2021
## 5505  y2021
## 5506  y2021
## 5507  y2021
## 5508  y2021
## 5509  y2021
## 5510  y2021
## 5511  y2021
## 5512  y2021
## 5513  y2021
## 5514  y2021
## 5515  y2021
## 5516  y2021
## 5517  y2021
## 5518  y2021
## 5519  y2021
## 5520  y2021
## 5521  y2021
## 5522  y2021
## 5523  y2021
## 5524  y2021
## 5525  y2021
## 5526  y2021
## 5527  y2021
## 5528  y2021
## 5529  y2021
## 5530  y2021
## 5531  y2021
## 5532  y2021
## 5533  y2021
## 5534  y2021
## 5535  y2021
## 5536  y2021
## 5537  y2021
## 5538  y2021
## 5539  y2021
## 5540  y2021
## 5541  y2021
## 5542  y2021
## 5543  y2021
## 5544  y2021
## 5545  y2021
## 5546  y2021
## 5547  y2021
## 5548  y2021
## 5549  y2021
## 5550  y2021
## 5551  y2021
## 5552  y2021
## 5553  y2021
## 5554  y2021
## 5555  y2021
## 5556  y2021
## 5557  y2021
## 5558  y2021
## 5559  y2021
## 5560  y2021
## 5561  y2021
## 5562  y2021
## 5563  y2021
## 5564  y2021
## 5565  y2021
## 5566  y2021
## 5567  y2021
## 5568  y2021
## 5569  y2021
## 5570  y2021
## 5571  y2021
## 5572  y2021
## 5573  y2021
## 5574  y2021
## 5575  y2021
## 5576  y2021
## 5577  y2021
## 5578  y2021
## 5579  y2021
## 5580  y2021
## 5581  y2021
## 5582  y2021
## 5583  y2021
## 5584  y2021
## 5585  y2021
## 5586  y2021
## 5587  y2021
## 5588  y2021
## 5589  y2021
## 5590  y2021
## 5591  y2021
## 5592  y2021
## 5593  y2021
## 5594  y2021
## 5595  y2021
## 5596  y2021
## 5597  y2021
## 5598  y2021
## 5599  y2021
## 5600  y2021
## 5601  y2021
## 5602  y2021
## 5603  y2021
## 5604  y2021
## 5605  y2021
## 5606  y2021
## 5607  y2021
## 5608  y2021
## 5609  y2021
## 5610  y2021
## 5611  y2021
## 5612  y2021
## 5613  y2021
## 5614  y2021
## 5615  y2021
## 5616  y2021
## 5617  y2021
## 5618  y2021
## 5619  y2021
## 5620  y2021
## 5621  y2021
## 5622  y2021
## 5623  y2021
## 5624  y2021
## 5625  y2021
## 5626  y2022
## 5627  y2022
## 5628  y2022
## 5629  y2022
## 5630  y2022
## 5631  y2022
## 5632  y2022
## 5633  y2022
## 5634  y2022
## 5635  y2022
## 5636  y2022
## 5637  y2022
## 5638  y2022
## 5639  y2022
## 5640  y2022
## 5641  y2022
## 5642  y2022
## 5643  y2022
## 5644  y2022
## 5645  y2022
## 5646  y2022
## 5647  y2022
## 5648  y2022
## 5649  y2022
## 5650  y2022
## 5651  y2022
## 5652  y2022
## 5653  y2022
## 5654  y2022
## 5655  y2022
## 5656  y2022
## 5657  y2022
## 5658  y2022
## 5659  y2022
## 5660  y2022
## 5661  y2022
## 5662  y2022
## 5663  y2022
## 5664  y2022
## 5665  y2022
## 5666  y2022
## 5667  y2022
## 5668  y2022
## 5669  y2022
## 5670  y2022
## 5671  y2022
## 5672  y2022
## 5673  y2022
## 5674  y2022
## 5675  y2022
## 5676  y2022
## 5677  y2022
## 5678  y2022
## 5679  y2022
## 5680  y2022
## 5681  y2022
## 5682  y2022
## 5683  y2022
## 5684  y2022
## 5685  y2022
## 5686  y2022
## 5687  y2022
## 5688  y2022
## 5689  y2022
## 5690  y2022
## 5691  y2022
## 5692  y2022
## 5693  y2022
## 5694  y2022
## 5695  y2022
## 5696  y2022
## 5697  y2022
## 5698  y2022
## 5699  y2022
## 5700  y2022
## 5701  y2022
## 5702  y2022
## 5703  y2022
## 5704  y2022
## 5705  y2022
## 5706  y2022
## 5707  y2022
## 5708  y2022
## 5709  y2022
## 5710  y2022
## 5711  y2022
## 5712  y2022
## 5713  y2022
## 5714  y2022
## 5715  y2022
## 5716  y2022
## 5717  y2022
## 5718  y2022
## 5719  y2022
## 5720  y2022
## 5721  y2022
## 5722  y2022
## 5723  y2022
## 5724  y2022
## 5725  y2022
## 5726  y2022
## 5727  y2022
## 5728  y2022
## 5729  y2022
## 5730  y2022
## 5731  y2022
## 5732  y2022
## 5733  y2022
## 5734  y2022
## 5735  y2022
## 5736  y2022
## 5737  y2022
## 5738  y2022
## 5739  y2022
## 5740  y2022
## 5741  y2022
## 5742  y2022
## 5743  y2022
## 5744  y2022
## 5745  y2022
## 5746  y2022
## 5747  y2022
## 5748  y2022
## 5749  y2022
## 5750  y2022
## 5751  y2022
## 5752  y2022
## 5753  y2022
## 5754  y2022
## 5755  y2022
## 5756  y2022
## 5757  y2022
## 5758  y2022
## 5759  y2022
## 5760  y2022
## 5761  y2022
## 5762  y2022
## 5763  y2022
## 5764  y2022
## 5765  y2022
## 5766  y2022
## 5767  y2022
## 5768  y2022
## 5769  y2022
## 5770  y2022
## 5771  y2022
## 5772  y2022
## 5773  y2022
## 5774  y2022
## 5775  y2022
## 5776  y2022
## 5777  y2022
## 5778  y2022
## 5779  y2022
## 5780  y2022
## 5781  y2022
## 5782  y2022
## 5783  y2022
## 5784  y2022
## 5785  y2022
## 5786  y2022
## 5787  y2022
## 5788  y2022
## 5789  y2022
## 5790  y2022
## 5791  y2022
## 5792  y2022
## 5793  y2022
## 5794  y2022
## 5795  y2022
## 5796  y2022
## 5797  y2022
## 5798  y2022
## 5799  y2022
## 5800  y2022
## 5801  y2022
## 5802  y2022
## 5803  y2022
## 5804  y2022
## 5805  y2022
## 5806  y2022
## 5807  y2022
## 5808  y2022
## 5809  y2022
## 5810  y2022
## 5811  y2022
## 5812  y2022
## 5813  y2022
## 5814  y2022
## 5815  y2022
## 5816  y2022
## 5817  y2022
## 5818  y2022
## 5819  y2022
## 5820  y2022
## 5821  y2022
## 5822  y2022
## 5823  y2022
## 5824  y2022
## 5825  y2022
## 5826  y2022
## 5827  y2022
## 5828  y2022
## 5829  y2022
## 5830  y2022
## 5831  y2022
## 5832  y2022
## 5833  y2022
## 5834  y2022
## 5835  y2022
## 5836  y2022
## 5837  y2022
## 5838  y2022
## 5839  y2022
## 5840  y2022
## 5841  y2022
## 5842  y2022
## 5843  y2022
## 5844  y2022
## 5845  y2022
## 5846  y2022
## 5847  y2022
## 5848  y2022
## 5849  y2022
## 5850  y2022
## 5851  y2022
## 5852  y2022
## 5853  y2022
## 5854  y2022
## 5855  y2022
## 5856  y2022
## 5857  y2022
## 5858  y2022
## 5859  y2022
## 5860  y2022
## 5861  y2022
## 5862  y2022
## 5863  y2022
## 5864  y2022
## 5865  y2022
## 5866  y2022
## 5867  y2022
## 5868  y2022
## 5869  y2022
## 5870  y2022
## 5871  y2022
## 5872  y2022
## 5873  y2022
## 5874  y2022
## 5875  y2022
## 5876  y2022
## 5877  y2022
## 5878  y2022
## 5879  y2022
## 5880  y2022
## 5881  y2022
## 5882  y2022
## 5883  y2022
## 5884  y2022
## 5885  y2022
## 5886  y2022
## 5887  y2022
## 5888  y2022
## 5889  y2022
## 5890  y2022
## 5891  y2022
## 5892  y2022
## 5893  y2022
## 5894  y2022
## 5895  y2022
## 5896  y2022
## 5897  y2022
## 5898  y2022
## 5899  y2022
## 5900  y2022
## 5901  y2022
## 5902  y2022
## 5903  y2022
## 5904  y2022
## 5905  y2022
## 5906  y2022
## 5907  y2022
## 5908  y2022
## 5909  y2022
## 5910  y2022
## 5911  y2022
## 5912  y2022
## 5913  y2022
## 5914  y2022
## 5915  y2022
## 5916  y2022
## 5917  y2022
## 5918  y2022
## 5919  y2022
## 5920  y2022
## 5921  y2022
## 5922  y2022
## 5923  y2022
## 5924  y2022
## 5925  y2022
## 5926  y2022
## 5927  y2022
## 5928  y2022
## 5929  y2022
## 5930  y2022
## 5931  y2022
## 5932  y2022
## 5933  y2022
## 5934  y2022
## 5935  y2022
## 5936  y2022
## 5937  y2022
## 5938  y2022
## 5939  y2022
## 5940  y2022
## 5941  y2022
## 5942  y2022
## 5943  y2022
## 5944  y2022
## 5945  y2022
## 5946  y2022
## 5947  y2022
## 5948  y2022
## 5949  y2022
## 5950  y2022
## 5951  y2022
## 5952  y2022
## 5953  y2022
## 5954  y2022
## 5955  y2022
## 5956  y2022
## 5957  y2022
## 5958  y2022
## 5959  y2022
## 5960  y2022
## 5961  y2022
## 5962  y2022
## 5963  y2022
## 5964  y2022
## 5965  y2022
## 5966  y2022
## 5967  y2022
## 5968  y2020
## 5969  y2020
## 5970  y2020
## 5971  y2020
## 5972  y2020
## 5973  y2020
## 5974  y2020
## 5975  y2020
## 5976  y2020
## 5977  y2020
## 5978  y2020
## 5979  y2020
## 5980  y2020
## 5981  y2020
## 5982  y2020
## 5983  y2020
## 5984  y2020
## 5985  y2020
## 5986  y2020
## 5987  y2020
## 5988  y2020
## 5989  y2020
## 5990  y2020
## 5991  y2020
## 5992  y2020
## 5993  y2020
## 5994  y2020
## 5995  y2020
## 5996  y2020
## 5997  y2020
## 5998  y2020
## 5999  y2020
## 6000  y2020
## 6001  y2020
## 6002  y2020
## 6003  y2020
## 6004  y2020
## 6005  y2020
## 6006  y2020
## 6007  y2020
## 6008  y2020
## 6009  y2020
## 6010  y2020
## 6011  y2020
## 6012  y2020
## 6013  y2020
## 6014  y2020
## 6015  y2020
## 6016  y2020
## 6017  y2020
## 6018  y2020
## 6019  y2020
## 6020  y2020
## 6021  y2020
## 6022  y2020
## 6023  y2020
## 6024  y2020
## 6025  y2020
## 6026  y2020
## 6027  y2020
## 6028  y2020
## 6029  y2020
## 6030  y2020
## 6031  y2020
## 6032  y2020
## 6033  y2020
## 6034  y2020
## 6035  y2020
## 6036  y2020
## 6037  y2020
## 6038  y2020
## 6039  y2020
## 6040  y2020
## 6041  y2020
## 6042  y2020
## 6043  y2020
## 6044  y2020
## 6045  y2020
## 6046  y2020
## 6047  y2020
## 6048  y2020
## 6049  y2020
## 6050  y2020
## 6051  y2020
## 6052  y2020
## 6053  y2020
## 6054  y2020
## 6055  y2020
## 6056  y2020
## 6057  y2020
## 6058  y2020
## 6059  y2020
## 6060  y2020
## 6061  y2020
## 6062  y2020
## 6063  y2020
## 6064  y2020
## 6065  y2020
## 6066  y2020
## 6067  y2020
## 6068  y2020
## 6069  y2020
## 6070  y2020
## 6071  y2020
## 6072  y2020
## 6073  y2020
## 6074  y2020
## 6075  y2020
## 6076  y2020
## 6077  y2020
## 6078  y2020
## 6079  y2020
## 6080  y2020
## 6081  y2020
## 6082  y2020
## 6083  y2020
## 6084  y2020
## 6085  y2020
## 6086  y2020
## 6087  y2020
## 6088  y2020
## 6089  y2020
## 6090  y2020
## 6091  y2020
## 6092  y2020
## 6093  y2020
## 6094  y2020
## 6095  y2020
## 6096  y2020
## 6097  y2020
## 6098  y2020
## 6099  y2020
## 6100  y2020
## 6101  y2020
## 6102  y2020
## 6103  y2020
## 6104  y2020
## 6105  y2020
## 6106  y2020
## 6107  y2020
## 6108  y2020
## 6109  y2020
## 6110  y2020
## 6111  y2020
## 6112  y2020
## 6113  y2020
## 6114  y2020
## 6115  y2020
## 6116  y2020
## 6117  y2020
## 6118  y2020
## 6119  y2020
## 6120  y2020
## 6121  y2020
## 6122  y2020
## 6123  y2020
## 6124  y2020
## 6125  y2020
## 6126  y2020
## 6127  y2020
## 6128  y2020
## 6129  y2020
## 6130  y2020
## 6131  y2020
## 6132  y2020
## 6133  y2020
## 6134  y2020
## 6135  y2020
## 6136  y2020
## 6137  y2020
## 6138  y2020
## 6139  y2020
## 6140  y2020
## 6141  y2020
## 6142  y2020
## 6143  y2020
## 6144  y2020
## 6145  y2020
## 6146  y2020
## 6147  y2020
## 6148  y2020
## 6149  y2020
## 6150  y2020
## 6151  y2020
## 6152  y2020
## 6153  y2020
## 6154  y2020
## 6155  y2020
## 6156  y2020
## 6157  y2020
## 6158  y2020
## 6159  y2020
## 6160  y2020
## 6161  y2020
## 6162  y2020
## 6163  y2020
## 6164  y2020
## 6165  y2020
## 6166  y2020
## 6167  y2020
## 6168  y2020
## 6169  y2020
## 6170  y2020
## 6171  y2020
## 6172  y2020
## 6173  y2020
## 6174  y2020
## 6175  y2020
## 6176  y2020
## 6177  y2020
## 6178  y2020
## 6179  y2020
## 6180  y2020
## 6181  y2020
## 6182  y2020
## 6183  y2020
## 6184  y2020
## 6185  y2020
## 6186  y2020
## 6187  y2020
## 6188  y2020
## 6189  y2020
## 6190  y2020
## 6191  y2020
## 6192  y2020
## 6193  y2020
## 6194  y2020
## 6195  y2020
## 6196  y2020
## 6197  y2020
## 6198  y2020
## 6199  y2020
## 6200  y2020
## 6201  y2020
## 6202  y2020
## 6203  y2020
## 6204  y2020
## 6205  y2020
## 6206  y2020
## 6207  y2020
## 6208  y2020
## 6209  y2020
## 6210  y2020
## 6211  y2020
## 6212  y2020
## 6213  y2020
## 6214  y2020
## 6215  y2020
## 6216  y2020
## 6217  y2020
## 6218  y2020
## 6219  y2020
## 6220  y2020
## 6221  y2020
## 6222  y2020
## 6223  y2020
## 6224  y2020
## 6225  y2020
## 6226  y2020
## 6227  y2020
## 6228  y2020
## 6229  y2020
## 6230  y2020
## 6231  y2020
## 6232  y2020
## 6233  y2020
## 6234  y2020
## 6235  y2020
## 6236  y2020
## 6237  y2020
## 6238  y2020
## 6239  y2020
## 6240  y2020
## 6241  y2020
## 6242  y2020
## 6243  y2020
## 6244  y2020
## 6245  y2020
## 6246  y2020
## 6247  y2020
## 6248  y2020
## 6249  y2020
## 6250  y2020
## 6251  y2020
## 6252  y2020
## 6253  y2020
## 6254  y2020
## 6255  y2020
## 6256  y2020
## 6257  y2020
## 6258  y2020
## 6259  y2020
## 6260  y2020
## 6261  y2020
## 6262  y2020
## 6263  y2020
## 6264  y2020
## 6265  y2020
## 6266  y2020
## 6267  y2020
## 6268  y2020
## 6269  y2020
## 6270  y2020
## 6271  y2020
## 6272  y2020
## 6273  y2020
## 6274  y2020
## 6275  y2020
## 6276  y2020
## 6277  y2020
## 6278  y2020
## 6279  y2020
## 6280  y2020
## 6281  y2020
## 6282  y2020
## 6283  y2020
## 6284  y2020
## 6285  y2020
## 6286  y2020
## 6287  y2020
## 6288  y2020
## 6289  y2020
## 6290  y2020
## 6291  y2020
## 6292  y2020
## 6293  y2020
## 6294  y2020
## 6295  y2020
## 6296  y2020
## 6297  y2020
## 6298  y2020
## 6299  y2020
## 6300  y2020
## 6301  y2020
## 6302  y2020
## 6303  y2020
## 6304  y2020
## 6305  y2020
## 6306  y2020
## 6307  y2020
## 6308  y2020
## 6309  y2020
## 6310  y2020
## 6311  y2020
## 6312  y2020
## 6313  y2020
## 6314  y2020
## 6315  y2020
## 6316  y2020
## 6317  y2020
## 6318  y2020
## 6319  y2020
## 6320  y2020
## 6321  y2020
## 6322  y2020
## 6323  y2020
## 6324  y2020
## 6325  y2020
## 6326  y2020
## 6327  y2020
## 6328  y2020
## 6329  y2020
## 6330  y2020
## 6331  y2020
## 6332  y2020
## 6333  y2020
## 6334  y2020
## 6335  y2020
## 6336  y2020
## 6337  y2020
## 6338  y2020
## 6339  y2020
## 6340  y2020
## 6341  y2020
## 6342  y2020
## 6343  y2020
## 6344  y2020
## 6345  y2020
## 6346  y2020
## 6347  y2020
## 6348  y2020
## 6349  y2020
## 6350  y2020
## 6351  y2020
## 6352  y2020
## 6353  y2020
## 6354  y2020
## 6355  y2020
## 6356  y2020
## 6357  y2020
## 6358  y2020
## 6359  y2020
## 6360  y2020
## 6361  y2020
## 6362  y2020
## 6363  y2020
## 6364  y2020
## 6365  y2020
## 6366  y2020
## 6367  y2020
## 6368  y2020
## 6369  y2020
## 6370  y2020
## 6371  y2020
## 6372  y2020
## 6373  y2020
## 6374  y2020
## 6375  y2020
## 6376  y2020
## 6377  y2020
## 6378  y2020
## 6379  y2020
## 6380  y2020
## 6381  y2020
## 6382  y2020
## 6383  y2020
## 6384  y2020
## 6385  y2020
## 6386  y2020
## 6387  y2020
## 6388  y2020
## 6389  y2020
## 6390  y2020
## 6391  y2020
## 6392  y2020
## 6393  y2020
## 6394  y2020
## 6395  y2020
## 6396  y2020
## 6397  y2020
## 6398  y2020
## 6399  y2020
## 6400  y2020
## 6401  y2020
## 6402  y2020
## 6403  y2020
## 6404  y2020
## 6405  y2020
## 6406  y2020
## 6407  y2020
## 6408  y2020
## 6409  y2020
## 6410  y2020
## 6411  y2020
## 6412  y2020
## 6413  y2020
## 6414  y2020
## 6415  y2020
## 6416  y2020
## 6417  y2020
## 6418  y2020
## 6419  y2020
## 6420  y2020
## 6421  y2020
## 6422  y2020
## 6423  y2020
## 6424  y2020
## 6425  y2020
## 6426  y2020
## 6427  y2020
## 6428  y2020
## 6429  y2020
## 6430  y2020
## 6431  y2020
## 6432  y2020
## 6433  y2020
## 6434  y2020
## 6435  y2020
## 6436  y2020
## 6437  y2020
## 6438  y2020
## 6439  y2020
## 6440  y2020
## 6441  y2020
## 6442  y2020
## 6443  y2020
## 6444  y2020
## 6445  y2020
## 6446  y2020
## 6447  y2020
## 6448  y2020
## 6449  y2020
## 6450  y2020
## 6451  y2020
## 6452  y2020
## 6453  y2020
## 6454  y2020
## 6455  y2020
## 6456  y2020
## 6457  y2020
## 6458  y2020
## 6459  y2020
## 6460  y2020
## 6461  y2020
## 6462  y2020
## 6463  y2020
## 6464  y2020
## 6465  y2020
## 6466  y2020
## 6467  y2020
## 6468  y2020
## 6469  y2020
## 6470  y2020
## 6471  y2020
## 6472  y2020
## 6473  y2020
## 6474  y2020
## 6475  y2020
## 6476  y2020
## 6477  y2020
## 6478  y2020
## 6479  y2020
## 6480  y2020
## 6481  y2020
## 6482  y2020
## 6483  y2020
## 6484  y2020
## 6485  y2020
## 6486  y2020
## 6487  y2020
## 6488  y2020
## 6489  y2020
## 6490  y2020
## 6491  y2020
## 6492  y2020
## 6493  y2020
## 6494  y2020
## 6495  y2020
## 6496  y2020
## 6497  y2020
## 6498  y2020
## 6499  y2020
## 6500  y2020
## 6501  y2020
## 6502  y2020
## 6503  y2020
## 6504  y2020
## 6505  y2020
## 6506  y2020
## 6507  y2020
## 6508  y2020
## 6509  y2020
## 6510  y2020
## 6511  y2020
## 6512  y2020
## 6513  y2020
## 6514  y2020
## 6515  y2020
## 6516  y2020
## 6517  y2020
## 6518  y2020
## 6519  y2020
## 6520  y2020
## 6521  y2020
## 6522  y2020
## 6523  y2020
## 6524  y2020
## 6525  y2020
## 6526  y2020
## 6527  y2020
## 6528  y2020
## 6529  y2020
## 6530  y2020
## 6531  y2020
## 6532  y2020
## 6533  y2020
## 6534  y2020
## 6535  y2020
## 6536  y2020
## 6537  y2020
## 6538  y2020
## 6539  y2020
## 6540  y2020
## 6541  y2020
## 6542  y2020
## 6543  y2020
## 6544  y2020
## 6545  y2020
## 6546  y2020
## 6547  y2020
## 6548  y2020
## 6549  y2020
## 6550  y2020
## 6551  y2020
## 6552  y2020
## 6553  y2020
## 6554  y2020
## 6555  y2020
## 6556  y2020
## 6557  y2020
## 6558  y2020
## 6559  y2020
## 6560  y2020
## 6561  y2020
## 6562  y2020
## 6563  y2020
## 6564  y2020
## 6565  y2020
## 6566  y2020
## 6567  y2020
## 6568  y2020
## 6569  y2020
## 6570  y2020
## 6571  y2020
## 6572  y2020
## 6573  y2020
## 6574  y2020
## 6575  y2020
## 6576  y2020
## 6577  y2020
## 6578  y2020
## 6579  y2020
## 6580  y2020
## 6581  y2020
## 6582  y2020
## 6583  y2020
## 6584  y2020
## 6585  y2020
## 6586  y2020
## 6587  y2020
## 6588  y2020
## 6589  y2020
## 6590  y2020
## 6591  y2020
## 6592  y2020
## 6593  y2020
## 6594  y2020
## 6595  y2020
## 6596  y2020
## 6597  y2020
## 6598  y2020
## 6599  y2020
## 6600  y2020
## 6601  y2020
## 6602  y2020
## 6603  y2020
## 6604  y2020
## 6605  y2020
## 6606  y2020
## 6607  y2020
## 6608  y2020
## 6609  y2020
## 6610  y2020
## 6611  y2020
## 6612  y2020
## 6613  y2020
## 6614  y2020
## 6615  y2020
## 6616  y2020
## 6617  y2020
## 6618  y2020
## 6619  y2020
## 6620  y2020
## 6621  y2020
## 6622  y2020
## 6623  y2020
## 6624  y2020
## 6625  y2020
## 6626  y2020
## 6627  y2020
## 6628  y2020
## 6629  y2020
## 6630  y2020
## 6631  y2020
## 6632  y2020
## 6633  y2020
## 6634  y2020
## 6635  y2020
## 6636  y2020
## 6637  y2020
## 6638  y2020
## 6639  y2020
## 6640  y2020
## 6641  y2020
## 6642  y2020
## 6643  y2020
## 6644  y2020
## 6645  y2020
## 6646  y2020
## 6647  y2020
## 6648  y2020
## 6649  y2020
## 6650  y2020
## 6651  y2020
## 6652  y2020
## 6653  y2020
## 6654  y2020
## 6655  y2020
## 6656  y2020
## 6657  y2020
## 6658  y2020
## 6659  y2020
## 6660  y2020
## 6661  y2020
## 6662  y2020
## 6663  y2020
## 6664  y2020
## 6665  y2020
## 6666  y2020
## 6667  y2020
## 6668  y2020
## 6669  y2020
## 6670  y2020
## 6671  y2020
## 6672  y2020
## 6673  y2020
## 6674  y2020
## 6675  y2020
## 6676  y2020
## 6677  y2020
## 6678  y2020
## 6679  y2020
## 6680  y2020
## 6681  y2020
## 6682  y2020
## 6683  y2020
## 6684  y2020
## 6685  y2020
## 6686  y2020
## 6687  y2020
## 6688  y2020
## 6689  y2020
## 6690  y2020
## 6691  y2020
## 6692  y2020
## 6693  y2020
## 6694  y2020
## 6695  y2020
## 6696  y2020
## 6697  y2020
## 6698  y2020
## 6699  y2020
## 6700  y2020
## 6701  y2020
## 6702  y2020
## 6703  y2020
## 6704  y2020
## 6705  y2020
## 6706  y2020
## 6707  y2020
## 6708  y2020
## 6709  y2020
## 6710  y2020
## 6711  y2020
## 6712  y2020
## 6713  y2020
## 6714  y2020
## 6715  y2020
## 6716  y2020
## 6717  y2020
## 6718  y2020
## 6719  y2020
## 6720  y2020
## 6721  y2020
## 6722  y2020
## 6723  y2020
## 6724  y2020
## 6725  y2020
## 6726  y2020
## 6727  y2020
## 6728  y2020
## 6729  y2020
## 6730  y2020
## 6731  y2020
## 6732  y2020
## 6733  y2020
## 6734  y2020
## 6735  y2020
## 6736  y2020
## 6737  y2020
## 6738  y2020
## 6739  y2020
## 6740  y2020
## 6741  y2020
## 6742  y2020
## 6743  y2020
## 6744  y2020
## 6745  y2020
## 6746  y2020
## 6747  y2020
## 6748  y2020
## 6749  y2020
## 6750  y2020
## 6751  y2020
## 6752  y2020
## 6753  y2020
## 6754  y2020
## 6755  y2020
## 6756  y2020
## 6757  y2020
## 6758  y2020
## 6759  y2020
## 6760  y2020
## 6761  y2020
## 6762  y2020
## 6763  y2020
## 6764  y2020
## 6765  y2020
## 6766  y2020
## 6767  y2020
## 6768  y2020
## 6769  y2020
## 6770  y2020
## 6771  y2020
## 6772  y2020
## 6773  y2020
## 6774  y2020
## 6775  y2020
## 6776  y2020
## 6777  y2020
## 6778  y2020
## 6779  y2020
## 6780  y2020
## 6781  y2020
## 6782  y2020
## 6783  y2020
## 6784  y2020
## 6785  y2020
## 6786  y2020
## 6787  y2020
## 6788  y2020
## 6789  y2020
## 6790  y2020
## 6791  y2020
## 6792  y2020
## 6793  y2020
## 6794  y2020
## 6795  y2020
## 6796  y2020
## 6797  y2020
## 6798  y2020
## 6799  y2020
## 6800  y2020
## 6801  y2020
## 6802  y2020
## 6803  y2020
## 6804  y2020
## 6805  y2020
## 6806  y2020
## 6807  y2020
## 6808  y2020
## 6809  y2020
## 6810  y2020
## 6811  y2020
## 6812  y2020
## 6813  y2020
## 6814  y2020
## 6815  y2020
## 6816  y2020
## 6817  y2020
## 6818  y2020
## 6819  y2020
## 6820  y2020
## 6821  y2020
## 6822  y2020
## 6823  y2020
## 6824  y2020
## 6825  y2020
## 6826  y2020
## 6827  y2020
## 6828  y2020
## 6829  y2020
## 6830  y2020
## 6831  y2020
## 6832  y2020
## 6833  y2020
## 6834  y2020
## 6835  y2020
## 6836  y2020
## 6837  y2020
## 6838  y2020
## 6839  y2020
## 6840  y2020
## 6841  y2020
## 6842  y2020
## 6843  y2020
## 6844  y2020
## 6845  y2020
## 6846  y2020
## 6847  y2020
## 6848  y2020
## 6849  y2020
## 6850  y2020
## 6851  y2020
## 6852  y2020
## 6853  y2020
## 6854  y2020
## 6855  y2020
## 6856  y2020
## 6857  y2020
## 6858  y2020
## 6859  y2020
## 6860  y2020
## 6861  y2020
## 6862  y2020
## 6863  y2020
## 6864  y2020
## 6865  y2020
## 6866  y2020
## 6867  y2020
## 6868  y2020
## 6869  y2020
## 6870  y2020
## 6871  y2020
## 6872  y2020
## 6873  y2020
## 6874  y2020
## 6875  y2020
## 6876  y2020
## 6877  y2020
## 6878  y2020
## 6879  y2020
## 6880  y2020
## 6881  y2020
## 6882  y2020
## 6883  y2020
## 6884  y2020
## 6885  y2020
## 6886  y2020
## 6887  y2020
## 6888  y2020
## 6889  y2020
## 6890  y2020
## 6891  y2020
## 6892  y2020
## 6893  y2020
## 6894  y2020
## 6895  y2020
## 6896  y2020
## 6897  y2020
## 6898  y2020
## 6899  y2020
## 6900  y2020
## 6901  y2020
## 6902  y2020
## 6903  y2020
## 6904  y2020
## 6905  y2020
## 6906  y2020
## 6907  y2020
## 6908  y2020
## 6909  y2020
## 6910  y2020
## 6911  y2020
## 6912  y2020
## 6913  y2020
## 6914  y2020
## 6915  y2020
## 6916  y2020
## 6917  y2020
## 6918  y2020
## 6919  y2020
## 6920  y2020
## 6921  y2020
## 6922  y2020
## 6923  y2020
## 6924  y2020
## 6925  y2020
## 6926  y2020
## 6927  y2020
## 6928  y2020
## 6929  y2020
## 6930  y2020
## 6931  y2020
## 6932  y2020
## 6933  y2020
## 6934  y2020
## 6935  y2020
## 6936  y2020
## 6937  y2020
## 6938  y2020
## 6939  y2020
## 6940  y2020
## 6941  y2020
## 6942  y2020
## 6943  y2020
## 6944  y2020
## 6945  y2020
## 6946  y2020
## 6947  y2020
## 6948  y2020
## 6949  y2020
## 6950  y2020
## 6951  y2020
## 6952  y2020
## 6953  y2020
## 6954  y2020
## 6955  y2020
## 6956  y2020
## 6957  y2020
## 6958  y2020
## 6959  y2020
## 6960  y2020
## 6961  y2020
## 6962  y2020
## 6963  y2020
## 6964  y2020
## 6965  y2020
## 6966  y2020
## 6967  y2020
## 6968  y2020
## 6969  y2020
## 6970  y2020
## 6971  y2020
## 6972  y2020
## 6973  y2020
## 6974  y2020
## 6975  y2020
## 6976  y2020
## 6977  y2020
## 6978  y2020
## 6979  y2020
## 6980  y2020
## 6981  y2020
## 6982  y2020
## 6983  y2020
## 6984  y2020
## 6985  y2020
## 6986  y2020
## 6987  y2020
## 6988  y2020
## 6989  y2020
## 6990  y2020
## 6991  y2020
## 6992  y2020
## 6993  y2020
## 6994  y2020
## 6995  y2020
## 6996  y2020
## 6997  y2020
## 6998  y2020
## 6999  y2020
## 7000  y2020
## 7001  y2020
## 7002  y2020
## 7003  y2020
## 7004  y2020
## 7005  y2020
## 7006  y2020
## 7007  y2020
## 7008  y2020
## 7009  y2020
## 7010  y2020
## 7011  y2020
## 7012  y2020
## 7013  y2020
## 7014  y2020
## 7015  y2020
## 7016  y2020
## 7017  y2020
## 7018  y2020
## 7019  y2020
## 7020  y2020
## 7021  y2020
## 7022  y2020
## 7023  y2020
## 7024  y2020
## 7025  y2020
## 7026  y2020
## 7027  y2020
## 7028  y2020
## 7029  y2020
## 7030  y2020
## 7031  y2020
## 7032  y2020
## 7033  y2020
## 7034  y2020
## 7035  y2020
## 7036  y2020
## 7037  y2020
## 7038  y2020
## 7039  y2020
## 7040  y2020
## 7041  y2020
## 7042  y2020
## 7043  y2020
## 7044  y2020
## 7045  y2020
## 7046  y2020
## 7047  y2020
## 7048  y2020
## 7049  y2020
## 7050  y2020
## 7051  y2020
## 7052  y2020
## 7053  y2020
## 7054  y2020
## 7055  y2020
## 7056  y2020
## 7057  y2020
## 7058  y2020
## 7059  y2020
## 7060  y2020
## 7061  y2020
## 7062  y2020
## 7063  y2020
## 7064  y2020
## 7065  y2020
## 7066  y2020
## 7067  y2020
## 7068  y2020
## 7069  y2020
## 7070  y2020
## 7071  y2020
## 7072  y2020
## 7073  y2020
## 7074  y2020
## 7075  y2020
## 7076  y2020
## 7077  y2020
## 7078  y2020
## 7079  y2020
## 7080  y2020
## 7081  y2020
## 7082  y2020
## 7083  y2020
## 7084  y2020
## 7085  y2020
## 7086  y2020
## 7087  y2020
## 7088  y2020
## 7089  y2020
## 7090  y2020
## 7091  y2020
## 7092  y2020
## 7093  y2020
## 7094  y2020
## 7095  y2020
## 7096  y2020
## 7097  y2020
## 7098  y2020
## 7099  y2020
## 7100  y2020
## 7101  y2020
## 7102  y2020
## 7103  y2020
## 7104  y2020
## 7105  y2020
## 7106  y2020
## 7107  y2020
## 7108  y2020
## 7109  y2020
## 7110  y2020
## 7111  y2020
## 7112  y2020
## 7113  y2020
## 7114  y2020
## 7115  y2020
## 7116  y2020
## 7117  y2020
## 7118  y2020
## 7119  y2020
## 7120  y2020
## 7121  y2020
## 7122  y2020
## 7123  y2020
## 7124  y2020
## 7125  y2020
## 7126  y2020
## 7127  y2020
## 7128  y2020
## 7129  y2020
## 7130  y2020
## 7131  y2020
## 7132  y2020
## 7133  y2020
## 7134  y2020
## 7135  y2020
## 7136  y2020
## 7137  y2020
## 7138  y2020
## 7139  y2020
## 7140  y2020
## 7141  y2020
## 7142  y2020
## 7143  y2020
## 7144  y2020
## 7145  y2020
## 7146  y2020
## 7147  y2020
## 7148  y2020
## 7149  y2020
## 7150  y2020
## 7151  y2020
## 7152  y2020
## 7153  y2020
## 7154  y2020
## 7155  y2020
## 7156  y2020
## 7157  y2020
## 7158  y2020
## 7159  y2020
## 7160  y2020
## 7161  y2020
## 7162  y2020
## 7163  y2020
## 7164  y2020
## 7165  y2020
## 7166  y2020
## 7167  y2020
## 7168  y2020
## 7169  y2020
## 7170  y2020
## 7171  y2020
## 7172  y2020
## 7173  y2020
## 7174  y2020
## 7175  y2020
## 7176  y2020
## 7177  y2020
## 7178  y2020
## 7179  y2020
## 7180  y2020
## 7181  y2020
## 7182  y2020
## 7183  y2020
## 7184  y2020
## 7185  y2020
## 7186  y2020
## 7187  y2020
## 7188  y2020
## 7189  y2020
## 7190  y2020
## 7191  y2020
## 7192  y2020
## 7193  y2020
## 7194  y2020
## 7195  y2020
## 7196  y2020
## 7197  y2020
## 7198  y2020
## 7199  y2020
## 7200  y2020
## 7201  y2020
## 7202  y2020
## 7203  y2020
## 7204  y2020
## 7205  y2020
## 7206  y2020
## 7207  y2020
## 7208  y2020
## 7209  y2020
## 7210  y2020
## 7211  y2020
## 7212  y2020
## 7213  y2020
## 7214  y2020
## 7215  y2020
## 7216  y2020
## 7217  y2020
## 7218  y2020
## 7219  y2020
## 7220  y2020
## 7221  y2020
## 7222  y2020
## 7223  y2020
## 7224  y2020
## 7225  y2020
## 7226  y2020
## 7227  y2020
## 7228  y2020
## 7229  y2020
## 7230  y2020
## 7231  y2020
## 7232  y2020
## 7233  y2020
## 7234  y2020
## 7235  y2020
## 7236  y2020
## 7237  y2020
## 7238  y2020
## 7239  y2020
## 7240  y2020
## 7241  y2020
## 7242  y2020
## 7243  y2020
## 7244  y2020
## 7245  y2020
## 7246  y2020
## 7247  y2020
## 7248  y2020
## 7249  y2020
## 7250  y2020
## 7251  y2020
## 7252  y2020
## 7253  y2020
## 7254  y2020
## 7255  y2020
## 7256  y2020
## 7257  y2020
## 7258  y2020
## 7259  y2020
## 7260  y2020
## 7261  y2020
## 7262  y2020
## 7263  y2020
## 7264  y2020
## 7265  y2020
## 7266  y2020
## 7267  y2020
## 7268  y2020
## 7269  y2020
## 7270  y2020
## 7271  y2020
## 7272  y2020
## 7273  y2020
## 7274  y2020
## 7275  y2020
## 7276  y2020
## 7277  y2020
## 7278  y2020
## 7279  y2020
## 7280  y2020
## 7281  y2020
## 7282  y2020
## 7283  y2020
## 7284  y2020
## 7285  y2020
## 7286  y2020
## 7287  y2020
## 7288  y2020
## 7289  y2020
## 7290  y2020
## 7291  y2020
## 7292  y2020
## 7293  y2020
## 7294  y2020
## 7295  y2020
## 7296  y2020
## 7297  y2020
## 7298  y2020
## 7299  y2020
## 7300  y2020
## 7301  y2020
## 7302  y2020
## 7303  y2020
## 7304  y2020
## 7305  y2020
## 7306  y2020
## 7307  y2020
## 7308  y2020
## 7309  y2020
## 7310  y2020
## 7311  y2020
## 7312  y2020
## 7313  y2020
## 7314  y2020
## 7315  y2020
## 7316  y2020
## 7317  y2020
## 7318  y2020
## 7319  y2020
## 7320  y2020
## 7321  y2020
## 7322  y2020
## 7323  y2020
## 7324  y2020
## 7325  y2020
## 7326  y2020
## 7327  y2020
## 7328  y2020
## 7329  y2020
## 7330  y2020
## 7331  y2020
## 7332  y2020
## 7333  y2020
## 7334  y2020
## 7335  y2020
## 7336  y2020
## 7337  y2020
## 7338  y2020
## 7339  y2020
## 7340  y2020
## 7341  y2020
## 7342  y2020
## 7343  y2020
## 7344  y2020
## 7345  y2020
## 7346  y2020
## 7347  y2020
## 7348  y2020
## 7349  y2020
## 7350  y2020
## 7351  y2020
## 7352  y2020
## 7353  y2020
## 7354  y2020
## 7355  y2020
## 7356  y2020
## 7357  y2020
## 7358  y2020
## 7359  y2020
## 7360  y2020
## 7361  y2020
## 7362  y2020
## 7363  y2020
## 7364  y2020
## 7365  y2020
## 7366  y2020
## 7367  y2020
## 7368  y2020
## 7369  y2020
## 7370  y2020
## 7371  y2020
## 7372  y2020
## 7373  y2020
## 7374  y2020
## 7375  y2020
## 7376  y2020
## 7377  y2020
## 7378  y2020
## 7379  y2020
## 7380  y2020
## 7381  y2020
## 7382  y2020
## 7383  y2020
## 7384  y2020
## 7385  y2020
## 7386  y2020
## 7387  y2020
## 7388  y2020
## 7389  y2020
## 7390  y2020
## 7391  y2020
## 7392  y2020
## 7393  y2020
## 7394  y2020
## 7395  y2020
## 7396  y2020
## 7397  y2020
## 7398  y2020
## 7399  y2020
## 7400  y2020
## 7401  y2020
## 7402  y2020
## 7403  y2020
## 7404  y2020
## 7405  y2020
## 7406  y2020
## 7407  y2020
## 7408  y2020
## 7409  y2020
## 7410  y2020
## 7411  y2020
## 7412  y2020
## 7413  y2020
## 7414  y2020
## 7415  y2020
## 7416  y2020
## 7417  y2020
## 7418  y2020
## 7419  y2020
## 7420  y2020
## 7421  y2020
## 7422  y2020
## 7423  y2020
## 7424  y2020
## 7425  y2020
## 7426  y2020
## 7427  y2020
## 7428  y2020
## 7429  y2020
## 7430  y2020
## 7431  y2020
## 7432  y2020
## 7433  y2020
## 7434  y2020
## 7435  y2020
## 7436  y2020
## 7437  y2020
## 7438  y2020
## 7439  y2020
## 7440  y2020
## 7441  y2020
## 7442  y2020
## 7443  y2020
## 7444  y2020
## 7445  y2020
## 7446  y2020
## 7447  y2020
## 7448  y2020
## 7449  y2020
## 7450  y2020
## 7451  y2020
## 7452  y2020
## 7453  y2020
## 7454  y2020
## 7455  y2020
## 7456  y2020
## 7457  y2020
## 7458  y2020
## 7459  y2020
## 7460  y2020
## 7461  y2020
## 7462  y2020
## 7463  y2020
## 7464  y2020
## 7465  y2020
## 7466  y2020
## 7467  y2020
## 7468  y2020
## 7469  y2020
## 7470  y2020
## 7471  y2020
## 7472  y2020
## 7473  y2020
## 7474  y2020
## 7475  y2020
## 7476  y2020
## 7477  y2020
## 7478  y2020
## 7479  y2020
## 7480  y2020
## 7481  y2020
## 7482  y2020
## 7483  y2020
## 7484  y2020
## 7485  y2020
## 7486  y2020
## 7487  y2020
## 7488  y2020
## 7489  y2020
## 7490  y2020
## 7491  y2020
## 7492  y2020
## 7493  y2020
## 7494  y2020
## 7495  y2020
## 7496  y2020
## 7497  y2020
## 7498  y2020
## 7499  y2020
## 7500  y2020
## 7501  y2020
## 7502  y2020
## 7503  y2020
## 7504  y2020
## 7505  y2020
## 7506  y2020
## 7507  y2020
## 7508  y2020
## 7509  y2020
## 7510  y2020
## 7511  y2020
## 7512  y2020
## 7513  y2020
## 7514  y2020
## 7515  y2020
## 7516  y2020
## 7517  y2020
## 7518  y2020
## 7519  y2020
## 7520  y2020
## 7521  y2020
## 7522  y2020
## 7523  y2020
## 7524  y2020
## 7525  y2020
## 7526  y2020
## 7527  y2020
## 7528  y2020
## 7529  y2020
## 7530  y2020
## 7531  y2020
## 7532  y2020
## 7533  y2020
## 7534  y2020
## 7535  y2020
## 7536  y2020
## 7537  y2020
## 7538  y2020
## 7539  y2020
## 7540  y2020
## 7541  y2020
## 7542  y2020
## 7543  y2020
## 7544  y2020
## 7545  y2020
## 7546  y2020
## 7547  y2020
## 7548  y2020
## 7549  y2020
## 7550  y2020
## 7551  y2020
## 7552  y2020
## 7553  y2020
## 7554  y2020
## 7555  y2020
## 7556  y2020
## 7557  y2020
## 7558  y2020
## 7559  y2020
## 7560  y2020
## 7561  y2020
## 7562  y2020
## 7563  y2020
## 7564  y2020
## 7565  y2020
## 7566  y2020
## 7567  y2020
## 7568  y2020
## 7569  y2020
## 7570  y2020
## 7571  y2020
## 7572  y2020
## 7573  y2020
## 7574  y2020
## 7575  y2020
## 7576  y2020
## 7577  y2020
## 7578  y2020
## 7579  y2020
## 7580  y2020
## 7581  y2020
## 7582  y2020
## 7583  y2020
## 7584  y2020
## 7585  y2020
## 7586  y2020
## 7587  y2020
## 7588  y2020
## 7589  y2020
## 7590  y2020
## 7591  y2020
## 7592  y2020
## 7593  y2020
## 7594  y2020
## 7595  y2020
## 7596  y2020
## 7597  y2020
## 7598  y2020
## 7599  y2020
## 7600  y2020
## 7601  y2020
## 7602  y2020
## 7603  y2020
## 7604  y2020
## 7605  y2020
## 7606  y2020
## 7607  y2020
## 7608  y2020
## 7609  y2020
## 7610  y2020
## 7611  y2020
## 7612  y2020
## 7613  y2020
## 7614  y2020
## 7615  y2020
## 7616  y2020
## 7617  y2020
## 7618  y2020
## 7619  y2020
## 7620  y2020
## 7621  y2020
## 7622  y2020
## 7623  y2020
## 7624  y2020
## 7625  y2020
## 7626  y2020
## 7627  y2020
## 7628  y2020
## 7629  y2020
## 7630  y2020
## 7631  y2020
## 7632  y2020
## 7633  y2020
## 7634  y2020
## 7635  y2020
## 7636  y2020
## 7637  y2020
## 7638  y2020
## 7639  y2020
## 7640  y2020
## 7641  y2020
## 7642  y2020
## 7643  y2020
## 7644  y2020
## 7645  y2020
## 7646  y2020
## 7647  y2020
## 7648  y2020
## 7649  y2020
## 7650  y2020
## 7651  y2020
## 7652  y2020
## 7653  y2020
## 7654  y2020
## 7655  y2020
## 7656  y2020
## 7657  y2020
## 7658  y2020
## 7659  y2020
## 7660  y2020
## 7661  y2020
## 7662  y2020
## 7663  y2020
## 7664  y2020
## 7665  y2020
## 7666  y2020
## 7667  y2020
## 7668  y2020
## 7669  y2020
## 7670  y2020
## 7671  y2020
## 7672  y2020
## 7673  y2020
## 7674  y2020
## 7675  y2020
## 7676  y2020
## 7677  y2020
## 7678  y2020
## 7679  y2020
## 7680  y2020
## 7681  y2020
## 7682  y2020
## 7683  y2020
## 7684  y2020
## 7685  y2020
## 7686  y2020
## 7687  y2020
## 7688  y2020
## 7689  y2020
## 7690  y2020
## 7691  y2020
## 7692  y2020
## 7693  y2020
## 7694  y2020
## 7695  y2020
## 7696  y2020
## 7697  y2020
## 7698  y2020
## 7699  y2020
## 7700  y2020
## 7701  y2020
## 7702  y2020
## 7703  y2020
## 7704  y2020
## 7705  y2020
## 7706  y2020
## 7707  y2020
## 7708  y2020
## 7709  y2020
## 7710  y2020
## 7711  y2020
## 7712  y2020
## 7713  y2020
## 7714  y2020
## 7715  y2020
## 7716  y2020
## 7717  y2020
## 7718  y2020
## 7719  y2020
## 7720  y2020
## 7721  y2020
## 7722  y2020
## 7723  y2020
## 7724  y2020
## 7725  y2020
## 7726  y2020
## 7727  y2020
## 7728  y2020
## 7729  y2020
## 7730  y2020
## 7731  y2020
## 7732  y2020
## 7733  y2020
## 7734  y2020
## 7735  y2020
## 7736  y2020
## 7737  y2020
## 7738  y2020
## 7739  y2020
## 7740  y2020
## 7741  y2020
## 7742  y2020
## 7743  y2020
## 7744  y2020
## 7745  y2020
## 7746  y2020
## 7747  y2020
## 7748  y2020
## 7749  y2020
## 7750  y2020
## 7751  y2020
## 7752  y2020
## 7753  y2020
## 7754  y2020
## 7755  y2020
## 7756  y2020
## 7757  y2020
## 7758  y2020
## 7759  y2020
## 7760  y2020
## 7761  y2020
## 7762  y2020
## 7763  y2020
## 7764  y2020
## 7765  y2020
## 7766  y2020
## 7767  y2020
## 7768  y2020
## 7769  y2020
## 7770  y2020
## 7771  y2020
## 7772  y2020
## 7773  y2020
## 7774  y2020
## 7775  y2020
## 7776  y2020
## 7777  y2020
## 7778  y2020
## 7779  y2020
## 7780  y2020
## 7781  y2020
## 7782  y2020
## 7783  y2020
## 7784  y2020
## 7785  y2020
## 7786  y2020
## 7787  y2020
## 7788  y2020
## 7789  y2020
## 7790  y2020
## 7791  y2020
## 7792  y2020
## 7793  y2020
## 7794  y2020
## 7795  y2020
## 7796  y2020
## 7797  y2020
## 7798  y2020
## 7799  y2020
## 7800  y2020
## 7801  y2020
## 7802  y2020
## 7803  y2020
## 7804  y2020
## 7805  y2020
## 7806  y2020
## 7807  y2020
## 7808  y2020
## 7809  y2020
## 7810  y2020
## 7811  y2020
## 7812  y2020
## 7813  y2020
## 7814  y2020
## 7815  y2020
## 7816  y2020
## 7817  y2020
## 7818  y2020
## 7819  y2020
## 7820  y2020
## 7821  y2020
## 7822  y2020
## 7823  y2021
## 7824  y2021
## 7825  y2021
## 7826  y2021
## 7827  y2021
## 7828  y2021
## 7829  y2021
## 7830  y2021
## 7831  y2021
## 7832  y2021
## 7833  y2021
## 7834  y2021
## 7835  y2021
## 7836  y2021
## 7837  y2021
## 7838  y2021
## 7839  y2021
## 7840  y2021
## 7841  y2021
## 7842  y2021
## 7843  y2021
## 7844  y2021
## 7845  y2021
## 7846  y2021
## 7847  y2021
## 7848  y2021
## 7849  y2021
## 7850  y2021
## 7851  y2021
## 7852  y2021
## 7853  y2021
## 7854  y2021
## 7855  y2021
## 7856  y2021
## 7857  y2021
## 7858  y2021
## 7859  y2021
## 7860  y2021
## 7861  y2021
## 7862  y2021
## 7863  y2021
## 7864  y2021
## 7865  y2021
## 7866  y2021
## 7867  y2021
## 7868  y2021
## 7869  y2021
## 7870  y2021
## 7871  y2021
## 7872  y2021
## 7873  y2021
## 7874  y2021
## 7875  y2021
## 7876  y2021
## 7877  y2021
## 7878  y2021
## 7879  y2021
## 7880  y2021
## 7881  y2021
## 7882  y2021
## 7883  y2021
## 7884  y2021
## 7885  y2021
## 7886  y2021
## 7887  y2021
## 7888  y2021
## 7889  y2021
## 7890  y2021
## 7891  y2021
## 7892  y2021
## 7893  y2021
## 7894  y2021
## 7895  y2021
## 7896  y2021
## 7897  y2021
## 7898  y2021
## 7899  y2021
## 7900  y2021
## 7901  y2021
## 7902  y2021
## 7903  y2021
## 7904  y2021
## 7905  y2021
## 7906  y2021
## 7907  y2021
## 7908  y2021
## 7909  y2021
## 7910  y2021
## 7911  y2021
## 7912  y2021
## 7913  y2021
## 7914  y2021
## 7915  y2021
## 7916  y2021
## 7917  y2021
## 7918  y2021
## 7919  y2021
## 7920  y2021
## 7921  y2021
## 7922  y2021
## 7923  y2021
## 7924  y2021
## 7925  y2021
## 7926  y2021
## 7927  y2021
## 7928  y2021
## 7929  y2021
## 7930  y2021
## 7931  y2021
## 7932  y2021
## 7933  y2021
## 7934  y2021
## 7935  y2021
## 7936  y2021
## 7937  y2021
## 7938  y2021
## 7939  y2021
## 7940  y2021
## 7941  y2021
## 7942  y2021
## 7943  y2021
## 7944  y2021
## 7945  y2021
## 7946  y2021
## 7947  y2021
## 7948  y2021
## 7949  y2021
## 7950  y2021
## 7951  y2021
## 7952  y2021
## 7953  y2021
## 7954  y2021
## 7955  y2021
## 7956  y2021
## 7957  y2021
## 7958  y2021
## 7959  y2021
## 7960  y2021
## 7961  y2021
## 7962  y2021
## 7963  y2021
## 7964  y2021
## 7965  y2021
## 7966  y2021
## 7967  y2021
## 7968  y2021
## 7969  y2021
## 7970  y2021
## 7971  y2021
## 7972  y2021
## 7973  y2021
## 7974  y2021
## 7975  y2021
## 7976  y2021
## 7977  y2021
## 7978  y2021
## 7979  y2021
## 7980  y2021
## 7981  y2021
## 7982  y2021
## 7983  y2021
## 7984  y2021
## 7985  y2021
## 7986  y2021
## 7987  y2021
## 7988  y2021
## 7989  y2021
## 7990  y2021
## 7991  y2021
## 7992  y2021
## 7993  y2021
## 7994  y2021
## 7995  y2021
## 7996  y2021
## 7997  y2021
## 7998  y2021
## 7999  y2021
## 8000  y2021
## 8001  y2021
## 8002  y2021
## 8003  y2021
## 8004  y2021
## 8005  y2021
## 8006  y2021
## 8007  y2021
## 8008  y2021
## 8009  y2021
## 8010  y2021
## 8011  y2021
## 8012  y2021
## 8013  y2021
## 8014  y2021
## 8015  y2021
## 8016  y2021
## 8017  y2021
## 8018  y2021
## 8019  y2021
## 8020  y2021
## 8021  y2021
## 8022  y2021
## 8023  y2021
## 8024  y2021
## 8025  y2021
## 8026  y2021
## 8027  y2021
## 8028  y2021
## 8029  y2021
## 8030  y2021
## 8031  y2021
## 8032  y2021
## 8033  y2021
## 8034  y2021
## 8035  y2021
## 8036  y2021
## 8037  y2021
## 8038  y2021
## 8039  y2021
## 8040  y2021
## 8041  y2021
## 8042  y2021
## 8043  y2021
## 8044  y2021
## 8045  y2021
## 8046  y2021
## 8047  y2021
## 8048  y2021
## 8049  y2021
## 8050  y2021
## 8051  y2021
## 8052  y2021
## 8053  y2021
## 8054  y2021
## 8055  y2021
## 8056  y2021
## 8057  y2021
## 8058  y2021
## 8059  y2021
## 8060  y2021
## 8061  y2021
## 8062  y2021
## 8063  y2021
## 8064  y2021
## 8065  y2021
## 8066  y2021
## 8067  y2021
## 8068  y2021
## 8069  y2021
## 8070  y2021
## 8071  y2021
## 8072  y2021
## 8073  y2021
## 8074  y2021
## 8075  y2021
## 8076  y2021
## 8077  y2021
## 8078  y2021
## 8079  y2021
## 8080  y2021
## 8081  y2021
## 8082  y2021
## 8083  y2021
## 8084  y2021
## 8085  y2021
## 8086  y2021
## 8087  y2021
## 8088  y2021
## 8089  y2021
## 8090  y2021
## 8091  y2021
## 8092  y2021
## 8093  y2021
## 8094  y2021
## 8095  y2021
## 8096  y2021
## 8097  y2021
## 8098  y2021
## 8099  y2021
## 8100  y2021
## 8101  y2021
## 8102  y2021
## 8103  y2021
## 8104  y2021
## 8105  y2021
## 8106  y2021
## 8107  y2021
## 8108  y2021
## 8109  y2021
## 8110  y2021
## 8111  y2021
## 8112  y2021
## 8113  y2021
## 8114  y2021
## 8115  y2021
## 8116  y2021
## 8117  y2021
## 8118  y2021
## 8119  y2021
## 8120  y2021
## 8121  y2021
## 8122  y2021
## 8123  y2021
## 8124  y2021
## 8125  y2021
## 8126  y2021
## 8127  y2021
## 8128  y2021
## 8129  y2021
## 8130  y2021
## 8131  y2021
## 8132  y2021
## 8133  y2021
## 8134  y2021
## 8135  y2021
## 8136  y2021
## 8137  y2021
## 8138  y2021
## 8139  y2021
## 8140  y2021
## 8141  y2021
## 8142  y2021
## 8143  y2021
## 8144  y2021
## 8145  y2021
## 8146  y2021
## 8147  y2021
## 8148  y2021
## 8149  y2021
## 8150  y2021
## 8151  y2021
## 8152  y2021
## 8153  y2021
## 8154  y2021
## 8155  y2021
## 8156  y2021
## 8157  y2021
## 8158  y2021
## 8159  y2021
## 8160  y2021
## 8161  y2021
## 8162  y2021
## 8163  y2021
## 8164  y2021
## 8165  y2021
## 8166  y2021
## 8167  y2021
## 8168  y2021
## 8169  y2021
## 8170  y2021
## 8171  y2021
## 8172  y2021
## 8173  y2021
## 8174  y2021
## 8175  y2021
## 8176  y2021
## 8177  y2021
## 8178  y2021
## 8179  y2021
## 8180  y2021
## 8181  y2021
## 8182  y2021
## 8183  y2021
## 8184  y2021
## 8185  y2021
## 8186  y2021
## 8187  y2021
## 8188  y2021
## 8189  y2021
## 8190  y2021
## 8191  y2021
## 8192  y2021
## 8193  y2021
## 8194  y2021
## 8195  y2021
## 8196  y2021
## 8197  y2021
## 8198  y2021
## 8199  y2021
## 8200  y2021
## 8201  y2021
## 8202  y2021
## 8203  y2021
## 8204  y2021
## 8205  y2021
## 8206  y2021
## 8207  y2021
## 8208  y2021
## 8209  y2021
## 8210  y2021
## 8211  y2021
## 8212  y2021
## 8213  y2021
## 8214  y2021
## 8215  y2021
## 8216  y2021
## 8217  y2021
## 8218  y2021
## 8219  y2021
## 8220  y2021
## 8221  y2021
## 8222  y2021
## 8223  y2021
## 8224  y2021
## 8225  y2021
## 8226  y2021
## 8227  y2021
## 8228  y2021
## 8229  y2021
## 8230  y2021
## 8231  y2021
## 8232  y2021
## 8233  y2021
## 8234  y2021
## 8235  y2021
## 8236  y2021
## 8237  y2021
## 8238  y2021
## 8239  y2021
## 8240  y2021
## 8241  y2021
## 8242  y2021
## 8243  y2021
## 8244  y2021
## 8245  y2021
## 8246  y2021
## 8247  y2021
## 8248  y2021
## 8249  y2021
## 8250  y2021
## 8251  y2021
## 8252  y2021
## 8253  y2021
## 8254  y2021
## 8255  y2021
## 8256  y2021
## 8257  y2021
## 8258  y2021
## 8259  y2021
## 8260  y2021
## 8261  y2021
## 8262  y2021
## 8263  y2021
## 8264  y2021
## 8265  y2021
## 8266  y2021
## 8267  y2021
## 8268  y2021
## 8269  y2021
## 8270  y2021
## 8271  y2021
## 8272  y2021
## 8273  y2021
## 8274  y2021
## 8275  y2021
## 8276  y2021
## 8277  y2021
## 8278  y2021
## 8279  y2021
## 8280  y2021
## 8281  y2021
## 8282  y2021
## 8283  y2021
## 8284  y2021
## 8285  y2021
## 8286  y2021
## 8287  y2021
## 8288  y2021
## 8289  y2021
## 8290  y2021
## 8291  y2021
## 8292  y2021
## 8293  y2021
## 8294  y2021
## 8295  y2021
## 8296  y2021
## 8297  y2021
## 8298  y2021
## 8299  y2021
## 8300  y2021
## 8301  y2021
## 8302  y2021
## 8303  y2021
## 8304  y2021
## 8305  y2021
## 8306  y2021
## 8307  y2021
## 8308  y2021
## 8309  y2021
## 8310  y2021
## 8311  y2021
## 8312  y2021
## 8313  y2021
## 8314  y2021
## 8315  y2021
## 8316  y2021
## 8317  y2021
## 8318  y2021
## 8319  y2021
## 8320  y2021
## 8321  y2021
## 8322  y2021
## 8323  y2021
## 8324  y2021
## 8325  y2021
## 8326  y2021
## 8327  y2021
## 8328  y2021
## 8329  y2021
## 8330  y2021
## 8331  y2021
## 8332  y2021
## 8333  y2021
## 8334  y2021
## 8335  y2021
## 8336  y2021
## 8337  y2021
## 8338  y2021
## 8339  y2021
## 8340  y2021
## 8341  y2021
## 8342  y2021
## 8343  y2021
## 8344  y2021
## 8345  y2021
## 8346  y2021
## 8347  y2021
## 8348  y2021
## 8349  y2021
## 8350  y2021
## 8351  y2021
## 8352  y2021
## 8353  y2021
## 8354  y2021
## 8355  y2021
## 8356  y2021
## 8357  y2021
## 8358  y2021
## 8359  y2021
## 8360  y2021
## 8361  y2021
## 8362  y2021
## 8363  y2021
## 8364  y2021
## 8365  y2021
## 8366  y2021
## 8367  y2021
## 8368  y2021
## 8369  y2021
## 8370  y2021
## 8371  y2021
## 8372  y2021
## 8373  y2021
## 8374  y2021
## 8375  y2021
## 8376  y2021
## 8377  y2021
## 8378  y2021
## 8379  y2021
## 8380  y2021
## 8381  y2021
## 8382  y2021
## 8383  y2021
## 8384  y2021
## 8385  y2021
## 8386  y2021
## 8387  y2021
## 8388  y2021
## 8389  y2021
## 8390  y2021
## 8391  y2021
## 8392  y2021
## 8393  y2021
## 8394  y2021
## 8395  y2021
## 8396  y2021
## 8397  y2021
## 8398  y2021
## 8399  y2021
## 8400  y2021
## 8401  y2021
## 8402  y2021
## 8403  y2021
## 8404  y2021
## 8405  y2021
## 8406  y2021
## 8407  y2021
## 8408  y2021
## 8409  y2021
## 8410  y2021
## 8411  y2021
## 8412  y2021
## 8413  y2021
## 8414  y2021
## 8415  y2021
## 8416  y2021
## 8417  y2021
## 8418  y2021
## 8419  y2021
## 8420  y2021
## 8421  y2021
## 8422  y2021
## 8423  y2021
## 8424  y2021
## 8425  y2021
## 8426  y2021
## 8427  y2021
## 8428  y2021
## 8429  y2021
## 8430  y2021
## 8431  y2021
## 8432  y2021
## 8433  y2021
## 8434  y2021
## 8435  y2021
## 8436  y2021
## 8437  y2021
## 8438  y2021
## 8439  y2021
## 8440  y2021
## 8441  y2021
## 8442  y2021
## 8443  y2021
## 8444  y2021
## 8445  y2021
## 8446  y2021
## 8447  y2021
## 8448  y2021
## 8449  y2021
## 8450  y2021
## 8451  y2021
## 8452  y2021
## 8453  y2021
## 8454  y2021
## 8455  y2021
## 8456  y2021
## 8457  y2021
## 8458  y2021
## 8459  y2021
## 8460  y2021
## 8461  y2021
## 8462  y2021
## 8463  y2021
## 8464  y2021
## 8465  y2021
## 8466  y2021
## 8467  y2021
## 8468  y2021
## 8469  y2021
## 8470  y2021
## 8471  y2021
## 8472  y2021
## 8473  y2021
## 8474  y2021
## 8475  y2021
## 8476  y2021
## 8477  y2021
## 8478  y2021
## 8479  y2021
## 8480  y2021
## 8481  y2021
## 8482  y2021
## 8483  y2021
## 8484  y2021
## 8485  y2021
## 8486  y2021
## 8487  y2021
## 8488  y2021
## 8489  y2021
## 8490  y2021
## 8491  y2021
## 8492  y2021
## 8493  y2021
## 8494  y2021
## 8495  y2021
## 8496  y2021
## 8497  y2021
## 8498  y2021
## 8499  y2021
## 8500  y2021
## 8501  y2021
## 8502  y2021
## 8503  y2021
## 8504  y2021
## 8505  y2021
## 8506  y2021
## 8507  y2021
## 8508  y2021
## 8509  y2021
## 8510  y2021
## 8511  y2021
## 8512  y2021
## 8513  y2021
## 8514  y2021
## 8515  y2021
## 8516  y2021
## 8517  y2021
## 8518  y2021
## 8519  y2021
## 8520  y2021
## 8521  y2021
## 8522  y2021
## 8523  y2021
## 8524  y2021
## 8525  y2021
## 8526  y2021
## 8527  y2021
## 8528  y2021
## 8529  y2021
## 8530  y2021
## 8531  y2021
## 8532  y2021
## 8533  y2021
## 8534  y2021
## 8535  y2021
## 8536  y2021
## 8537  y2021
## 8538  y2021
## 8539  y2021
## 8540  y2021
## 8541  y2021
## 8542  y2021
## 8543  y2021
## 8544  y2021
## 8545  y2021
## 8546  y2021
## 8547  y2021
## 8548  y2021
## 8549  y2021
## 8550  y2021
## 8551  y2021
## 8552  y2021
## 8553  y2021
## 8554  y2021
## 8555  y2021
## 8556  y2021
## 8557  y2021
## 8558  y2021
## 8559  y2021
## 8560  y2021
## 8561  y2021
## 8562  y2021
## 8563  y2021
## 8564  y2021
## 8565  y2021
## 8566  y2021
## 8567  y2021
## 8568  y2021
## 8569  y2021
## 8570  y2021
## 8571  y2021
## 8572  y2021
## 8573  y2021
## 8574  y2021
## 8575  y2021
## 8576  y2021
## 8577  y2021
## 8578  y2021
## 8579  y2021
## 8580  y2021
## 8581  y2021
## 8582  y2021
## 8583  y2021
## 8584  y2021
## 8585  y2021
## 8586  y2021
## 8587  y2021
## 8588  y2021
## 8589  y2021
## 8590  y2021
## 8591  y2021
## 8592  y2021
## 8593  y2021
## 8594  y2021
## 8595  y2021
## 8596  y2021
## 8597  y2021
## 8598  y2021
## 8599  y2021
## 8600  y2021
## 8601  y2021
## 8602  y2021
## 8603  y2021
## 8604  y2021
## 8605  y2021
## 8606  y2021
## 8607  y2021
## 8608  y2021
## 8609  y2021
## 8610  y2021
## 8611  y2021
## 8612  y2021
## 8613  y2021
## 8614  y2021
## 8615  y2021
## 8616  y2021
## 8617  y2021
## 8618  y2021
## 8619  y2021
## 8620  y2021
## 8621  y2021
## 8622  y2021
## 8623  y2021
## 8624  y2021
## 8625  y2021
## 8626  y2021
## 8627  y2021
## 8628  y2021
## 8629  y2021
## 8630  y2021
## 8631  y2021
## 8632  y2021
## 8633  y2021
## 8634  y2021
## 8635  y2021
## 8636  y2021
## 8637  y2021
## 8638  y2021
## 8639  y2021
## 8640  y2021
## 8641  y2021
## 8642  y2021
## 8643  y2021
## 8644  y2021
## 8645  y2021
## 8646  y2021
## 8647  y2021
## 8648  y2021
## 8649  y2021
## 8650  y2021
## 8651  y2021
## 8652  y2021
## 8653  y2021
## 8654  y2021
## 8655  y2021
## 8656  y2021
## 8657  y2021
## 8658  y2021
## 8659  y2021
## 8660  y2021
## 8661  y2021
## 8662  y2021
## 8663  y2021
## 8664  y2021
## 8665  y2021
## 8666  y2021
## 8667  y2021
## 8668  y2021
## 8669  y2021
## 8670  y2021
## 8671  y2021
## 8672  y2021
## 8673  y2021
## 8674  y2021
## 8675  y2021
## 8676  y2021
## 8677  y2021
## 8678  y2021
## 8679  y2021
## 8680  y2021
## 8681  y2021
## 8682  y2021
## 8683  y2021
## 8684  y2021
## 8685  y2021
## 8686  y2021
## 8687  y2021
## 8688  y2021
## 8689  y2021
## 8690  y2021
## 8691  y2021
## 8692  y2021
## 8693  y2021
## 8694  y2021
## 8695  y2021
## 8696  y2021
## 8697  y2021
## 8698  y2021
## 8699  y2021
## 8700  y2021
## 8701  y2021
## 8702  y2021
## 8703  y2021
## 8704  y2021
## 8705  y2021
## 8706  y2021
## 8707  y2021
## 8708  y2021
## 8709  y2021
## 8710  y2021
## 8711  y2021
## 8712  y2021
## 8713  y2021
## 8714  y2021
## 8715  y2021
## 8716  y2021
## 8717  y2021
## 8718  y2021
## 8719  y2021
## 8720  y2021
## 8721  y2021
## 8722  y2021
## 8723  y2021
## 8724  y2021
## 8725  y2021
## 8726  y2021
## 8727  y2021
## 8728  y2021
## 8729  y2021
## 8730  y2021
## 8731  y2021
## 8732  y2021
## 8733  y2021
## 8734  y2021
## 8735  y2021
## 8736  y2021
## 8737  y2021
## 8738  y2021
## 8739  y2021
## 8740  y2021
## 8741  y2021
## 8742  y2021
## 8743  y2021
## 8744  y2021
## 8745  y2021
## 8746  y2021
## 8747  y2021
## 8748  y2021
## 8749  y2021
## 8750  y2021
## 8751  y2021
## 8752  y2021
## 8753  y2021
## 8754  y2021
## 8755  y2021
## 8756  y2021
## 8757  y2021
## 8758  y2021
## 8759  y2021
## 8760  y2021
## 8761  y2021
## 8762  y2021
## 8763  y2021
## 8764  y2021
## 8765  y2021
## 8766  y2021
## 8767  y2021
## 8768  y2021
## 8769  y2021
## 8770  y2021
## 8771  y2021
## 8772  y2021
## 8773  y2021
## 8774  y2021
## 8775  y2021
## 8776  y2021
## 8777  y2021
## 8778  y2021
## 8779  y2021
## 8780  y2021
## 8781  y2021
## 8782  y2021
## 8783  y2021
## 8784  y2021
## 8785  y2021
## 8786  y2021
## 8787  y2021
## 8788  y2021
## 8789  y2021
## 8790  y2021
## 8791  y2021
## 8792  y2021
## 8793  y2021
## 8794  y2021
## 8795  y2021
## 8796  y2021
## 8797  y2021
## 8798  y2021
## 8799  y2021
## 8800  y2021
## 8801  y2021
## 8802  y2021
## 8803  y2021
## 8804  y2021
## 8805  y2021
## 8806  y2021
## 8807  y2021
## 8808  y2021
## 8809  y2021
## 8810  y2021
## 8811  y2021
## 8812  y2021
## 8813  y2021
## 8814  y2021
## 8815  y2021
## 8816  y2021
## 8817  y2021
## 8818  y2021
## 8819  y2021
## 8820  y2021
## 8821  y2021
## 8822  y2021
## 8823  y2021
## 8824  y2021
## 8825  y2021
## 8826  y2021
## 8827  y2021
## 8828  y2021
## 8829  y2021
## 8830  y2021
## 8831  y2021
## 8832  y2021
## 8833  y2021
## 8834  y2021
## 8835  y2021
## 8836  y2021
## 8837  y2021
## 8838  y2021
## 8839  y2021
## 8840  y2021
## 8841  y2021
## 8842  y2021
## 8843  y2021
## 8844  y2021
## 8845  y2021
## 8846  y2021
## 8847  y2021
## 8848  y2021
## 8849  y2021
## 8850  y2021
## 8851  y2021
## 8852  y2021
## 8853  y2021
## 8854  y2021
## 8855  y2021
## 8856  y2021
## 8857  y2021
## 8858  y2021
## 8859  y2021
## 8860  y2021
## 8861  y2021
## 8862  y2021
## 8863  y2021
## 8864  y2021
## 8865  y2021
## 8866  y2021
## 8867  y2021
## 8868  y2021
## 8869  y2021
## 8870  y2021
## 8871  y2021
## 8872  y2021
## 8873  y2021
## 8874  y2021
## 8875  y2021
## 8876  y2021
## 8877  y2021
## 8878  y2021
## 8879  y2021
## 8880  y2021
## 8881  y2021
## 8882  y2021
## 8883  y2021
## 8884  y2021
## 8885  y2021
## 8886  y2021
## 8887  y2021
## 8888  y2021
## 8889  y2021
## 8890  y2021
## 8891  y2021
## 8892  y2021
## 8893  y2021
## 8894  y2021
## 8895  y2021
## 8896  y2021
## 8897  y2021
## 8898  y2021
## 8899  y2021
## 8900  y2021
## 8901  y2021
## 8902  y2021
## 8903  y2021
## 8904  y2021
## 8905  y2021
## 8906  y2021
## 8907  y2021
## 8908  y2021
## 8909  y2021
## 8910  y2021
## 8911  y2021
## 8912  y2021
## 8913  y2021
## 8914  y2021
## 8915  y2021
## 8916  y2021
## 8917  y2021
## 8918  y2021
## 8919  y2021
## 8920  y2021
## 8921  y2021
## 8922  y2021
## 8923  y2021
## 8924  y2021
## 8925  y2021
## 8926  y2021
## 8927  y2021
## 8928  y2021
## 8929  y2021
## 8930  y2021
## 8931  y2021
## 8932  y2021
## 8933  y2021
## 8934  y2021
## 8935  y2021
## 8936  y2021
## 8937  y2021
## 8938  y2021
## 8939  y2021
## 8940  y2021
## 8941  y2021
## 8942  y2021
## 8943  y2021
## 8944  y2021
## 8945  y2021
## 8946  y2021
## 8947  y2021
## 8948  y2021
## 8949  y2021
## 8950  y2021
## 8951  y2021
## 8952  y2021
## 8953  y2021
## 8954  y2021
## 8955  y2021
## 8956  y2021
## 8957  y2021
## 8958  y2021
## 8959  y2021
## 8960  y2021
## 8961  y2021
## 8962  y2021
## 8963  y2021
## 8964  y2021
## 8965  y2021
## 8966  y2021
## 8967  y2021
## 8968  y2021
## 8969  y2021
## 8970  y2021
## 8971  y2021
## 8972  y2021
## 8973  y2021
## 8974  y2021
## 8975  y2021
## 8976  y2021
## 8977  y2021
## 8978  y2021
## 8979  y2021
## 8980  y2021
## 8981  y2021
## 8982  y2021
## 8983  y2021
## 8984  y2021
## 8985  y2021
## 8986  y2021
## 8987  y2021
## 8988  y2021
## 8989  y2021
## 8990  y2021
## 8991  y2021
## 8992  y2021
## 8993  y2021
## 8994  y2021
## 8995  y2021
## 8996  y2021
## 8997  y2021
## 8998  y2021
## 8999  y2021
## 9000  y2021
## 9001  y2021
## 9002  y2021
## 9003  y2021
## 9004  y2021
## 9005  y2021
## 9006  y2021
## 9007  y2021
## 9008  y2021
## 9009  y2021
## 9010  y2021
## 9011  y2021
## 9012  y2021
## 9013  y2021
## 9014  y2021
## 9015  y2021
## 9016  y2021
## 9017  y2021
## 9018  y2021
## 9019  y2021
## 9020  y2021
## 9021  y2021
## 9022  y2021
## 9023  y2021
## 9024  y2021
## 9025  y2021
## 9026  y2021
## 9027  y2021
## 9028  y2021
## 9029  y2021
## 9030  y2021
## 9031  y2021
## 9032  y2021
## 9033  y2021
## 9034  y2021
## 9035  y2021
## 9036  y2021
## 9037  y2021
## 9038  y2021
## 9039  y2021
## 9040  y2021
## 9041  y2021
## 9042  y2021
## 9043  y2021
## 9044  y2021
## 9045  y2021
## 9046  y2021
## 9047  y2021
## 9048  y2021
## 9049  y2021
## 9050  y2021
## 9051  y2021
## 9052  y2021
## 9053  y2021
## 9054  y2021
## 9055  y2021
## 9056  y2021
## 9057  y2021
## 9058  y2021
## 9059  y2021
## 9060  y2021
## 9061  y2021
## 9062  y2021
## 9063  y2021
## 9064  y2021
## 9065  y2021
## 9066  y2021
## 9067  y2021
## 9068  y2021
## 9069  y2021
## 9070  y2021
## 9071  y2021
## 9072  y2021
## 9073  y2021
## 9074  y2021
## 9075  y2021
## 9076  y2021
## 9077  y2021
## 9078  y2021
## 9079  y2021
## 9080  y2021
## 9081  y2021
## 9082  y2021
## 9083  y2021
## 9084  y2021
## 9085  y2021
## 9086  y2021
## 9087  y2021
## 9088  y2021
## 9089  y2021
## 9090  y2021
## 9091  y2021
## 9092  y2021
## 9093  y2021
## 9094  y2021
## 9095  y2021
## 9096  y2021
## 9097  y2021
## 9098  y2021
## 9099  y2021
## 9100  y2021
## 9101  y2021
## 9102  y2021
## 9103  y2021
## 9104  y2021
## 9105  y2021
## 9106  y2021
## 9107  y2021
## 9108  y2021
## 9109  y2021
## 9110  y2021
## 9111  y2021
## 9112  y2021
## 9113  y2021
## 9114  y2021
## 9115  y2021
## 9116  y2021
## 9117  y2021
## 9118  y2021
## 9119  y2021
## 9120  y2021
## 9121  y2021
## 9122  y2021
## 9123  y2021
## 9124  y2021
## 9125  y2021
## 9126  y2021
## 9127  y2021
## 9128  y2021
## 9129  y2021
## 9130  y2021
## 9131  y2021
## 9132  y2021
## 9133  y2021
## 9134  y2021
## 9135  y2021
## 9136  y2021
## 9137  y2021
## 9138  y2021
## 9139  y2021
## 9140  y2021
## 9141  y2021
## 9142  y2021
## 9143  y2021
## 9144  y2021
## 9145  y2021
## 9146  y2021
## 9147  y2021
## 9148  y2021
## 9149  y2021
## 9150  y2021
## 9151  y2021
## 9152  y2021
## 9153  y2021
## 9154  y2021
## 9155  y2021
## 9156  y2021
## 9157  y2021
## 9158  y2021
## 9159  y2021
## 9160  y2021
## 9161  y2021
## 9162  y2021
## 9163  y2021
## 9164  y2021
## 9165  y2021
## 9166  y2021
## 9167  y2021
## 9168  y2021
## 9169  y2021
## 9170  y2021
## 9171  y2021
## 9172  y2021
## 9173  y2021
## 9174  y2021
## 9175  y2021
## 9176  y2021
## 9177  y2021
## 9178  y2021
## 9179  y2021
## 9180  y2021
## 9181  y2021
## 9182  y2021
## 9183  y2021
## 9184  y2021
## 9185  y2021
## 9186  y2021
## 9187  y2021
## 9188  y2021
## 9189  y2021
## 9190  y2021
## 9191  y2021
## 9192  y2021
## 9193  y2021
## 9194  y2021
## 9195  y2021
## 9196  y2021
## 9197  y2021
## 9198  y2021
## 9199  y2021
## 9200  y2021
## 9201  y2021
## 9202  y2021
## 9203  y2021
## 9204  y2021
## 9205  y2021
## 9206  y2021
## 9207  y2021
## 9208  y2021
## 9209  y2021
## 9210  y2021
## 9211  y2021
## 9212  y2021
## 9213  y2021
## 9214  y2021
## 9215  y2021
## 9216  y2021
## 9217  y2021
## 9218  y2021
## 9219  y2021
## 9220  y2021
## 9221  y2021
## 9222  y2021
## 9223  y2021
## 9224  y2021
## 9225  y2021
## 9226  y2021
## 9227  y2021
## 9228  y2021
## 9229  y2021
## 9230  y2021
## 9231  y2021
## 9232  y2021
## 9233  y2021
## 9234  y2021
## 9235  y2021
## 9236  y2021
## 9237  y2021
## 9238  y2021
## 9239  y2021
## 9240  y2021
## 9241  y2021
## 9242  y2021
## 9243  y2021
## 9244  y2021
## 9245  y2021
## 9246  y2021
## 9247  y2021
## 9248  y2021
## 9249  y2021
## 9250  y2021
## 9251  y2021
## 9252  y2021
## 9253  y2021
## 9254  y2021
## 9255  y2021
## 9256  y2021
## 9257  y2021
## 9258  y2021
## 9259  y2021
## 9260  y2021
## 9261  y2021
## 9262  y2021
## 9263  y2021
## 9264  y2021
## 9265  y2021
## 9266  y2021
## 9267  y2021
## 9268  y2021
## 9269  y2021
## 9270  y2021
## 9271  y2021
## 9272  y2021
## 9273  y2021
## 9274  y2021
## 9275  y2021
## 9276  y2021
## 9277  y2021
## 9278  y2021
## 9279  y2021
## 9280  y2021
## 9281  y2021
## 9282  y2021
## 9283  y2021
## 9284  y2021
## 9285  y2021
## 9286  y2021
## 9287  y2021
## 9288  y2021
## 9289  y2021
## 9290  y2021
## 9291  y2021
## 9292  y2022
## 9293  y2022
## 9294  y2022
## 9295  y2022
## 9296  y2022
## 9297  y2022
## 9298  y2022
## 9299  y2022
## 9300  y2022
## 9301  y2022
## 9302  y2022
## 9303  y2022
## 9304  y2022
## 9305  y2022
## 9306  y2022
## 9307  y2022
## 9308  y2022
## 9309  y2022
## 9310  y2022
## 9311  y2022
## 9312  y2022
## 9313  y2022
## 9314  y2022
## 9315  y2022
## 9316  y2022
## 9317  y2022
## 9318  y2022
## 9319  y2022
## 9320  y2022
## 9321  y2022
## 9322  y2022
## 9323  y2022
## 9324  y2022
## 9325  y2022
## 9326  y2022
## 9327  y2022
## 9328  y2022
## 9329  y2022
## 9330  y2022
## 9331  y2022
## 9332  y2022
## 9333  y2022
## 9334  y2022
## 9335  y2022
## 9336  y2022
## 9337  y2022
## 9338  y2022
## 9339  y2022
## 9340  y2022
## 9341  y2022
## 9342  y2022
## 9343  y2022
## 9344  y2022
## 9345  y2022
## 9346  y2022
## 9347  y2022
## 9348  y2022
## 9349  y2022
## 9350  y2022
## 9351  y2022
## 9352  y2022
## 9353  y2022
## 9354  y2022
## 9355  y2022
## 9356  y2022
## 9357  y2022
## 9358  y2022
## 9359  y2022
## 9360  y2022
## 9361  y2022
## 9362  y2022
## 9363  y2022
## 9364  y2022
## 9365  y2022
## 9366  y2022
## 9367  y2022
## 9368  y2022
## 9369  y2022
## 9370  y2022
## 9371  y2022
## 9372  y2022
## 9373  y2022
## 9374  y2022
## 9375  y2022
## 9376  y2022
## 9377  y2022
## 9378  y2022
## 9379  y2022
## 9380  y2022
## 9381  y2022
## 9382  y2022
## 9383  y2022
## 9384  y2022
## 9385  y2022
## 9386  y2022
## 9387  y2022
## 9388  y2022
## 9389  y2022
## 9390  y2022
## 9391  y2022
## 9392  y2022
## 9393  y2022
## 9394  y2022
## 9395  y2022
## 9396  y2022
## 9397  y2022
## 9398  y2022
## 9399  y2022
## 9400  y2022
## 9401  y2022
## 9402  y2022
## 9403  y2022
## 9404  y2022
## 9405  y2022
## 9406  y2022
## 9407  y2022
## 9408  y2022
## 9409  y2022
## 9410  y2022
## 9411  y2022
## 9412  y2022
## 9413  y2022
## 9414  y2022
## 9415  y2022
## 9416  y2022
## 9417  y2022
## 9418  y2022
## 9419  y2022
## 9420  y2022
## 9421  y2022
## 9422  y2022
## 9423  y2022
## 9424  y2022
## 9425  y2022
## 9426  y2022
## 9427  y2022
## 9428  y2022
## 9429  y2022
## 9430  y2022
## 9431  y2022
## 9432  y2022
## 9433  y2022
## 9434  y2022
## 9435  y2022
## 9436  y2022
## 9437  y2022
## 9438  y2022
## 9439  y2022
## 9440  y2022
## 9441  y2022
## 9442  y2022
## 9443  y2022
## 9444  y2022
## 9445  y2022
## 9446  y2022
## 9447  y2022
## 9448  y2022
## 9449  y2022
## 9450  y2022
## 9451  y2022
## 9452  y2022
## 9453  y2022
## 9454  y2022
## 9455  y2022
## 9456  y2022
## 9457  y2022
## 9458  y2022
## 9459  y2022
## 9460  y2022
## 9461  y2022
## 9462  y2022
## 9463  y2022
## 9464  y2022
## 9465  y2022
## 9466  y2022
## 9467  y2022
## 9468  y2022
## 9469  y2022
## 9470  y2022
## 9471  y2022
## 9472  y2022
## 9473  y2022
## 9474  y2022
## 9475  y2022
## 9476  y2022
## 9477  y2022
## 9478  y2022
## 9479  y2022
## 9480  y2022
## 9481  y2022
## 9482  y2022
## 9483  y2022
## 9484  y2022
## 9485  y2022
## 9486  y2022
## 9487  y2022
## 9488  y2022
## 9489  y2022
## 9490  y2022
## 9491  y2022
## 9492  y2022
## 9493  y2022
## 9494  y2022
## 9495  y2022
## 9496  y2022
## 9497  y2022
## 9498  y2022
## 9499  y2022
## 9500  y2022
## 9501  y2022
## 9502  y2022
## 9503  y2022
## 9504  y2022
## 9505  y2022
## 9506  y2022
## 9507  y2022
## 9508  y2022
## 9509  y2022
## 9510  y2022
## 9511  y2022
## 9512  y2022
## 9513  y2022
## 9514  y2022
## 9515  y2022
## 9516  y2022
## 9517  y2022
## 9518  y2022
## 9519  y2022
## 9520  y2022
## 9521  y2022
## 9522  y2022
## 9523  y2022
## 9524  y2022
## 9525  y2022
## 9526  y2022
## 9527  y2022
## 9528  y2022
## 9529  y2022
## 9530  y2022
## 9531  y2022
## 9532  y2022
## 9533  y2022
## 9534  y2022
## 9535  y2022
## 9536  y2022
## 9537  y2022
## 9538  y2022
## 9539  y2022
## 9540  y2022
## 9541  y2022
## 9542  y2022
## 9543  y2022
## 9544  y2022
## 9545  y2022
## 9546  y2022
## 9547  y2022
## 9548  y2022
## 9549  y2022
## 9550  y2022
## 9551  y2022
## 9552  y2022
## 9553  y2022
## 9554  y2022
## 9555  y2022
## 9556  y2022
## 9557  y2022
## 9558  y2022
## 9559  y2022
## 9560  y2022
## 9561  y2022
## 9562  y2022
## 9563  y2022
## 9564  y2022
## 9565  y2022
## 9566  y2022
## 9567  y2022
## 9568  y2022
## 9569  y2022
## 9570  y2022
## 9571  y2022
## 9572  y2022
## 9573  y2022
## 9574  y2022
## 9575  y2022
## 9576  y2022
## 9577  y2022
## 9578  y2022
## 9579  y2022
## 9580  y2022
## 9581  y2022
## 9582  y2022
## 9583  y2022
## 9584  y2022
## 9585  y2022
## 9586  y2022
## 9587  y2022
## 9588  y2022
## 9589  y2022
## 9590  y2022
## 9591  y2022
## 9592  y2022
## 9593  y2022
## 9594  y2022
## 9595  y2022
## 9596  y2022
## 9597  y2022
## 9598  y2022
## 9599  y2022
## 9600  y2022
## 9601  y2022
## 9602  y2022
## 9603  y2022
## 9604  y2022
## 9605  y2022
## 9606  y2022
## 9607  y2022
## 9608  y2022
## 9609  y2022
## 9610  y2022
## 9611  y2022
## 9612  y2022
## 9613  y2022
## 9614  y2022
## 9615  y2022
## 9616  y2022
## 9617  y2022
## 9618  y2022
## 9619  y2022
## 9620  y2022
## 9621  y2022
## 9622  y2022
## 9623  y2022
## 9624  y2022
## 9625  y2022
## 9626  y2022
## 9627  y2022
## 9628  y2022
## 9629  y2022
## 9630  y2022
## 9631  y2022
## 9632  y2022
## 9633  y2022
## 9634  y2022
## 9635  y2022
## 9636  y2022
## 9637  y2022
## 9638  y2022
## 9639  y2022
## 9640  y2022
## 9641  y2022
## 9642  y2022
## 9643  y2022
## 9644  y2022
## 9645  y2022
## 9646  y2022
## 9647  y2022
## 9648  y2022
## 9649  y2022
## 9650  y2022
## 9651  y2022
## 9652  y2022
## 9653  y2022
## 9654  y2022
## 9655  y2022
## 9656  y2022
## 9657  y2022
## 9658  y2022
## 9659  y2022
## 9660  y2022
## 9661  y2022
## 9662  y2022
## 9663  y2022
## 9664  y2022
## 9665  y2022
## 9666  y2022
## 9667  y2022
## 9668  y2022
## 9669  y2022
## 9670  y2022
## 9671  y2022
## 9672  y2022
## 9673  y2022
## 9674  y2022
## 9675  y2022
## 9676  y2022
## 9677  y2022
## 9678  y2022
## 9679  y2022
## 9680  y2022
## 9681  y2022
## 9682  y2022
## 9683  y2022
## 9684  y2022
## 9685  y2022
## 9686  y2022
## 9687  y2022
## 9688  y2022
## 9689  y2022
## 9690  y2022
## 9691  y2022
## 9692  y2022
## 9693  y2022
## 9694  y2022
## 9695  y2022
## 9696  y2022
## 9697  y2022
## 9698  y2022
## 9699  y2022
## 9700  y2022
## 9701  y2022
## 9702  y2022
## 9703  y2022
## 9704  y2022
## 9705  y2022
## 9706  y2022
## 9707  y2022
## 9708  y2022
## 9709  y2022
## 9710  y2022
## 9711  y2022
## 9712  y2022
## 9713  y2022
## 9714  y2022
## 9715  y2022
## 9716  y2022
## 9717  y2022
## 9718  y2022
## 9719  y2022
## 9720  y2022
## 9721  y2022
## 9722  y2022
## 9723  y2022
## 9724  y2022
## 9725  y2022
## 9726  y2022
## 9727  y2022
## 9728  y2022
## 9729  y2022
## 9730  y2022
## 9731  y2022
## 9732  y2022
## 9733  y2022
## 9734  y2022
## 9735  y2022
## 9736  y2022
## 9737  y2022
## 9738  y2022
## 9739  y2022
## 9740  y2022
## 9741  y2022
## 9742  y2022
## 9743  y2022
## 9744  y2022
## 9745  y2022
## 9746  y2022
## 9747  y2022
## 9748  y2022
## 9749  y2022
## 9750  y2022
## 9751  y2022
## 9752  y2022
## 9753  y2022
## 9754  y2022
## 9755  y2022
## 9756  y2022
## 9757  y2022
## 9758  y2022
## 9759  y2022
## 9760  y2022
## 9761  y2022
## 9762  y2022
## 9763  y2022
## 9764  y2022
## 9765  y2022
## 9766  y2022
## 9767  y2022
## 9768  y2022
## 9769  y2022
## 9770  y2022
## 9771  y2022
## 9772  y2022
## 9773  y2022
## 9774  y2022
## 9775  y2022
## 9776  y2022
## 9777  y2022
## 9778  y2022
## 9779  y2022
## 9780  y2022
## 9781  y2022
## 9782  y2022
## 9783  y2022
## 9784  y2022
## 9785  y2022
## 9786  y2022
## 9787  y2022
## 9788  y2022
## 9789  y2022
## 9790  y2022
## 9791  y2022
## 9792  y2022
## 9793  y2022
## 9794  y2022
## 9795  y2022
## 9796  y2022
## 9797  y2022
## 9798  y2022
## 9799  y2022
## 9800  y2022
## 9801  y2022
## 9802  y2022
## 9803  y2022
## 9804  y2022
## 9805  y2022
## 9806  y2022
## 9807  y2022
## 9808  y2022
## 9809  y2022
## 9810  y2022
## 9811  y2022
## 9812  y2022
## 9813  y2022
## 9814  y2022
## 9815  y2022
## 9816  y2022
## 9817  y2022
## 9818  y2022
## 9819  y2022
## 9820  y2022
## 9821  y2022
## 9822  y2022
## 9823  y2022
## 9824  y2022
## 9825  y2022
## 9826  y2022
## 9827  y2022
## 9828  y2022
## 9829  y2022
## 9830  y2022
## 9831  y2022
## 9832  y2022
## 9833  y2022
## 9834  y2022
## 9835  y2022
## 9836  y2022
## 9837  y2022
## 9838  y2022
## 9839  y2022
## 9840  y2022
## 9841  y2022
## 9842  y2022
## 9843  y2022
## 9844  y2022
## 9845  y2022
## 9846  y2022
## 9847  y2022
## 9848  y2022
## 9849  y2022
## 9850  y2022
## 9851  y2022
## 9852  y2022
## 9853  y2022
## 9854  y2022
## 9855  y2022
## 9856  y2022
## 9857  y2022
## 9858  y2022
## 9859  y2022
## 9860  y2022
## 9861  y2022
## 9862  y2022
## 9863  y2022
## 9864  y2022
## 9865  y2022
## 9866  y2022
## 9867  y2022
## 9868  y2022
## 9869  y2022
## 9870  y2022
## 9871  y2022
## 9872  y2022
## 9873  y2022
## 9874  y2022
## 9875  y2022
## 9876  y2022
## 9877  y2022
## 9878  y2022
## 9879  y2022
## 9880  y2022
## 9881  y2022
## 9882  y2022
## 9883  y2022
## 9884  y2022
## 9885  y2022
## 9886  y2022
## 9887  y2022
## 9888  y2022
## 9889  y2022
## 9890  y2022
## 9891  y2022
## 9892  y2022
## 9893  y2022
## 9894  y2022
## 9895  y2022
## 9896  y2022
## 9897  y2022
## 9898  y2022
## 9899  y2022
## 9900  y2022
## 9901  y2022
## 9902  y2022
## 9903  y2022
## 9904  y2022
## 9905  y2022
## 9906  y2022
## 9907  y2022
## 9908  y2022
## 9909  y2022
## 9910  y2022
## 9911  y2022
## 9912  y2022
## 9913  y2022
## 9914  y2022
## 9915  y2022
## 9916  y2022
## 9917  y2022
## 9918  y2022
## 9919  y2022
## 9920  y2022
## 9921  y2022
## 9922  y2022
## 9923  y2022
## 9924  y2022
## 9925  y2022
## 9926  y2022
## 9927  y2022
## 9928  y2022
## 9929  y2022
## 9930  y2022
## 9931  y2022
## 9932  y2022
## 9933  y2022
## 9934  y2022
## 9935  y2022
## 9936  y2022
## 9937  y2022
## 9938  y2022
## 9939  y2022
## 9940  y2022
## 9941  y2022
## 9942  y2022
## 9943  y2022
## 9944  y2022
## 9945  y2022
## 9946  y2022
## 9947  y2022
## 9948  y2022
## 9949  y2022
## 9950  y2022
## 9951  y2022
## 9952  y2022
## 9953  y2022
## 9954  y2022
## 9955  y2022
## 9956  y2022
## 9957  y2022
## 9958  y2022
## 9959  y2022
## 9960  y2022
## 9961  y2022
## 9962  y2022
## 9963  y2022
## 9964  y2022
## 9965  y2022
## 9966  y2022
## 9967  y2022
## 9968  y2022
## 9969  y2022
## 9970  y2022
## 9971  y2022
## 9972  y2022
## 9973  y2022
## 9974  y2022
## 9975  y2022
## 9976  y2022
## 9977  y2022
## 9978  y2022
## 9979  y2022
## 9980  y2022
## 9981  y2022
## 9982  y2022
## 9983  y2022
## 9984  y2022
## 9985  y2022
## 9986  y2022
## 9987  y2022
## 9988  y2022
## 9989  y2022
## 9990  y2022
## 9991  y2022
## 9992  y2022
## 9993  y2022
## 9994  y2022
## 9995  y2022
## 9996  y2022
## 9997  y2022
## 9998  y2022
## 9999  y2022
## 10000 y2022
## 10001 y2022
## 10002 y2022
## 10003 y2022
## 10004 y2022
## 10005 y2022
## 10006 y2022
## 10007 y2022
## 10008 y2022
## 10009 y2022
## 10010 y2022
## 10011 y2022
## 10012 y2022
## 10013 y2022
## 10014 y2022
## 10015 y2022
## 10016 y2022
## 10017 y2022
## 10018 y2022
## 10019 y2022
## 10020 y2022
## 10021 y2022
## 10022 y2022
## 10023 y2022
## 10024 y2022
## 10025 y2022
## 10026 y2022
## 10027 y2022
## 10028 y2022
## 10029 y2022
## 10030 y2022
## 10031 y2022
## 10032 y2022
## 10033 y2022
## 10034 y2022
## 10035 y2022
## 10036 y2022
## 10037 y2022
## 10038 y2022
## 10039 y2022
## 10040 y2022
## 10041 y2022
## 10042 y2022
## 10043 y2022
## 10044 y2022
## 10045 y2022
## 10046 y2022
## 10047 y2022
## 10048 y2022
## 10049 y2022
## 10050 y2022
## 10051 y2022
## 10052 y2022
## 10053 y2022
## 10054 y2022
## 10055 y2022
## 10056 y2022
## 10057 y2022
## 10058 y2022
## 10059 y2022
## 10060 y2022
## 10061 y2022
## 10062 y2022
## 10063 y2022
## 10064 y2022
## 10065 y2022
## 10066 y2022
## 10067 y2022
## 10068 y2022
## 10069 y2022
## 10070 y2022
## 10071 y2022
## 10072 y2022
## 10073 y2022
## 10074 y2022
## 10075 y2022
## 10076 y2022
## 10077 y2022
## 10078 y2022
## 10079 y2022
## 10080 y2022
## 10081 y2022
## 10082 y2022
## 10083 y2022
## 10084 y2022
## 10085 y2022
## 10086 y2022
## 10087 y2022
## 10088 y2022
## 10089 y2022
## 10090 y2022
## 10091 y2022
## 10092 y2022
## 10093 y2022
## 10094 y2022
## 10095 y2022
## 10096 y2022
## 10097 y2022
## 10098 y2022
## 10099 y2022
## 10100 y2022
## 10101 y2022
## 10102 y2022
## 10103 y2022
## 10104 y2022
## 10105 y2022
## 10106 y2022
## 10107 y2022
## 10108 y2022
## 10109 y2022
## 10110 y2022
## 10111 y2022
## 10112 y2022
## 10113 y2022
## 10114 y2022
## 10115 y2022
## 10116 y2022
## 10117 y2022
## 10118 y2022
## 10119 y2022
## 10120 y2022
## 10121 y2022
## 10122 y2022
## 10123 y2022
## 10124 y2022
## 10125 y2022
## 10126 y2022
## 10127 y2022
## 10128 y2022
## 10129 y2022
## 10130 y2022
## 10131 y2022
## 10132 y2022
## 10133 y2022
## 10134 y2022
## 10135 y2022
## 10136 y2022
## 10137 y2022
## 10138 y2022
## 10139 y2022
## 10140 y2022
## 10141 y2022
## 10142 y2022
## 10143 y2022
## 10144 y2022
## 10145 y2022
## 10146 y2022
## 10147 y2022
## 10148 y2022
## 10149 y2022
## 10150 y2022
## 10151 y2022
## 10152 y2022
## 10153 y2022
## 10154 y2022
## 10155 y2022
## 10156 y2022
## 10157 y2022
## 10158 y2022
## 10159 y2022
## 10160 y2022
## 10161 y2022
## 10162 y2022
## 10163 y2022
## 10164 y2022
## 10165 y2022
## 10166 y2022
## 10167 y2022
## 10168 y2022
## 10169 y2022
## 10170 y2022
## 10171 y2022
## 10172 y2022
## 10173 y2022
## 10174 y2022
## 10175 y2022
## 10176 y2022
## 10177 y2022
## 10178 y2022
## 10179 y2022
## 10180 y2022
## 10181 y2022
## 10182 y2022
## 10183 y2022
## 10184 y2022
## 10185 y2022
## 10186 y2022
## 10187 y2022
## 10188 y2022
## 10189 y2022
## 10190 y2022
## 10191 y2022
## 10192 y2022
## 10193 y2022
## 10194 y2022
## 10195 y2022
## 10196 y2022
## 10197 y2022
## 10198 y2022
## 10199 y2022
## 10200 y2022
## 10201 y2022
## 10202 y2022
## 10203 y2022
## 10204 y2022
## 10205 y2022
## 10206 y2022
## 10207 y2022
## 10208 y2022
## 10209 y2022
## 10210 y2022
## 10211 y2022
## 10212 y2022
## 10213 y2022
## 10214 y2022
## 10215 y2022
## 10216 y2022
## 10217 y2022
## 10218 y2022
## 10219 y2022
## 10220 y2022
## 10221 y2022
## 10222 y2022
## 10223 y2022
## 10224 y2022
## 10225 y2022
## 10226 y2022
## 10227 y2022
## 10228 y2022
## 10229 y2022
## 10230 y2022
## 10231 y2020
## 10232 y2020
## 10233 y2020
## 10234 y2020
## 10235 y2020
## 10236 y2020
## 10237 y2020
## 10238 y2020
## 10239 y2020
## 10240 y2020
## 10241 y2020
## 10242 y2020
## 10243 y2020
## 10244 y2020
## 10245 y2020
## 10246 y2020
## 10247 y2020
## 10248 y2020
## 10249 y2020
## 10250 y2020
## 10251 y2020
## 10252 y2020
## 10253 y2020
## 10254 y2020
## 10255 y2020
## 10256 y2020
## 10257 y2020
## 10258 y2020
## 10259 y2020
## 10260 y2020
## 10261 y2020
## 10262 y2020
## 10263 y2020
## 10264 y2020
## 10265 y2020
## 10266 y2020
## 10267 y2020
## 10268 y2020
## 10269 y2020
## 10270 y2020
## 10271 y2020
## 10272 y2020
## 10273 y2020
## 10274 y2020
## 10275 y2020
## 10276 y2020
## 10277 y2020
## 10278 y2020
## 10279 y2020
## 10280 y2020
## 10281 y2020
## 10282 y2020
## 10283 y2020
## 10284 y2020
## 10285 y2020
## 10286 y2020
## 10287 y2020
## 10288 y2020
## 10289 y2020
## 10290 y2020
## 10291 y2020
## 10292 y2020
## 10293 y2020
## 10294 y2020
## 10295 y2020
## 10296 y2020
## 10297 y2020
## 10298 y2020
## 10299 y2020
## 10300 y2020
## 10301 y2020
## 10302 y2020
## 10303 y2020
## 10304 y2020
## 10305 y2020
## 10306 y2020
## 10307 y2020
## 10308 y2020
## 10309 y2020
## 10310 y2020
## 10311 y2020
## 10312 y2020
## 10313 y2020
## 10314 y2020
## 10315 y2020
## 10316 y2020
## 10317 y2020
## 10318 y2020
## 10319 y2020
## 10320 y2020
## 10321 y2020
## 10322 y2020
## 10323 y2020
## 10324 y2020
## 10325 y2020
## 10326 y2020
## 10327 y2020
## 10328 y2020
## 10329 y2020
## 10330 y2020
## 10331 y2020
## 10332 y2020
## 10333 y2020
## 10334 y2020
## 10335 y2020
## 10336 y2020
## 10337 y2020
## 10338 y2020
## 10339 y2020
## 10340 y2020
## 10341 y2020
## 10342 y2020
## 10343 y2020
## 10344 y2020
## 10345 y2020
## 10346 y2020
## 10347 y2020
## 10348 y2020
## 10349 y2020
## 10350 y2020
## 10351 y2020
## 10352 y2020
## 10353 y2020
## 10354 y2020
## 10355 y2020
## 10356 y2020
## 10357 y2020
## 10358 y2020
## 10359 y2020
## 10360 y2020
## 10361 y2020
## 10362 y2020
## 10363 y2020
## 10364 y2020
## 10365 y2020
## 10366 y2020
## 10367 y2020
## 10368 y2020
## 10369 y2020
## 10370 y2020
## 10371 y2020
## 10372 y2020
## 10373 y2020
## 10374 y2020
## 10375 y2020
## 10376 y2020
## 10377 y2020
## 10378 y2020
## 10379 y2020
## 10380 y2020
## 10381 y2020
## 10382 y2020
## 10383 y2020
## 10384 y2020
## 10385 y2020
## 10386 y2020
## 10387 y2020
## 10388 y2020
## 10389 y2020
## 10390 y2020
## 10391 y2020
## 10392 y2020
## 10393 y2020
## 10394 y2020
## 10395 y2020
## 10396 y2020
## 10397 y2020
## 10398 y2020
## 10399 y2020
## 10400 y2020
## 10401 y2020
## 10402 y2020
## 10403 y2020
## 10404 y2020
## 10405 y2020
## 10406 y2020
## 10407 y2020
## 10408 y2020
## 10409 y2020
## 10410 y2020
## 10411 y2020
## 10412 y2020
## 10413 y2020
## 10414 y2020
## 10415 y2020
## 10416 y2020
## 10417 y2020
## 10418 y2020
## 10419 y2020
## 10420 y2020
## 10421 y2020
## 10422 y2020
## 10423 y2020
## 10424 y2020
## 10425 y2020
## 10426 y2020
## 10427 y2020
## 10428 y2020
## 10429 y2020
## 10430 y2020
## 10431 y2020
## 10432 y2020
## 10433 y2020
## 10434 y2020
## 10435 y2020
## 10436 y2020
## 10437 y2020
## 10438 y2020
## 10439 y2020
## 10440 y2020
## 10441 y2020
## 10442 y2020
## 10443 y2020
## 10444 y2020
## 10445 y2020
## 10446 y2020
## 10447 y2020
## 10448 y2020
## 10449 y2020
## 10450 y2020
## 10451 y2020
## 10452 y2020
## 10453 y2020
## 10454 y2020
## 10455 y2020
## 10456 y2020
## 10457 y2020
## 10458 y2020
## 10459 y2020
## 10460 y2020
## 10461 y2020
## 10462 y2020
## 10463 y2020
## 10464 y2020
## 10465 y2020
## 10466 y2020
## 10467 y2020
## 10468 y2020
## 10469 y2020
## 10470 y2020
## 10471 y2020
## 10472 y2020
## 10473 y2020
## 10474 y2020
## 10475 y2020
## 10476 y2020
## 10477 y2020
## 10478 y2020
## 10479 y2020
## 10480 y2020
## 10481 y2020
## 10482 y2020
## 10483 y2020
## 10484 y2020
## 10485 y2020
## 10486 y2020
## 10487 y2020
## 10488 y2020
## 10489 y2020
## 10490 y2020
## 10491 y2020
## 10492 y2020
## 10493 y2020
## 10494 y2020
## 10495 y2020
## 10496 y2020
## 10497 y2020
## 10498 y2020
## 10499 y2020
## 10500 y2020
## 10501 y2020
## 10502 y2020
## 10503 y2020
## 10504 y2020
## 10505 y2020
## 10506 y2020
## 10507 y2020
## 10508 y2020
## 10509 y2020
## 10510 y2020
## 10511 y2020
## 10512 y2020
## 10513 y2020
## 10514 y2020
## 10515 y2020
## 10516 y2020
## 10517 y2020
## 10518 y2020
## 10519 y2020
## 10520 y2020
## 10521 y2020
## 10522 y2020
## 10523 y2020
## 10524 y2020
## 10525 y2020
## 10526 y2020
## 10527 y2020
## 10528 y2020
## 10529 y2020
## 10530 y2020
## 10531 y2020
## 10532 y2020
## 10533 y2020
## 10534 y2020
## 10535 y2020
## 10536 y2020
## 10537 y2020
## 10538 y2020
## 10539 y2020
## 10540 y2020
## 10541 y2020
## 10542 y2020
## 10543 y2020
## 10544 y2020
## 10545 y2020
## 10546 y2020
## 10547 y2020
## 10548 y2020
## 10549 y2020
## 10550 y2020
## 10551 y2020
## 10552 y2020
## 10553 y2020
## 10554 y2020
## 10555 y2020
## 10556 y2020
## 10557 y2020
## 10558 y2020
## 10559 y2020
## 10560 y2020
## 10561 y2020
## 10562 y2020
## 10563 y2020
## 10564 y2020
## 10565 y2020
## 10566 y2020
## 10567 y2020
## 10568 y2020
## 10569 y2020
## 10570 y2020
## 10571 y2020
## 10572 y2020
## 10573 y2020
## 10574 y2020
## 10575 y2020
## 10576 y2020
## 10577 y2020
## 10578 y2020
## 10579 y2020
## 10580 y2020
## 10581 y2020
## 10582 y2020
## 10583 y2020
## 10584 y2020
## 10585 y2020
## 10586 y2020
## 10587 y2020
## 10588 y2020
## 10589 y2020
## 10590 y2020
## 10591 y2020
## 10592 y2020
## 10593 y2020
## 10594 y2020
## 10595 y2020
## 10596 y2020
## 10597 y2020
## 10598 y2020
## 10599 y2020
## 10600 y2020
## 10601 y2020
## 10602 y2020
## 10603 y2020
## 10604 y2020
## 10605 y2020
## 10606 y2020
## 10607 y2020
## 10608 y2020
## 10609 y2020
## 10610 y2020
## 10611 y2020
## 10612 y2020
## 10613 y2020
## 10614 y2020
## 10615 y2020
## 10616 y2020
## 10617 y2020
## 10618 y2020
## 10619 y2020
## 10620 y2020
## 10621 y2020
## 10622 y2020
## 10623 y2020
## 10624 y2020
## 10625 y2020
## 10626 y2020
## 10627 y2020
## 10628 y2020
## 10629 y2020
## 10630 y2020
## 10631 y2020
## 10632 y2020
## 10633 y2020
## 10634 y2020
## 10635 y2020
## 10636 y2020
## 10637 y2020
## 10638 y2020
## 10639 y2020
## 10640 y2020
## 10641 y2020
## 10642 y2020
## 10643 y2020
## 10644 y2020
## 10645 y2020
## 10646 y2020
## 10647 y2020
## 10648 y2020
## 10649 y2020
## 10650 y2020
## 10651 y2020
## 10652 y2020
## 10653 y2020
## 10654 y2020
## 10655 y2020
## 10656 y2020
## 10657 y2020
## 10658 y2020
## 10659 y2020
## 10660 y2020
## 10661 y2020
## 10662 y2020
## 10663 y2020
## 10664 y2020
## 10665 y2020
## 10666 y2020
## 10667 y2020
## 10668 y2020
## 10669 y2020
## 10670 y2020
## 10671 y2020
## 10672 y2020
## 10673 y2020
## 10674 y2020
## 10675 y2020
## 10676 y2020
## 10677 y2020
## 10678 y2020
## 10679 y2020
## 10680 y2020
## 10681 y2020
## 10682 y2020
## 10683 y2020
## 10684 y2020
## 10685 y2020
## 10686 y2020
## 10687 y2020
## 10688 y2020
## 10689 y2020
## 10690 y2020
## 10691 y2020
## 10692 y2020
## 10693 y2020
## 10694 y2020
## 10695 y2020
## 10696 y2020
## 10697 y2020
## 10698 y2020
## 10699 y2020
## 10700 y2020
## 10701 y2020
## 10702 y2020
## 10703 y2020
## 10704 y2020
## 10705 y2020
## 10706 y2020
## 10707 y2020
## 10708 y2020
## 10709 y2020
## 10710 y2020
## 10711 y2020
## 10712 y2020
## 10713 y2020
## 10714 y2020
## 10715 y2020
## 10716 y2020
## 10717 y2020
## 10718 y2020
## 10719 y2020
## 10720 y2020
## 10721 y2020
## 10722 y2020
## 10723 y2020
## 10724 y2020
## 10725 y2020
## 10726 y2020
## 10727 y2020
## 10728 y2020
## 10729 y2020
## 10730 y2020
## 10731 y2020
## 10732 y2020
## 10733 y2020
## 10734 y2020
## 10735 y2020
## 10736 y2020
## 10737 y2020
## 10738 y2020
## 10739 y2020
## 10740 y2020
## 10741 y2020
## 10742 y2020
## 10743 y2020
## 10744 y2020
## 10745 y2020
## 10746 y2020
## 10747 y2020
## 10748 y2020
## 10749 y2020
## 10750 y2020
## 10751 y2020
## 10752 y2020
## 10753 y2020
## 10754 y2020
## 10755 y2020
## 10756 y2020
## 10757 y2020
## 10758 y2020
## 10759 y2020
## 10760 y2020
## 10761 y2020
## 10762 y2020
## 10763 y2020
## 10764 y2020
## 10765 y2020
## 10766 y2020
## 10767 y2020
## 10768 y2020
## 10769 y2020
## 10770 y2020
## 10771 y2020
## 10772 y2020
## 10773 y2020
## 10774 y2020
## 10775 y2020
## 10776 y2020
## 10777 y2020
## 10778 y2020
## 10779 y2020
## 10780 y2020
## 10781 y2020
## 10782 y2020
## 10783 y2020
## 10784 y2020
## 10785 y2020
## 10786 y2020
## 10787 y2020
## 10788 y2020
## 10789 y2020
## 10790 y2020
## 10791 y2020
## 10792 y2020
## 10793 y2020
## 10794 y2020
## 10795 y2020
## 10796 y2020
## 10797 y2020
## 10798 y2020
## 10799 y2020
## 10800 y2020
## 10801 y2020
## 10802 y2020
## 10803 y2020
## 10804 y2020
## 10805 y2020
## 10806 y2020
## 10807 y2020
## 10808 y2020
## 10809 y2020
## 10810 y2020
## 10811 y2020
## 10812 y2020
## 10813 y2020
## 10814 y2020
## 10815 y2020
## 10816 y2020
## 10817 y2020
## 10818 y2020
## 10819 y2020
## 10820 y2020
## 10821 y2020
## 10822 y2020
## 10823 y2020
## 10824 y2020
## 10825 y2020
## 10826 y2020
## 10827 y2020
## 10828 y2020
## 10829 y2020
## 10830 y2020
## 10831 y2020
## 10832 y2020
## 10833 y2020
## 10834 y2020
## 10835 y2020
## 10836 y2020
## 10837 y2020
## 10838 y2020
## 10839 y2020
## 10840 y2020
## 10841 y2020
## 10842 y2020
## 10843 y2020
## 10844 y2020
## 10845 y2020
## 10846 y2020
## 10847 y2020
## 10848 y2020
## 10849 y2020
## 10850 y2020
## 10851 y2020
## 10852 y2020
## 10853 y2020
## 10854 y2020
## 10855 y2020
## 10856 y2020
## 10857 y2020
## 10858 y2020
## 10859 y2020
## 10860 y2020
## 10861 y2020
## 10862 y2020
## 10863 y2020
## 10864 y2020
## 10865 y2020
## 10866 y2020
## 10867 y2020
## 10868 y2020
## 10869 y2020
## 10870 y2020
## 10871 y2020
## 10872 y2020
## 10873 y2020
## 10874 y2020
## 10875 y2020
## 10876 y2020
## 10877 y2020
## 10878 y2020
## 10879 y2020
## 10880 y2020
## 10881 y2020
## 10882 y2020
## 10883 y2020
## 10884 y2020
## 10885 y2020
## 10886 y2020
## 10887 y2020
## 10888 y2020
## 10889 y2020
## 10890 y2020
## 10891 y2020
## 10892 y2020
## 10893 y2020
## 10894 y2020
## 10895 y2020
## 10896 y2020
## 10897 y2020
## 10898 y2020
## 10899 y2020
## 10900 y2020
## 10901 y2020
## 10902 y2020
## 10903 y2020
## 10904 y2020
## 10905 y2020
## 10906 y2020
## 10907 y2020
## 10908 y2020
## 10909 y2020
## 10910 y2020
## 10911 y2020
## 10912 y2020
## 10913 y2020
## 10914 y2020
## 10915 y2020
## 10916 y2020
## 10917 y2020
## 10918 y2020
## 10919 y2020
## 10920 y2020
## 10921 y2020
## 10922 y2020
## 10923 y2020
## 10924 y2020
## 10925 y2020
## 10926 y2020
## 10927 y2020
## 10928 y2020
## 10929 y2020
## 10930 y2020
## 10931 y2020
## 10932 y2020
## 10933 y2020
## 10934 y2020
## 10935 y2020
## 10936 y2020
## 10937 y2020
## 10938 y2020
## 10939 y2020
## 10940 y2020
## 10941 y2020
## 10942 y2020
## 10943 y2020
## 10944 y2020
## 10945 y2020
## 10946 y2020
## 10947 y2020
## 10948 y2020
## 10949 y2020
## 10950 y2020
## 10951 y2020
## 10952 y2020
## 10953 y2020
## 10954 y2020
## 10955 y2020
## 10956 y2020
## 10957 y2020
## 10958 y2020
## 10959 y2020
## 10960 y2020
## 10961 y2020
## 10962 y2020
## 10963 y2020
## 10964 y2020
## 10965 y2020
## 10966 y2020
## 10967 y2020
## 10968 y2020
## 10969 y2020
## 10970 y2020
## 10971 y2020
## 10972 y2020
## 10973 y2020
## 10974 y2020
## 10975 y2020
## 10976 y2020
## 10977 y2020
## 10978 y2020
## 10979 y2020
## 10980 y2020
## 10981 y2020
## 10982 y2020
## 10983 y2020
## 10984 y2020
## 10985 y2020
## 10986 y2020
## 10987 y2020
## 10988 y2020
## 10989 y2020
## 10990 y2020
## 10991 y2020
## 10992 y2020
## 10993 y2020
## 10994 y2020
## 10995 y2020
## 10996 y2020
## 10997 y2020
## 10998 y2020
## 10999 y2020
## 11000 y2020
## 11001 y2020
## 11002 y2020
## 11003 y2020
## 11004 y2020
## 11005 y2020
## 11006 y2020
## 11007 y2020
## 11008 y2020
## 11009 y2020
## 11010 y2020
## 11011 y2020
## 11012 y2020
## 11013 y2020
## 11014 y2020
## 11015 y2020
## 11016 y2020
## 11017 y2020
## 11018 y2020
## 11019 y2020
## 11020 y2020
## 11021 y2020
## 11022 y2020
## 11023 y2020
## 11024 y2020
## 11025 y2020
## 11026 y2020
## 11027 y2020
## 11028 y2020
## 11029 y2020
## 11030 y2020
## 11031 y2020
## 11032 y2020
## 11033 y2020
## 11034 y2020
## 11035 y2020
## 11036 y2020
## 11037 y2020
## 11038 y2020
## 11039 y2020
## 11040 y2020
## 11041 y2020
## 11042 y2020
## 11043 y2020
## 11044 y2020
## 11045 y2020
## 11046 y2020
## 11047 y2020
## 11048 y2020
## 11049 y2020
## 11050 y2020
## 11051 y2020
## 11052 y2020
## 11053 y2020
## 11054 y2020
## 11055 y2020
## 11056 y2020
## 11057 y2020
## 11058 y2020
## 11059 y2020
## 11060 y2020
## 11061 y2020
## 11062 y2020
## 11063 y2020
## 11064 y2020
## 11065 y2020
## 11066 y2020
## 11067 y2020
## 11068 y2020
## 11069 y2020
## 11070 y2020
## 11071 y2020
## 11072 y2020
## 11073 y2020
## 11074 y2020
## 11075 y2020
## 11076 y2020
## 11077 y2020
## 11078 y2020
## 11079 y2020
## 11080 y2020
## 11081 y2020
## 11082 y2020
## 11083 y2020
## 11084 y2020
## 11085 y2020
## 11086 y2020
## 11087 y2020
## 11088 y2020
## 11089 y2020
## 11090 y2020
## 11091 y2020
## 11092 y2020
## 11093 y2020
## 11094 y2020
## 11095 y2020
## 11096 y2020
## 11097 y2020
## 11098 y2020
## 11099 y2020
## 11100 y2020
## 11101 y2020
## 11102 y2020
## 11103 y2020
## 11104 y2020
## 11105 y2020
## 11106 y2020
## 11107 y2020
## 11108 y2020
## 11109 y2020
## 11110 y2020
## 11111 y2020
## 11112 y2020
## 11113 y2020
## 11114 y2020
## 11115 y2020
## 11116 y2020
## 11117 y2020
## 11118 y2020
## 11119 y2020
## 11120 y2020
## 11121 y2020
## 11122 y2020
## 11123 y2020
## 11124 y2020
## 11125 y2020
## 11126 y2020
## 11127 y2020
## 11128 y2020
## 11129 y2020
## 11130 y2020
## 11131 y2020
## 11132 y2020
## 11133 y2020
## 11134 y2020
## 11135 y2020
## 11136 y2020
## 11137 y2020
## 11138 y2020
## 11139 y2020
## 11140 y2020
## 11141 y2020
## 11142 y2020
## 11143 y2020
## 11144 y2020
## 11145 y2020
## 11146 y2020
## 11147 y2020
## 11148 y2020
## 11149 y2020
## 11150 y2020
## 11151 y2020
## 11152 y2020
## 11153 y2020
## 11154 y2020
## 11155 y2020
## 11156 y2020
## 11157 y2020
## 11158 y2020
## 11159 y2020
## 11160 y2020
## 11161 y2020
## 11162 y2020
## 11163 y2020
## 11164 y2020
## 11165 y2020
## 11166 y2020
## 11167 y2020
## 11168 y2020
## 11169 y2020
## 11170 y2020
## 11171 y2020
## 11172 y2020
## 11173 y2020
## 11174 y2020
## 11175 y2020
## 11176 y2020
## 11177 y2020
## 11178 y2020
## 11179 y2020
## 11180 y2020
## 11181 y2020
## 11182 y2020
## 11183 y2020
## 11184 y2020
## 11185 y2020
## 11186 y2020
## 11187 y2020
## 11188 y2020
## 11189 y2020
## 11190 y2020
## 11191 y2020
## 11192 y2020
## 11193 y2020
## 11194 y2020
## 11195 y2020
## 11196 y2020
## 11197 y2020
## 11198 y2020
## 11199 y2020
## 11200 y2020
## 11201 y2020
## 11202 y2020
## 11203 y2020
## 11204 y2020
## 11205 y2020
## 11206 y2020
## 11207 y2020
## 11208 y2020
## 11209 y2020
## 11210 y2020
## 11211 y2020
## 11212 y2020
## 11213 y2020
## 11214 y2020
## 11215 y2020
## 11216 y2020
## 11217 y2020
## 11218 y2020
## 11219 y2020
## 11220 y2020
## 11221 y2020
## 11222 y2020
## 11223 y2020
## 11224 y2020
## 11225 y2020
## 11226 y2020
## 11227 y2020
## 11228 y2020
## 11229 y2020
## 11230 y2020
## 11231 y2020
## 11232 y2020
## 11233 y2020
## 11234 y2020
## 11235 y2020
## 11236 y2020
## 11237 y2020
## 11238 y2020
## 11239 y2020
## 11240 y2020
## 11241 y2020
## 11242 y2020
## 11243 y2020
## 11244 y2020
## 11245 y2020
## 11246 y2020
## 11247 y2020
## 11248 y2020
## 11249 y2020
## 11250 y2020
## 11251 y2020
## 11252 y2020
## 11253 y2020
## 11254 y2020
## 11255 y2020
## 11256 y2020
## 11257 y2020
## 11258 y2020
## 11259 y2020
## 11260 y2020
## 11261 y2020
## 11262 y2020
## 11263 y2020
## 11264 y2020
## 11265 y2020
## 11266 y2020
## 11267 y2020
## 11268 y2020
## 11269 y2020
## 11270 y2020
## 11271 y2020
## 11272 y2020
## 11273 y2020
## 11274 y2020
## 11275 y2020
## 11276 y2020
## 11277 y2020
## 11278 y2020
## 11279 y2020
## 11280 y2020
## 11281 y2020
## 11282 y2020
## 11283 y2020
## 11284 y2020
## 11285 y2020
## 11286 y2020
## 11287 y2020
## 11288 y2020
## 11289 y2020
## 11290 y2020
## 11291 y2020
## 11292 y2020
## 11293 y2020
## 11294 y2020
## 11295 y2020
## 11296 y2020
## 11297 y2020
## 11298 y2020
## 11299 y2020
## 11300 y2020
## 11301 y2020
## 11302 y2020
## 11303 y2020
## 11304 y2020
## 11305 y2020
## 11306 y2020
## 11307 y2020
## 11308 y2020
## 11309 y2020
## 11310 y2020
## 11311 y2020
## 11312 y2020
## 11313 y2020
## 11314 y2020
## 11315 y2020
## 11316 y2020
## 11317 y2020
## 11318 y2020
## 11319 y2020
## 11320 y2020
## 11321 y2020
## 11322 y2020
## 11323 y2020
## 11324 y2020
## 11325 y2020
## 11326 y2020
## 11327 y2020
## 11328 y2020
## 11329 y2020
## 11330 y2020
## 11331 y2020
## 11332 y2020
## 11333 y2020
## 11334 y2020
## 11335 y2020
## 11336 y2020
## 11337 y2020
## 11338 y2020
## 11339 y2020
## 11340 y2020
## 11341 y2020
## 11342 y2020
## 11343 y2020
## 11344 y2020
## 11345 y2020
## 11346 y2020
## 11347 y2020
## 11348 y2020
## 11349 y2020
## 11350 y2020
## 11351 y2020
## 11352 y2020
## 11353 y2020
## 11354 y2020
## 11355 y2020
## 11356 y2020
## 11357 y2020
## 11358 y2020
## 11359 y2020
## 11360 y2020
## 11361 y2020
## 11362 y2020
## 11363 y2020
## 11364 y2020
## 11365 y2020
## 11366 y2020
## 11367 y2020
## 11368 y2020
## 11369 y2020
## 11370 y2020
## 11371 y2020
## 11372 y2020
## 11373 y2020
## 11374 y2020
## 11375 y2020
## 11376 y2020
## 11377 y2020
## 11378 y2020
## 11379 y2020
## 11380 y2020
## 11381 y2020
## 11382 y2020
## 11383 y2020
## 11384 y2020
## 11385 y2020
## 11386 y2020
## 11387 y2020
## 11388 y2020
## 11389 y2020
## 11390 y2020
## 11391 y2020
## 11392 y2020
## 11393 y2020
## 11394 y2020
## 11395 y2020
## 11396 y2020
## 11397 y2020
## 11398 y2020
## 11399 y2020
## 11400 y2020
## 11401 y2020
## 11402 y2020
## 11403 y2020
## 11404 y2020
## 11405 y2020
## 11406 y2020
## 11407 y2020
## 11408 y2020
## 11409 y2020
## 11410 y2020
## 11411 y2020
## 11412 y2020
## 11413 y2020
## 11414 y2020
## 11415 y2020
## 11416 y2020
## 11417 y2020
## 11418 y2020
## 11419 y2020
## 11420 y2020
## 11421 y2020
## 11422 y2020
## 11423 y2020
## 11424 y2020
## 11425 y2020
## 11426 y2020
## 11427 y2020
## 11428 y2020
## 11429 y2020
## 11430 y2020
## 11431 y2020
## 11432 y2020
## 11433 y2020
## 11434 y2020
## 11435 y2020
## 11436 y2020
## 11437 y2020
## 11438 y2020
## 11439 y2020
## 11440 y2020
## 11441 y2020
## 11442 y2020
## 11443 y2020
## 11444 y2020
## 11445 y2020
## 11446 y2020
## 11447 y2020
## 11448 y2020
## 11449 y2020
## 11450 y2020
## 11451 y2020
## 11452 y2020
## 11453 y2020
## 11454 y2020
## 11455 y2020
## 11456 y2020
## 11457 y2020
## 11458 y2020
## 11459 y2020
## 11460 y2020
## 11461 y2020
## 11462 y2020
## 11463 y2020
## 11464 y2020
## 11465 y2020
## 11466 y2020
## 11467 y2020
## 11468 y2020
## 11469 y2020
## 11470 y2020
## 11471 y2020
## 11472 y2020
## 11473 y2020
## 11474 y2020
## 11475 y2020
## 11476 y2020
## 11477 y2020
## 11478 y2020
## 11479 y2020
## 11480 y2020
## 11481 y2020
## 11482 y2020
## 11483 y2020
## 11484 y2020
## 11485 y2020
## 11486 y2020
## 11487 y2020
## 11488 y2020
## 11489 y2020
## 11490 y2020
## 11491 y2020
## 11492 y2020
## 11493 y2020
## 11494 y2020
## 11495 y2020
## 11496 y2020
## 11497 y2020
## 11498 y2020
## 11499 y2020
## 11500 y2020
## 11501 y2020
## 11502 y2020
## 11503 y2020
## 11504 y2020
## 11505 y2020
## 11506 y2020
## 11507 y2020
## 11508 y2020
## 11509 y2020
## 11510 y2020
## 11511 y2020
## 11512 y2020
## 11513 y2020
## 11514 y2020
## 11515 y2020
## 11516 y2020
## 11517 y2020
## 11518 y2020
## 11519 y2020
## 11520 y2020
## 11521 y2020
## 11522 y2020
## 11523 y2020
## 11524 y2020
## 11525 y2020
## 11526 y2020
## 11527 y2020
## 11528 y2020
## 11529 y2020
## 11530 y2020
## 11531 y2020
## 11532 y2020
## 11533 y2020
## 11534 y2020
## 11535 y2020
## 11536 y2020
## 11537 y2020
## 11538 y2020
## 11539 y2020
## 11540 y2020
## 11541 y2020
## 11542 y2020
## 11543 y2020
## 11544 y2020
## 11545 y2020
## 11546 y2020
## 11547 y2020
## 11548 y2020
## 11549 y2020
## 11550 y2020
## 11551 y2020
## 11552 y2020
## 11553 y2020
## 11554 y2020
## 11555 y2020
## 11556 y2020
## 11557 y2020
## 11558 y2020
## 11559 y2020
## 11560 y2020
## 11561 y2020
## 11562 y2020
## 11563 y2020
## 11564 y2020
## 11565 y2020
## 11566 y2020
## 11567 y2020
## 11568 y2020
## 11569 y2020
## 11570 y2020
## 11571 y2020
## 11572 y2020
## 11573 y2020
## 11574 y2020
## 11575 y2020
## 11576 y2020
## 11577 y2020
## 11578 y2020
## 11579 y2020
## 11580 y2020
## 11581 y2020
## 11582 y2020
## 11583 y2020
## 11584 y2020
## 11585 y2020
## 11586 y2020
## 11587 y2020
## 11588 y2020
## 11589 y2020
## 11590 y2020
## 11591 y2020
## 11592 y2020
## 11593 y2020
## 11594 y2020
## 11595 y2020
## 11596 y2020
## 11597 y2020
## 11598 y2020
## 11599 y2020
## 11600 y2020
## 11601 y2020
## 11602 y2020
## 11603 y2020
## 11604 y2020
## 11605 y2020
## 11606 y2020
## 11607 y2020
## 11608 y2020
## 11609 y2020
## 11610 y2020
## 11611 y2020
## 11612 y2020
## 11613 y2020
## 11614 y2020
## 11615 y2020
## 11616 y2020
## 11617 y2020
## 11618 y2020
## 11619 y2020
## 11620 y2020
## 11621 y2020
## 11622 y2020
## 11623 y2020
## 11624 y2020
## 11625 y2020
## 11626 y2020
## 11627 y2020
## 11628 y2020
## 11629 y2020
## 11630 y2020
## 11631 y2020
## 11632 y2020
## 11633 y2020
## 11634 y2020
## 11635 y2020
## 11636 y2020
## 11637 y2020
## 11638 y2020
## 11639 y2020
## 11640 y2020
## 11641 y2020
## 11642 y2020
## 11643 y2020
## 11644 y2020
## 11645 y2020
## 11646 y2020
## 11647 y2020
## 11648 y2020
## 11649 y2020
## 11650 y2020
## 11651 y2020
## 11652 y2020
## 11653 y2020
## 11654 y2020
## 11655 y2020
## 11656 y2020
## 11657 y2020
## 11658 y2020
## 11659 y2020
## 11660 y2020
## 11661 y2020
## 11662 y2020
## 11663 y2020
## 11664 y2020
## 11665 y2020
## 11666 y2020
## 11667 y2020
## 11668 y2020
## 11669 y2020
## 11670 y2020
## 11671 y2020
## 11672 y2020
## 11673 y2020
## 11674 y2020
## 11675 y2020
## 11676 y2020
## 11677 y2020
## 11678 y2020
## 11679 y2020
## 11680 y2020
## 11681 y2020
## 11682 y2020
## 11683 y2020
## 11684 y2020
## 11685 y2020
## 11686 y2020
## 11687 y2020
## 11688 y2020
## 11689 y2020
## 11690 y2020
## 11691 y2020
## 11692 y2020
## 11693 y2020
## 11694 y2020
## 11695 y2020
## 11696 y2020
## 11697 y2020
## 11698 y2020
## 11699 y2020
## 11700 y2020
## 11701 y2020
## 11702 y2020
## 11703 y2020
## 11704 y2020
## 11705 y2020
## 11706 y2020
## 11707 y2020
## 11708 y2020
## 11709 y2020
## 11710 y2020
## 11711 y2020
## 11712 y2020
## 11713 y2020
## 11714 y2020
## 11715 y2020
## 11716 y2020
## 11717 y2020
## 11718 y2020
## 11719 y2020
## 11720 y2020
## 11721 y2020
## 11722 y2020
## 11723 y2020
## 11724 y2020
## 11725 y2020
## 11726 y2020
## 11727 y2020
## 11728 y2020
## 11729 y2020
## 11730 y2020
## 11731 y2020
## 11732 y2020
## 11733 y2020
## 11734 y2020
## 11735 y2020
## 11736 y2020
## 11737 y2020
## 11738 y2020
## 11739 y2020
## 11740 y2020
## 11741 y2020
## 11742 y2020
## 11743 y2020
## 11744 y2020
## 11745 y2020
## 11746 y2020
## 11747 y2020
## 11748 y2020
## 11749 y2020
## 11750 y2020
## 11751 y2020
## 11752 y2020
## 11753 y2020
## 11754 y2020
## 11755 y2020
## 11756 y2020
## 11757 y2020
## 11758 y2020
## 11759 y2020
## 11760 y2020
## 11761 y2020
## 11762 y2020
## 11763 y2020
## 11764 y2020
## 11765 y2020
## 11766 y2020
## 11767 y2020
## 11768 y2020
## 11769 y2020
## 11770 y2020
## 11771 y2020
## 11772 y2020
## 11773 y2020
## 11774 y2020
## 11775 y2020
## 11776 y2020
## 11777 y2020
## 11778 y2020
## 11779 y2020
## 11780 y2020
## 11781 y2020
## 11782 y2020
## 11783 y2020
## 11784 y2020
## 11785 y2020
## 11786 y2020
## 11787 y2020
## 11788 y2020
## 11789 y2020
## 11790 y2020
## 11791 y2020
## 11792 y2020
## 11793 y2020
## 11794 y2020
## 11795 y2020
## 11796 y2020
## 11797 y2020
## 11798 y2020
## 11799 y2020
## 11800 y2020
## 11801 y2020
## 11802 y2020
## 11803 y2020
## 11804 y2020
## 11805 y2020
## 11806 y2020
## 11807 y2020
## 11808 y2020
## 11809 y2020
## 11810 y2020
## 11811 y2020
## 11812 y2020
## 11813 y2020
## 11814 y2020
## 11815 y2020
## 11816 y2020
## 11817 y2020
## 11818 y2020
## 11819 y2020
## 11820 y2020
## 11821 y2020
## 11822 y2020
## 11823 y2020
## 11824 y2020
## 11825 y2020
## 11826 y2020
## 11827 y2020
## 11828 y2020
## 11829 y2020
## 11830 y2020
## 11831 y2020
## 11832 y2020
## 11833 y2020
## 11834 y2020
## 11835 y2020
## 11836 y2020
## 11837 y2020
## 11838 y2020
## 11839 y2020
## 11840 y2020
## 11841 y2020
## 11842 y2020
## 11843 y2020
## 11844 y2020
## 11845 y2020
## 11846 y2020
## 11847 y2020
## 11848 y2020
## 11849 y2020
## 11850 y2020
## 11851 y2020
## 11852 y2020
## 11853 y2020
## 11854 y2020
## 11855 y2020
## 11856 y2020
## 11857 y2020
## 11858 y2020
## 11859 y2020
## 11860 y2020
## 11861 y2020
## 11862 y2020
## 11863 y2020
## 11864 y2020
## 11865 y2020
## 11866 y2020
## 11867 y2020
## 11868 y2020
## 11869 y2020
## 11870 y2020
## 11871 y2020
## 11872 y2020
## 11873 y2020
## 11874 y2020
## 11875 y2020
## 11876 y2020
## 11877 y2020
## 11878 y2020
## 11879 y2020
## 11880 y2020
## 11881 y2020
## 11882 y2020
## 11883 y2020
## 11884 y2020
## 11885 y2020
## 11886 y2020
## 11887 y2020
## 11888 y2020
## 11889 y2020
## 11890 y2020
## 11891 y2020
## 11892 y2020
## 11893 y2020
## 11894 y2020
## 11895 y2020
## 11896 y2020
## 11897 y2020
## 11898 y2020
## 11899 y2020
## 11900 y2020
## 11901 y2020
## 11902 y2020
## 11903 y2020
## 11904 y2020
## 11905 y2020
## 11906 y2020
## 11907 y2020
## 11908 y2020
## 11909 y2020
## 11910 y2020
## 11911 y2020
## 11912 y2020
## 11913 y2020
## 11914 y2020
## 11915 y2020
## 11916 y2020
## 11917 y2020
## 11918 y2020
## 11919 y2020
## 11920 y2020
## 11921 y2020
## 11922 y2020
## 11923 y2020
## 11924 y2020
## 11925 y2020
## 11926 y2020
## 11927 y2020
## 11928 y2020
## 11929 y2020
## 11930 y2020
## 11931 y2020
## 11932 y2020
## 11933 y2020
## 11934 y2020
## 11935 y2020
## 11936 y2020
## 11937 y2020
## 11938 y2020
## 11939 y2020
## 11940 y2020
## 11941 y2020
## 11942 y2020
## 11943 y2020
## 11944 y2020
## 11945 y2020
## 11946 y2020
## 11947 y2020
## 11948 y2020
## 11949 y2020
## 11950 y2020
## 11951 y2020
## 11952 y2020
## 11953 y2020
## 11954 y2020
## 11955 y2020
## 11956 y2020
## 11957 y2020
## 11958 y2020
## 11959 y2020
## 11960 y2020
## 11961 y2020
## 11962 y2020
## 11963 y2020
## 11964 y2020
## 11965 y2020
## 11966 y2020
## 11967 y2020
## 11968 y2020
## 11969 y2020
## 11970 y2020
## 11971 y2020
## 11972 y2020
## 11973 y2020
## 11974 y2020
## 11975 y2020
## 11976 y2020
## 11977 y2020
## 11978 y2020
## 11979 y2020
## 11980 y2020
## 11981 y2020
## 11982 y2020
## 11983 y2020
## 11984 y2020
## 11985 y2020
## 11986 y2020
## 11987 y2020
## 11988 y2020
## 11989 y2020
## 11990 y2020
## 11991 y2020
## 11992 y2020
## 11993 y2020
## 11994 y2020
## 11995 y2020
## 11996 y2020
## 11997 y2020
## 11998 y2020
## 11999 y2020
## 12000 y2020
## 12001 y2020
## 12002 y2020
## 12003 y2020
## 12004 y2020
## 12005 y2020
## 12006 y2020
## 12007 y2020
## 12008 y2020
## 12009 y2020
## 12010 y2020
## 12011 y2020
## 12012 y2020
## 12013 y2020
## 12014 y2020
## 12015 y2020
## 12016 y2020
## 12017 y2020
## 12018 y2020
## 12019 y2020
## 12020 y2020
## 12021 y2020
## 12022 y2020
## 12023 y2020
## 12024 y2020
## 12025 y2020
## 12026 y2020
## 12027 y2020
## 12028 y2020
## 12029 y2020
## 12030 y2020
## 12031 y2020
## 12032 y2020
## 12033 y2020
## 12034 y2020
## 12035 y2020
## 12036 y2020
## 12037 y2020
## 12038 y2020
## 12039 y2020
## 12040 y2020
## 12041 y2020
## 12042 y2020
## 12043 y2020
## 12044 y2020
## 12045 y2020
## 12046 y2020
## 12047 y2020
## 12048 y2020
## 12049 y2020
## 12050 y2020
## 12051 y2020
## 12052 y2020
## 12053 y2020
## 12054 y2020
## 12055 y2020
## 12056 y2020
## 12057 y2020
## 12058 y2020
## 12059 y2020
## 12060 y2020
## 12061 y2020
## 12062 y2020
## 12063 y2020
## 12064 y2020
## 12065 y2020
## 12066 y2020
## 12067 y2020
## 12068 y2020
## 12069 y2020
## 12070 y2020
## 12071 y2020
## 12072 y2020
## 12073 y2020
## 12074 y2020
## 12075 y2020
## 12076 y2020
## 12077 y2020
## 12078 y2020
## 12079 y2020
## 12080 y2020
## 12081 y2020
## 12082 y2020
## 12083 y2020
## 12084 y2020
## 12085 y2020
## 12086 y2020
## 12087 y2020
## 12088 y2020
## 12089 y2020
## 12090 y2020
## 12091 y2020
## 12092 y2020
## 12093 y2020
## 12094 y2020
## 12095 y2020
## 12096 y2020
## 12097 y2020
## 12098 y2020
## 12099 y2020
## 12100 y2020
## 12101 y2020
## 12102 y2020
## 12103 y2020
## 12104 y2020
## 12105 y2020
## 12106 y2020
## 12107 y2020
## 12108 y2020
## 12109 y2020
## 12110 y2020
## 12111 y2020
## 12112 y2020
## 12113 y2020
## 12114 y2020
## 12115 y2020
## 12116 y2020
## 12117 y2020
## 12118 y2020
## 12119 y2020
## 12120 y2020
## 12121 y2020
## 12122 y2020
## 12123 y2020
## 12124 y2020
## 12125 y2020
## 12126 y2020
## 12127 y2020
## 12128 y2020
## 12129 y2020
## 12130 y2020
## 12131 y2020
## 12132 y2020
## 12133 y2020
## 12134 y2020
## 12135 y2020
## 12136 y2020
## 12137 y2020
## 12138 y2020
## 12139 y2020
## 12140 y2020
## 12141 y2020
## 12142 y2020
## 12143 y2020
## 12144 y2020
## 12145 y2020
## 12146 y2020
## 12147 y2020
## 12148 y2020
## 12149 y2020
## 12150 y2020
## 12151 y2020
## 12152 y2020
## 12153 y2020
## 12154 y2020
## 12155 y2020
## 12156 y2020
## 12157 y2020
## 12158 y2020
## 12159 y2020
## 12160 y2020
## 12161 y2020
## 12162 y2020
## 12163 y2020
## 12164 y2020
## 12165 y2020
## 12166 y2020
## 12167 y2020
## 12168 y2020
## 12169 y2020
## 12170 y2020
## 12171 y2020
## 12172 y2020
## 12173 y2020
## 12174 y2020
## 12175 y2020
## 12176 y2020
## 12177 y2020
## 12178 y2020
## 12179 y2020
## 12180 y2020
## 12181 y2020
## 12182 y2020
## 12183 y2020
## 12184 y2020
## 12185 y2020
## 12186 y2020
## 12187 y2020
## 12188 y2020
## 12189 y2020
## 12190 y2020
## 12191 y2020
## 12192 y2020
## 12193 y2020
## 12194 y2020
## 12195 y2020
## 12196 y2020
## 12197 y2020
## 12198 y2020
## 12199 y2020
## 12200 y2020
## 12201 y2020
## 12202 y2020
## 12203 y2020
## 12204 y2020
## 12205 y2020
## 12206 y2020
## 12207 y2020
## 12208 y2020
## 12209 y2020
## 12210 y2020
## 12211 y2020
## 12212 y2020
## 12213 y2020
## 12214 y2020
## 12215 y2020
## 12216 y2020
## 12217 y2020
## 12218 y2020
## 12219 y2020
## 12220 y2020
## 12221 y2020
## 12222 y2020
## 12223 y2020
## 12224 y2020
## 12225 y2020
## 12226 y2020
## 12227 y2020
## 12228 y2020
## 12229 y2020
## 12230 y2020
## 12231 y2020
## 12232 y2020
## 12233 y2020
## 12234 y2020
## 12235 y2020
## 12236 y2020
## 12237 y2020
## 12238 y2020
## 12239 y2020
## 12240 y2020
## 12241 y2020
## 12242 y2020
## 12243 y2020
## 12244 y2020
## 12245 y2020
## 12246 y2020
## 12247 y2020
## 12248 y2020
## 12249 y2020
## 12250 y2020
## 12251 y2020
## 12252 y2020
## 12253 y2020
## 12254 y2020
## 12255 y2020
## 12256 y2020
## 12257 y2020
## 12258 y2020
## 12259 y2020
## 12260 y2020
## 12261 y2020
## 12262 y2020
## 12263 y2020
## 12264 y2020
## 12265 y2020
## 12266 y2020
## 12267 y2020
## 12268 y2020
## 12269 y2020
## 12270 y2020
## 12271 y2020
## 12272 y2020
## 12273 y2020
## 12274 y2020
## 12275 y2020
## 12276 y2020
## 12277 y2020
## 12278 y2020
## 12279 y2020
## 12280 y2020
## 12281 y2020
## 12282 y2020
## 12283 y2020
## 12284 y2020
## 12285 y2020
## 12286 y2020
## 12287 y2020
## 12288 y2020
## 12289 y2020
## 12290 y2020
## 12291 y2020
## 12292 y2020
## 12293 y2020
## 12294 y2020
## 12295 y2020
## 12296 y2020
## 12297 y2020
## 12298 y2020
## 12299 y2020
## 12300 y2020
## 12301 y2020
## 12302 y2020
## 12303 y2020
## 12304 y2020
## 12305 y2020
## 12306 y2020
## 12307 y2020
## 12308 y2020
## 12309 y2020
## 12310 y2020
## 12311 y2020
## 12312 y2020
## 12313 y2020
## 12314 y2020
## 12315 y2020
## 12316 y2020
## 12317 y2020
## 12318 y2020
## 12319 y2020
## 12320 y2020
## 12321 y2020
## 12322 y2020
## 12323 y2020
## 12324 y2020
## 12325 y2020
## 12326 y2020
## 12327 y2020
## 12328 y2020
## 12329 y2020
## 12330 y2020
## 12331 y2020
## 12332 y2020
## 12333 y2020
## 12334 y2020
## 12335 y2020
## 12336 y2020
## 12337 y2020
## 12338 y2020
## 12339 y2020
## 12340 y2020
## 12341 y2020
## 12342 y2020
## 12343 y2020
## 12344 y2020
## 12345 y2020
## 12346 y2020
## 12347 y2020
## 12348 y2020
## 12349 y2020
## 12350 y2020
## 12351 y2020
## 12352 y2020
## 12353 y2020
## 12354 y2020
## 12355 y2020
## 12356 y2020
## 12357 y2020
## 12358 y2020
## 12359 y2020
## 12360 y2020
## 12361 y2020
## 12362 y2020
## 12363 y2020
## 12364 y2020
## 12365 y2020
## 12366 y2020
## 12367 y2020
## 12368 y2020
## 12369 y2020
## 12370 y2020
## 12371 y2020
## 12372 y2020
## 12373 y2020
## 12374 y2020
## 12375 y2020
## 12376 y2020
## 12377 y2020
## 12378 y2020
## 12379 y2020
## 12380 y2020
## 12381 y2020
## 12382 y2020
## 12383 y2020
## 12384 y2020
## 12385 y2020
## 12386 y2020
## 12387 y2020
## 12388 y2020
## 12389 y2020
## 12390 y2020
## 12391 y2020
## 12392 y2020
## 12393 y2020
## 12394 y2020
## 12395 y2020
## 12396 y2020
## 12397 y2020
## 12398 y2020
## 12399 y2020
## 12400 y2020
## 12401 y2020
## 12402 y2020
## 12403 y2020
## 12404 y2020
## 12405 y2020
## 12406 y2020
## 12407 y2020
## 12408 y2020
## 12409 y2020
## 12410 y2020
## 12411 y2020
## 12412 y2020
## 12413 y2020
## 12414 y2020
## 12415 y2020
## 12416 y2020
## 12417 y2020
## 12418 y2020
## 12419 y2020
## 12420 y2020
## 12421 y2020
## 12422 y2020
## 12423 y2020
## 12424 y2020
## 12425 y2020
## 12426 y2020
## 12427 y2020
## 12428 y2020
## 12429 y2020
## 12430 y2020
## 12431 y2020
## 12432 y2020
## 12433 y2020
## 12434 y2020
## 12435 y2020
## 12436 y2020
## 12437 y2020
## 12438 y2020
## 12439 y2020
## 12440 y2020
## 12441 y2020
## 12442 y2020
## 12443 y2020
## 12444 y2020
## 12445 y2020
## 12446 y2020
## 12447 y2020
## 12448 y2020
## 12449 y2020
## 12450 y2020
## 12451 y2020
## 12452 y2020
## 12453 y2020
## 12454 y2020
## 12455 y2020
## 12456 y2020
## 12457 y2020
## 12458 y2020
## 12459 y2020
## 12460 y2020
## 12461 y2020
## 12462 y2020
## 12463 y2020
## 12464 y2020
## 12465 y2020
## 12466 y2020
## 12467 y2020
## 12468 y2020
## 12469 y2020
## 12470 y2020
## 12471 y2020
## 12472 y2020
## 12473 y2020
## 12474 y2020
## 12475 y2020
## 12476 y2020
## 12477 y2020
## 12478 y2020
## 12479 y2020
## 12480 y2020
## 12481 y2020
## 12482 y2020
## 12483 y2020
## 12484 y2020
## 12485 y2020
## 12486 y2020
## 12487 y2020
## 12488 y2020
## 12489 y2020
## 12490 y2020
## 12491 y2020
## 12492 y2020
## 12493 y2020
## 12494 y2020
## 12495 y2020
## 12496 y2020
## 12497 y2020
## 12498 y2020
## 12499 y2020
## 12500 y2020
## 12501 y2020
## 12502 y2020
## 12503 y2020
## 12504 y2020
## 12505 y2020
## 12506 y2020
## 12507 y2020
## 12508 y2020
## 12509 y2020
## 12510 y2020
## 12511 y2020
## 12512 y2020
## 12513 y2020
## 12514 y2020
## 12515 y2020
## 12516 y2020
## 12517 y2020
## 12518 y2020
## 12519 y2020
## 12520 y2020
## 12521 y2020
## 12522 y2020
## 12523 y2020
## 12524 y2020
## 12525 y2020
## 12526 y2020
## 12527 y2020
## 12528 y2020
## 12529 y2020
## 12530 y2020
## 12531 y2020
## 12532 y2020
## 12533 y2020
## 12534 y2020
## 12535 y2020
## 12536 y2020
## 12537 y2020
## 12538 y2020
## 12539 y2020
## 12540 y2020
## 12541 y2020
## 12542 y2020
## 12543 y2020
## 12544 y2020
## 12545 y2020
## 12546 y2020
## 12547 y2020
## 12548 y2020
## 12549 y2020
## 12550 y2020
## 12551 y2020
## 12552 y2020
## 12553 y2020
## 12554 y2020
## 12555 y2020
## 12556 y2020
## 12557 y2020
## 12558 y2020
## 12559 y2020
## 12560 y2020
## 12561 y2020
## 12562 y2020
## 12563 y2020
## 12564 y2020
## 12565 y2020
## 12566 y2020
## 12567 y2020
## 12568 y2020
## 12569 y2020
## 12570 y2020
## 12571 y2020
## 12572 y2020
## 12573 y2020
## 12574 y2020
## 12575 y2020
## 12576 y2020
## 12577 y2020
## 12578 y2020
## 12579 y2020
## 12580 y2020
## 12581 y2020
## 12582 y2020
## 12583 y2020
## 12584 y2020
## 12585 y2020
## 12586 y2020
## 12587 y2020
## 12588 y2020
## 12589 y2020
## 12590 y2020
## 12591 y2020
## 12592 y2020
## 12593 y2020
## 12594 y2020
## 12595 y2020
## 12596 y2020
## 12597 y2020
## 12598 y2020
## 12599 y2020
## 12600 y2020
## 12601 y2020
## 12602 y2020
## 12603 y2020
## 12604 y2020
## 12605 y2020
## 12606 y2020
## 12607 y2020
## 12608 y2020
## 12609 y2020
## 12610 y2020
## 12611 y2020
## 12612 y2020
## 12613 y2020
## 12614 y2020
## 12615 y2020
## 12616 y2020
## 12617 y2020
## 12618 y2020
## 12619 y2020
## 12620 y2020
## 12621 y2020
## 12622 y2020
## 12623 y2020
## 12624 y2020
## 12625 y2020
## 12626 y2020
## 12627 y2020
## 12628 y2020
## 12629 y2020
## 12630 y2020
## 12631 y2020
## 12632 y2020
## 12633 y2020
## 12634 y2020
## 12635 y2020
## 12636 y2020
## 12637 y2020
## 12638 y2020
## 12639 y2020
## 12640 y2020
## 12641 y2020
## 12642 y2020
## 12643 y2020
## 12644 y2020
## 12645 y2020
## 12646 y2020
## 12647 y2020
## 12648 y2020
## 12649 y2020
## 12650 y2020
## 12651 y2020
## 12652 y2020
## 12653 y2020
## 12654 y2020
## 12655 y2020
## 12656 y2020
## 12657 y2020
## 12658 y2020
## 12659 y2020
## 12660 y2020
## 12661 y2020
## 12662 y2020
## 12663 y2020
## 12664 y2020
## 12665 y2020
## 12666 y2020
## 12667 y2020
## 12668 y2020
## 12669 y2020
## 12670 y2020
## 12671 y2020
## 12672 y2020
## 12673 y2020
## 12674 y2020
## 12675 y2020
## 12676 y2020
## 12677 y2020
## 12678 y2020
## 12679 y2020
## 12680 y2020
## 12681 y2020
## 12682 y2020
## 12683 y2020
## 12684 y2020
## 12685 y2020
## 12686 y2020
## 12687 y2020
## 12688 y2020
## 12689 y2020
## 12690 y2020
## 12691 y2020
## 12692 y2020
## 12693 y2020
## 12694 y2020
## 12695 y2020
## 12696 y2020
## 12697 y2020
## 12698 y2020
## 12699 y2020
## 12700 y2020
## 12701 y2020
## 12702 y2020
## 12703 y2020
## 12704 y2020
## 12705 y2020
## 12706 y2020
## 12707 y2020
## 12708 y2020
## 12709 y2020
## 12710 y2020
## 12711 y2020
## 12712 y2020
## 12713 y2020
## 12714 y2020
## 12715 y2020
## 12716 y2020
## 12717 y2020
## 12718 y2020
## 12719 y2020
## 12720 y2020
## 12721 y2020
## 12722 y2020
## 12723 y2020
## 12724 y2020
## 12725 y2020
## 12726 y2020
## 12727 y2020
## 12728 y2020
## 12729 y2020
## 12730 y2020
## 12731 y2020
## 12732 y2020
## 12733 y2020
## 12734 y2020
## 12735 y2020
## 12736 y2020
## 12737 y2020
## 12738 y2020
## 12739 y2020
## 12740 y2020
## 12741 y2020
## 12742 y2020
## 12743 y2020
## 12744 y2020
## 12745 y2020
## 12746 y2020
## 12747 y2020
## 12748 y2020
## 12749 y2020
## 12750 y2020
## 12751 y2020
## 12752 y2020
## 12753 y2020
## 12754 y2020
## 12755 y2020
## 12756 y2020
## 12757 y2020
## 12758 y2020
## 12759 y2020
## 12760 y2020
## 12761 y2020
## 12762 y2020
## 12763 y2020
## 12764 y2020
## 12765 y2020
## 12766 y2020
## 12767 y2020
## 12768 y2020
## 12769 y2020
## 12770 y2020
## 12771 y2020
## 12772 y2020
## 12773 y2020
## 12774 y2020
## 12775 y2020
## 12776 y2020
## 12777 y2020
## 12778 y2020
## 12779 y2020
## 12780 y2020
## 12781 y2020
## 12782 y2020
## 12783 y2020
## 12784 y2020
## 12785 y2020
## 12786 y2020
## 12787 y2020
## 12788 y2020
## 12789 y2020
## 12790 y2020
## 12791 y2020
## 12792 y2020
## 12793 y2020
## 12794 y2020
## 12795 y2020
## 12796 y2020
## 12797 y2020
## 12798 y2020
## 12799 y2020
## 12800 y2020
## 12801 y2020
## 12802 y2020
## 12803 y2020
## 12804 y2020
## 12805 y2020
## 12806 y2020
## 12807 y2020
## 12808 y2020
## 12809 y2020
## 12810 y2020
## 12811 y2020
## 12812 y2020
## 12813 y2020
## 12814 y2020
## 12815 y2020
## 12816 y2020
## 12817 y2020
## 12818 y2020
## 12819 y2020
## 12820 y2020
## 12821 y2020
## 12822 y2020
## 12823 y2020
## 12824 y2020
## 12825 y2020
## 12826 y2020
## 12827 y2020
## 12828 y2020
## 12829 y2020
## 12830 y2020
## 12831 y2020
## 12832 y2020
## 12833 y2020
## 12834 y2020
## 12835 y2020
## 12836 y2020
## 12837 y2020
## 12838 y2020
## 12839 y2020
## 12840 y2020
## 12841 y2020
## 12842 y2020
## 12843 y2020
## 12844 y2020
## 12845 y2020
## 12846 y2020
## 12847 y2020
## 12848 y2020
## 12849 y2020
## 12850 y2020
## 12851 y2020
## 12852 y2020
## 12853 y2020
## 12854 y2020
## 12855 y2020
## 12856 y2020
## 12857 y2020
## 12858 y2020
## 12859 y2020
## 12860 y2020
## 12861 y2020
## 12862 y2020
## 12863 y2020
## 12864 y2020
## 12865 y2020
## 12866 y2020
## 12867 y2020
## 12868 y2020
## 12869 y2020
## 12870 y2020
## 12871 y2020
## 12872 y2020
## 12873 y2020
## 12874 y2020
## 12875 y2020
## 12876 y2020
## 12877 y2020
## 12878 y2020
## 12879 y2020
## 12880 y2020
## 12881 y2020
## 12882 y2020
## 12883 y2020
## 12884 y2020
## 12885 y2020
## 12886 y2020
## 12887 y2020
## 12888 y2020
## 12889 y2020
## 12890 y2020
## 12891 y2020
## 12892 y2020
## 12893 y2020
## 12894 y2020
## 12895 y2020
## 12896 y2020
## 12897 y2020
## 12898 y2020
## 12899 y2020
## 12900 y2020
## 12901 y2020
## 12902 y2020
## 12903 y2020
## 12904 y2020
## 12905 y2020
## 12906 y2020
## 12907 y2020
## 12908 y2020
## 12909 y2020
## 12910 y2020
## 12911 y2020
## 12912 y2020
## 12913 y2020
## 12914 y2020
## 12915 y2020
## 12916 y2020
## 12917 y2020
## 12918 y2020
## 12919 y2020
## 12920 y2020
## 12921 y2020
## 12922 y2020
## 12923 y2020
## 12924 y2020
## 12925 y2020
## 12926 y2020
## 12927 y2020
## 12928 y2020
## 12929 y2020
## 12930 y2020
## 12931 y2020
## 12932 y2020
## 12933 y2020
## 12934 y2020
## 12935 y2020
## 12936 y2020
## 12937 y2020
## 12938 y2020
## 12939 y2020
## 12940 y2020
## 12941 y2020
## 12942 y2020
## 12943 y2020
## 12944 y2020
## 12945 y2020
## 12946 y2020
## 12947 y2020
## 12948 y2020
## 12949 y2020
## 12950 y2020
## 12951 y2020
## 12952 y2020
## 12953 y2020
## 12954 y2020
## 12955 y2020
## 12956 y2020
## 12957 y2020
## 12958 y2020
## 12959 y2020
## 12960 y2020
## 12961 y2020
## 12962 y2020
## 12963 y2020
## 12964 y2020
## 12965 y2020
## 12966 y2020
## 12967 y2020
## 12968 y2020
## 12969 y2020
## 12970 y2020
## 12971 y2020
## 12972 y2020
## 12973 y2020
## 12974 y2020
## 12975 y2020
## 12976 y2020
## 12977 y2020
## 12978 y2020
## 12979 y2020
## 12980 y2020
## 12981 y2020
## 12982 y2020
## 12983 y2020
## 12984 y2020
## 12985 y2020
## 12986 y2020
## 12987 y2020
## 12988 y2020
## 12989 y2020
## 12990 y2020
## 12991 y2020
## 12992 y2020
## 12993 y2020
## 12994 y2020
## 12995 y2020
## 12996 y2020
## 12997 y2020
## 12998 y2020
## 12999 y2020
## 13000 y2020
## 13001 y2020
## 13002 y2020
## 13003 y2020
## 13004 y2020
## 13005 y2020
## 13006 y2020
## 13007 y2020
## 13008 y2020
## 13009 y2020
## 13010 y2020
## 13011 y2020
## 13012 y2020
## 13013 y2020
## 13014 y2020
## 13015 y2020
## 13016 y2020
## 13017 y2020
## 13018 y2020
## 13019 y2020
## 13020 y2020
## 13021 y2020
## 13022 y2020
## 13023 y2020
## 13024 y2020
## 13025 y2020
## 13026 y2020
## 13027 y2020
## 13028 y2020
## 13029 y2020
## 13030 y2020
## 13031 y2020
## 13032 y2020
## 13033 y2020
## 13034 y2020
## 13035 y2020
## 13036 y2020
## 13037 y2020
## 13038 y2020
## 13039 y2020
## 13040 y2020
## 13041 y2020
## 13042 y2020
## 13043 y2020
## 13044 y2020
## 13045 y2020
## 13046 y2020
## 13047 y2020
## 13048 y2020
## 13049 y2020
## 13050 y2020
## 13051 y2020
## 13052 y2020
## 13053 y2020
## 13054 y2020
## 13055 y2020
## 13056 y2020
## 13057 y2020
## 13058 y2020
## 13059 y2020
## 13060 y2020
## 13061 y2020
## 13062 y2020
## 13063 y2020
## 13064 y2020
## 13065 y2020
## 13066 y2020
## 13067 y2020
## 13068 y2020
## 13069 y2020
## 13070 y2020
## 13071 y2020
## 13072 y2020
## 13073 y2020
## 13074 y2020
## 13075 y2020
## 13076 y2020
## 13077 y2020
## 13078 y2020
## 13079 y2020
## 13080 y2020
## 13081 y2020
## 13082 y2020
## 13083 y2020
## 13084 y2020
## 13085 y2020
## 13086 y2020
## 13087 y2020
## 13088 y2020
## 13089 y2020
## 13090 y2020
## 13091 y2020
## 13092 y2020
## 13093 y2020
## 13094 y2020
## 13095 y2020
## 13096 y2020
## 13097 y2020
## 13098 y2020
## 13099 y2020
## 13100 y2020
## 13101 y2020
## 13102 y2020
## 13103 y2020
## 13104 y2020
## 13105 y2020
## 13106 y2020
## 13107 y2020
## 13108 y2020
## 13109 y2020
## 13110 y2020
## 13111 y2020
## 13112 y2020
## 13113 y2020
## 13114 y2020
## 13115 y2020
## 13116 y2020
## 13117 y2020
## 13118 y2020
## 13119 y2020
## 13120 y2020
## 13121 y2020
## 13122 y2020
## 13123 y2020
## 13124 y2020
## 13125 y2020
## 13126 y2020
## 13127 y2020
## 13128 y2020
## 13129 y2020
## 13130 y2020
## 13131 y2020
## 13132 y2020
## 13133 y2020
## 13134 y2020
## 13135 y2020
## 13136 y2020
## 13137 y2020
## 13138 y2020
## 13139 y2020
## 13140 y2020
## 13141 y2020
## 13142 y2020
## 13143 y2020
## 13144 y2020
## 13145 y2020
## 13146 y2020
## 13147 y2020
## 13148 y2020
## 13149 y2020
## 13150 y2020
## 13151 y2020
## 13152 y2020
## 13153 y2020
## 13154 y2020
## 13155 y2020
## 13156 y2020
## 13157 y2020
## 13158 y2020
## 13159 y2020
## 13160 y2020
## 13161 y2020
## 13162 y2020
## 13163 y2020
## 13164 y2020
## 13165 y2020
## 13166 y2020
## 13167 y2020
## 13168 y2020
## 13169 y2020
## 13170 y2020
## 13171 y2020
## 13172 y2020
## 13173 y2020
## 13174 y2020
## 13175 y2020
## 13176 y2020
## 13177 y2020
## 13178 y2020
## 13179 y2020
## 13180 y2020
## 13181 y2020
## 13182 y2020
## 13183 y2020
## 13184 y2020
## 13185 y2020
## 13186 y2020
## 13187 y2020
## 13188 y2020
## 13189 y2020
## 13190 y2020
## 13191 y2020
## 13192 y2020
## 13193 y2020
## 13194 y2020
## 13195 y2020
## 13196 y2020
## 13197 y2020
## 13198 y2020
## 13199 y2020
## 13200 y2020
## 13201 y2020
## 13202 y2020
## 13203 y2020
## 13204 y2020
## 13205 y2020
## 13206 y2020
## 13207 y2020
## 13208 y2020
## 13209 y2020
## 13210 y2020
## 13211 y2020
## 13212 y2020
## 13213 y2020
## 13214 y2020
## 13215 y2020
## 13216 y2020
## 13217 y2020
## 13218 y2020
## 13219 y2020
## 13220 y2020
## 13221 y2020
## 13222 y2020
## 13223 y2020
## 13224 y2020
## 13225 y2020
## 13226 y2020
## 13227 y2020
## 13228 y2020
## 13229 y2020
## 13230 y2020
## 13231 y2020
## 13232 y2020
## 13233 y2020
## 13234 y2020
## 13235 y2020
## 13236 y2020
## 13237 y2020
## 13238 y2020
## 13239 y2020
## 13240 y2020
## 13241 y2020
## 13242 y2020
## 13243 y2020
## 13244 y2020
## 13245 y2020
## 13246 y2020
## 13247 y2020
## 13248 y2020
## 13249 y2020
## 13250 y2020
## 13251 y2020
## 13252 y2020
## 13253 y2020
## 13254 y2020
## 13255 y2020
## 13256 y2020
## 13257 y2020
## 13258 y2020
## 13259 y2020
## 13260 y2020
## 13261 y2020
## 13262 y2020
## 13263 y2020
## 13264 y2020
## 13265 y2020
## 13266 y2020
## 13267 y2020
## 13268 y2020
## 13269 y2020
## 13270 y2020
## 13271 y2020
## 13272 y2020
## 13273 y2020
## 13274 y2020
## 13275 y2020
## 13276 y2020
## 13277 y2020
## 13278 y2020
## 13279 y2020
## 13280 y2020
## 13281 y2020
## 13282 y2020
## 13283 y2020
## 13284 y2020
## 13285 y2020
## 13286 y2020
## 13287 y2020
## 13288 y2020
## 13289 y2020
## 13290 y2020
## 13291 y2020
## 13292 y2020
## 13293 y2020
## 13294 y2020
## 13295 y2020
## 13296 y2020
## 13297 y2020
## 13298 y2020
## 13299 y2020
## 13300 y2020
## 13301 y2020
## 13302 y2020
## 13303 y2020
## 13304 y2020
## 13305 y2020
## 13306 y2020
## 13307 y2020
## 13308 y2020
## 13309 y2020
## 13310 y2020
## 13311 y2020
## 13312 y2020
## 13313 y2020
## 13314 y2020
## 13315 y2020
## 13316 y2020
## 13317 y2020
## 13318 y2020
## 13319 y2020
## 13320 y2020
## 13321 y2020
## 13322 y2020
## 13323 y2020
## 13324 y2020
## 13325 y2020
## 13326 y2020
## 13327 y2020
## 13328 y2020
## 13329 y2020
## 13330 y2020
## 13331 y2020
## 13332 y2020
## 13333 y2020
## 13334 y2020
## 13335 y2020
## 13336 y2020
## 13337 y2020
## 13338 y2020
## 13339 y2020
## 13340 y2020
## 13341 y2020
## 13342 y2020
## 13343 y2020
## 13344 y2020
## 13345 y2020
## 13346 y2020
## 13347 y2020
## 13348 y2020
## 13349 y2020
## 13350 y2020
## 13351 y2020
## 13352 y2020
## 13353 y2020
## 13354 y2020
## 13355 y2020
## 13356 y2020
## 13357 y2020
## 13358 y2020
## 13359 y2020
## 13360 y2020
## 13361 y2020
## 13362 y2020
## 13363 y2020
## 13364 y2020
## 13365 y2020
## 13366 y2020
## 13367 y2020
## 13368 y2020
## 13369 y2020
## 13370 y2020
## 13371 y2020
## 13372 y2020
## 13373 y2020
## 13374 y2020
## 13375 y2020
## 13376 y2020
## 13377 y2020
## 13378 y2020
## 13379 y2020
## 13380 y2020
## 13381 y2020
## 13382 y2020
## 13383 y2020
## 13384 y2020
## 13385 y2020
## 13386 y2020
## 13387 y2020
## 13388 y2020
## 13389 y2020
## 13390 y2020
## 13391 y2020
## 13392 y2020
## 13393 y2020
## 13394 y2020
## 13395 y2020
## 13396 y2020
## 13397 y2020
## 13398 y2020
## 13399 y2020
## 13400 y2020
## 13401 y2020
## 13402 y2020
## 13403 y2020
## 13404 y2020
## 13405 y2020
## 13406 y2020
## 13407 y2020
## 13408 y2020
## 13409 y2020
## 13410 y2020
## 13411 y2020
## 13412 y2020
## 13413 y2020
## 13414 y2020
## 13415 y2020
## 13416 y2020
## 13417 y2020
## 13418 y2020
## 13419 y2020
## 13420 y2020
## 13421 y2020
## 13422 y2020
## 13423 y2020
## 13424 y2020
## 13425 y2020
## 13426 y2020
## 13427 y2020
## 13428 y2020
## 13429 y2020
## 13430 y2020
## 13431 y2020
## 13432 y2020
## 13433 y2020
## 13434 y2020
## 13435 y2020
## 13436 y2020
## 13437 y2020
## 13438 y2020
## 13439 y2020
## 13440 y2020
## 13441 y2020
## 13442 y2020
## 13443 y2020
## 13444 y2020
## 13445 y2020
## 13446 y2020
## 13447 y2020
## 13448 y2020
## 13449 y2020
## 13450 y2020
## 13451 y2020
## 13452 y2020
## 13453 y2020
## 13454 y2020
## 13455 y2020
## 13456 y2020
## 13457 y2020
## 13458 y2020
## 13459 y2020
## 13460 y2020
## 13461 y2020
## 13462 y2020
## 13463 y2020
## 13464 y2020
## 13465 y2020
## 13466 y2020
## 13467 y2020
## 13468 y2020
## 13469 y2020
## 13470 y2020
## 13471 y2020
## 13472 y2020
## 13473 y2020
## 13474 y2020
## 13475 y2020
## 13476 y2020
## 13477 y2020
## 13478 y2020
## 13479 y2020
## 13480 y2020
## 13481 y2020
## 13482 y2020
## 13483 y2020
## 13484 y2020
## 13485 y2020
## 13486 y2020
## 13487 y2020
## 13488 y2020
## 13489 y2020
## 13490 y2020
## 13491 y2020
## 13492 y2020
## 13493 y2020
## 13494 y2020
## 13495 y2020
## 13496 y2020
## 13497 y2020
## 13498 y2020
## 13499 y2020
## 13500 y2020
## 13501 y2020
## 13502 y2020
## 13503 y2020
## 13504 y2020
## 13505 y2020
## 13506 y2020
## 13507 y2020
## 13508 y2020
## 13509 y2020
## 13510 y2020
## 13511 y2020
## 13512 y2020
## 13513 y2020
## 13514 y2020
## 13515 y2020
## 13516 y2020
## 13517 y2020
## 13518 y2020
## 13519 y2020
## 13520 y2020
## 13521 y2020
## 13522 y2020
## 13523 y2020
## 13524 y2020
## 13525 y2020
## 13526 y2020
## 13527 y2020
## 13528 y2020
## 13529 y2020
## 13530 y2020
## 13531 y2020
## 13532 y2020
## 13533 y2020
## 13534 y2020
## 13535 y2020
## 13536 y2020
## 13537 y2020
## 13538 y2020
## 13539 y2020
## 13540 y2020
## 13541 y2020
## 13542 y2020
## 13543 y2020
## 13544 y2020
## 13545 y2020
## 13546 y2020
## 13547 y2020
## 13548 y2020
## 13549 y2020
## 13550 y2020
## 13551 y2020
## 13552 y2020
## 13553 y2020
## 13554 y2020
## 13555 y2020
## 13556 y2020
## 13557 y2020
## 13558 y2020
## 13559 y2020
## 13560 y2020
## 13561 y2020
## 13562 y2020
## 13563 y2020
## 13564 y2020
## 13565 y2020
## 13566 y2020
## 13567 y2020
## 13568 y2020
## 13569 y2020
## 13570 y2020
## 13571 y2020
## 13572 y2020
## 13573 y2020
## 13574 y2020
## 13575 y2020
## 13576 y2020
## 13577 y2020
## 13578 y2020
## 13579 y2020
## 13580 y2020
## 13581 y2020
## 13582 y2020
## 13583 y2020
## 13584 y2020
## 13585 y2020
## 13586 y2020
## 13587 y2020
## 13588 y2020
## 13589 y2020
## 13590 y2020
## 13591 y2020
## 13592 y2020
## 13593 y2020
## 13594 y2020
## 13595 y2020
## 13596 y2020
## 13597 y2020
## 13598 y2020
## 13599 y2020
## 13600 y2020
## 13601 y2020
## 13602 y2020
## 13603 y2020
## 13604 y2020
## 13605 y2020
## 13606 y2020
## 13607 y2020
## 13608 y2020
## 13609 y2020
## 13610 y2020
## 13611 y2020
## 13612 y2020
## 13613 y2020
## 13614 y2020
## 13615 y2020
## 13616 y2020
## 13617 y2020
## 13618 y2020
## 13619 y2020
## 13620 y2020
## 13621 y2020
## 13622 y2020
## 13623 y2020
## 13624 y2020
## 13625 y2020
## 13626 y2020
## 13627 y2020
## 13628 y2020
## 13629 y2020
## 13630 y2020
## 13631 y2020
## 13632 y2020
## 13633 y2020
## 13634 y2020
## 13635 y2020
## 13636 y2020
## 13637 y2020
## 13638 y2020
## 13639 y2020
## 13640 y2020
## 13641 y2020
## 13642 y2020
## 13643 y2020
## 13644 y2020
## 13645 y2020
## 13646 y2020
## 13647 y2020
## 13648 y2020
## 13649 y2020
## 13650 y2020
## 13651 y2020
## 13652 y2020
## 13653 y2020
## 13654 y2020
## 13655 y2020
## 13656 y2020
## 13657 y2020
## 13658 y2020
## 13659 y2020
## 13660 y2020
## 13661 y2020
## 13662 y2020
## 13663 y2020
## 13664 y2020
## 13665 y2020
## 13666 y2020
## 13667 y2020
## 13668 y2020
## 13669 y2020
## 13670 y2020
## 13671 y2020
## 13672 y2020
## 13673 y2020
## 13674 y2020
## 13675 y2020
## 13676 y2020
## 13677 y2020
## 13678 y2020
## 13679 y2020
## 13680 y2020
## 13681 y2020
## 13682 y2020
## 13683 y2020
## 13684 y2020
## 13685 y2020
## 13686 y2020
## 13687 y2020
## 13688 y2020
## 13689 y2020
## 13690 y2020
## 13691 y2020
## 13692 y2020
## 13693 y2020
## 13694 y2020
## 13695 y2020
## 13696 y2020
## 13697 y2020
## 13698 y2020
## 13699 y2020
## 13700 y2020
## 13701 y2020
## 13702 y2020
## 13703 y2020
## 13704 y2020
## 13705 y2020
## 13706 y2020
## 13707 y2020
## 13708 y2020
## 13709 y2020
## 13710 y2020
## 13711 y2020
## 13712 y2020
## 13713 y2020
## 13714 y2020
## 13715 y2020
## 13716 y2020
## 13717 y2020
## 13718 y2020
## 13719 y2020
## 13720 y2020
## 13721 y2020
## 13722 y2020
## 13723 y2020
## 13724 y2020
## 13725 y2020
## 13726 y2020
## 13727 y2020
## 13728 y2020
## 13729 y2020
## 13730 y2020
## 13731 y2020
## 13732 y2020
## 13733 y2020
## 13734 y2020
## 13735 y2020
## 13736 y2020
## 13737 y2020
## 13738 y2020
## 13739 y2020
## 13740 y2020
## 13741 y2020
## 13742 y2020
## 13743 y2020
## 13744 y2020
## 13745 y2020
## 13746 y2020
## 13747 y2020
## 13748 y2020
## 13749 y2020
## 13750 y2020
## 13751 y2020
## 13752 y2020
## 13753 y2020
## 13754 y2020
## 13755 y2020
## 13756 y2020
## 13757 y2020
## 13758 y2020
## 13759 y2020
## 13760 y2020
## 13761 y2020
## 13762 y2020
## 13763 y2020
## 13764 y2020
## 13765 y2020
## 13766 y2020
## 13767 y2020
## 13768 y2020
## 13769 y2020
## 13770 y2020
## 13771 y2020
## 13772 y2020
## 13773 y2020
## 13774 y2020
## 13775 y2020
## 13776 y2020
## 13777 y2020
## 13778 y2020
## 13779 y2020
## 13780 y2020
## 13781 y2020
## 13782 y2020
## 13783 y2020
## 13784 y2020
## 13785 y2020
## 13786 y2020
## 13787 y2020
## 13788 y2020
## 13789 y2020
## 13790 y2020
## 13791 y2020
## 13792 y2020
## 13793 y2020
## 13794 y2020
## 13795 y2020
## 13796 y2020
## 13797 y2020
## 13798 y2020
## 13799 y2020
## 13800 y2020
## 13801 y2020
## 13802 y2020
## 13803 y2020
## 13804 y2020
## 13805 y2020
## 13806 y2020
## 13807 y2020
## 13808 y2020
## 13809 y2020
## 13810 y2020
## 13811 y2020
## 13812 y2020
## 13813 y2020
## 13814 y2020
## 13815 y2020
## 13816 y2020
## 13817 y2020
## 13818 y2020
## 13819 y2020
## 13820 y2020
## 13821 y2020
## 13822 y2020
## 13823 y2020
## 13824 y2020
## 13825 y2020
## 13826 y2020
## 13827 y2020
## 13828 y2020
## 13829 y2020
## 13830 y2020
## 13831 y2020
## 13832 y2020
## 13833 y2020
## 13834 y2020
## 13835 y2020
## 13836 y2020
## 13837 y2020
## 13838 y2020
## 13839 y2020
## 13840 y2020
## 13841 y2020
## 13842 y2020
## 13843 y2020
## 13844 y2020
## 13845 y2020
## 13846 y2020
## 13847 y2020
## 13848 y2020
## 13849 y2020
## 13850 y2020
## 13851 y2020
## 13852 y2020
## 13853 y2020
## 13854 y2020
## 13855 y2020
## 13856 y2020
## 13857 y2020
## 13858 y2020
## 13859 y2020
## 13860 y2020
## 13861 y2020
## 13862 y2020
## 13863 y2020
## 13864 y2020
## 13865 y2020
## 13866 y2020
## 13867 y2020
## 13868 y2020
## 13869 y2020
## 13870 y2020
## 13871 y2020
## 13872 y2020
## 13873 y2020
## 13874 y2020
## 13875 y2020
## 13876 y2020
## 13877 y2020
## 13878 y2020
## 13879 y2020
## 13880 y2020
## 13881 y2020
## 13882 y2020
## 13883 y2020
## 13884 y2020
## 13885 y2020
## 13886 y2020
## 13887 y2020
## 13888 y2020
## 13889 y2020
## 13890 y2020
## 13891 y2020
## 13892 y2020
## 13893 y2020
## 13894 y2020
## 13895 y2020
## 13896 y2020
## 13897 y2020
## 13898 y2020
## 13899 y2020
## 13900 y2020
## 13901 y2020
## 13902 y2020
## 13903 y2020
## 13904 y2020
## 13905 y2020
## 13906 y2020
## 13907 y2020
## 13908 y2020
## 13909 y2020
## 13910 y2020
## 13911 y2020
## 13912 y2020
## 13913 y2020
## 13914 y2020
## 13915 y2020
## 13916 y2020
## 13917 y2020
## 13918 y2020
## 13919 y2020
## 13920 y2020
## 13921 y2020
## 13922 y2020
## 13923 y2020
## 13924 y2020
## 13925 y2020
## 13926 y2020
## 13927 y2020
## 13928 y2020
## 13929 y2020
## 13930 y2020
## 13931 y2020
## 13932 y2020
## 13933 y2020
## 13934 y2020
## 13935 y2020
## 13936 y2020
## 13937 y2020
## 13938 y2020
## 13939 y2020
## 13940 y2020
## 13941 y2020
## 13942 y2020
## 13943 y2020
## 13944 y2020
## 13945 y2020
## 13946 y2020
## 13947 y2020
## 13948 y2020
## 13949 y2020
## 13950 y2020
## 13951 y2020
## 13952 y2020
## 13953 y2020
## 13954 y2020
## 13955 y2020
## 13956 y2020
## 13957 y2020
## 13958 y2020
## 13959 y2020
## 13960 y2020
## 13961 y2020
## 13962 y2020
## 13963 y2020
## 13964 y2020
## 13965 y2020
## 13966 y2020
## 13967 y2020
## 13968 y2020
## 13969 y2020
## 13970 y2020
## 13971 y2020
## 13972 y2020
## 13973 y2020
## 13974 y2020
## 13975 y2020
## 13976 y2020
## 13977 y2020
## 13978 y2020
## 13979 y2020
## 13980 y2020
## 13981 y2020
## 13982 y2020
## 13983 y2020
## 13984 y2020
## 13985 y2020
## 13986 y2020
## 13987 y2020
## 13988 y2020
## 13989 y2020
## 13990 y2020
## 13991 y2020
## 13992 y2020
## 13993 y2020
## 13994 y2020
## 13995 y2020
## 13996 y2020
## 13997 y2020
## 13998 y2020
## 13999 y2020
## 14000 y2020
## 14001 y2020
## 14002 y2020
## 14003 y2020
## 14004 y2020
## 14005 y2020
## 14006 y2020
## 14007 y2020
## 14008 y2020
## 14009 y2020
## 14010 y2020
## 14011 y2020
## 14012 y2020
## 14013 y2020
## 14014 y2020
## 14015 y2020
## 14016 y2020
## 14017 y2020
## 14018 y2020
## 14019 y2020
## 14020 y2020
## 14021 y2020
## 14022 y2020
## 14023 y2020
## 14024 y2020
## 14025 y2020
## 14026 y2020
## 14027 y2020
## 14028 y2020
## 14029 y2020
## 14030 y2020
## 14031 y2020
## 14032 y2020
## 14033 y2020
## 14034 y2020
## 14035 y2020
## 14036 y2020
## 14037 y2020
## 14038 y2020
## 14039 y2020
## 14040 y2020
## 14041 y2020
## 14042 y2020
## 14043 y2020
## 14044 y2020
## 14045 y2020
## 14046 y2020
## 14047 y2020
## 14048 y2020
## 14049 y2020
## 14050 y2020
## 14051 y2020
## 14052 y2020
## 14053 y2020
## 14054 y2020
## 14055 y2020
## 14056 y2020
## 14057 y2020
## 14058 y2020
## 14059 y2020
## 14060 y2020
## 14061 y2020
## 14062 y2020
## 14063 y2020
## 14064 y2020
## 14065 y2020
## 14066 y2020
## 14067 y2020
## 14068 y2020
## 14069 y2020
## 14070 y2020
## 14071 y2020
## 14072 y2020
## 14073 y2020
## 14074 y2020
## 14075 y2020
## 14076 y2020
## 14077 y2020
## 14078 y2020
## 14079 y2020
## 14080 y2020
## 14081 y2020
## 14082 y2020
## 14083 y2020
## 14084 y2020
## 14085 y2020
## 14086 y2020
## 14087 y2020
## 14088 y2020
## 14089 y2020
## 14090 y2020
## 14091 y2020
## 14092 y2020
## 14093 y2020
## 14094 y2020
## 14095 y2020
## 14096 y2020
## 14097 y2020
## 14098 y2020
## 14099 y2020
## 14100 y2020
## 14101 y2020
## 14102 y2020
## 14103 y2020
## 14104 y2020
## 14105 y2020
## 14106 y2020
## 14107 y2020
## 14108 y2020
## 14109 y2020
## 14110 y2020
## 14111 y2020
## 14112 y2020
## 14113 y2020
## 14114 y2020
## 14115 y2020
## 14116 y2020
## 14117 y2020
## 14118 y2020
## 14119 y2020
## 14120 y2020
## 14121 y2020
## 14122 y2020
## 14123 y2020
## 14124 y2020
## 14125 y2020
## 14126 y2020
## 14127 y2020
## 14128 y2020
## 14129 y2020
## 14130 y2020
## 14131 y2020
## 14132 y2020
## 14133 y2020
## 14134 y2020
## 14135 y2020
## 14136 y2020
## 14137 y2020
## 14138 y2020
## 14139 y2020
## 14140 y2020
## 14141 y2020
## 14142 y2020
## 14143 y2020
## 14144 y2020
## 14145 y2020
## 14146 y2020
## 14147 y2020
## 14148 y2020
## 14149 y2020
## 14150 y2020
## 14151 y2020
## 14152 y2020
## 14153 y2020
## 14154 y2020
## 14155 y2020
## 14156 y2020
## 14157 y2020
## 14158 y2020
## 14159 y2020
## 14160 y2020
## 14161 y2020
## 14162 y2020
## 14163 y2020
## 14164 y2020
## 14165 y2020
## 14166 y2020
## 14167 y2020
## 14168 y2020
## 14169 y2020
## 14170 y2020
## 14171 y2020
## 14172 y2020
## 14173 y2020
## 14174 y2020
## 14175 y2020
## 14176 y2020
## 14177 y2020
## 14178 y2020
## 14179 y2020
## 14180 y2020
## 14181 y2020
## 14182 y2020
## 14183 y2020
## 14184 y2020
## 14185 y2020
## 14186 y2020
## 14187 y2020
## 14188 y2020
## 14189 y2020
## 14190 y2020
## 14191 y2020
## 14192 y2020
## 14193 y2020
## 14194 y2020
## 14195 y2020
## 14196 y2020
## 14197 y2020
## 14198 y2020
## 14199 y2020
## 14200 y2020
## 14201 y2020
## 14202 y2020
## 14203 y2020
## 14204 y2020
## 14205 y2020
## 14206 y2020
## 14207 y2020
## 14208 y2020
## 14209 y2020
## 14210 y2020
## 14211 y2020
## 14212 y2020
## 14213 y2020
## 14214 y2020
## 14215 y2020
## 14216 y2020
## 14217 y2020
## 14218 y2020
## 14219 y2020
## 14220 y2020
## 14221 y2020
## 14222 y2020
## 14223 y2020
## 14224 y2020
## 14225 y2020
## 14226 y2020
## 14227 y2020
## 14228 y2020
## 14229 y2020
## 14230 y2020
## 14231 y2020
## 14232 y2020
## 14233 y2020
## 14234 y2020
## 14235 y2020
## 14236 y2020
## 14237 y2020
## 14238 y2020
## 14239 y2020
## 14240 y2020
## 14241 y2020
## 14242 y2020
## 14243 y2020
## 14244 y2020
## 14245 y2020
## 14246 y2020
## 14247 y2020
## 14248 y2020
## 14249 y2020
## 14250 y2020
## 14251 y2020
## 14252 y2020
## 14253 y2020
## 14254 y2020
## 14255 y2020
## 14256 y2020
## 14257 y2020
## 14258 y2020
## 14259 y2020
## 14260 y2020
## 14261 y2020
## 14262 y2020
## 14263 y2020
## 14264 y2020
## 14265 y2020
## 14266 y2020
## 14267 y2020
## 14268 y2020
## 14269 y2020
## 14270 y2020
## 14271 y2020
## 14272 y2020
## 14273 y2020
## 14274 y2020
## 14275 y2020
## 14276 y2020
## 14277 y2020
## 14278 y2020
## 14279 y2020
## 14280 y2020
## 14281 y2020
## 14282 y2020
## 14283 y2020
## 14284 y2020
## 14285 y2020
## 14286 y2020
## 14287 y2020
## 14288 y2020
## 14289 y2020
## 14290 y2020
## 14291 y2020
## 14292 y2020
## 14293 y2020
## 14294 y2020
## 14295 y2020
## 14296 y2020
## 14297 y2020
## 14298 y2020
## 14299 y2020
## 14300 y2020
## 14301 y2020
## 14302 y2020
## 14303 y2020
## 14304 y2020
## 14305 y2020
## 14306 y2020
## 14307 y2020
## 14308 y2020
## 14309 y2020
## 14310 y2020
## 14311 y2020
## 14312 y2020
## 14313 y2020
## 14314 y2020
## 14315 y2020
## 14316 y2020
## 14317 y2020
## 14318 y2020
## 14319 y2020
## 14320 y2020
## 14321 y2020
## 14322 y2020
## 14323 y2020
## 14324 y2020
## 14325 y2020
## 14326 y2020
## 14327 y2020
## 14328 y2020
## 14329 y2020
## 14330 y2020
## 14331 y2020
## 14332 y2020
## 14333 y2020
## 14334 y2020
## 14335 y2020
## 14336 y2020
## 14337 y2020
## 14338 y2020
## 14339 y2020
## 14340 y2020
## 14341 y2020
## 14342 y2020
## 14343 y2020
## 14344 y2020
## 14345 y2020
## 14346 y2020
## 14347 y2020
## 14348 y2020
## 14349 y2020
## 14350 y2020
## 14351 y2020
## 14352 y2020
## 14353 y2020
## 14354 y2020
## 14355 y2020
## 14356 y2020
## 14357 y2020
## 14358 y2020
## 14359 y2020
## 14360 y2020
## 14361 y2020
## 14362 y2020
## 14363 y2020
## 14364 y2020
## 14365 y2020
## 14366 y2020
## 14367 y2020
## 14368 y2020
## 14369 y2020
## 14370 y2020
## 14371 y2020
## 14372 y2020
## 14373 y2020
## 14374 y2020
## 14375 y2020
## 14376 y2020
## 14377 y2020
## 14378 y2020
## 14379 y2020
## 14380 y2020
## 14381 y2020
## 14382 y2020
## 14383 y2020
## 14384 y2020
## 14385 y2020
## 14386 y2020
## 14387 y2020
## 14388 y2020
## 14389 y2020
## 14390 y2020
## 14391 y2020
## 14392 y2020
## 14393 y2020
## 14394 y2020
## 14395 y2020
## 14396 y2020
## 14397 y2020
## 14398 y2020
## 14399 y2020
## 14400 y2020
## 14401 y2020
## 14402 y2020
## 14403 y2020
## 14404 y2020
## 14405 y2020
## 14406 y2020
## 14407 y2020
## 14408 y2020
## 14409 y2020
## 14410 y2020
## 14411 y2020
## 14412 y2020
## 14413 y2020
## 14414 y2020
## 14415 y2020
## 14416 y2020
## 14417 y2020
## 14418 y2020
## 14419 y2020
## 14420 y2020
## 14421 y2020
## 14422 y2020
## 14423 y2020
## 14424 y2020
## 14425 y2020
## 14426 y2020
## 14427 y2020
## 14428 y2020
## 14429 y2020
## 14430 y2020
## 14431 y2020
## 14432 y2020
## 14433 y2020
## 14434 y2020
## 14435 y2020
## 14436 y2020
## 14437 y2020
## 14438 y2020
## 14439 y2020
## 14440 y2020
## 14441 y2020
## 14442 y2020
## 14443 y2020
## 14444 y2020
## 14445 y2020
## 14446 y2020
## 14447 y2020
## 14448 y2020
## 14449 y2020
## 14450 y2020
## 14451 y2020
## 14452 y2020
## 14453 y2020
## 14454 y2020
## 14455 y2020
## 14456 y2020
## 14457 y2020
## 14458 y2020
## 14459 y2020
## 14460 y2020
## 14461 y2020
## 14462 y2020
## 14463 y2020
## 14464 y2020
## 14465 y2020
## 14466 y2020
## 14467 y2020
## 14468 y2020
## 14469 y2020
## 14470 y2020
## 14471 y2020
## 14472 y2020
## 14473 y2020
## 14474 y2020
## 14475 y2020
## 14476 y2020
## 14477 y2020
## 14478 y2020
## 14479 y2020
## 14480 y2020
## 14481 y2020
## 14482 y2020
## 14483 y2020
## 14484 y2020
## 14485 y2020
## 14486 y2020
## 14487 y2020
## 14488 y2020
## 14489 y2020
## 14490 y2020
## 14491 y2020
## 14492 y2020
## 14493 y2020
## 14494 y2020
## 14495 y2020
## 14496 y2020
## 14497 y2020
## 14498 y2020
## 14499 y2020
## 14500 y2020
## 14501 y2020
## 14502 y2020
## 14503 y2020
## 14504 y2020
## 14505 y2020
## 14506 y2020
## 14507 y2020
## 14508 y2020
## 14509 y2020
## 14510 y2020
## 14511 y2020
## 14512 y2020
## 14513 y2020
## 14514 y2020
## 14515 y2020
## 14516 y2020
## 14517 y2020
## 14518 y2020
## 14519 y2020
## 14520 y2020
## 14521 y2020
## 14522 y2020
## 14523 y2020
## 14524 y2020
## 14525 y2020
## 14526 y2020
## 14527 y2020
## 14528 y2020
## 14529 y2020
## 14530 y2020
## 14531 y2020
## 14532 y2020
## 14533 y2020
## 14534 y2020
## 14535 y2020
## 14536 y2020
## 14537 y2020
## 14538 y2020
## 14539 y2020
## 14540 y2020
## 14541 y2020
## 14542 y2020
## 14543 y2020
## 14544 y2020
## 14545 y2020
## 14546 y2020
## 14547 y2020
## 14548 y2020
## 14549 y2020
## 14550 y2020
## 14551 y2020
## 14552 y2020
## 14553 y2020
## 14554 y2020
## 14555 y2020
## 14556 y2020
## 14557 y2020
## 14558 y2020
## 14559 y2020
## 14560 y2020
## 14561 y2020
## 14562 y2020
## 14563 y2020
## 14564 y2020
## 14565 y2020
## 14566 y2020
## 14567 y2020
## 14568 y2020
## 14569 y2020
## 14570 y2020
## 14571 y2020
## 14572 y2020
## 14573 y2020
## 14574 y2020
## 14575 y2020
## 14576 y2020
## 14577 y2020
## 14578 y2020
## 14579 y2020
## 14580 y2020
## 14581 y2020
## 14582 y2020
## 14583 y2020
## 14584 y2020
## 14585 y2020
## 14586 y2020
## 14587 y2020
## 14588 y2020
## 14589 y2020
## 14590 y2020
## 14591 y2020
## 14592 y2020
## 14593 y2020
## 14594 y2020
## 14595 y2020
## 14596 y2020
## 14597 y2020
## 14598 y2020
## 14599 y2020
## 14600 y2020
## 14601 y2020
## 14602 y2020
## 14603 y2020
## 14604 y2020
## 14605 y2020
## 14606 y2020
## 14607 y2020
## 14608 y2020
## 14609 y2020
## 14610 y2020
## 14611 y2020
## 14612 y2020
## 14613 y2020
## 14614 y2020
## 14615 y2020
## 14616 y2020
## 14617 y2020
## 14618 y2020
## 14619 y2020
## 14620 y2020
## 14621 y2020
## 14622 y2020
## 14623 y2020
## 14624 y2020
## 14625 y2020
## 14626 y2020
## 14627 y2020
## 14628 y2020
## 14629 y2020
## 14630 y2020
## 14631 y2020
## 14632 y2020
## 14633 y2020
## 14634 y2020
## 14635 y2020
## 14636 y2020
## 14637 y2020
## 14638 y2020
## 14639 y2020
## 14640 y2020
## 14641 y2020
## 14642 y2020
## 14643 y2020
## 14644 y2020
## 14645 y2020
## 14646 y2020
## 14647 y2020
## 14648 y2020
## 14649 y2020
## 14650 y2020
## 14651 y2020
## 14652 y2020
## 14653 y2020
## 14654 y2020
## 14655 y2020
## 14656 y2020
## 14657 y2020
## 14658 y2020
## 14659 y2020
## 14660 y2020
## 14661 y2020
## 14662 y2020
## 14663 y2020
## 14664 y2020
## 14665 y2020
## 14666 y2020
## 14667 y2020
## 14668 y2020
## 14669 y2020
## 14670 y2020
## 14671 y2020
## 14672 y2020
## 14673 y2020
## 14674 y2020
## 14675 y2020
## 14676 y2020
## 14677 y2020
## 14678 y2020
## 14679 y2020
## 14680 y2020
## 14681 y2020
## 14682 y2020
## 14683 y2020
## 14684 y2020
## 14685 y2020
## 14686 y2020
## 14687 y2020
## 14688 y2020
## 14689 y2020
## 14690 y2020
## 14691 y2020
## 14692 y2020
## 14693 y2020
## 14694 y2020
## 14695 y2020
## 14696 y2020
## 14697 y2020
## 14698 y2020
## 14699 y2020
## 14700 y2020
## 14701 y2020
## 14702 y2020
## 14703 y2020
## 14704 y2020
## 14705 y2020
## 14706 y2020
## 14707 y2020
## 14708 y2020
## 14709 y2020
## 14710 y2020
## 14711 y2020
## 14712 y2020
## 14713 y2020
## 14714 y2020
## 14715 y2020
## 14716 y2020
## 14717 y2020
## 14718 y2020
## 14719 y2020
## 14720 y2020
## 14721 y2020
## 14722 y2020
## 14723 y2020
## 14724 y2020
## 14725 y2020
## 14726 y2020
## 14727 y2020
## 14728 y2020
## 14729 y2020
## 14730 y2020
## 14731 y2020
## 14732 y2020
## 14733 y2020
## 14734 y2020
## 14735 y2020
## 14736 y2020
## 14737 y2020
## 14738 y2020
## 14739 y2020
## 14740 y2020
## 14741 y2020
## 14742 y2020
## 14743 y2020
## 14744 y2020
## 14745 y2020
## 14746 y2020
## 14747 y2020
## 14748 y2020
## 14749 y2020
## 14750 y2020
## 14751 y2020
## 14752 y2020
## 14753 y2020
## 14754 y2020
## 14755 y2020
## 14756 y2020
## 14757 y2020
## 14758 y2020
## 14759 y2020
## 14760 y2020
## 14761 y2020
## 14762 y2020
## 14763 y2020
## 14764 y2020
## 14765 y2020
## 14766 y2020
## 14767 y2020
## 14768 y2020
## 14769 y2020
## 14770 y2020
## 14771 y2020
## 14772 y2020
## 14773 y2020
## 14774 y2020
## 14775 y2020
## 14776 y2020
## 14777 y2020
## 14778 y2020
## 14779 y2020
## 14780 y2020
## 14781 y2020
## 14782 y2020
## 14783 y2020
## 14784 y2020
## 14785 y2020
## 14786 y2020
## 14787 y2020
## 14788 y2020
## 14789 y2020
## 14790 y2020
## 14791 y2020
## 14792 y2020
## 14793 y2020
## 14794 y2020
## 14795 y2020
## 14796 y2020
## 14797 y2020
## 14798 y2020
## 14799 y2020
## 14800 y2020
## 14801 y2020
## 14802 y2020
## 14803 y2020
## 14804 y2020
## 14805 y2020
## 14806 y2020
## 14807 y2020
## 14808 y2020
## 14809 y2020
## 14810 y2020
## 14811 y2020
## 14812 y2020
## 14813 y2020
## 14814 y2020
## 14815 y2020
## 14816 y2020
## 14817 y2020
## 14818 y2020
## 14819 y2020
## 14820 y2020
## 14821 y2020
## 14822 y2020
## 14823 y2020
## 14824 y2020
## 14825 y2020
## 14826 y2020
## 14827 y2020
## 14828 y2020
## 14829 y2020
## 14830 y2020
## 14831 y2020
## 14832 y2020
## 14833 y2020
## 14834 y2020
## 14835 y2020
## 14836 y2020
## 14837 y2020
## 14838 y2020
## 14839 y2020
## 14840 y2020
## 14841 y2020
## 14842 y2020
## 14843 y2020
## 14844 y2020
## 14845 y2020
## 14846 y2020
## 14847 y2020
## 14848 y2020
## 14849 y2020
## 14850 y2020
## 14851 y2020
## 14852 y2020
## 14853 y2020
## 14854 y2020
## 14855 y2020
## 14856 y2020
## 14857 y2020
## 14858 y2020
## 14859 y2020
## 14860 y2020
## 14861 y2020
## 14862 y2020
## 14863 y2020
## 14864 y2020
## 14865 y2020
## 14866 y2020
## 14867 y2020
## 14868 y2020
## 14869 y2020
## 14870 y2020
## 14871 y2020
## 14872 y2020
## 14873 y2020
## 14874 y2020
## 14875 y2020
## 14876 y2020
## 14877 y2020
## 14878 y2020
## 14879 y2020
## 14880 y2020
## 14881 y2020
## 14882 y2020
## 14883 y2020
## 14884 y2020
## 14885 y2020
## 14886 y2020
## 14887 y2020
## 14888 y2020
## 14889 y2020
## 14890 y2020
## 14891 y2020
## 14892 y2020
## 14893 y2020
## 14894 y2020
## 14895 y2020
## 14896 y2020
## 14897 y2020
## 14898 y2020
## 14899 y2020
## 14900 y2020
## 14901 y2020
## 14902 y2020
## 14903 y2020
## 14904 y2020
## 14905 y2020
## 14906 y2020
## 14907 y2020
## 14908 y2020
## 14909 y2020
## 14910 y2020
## 14911 y2020
## 14912 y2020
## 14913 y2020
## 14914 y2020
## 14915 y2020
## 14916 y2020
## 14917 y2020
## 14918 y2020
## 14919 y2020
## 14920 y2020
## 14921 y2020
## 14922 y2020
## 14923 y2020
## 14924 y2020
## 14925 y2020
## 14926 y2020
## 14927 y2020
## 14928 y2020
## 14929 y2020
## 14930 y2020
## 14931 y2020
## 14932 y2020
## 14933 y2020
## 14934 y2020
## 14935 y2020
## 14936 y2020
## 14937 y2020
## 14938 y2020
## 14939 y2020
## 14940 y2020
## 14941 y2020
## 14942 y2020
## 14943 y2020
## 14944 y2020
## 14945 y2020
## 14946 y2020
## 14947 y2020
## 14948 y2020
## 14949 y2020
## 14950 y2020
## 14951 y2020
## 14952 y2020
## 14953 y2020
## 14954 y2020
## 14955 y2020
## 14956 y2020
## 14957 y2020
## 14958 y2020
## 14959 y2020
## 14960 y2020
## 14961 y2020
## 14962 y2020
## 14963 y2020
## 14964 y2020
## 14965 y2020
## 14966 y2020
## 14967 y2020
## 14968 y2020
## 14969 y2020
## 14970 y2020
## 14971 y2020
## 14972 y2020
## 14973 y2020
## 14974 y2020
## 14975 y2020
## 14976 y2020
## 14977 y2020
## 14978 y2020
## 14979 y2020
## 14980 y2020
## 14981 y2020
## 14982 y2020
## 14983 y2020
## 14984 y2020
## 14985 y2020
## 14986 y2020
## 14987 y2020
## 14988 y2020
## 14989 y2020
## 14990 y2020
## 14991 y2020
## 14992 y2020
## 14993 y2020
## 14994 y2020
## 14995 y2020
## 14996 y2020
## 14997 y2020
## 14998 y2020
## 14999 y2020
## 15000 y2020
## 15001 y2020
## 15002 y2020
## 15003 y2020
## 15004 y2020
## 15005 y2020
## 15006 y2020
## 15007 y2020
## 15008 y2020
## 15009 y2020
## 15010 y2020
## 15011 y2020
## 15012 y2020
## 15013 y2020
## 15014 y2020
## 15015 y2020
## 15016 y2020
## 15017 y2020
## 15018 y2020
## 15019 y2020
## 15020 y2020
## 15021 y2020
## 15022 y2020
## 15023 y2020
## 15024 y2020
## 15025 y2020
## 15026 y2020
## 15027 y2020
## 15028 y2020
## 15029 y2020
## 15030 y2020
## 15031 y2020
## 15032 y2020
## 15033 y2020
## 15034 y2020
## 15035 y2020
## 15036 y2020
## 15037 y2020
## 15038 y2020
## 15039 y2020
## 15040 y2020
## 15041 y2020
## 15042 y2020
## 15043 y2020
## 15044 y2020
## 15045 y2020
## 15046 y2020
## 15047 y2020
## 15048 y2020
## 15049 y2020
## 15050 y2020
## 15051 y2020
## 15052 y2020
## 15053 y2020
## 15054 y2020
## 15055 y2020
## 15056 y2020
## 15057 y2020
## 15058 y2020
## 15059 y2020
## 15060 y2020
## 15061 y2020
## 15062 y2020
## 15063 y2020
## 15064 y2020
## 15065 y2020
## 15066 y2020
## 15067 y2020
## 15068 y2020
## 15069 y2020
## 15070 y2020
## 15071 y2020
## 15072 y2020
## 15073 y2020
## 15074 y2020
## 15075 y2020
## 15076 y2020
## 15077 y2020
## 15078 y2020
## 15079 y2020
## 15080 y2020
## 15081 y2020
## 15082 y2020
## 15083 y2020
## 15084 y2020
## 15085 y2020
## 15086 y2020
## 15087 y2020
## 15088 y2020
## 15089 y2020
## 15090 y2020
## 15091 y2020
## 15092 y2020
## 15093 y2020
## 15094 y2020
## 15095 y2020
## 15096 y2020
## 15097 y2020
## 15098 y2020
## 15099 y2020
## 15100 y2020
## 15101 y2020
## 15102 y2020
## 15103 y2020
## 15104 y2020
## 15105 y2020
## 15106 y2020
## 15107 y2020
## 15108 y2020
## 15109 y2020
## 15110 y2020
## 15111 y2020
## 15112 y2020
## 15113 y2020
## 15114 y2020
## 15115 y2020
## 15116 y2020
## 15117 y2020
## 15118 y2020
## 15119 y2020
## 15120 y2020
## 15121 y2020
## 15122 y2020
## 15123 y2020
## 15124 y2020
## 15125 y2020
## 15126 y2020
## 15127 y2020
## 15128 y2020
## 15129 y2020
## 15130 y2020
## 15131 y2020
## 15132 y2020
## 15133 y2020
## 15134 y2020
## 15135 y2020
## 15136 y2020
## 15137 y2020
## 15138 y2020
## 15139 y2020
## 15140 y2020
## 15141 y2020
## 15142 y2020
## 15143 y2020
## 15144 y2020
## 15145 y2020
## 15146 y2020
## 15147 y2020
## 15148 y2020
## 15149 y2020
## 15150 y2020
## 15151 y2020
## 15152 y2020
## 15153 y2020
## 15154 y2020
## 15155 y2020
## 15156 y2020
## 15157 y2020
## 15158 y2020
## 15159 y2020
## 15160 y2020
## 15161 y2020
## 15162 y2020
## 15163 y2020
## 15164 y2020
## 15165 y2020
## 15166 y2020
## 15167 y2020
## 15168 y2020
## 15169 y2020
## 15170 y2020
## 15171 y2020
## 15172 y2020
## 15173 y2020
## 15174 y2020
## 15175 y2020
## 15176 y2020
## 15177 y2020
## 15178 y2020
## 15179 y2020
## 15180 y2020
## 15181 y2020
## 15182 y2020
## 15183 y2020
## 15184 y2020
## 15185 y2020
## 15186 y2020
## 15187 y2020
## 15188 y2020
## 15189 y2020
## 15190 y2020
## 15191 y2020
## 15192 y2020
## 15193 y2020
## 15194 y2020
## 15195 y2020
## 15196 y2020
## 15197 y2020
## 15198 y2020
## 15199 y2020
## 15200 y2020
## 15201 y2020
## 15202 y2020
## 15203 y2020
## 15204 y2020
## 15205 y2020
## 15206 y2020
## 15207 y2020
## 15208 y2020
## 15209 y2020
## 15210 y2020
## 15211 y2020
## 15212 y2020
## 15213 y2020
## 15214 y2020
## 15215 y2020
## 15216 y2020
## 15217 y2020
## 15218 y2020
## 15219 y2020
## 15220 y2020
## 15221 y2020
## 15222 y2020
## 15223 y2020
## 15224 y2020
## 15225 y2020
## 15226 y2020
## 15227 y2020
## 15228 y2020
## 15229 y2020
## 15230 y2020
## 15231 y2020
## 15232 y2020
## 15233 y2020
## 15234 y2020
## 15235 y2020
## 15236 y2020
## 15237 y2020
## 15238 y2020
## 15239 y2020
## 15240 y2020
## 15241 y2020
## 15242 y2020
## 15243 y2020
## 15244 y2020
## 15245 y2020
## 15246 y2020
## 15247 y2020
## 15248 y2020
## 15249 y2020
## 15250 y2020
## 15251 y2020
## 15252 y2020
## 15253 y2020
## 15254 y2020
## 15255 y2020
## 15256 y2020
## 15257 y2020
## 15258 y2020
## 15259 y2020
## 15260 y2020
## 15261 y2020
## 15262 y2020
## 15263 y2020
## 15264 y2020
## 15265 y2020
## 15266 y2020
## 15267 y2020
## 15268 y2020
## 15269 y2020
## 15270 y2020
## 15271 y2020
## 15272 y2020
## 15273 y2020
## 15274 y2020
## 15275 y2020
## 15276 y2020
## 15277 y2020
## 15278 y2020
## 15279 y2020
## 15280 y2020
## 15281 y2020
## 15282 y2020
## 15283 y2020
## 15284 y2020
## 15285 y2020
## 15286 y2020
## 15287 y2020
## 15288 y2020
## 15289 y2020
## 15290 y2020
## 15291 y2020
## 15292 y2020
## 15293 y2020
## 15294 y2020
## 15295 y2020
## 15296 y2020
## 15297 y2020
## 15298 y2020
## 15299 y2020
## 15300 y2020
## 15301 y2020
## 15302 y2020
## 15303 y2020
## 15304 y2020
## 15305 y2020
## 15306 y2020
## 15307 y2020
## 15308 y2020
## 15309 y2020
## 15310 y2020
## 15311 y2020
## 15312 y2020
## 15313 y2020
## 15314 y2020
## 15315 y2020
## 15316 y2020
## 15317 y2020
## 15318 y2020
## 15319 y2020
## 15320 y2020
## 15321 y2020
## 15322 y2020
## 15323 y2020
## 15324 y2020
## 15325 y2020
## 15326 y2020
## 15327 y2020
## 15328 y2020
## 15329 y2020
## 15330 y2020
## 15331 y2020
## 15332 y2020
## 15333 y2020
## 15334 y2020
## 15335 y2020
## 15336 y2020
## 15337 y2020
## 15338 y2020
## 15339 y2020
## 15340 y2020
## 15341 y2020
## 15342 y2020
## 15343 y2020
## 15344 y2020
## 15345 y2020
## 15346 y2020
## 15347 y2020
## 15348 y2020
## 15349 y2020
## 15350 y2020
## 15351 y2020
## 15352 y2020
## 15353 y2020
## 15354 y2020
## 15355 y2020
## 15356 y2020
## 15357 y2020
## 15358 y2020
## 15359 y2020
## 15360 y2020
## 15361 y2020
## 15362 y2020
## 15363 y2020
## 15364 y2020
## 15365 y2020
## 15366 y2020
## 15367 y2020
## 15368 y2020
## 15369 y2020
## 15370 y2020
## 15371 y2020
## 15372 y2020
## 15373 y2020
## 15374 y2020
## 15375 y2020
## 15376 y2020
## 15377 y2020
## 15378 y2020
## 15379 y2020
## 15380 y2020
## 15381 y2020
## 15382 y2020
## 15383 y2020
## 15384 y2020
## 15385 y2020
## 15386 y2020
## 15387 y2020
## 15388 y2020
## 15389 y2020
## 15390 y2020
## 15391 y2020
## 15392 y2020
## 15393 y2020
## 15394 y2020
## 15395 y2020
## 15396 y2020
## 15397 y2020
## 15398 y2020
## 15399 y2020
## 15400 y2020
## 15401 y2020
## 15402 y2020
## 15403 y2020
## 15404 y2020
## 15405 y2020
## 15406 y2020
## 15407 y2020
## 15408 y2020
## 15409 y2020
## 15410 y2020
## 15411 y2020
## 15412 y2020
## 15413 y2020
## 15414 y2020
## 15415 y2020
## 15416 y2020
## 15417 y2020
## 15418 y2020
## 15419 y2020
## 15420 y2020
## 15421 y2020
## 15422 y2020
## 15423 y2020
## 15424 y2020
## 15425 y2020
## 15426 y2020
## 15427 y2020
## 15428 y2020
## 15429 y2020
## 15430 y2020
## 15431 y2020
## 15432 y2020
## 15433 y2020
## 15434 y2020
## 15435 y2020
## 15436 y2020
## 15437 y2020
## 15438 y2020
## 15439 y2020
## 15440 y2020
## 15441 y2020
## 15442 y2020
## 15443 y2020
## 15444 y2020
## 15445 y2020
## 15446 y2020
## 15447 y2020
## 15448 y2020
## 15449 y2020
## 15450 y2020
## 15451 y2020
## 15452 y2020
## 15453 y2020
## 15454 y2020
## 15455 y2020
## 15456 y2020
## 15457 y2020
## 15458 y2020
## 15459 y2020
## 15460 y2020
## 15461 y2020
## 15462 y2020
## 15463 y2020
## 15464 y2020
## 15465 y2020
## 15466 y2020
## 15467 y2020
## 15468 y2020
## 15469 y2020
## 15470 y2020
## 15471 y2020
## 15472 y2020
## 15473 y2020
## 15474 y2020
## 15475 y2020
## 15476 y2020
## 15477 y2020
## 15478 y2020
## 15479 y2020
## 15480 y2020
## 15481 y2020
## 15482 y2020
## 15483 y2020
## 15484 y2020
## 15485 y2020
## 15486 y2020
## 15487 y2020
## 15488 y2020
## 15489 y2020
## 15490 y2020
## 15491 y2020
## 15492 y2020
## 15493 y2020
## 15494 y2020
## 15495 y2020
## 15496 y2020
## 15497 y2020
## 15498 y2020
## 15499 y2020
## 15500 y2020
## 15501 y2020
## 15502 y2020
## 15503 y2020
## 15504 y2020
## 15505 y2020
## 15506 y2020
## 15507 y2020
## 15508 y2020
## 15509 y2020
## 15510 y2020
## 15511 y2020
## 15512 y2020
## 15513 y2020
## 15514 y2020
## 15515 y2020
## 15516 y2020
## 15517 y2020
## 15518 y2020
## 15519 y2020
## 15520 y2020
## 15521 y2020
## 15522 y2020
## 15523 y2020
## 15524 y2020
## 15525 y2020
## 15526 y2020
## 15527 y2020
## 15528 y2020
## 15529 y2020
## 15530 y2020
## 15531 y2020
## 15532 y2020
## 15533 y2020
## 15534 y2020
## 15535 y2020
## 15536 y2020
## 15537 y2020
## 15538 y2020
## 15539 y2020
## 15540 y2020
## 15541 y2020
## 15542 y2020
## 15543 y2020
## 15544 y2020
## 15545 y2020
## 15546 y2020
## 15547 y2020
## 15548 y2020
## 15549 y2020
## 15550 y2020
## 15551 y2020
## 15552 y2020
## 15553 y2020
## 15554 y2020
## 15555 y2020
## 15556 y2020
## 15557 y2020
## 15558 y2020
## 15559 y2020
## 15560 y2020
## 15561 y2020
## 15562 y2020
## 15563 y2020
## 15564 y2020
## 15565 y2020
## 15566 y2020
## 15567 y2020
## 15568 y2020
## 15569 y2020
## 15570 y2020
## 15571 y2020
## 15572 y2020
## 15573 y2020
## 15574 y2020
## 15575 y2020
## 15576 y2020
## 15577 y2020
## 15578 y2020
## 15579 y2020
## 15580 y2020
## 15581 y2020
## 15582 y2020
## 15583 y2020
## 15584 y2020
## 15585 y2020
## 15586 y2020
## 15587 y2020
## 15588 y2020
## 15589 y2020
## 15590 y2020
## 15591 y2020
## 15592 y2020
## 15593 y2020
## 15594 y2020
## 15595 y2020
## 15596 y2020
## 15597 y2020
## 15598 y2020
## 15599 y2020
## 15600 y2020
## 15601 y2020
## 15602 y2020
## 15603 y2020
## 15604 y2020
## 15605 y2020
## 15606 y2020
## 15607 y2020
## 15608 y2020
## 15609 y2020
## 15610 y2020
## 15611 y2020
## 15612 y2020
## 15613 y2020
## 15614 y2020
## 15615 y2020
## 15616 y2020
## 15617 y2020
## 15618 y2020
## 15619 y2020
## 15620 y2020
## 15621 y2020
## 15622 y2020
## 15623 y2020
## 15624 y2020
## 15625 y2020
## 15626 y2020
## 15627 y2020
## 15628 y2020
## 15629 y2020
## 15630 y2020
## 15631 y2020
## 15632 y2020
## 15633 y2020
## 15634 y2020
## 15635 y2020
## 15636 y2020
## 15637 y2020
## 15638 y2020
## 15639 y2020
## 15640 y2020
## 15641 y2020
## 15642 y2020
## 15643 y2020
## 15644 y2020
## 15645 y2020
## 15646 y2020
## 15647 y2020
## 15648 y2020
## 15649 y2020
## 15650 y2020
## 15651 y2020
## 15652 y2020
## 15653 y2020
## 15654 y2020
## 15655 y2020
## 15656 y2020
## 15657 y2020
## 15658 y2020
## 15659 y2020
## 15660 y2020
## 15661 y2020
## 15662 y2020
## 15663 y2020
## 15664 y2020
## 15665 y2020
## 15666 y2020
## 15667 y2020
## 15668 y2020
## 15669 y2020
## 15670 y2020
## 15671 y2020
## 15672 y2020
## 15673 y2020
## 15674 y2020
## 15675 y2020
## 15676 y2020
## 15677 y2020
## 15678 y2020
## 15679 y2020
## 15680 y2020
## 15681 y2020
## 15682 y2020
## 15683 y2020
## 15684 y2020
## 15685 y2020
## 15686 y2020
## 15687 y2020
## 15688 y2020
## 15689 y2020
## 15690 y2020
## 15691 y2020
## 15692 y2020
## 15693 y2020
## 15694 y2020
## 15695 y2020
## 15696 y2020
## 15697 y2020
## 15698 y2020
## 15699 y2020
## 15700 y2020
## 15701 y2020
## 15702 y2020
## 15703 y2020
## 15704 y2020
## 15705 y2020
## 15706 y2020
## 15707 y2020
## 15708 y2020
## 15709 y2020
## 15710 y2020
## 15711 y2020
## 15712 y2020
## 15713 y2020
## 15714 y2020
## 15715 y2020
## 15716 y2020
## 15717 y2020
## 15718 y2020
## 15719 y2020
## 15720 y2020
## 15721 y2020
## 15722 y2020
## 15723 y2020
## 15724 y2020
## 15725 y2020
## 15726 y2020
## 15727 y2020
## 15728 y2020
## 15729 y2020
## 15730 y2020
## 15731 y2020
## 15732 y2020
## 15733 y2020
## 15734 y2020
## 15735 y2020
## 15736 y2020
## 15737 y2020
## 15738 y2020
## 15739 y2020
## 15740 y2020
## 15741 y2020
## 15742 y2020
## 15743 y2020
## 15744 y2020
## 15745 y2020
## 15746 y2020
## 15747 y2020
## 15748 y2020
## 15749 y2020
## 15750 y2020
## 15751 y2020
## 15752 y2020
## 15753 y2020
## 15754 y2020
## 15755 y2020
## 15756 y2020
## 15757 y2020
## 15758 y2020
## 15759 y2020
## 15760 y2020
## 15761 y2020
## 15762 y2020
## 15763 y2020
## 15764 y2020
## 15765 y2020
## 15766 y2020
## 15767 y2020
## 15768 y2020
## 15769 y2020
## 15770 y2020
## 15771 y2020
## 15772 y2020
## 15773 y2020
## 15774 y2020
## 15775 y2020
## 15776 y2020
## 15777 y2020
## 15778 y2020
## 15779 y2020
## 15780 y2020
## 15781 y2020
## 15782 y2020
## 15783 y2020
## 15784 y2020
## 15785 y2020
## 15786 y2020
## 15787 y2020
## 15788 y2020
## 15789 y2020
## 15790 y2020
## 15791 y2020
## 15792 y2020
## 15793 y2020
## 15794 y2020
## 15795 y2020
## 15796 y2020
## 15797 y2020
## 15798 y2020
## 15799 y2020
## 15800 y2020
## 15801 y2020
## 15802 y2020
## 15803 y2020
## 15804 y2020
## 15805 y2020
## 15806 y2020
## 15807 y2020
## 15808 y2020
## 15809 y2020
## 15810 y2020
## 15811 y2020
## 15812 y2020
## 15813 y2020
## 15814 y2020
## 15815 y2020
## 15816 y2020
## 15817 y2020
## 15818 y2020
## 15819 y2020
## 15820 y2020
## 15821 y2020
## 15822 y2020
## 15823 y2020
## 15824 y2020
## 15825 y2020
## 15826 y2020
## 15827 y2020
## 15828 y2020
## 15829 y2020
## 15830 y2020
## 15831 y2020
## 15832 y2020
## 15833 y2020
## 15834 y2020
## 15835 y2020
## 15836 y2020
## 15837 y2020
## 15838 y2020
## 15839 y2020
## 15840 y2020
## 15841 y2020
## 15842 y2020
## 15843 y2020
## 15844 y2020
## 15845 y2020
## 15846 y2020
## 15847 y2020
## 15848 y2020
## 15849 y2020
## 15850 y2020
## 15851 y2020
## 15852 y2020
## 15853 y2020
## 15854 y2020
## 15855 y2020
## 15856 y2020
## 15857 y2020
## 15858 y2020
## 15859 y2020
## 15860 y2020
## 15861 y2020
## 15862 y2020
## 15863 y2020
## 15864 y2020
## 15865 y2020
## 15866 y2020
## 15867 y2020
## 15868 y2020
## 15869 y2020
## 15870 y2020
## 15871 y2020
## 15872 y2020
## 15873 y2020
## 15874 y2020
## 15875 y2020
## 15876 y2020
## 15877 y2020
## 15878 y2020
## 15879 y2020
## 15880 y2020
## 15881 y2020
## 15882 y2020
## 15883 y2020
## 15884 y2020
## 15885 y2020
## 15886 y2020
## 15887 y2020
## 15888 y2020
## 15889 y2020
## 15890 y2020
## 15891 y2020
## 15892 y2020
## 15893 y2020
## 15894 y2020
## 15895 y2020
## 15896 y2020
## 15897 y2020
## 15898 y2020
## 15899 y2020
## 15900 y2020
## 15901 y2020
## 15902 y2020
## 15903 y2020
## 15904 y2020
## 15905 y2020
## 15906 y2020
## 15907 y2020
## 15908 y2020
## 15909 y2020
## 15910 y2020
## 15911 y2020
## 15912 y2020
## 15913 y2020
## 15914 y2020
## 15915 y2020
## 15916 y2020
## 15917 y2020
## 15918 y2020
## 15919 y2020
## 15920 y2020
## 15921 y2020
## 15922 y2020
## 15923 y2020
## 15924 y2020
## 15925 y2020
## 15926 y2020
## 15927 y2020
## 15928 y2020
## 15929 y2020
## 15930 y2020
## 15931 y2020
## 15932 y2020
## 15933 y2020
## 15934 y2020
## 15935 y2020
## 15936 y2020
## 15937 y2020
## 15938 y2020
## 15939 y2020
## 15940 y2020
## 15941 y2020
## 15942 y2020
## 15943 y2020
## 15944 y2020
## 15945 y2020
## 15946 y2020
## 15947 y2020
## 15948 y2020
## 15949 y2020
## 15950 y2020
## 15951 y2020
## 15952 y2020
## 15953 y2020
## 15954 y2020
## 15955 y2020
## 15956 y2020
## 15957 y2020
## 15958 y2020
## 15959 y2020
## 15960 y2020
## 15961 y2020
## 15962 y2020
## 15963 y2020
## 15964 y2020
## 15965 y2020
## 15966 y2020
## 15967 y2020
## 15968 y2020
## 15969 y2020
## 15970 y2020
## 15971 y2020
## 15972 y2020
## 15973 y2020
## 15974 y2020
## 15975 y2020
## 15976 y2020
## 15977 y2020
## 15978 y2020
## 15979 y2020
## 15980 y2020
## 15981 y2020
## 15982 y2020
## 15983 y2020
## 15984 y2020
## 15985 y2020
## 15986 y2020
## 15987 y2020
## 15988 y2020
## 15989 y2020
## 15990 y2020
## 15991 y2020
## 15992 y2020
## 15993 y2020
## 15994 y2020
## 15995 y2020
## 15996 y2020
## 15997 y2020
## 15998 y2020
## 15999 y2020
## 16000 y2020
## 16001 y2020
## 16002 y2020
## 16003 y2020
## 16004 y2020
## 16005 y2020
## 16006 y2020
## 16007 y2020
## 16008 y2020
## 16009 y2020
## 16010 y2020
## 16011 y2020
## 16012 y2020
## 16013 y2020
## 16014 y2020
## 16015 y2020
## 16016 y2020
## 16017 y2020
## 16018 y2020
## 16019 y2020
## 16020 y2020
## 16021 y2020
## 16022 y2020
## 16023 y2020
## 16024 y2020
## 16025 y2020
## 16026 y2020
## 16027 y2020
## 16028 y2020
## 16029 y2020
## 16030 y2020
## 16031 y2020
## 16032 y2020
## 16033 y2020
## 16034 y2020
## 16035 y2020
## 16036 y2020
## 16037 y2020
## 16038 y2020
## 16039 y2020
## 16040 y2020
## 16041 y2020
## 16042 y2020
## 16043 y2020
## 16044 y2020
## 16045 y2020
## 16046 y2020
## 16047 y2020
## 16048 y2020
## 16049 y2020
## 16050 y2020
## 16051 y2020
## 16052 y2020
## 16053 y2020
## 16054 y2020
## 16055 y2020
## 16056 y2020
## 16057 y2020
## 16058 y2020
## 16059 y2020
## 16060 y2020
## 16061 y2020
## 16062 y2020
## 16063 y2020
## 16064 y2020
## 16065 y2020
## 16066 y2020
## 16067 y2020
## 16068 y2020
## 16069 y2020
## 16070 y2020
## 16071 y2020
## 16072 y2020
## 16073 y2020
## 16074 y2020
## 16075 y2020
## 16076 y2020
## 16077 y2020
## 16078 y2020
## 16079 y2020
## 16080 y2020
## 16081 y2020
## 16082 y2020
## 16083 y2020
## 16084 y2020
## 16085 y2020
## 16086 y2020
## 16087 y2020
## 16088 y2020
## 16089 y2020
## 16090 y2020
## 16091 y2020
## 16092 y2020
## 16093 y2020
## 16094 y2020
## 16095 y2020
## 16096 y2020
## 16097 y2020
## 16098 y2020
## 16099 y2020
## 16100 y2020
## 16101 y2020
## 16102 y2020
## 16103 y2020
## 16104 y2020
## 16105 y2020
## 16106 y2020
## 16107 y2020
## 16108 y2020
## 16109 y2020
## 16110 y2020
## 16111 y2020
## 16112 y2020
## 16113 y2020
## 16114 y2020
## 16115 y2020
## 16116 y2020
## 16117 y2020
## 16118 y2020
## 16119 y2020
## 16120 y2020
## 16121 y2020
## 16122 y2020
## 16123 y2020
## 16124 y2020
## 16125 y2020
## 16126 y2020
## 16127 y2020
## 16128 y2020
## 16129 y2020
## 16130 y2020
## 16131 y2020
## 16132 y2020
## 16133 y2020
## 16134 y2020
## 16135 y2020
## 16136 y2020
## 16137 y2020
## 16138 y2020
## 16139 y2020
## 16140 y2020
## 16141 y2020
## 16142 y2020
## 16143 y2020
## 16144 y2020
## 16145 y2020
## 16146 y2020
## 16147 y2020
## 16148 y2020
## 16149 y2020
## 16150 y2020
## 16151 y2020
## 16152 y2020
## 16153 y2020
## 16154 y2020
## 16155 y2020
## 16156 y2020
## 16157 y2020
## 16158 y2020
## 16159 y2020
## 16160 y2020
## 16161 y2020
## 16162 y2020
## 16163 y2020
## 16164 y2020
## 16165 y2020
## 16166 y2020
## 16167 y2020
## 16168 y2020
## 16169 y2020
## 16170 y2020
## 16171 y2020
## 16172 y2020
## 16173 y2020
## 16174 y2020
## 16175 y2020
## 16176 y2020
## 16177 y2020
## 16178 y2020
## 16179 y2020
## 16180 y2020
## 16181 y2020
## 16182 y2020
## 16183 y2020
## 16184 y2020
## 16185 y2020
## 16186 y2020
## 16187 y2020
## 16188 y2020
## 16189 y2020
## 16190 y2020
## 16191 y2020
## 16192 y2020
## 16193 y2020
## 16194 y2020
## 16195 y2020
## 16196 y2020
## 16197 y2020
## 16198 y2020
## 16199 y2020
## 16200 y2020
## 16201 y2020
## 16202 y2020
## 16203 y2020
## 16204 y2020
## 16205 y2020
## 16206 y2020
## 16207 y2020
## 16208 y2020
## 16209 y2020
## 16210 y2020
## 16211 y2020
## 16212 y2020
## 16213 y2020
## 16214 y2020
## 16215 y2020
## 16216 y2020
## 16217 y2020
## 16218 y2020
## 16219 y2020
## 16220 y2020
## 16221 y2020
## 16222 y2020
## 16223 y2020
## 16224 y2020
## 16225 y2020
## 16226 y2020
## 16227 y2020
## 16228 y2020
## 16229 y2020
## 16230 y2020
## 16231 y2020
## 16232 y2020
## 16233 y2020
## 16234 y2020
## 16235 y2020
## 16236 y2020
## 16237 y2020
## 16238 y2020
## 16239 y2020
## 16240 y2020
## 16241 y2020
## 16242 y2020
## 16243 y2020
## 16244 y2020
## 16245 y2020
## 16246 y2020
## 16247 y2020
## 16248 y2020
## 16249 y2020
## 16250 y2020
## 16251 y2020
## 16252 y2020
## 16253 y2020
## 16254 y2020
## 16255 y2020
## 16256 y2020
## 16257 y2020
## 16258 y2020
## 16259 y2020
## 16260 y2020
## 16261 y2020
## 16262 y2020
## 16263 y2020
## 16264 y2020
## 16265 y2020
## 16266 y2020
## 16267 y2020
## 16268 y2020
## 16269 y2020
## 16270 y2020
## 16271 y2020
## 16272 y2020
## 16273 y2020
## 16274 y2020
## 16275 y2020
## 16276 y2020
## 16277 y2020
## 16278 y2020
## 16279 y2020
## 16280 y2020
## 16281 y2020
## 16282 y2020
## 16283 y2020
## 16284 y2020
## 16285 y2020
## 16286 y2020
## 16287 y2020
## 16288 y2020
## 16289 y2020
## 16290 y2020
## 16291 y2020
## 16292 y2020
## 16293 y2020
## 16294 y2020
## 16295 y2020
## 16296 y2020
## 16297 y2020
## 16298 y2020
## 16299 y2020
## 16300 y2020
## 16301 y2020
## 16302 y2020
## 16303 y2020
## 16304 y2020
## 16305 y2020
## 16306 y2020
## 16307 y2020
## 16308 y2020
## 16309 y2020
## 16310 y2020
## 16311 y2020
## 16312 y2020
## 16313 y2020
## 16314 y2020
## 16315 y2020
## 16316 y2020
## 16317 y2020
## 16318 y2020
## 16319 y2020
## 16320 y2020
## 16321 y2020
## 16322 y2020
## 16323 y2020
## 16324 y2020
## 16325 y2020
## 16326 y2020
## 16327 y2020
## 16328 y2020
## 16329 y2020
## 16330 y2020
## 16331 y2020
## 16332 y2020
## 16333 y2020
## 16334 y2020
## 16335 y2020
## 16336 y2020
## 16337 y2020
## 16338 y2020
## 16339 y2020
## 16340 y2020
## 16341 y2020
## 16342 y2020
## 16343 y2020
## 16344 y2020
## 16345 y2020
## 16346 y2020
## 16347 y2020
## 16348 y2020
## 16349 y2020
## 16350 y2020
## 16351 y2020
## 16352 y2020
## 16353 y2020
## 16354 y2020
## 16355 y2020
## 16356 y2020
## 16357 y2020
## 16358 y2020
## 16359 y2020
## 16360 y2020
## 16361 y2020
## 16362 y2020
## 16363 y2020
## 16364 y2020
## 16365 y2020
## 16366 y2020
## 16367 y2020
## 16368 y2020
## 16369 y2020
## 16370 y2020
## 16371 y2020
## 16372 y2020
## 16373 y2020
## 16374 y2020
## 16375 y2020
## 16376 y2020
## 16377 y2020
## 16378 y2020
## 16379 y2020
## 16380 y2020
## 16381 y2020
## 16382 y2020
## 16383 y2020
## 16384 y2020
## 16385 y2020
## 16386 y2020
## 16387 y2020
## 16388 y2020
## 16389 y2020
## 16390 y2020
## 16391 y2020
## 16392 y2020
## 16393 y2020
## 16394 y2020
## 16395 y2020
## 16396 y2020
## 16397 y2020
## 16398 y2020
## 16399 y2020
## 16400 y2020
## 16401 y2020
## 16402 y2020
## 16403 y2020
## 16404 y2020
## 16405 y2020
## 16406 y2020
## 16407 y2020
## 16408 y2020
## 16409 y2020
## 16410 y2020
## 16411 y2020
## 16412 y2020
## 16413 y2020
## 16414 y2020
## 16415 y2020
## 16416 y2020
## 16417 y2020
## 16418 y2020
## 16419 y2020
## 16420 y2020
## 16421 y2020
## 16422 y2020
## 16423 y2020
## 16424 y2020
## 16425 y2020
## 16426 y2020
## 16427 y2020
## 16428 y2020
## 16429 y2020
## 16430 y2020
## 16431 y2020
## 16432 y2020
## 16433 y2020
## 16434 y2020
## 16435 y2020
## 16436 y2020
## 16437 y2020
## 16438 y2020
## 16439 y2020
## 16440 y2020
## 16441 y2020
## 16442 y2020
## 16443 y2020
## 16444 y2020
## 16445 y2020
## 16446 y2020
## 16447 y2020
## 16448 y2020
## 16449 y2020
## 16450 y2020
## 16451 y2020
## 16452 y2020
## 16453 y2020
## 16454 y2020
## 16455 y2020
## 16456 y2020
## 16457 y2020
## 16458 y2020
## 16459 y2020
## 16460 y2020
## 16461 y2020
## 16462 y2020
## 16463 y2020
## 16464 y2020
## 16465 y2020
## 16466 y2020
## 16467 y2020
## 16468 y2020
## 16469 y2020
## 16470 y2020
## 16471 y2020
## 16472 y2020
## 16473 y2020
## 16474 y2020
## 16475 y2020
## 16476 y2020
## 16477 y2020
## 16478 y2020
## 16479 y2020
## 16480 y2020
## 16481 y2020
## 16482 y2020
## 16483 y2020
## 16484 y2020
## 16485 y2020
## 16486 y2020
## 16487 y2020
## 16488 y2020
## 16489 y2020
## 16490 y2020
## 16491 y2020
## 16492 y2020
## 16493 y2020
## 16494 y2020
## 16495 y2020
## 16496 y2020
## 16497 y2020
## 16498 y2020
## 16499 y2020
## 16500 y2020
## 16501 y2020
## 16502 y2020
## 16503 y2020
## 16504 y2020
## 16505 y2020
## 16506 y2020
## 16507 y2020
## 16508 y2020
## 16509 y2020
## 16510 y2020
## 16511 y2020
## 16512 y2020
## 16513 y2020
## 16514 y2020
## 16515 y2020
## 16516 y2020
## 16517 y2020
## 16518 y2020
## 16519 y2020
## 16520 y2020
## 16521 y2020
## 16522 y2020
## 16523 y2020
## 16524 y2020
## 16525 y2020
## 16526 y2020
## 16527 y2020
## 16528 y2020
## 16529 y2020
## 16530 y2020
## 16531 y2020
## 16532 y2020
## 16533 y2020
## 16534 y2020
## 16535 y2020
## 16536 y2020
## 16537 y2020
## 16538 y2020
## 16539 y2020
## 16540 y2020
## 16541 y2020
## 16542 y2020
## 16543 y2020
## 16544 y2020
## 16545 y2020
## 16546 y2020
## 16547 y2020
## 16548 y2020
## 16549 y2020
## 16550 y2020
## 16551 y2020
## 16552 y2020
## 16553 y2020
## 16554 y2020
## 16555 y2020
## 16556 y2020
## 16557 y2020
## 16558 y2020
## 16559 y2020
## 16560 y2020
## 16561 y2020
## 16562 y2020
## 16563 y2020
## 16564 y2020
## 16565 y2020
## 16566 y2020
## 16567 y2020
## 16568 y2020
## 16569 y2020
## 16570 y2020
## 16571 y2020
## 16572 y2020
## 16573 y2020
## 16574 y2020
## 16575 y2020
## 16576 y2020
## 16577 y2020
## 16578 y2020
## 16579 y2020
## 16580 y2020
## 16581 y2020
## 16582 y2020
## 16583 y2020
## 16584 y2020
## 16585 y2020
## 16586 y2020
## 16587 y2020
## 16588 y2020
## 16589 y2020
## 16590 y2020
## 16591 y2020
## 16592 y2020
## 16593 y2020
## 16594 y2020
## 16595 y2020
## 16596 y2020
## 16597 y2020
## 16598 y2020
## 16599 y2020
## 16600 y2020
## 16601 y2020
## 16602 y2020
## 16603 y2020
## 16604 y2020
## 16605 y2020
## 16606 y2020
## 16607 y2020
## 16608 y2020
## 16609 y2020
## 16610 y2020
## 16611 y2020
## 16612 y2020
## 16613 y2020
## 16614 y2020
## 16615 y2020
## 16616 y2020
## 16617 y2020
## 16618 y2020
## 16619 y2020
## 16620 y2020
## 16621 y2020
## 16622 y2020
## 16623 y2020
## 16624 y2020
## 16625 y2020
## 16626 y2020
## 16627 y2020
## 16628 y2020
## 16629 y2020
## 16630 y2020
## 16631 y2020
## 16632 y2020
## 16633 y2020
## 16634 y2020
## 16635 y2020
## 16636 y2020
## 16637 y2020
## 16638 y2020
## 16639 y2020
## 16640 y2020
## 16641 y2020
## 16642 y2020
## 16643 y2020
## 16644 y2020
## 16645 y2020
## 16646 y2020
## 16647 y2020
## 16648 y2020
## 16649 y2020
## 16650 y2020
## 16651 y2020
## 16652 y2020
## 16653 y2020
## 16654 y2020
## 16655 y2020
## 16656 y2020
## 16657 y2020
## 16658 y2020
## 16659 y2020
## 16660 y2020
## 16661 y2020
## 16662 y2020
## 16663 y2020
## 16664 y2020
## 16665 y2020
## 16666 y2020
## 16667 y2020
## 16668 y2020
## 16669 y2020
## 16670 y2020
## 16671 y2020
## 16672 y2020
## 16673 y2020
## 16674 y2020
## 16675 y2020
## 16676 y2020
## 16677 y2020
## 16678 y2020
## 16679 y2020
## 16680 y2020
## 16681 y2020
## 16682 y2020
## 16683 y2020
## 16684 y2020
## 16685 y2020
## 16686 y2020
## 16687 y2020
## 16688 y2020
## 16689 y2020
## 16690 y2020
## 16691 y2020
## 16692 y2020
## 16693 y2020
## 16694 y2020
## 16695 y2020
## 16696 y2020
## 16697 y2020
## 16698 y2020
## 16699 y2020
## 16700 y2020
## 16701 y2020
## 16702 y2020
## 16703 y2020
## 16704 y2020
## 16705 y2020
## 16706 y2020
## 16707 y2020
## 16708 y2020
## 16709 y2020
## 16710 y2020
## 16711 y2020
## 16712 y2020
## 16713 y2020
## 16714 y2020
## 16715 y2020
## 16716 y2020
## 16717 y2020
## 16718 y2020
## 16719 y2020
## 16720 y2020
## 16721 y2020
## 16722 y2020
## 16723 y2020
## 16724 y2020
## 16725 y2020
## 16726 y2020
## 16727 y2020
## 16728 y2020
## 16729 y2020
## 16730 y2020
## 16731 y2020
## 16732 y2020
## 16733 y2020
## 16734 y2020
## 16735 y2020
## 16736 y2020
## 16737 y2020
## 16738 y2020
## 16739 y2020
## 16740 y2020
## 16741 y2020
## 16742 y2020
## 16743 y2020
## 16744 y2020
## 16745 y2020
## 16746 y2020
## 16747 y2020
## 16748 y2020
## 16749 y2020
## 16750 y2020
## 16751 y2020
## 16752 y2020
## 16753 y2020
## 16754 y2020
## 16755 y2020
## 16756 y2020
## 16757 y2020
## 16758 y2020
## 16759 y2020
## 16760 y2020
## 16761 y2020
## 16762 y2020
## 16763 y2020
## 16764 y2020
## 16765 y2020
## 16766 y2020
## 16767 y2020
## 16768 y2020
## 16769 y2020
## 16770 y2020
## 16771 y2020
## 16772 y2020
## 16773 y2020
## 16774 y2020
## 16775 y2020
## 16776 y2020
## 16777 y2020
## 16778 y2020
## 16779 y2020
## 16780 y2020
## 16781 y2020
## 16782 y2020
## 16783 y2020
## 16784 y2020
## 16785 y2020
## 16786 y2020
## 16787 y2020
## 16788 y2020
## 16789 y2020
## 16790 y2020
## 16791 y2020
## 16792 y2020
## 16793 y2020
## 16794 y2020
## 16795 y2020
## 16796 y2020
## 16797 y2020
## 16798 y2020
## 16799 y2020
## 16800 y2020
## 16801 y2020
## 16802 y2020
## 16803 y2020
## 16804 y2020
## 16805 y2020
## 16806 y2020
## 16807 y2020
## 16808 y2020
## 16809 y2020
## 16810 y2020
## 16811 y2020
## 16812 y2020
## 16813 y2020
## 16814 y2020
## 16815 y2020
## 16816 y2020
## 16817 y2020
## 16818 y2020
## 16819 y2020
## 16820 y2020
## 16821 y2020
## 16822 y2020
## 16823 y2020
## 16824 y2020
## 16825 y2020
## 16826 y2020
## 16827 y2020
## 16828 y2020
## 16829 y2020
## 16830 y2020
## 16831 y2020
## 16832 y2020
## 16833 y2020
## 16834 y2020
## 16835 y2020
## 16836 y2020
## 16837 y2020
## 16838 y2020
## 16839 y2020
## 16840 y2020
## 16841 y2020
## 16842 y2020
## 16843 y2020
## 16844 y2020
## 16845 y2020
## 16846 y2020
## 16847 y2020
## 16848 y2020
## 16849 y2020
## 16850 y2020
## 16851 y2020
## 16852 y2020
## 16853 y2020
## 16854 y2020
## 16855 y2020
## 16856 y2020
## 16857 y2020
## 16858 y2020
## 16859 y2020
## 16860 y2020
## 16861 y2020
## 16862 y2020
## 16863 y2020
## 16864 y2020
## 16865 y2020
## 16866 y2020
## 16867 y2020
## 16868 y2020
## 16869 y2020
## 16870 y2020
## 16871 y2020
## 16872 y2020
## 16873 y2020
## 16874 y2020
## 16875 y2020
## 16876 y2020
## 16877 y2020
## 16878 y2020
## 16879 y2020
## 16880 y2020
## 16881 y2020
## 16882 y2020
## 16883 y2020
## 16884 y2020
## 16885 y2020
## 16886 y2020
## 16887 y2020
## 16888 y2020
## 16889 y2020
## 16890 y2020
## 16891 y2020
## 16892 y2020
## 16893 y2020
## 16894 y2020
## 16895 y2020
## 16896 y2020
## 16897 y2020
## 16898 y2020
## 16899 y2020
## 16900 y2020
## 16901 y2020
## 16902 y2020
## 16903 y2020
## 16904 y2020
## 16905 y2020
## 16906 y2020
## 16907 y2020
## 16908 y2020
## 16909 y2020
## 16910 y2020
## 16911 y2020
## 16912 y2020
## 16913 y2020
## 16914 y2020
## 16915 y2020
## 16916 y2020
## 16917 y2020
## 16918 y2020
## 16919 y2020
## 16920 y2020
## 16921 y2020
## 16922 y2020
## 16923 y2020
## 16924 y2020
## 16925 y2020
## 16926 y2020
## 16927 y2020
## 16928 y2020
## 16929 y2020
## 16930 y2020
## 16931 y2020
## 16932 y2020
## 16933 y2020
## 16934 y2020
## 16935 y2020
## 16936 y2020
## 16937 y2020
## 16938 y2020
## 16939 y2020
## 16940 y2020
## 16941 y2020
## 16942 y2020
## 16943 y2020
## 16944 y2020
## 16945 y2020
## 16946 y2020
## 16947 y2020
## 16948 y2020
## 16949 y2020
## 16950 y2020
## 16951 y2020
## 16952 y2020
## 16953 y2020
## 16954 y2020
## 16955 y2020
## 16956 y2020
## 16957 y2020
## 16958 y2020
## 16959 y2020
## 16960 y2020
## 16961 y2020
## 16962 y2020
## 16963 y2020
## 16964 y2020
## 16965 y2020
## 16966 y2020
## 16967 y2020
## 16968 y2020
## 16969 y2020
## 16970 y2020
## 16971 y2020
## 16972 y2020
## 16973 y2020
## 16974 y2020
## 16975 y2020
## 16976 y2020
## 16977 y2020
## 16978 y2020
## 16979 y2020
## 16980 y2020
## 16981 y2020
## 16982 y2020
## 16983 y2020
## 16984 y2020
## 16985 y2020
## 16986 y2020
## 16987 y2020
## 16988 y2020
## 16989 y2020
## 16990 y2020
## 16991 y2020
## 16992 y2020
## 16993 y2020
## 16994 y2020
## 16995 y2020
## 16996 y2020
## 16997 y2020
## 16998 y2020
## 16999 y2020
## 17000 y2020
## 17001 y2020
## 17002 y2020
## 17003 y2020
## 17004 y2020
## 17005 y2020
## 17006 y2020
## 17007 y2020
## 17008 y2020
## 17009 y2020
## 17010 y2020
## 17011 y2020
## 17012 y2020
## 17013 y2020
## 17014 y2020
## 17015 y2020
## 17016 y2020
## 17017 y2020
## 17018 y2020
## 17019 y2020
## 17020 y2020
## 17021 y2020
## 17022 y2020
## 17023 y2020
## 17024 y2020
## 17025 y2020
## 17026 y2020
## 17027 y2020
## 17028 y2020
## 17029 y2020
## 17030 y2020
## 17031 y2020
## 17032 y2020
## 17033 y2020
## 17034 y2020
## 17035 y2020
## 17036 y2020
## 17037 y2020
## 17038 y2020
## 17039 y2020
## 17040 y2020
## 17041 y2020
## 17042 y2020
## 17043 y2020
## 17044 y2020
## 17045 y2020
## 17046 y2020
## 17047 y2020
## 17048 y2020
## 17049 y2020
## 17050 y2020
## 17051 y2020
## 17052 y2020
## 17053 y2020
## 17054 y2020
## 17055 y2020
## 17056 y2020
## 17057 y2020
## 17058 y2020
## 17059 y2020
## 17060 y2020
## 17061 y2020
## 17062 y2020
## 17063 y2020
## 17064 y2020
## 17065 y2020
## 17066 y2020
## 17067 y2020
## 17068 y2020
## 17069 y2020
## 17070 y2020
## 17071 y2020
## 17072 y2020
## 17073 y2020
## 17074 y2020
## 17075 y2020
## 17076 y2020
## 17077 y2020
## 17078 y2020
## 17079 y2020
## 17080 y2020
## 17081 y2020
## 17082 y2020
## 17083 y2020
## 17084 y2020
## 17085 y2020
## 17086 y2020
## 17087 y2020
## 17088 y2020
## 17089 y2020
## 17090 y2020
## 17091 y2020
## 17092 y2020
## 17093 y2020
## 17094 y2020
## 17095 y2020
## 17096 y2020
## 17097 y2020
## 17098 y2020
## 17099 y2020
## 17100 y2020
## 17101 y2020
## 17102 y2020
## 17103 y2020
## 17104 y2020
## 17105 y2020
## 17106 y2020
## 17107 y2020
## 17108 y2020
## 17109 y2020
## 17110 y2020
## 17111 y2020
## 17112 y2020
## 17113 y2020
## 17114 y2020
## 17115 y2020
## 17116 y2020
## 17117 y2020
## 17118 y2020
## 17119 y2020
## 17120 y2020
## 17121 y2020
## 17122 y2020
## 17123 y2020
## 17124 y2020
## 17125 y2020
## 17126 y2020
## 17127 y2020
## 17128 y2020
## 17129 y2020
## 17130 y2020
## 17131 y2020
## 17132 y2020
## 17133 y2020
## 17134 y2020
## 17135 y2020
## 17136 y2020
## 17137 y2020
## 17138 y2020
## 17139 y2020
## 17140 y2020
## 17141 y2020
## 17142 y2020
## 17143 y2020
## 17144 y2020
## 17145 y2020
## 17146 y2020
## 17147 y2020
## 17148 y2020
## 17149 y2020
## 17150 y2020
## 17151 y2020
## 17152 y2020
## 17153 y2020
## 17154 y2020
## 17155 y2020
## 17156 y2020
## 17157 y2020
## 17158 y2020
## 17159 y2020
## 17160 y2020
## 17161 y2020
## 17162 y2020
## 17163 y2020
## 17164 y2020
## 17165 y2020
## 17166 y2020
## 17167 y2020
## 17168 y2020
## 17169 y2020
## 17170 y2020
## 17171 y2020
## 17172 y2020
## 17173 y2020
## 17174 y2020
## 17175 y2020
## 17176 y2020
## 17177 y2020
## 17178 y2020
## 17179 y2020
## 17180 y2020
## 17181 y2020
## 17182 y2020
## 17183 y2020
## 17184 y2020
## 17185 y2020
## 17186 y2020
## 17187 y2020
## 17188 y2020
## 17189 y2020
## 17190 y2020
## 17191 y2020
## 17192 y2020
## 17193 y2020
## 17194 y2020
## 17195 y2020
## 17196 y2020
## 17197 y2020
## 17198 y2020
## 17199 y2020
## 17200 y2020
## 17201 y2020
## 17202 y2020
## 17203 y2020
## 17204 y2020
## 17205 y2020
## 17206 y2020
## 17207 y2020
## 17208 y2020
## 17209 y2020
## 17210 y2020
## 17211 y2020
## 17212 y2020
## 17213 y2020
## 17214 y2020
## 17215 y2020
## 17216 y2020
## 17217 y2020
## 17218 y2020
## 17219 y2020
## 17220 y2020
## 17221 y2020
## 17222 y2020
## 17223 y2020
## 17224 y2020
## 17225 y2020
## 17226 y2020
## 17227 y2020
## 17228 y2020
## 17229 y2020
## 17230 y2020
## 17231 y2020
## 17232 y2020
## 17233 y2020
## 17234 y2020
## 17235 y2020
## 17236 y2020
## 17237 y2020
## 17238 y2020
## 17239 y2020
## 17240 y2020
## 17241 y2020
## 17242 y2020
## 17243 y2020
## 17244 y2020
## 17245 y2020
## 17246 y2020
## 17247 y2020
## 17248 y2020
## 17249 y2020
## 17250 y2020
## 17251 y2020
## 17252 y2020
## 17253 y2020
## 17254 y2020
## 17255 y2020
## 17256 y2020
## 17257 y2020
## 17258 y2020
## 17259 y2020
## 17260 y2020
## 17261 y2020
## 17262 y2020
## 17263 y2020
## 17264 y2020
## 17265 y2020
## 17266 y2020
## 17267 y2020
## 17268 y2020
## 17269 y2020
## 17270 y2020
## 17271 y2020
## 17272 y2020
## 17273 y2020
## 17274 y2020
## 17275 y2020
## 17276 y2020
## 17277 y2020
## 17278 y2020
## 17279 y2020
## 17280 y2020
## 17281 y2020
## 17282 y2020
## 17283 y2020
## 17284 y2020
## 17285 y2020
## 17286 y2020
## 17287 y2020
## 17288 y2020
## 17289 y2020
## 17290 y2020
## 17291 y2020
## 17292 y2020
## 17293 y2020
## 17294 y2020
## 17295 y2020
## 17296 y2020
## 17297 y2020
## 17298 y2020
## 17299 y2020
## 17300 y2020
## 17301 y2020
## 17302 y2020
## 17303 y2020
## 17304 y2020
## 17305 y2020
## 17306 y2020
## 17307 y2020
## 17308 y2020
## 17309 y2020
## 17310 y2020
## 17311 y2020
## 17312 y2020
## 17313 y2020
## 17314 y2020
## 17315 y2020
## 17316 y2020
## 17317 y2020
## 17318 y2020
## 17319 y2020
## 17320 y2020
## 17321 y2020
## 17322 y2020
## 17323 y2020
## 17324 y2020
## 17325 y2020
## 17326 y2020
## 17327 y2020
## 17328 y2020
## 17329 y2020
## 17330 y2020
## 17331 y2020
## 17332 y2020
## 17333 y2020
## 17334 y2020
## 17335 y2020
## 17336 y2020
## 17337 y2020
## 17338 y2020
## 17339 y2020
## 17340 y2020
## 17341 y2020
## 17342 y2020
## 17343 y2020
## 17344 y2020
## 17345 y2020
## 17346 y2020
## 17347 y2020
## 17348 y2020
## 17349 y2020
## 17350 y2020
## 17351 y2020
## 17352 y2020
## 17353 y2020
## 17354 y2020
## 17355 y2020
## 17356 y2020
## 17357 y2020
## 17358 y2020
## 17359 y2020
## 17360 y2020
## 17361 y2020
## 17362 y2020
## 17363 y2020
## 17364 y2020
## 17365 y2020
## 17366 y2020
## 17367 y2020
## 17368 y2020
## 17369 y2020
## 17370 y2020
## 17371 y2020
## 17372 y2020
## 17373 y2020
## 17374 y2020
## 17375 y2020
## 17376 y2020
## 17377 y2020
## 17378 y2020
## 17379 y2020
## 17380 y2020
## 17381 y2020
## 17382 y2020
## 17383 y2020
## 17384 y2020
## 17385 y2020
## 17386 y2020
## 17387 y2020
## 17388 y2020
## 17389 y2020
## 17390 y2020
## 17391 y2020
## 17392 y2020
## 17393 y2020
## 17394 y2020
## 17395 y2020
## 17396 y2020
## 17397 y2020
## 17398 y2020
## 17399 y2020
## 17400 y2020
## 17401 y2020
## 17402 y2020
## 17403 y2020
## 17404 y2020
## 17405 y2020
## 17406 y2020
## 17407 y2020
## 17408 y2020
## 17409 y2020
## 17410 y2020
## 17411 y2020
## 17412 y2020
## 17413 y2020
## 17414 y2020
## 17415 y2020
## 17416 y2020
## 17417 y2020
## 17418 y2020
## 17419 y2020
## 17420 y2020
## 17421 y2020
## 17422 y2020
## 17423 y2020
## 17424 y2020
## 17425 y2020
## 17426 y2020
## 17427 y2020
## 17428 y2020
## 17429 y2020
## 17430 y2020
## 17431 y2020
## 17432 y2020
## 17433 y2020
## 17434 y2020
## 17435 y2020
## 17436 y2020
## 17437 y2020
## 17438 y2020
## 17439 y2020
## 17440 y2020
## 17441 y2020
## 17442 y2020
## 17443 y2020
## 17444 y2020
## 17445 y2020
## 17446 y2020
## 17447 y2020
## 17448 y2020
## 17449 y2020
## 17450 y2020
## 17451 y2020
## 17452 y2020
## 17453 y2020
## 17454 y2020
## 17455 y2020
## 17456 y2020
## 17457 y2020
## 17458 y2020
## 17459 y2020
## 17460 y2020
## 17461 y2020
## 17462 y2020
## 17463 y2020
## 17464 y2020
## 17465 y2020
## 17466 y2020
## 17467 y2020
## 17468 y2020
## 17469 y2020
## 17470 y2020
## 17471 y2020
## 17472 y2020
## 17473 y2020
## 17474 y2020
## 17475 y2020
## 17476 y2020
## 17477 y2020
## 17478 y2020
## 17479 y2020
## 17480 y2020
## 17481 y2020
## 17482 y2020
## 17483 y2020
## 17484 y2020
## 17485 y2020
## 17486 y2020
## 17487 y2020
## 17488 y2020
## 17489 y2020
## 17490 y2020
## 17491 y2020
## 17492 y2020
## 17493 y2020
## 17494 y2020
## 17495 y2020
## 17496 y2020
## 17497 y2020
## 17498 y2020
## 17499 y2020
## 17500 y2020
## 17501 y2020
## 17502 y2020
## 17503 y2020
## 17504 y2020
## 17505 y2020
## 17506 y2020
## 17507 y2020
## 17508 y2020
## 17509 y2020
## 17510 y2020
## 17511 y2020
## 17512 y2020
## 17513 y2020
## 17514 y2020
## 17515 y2020
## 17516 y2020
## 17517 y2020
## 17518 y2020
## 17519 y2020
## 17520 y2020
## 17521 y2020
## 17522 y2020
## 17523 y2020
## 17524 y2020
## 17525 y2020
## 17526 y2020
## 17527 y2020
## 17528 y2020
## 17529 y2020
## 17530 y2020
## 17531 y2020
## 17532 y2020
## 17533 y2020
## 17534 y2020
## 17535 y2020
## 17536 y2020
## 17537 y2020
## 17538 y2020
## 17539 y2020
## 17540 y2020
## 17541 y2020
## 17542 y2020
## 17543 y2020
## 17544 y2020
## 17545 y2020
## 17546 y2020
## 17547 y2020
## 17548 y2020
## 17549 y2020
## 17550 y2020
## 17551 y2020
## 17552 y2020
## 17553 y2020
## 17554 y2020
## 17555 y2020
## 17556 y2020
## 17557 y2020
## 17558 y2020
## 17559 y2020
## 17560 y2020
## 17561 y2020
## 17562 y2020
## 17563 y2020
## 17564 y2020
## 17565 y2020
## 17566 y2020
## 17567 y2020
## 17568 y2020
## 17569 y2020
## 17570 y2020
## 17571 y2020
## 17572 y2020
## 17573 y2020
## 17574 y2020
## 17575 y2020
## 17576 y2020
## 17577 y2020
## 17578 y2020
## 17579 y2020
## 17580 y2020
## 17581 y2020
## 17582 y2020
## 17583 y2020
## 17584 y2020
## 17585 y2020
## 17586 y2020
## 17587 y2020
## 17588 y2020
## 17589 y2020
## 17590 y2020
## 17591 y2020
## 17592 y2020
## 17593 y2020
## 17594 y2020
## 17595 y2020
## 17596 y2020
## 17597 y2020
## 17598 y2020
## 17599 y2020
## 17600 y2020
## 17601 y2020
## 17602 y2020
## 17603 y2020
## 17604 y2020
## 17605 y2020
## 17606 y2020
## 17607 y2020
## 17608 y2020
## 17609 y2020
## 17610 y2020
## 17611 y2020
## 17612 y2020
## 17613 y2020
## 17614 y2020
## 17615 y2020
## 17616 y2020
## 17617 y2020
## 17618 y2020
## 17619 y2020
## 17620 y2020
## 17621 y2020
## 17622 y2020
## 17623 y2020
## 17624 y2020
## 17625 y2020
## 17626 y2020
## 17627 y2020
## 17628 y2020
## 17629 y2020
## 17630 y2020
## 17631 y2020
## 17632 y2020
## 17633 y2020
## 17634 y2020
## 17635 y2020
## 17636 y2020
## 17637 y2020
## 17638 y2020
## 17639 y2020
## 17640 y2020
## 17641 y2020
## 17642 y2020
## 17643 y2020
## 17644 y2020
## 17645 y2020
## 17646 y2020
## 17647 y2020
## 17648 y2020
## 17649 y2020
## 17650 y2020
## 17651 y2020
## 17652 y2020
## 17653 y2020
## 17654 y2020
## 17655 y2020
## 17656 y2020
## 17657 y2020
## 17658 y2020
## 17659 y2020
## 17660 y2020
## 17661 y2020
## 17662 y2020
## 17663 y2020
## 17664 y2020
## 17665 y2020
## 17666 y2020
## 17667 y2020
## 17668 y2020
## 17669 y2020
## 17670 y2020
## 17671 y2020
## 17672 y2020
## 17673 y2020
## 17674 y2020
## 17675 y2020
## 17676 y2020
## 17677 y2020
## 17678 y2020
## 17679 y2020
## 17680 y2020
## 17681 y2020
## 17682 y2020
## 17683 y2020
## 17684 y2020
## 17685 y2020
## 17686 y2020
## 17687 y2020
## 17688 y2020
## 17689 y2020
## 17690 y2020
## 17691 y2020
## 17692 y2020
## 17693 y2020
## 17694 y2020
## 17695 y2020
## 17696 y2020
## 17697 y2020
## 17698 y2020
## 17699 y2020
## 17700 y2020
## 17701 y2020
## 17702 y2020
## 17703 y2020
## 17704 y2020
## 17705 y2020
## 17706 y2020
## 17707 y2020
## 17708 y2020
## 17709 y2020
## 17710 y2020
## 17711 y2020
## 17712 y2020
## 17713 y2020
## 17714 y2020
## 17715 y2020
## 17716 y2020
## 17717 y2020
## 17718 y2020
## 17719 y2020
## 17720 y2020
## 17721 y2020
## 17722 y2020
## 17723 y2020
## 17724 y2020
## 17725 y2020
## 17726 y2020
## 17727 y2020
## 17728 y2020
## 17729 y2020
## 17730 y2020
## 17731 y2020
## 17732 y2020
## 17733 y2020
## 17734 y2020
## 17735 y2020
## 17736 y2020
## 17737 y2020
## 17738 y2020
## 17739 y2020
## 17740 y2020
## 17741 y2020
## 17742 y2020
## 17743 y2020
## 17744 y2020
## 17745 y2020
## 17746 y2020
## 17747 y2020
## 17748 y2020
## 17749 y2020
## 17750 y2020
## 17751 y2020
## 17752 y2020
## 17753 y2020
## 17754 y2020
## 17755 y2020
## 17756 y2020
## 17757 y2020
## 17758 y2020
## 17759 y2020
## 17760 y2020
## 17761 y2020
## 17762 y2020
## 17763 y2020
## 17764 y2020
## 17765 y2020
## 17766 y2020
## 17767 y2020
## 17768 y2020
## 17769 y2020
## 17770 y2020
## 17771 y2020
## 17772 y2020
## 17773 y2020
## 17774 y2020
## 17775 y2020
## 17776 y2020
## 17777 y2020
## 17778 y2020
## 17779 y2020
## 17780 y2020
## 17781 y2020
## 17782 y2020
## 17783 y2020
## 17784 y2020
## 17785 y2020
## 17786 y2020
## 17787 y2020
## 17788 y2020
## 17789 y2020
## 17790 y2020
## 17791 y2020
## 17792 y2020
## 17793 y2020
## 17794 y2020
## 17795 y2020
## 17796 y2020
## 17797 y2020
## 17798 y2020
## 17799 y2020
## 17800 y2020
## 17801 y2020
## 17802 y2020
## 17803 y2020
## 17804 y2020
## 17805 y2020
## 17806 y2020
## 17807 y2020
## 17808 y2020
## 17809 y2020
## 17810 y2020
## 17811 y2020
## 17812 y2020
## 17813 y2020
## 17814 y2020
## 17815 y2020
## 17816 y2020
## 17817 y2020
## 17818 y2020
## 17819 y2020
## 17820 y2020
## 17821 y2020
## 17822 y2020
## 17823 y2020
## 17824 y2020
## 17825 y2020
## 17826 y2020
## 17827 y2020
## 17828 y2020
## 17829 y2020
## 17830 y2020
## 17831 y2020
## 17832 y2020
## 17833 y2020
## 17834 y2020
## 17835 y2020
## 17836 y2020
## 17837 y2020
## 17838 y2020
## 17839 y2020
## 17840 y2020
## 17841 y2020
## 17842 y2020
## 17843 y2020
## 17844 y2020
## 17845 y2020
## 17846 y2020
## 17847 y2020
## 17848 y2020
## 17849 y2020
## 17850 y2020
## 17851 y2020
## 17852 y2020
## 17853 y2020
## 17854 y2020
## 17855 y2020
## 17856 y2020
## 17857 y2020
## 17858 y2020
## 17859 y2020
## 17860 y2020
## 17861 y2020
## 17862 y2020
## 17863 y2020
## 17864 y2020
## 17865 y2020
## 17866 y2020
## 17867 y2020
## 17868 y2020
## 17869 y2020
## 17870 y2020
## 17871 y2020
## 17872 y2020
## 17873 y2020
## 17874 y2020
## 17875 y2020
## 17876 y2020
## 17877 y2020
## 17878 y2020
## 17879 y2020
## 17880 y2020
## 17881 y2020
## 17882 y2020
## 17883 y2020
## 17884 y2020
## 17885 y2020
## 17886 y2020
## 17887 y2020
## 17888 y2020
## 17889 y2020
## 17890 y2020
## 17891 y2020
## 17892 y2020
## 17893 y2020
## 17894 y2020
## 17895 y2020
## 17896 y2020
## 17897 y2020
## 17898 y2020
## 17899 y2020
## 17900 y2020
## 17901 y2020
## 17902 y2020
## 17903 y2020
## 17904 y2020
## 17905 y2020
## 17906 y2020
## 17907 y2020
## 17908 y2020
## 17909 y2020
## 17910 y2020
## 17911 y2020
## 17912 y2020
## 17913 y2020
## 17914 y2020
## 17915 y2020
## 17916 y2020
## 17917 y2020
## 17918 y2020
## 17919 y2020
## 17920 y2020
## 17921 y2020
## 17922 y2020
## 17923 y2020
## 17924 y2020
## 17925 y2020
## 17926 y2020
## 17927 y2020
## 17928 y2020
## 17929 y2020
## 17930 y2020
## 17931 y2020
## 17932 y2020
## 17933 y2020
## 17934 y2020
## 17935 y2020
## 17936 y2020
## 17937 y2020
## 17938 y2020
## 17939 y2020
## 17940 y2020
## 17941 y2020
## 17942 y2020
## 17943 y2020
## 17944 y2020
## 17945 y2020
## 17946 y2020
## 17947 y2020
## 17948 y2020
## 17949 y2020
## 17950 y2020
## 17951 y2020
## 17952 y2020
## 17953 y2020
## 17954 y2020
## 17955 y2020
## 17956 y2020
## 17957 y2020
## 17958 y2020
## 17959 y2020
## 17960 y2020
## 17961 y2020
## 17962 y2020
## 17963 y2020
## 17964 y2020
## 17965 y2020
## 17966 y2020
## 17967 y2020
## 17968 y2020
## 17969 y2020
## 17970 y2020
## 17971 y2020
## 17972 y2020
## 17973 y2020
## 17974 y2020
## 17975 y2020
## 17976 y2020
## 17977 y2020
## 17978 y2020
## 17979 y2020
## 17980 y2020
## 17981 y2020
## 17982 y2020
## 17983 y2020
## 17984 y2020
## 17985 y2020
## 17986 y2020
## 17987 y2020
## 17988 y2020
## 17989 y2020
## 17990 y2020
## 17991 y2020
## 17992 y2020
## 17993 y2020
## 17994 y2020
## 17995 y2020
## 17996 y2020
## 17997 y2020
## 17998 y2020
## 17999 y2020
## 18000 y2020
## 18001 y2020
## 18002 y2020
## 18003 y2020
## 18004 y2020
## 18005 y2020
## 18006 y2020
## 18007 y2020
## 18008 y2020
## 18009 y2020
## 18010 y2020
## 18011 y2020
## 18012 y2020
## 18013 y2020
## 18014 y2020
## 18015 y2020
## 18016 y2020
## 18017 y2020
## 18018 y2020
## 18019 y2020
## 18020 y2020
## 18021 y2020
## 18022 y2020
## 18023 y2020
## 18024 y2020
## 18025 y2020
## 18026 y2020
## 18027 y2020
## 18028 y2020
## 18029 y2020
## 18030 y2020
## 18031 y2020
## 18032 y2020
## 18033 y2020
## 18034 y2020
## 18035 y2020
## 18036 y2020
## 18037 y2020
## 18038 y2020
## 18039 y2020
## 18040 y2020
## 18041 y2020
## 18042 y2020
## 18043 y2020
## 18044 y2020
## 18045 y2020
## 18046 y2020
## 18047 y2020
## 18048 y2020
## 18049 y2020
## 18050 y2020
## 18051 y2020
## 18052 y2020
## 18053 y2020
## 18054 y2020
## 18055 y2020
## 18056 y2020
## 18057 y2020
## 18058 y2020
## 18059 y2020
## 18060 y2020
## 18061 y2020
## 18062 y2020
## 18063 y2020
## 18064 y2020
## 18065 y2020
## 18066 y2020
## 18067 y2020
## 18068 y2020
## 18069 y2020
## 18070 y2020
## 18071 y2020
## 18072 y2020
## 18073 y2020
## 18074 y2020
## 18075 y2020
## 18076 y2020
## 18077 y2020
## 18078 y2020
## 18079 y2020
## 18080 y2020
## 18081 y2020
## 18082 y2020
## 18083 y2020
## 18084 y2020
## 18085 y2020
## 18086 y2020
## 18087 y2020
## 18088 y2020
## 18089 y2020
## 18090 y2020
## 18091 y2020
## 18092 y2020
## 18093 y2020
## 18094 y2020
## 18095 y2020
## 18096 y2020
## 18097 y2020
## 18098 y2020
## 18099 y2020
## 18100 y2020
## 18101 y2020
## 18102 y2020
## 18103 y2020
## 18104 y2020
## 18105 y2020
## 18106 y2020
## 18107 y2020
## 18108 y2020
## 18109 y2020
## 18110 y2020
## 18111 y2020
## 18112 y2020
## 18113 y2020
## 18114 y2020
## 18115 y2020
## 18116 y2020
## 18117 y2020
## 18118 y2020
## 18119 y2020
## 18120 y2020
## 18121 y2020
## 18122 y2020
## 18123 y2020
## 18124 y2020
## 18125 y2020
## 18126 y2020
## 18127 y2020
## 18128 y2020
## 18129 y2020
## 18130 y2020
## 18131 y2020
## 18132 y2020
## 18133 y2020
## 18134 y2020
## 18135 y2020
## 18136 y2020
## 18137 y2020
## 18138 y2020
## 18139 y2020
## 18140 y2020
## 18141 y2020
## 18142 y2020
## 18143 y2020
## 18144 y2020
## 18145 y2020
## 18146 y2020
## 18147 y2020
## 18148 y2020
## 18149 y2020
## 18150 y2020
## 18151 y2020
## 18152 y2020
## 18153 y2020
## 18154 y2020
## 18155 y2020
## 18156 y2020
## 18157 y2020
## 18158 y2020
## 18159 y2020
## 18160 y2020
## 18161 y2020
## 18162 y2020
## 18163 y2020
## 18164 y2020
## 18165 y2020
## 18166 y2020
## 18167 y2020
## 18168 y2020
## 18169 y2020
## 18170 y2020
## 18171 y2020
## 18172 y2020
## 18173 y2020
## 18174 y2020
## 18175 y2020
## 18176 y2020
## 18177 y2020
## 18178 y2020
## 18179 y2020
## 18180 y2020
## 18181 y2020
## 18182 y2020
## 18183 y2020
## 18184 y2020
## 18185 y2020
## 18186 y2020
## 18187 y2020
## 18188 y2020
## 18189 y2020
## 18190 y2020
## 18191 y2020
## 18192 y2020
## 18193 y2020
## 18194 y2020
## 18195 y2020
## 18196 y2020
## 18197 y2020
## 18198 y2020
## 18199 y2020
## 18200 y2020
## 18201 y2020
## 18202 y2020
## 18203 y2020
## 18204 y2020
## 18205 y2020
## 18206 y2020
## 18207 y2020
## 18208 y2020
## 18209 y2020
## 18210 y2020
## 18211 y2020
## 18212 y2020
## 18213 y2020
## 18214 y2020
## 18215 y2020
## 18216 y2020
## 18217 y2020
## 18218 y2020
## 18219 y2020
## 18220 y2020
## 18221 y2020
## 18222 y2020
## 18223 y2020
## 18224 y2020
## 18225 y2020
## 18226 y2020
## 18227 y2020
## 18228 y2020
## 18229 y2020
## 18230 y2020
## 18231 y2020
## 18232 y2020
## 18233 y2020
## 18234 y2020
## 18235 y2020
## 18236 y2020
## 18237 y2020
## 18238 y2020
## 18239 y2020
## 18240 y2020
## 18241 y2020
## 18242 y2020
## 18243 y2020
## 18244 y2020
## 18245 y2020
## 18246 y2020
## 18247 y2020
## 18248 y2020
## 18249 y2020
## 18250 y2020
## 18251 y2020
## 18252 y2020
## 18253 y2020
## 18254 y2020
## 18255 y2020
## 18256 y2020
## 18257 y2020
## 18258 y2020
## 18259 y2020
## 18260 y2020
## 18261 y2020
## 18262 y2020
## 18263 y2020
## 18264 y2020
## 18265 y2020
## 18266 y2020
## 18267 y2020
## 18268 y2020
## 18269 y2020
## 18270 y2020
## 18271 y2020
## 18272 y2020
## 18273 y2020
## 18274 y2020
## 18275 y2020
## 18276 y2020
## 18277 y2020
## 18278 y2020
## 18279 y2020
## 18280 y2020
## 18281 y2020
## 18282 y2020
## 18283 y2020
## 18284 y2020
## 18285 y2020
## 18286 y2020
## 18287 y2020
## 18288 y2020
## 18289 y2020
## 18290 y2020
## 18291 y2020
## 18292 y2020
## 18293 y2020
## 18294 y2020
## 18295 y2020
## 18296 y2020
## 18297 y2020
## 18298 y2020
## 18299 y2020
## 18300 y2020
## 18301 y2020
## 18302 y2020
## 18303 y2020
## 18304 y2020
## 18305 y2020
## 18306 y2020
## 18307 y2020
## 18308 y2020
## 18309 y2020
## 18310 y2020
## 18311 y2020
## 18312 y2020
## 18313 y2020
## 18314 y2020
## 18315 y2020
## 18316 y2020
## 18317 y2020
## 18318 y2020
## 18319 y2020
## 18320 y2020
## 18321 y2020
## 18322 y2020
## 18323 y2020
## 18324 y2020
## 18325 y2020
## 18326 y2020
## 18327 y2020
## 18328 y2020
## 18329 y2020
## 18330 y2020
## 18331 y2020
## 18332 y2020
## 18333 y2020
## 18334 y2020
## 18335 y2020
## 18336 y2020
## 18337 y2020
## 18338 y2020
## 18339 y2020
## 18340 y2020
## 18341 y2020
## 18342 y2020
## 18343 y2020
## 18344 y2020
## 18345 y2020
## 18346 y2020
## 18347 y2020
## 18348 y2020
## 18349 y2020
## 18350 y2020
## 18351 y2020
## 18352 y2020
## 18353 y2020
## 18354 y2020
## 18355 y2020
## 18356 y2020
## 18357 y2020
## 18358 y2020
## 18359 y2020
## 18360 y2020
## 18361 y2020
## 18362 y2020
## 18363 y2020
## 18364 y2020
## 18365 y2020
## 18366 y2020
## 18367 y2020
## 18368 y2020
## 18369 y2020
## 18370 y2020
## 18371 y2020
## 18372 y2020
## 18373 y2020
## 18374 y2020
## 18375 y2020
## 18376 y2020
## 18377 y2020
## 18378 y2020
## 18379 y2020
## 18380 y2020
## 18381 y2020
## 18382 y2020
## 18383 y2020
## 18384 y2020
## 18385 y2020
## 18386 y2020
## 18387 y2020
## 18388 y2020
## 18389 y2020
## 18390 y2020
## 18391 y2020
## 18392 y2020
## 18393 y2020
## 18394 y2020
## 18395 y2020
## 18396 y2020
## 18397 y2020
## 18398 y2020
## 18399 y2020
## 18400 y2020
## 18401 y2020
## 18402 y2020
## 18403 y2020
## 18404 y2020
## 18405 y2020
## 18406 y2020
## 18407 y2020
## 18408 y2020
## 18409 y2020
## 18410 y2020
## 18411 y2020
## 18412 y2020
## 18413 y2020
## 18414 y2020
## 18415 y2020
## 18416 y2020
## 18417 y2020
## 18418 y2020
## 18419 y2020
## 18420 y2020
## 18421 y2020
## 18422 y2020
## 18423 y2020
## 18424 y2020
## 18425 y2020
## 18426 y2020
## 18427 y2020
## 18428 y2020
## 18429 y2020
## 18430 y2020
## 18431 y2020
## 18432 y2020
## 18433 y2020
## 18434 y2020
## 18435 y2020
## 18436 y2020
## 18437 y2020
## 18438 y2020
## 18439 y2020
## 18440 y2020
## 18441 y2020
## 18442 y2020
## 18443 y2020
## 18444 y2020
## 18445 y2020
## 18446 y2020
## 18447 y2020
## 18448 y2020
## 18449 y2020
## 18450 y2020
## 18451 y2020
## 18452 y2020
## 18453 y2020
## 18454 y2020
## 18455 y2020
## 18456 y2020
## 18457 y2020
## 18458 y2020
## 18459 y2020
## 18460 y2020
## 18461 y2020
## 18462 y2020
## 18463 y2020
## 18464 y2020
## 18465 y2020
## 18466 y2020
## 18467 y2020
## 18468 y2020
## 18469 y2020
## 18470 y2020
## 18471 y2020
## 18472 y2020
## 18473 y2020
## 18474 y2020
## 18475 y2020
## 18476 y2020
## 18477 y2020
## 18478 y2020
## 18479 y2020
## 18480 y2020
## 18481 y2020
## 18482 y2020
## 18483 y2020
## 18484 y2020
## 18485 y2020
## 18486 y2020
## 18487 y2020
## 18488 y2020
## 18489 y2020
## 18490 y2020
## 18491 y2020
## 18492 y2020
## 18493 y2020
## 18494 y2020
## 18495 y2020
## 18496 y2020
## 18497 y2020
## 18498 y2020
## 18499 y2020
## 18500 y2020
## 18501 y2020
## 18502 y2020
## 18503 y2020
## 18504 y2020
## 18505 y2020
## 18506 y2020
## 18507 y2020
## 18508 y2020
## 18509 y2020
## 18510 y2020
## 18511 y2020
## 18512 y2020
## 18513 y2020
## 18514 y2020
## 18515 y2020
## 18516 y2020
## 18517 y2020
## 18518 y2020
## 18519 y2020
## 18520 y2020
## 18521 y2020
## 18522 y2020
## 18523 y2020
## 18524 y2020
## 18525 y2020
## 18526 y2020
## 18527 y2020
## 18528 y2020
## 18529 y2020
## 18530 y2020
## 18531 y2020
## 18532 y2020
## 18533 y2020
## 18534 y2020
## 18535 y2020
## 18536 y2020
## 18537 y2020
## 18538 y2020
## 18539 y2020
## 18540 y2020
## 18541 y2020
## 18542 y2020
## 18543 y2020
## 18544 y2020
## 18545 y2020
## 18546 y2020
## 18547 y2020
## 18548 y2020
## 18549 y2020
## 18550 y2020
## 18551 y2020
## 18552 y2020
## 18553 y2020
## 18554 y2020
## 18555 y2020
## 18556 y2020
## 18557 y2020
## 18558 y2020
## 18559 y2020
## 18560 y2020
## 18561 y2020
## 18562 y2020
## 18563 y2020
## 18564 y2020
## 18565 y2020
## 18566 y2020
## 18567 y2020
## 18568 y2020
## 18569 y2020
## 18570 y2020
## 18571 y2020
## 18572 y2020
## 18573 y2020
## 18574 y2020
## 18575 y2020
## 18576 y2020
## 18577 y2020
## 18578 y2020
## 18579 y2020
## 18580 y2020
## 18581 y2020
## 18582 y2020
## 18583 y2020
## 18584 y2020
## 18585 y2020
## 18586 y2020
## 18587 y2020
## 18588 y2020
## 18589 y2020
## 18590 y2020
## 18591 y2020
## 18592 y2020
## 18593 y2020
## 18594 y2020
## 18595 y2020
## 18596 y2020
## 18597 y2020
## 18598 y2020
## 18599 y2020
## 18600 y2020
## 18601 y2020
## 18602 y2020
## 18603 y2020
## 18604 y2020
## 18605 y2020
## 18606 y2020
## 18607 y2020
## 18608 y2020
## 18609 y2020
## 18610 y2020
## 18611 y2020
## 18612 y2020
## 18613 y2020
## 18614 y2020
## 18615 y2020
## 18616 y2020
## 18617 y2020
## 18618 y2020
## 18619 y2020
## 18620 y2020
## 18621 y2020
## 18622 y2020
## 18623 y2020
## 18624 y2020
## 18625 y2020
## 18626 y2020
## 18627 y2020
## 18628 y2020
## 18629 y2020
## 18630 y2020
## 18631 y2020
## 18632 y2020
## 18633 y2020
## 18634 y2020
## 18635 y2020
## 18636 y2020
## 18637 y2020
## 18638 y2020
## 18639 y2020
## 18640 y2020
## 18641 y2020
## 18642 y2020
## 18643 y2020
## 18644 y2020
## 18645 y2020
## 18646 y2020
## 18647 y2020
## 18648 y2020
## 18649 y2020
## 18650 y2020
## 18651 y2020
## 18652 y2020
## 18653 y2020
## 18654 y2020
## 18655 y2020
## 18656 y2020
## 18657 y2020
## 18658 y2020
## 18659 y2020
## 18660 y2020
## 18661 y2020
## 18662 y2020
## 18663 y2020
## 18664 y2020
## 18665 y2020
## 18666 y2020
## 18667 y2020
## 18668 y2020
## 18669 y2020
## 18670 y2020
## 18671 y2020
## 18672 y2020
## 18673 y2020
## 18674 y2020
## 18675 y2020
## 18676 y2020
## 18677 y2020
## 18678 y2020
## 18679 y2020
## 18680 y2020
## 18681 y2020
## 18682 y2020
## 18683 y2020
## 18684 y2020
## 18685 y2020
## 18686 y2020
## 18687 y2020
## 18688 y2020
## 18689 y2020
## 18690 y2020
## 18691 y2020
## 18692 y2020
## 18693 y2020
## 18694 y2020
## 18695 y2020
## 18696 y2020
## 18697 y2020
## 18698 y2020
## 18699 y2020
## 18700 y2020
## 18701 y2020
## 18702 y2020
## 18703 y2020
## 18704 y2020
## 18705 y2020
## 18706 y2020
## 18707 y2020
## 18708 y2020
## 18709 y2020
## 18710 y2020
## 18711 y2020
## 18712 y2020
## 18713 y2020
## 18714 y2020
## 18715 y2020
## 18716 y2020
## 18717 y2020
## 18718 y2020
## 18719 y2020
## 18720 y2020
## 18721 y2020
## 18722 y2020
## 18723 y2020
## 18724 y2020
## 18725 y2020
## 18726 y2020
## 18727 y2020
## 18728 y2020
## 18729 y2020
## 18730 y2020
## 18731 y2020
## 18732 y2020
## 18733 y2020
## 18734 y2020
## 18735 y2020
## 18736 y2020
## 18737 y2020
## 18738 y2020
## 18739 y2020
## 18740 y2020
## 18741 y2020
## 18742 y2020
## 18743 y2020
## 18744 y2020
## 18745 y2020
## 18746 y2020
## 18747 y2020
## 18748 y2020
## 18749 y2020
## 18750 y2020
## 18751 y2020
## 18752 y2020
## 18753 y2020
## 18754 y2020
## 18755 y2020
## 18756 y2020
## 18757 y2020
## 18758 y2020
## 18759 y2020
## 18760 y2020
## 18761 y2020
## 18762 y2020
## 18763 y2020
## 18764 y2020
## 18765 y2020
## 18766 y2020
## 18767 y2020
## 18768 y2020
## 18769 y2020
## 18770 y2020
## 18771 y2020
## 18772 y2020
## 18773 y2020
## 18774 y2020
## 18775 y2020
## 18776 y2020
## 18777 y2020
## 18778 y2020
## 18779 y2020
## 18780 y2020
## 18781 y2020
## 18782 y2020
## 18783 y2020
## 18784 y2020
## 18785 y2020
## 18786 y2020
## 18787 y2020
## 18788 y2020
## 18789 y2020
## 18790 y2020
## 18791 y2020
## 18792 y2020
## 18793 y2020
## 18794 y2020
## 18795 y2020
## 18796 y2020
## 18797 y2020
## 18798 y2020
## 18799 y2020
## 18800 y2020
## 18801 y2020
## 18802 y2020
## 18803 y2020
## 18804 y2020
## 18805 y2020
## 18806 y2020
## 18807 y2020
## 18808 y2020
## 18809 y2020
## 18810 y2020
## 18811 y2020
## 18812 y2020
## 18813 y2020
## 18814 y2020
## 18815 y2020
## 18816 y2020
## 18817 y2020
## 18818 y2020
## 18819 y2020
## 18820 y2020
## 18821 y2020
## 18822 y2020
## 18823 y2020
## 18824 y2020
## 18825 y2020
## 18826 y2020
## 18827 y2020
## 18828 y2020
## 18829 y2020
## 18830 y2020
## 18831 y2020
## 18832 y2020
## 18833 y2020
## 18834 y2020
## 18835 y2020
## 18836 y2020
## 18837 y2020
## 18838 y2020
## 18839 y2020
## 18840 y2020
## 18841 y2020
## 18842 y2020
## 18843 y2020
## 18844 y2020
## 18845 y2020
## 18846 y2020
## 18847 y2020
## 18848 y2020
## 18849 y2020
## 18850 y2020
## 18851 y2020
## 18852 y2020
## 18853 y2020
## 18854 y2020
## 18855 y2020
## 18856 y2020
## 18857 y2020
## 18858 y2020
## 18859 y2020
## 18860 y2020
## 18861 y2020
## 18862 y2020
## 18863 y2020
## 18864 y2020
## 18865 y2020
## 18866 y2020
## 18867 y2020
## 18868 y2020
## 18869 y2020
## 18870 y2020
## 18871 y2020
## 18872 y2020
## 18873 y2020
## 18874 y2020
## 18875 y2020
## 18876 y2020
## 18877 y2020
## 18878 y2020
## 18879 y2020
## 18880 y2020
## 18881 y2020
## 18882 y2020
## 18883 y2020
## 18884 y2020
## 18885 y2020
## 18886 y2020
## 18887 y2020
## 18888 y2020
## 18889 y2020
## 18890 y2020
## 18891 y2020
## 18892 y2020
## 18893 y2020
## 18894 y2020
## 18895 y2020
## 18896 y2020
## 18897 y2020
## 18898 y2020
## 18899 y2020
## 18900 y2020
## 18901 y2020
## 18902 y2020
## 18903 y2020
## 18904 y2020
## 18905 y2020
## 18906 y2020
## 18907 y2020
## 18908 y2020
## 18909 y2020
## 18910 y2020
## 18911 y2020
## 18912 y2020
## 18913 y2020
## 18914 y2020
## 18915 y2020
## 18916 y2020
## 18917 y2020
## 18918 y2020
## 18919 y2020
## 18920 y2020
## 18921 y2020
## 18922 y2020
## 18923 y2020
## 18924 y2020
## 18925 y2020
## 18926 y2020
## 18927 y2020
## 18928 y2020
## 18929 y2020
## 18930 y2020
## 18931 y2020
## 18932 y2020
## 18933 y2020
## 18934 y2020
## 18935 y2020
## 18936 y2020
## 18937 y2020
## 18938 y2020
## 18939 y2020
## 18940 y2020
## 18941 y2020
## 18942 y2020
## 18943 y2020
## 18944 y2020
## 18945 y2020
## 18946 y2020
## 18947 y2020
## 18948 y2020
## 18949 y2020
## 18950 y2020
## 18951 y2020
## 18952 y2020
## 18953 y2020
## 18954 y2020
## 18955 y2020
## 18956 y2020
## 18957 y2020
## 18958 y2020
## 18959 y2020
## 18960 y2020
## 18961 y2020
## 18962 y2020
## 18963 y2020
## 18964 y2020
## 18965 y2020
## 18966 y2020
## 18967 y2020
## 18968 y2020
## 18969 y2020
## 18970 y2020
## 18971 y2020
## 18972 y2020
## 18973 y2020
## 18974 y2020
## 18975 y2020
## 18976 y2020
## 18977 y2020
## 18978 y2020
## 18979 y2020
## 18980 y2020
## 18981 y2020
## 18982 y2020
## 18983 y2020
## 18984 y2020
## 18985 y2020
## 18986 y2020
## 18987 y2020
## 18988 y2020
## 18989 y2020
## 18990 y2020
## 18991 y2020
## 18992 y2020
## 18993 y2020
## 18994 y2020
## 18995 y2020
## 18996 y2020
## 18997 y2020
## 18998 y2020
## 18999 y2020
## 19000 y2020
## 19001 y2020
## 19002 y2020
## 19003 y2020
## 19004 y2020
## 19005 y2020
## 19006 y2020
## 19007 y2020
## 19008 y2020
## 19009 y2020
## 19010 y2020
## 19011 y2020
## 19012 y2020
## 19013 y2020
## 19014 y2020
## 19015 y2020
## 19016 y2020
## 19017 y2020
## 19018 y2020
## 19019 y2020
## 19020 y2020
## 19021 y2020
## 19022 y2020
## 19023 y2020
## 19024 y2020
## 19025 y2020
## 19026 y2020
## 19027 y2020
## 19028 y2020
## 19029 y2020
## 19030 y2020
## 19031 y2020
## 19032 y2020
## 19033 y2020
## 19034 y2020
## 19035 y2020
## 19036 y2020
## 19037 y2020
## 19038 y2020
## 19039 y2020
## 19040 y2020
## 19041 y2020
## 19042 y2020
## 19043 y2020
## 19044 y2020
## 19045 y2020
## 19046 y2020
## 19047 y2020
## 19048 y2020
## 19049 y2020
## 19050 y2020
## 19051 y2020
## 19052 y2020
## 19053 y2020
## 19054 y2020
## 19055 y2020
## 19056 y2020
## 19057 y2020
## 19058 y2020
## 19059 y2020
## 19060 y2020
## 19061 y2020
## 19062 y2020
## 19063 y2020
## 19064 y2020
## 19065 y2020
## 19066 y2020
## 19067 y2020
## 19068 y2020
## 19069 y2020
## 19070 y2020
## 19071 y2020
## 19072 y2020
## 19073 y2020
## 19074 y2020
## 19075 y2020
## 19076 y2020
## 19077 y2020
## 19078 y2020
## 19079 y2020
## 19080 y2020
## 19081 y2020
## 19082 y2020
## 19083 y2020
## 19084 y2020
## 19085 y2020
## 19086 y2020
## 19087 y2020
## 19088 y2020
## 19089 y2020
## 19090 y2020
## 19091 y2020
## 19092 y2020
## 19093 y2020
## 19094 y2020
## 19095 y2020
## 19096 y2020
## 19097 y2020
## 19098 y2020
## 19099 y2020
## 19100 y2020
## 19101 y2020
## 19102 y2020
## 19103 y2020
## 19104 y2020
## 19105 y2020
## 19106 y2020
## 19107 y2020
## 19108 y2020
## 19109 y2020
## 19110 y2020
## 19111 y2020
## 19112 y2020
## 19113 y2020
## 19114 y2020
## 19115 y2020
## 19116 y2020
## 19117 y2020
## 19118 y2020
## 19119 y2020
## 19120 y2020
## 19121 y2020
## 19122 y2020
## 19123 y2020
## 19124 y2020
## 19125 y2020
## 19126 y2020
## 19127 y2020
## 19128 y2020
## 19129 y2020
## 19130 y2020
## 19131 y2020
## 19132 y2020
## 19133 y2020
## 19134 y2020
## 19135 y2020
## 19136 y2020
## 19137 y2020
## 19138 y2020
## 19139 y2020
## 19140 y2020
## 19141 y2020
## 19142 y2020
## 19143 y2020
## 19144 y2020
## 19145 y2020
## 19146 y2020
## 19147 y2020
## 19148 y2020
## 19149 y2020
## 19150 y2020
## 19151 y2020
## 19152 y2020
## 19153 y2020
## 19154 y2020
## 19155 y2020
## 19156 y2020
## 19157 y2020
## 19158 y2020
## 19159 y2020
## 19160 y2020
## 19161 y2020
## 19162 y2020
## 19163 y2020
## 19164 y2020
## 19165 y2020
## 19166 y2020
## 19167 y2020
## 19168 y2020
## 19169 y2020
## 19170 y2020
## 19171 y2020
## 19172 y2020
## 19173 y2020
## 19174 y2020
## 19175 y2020
## 19176 y2020
## 19177 y2020
## 19178 y2020
## 19179 y2020
## 19180 y2020
## 19181 y2020
## 19182 y2020
## 19183 y2020
## 19184 y2020
## 19185 y2020
## 19186 y2020
## 19187 y2020
## 19188 y2020
## 19189 y2020
## 19190 y2020
## 19191 y2020
## 19192 y2020
## 19193 y2020
## 19194 y2020
## 19195 y2020
## 19196 y2020
## 19197 y2020
## 19198 y2020
## 19199 y2020
## 19200 y2020
## 19201 y2020
## 19202 y2020
## 19203 y2020
## 19204 y2020
## 19205 y2020
## 19206 y2020
## 19207 y2020
## 19208 y2020
## 19209 y2020
## 19210 y2020
## 19211 y2020
## 19212 y2020
## 19213 y2020
## 19214 y2020
## 19215 y2020
## 19216 y2020
## 19217 y2020
## 19218 y2020
## 19219 y2020
## 19220 y2020
## 19221 y2020
## 19222 y2020
## 19223 y2020
## 19224 y2020
## 19225 y2020
## 19226 y2020
## 19227 y2020
## 19228 y2020
## 19229 y2020
## 19230 y2020
## 19231 y2020
## 19232 y2020
## 19233 y2020
## 19234 y2020
## 19235 y2020
## 19236 y2020
## 19237 y2020
## 19238 y2020
## 19239 y2020
## 19240 y2020
## 19241 y2020
## 19242 y2020
## 19243 y2020
## 19244 y2020
## 19245 y2020
## 19246 y2020
## 19247 y2020
## 19248 y2020
## 19249 y2020
## 19250 y2020
## 19251 y2020
## 19252 y2020
## 19253 y2020
## 19254 y2020
## 19255 y2020
## 19256 y2020
## 19257 y2020
## 19258 y2020
## 19259 y2020
## 19260 y2020
## 19261 y2020
## 19262 y2020
## 19263 y2020
## 19264 y2020
## 19265 y2020
## 19266 y2020
## 19267 y2020
## 19268 y2020
## 19269 y2020
## 19270 y2020
## 19271 y2020
## 19272 y2020
## 19273 y2020
## 19274 y2020
## 19275 y2020
## 19276 y2020
## 19277 y2020
## 19278 y2020
## 19279 y2020
## 19280 y2020
## 19281 y2020
## 19282 y2020
## 19283 y2020
## 19284 y2020
## 19285 y2020
## 19286 y2020
## 19287 y2020
## 19288 y2020
## 19289 y2020
## 19290 y2020
## 19291 y2020
## 19292 y2020
## 19293 y2020
## 19294 y2020
## 19295 y2020
## 19296 y2020
## 19297 y2020
## 19298 y2020
## 19299 y2020
## 19300 y2020
## 19301 y2020
## 19302 y2020
## 19303 y2020
## 19304 y2020
## 19305 y2020
## 19306 y2020
## 19307 y2020
## 19308 y2020
## 19309 y2020
## 19310 y2020
## 19311 y2020
## 19312 y2020
## 19313 y2020
## 19314 y2020
## 19315 y2020
## 19316 y2020
## 19317 y2020
## 19318 y2020
## 19319 y2020
## 19320 y2020
## 19321 y2020
## 19322 y2020
## 19323 y2020
## 19324 y2020
## 19325 y2020
## 19326 y2020
## 19327 y2020
## 19328 y2020
## 19329 y2020
## 19330 y2020
## 19331 y2020
## 19332 y2020
## 19333 y2020
## 19334 y2020
## 19335 y2020
## 19336 y2020
## 19337 y2020
## 19338 y2020
## 19339 y2020
## 19340 y2020
## 19341 y2020
## 19342 y2020
## 19343 y2020
## 19344 y2020
## 19345 y2020
## 19346 y2020
## 19347 y2020
## 19348 y2020
## 19349 y2020
## 19350 y2020
## 19351 y2020
## 19352 y2020
## 19353 y2020
## 19354 y2020
## 19355 y2020
## 19356 y2020
## 19357 y2020
## 19358 y2020
## 19359 y2020
## 19360 y2020
## 19361 y2020
## 19362 y2020
## 19363 y2020
## 19364 y2020
## 19365 y2020
## 19366 y2020
## 19367 y2020
## 19368 y2020
## 19369 y2020
## 19370 y2020
## 19371 y2020
## 19372 y2020
## 19373 y2020
## 19374 y2020
## 19375 y2020
## 19376 y2020
## 19377 y2020
## 19378 y2020
## 19379 y2020
## 19380 y2020
## 19381 y2020
## 19382 y2020
## 19383 y2020
## 19384 y2020
## 19385 y2020
## 19386 y2020
## 19387 y2020
## 19388 y2020
## 19389 y2020
## 19390 y2020
## 19391 y2020
## 19392 y2020
## 19393 y2020
## 19394 y2020
## 19395 y2020
## 19396 y2020
## 19397 y2020
## 19398 y2020
## 19399 y2020
## 19400 y2020
## 19401 y2020
## 19402 y2020
## 19403 y2020
## 19404 y2020
## 19405 y2020
## 19406 y2020
## 19407 y2020
## 19408 y2020
## 19409 y2020
## 19410 y2020
## 19411 y2020
## 19412 y2020
## 19413 y2020
## 19414 y2020
## 19415 y2020
## 19416 y2020
## 19417 y2020
## 19418 y2020
## 19419 y2020
## 19420 y2020
## 19421 y2020
## 19422 y2020
## 19423 y2020
## 19424 y2020
## 19425 y2020
## 19426 y2020
## 19427 y2020
## 19428 y2020
## 19429 y2020
## 19430 y2020
## 19431 y2020
## 19432 y2020
## 19433 y2020
## 19434 y2020
## 19435 y2020
## 19436 y2020
## 19437 y2020
## 19438 y2020
## 19439 y2020
## 19440 y2020
## 19441 y2020
## 19442 y2020
## 19443 y2020
## 19444 y2020
## 19445 y2020
## 19446 y2020
## 19447 y2020
## 19448 y2020
## 19449 y2020
## 19450 y2020
## 19451 y2020
## 19452 y2020
## 19453 y2020
## 19454 y2020
## 19455 y2020
## 19456 y2020
## 19457 y2020
## 19458 y2020
## 19459 y2020
## 19460 y2020
## 19461 y2020
## 19462 y2020
## 19463 y2020
## 19464 y2020
## 19465 y2020
## 19466 y2020
## 19467 y2020
## 19468 y2020
## 19469 y2020
## 19470 y2020
## 19471 y2020
## 19472 y2020
## 19473 y2020
## 19474 y2020
## 19475 y2020
## 19476 y2020
## 19477 y2020
## 19478 y2020
## 19479 y2020
## 19480 y2020
## 19481 y2020
## 19482 y2020
## 19483 y2020
## 19484 y2020
## 19485 y2020
## 19486 y2020
## 19487 y2020
## 19488 y2020
## 19489 y2020
## 19490 y2020
## 19491 y2020
## 19492 y2020
## 19493 y2020
## 19494 y2020
## 19495 y2020
## 19496 y2020
## 19497 y2020
## 19498 y2020
## 19499 y2020
## 19500 y2020
## 19501 y2020
## 19502 y2020
## 19503 y2020
## 19504 y2020
## 19505 y2020
## 19506 y2020
## 19507 y2020
## 19508 y2020
## 19509 y2020
## 19510 y2020
## 19511 y2020
## 19512 y2020
## 19513 y2020
## 19514 y2020
## 19515 y2020
## 19516 y2020
## 19517 y2020
## 19518 y2020
## 19519 y2020
## 19520 y2020
## 19521 y2020
## 19522 y2020
## 19523 y2020
## 19524 y2020
## 19525 y2020
## 19526 y2020
## 19527 y2020
## 19528 y2020
## 19529 y2020
## 19530 y2020
## 19531 y2020
## 19532 y2020
## 19533 y2020
## 19534 y2020
## 19535 y2020
## 19536 y2020
## 19537 y2020
## 19538 y2020
## 19539 y2020
## 19540 y2020
## 19541 y2020
## 19542 y2020
## 19543 y2020
## 19544 y2020
## 19545 y2020
## 19546 y2020
## 19547 y2020
## 19548 y2020
## 19549 y2020
## 19550 y2020
## 19551 y2020
## 19552 y2020
## 19553 y2020
## 19554 y2020
## 19555 y2020
## 19556 y2020
## 19557 y2020
## 19558 y2020
## 19559 y2020
## 19560 y2020
## 19561 y2020
## 19562 y2020
## 19563 y2020
## 19564 y2020
## 19565 y2020
## 19566 y2020
## 19567 y2020
## 19568 y2020
## 19569 y2020
## 19570 y2020
## 19571 y2020
## 19572 y2020
## 19573 y2020
## 19574 y2020
## 19575 y2020
## 19576 y2020
## 19577 y2020
## 19578 y2020
## 19579 y2020
## 19580 y2020
## 19581 y2020
## 19582 y2020
## 19583 y2020
## 19584 y2020
## 19585 y2020
## 19586 y2020
## 19587 y2020
## 19588 y2020
## 19589 y2020
## 19590 y2020
## 19591 y2020
## 19592 y2020
## 19593 y2020
## 19594 y2020
## 19595 y2020
## 19596 y2020
## 19597 y2020
## 19598 y2020
## 19599 y2020
## 19600 y2020
## 19601 y2020
## 19602 y2020
## 19603 y2020
## 19604 y2020
## 19605 y2020
## 19606 y2020
## 19607 y2020
## 19608 y2020
## 19609 y2020
## 19610 y2020
## 19611 y2020
## 19612 y2020
## 19613 y2020
## 19614 y2020
## 19615 y2020
## 19616 y2020
## 19617 y2020
## 19618 y2020
## 19619 y2020
## 19620 y2020
## 19621 y2020
## 19622 y2020
## 19623 y2020
## 19624 y2020
## 19625 y2020
## 19626 y2020
## 19627 y2020
## 19628 y2020
## 19629 y2020
## 19630 y2020
## 19631 y2020
## 19632 y2020
## 19633 y2020
## 19634 y2020
## 19635 y2020
## 19636 y2020
## 19637 y2020
## 19638 y2020
## 19639 y2020
## 19640 y2020
## 19641 y2020
## 19642 y2020
## 19643 y2020
## 19644 y2020
## 19645 y2020
## 19646 y2020
## 19647 y2020
## 19648 y2020
## 19649 y2020
## 19650 y2020
## 19651 y2020
## 19652 y2020
## 19653 y2020
## 19654 y2020
## 19655 y2020
## 19656 y2020
## 19657 y2020
## 19658 y2020
## 19659 y2020
## 19660 y2020
## 19661 y2020
## 19662 y2020
## 19663 y2020
## 19664 y2020
## 19665 y2020
## 19666 y2020
## 19667 y2020
## 19668 y2020
## 19669 y2020
## 19670 y2020
## 19671 y2020
## 19672 y2020
## 19673 y2020
## 19674 y2020
## 19675 y2020
## 19676 y2020
## 19677 y2020
## 19678 y2020
## 19679 y2020
## 19680 y2020
## 19681 y2020
## 19682 y2020
## 19683 y2020
## 19684 y2020
## 19685 y2020
## 19686 y2020
## 19687 y2020
## 19688 y2020
## 19689 y2020
## 19690 y2020
## 19691 y2020
## 19692 y2020
## 19693 y2020
## 19694 y2020
## 19695 y2020
## 19696 y2020
## 19697 y2020
## 19698 y2020
## 19699 y2020
## 19700 y2020
## 19701 y2020
## 19702 y2020
## 19703 y2020
## 19704 y2020
## 19705 y2020
## 19706 y2020
## 19707 y2020
## 19708 y2020
## 19709 y2020
## 19710 y2020
## 19711 y2020
## 19712 y2020
## 19713 y2020
## 19714 y2020
## 19715 y2020
## 19716 y2020
## 19717 y2020
## 19718 y2020
## 19719 y2020
## 19720 y2020
## 19721 y2020
## 19722 y2020
## 19723 y2020
## 19724 y2020
## 19725 y2020
## 19726 y2020
## 19727 y2020
## 19728 y2020
## 19729 y2020
## 19730 y2020
## 19731 y2020
## 19732 y2020
## 19733 y2020
## 19734 y2020
## 19735 y2020
## 19736 y2020
## 19737 y2020
## 19738 y2020
## 19739 y2020
## 19740 y2020
## 19741 y2020
## 19742 y2020
## 19743 y2020
## 19744 y2020
## 19745 y2020
## 19746 y2020
## 19747 y2020
## 19748 y2020
## 19749 y2020
## 19750 y2020
## 19751 y2020
## 19752 y2020
## 19753 y2020
## 19754 y2020
## 19755 y2020
## 19756 y2020
## 19757 y2020
## 19758 y2020
## 19759 y2020
## 19760 y2020
## 19761 y2020
## 19762 y2020
## 19763 y2020
## 19764 y2020
## 19765 y2020
## 19766 y2020
## 19767 y2020
## 19768 y2020
## 19769 y2020
## 19770 y2020
## 19771 y2020
## 19772 y2020
## 19773 y2020
## 19774 y2020
## 19775 y2020
## 19776 y2020
## 19777 y2020
## 19778 y2020
## 19779 y2020
## 19780 y2020
## 19781 y2020
## 19782 y2020
## 19783 y2020
## 19784 y2020
## 19785 y2020
## 19786 y2020
## 19787 y2020
## 19788 y2020
## 19789 y2020
## 19790 y2020
## 19791 y2020
## 19792 y2020
## 19793 y2020
## 19794 y2020
## 19795 y2020
## 19796 y2020
## 19797 y2020
## 19798 y2020
## 19799 y2020
## 19800 y2020
## 19801 y2020
## 19802 y2020
## 19803 y2020
## 19804 y2020
## 19805 y2020
## 19806 y2020
## 19807 y2020
## 19808 y2020
## 19809 y2020
## 19810 y2020
## 19811 y2020
## 19812 y2020
## 19813 y2020
## 19814 y2020
## 19815 y2020
## 19816 y2020
## 19817 y2020
## 19818 y2020
## 19819 y2020
## 19820 y2020
## 19821 y2020
## 19822 y2020
## 19823 y2020
## 19824 y2020
## 19825 y2020
## 19826 y2020
## 19827 y2020
## 19828 y2020
## 19829 y2020
## 19830 y2020
## 19831 y2020
## 19832 y2020
## 19833 y2020
## 19834 y2020
## 19835 y2020
## 19836 y2020
## 19837 y2020
## 19838 y2020
## 19839 y2020
## 19840 y2020
## 19841 y2020
## 19842 y2020
## 19843 y2020
## 19844 y2020
## 19845 y2020
## 19846 y2020
## 19847 y2020
## 19848 y2020
## 19849 y2020
## 19850 y2020
## 19851 y2020
## 19852 y2020
## 19853 y2020
## 19854 y2020
## 19855 y2020
## 19856 y2020
## 19857 y2020
## 19858 y2020
## 19859 y2020
## 19860 y2020
## 19861 y2020
## 19862 y2020
## 19863 y2020
## 19864 y2020
## 19865 y2020
## 19866 y2020
## 19867 y2020
## 19868 y2020
## 19869 y2020
## 19870 y2020
## 19871 y2020
## 19872 y2020
## 19873 y2020
## 19874 y2020
## 19875 y2020
## 19876 y2020
## 19877 y2020
## 19878 y2020
## 19879 y2020
## 19880 y2020
## 19881 y2020
## 19882 y2020
## 19883 y2020
## 19884 y2020
## 19885 y2020
## 19886 y2020
## 19887 y2020
## 19888 y2020
## 19889 y2020
## 19890 y2020
## 19891 y2020
## 19892 y2020
## 19893 y2020
## 19894 y2020
## 19895 y2020
## 19896 y2020
## 19897 y2020
## 19898 y2020
## 19899 y2020
## 19900 y2020
## 19901 y2020
## 19902 y2020
## 19903 y2020
## 19904 y2020
## 19905 y2020
## 19906 y2020
## 19907 y2020
## 19908 y2020
## 19909 y2020
## 19910 y2020
## 19911 y2020
## 19912 y2020
## 19913 y2020
## 19914 y2020
## 19915 y2020
## 19916 y2020
## 19917 y2020
## 19918 y2020
## 19919 y2020
## 19920 y2020
## 19921 y2020
## 19922 y2020
## 19923 y2020
## 19924 y2020
## 19925 y2020
## 19926 y2020
## 19927 y2020
## 19928 y2020
## 19929 y2020
## 19930 y2020
## 19931 y2020
## 19932 y2020
## 19933 y2020
## 19934 y2020
## 19935 y2020
## 19936 y2020
## 19937 y2020
## 19938 y2020
## 19939 y2020
## 19940 y2020
## 19941 y2020
## 19942 y2020
## 19943 y2020
## 19944 y2020
## 19945 y2020
## 19946 y2020
## 19947 y2020
## 19948 y2020
## 19949 y2020
## 19950 y2020
## 19951 y2020
## 19952 y2020
## 19953 y2020
## 19954 y2020
## 19955 y2020
## 19956 y2020
## 19957 y2020
## 19958 y2020
## 19959 y2020
## 19960 y2020
## 19961 y2020
## 19962 y2020
## 19963 y2020
## 19964 y2020
## 19965 y2020
## 19966 y2020
## 19967 y2020
## 19968 y2020
## 19969 y2020
## 19970 y2020
## 19971 y2020
## 19972 y2020
## 19973 y2020
## 19974 y2020
## 19975 y2020
## 19976 y2020
## 19977 y2020
## 19978 y2020
## 19979 y2020
## 19980 y2020
## 19981 y2020
## 19982 y2020
## 19983 y2020
## 19984 y2020
## 19985 y2020
## 19986 y2020
## 19987 y2020
## 19988 y2020
## 19989 y2020
## 19990 y2020
## 19991 y2020
## 19992 y2020
## 19993 y2020
## 19994 y2020
## 19995 y2020
## 19996 y2020
## 19997 y2020
## 19998 y2020
## 19999 y2020
##                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                word
## 1                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           covid19
## 2                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           covid19
## 3                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           covid19
## 4                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            stigma
## 5                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #covid19
## 6                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            health
## 7                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fighting
## 8                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            health
## 9                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                de
## 10                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           stigma
## 11                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fighting
## 12                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           people
## 13                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ireland
## 14                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #covid19
## 15                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               de
## 16                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               la
## 17                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pandemic
## 18                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               le
## 19                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            covid
## 20                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ireland
## 21                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          vaccine
## 22                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            covid
## 23                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               la
## 24                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           people
## 25                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #covid19
## 26                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      coronavirus
## 27                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ontario
## 28                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ontario
## 29                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deaths
## 30                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              les
## 31                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              les
## 32                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             june
## 33                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           public
## 34                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            covid
## 35                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           people
## 36                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               en
## 37                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pandemic
## 38                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              due
## 39                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               de
## 40                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           canada
## 41                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               dr
## 42                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               le
## 43                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deaths
## 44                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           public
## 45                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              des
## 46                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             care
## 47                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         northern
## 48                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          workers
## 49                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              day
## 50                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             time
## 51                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #igstreet
## 52                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #photodocumentary
## 53                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           canada
## 54                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #urbanstreetphotography
## 55                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             care
## 56                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           health
## 57                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            death
## 58                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            total
## 59                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #urbanstreetphotogallery
## 60                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           social
## 61                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            virus
## 62                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              des
## 63                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               la
## 64                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             safe
## 65                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        confirmed
## 66                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           update
## 67                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vaccines
## 68                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          medical
## 69                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             it�s
## 70                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #bnw
## 71                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #bw
## 72                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ontario
## 73                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               en
## 74                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             home
## 75                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          vaccine
## 76                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          omicron
## 77                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       department
## 78                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #streetphotographer
## 79                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               du
## 80                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             home
## 81                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         northern
## 82                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      coronavirus
## 83                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        emergency
## 84                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            world
## 85                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pandemic
## 86                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lockdown
## 87                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reopening
## 88                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             stay
## 89                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       government
## 90                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         positive
## 91                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           spread
## 92                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              due
## 93                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             news
## 94                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               au
## 95                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pour
## 96                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wedding
## 97                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         positive
## 98                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             died
## 99                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         province
## 100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         testing
## 101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vaccination
## 102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crisis
## 103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            news
## 104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    restrictions
## 105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         support
## 106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              dr
## 107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        irelands
## 108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         service
## 109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hospital
## 110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dans
## 111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            data
## 112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        response
## 113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        positive
## 114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spread
## 115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        patients
## 116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            test
## 117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        minister
## 118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            week
## 119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      government
## 120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hospital
## 121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        minister
## 122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hospital
## 123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reported
## 124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         toronto
## 125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         medical
## 126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           april
## 127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      distancing
## 128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        patients
## 129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            plan
## 130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tests
## 131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         january
## 132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            stay
## 133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         booster
## 134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              bc
## 135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       community
## 136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           irish
## 137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           local
## 138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pas
## 139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pour
## 140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            time
## 141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          centre
## 142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pas
## 143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            risk
## 144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         service
## 145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             une
## 146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           chief
## 147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            days
## 148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #onpoli
## 149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         officer
## 150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       confirmed
## 151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              le
## 152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        business
## 153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      businesses
## 154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      healthcare
## 155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          online
## 156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            read
## 157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          safety
## 158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emergency
## 159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            it�s
## 160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            test
## 161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             cbc
## 162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          impact
## 163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hospitals
## 164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    restrictions
## 165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           virus
## 166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            city
## 167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fight
## 168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lockdown
## 169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         related
## 170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             les
## 171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tests
## 172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           chief
## 173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            team
## 174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            test
## 175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reported
## 176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             est
## 177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         testing
## 178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         january
## 179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            zone
## 180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        national
## 181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          reopen
## 182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             day
## 183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         workers
## 184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        canadian
## 185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            park
## 186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             qui
## 187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tested
## 188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           trump
## 189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      healthcare
## 190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          travel
## 191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            rate
## 192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              au
## 193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              du
## 194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reported
## 195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           staff
## 196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #lensculture�
## 197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #spicollective
## 198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           black
## 199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            days
## 200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         economy
## 201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          family
## 202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        irelands
## 203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           masks
## 204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mental
## 205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           weeks
## 206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dans
## 207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          record
## 208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              uk
## 209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          canada
## 210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        province
## 211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alberta
## 212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          change
## 213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          issues
## 214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       officials
## 215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         variant
## 216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          deaths
## 217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            news
## 218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #coronavirus
## 219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        continue
## 220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           don�t
## 221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            free
## 222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          friday
## 223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        industry
## 224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          qu�bec
## 225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      department
## 226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            plan
## 227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            team
## 228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tests
## 229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             des
## 230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             icu
## 231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         variant
## 232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @fordnation
## 233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             i�m
## 234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recovered
## 235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ford
## 236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       residents
## 237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            week
## 238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             due
## 239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quebec
## 240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vaccinated
## 241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         article
## 242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           d�c�s
## 243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              el
## 244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           staff
## 245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           doses
## 246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        measures
## 247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         officer
## 248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        province
## 249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reports
## 250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            stop
## 251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dose
## 252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vaccination
## 253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @realdonaldtrump
## 254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          global
## 255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        protests
## 256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          racism
## 257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vaccine
## 258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             est
## 259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quebec
## 260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            care
## 261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      government
## 262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ford
## 263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              il
## 264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          months
## 265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            moun
## 266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reports
## 267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            data
## 268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           irish
## 269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             jan
## 270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            safe
## 271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         toronto
## 272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           weeks
## 273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             day
## 274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            book
## 275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ce
## 276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            live
## 277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       officials
## 278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          regent
## 279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          return
## 280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        services
## 281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          summer
## 282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       community
## 283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            died
## 284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rollout
## 285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           total
## 286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pour
## 287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tested
## 288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            amid
## 289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         country
## 290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        economic
## 291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            food
## 292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     information
## 293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           march
## 294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        measures
## 295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        outbreak
## 296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        recovery
## 297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       situation
## 298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            toll
## 299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           visit
## 300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           we�re
## 301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           death
## 302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              se
## 303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          system
## 304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          update
## 305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @fordnation
## 306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #canada
## 307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pas
## 308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #spicollective�
## 309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            call
## 310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           learn
## 311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            life
## 312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        research
## 313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             qui
## 314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           south
## 315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             une
## 316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         testing
## 317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vaccines
## 318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       announced
## 319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             cas
## 320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         created
## 321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       essential
## 322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      guidelines
## 323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lives
## 324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mask
## 325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       personnes
## 326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sont
## 327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        canadian
## 328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              el
## 329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           homes
## 330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ne
## 331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ottawa
## 332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         schools
## 333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #cdnpoli
## 334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         disease
## 335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            time
## 336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         disease
## 337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        families
## 338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         holohan
## 339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         million
## 340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ont
## 341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            post
## 342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        recorded
## 343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        symptoms
## 344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tony
## 345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          travel
## 346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         updates
## 347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            wave
## 348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        continue
## 349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           surge
## 350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           world
## 351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             jan
## 352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            nova
## 353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    restrictions
## 354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       canadians
## 355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           child
## 356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         contact
## 357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        covid19�
## 358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           homes
## 359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             par
## 360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          school
## 361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             sur
## 362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #onpoli
## 363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         experts
## 364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        national
## 365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        response
## 366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            risk
## 367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            view
## 368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       including
## 369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            it�s
## 370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rapid
## 371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          scotia
## 372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             aux
## 373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           check
## 374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         experts
## 375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fear
## 376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hope
## 377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            line
## 378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ottawa
## 379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        physical
## 380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           start
## 381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          worker
## 382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         article
## 383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            life
## 384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            rate
## 385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          school
## 386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ontario
## 387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reporting
## 388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            avec
## 389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           daily
## 390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            link
## 391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             lot
## 392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        remember
## 393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              se
## 394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           stage
## 395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          system
## 396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           times
## 397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       announced
## 398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           daily
## 399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lives
## 400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        outbreak
## 401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         premier
## 402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         protect
## 403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             sur
## 404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #omicron
## 405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              en
## 406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          school
## 407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #canada
## 408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #socialdistancing
## 409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           can�t
## 410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          doctor
## 411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         federal
## 412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           phase
## 413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         special
## 414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            view
## 415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       yesterday
## 416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          you�re
## 417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @fordnation
## 418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            amid
## 419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         country
## 420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           don�t
## 421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          impact
## 422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            live
## 423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tested
## 424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          active
## 425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ontario
## 426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        children
## 427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         clients
## 428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             hit
## 429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        longterm
## 430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          market
## 431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           media
## 432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            the�
## 433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            told
## 434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            vous
## 435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     communities
## 436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          family
## 437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         million
## 438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          months
## 439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        negative
## 440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sont
## 441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vaccinations
## 442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            book
## 443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           don�t
## 444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         schools
## 445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @justintrudeau
## 446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #cdnpoli
## 447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #onpoli
## 448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         allowed
## 449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hard
## 450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           india
## 451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          living
## 452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            meet
## 453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ne
## 454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      provincial
## 455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           selon
## 456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             son
## 457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           south
## 458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           spike
## 459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            stop
## 460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           story
## 461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           study
## 462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alberta
## 463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        children
## 464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             i�m
## 465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           learn
## 466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          monday
## 467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             por
## 468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         receive
## 469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sick
## 470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        students
## 471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            the�
## 472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           times
## 473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vaccinated
## 474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        measures
## 475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          public
## 476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spread
## 477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            stop
## 478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          system
## 479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #covid19on
## 480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          active
## 481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        affected
## 482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        campaign
## 483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cancelled
## 484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      conditions
## 485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         efforts
## 486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          expert
## 487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hospitals
## 488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       including
## 489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             job
## 490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            join
## 491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ki
## 492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           let�s
## 493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            love
## 494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pand�mie
## 495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         protect
## 496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       residents
## 497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         results
## 498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              si
## 499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sign
## 500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          taking
## 501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            wait
## 502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        weddings
## 503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            york
## 504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             cas
## 505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       christmas
## 506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          curfew
## 507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           happy
## 508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   international
## 509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            read
## 510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            vous
## 511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         central
## 512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            home
## 513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            safe
## 514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sick
## 515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            stay
## 516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           virus
## 517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #featured
## 518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     519weddings
## 519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             age
## 520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           force
## 521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            jobs
## 522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            past
## 523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pays
## 524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          person
## 525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          photos
## 526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         premier
## 527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prevent
## 528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         protest
## 529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       protocols
## 530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ready
## 531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           share
## 532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         started
## 533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        students
## 534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             top
## 535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         virtual
## 536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         website
## 537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          centre
## 538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         control
## 539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hours
## 540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          issues
## 541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        longterm
## 542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lost
## 543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mental
## 544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         moderna
## 545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reporting
## 546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          social
## 547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         support
## 548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      travellers
## 549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         updates
## 550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              bc
## 551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       community
## 552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           death
## 553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          online
## 554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        patients
## 555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            plan
## 556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #gaybear
## 557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #gayottawa
## 558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #gaypuppy
## 559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ottawalife
## 560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #pupbear
## 561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #quarantinedpup
## 562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #toronto
## 563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        <u+2705>
## 564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         america
## 565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         control
## 566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         figures
## 567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           front
## 568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       frontline
## 569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        increase
## 570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ka
## 571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            move
## 572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          report
## 573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sale
## 574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         seniors
## 575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             set
## 576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       temporary
## 577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         today�s
## 578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              uk
## 579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           watch
## 580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            wear
## 581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #canada
## 582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       canadians
## 583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             cbc
## 584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           close
## 585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         figures
## 586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         holohan
## 587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      infections
## 588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             los
## 589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           north
## 590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          qu�bec
## 591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rules
## 592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       situation
## 593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            amid
## 594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          coming
## 595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            data
## 596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            days
## 597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          monday
## 598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           staff
## 599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        students
## 600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            week
## 601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         western
## 602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #blacklivesmatter
## 603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ago
## 604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       americans
## 605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          coming
## 606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       committee
## 607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       continues
## 608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              cp
## 609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         current
## 610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            doug
## 611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            feel
## 612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fund
## 613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gatherings
## 614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          here�s
## 615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hold
## 616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hours
## 617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            huge
## 618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      infections
## 619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leadership
## 620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            left
## 621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           month
## 622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           plans
## 623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              pm
## 624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ppe
## 625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         provide
## 626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        regional
## 627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        thursday
## 628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             to�
## 629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tracing
## 630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trudeau
## 631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      university
## 632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #news
## 633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       americans
## 634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           china
## 635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crisis
## 636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         current
## 637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        donnelly
## 638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dose
## 639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            doug
## 640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       executive
## 641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         federal
## 642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fight
## 643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      guidelines
## 644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         holiday
## 645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             icu
## 646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       questions
## 647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        received
## 648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           start
## 649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          strain
## 650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       announced
## 651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        continue
## 652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           doses
## 653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             est
## 654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                hospitalizations
## 655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          report
## 656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         support
## 657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        symptoms
## 658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    unvaccinated
## 659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #acros
## 660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #classicnegative
## 661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #covid
## 662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #humanpup
## 663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ldnont
## 664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #news
## 665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ak
## 666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         amazing
## 667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        attached
## 668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cette
## 669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     communities
## 670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         council
## 671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       countries
## 672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         doesn�t
## 673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       education
## 674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forward
## 675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           found
## 676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         migrant
## 677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         patient
## 678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            play
## 679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          policy
## 680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         program
## 681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      protection
## 682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rates
## 683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reuters
## 684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          safely
## 685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sports
## 686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         timmins
## 687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          todays
## 688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        uptodate
## 689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @globeandmail
## 690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #cdnpoli
## 691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #covid
## 692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          active
## 693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ago
## 694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       essential
## 695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            free
## 696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           india
## 697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       infection
## 698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             lot
## 699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        official
## 700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          online
## 701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            paul
## 702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            real
## 703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           trump
## 704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alberta
## 705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    appointments
## 706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       confirmed
## 707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         eastern
## 708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         medical
## 709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         million
## 710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          months
## 711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pcr
## 712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            rate
## 713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             une
## 714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           world
## 715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @cancovid
## 716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @celliottability
## 717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @covid19canada
## 718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jwoodgett
## 719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @moriartylab
## 720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #covid19ab
## 721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #humanpuppy
## 722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #instapuppy
## 723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #streetphotographer�
## 724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      additional
## 725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ahead
## 726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           avoid
## 727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             bad
## 728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bringing
## 729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       broadview
## 730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          called
## 731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         changed
## 732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        columbia
## 733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       customers
## 734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            date
## 735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         details
## 736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             die
## 737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fall
## 738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         keeping
## 739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     leslieville
## 740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           level
## 741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ministry
## 742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           monde
## 743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             nan
## 744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        planning
## 745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          prices
## 746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       provinces
## 747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quarantine
## 748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            real
## 749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          region
## 750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rules
## 751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         schools
## 752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sunday
## 753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wearing
## 754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         weekend
## 755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           women
## 756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ontario
## 757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          access
## 758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            city
## 759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       countries
## 760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              es
## 761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        families
## 762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             flu
## 763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           found
## 764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             hit
## 765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hope
## 766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             hse
## 767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     information
## 768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       isolation
## 769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ont
## 770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       outbreaks
## 771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            past
## 772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           plans
## 773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              pm
## 774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         related
## 775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          safety
## 776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stephen
## 777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           story
## 778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tuesday
## 779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            wave
## 780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             �t�
## 781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @justintrudeau
## 782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        admitted
## 783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           can�t
## 784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cent
## 785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        children
## 786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hospitals
## 787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              je
## 788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             qui
## 789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            risk
## 790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            wave
## 791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             art
## 792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          border
## 793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           build
## 794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            camp
## 795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           close
## 796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         excited
## 797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hand
## 798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       happening
## 799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hear
## 800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       infection
## 801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   international
## 802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            i�ve
## 803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         journal
## 804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             key
## 805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lowest
## 806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mais
## 807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        millions
## 808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          monday
## 809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           morts
## 810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nouveaux
## 811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          police
## 812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      protesting
## 813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quebec
## 814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       questions
## 815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          reduce
## 816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         remains
## 817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reporting
## 818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        republic
## 819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sales
## 820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    surveillance
## 821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thousands
## 822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tonight
## 823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tout
## 824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          united
## 825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         webinar
## 826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ceo
## 827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          coming
## 828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hard
## 829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        infected
## 830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              je
## 831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ltc
## 832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mandatory
## 833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           media
## 834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ni
## 835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            nous
## 836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ontarians
## 837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pays
## 838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         provide
## 839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       provinces
## 840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sant�
## 841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           study
## 842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tony
## 843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wrong
## 844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            call
## 845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          clinic
## 846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              dr
## 847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mild
## 848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            shot
## 849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           shots
## 850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          update
## 851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           weeks
## 852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #instagay
## 853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #ttc
## 854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #walkies
## 855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          access
## 856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          action
## 857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             air
## 858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     appointment
## 859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bring
## 860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          brings
## 861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            busy
## 862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        canada�s
## 863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       challenge
## 864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      challenges
## 865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           china
## 866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          closed
## 867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           comme
## 868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       companies
## 869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             con
## 870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             cut
## 871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        decision
## 872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  discrimination
## 873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            east
## 874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          events
## 875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         funding
## 876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          future
## 877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     governments
## 878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           guess
## 879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        guidance
## 880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           happy
## 881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             hey
## 882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            info
## 883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           issue
## 884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            juin
## 885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lead
## 886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          levels
## 887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             los
## 888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mandatory
## 889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          matter
## 890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mexico
## 891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mouri
## 892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ni
## 893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            nous
## 894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nursing
## 895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        personal
## 896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           proud
## 897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         release
## 898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        released
## 899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       riverdale
## 900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           robin
## 901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sant�
## 902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         science
## 903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sector
## 904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          senior
## 905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         society
## 906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       statement
## 907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            step
## 908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         success
## 909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          survey
## 910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           swann
## 911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            term
## 912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      understand
## 913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           youth
## 914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #health
## 915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         african
## 916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             aux
## 917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           black
## 918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        business
## 919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           can�t
## 920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          caught
## 921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           check
## 922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chiefs
## 923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          contre
## 924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        december
## 925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         doctors
## 926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dublin
## 927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           faire
## 928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          follow
## 929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          friday
## 930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mask
## 931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           masks
## 932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           month
## 933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             of�
## 934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             par
## 935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          police
## 936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      population
## 937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            post
## 938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pressure
## 939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      protection
## 940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         putting
## 941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         science
## 942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        services
## 943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           share
## 944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            shot
## 945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       statement
## 946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           takes
## 947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        teachers
## 948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vulnerable
## 949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            wait
## 950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          warned
## 951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           we�re
## 952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           won�t
## 953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          access
## 954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             age
## 955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        canadian
## 956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         control
## 957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            kids
## 958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           let�s
## 959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            live
## 960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           media
## 961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ne
## 962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           party
## 963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          person
## 964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              se
## 965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          social
## 966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           study
## 967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             sur
## 968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         toronto
## 969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tuesday
## 970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              tw
## 971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         workers
## 972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #yql
## 973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           added
## 974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          agency
## 975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           based
## 976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         calling
## 977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         company
## 978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        concerns
## 979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dead
## 980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           delay
## 981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          demand
## 982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          depuis
## 983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        director
## 984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dublin
## 985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      experience
## 986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         finally
## 987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       financial
## 988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           funds
## 989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         healthy
## 990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hundreds
## 991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              hydroxychloroquine
## 992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       isolation
## 993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            kids
## 994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             las
## 995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lost
## 996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lots
## 997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          moving
## 998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            m�me
## 999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nations
## 1000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       negative
## 1001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nurses
## 1002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            of�
## 1003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            por
## 1004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      president
## 1005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      providing
## 1006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        putting
## 1007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        records
## 1008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         result
## 1009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         resume
## 1010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rise
## 1011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           road
## 1012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         season
## 1013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       strategy
## 1014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     supporting
## 1015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           talk
## 1016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         that�s
## 1017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        transit
## 1018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           vote
## 1019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          warns
## 1020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            �t�
## 1021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @jkenney
## 1022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     additional
## 1023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        address
## 1024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            age
## 1025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ahead
## 1026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            air
## 1027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             bc
## 1028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           call
## 1029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       covid19�
## 1030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         doctor
## 1031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        friends
## 1032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          front
## 1033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         happen
## 1034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        illness
## 1035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            job
## 1036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            key
## 1037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kids
## 1038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           love
## 1039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          party
## 1040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            peu
## 1041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pfizer
## 1042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    politicians
## 1043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       question
## 1044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         remain
## 1045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         report
## 1046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       republic
## 1047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       research
## 1048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           slow
## 1049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sunday
## 1050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       symptoms
## 1051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thursday
## 1052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           told
## 1053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tomorrow
## 1054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           true
## 1055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        twitter
## 1056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          worse
## 1057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #onted
## 1058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     additional
## 1059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chief
## 1060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        current
## 1061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       eligible
## 1062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            flu
## 1063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hope
## 1064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            i�m
## 1065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       learning
## 1066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       minister
## 1067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       northern
## 1068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        premier
## 1069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     provincial
## 1070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           read
## 1071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       required
## 1072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        science
## 1073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       starting
## 1074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         travel
## 1075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             �a
## 1076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @torontostar
## 1077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        address
## 1078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         advice
## 1079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           and�
## 1080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       approach
## 1081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     assessment
## 1082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          blood
## 1083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          board
## 1084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brunswick
## 1085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          calls
## 1086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         circle
## 1087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deal
## 1088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         didn�t
## 1089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         donate
## 1090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      employees
## 1091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          enjoy
## 1092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             es
## 1093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          event
## 1094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      executive
## 1095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         extend
## 1096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          focus
## 1097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        friends
## 1098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            god
## 1099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   gouvernement
## 1100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           govt
## 1101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       grateful
## 1102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          green
## 1103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           half
## 1104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hamilton
## 1105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          house
## 1106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            icu
## 1107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        illness
## 1108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      increased
## 1109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       informed
## 1110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lack
## 1111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lol
## 1112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         london
## 1113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            low
## 1114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          means
## 1115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         middle
## 1116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        morning
## 1117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           note
## 1118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   organisation
## 1119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      outbreaks
## 1120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       petition
## 1121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           poor
## 1122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        project
## 1123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     protesters
## 1124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reason
## 1125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     restaurant
## 1126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        revenue
## 1127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           role
## 1128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           send
## 1129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           shut
## 1130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       speaking
## 1131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         street
## 1132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     struggling
## 1133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          teste
## 1134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tomorrow
## 1135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          track
## 1136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   transmission
## 1137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      treatment
## 1138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       visiting
## 1139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vulnerable
## 1140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wrong
## 1141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            yon
## 1142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        zealand
## 1143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             �a
## 1144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �the
## 1145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @francoislegault
## 1146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @justintrudeau
## 1147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #montreal
## 1148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        america
## 1149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            app
## 1150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             a�
## 1151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       capacity
## 1152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            con
## 1153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      couvrefeu
## 1154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       decision
## 1155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            del
## 1156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       detected
## 1157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dies
## 1158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dire
## 1159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        economy
## 1160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         effort
## 1161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        efforts
## 1162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    governments
## 1163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hear
## 1164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      including
## 1165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       increase
## 1166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          isn�t
## 1167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       learning
## 1168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           line
## 1169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mais
## 1170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        morning
## 1171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       notified
## 1172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       officers
## 1173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           para
## 1174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         policy
## 1175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      president
## 1176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      programme
## 1177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rates
## 1178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recovery
## 1179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        regions
## 1180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         result
## 1181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        results
## 1182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rise
## 1183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             si
## 1184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       starting
## 1185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        timmins
## 1186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          warns
## 1187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          women
## 1188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         worker
## 1189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      yesterday
## 1190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �coles
## 1191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #ontariolockdown
## 1192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       business
## 1193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             du
## 1194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          masks
## 1195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        morning
## 1196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      officials
## 1197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     population
## 1198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         record
## 1199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      situation
## 1200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         that�s
## 1201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thursday
## 1202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          visit
## 1203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #entertainment
## 1204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #health
## 1205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #india
## 1206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   announcement
## 1207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          apply
## 1208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             a�
## 1209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       breaking
## 1210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         capita
## 1211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        centres
## 1212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chinatown
## 1213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chsld
## 1214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        college
## 1215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         contre
## 1216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conversation
## 1217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         credit
## 1218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       critical
## 1219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          c�est
## 1220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deadly
## 1221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dealing
## 1222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       donation
## 1223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        edition
## 1224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ensure
## 1225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         facing
## 1226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      favourite
## 1227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fears
## 1228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         follow
## 1229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fun
## 1230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         giving
## 1231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          heart
## 1232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hse
## 1233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        impacts
## 1234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       infected
## 1235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 infrastructure
## 1236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         island
## 1237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            jun
## 1238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        limited
## 1239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          loved
## 1240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mass
## 1241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mayor
## 1242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           meat
## 1243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meeting
## 1244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mesures
## 1245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        network
## 1246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          night
## 1247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nouvo
## 1248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nova
## 1249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       offering
## 1250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       official
## 1251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ontarios
## 1252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           page
## 1253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pay
## 1254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         period
## 1255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    postcovid19
## 1256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          press
## 1257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pretty
## 1258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       provided
## 1259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         recent
## 1260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       register
## 1261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         relief
## 1262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         remain
## 1263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reopens
## 1264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    researchers
## 1265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            run
## 1266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scarborough
## 1267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           shop
## 1268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    significant
## 1269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             st
## 1270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stores
## 1271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           task
## 1272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tax
## 1273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       teachers
## 1274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           true
## 1275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        twitter
## 1276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   unemployment
## 1277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            utc
## 1278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vancouver
## 1279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          venue
## 1280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          video
## 1281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       watching
## 1282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          white
## 1283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            �we
## 1284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @jkwanmd
## 1285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covid19ab
## 1286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #featured
## 1287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #staysafe
## 1288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0001f1e8><u+0001f1e6>
## 1289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       advisory
## 1290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         africa
## 1291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arrived
## 1292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       breaking
## 1293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        calgary
## 1294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ce
## 1295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chance
## 1296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         closed
## 1297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       concerns
## 1298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      continues
## 1299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         depuis
## 1300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        details
## 1301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      education
## 1302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          entre
## 1303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flights
## 1304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      frontline
## 1305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         global
## 1306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        health�
## 1307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            in�
## 1308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           join
## 1309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         living
## 1310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         market
## 1311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          night
## 1312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nursing
## 1313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     paramedics
## 1314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       petition
## 1315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       priority
## 1316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      protocols
## 1317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       provided
## 1318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         recent
## 1319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           reid
## 1320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       remember
## 1321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shots
## 1322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spreading
## 1323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      thousands
## 1324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        updated
## 1325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        virtual
## 1326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        warning
## 1327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             �a
## 1328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #polqc
## 1329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    appointment
## 1330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         called
## 1331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           city
## 1332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          close
## 1333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      completed
## 1334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           doug
## 1335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ford
## 1336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           free
## 1337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         friday
## 1338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     healthcare
## 1339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   hospitalized
## 1340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        illness
## 1341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         impact
## 1342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     infections
## 1343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          learn
## 1344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       montreal
## 1345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             og
## 1346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pfizer
## 1347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           play
## 1348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     protection
## 1349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         region
## 1350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        release
## 1351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         safety
## 1352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            son
## 1353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          surge
## 1354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          total
## 1355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           true
## 1356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @johntory
## 1357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @topublichealth
## 1358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #bollywood
## 1359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #instabear
## 1360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #pupplay�
## 1361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #stayhome
## 1362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            24h
## 1363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          agree
## 1364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           alex
## 1365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        average
## 1366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ayiti
## 1367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beginning
## 1368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bilan
## 1369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         brazil
## 1370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         caught
## 1371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cdc
## 1372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ces
## 1373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chinese
## 1374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cities
## 1375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          class
## 1376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dates
## 1377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            del
## 1378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       distance
## 1379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       downtown
## 1380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           drop
## 1381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dying
## 1382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         effect
## 1383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         encore
## 1384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         expect
## 1385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exposed
## 1386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     facilities
## 1387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       facility
## 1388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           farm
## 1389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         george
## 1390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grand
## 1391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         happen
## 1392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         harris
## 1393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           held
## 1394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        helping
## 1395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         heures
## 1396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         highly
## 1397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hot
## 1398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     infectious
## 1399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            in�
## 1400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           john
## 1401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       launched
## 1402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          limit
## 1403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           main
## 1404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          major
## 1405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mspp
## 1406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nation
## 1407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nombre
## 1408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         normal
## 1409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           para
## 1410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parking
## 1411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          photo
## 1412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      practices
## 1413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          price
## 1414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        private
## 1415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        process
## 1416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       projects
## 1417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quickly
## 1418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           race
## 1419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         raison
## 1420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rallies
## 1421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reality
## 1422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        regions
## 1423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             rt
## 1424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             sa
## 1425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       saturday
## 1426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       security
## 1427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shopping
## 1428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sick
## 1429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         simply
## 1430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           site
## 1431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         source
## 1432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spreading
## 1433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        station
## 1434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stats
## 1435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         steady
## 1436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          store
## 1437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        studies
## 1438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    surrounding
## 1439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     technology
## 1440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trial
## 1441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tuesday
## 1442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          units
## 1443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wage
## 1444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wednesday
## 1445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            wfh
## 1446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        windsor
## 1447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          won�t
## 1448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        worried
## 1449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           zoom
## 1450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #covid19ontario
## 1451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #polqc
## 1452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #vaccine
## 1453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   administered
## 1454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         advice
## 1455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             al
## 1456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alert
## 1457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       announce
## 1458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           avec
## 1459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          begin
## 1460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       canada�s
## 1461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chair
## 1462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         change
## 1463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      committee
## 1464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        contact
## 1465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           date
## 1466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dec
## 1467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       declared
## 1468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doesn�t
## 1469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dying
## 1470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         effect
## 1471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       extended
## 1472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         facing
## 1473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fear
## 1474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           feel
## 1475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          folks
## 1476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        forward
## 1477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          guess
## 1478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           head
## 1479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       holidays
## 1480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           idea
## 1481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            las
## 1482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          leave
## 1483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           left
## 1484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          light
## 1485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           link
## 1486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          local
## 1487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lockdowns
## 1488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          loved
## 1489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     maintenant
## 1490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          major
## 1491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          makes
## 1492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         manage
## 1493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mass
## 1494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         matter
## 1495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mesures
## 1496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nations
## 1497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nphet
## 1498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           paid
## 1499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         person
## 1500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           poor
## 1501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      potential
## 1502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prevent
## 1503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        program
## 1504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     provincial
## 1505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     quarantine
## 1506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         region
## 1507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         relief
## 1508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           role
## 1509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       saturday
## 1510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           save
## 1511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sense
## 1512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         severe
## 1513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sign
## 1514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            son
## 1515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spike
## 1516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stories
## 1517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         taking
## 1518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        there�s
## 1519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tips
## 1520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tout
## 1521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            to�
## 1522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     travelling
## 1523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vacation
## 1524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vaccinate
## 1525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wear
## 1526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        weekend
## 1527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          worth
## 1528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    alzheimer�s
## 1529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        america
## 1530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        average
## 1531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     businesses
## 1532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        calling
## 1533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cest
## 1534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         change
## 1535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          child
## 1536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        contact
## 1537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         family
## 1538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fighting
## 1539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          folks
## 1540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           govt
## 1541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             il
## 1542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       increase
## 1543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    individuals
## 1544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      intensive
## 1545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        legault
## 1546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lot
## 1547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          major
## 1548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          money
## 1549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       negative
## 1550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parents
## 1551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pharmacy
## 1552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prevent
## 1553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        protect
## 1554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        provide
## 1555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       question
## 1556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       response
## 1557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rise
## 1558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sont
## 1559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tomorrow
## 1560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       variants
## 1561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         you�re
## 1562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @onthealth
## 1563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @pbethlenfalvy
## 1564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           @who
## 1565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #ppe
## 1566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #staysafe
## 1567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #usa
## 1568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f44d>
## 1569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f637>
## 1570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       activity
## 1571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       admitted
## 1572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         africa
## 1573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      afternoon
## 1574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       agencies
## 1575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      albertans
## 1576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       answered
## 1577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           baby
## 1578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         battle
## 1579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        biggest
## 1580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bill
## 1581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           body
## 1582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        calgary
## 1583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          camps
## 1584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       capacity
## 1585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      charities
## 1586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        charity
## 1587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       citizens
## 1588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         claims
## 1589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       closures
## 1590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           club
## 1591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  collaboration
## 1592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        concern
## 1593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      concerned
## 1594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         create
## 1595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decisions
## 1596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          delhi
## 1597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       delivery
## 1598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dies
## 1599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     difference
## 1600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        digital
## 1601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         direct
## 1602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doctors
## 1603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          doors
## 1604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          drive
## 1605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           drug
## 1606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          enter
## 1607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        evening
## 1608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          farms
## 1609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fast
## 1610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        feeling
## 1611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fewer
## 1612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     foundation
## 1613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         friend
## 1614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             f�
## 1615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hair
## 1616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hosted
## 1617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hour
## 1618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/01rmltvbex
## 1619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           idea
## 1620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ils
## 1621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       impacted
## 1622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inequality
## 1623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         inside
## 1624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ireland�
## 1625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          isn�t
## 1626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jadad
## 1627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jobless
## 1628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           july
## 1629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           late
## 1630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         leader
## 1631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        learned
## 1632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          light
## 1633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lose
## 1634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ltc
## 1635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mai
## 1636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mas
## 1637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            met
## 1638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       midnight
## 1639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mind
## 1640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           miss
## 1641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          named
## 1642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        niagara
## 1643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         office
## 1644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       partners
## 1645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pass
## 1646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         passed
## 1647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        picture
## 1648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         plants
## 1649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        players
## 1650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       policies
## 1651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     population
## 1652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  professionals
## 1653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        promise
## 1654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         racist
## 1655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recently
## 1656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                recommendations
## 1657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         record
## 1658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recycles
## 1659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      resources
## 1660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        respect
## 1661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          round
## 1662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sad
## 1663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         safest
## 1664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     scientists
## 1665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ses
## 1666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shared
## 1667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sharing
## 1668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shield
## 1669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       specific
## 1670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           spot
## 1671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     statistics
## 1672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stories
## 1673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         supply
## 1674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          takes
## 1675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        there�s
## 1676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        totally
## 1677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tour
## 1678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tous
## 1679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     transplant
## 1680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trend
## 1681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          truth
## 1682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             tv
## 1683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            vin
## 1684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       visitors
## 1685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     volunteers
## 1686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          walks
## 1687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           warn
## 1688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         weekly
## 1689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          we�ve
## 1690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         what�s
## 1691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         winter
## 1692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        workday
## 1693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          worry
## 1694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          worth
## 1695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            wow
## 1696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @citynewsmtl
## 1697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @torontostar
## 1698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #pandemic
## 1699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #stayhome
## 1700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #stopthespread
## 1701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f9a0>
## 1702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          added
## 1703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          agree
## 1704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      albertans
## 1705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          amgmt
## 1706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           and�
## 1707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          apr�s
## 1708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          avoir
## 1709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           beds
## 1710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          break
## 1711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bring
## 1712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cancer
## 1713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cest
## 1714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          comme
## 1715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cope
## 1716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deal
## 1717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            die
## 1718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dit
## 1719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         double
## 1720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         encore
## 1721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            eve
## 1722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        evening
## 1723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       expected
## 1724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     facilities
## 1725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         failed
## 1726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          false
## 1727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        finally
## 1728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           food
## 1729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hamilton
## 1730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        healthy
## 1731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        helping
## 1732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         here�s
## 1733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           he�s
## 1734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kenney
## 1735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        learned
## 1736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         levels
## 1737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        message
## 1738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             mi
## 1739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           move
## 1740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           m�me
## 1741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        network
## 1742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pand�mie
## 1743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pcr
## 1744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       publique
## 1745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quickly
## 1746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      qu�b�cois
## 1747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      receiving
## 1748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reduce
## 1749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        require
## 1750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       required
## 1751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rising
## 1752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       scotland
## 1753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         senior
## 1754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         simple
## 1755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spent
## 1756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        started
## 1757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   surveillance
## 1758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         that�s
## 1759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tous
## 1760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   transmission
## 1761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          union
## 1762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           unit
## 1763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         united
## 1764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vaccin
## 1765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          visit
## 1766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        waiting
## 1767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wearing
## 1768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        website
## 1769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ya
## 1770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         you�re
## 1771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �the
## 1772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @ctvnews
## 1773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ctvtoronto
## 1774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #bcpoli
## 1775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #covid
## 1776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covid19on
## 1777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #covid19ontario
## 1778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #lockdown
## 1779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     absolutely
## 1780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             au
## 1781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          avoid
## 1782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          break
## 1783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       breaking
## 1784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       capacity
## 1785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cbc
## 1786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           died
## 1787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       djokovic
## 1788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         effect
## 1789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       families
## 1790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        federal
## 1791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         france
## 1792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         global
## 1793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gyms
## 1794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hey
## 1795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          human
## 1796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        impacts
## 1797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         indoor
## 1798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       infected
## 1799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           info
## 1800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lab
## 1801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       labrador
## 1802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lake
## 1803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         living
## 1804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lockdown
## 1805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mask
## 1806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ottawa
## 1807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pei
## 1808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      postponed
## 1809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          power
## 1810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      protocols
## 1811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         qu�bec
## 1812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         refuse
## 1813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reports
## 1814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       research
## 1815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   saskatchewan
## 1816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             si
## 1817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             st
## 1818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           step
## 1819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stigma
## 1820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           team
## 1821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wear
## 1822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wife
## 1823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         winter
## 1824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �the
## 1825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cdnchange
## 1826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @jkwanmd
## 1827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @uoftdlsph
## 1828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #brampton
## 1829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #pandemic
## 1830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #polqc
## 1831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #yyc
## 1832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f9a0>
## 1833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+2764><u+fe0f>
## 1834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            2nd
## 1835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        account
## 1836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         afraid
## 1837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            aid
## 1838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             al
## 1839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         amidst
## 1840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     antiracism
## 1841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        appears
## 1842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   appointments
## 1843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          apr�s
## 1844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           army
## 1845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         attend
## 1846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         august
## 1847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bank
## 1848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          beach
## 1849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          begin
## 1850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        belfast
## 1851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       benefits
## 1852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bien
## 1853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bio
## 1854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          boost
## 1855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brampton
## 1856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       briefing
## 1857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brought
## 1858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         budget
## 1859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cancel
## 1860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         charge
## 1861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        classic
## 1862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          clean
## 1863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cleaning
## 1864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         clinic
## 1865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    confinement
## 1866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contracted
## 1867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         corona
## 1868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       couldn�t
## 1869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         couple
## 1870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crazy
## 1871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dangerous
## 1872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           debt
## 1873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dental
## 1874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deputy
## 1875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    development
## 1876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diagnosed
## 1877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      difficult
## 1878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       disaster
## 1879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             disproportionately
## 1880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dog
## 1881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       donating
## 1882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          donor
## 1883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       draaisma
## 1884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ease
## 1885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         easing
## 1886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      effective
## 1887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    electricity
## 1888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          email
## 1889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       entering
## 1890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          entry
## 1891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       epidemic
## 1892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       evidence
## 1893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    experiences
## 1894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        extends
## 1895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         failed
## 1896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fait
## 1897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fan
## 1898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          field
## 1899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          floyd
## 1900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            flu
## 1901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fraud
## 1902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fresh
## 1903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gas
## 1904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           glad
## 1905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grant
## 1906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       handling
## 1907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       happened
## 1908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           head
## 1909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hits
## 1910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/7m1hidaycr
## 1911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     identified
## 1912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        include
## 1913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     innovation
## 1914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            i�d
## 1915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        justice
## 1916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       launches
## 1917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leaders
## 1918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leading
## 1919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       learning
## 1920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           list
## 1921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         listen
## 1922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lockdowns
## 1923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        massive
## 1924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        michael
## 1925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          money
## 1926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       montreal
## 1927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mother
## 1928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         muriel
## 1929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          north
## 1930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       november
## 1931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            oil
## 1932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ontarians
## 1933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    opportunity
## 1934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  organizations
## 1935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       overdose
## 1936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             o�
## 1937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pandemic�
## 1938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          paper
## 1939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          parks
## 1940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        partner
## 1941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       payments
## 1942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    photography
## 1943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        planned
## 1944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        playing
## 1945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           port
## 1946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        poverty
## 1947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ppl
## 1948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          prime
## 1949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prison
## 1950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      published
## 1951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       question
## 1952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        recover
## 1953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            red
## 1954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      relatives
## 1955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        respond
## 1956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reveals
## 1957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         review
## 1958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rt�s
## 1959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        running
## 1960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           save
## 1961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         scotia
## 1962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        seeking
## 1963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          seeks
## 1964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        selling
## 1965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sense
## 1966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      september
## 1967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sex
## 1968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          signs
## 1969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        similar
## 1970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      solutions
## 1971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          speed
## 1972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          steps
## 1973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stream
## 1974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         studio
## 1975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     successful
## 1976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sud
## 1977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        talking
## 1978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tech
## 1979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thinking
## 1980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         thread
## 1981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tips
## 1982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          urged
## 1983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          vague
## 1984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        version
## 1985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         visits
## 1986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vitamin
## 1987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        waiting
## 1988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wake
## 1989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          water
## 1990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       waterloo
## 1991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wondering
## 1992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          worse
## 1993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          worst
## 1994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @lplapresse
## 1995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @realdonaldtrump
## 1996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ableg
## 1997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #confinement
## 1998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #covidvaccine
## 1999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #india
## 2000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #mentalhealth
## 2001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #toronto
## 2002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            1st
## 2003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            act
## 2004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         action
## 2005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       airlines
## 2006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        amazing
## 2007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aren�t
## 2008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          based
## 2009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        british
## 2010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        calling
## 2011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cette
## 2012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      challenge
## 2013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     challenges
## 2014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          child
## 2015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      childrens
## 2016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       closures
## 2017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       complete
## 2018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   construction
## 2019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       contacts
## 2020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decisions
## 2021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          delay
## 2022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      difficult
## 2023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       director
## 2024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           easy
## 2025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      employees
## 2026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     experience
## 2027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        explain
## 2028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fast
## 2029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         friend
## 2030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         future
## 2031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           game
## 2032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        germany
## 2033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        growing
## 2034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           huge
## 2035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             il
## 2036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     increasing
## 2037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    individuals
## 2038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           info
## 2039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          issue
## 2040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            law
## 2041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leaders
## 2042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        legault
## 2043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           list
## 2044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      listening
## 2045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             lo
## 2046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          march
## 2047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nation
## 2048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   nonessential
## 2049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nova
## 2050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         office
## 2051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             og
## 2052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ontario�s
## 2053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             o�
## 2054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         passed
## 2055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        patient
## 2056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pay
## 2057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           peak
## 2058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       personal
## 2059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          prior
## 2060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        process
## 2061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      published
## 2062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          radio
## 2063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rapid
## 2064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recorded
## 2065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        records
## 2066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        release
## 2067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       released
## 2068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         remote
## 2069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         review
## 2070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        running
## 2071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sad
## 2072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   saskatchewan
## 2073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         season
## 2074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        seniors
## 2075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            set
## 2076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       speaking
## 2077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          speed
## 2078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spending
## 2079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stopping
## 2080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       suggests
## 2081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           term
## 2082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           toll
## 2083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            top
## 2084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tracing
## 2085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      travelled
## 2086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vacciner
## 2087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vaccins
## 2088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          video
## 2089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          voice
## 2090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wales
## 2091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wednesday
## 2092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           west
## 2093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          white
## 2094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      worldwide
## 2095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           york
## 2096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �tude
## 2097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @cp24
## 2098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @francoislegault
## 2099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @intouchwit
## 2100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @merlinofcanada
## 2101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #quebec
## 2102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #vaccination
## 2103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+27a1><u+fe0f>
## 2104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     admissions
## 2105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ages
## 2106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        antigen
## 2107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           avec
## 2108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bearskin
## 2109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        boosted
## 2110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          brain
## 2111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cancer
## 2112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         centre
## 2113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cette
## 2114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cold
## 2115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         counts
## 2116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ctv
## 2117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deal
## 2118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        details
## 2119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      education
## 2120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      effective
## 2121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         entire
## 2122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exemption
## 2123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           feel
## 2124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fight
## 2125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         follow
## 2126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          found
## 2127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      happening
## 2128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          happy
## 2129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hard
## 2130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           held
## 2131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     identified
## 2132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           life
## 2133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           link
## 2134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           list
## 2135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          local
## 2136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mais
## 2137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mandates
## 2138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mandatory
## 2139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          moves
## 2140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nations
## 2141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nurses
## 2142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ontarians
## 2143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           past
## 2144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pharmacies
## 2145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       policies
## 2146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pourquoi
## 2147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          range
## 2148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       received
## 2149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         recent
## 2150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        related
## 2151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        require
## 2152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    restaurants
## 2153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         return
## 2154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         status
## 2155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      surgeries
## 2156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      treatment
## 2157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             va
## 2158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vaxxed
## 2159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vulnerable
## 2160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wednesday
## 2161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          we�re
## 2162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            yrs
## 2163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @andreahorwath
## 2164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @andrewscheer
## 2165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           @cnn
## 2166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @govcanhealth
## 2167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @ongov
## 2168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @sflecce
## 2169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #business
## 2170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #community
## 2171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #dogsofinstagram
## 2172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #mask
## 2173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #medicine
## 2174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #museumathome
## 2175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #pharmacy
## 2176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #portmoody
## 2177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #portmoodyheritagesociety
## 2178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #portmoodystationmuseum
## 2179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #vancouver
## 2180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f60a>
## 2181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            4th
## 2182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          abuse
## 2183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      accepting
## 2184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            act
## 2185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        actions
## 2186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         agenda
## 2187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alert
## 2188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alors
## 2189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       american
## 2190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          anger
## 2191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      announces
## 2192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       approved
## 2193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aquatic
## 2194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           are�
## 2195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arrived
## 2196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      autorit�s
## 2197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          avant
## 2198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          avoir
## 2199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       backyard
## 2200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ban
## 2201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bans
## 2202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        billion
## 2203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bleach
## 2204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           blog
## 2205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bloomberg
## 2206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           born
## 2207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           boys
## 2208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        british
## 2209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bulletin
## 2210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        caution
## 2211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cent
## 2212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cest
## 2213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    challenging
## 2214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chance
## 2215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      childcare
## 2216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         church
## 2217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        classes
## 2218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     colleagues
## 2219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         compte
## 2220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        concert
## 2221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      conducted
## 2222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     continuing
## 2223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    contracting
## 2224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     councillor
## 2225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         county
## 2226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           curb
## 2227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dear
## 2228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       declared
## 2229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       decrease
## 2230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         denied
## 2231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       directly
## 2232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             dj
## 2233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dollars
## 2234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          drugs
## 2235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       durgence
## 2236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           duty
## 2237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        earlier
## 2238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eased
## 2239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       eligible
## 2240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      employers
## 2241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          empty
## 2242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        england
## 2243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ensuring
## 2244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    environment
## 2245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 epidemiologist
## 2246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             eu
## 2247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         europe
## 2248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   experiencing
## 2249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       explains
## 2250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       facebook
## 2251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        factors
## 2252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fallout
## 2253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fantastic
## 2254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         faster
## 2255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fatalities
## 2256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           film
## 2257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          final
## 2258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          firms
## 2259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          folks
## 2260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forced
## 2261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forget
## 2262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          glynn
## 2263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      groceries
## 2264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          helps
## 2265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          henry
## 2266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         heroes
## 2267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        history
## 2268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hopes
## 2269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hotel
## 2270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/71wy3ptizz.
## 2271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    immediately
## 2272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         immune
## 2273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     incredible
## 2274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         indoor
## 2275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      infect�es
## 2276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       involved
## 2277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          japan
## 2278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             je
## 2279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jfts
## 2280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         killed
## 2281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           king
## 2282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          korea
## 2283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lanes
## 2284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            law
## 2285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lawsuits
## 2286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        legault
## 2287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lens
## 2288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lessons
## 2289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lifted
## 2290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lines
## 2291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         linked
## 2292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lutte
## 2293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       majority
## 2294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          makes
## 2295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         manage
## 2296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       manitoba
## 2297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            map
## 2298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       midwives
## 2299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mike
## 2300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ministre
## 2301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 misinformation
## 2302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          moins
## 2303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mois
## 2304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mondiale
## 2305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mystery
## 2306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             nb
## 2307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            nos
## 2308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          offer
## 2309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ongoing
## 2310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ontario�s
## 2311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            on�
## 2312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         option
## 2313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   organization
## 2314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            oui
## 2315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          owner
## 2316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pakistan
## 2317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         paying
## 2318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        payment
## 2319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           peak
## 2320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           peel
## 2321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      personnel
## 2322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          piece
## 2323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pizza
## 2324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       platform
## 2325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     postponing
## 2326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          posts
## 2327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    precautions
## 2328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     previously
## 2329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       priority
## 2330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pro
## 2331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     procedures
## 2332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       progress
## 2333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           push
## 2334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             r0
## 2335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         racial
## 2336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rally
## 2337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rare
## 2338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reached
## 2339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       received
## 2340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     resilience
## 2341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    responsible
## 2342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    restaurants
## 2343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       revealed
## 2344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ronan
## 2345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          safer
## 2346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         samedi
## 2347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sanitizer
## 2348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   saskatchewan
## 2349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       scotland
## 2350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      screening
## 2351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sera
## 2352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         series
## 2353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        session
## 2354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         severe
## 2355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         single
## 2356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         slowly
## 2357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      snapshots
## 2358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         snitch
## 2359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           song
## 2360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          space
## 2361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spark
## 2362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sport
## 2363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stands
## 2364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       starting
## 2365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         starts
## 2366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stations
## 2367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       straight
## 2368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         strict
## 2369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       suggests
## 2370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          surge
## 2371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      surprised
## 2372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          theme
## 2373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          treat
## 2374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trust
## 2375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tune
## 2376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            t�t
## 2377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unique
## 2378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          urges
## 2379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vaccines
## 2380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            van
## 2381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      virtually
## 2382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wales
## 2383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           walk
## 2384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            war
## 2385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        warning
## 2386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           west
## 2387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      workplace
## 2388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wrote
## 2389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           zone
## 2390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             �i
## 2391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �tre
## 2392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @celliottability
## 2393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cmohalberta
## 2394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @lornenystrom
## 2395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @merlinofcanada
## 2396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #polcan
## 2397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #skpoli
## 2398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    accelerated
## 2399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            add
## 2400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        allowed
## 2401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ambulance
## 2402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       american
## 2403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   announcement
## 2404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      announces
## 2405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         answer
## 2406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       approach
## 2407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       approved
## 2408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        awesome
## 2409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bay
## 2410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beginning
## 2411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        benefit
## 2412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         breaks
## 2413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       building
## 2414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            buy
## 2415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         called
## 2416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          calls
## 2417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      canadiens
## 2418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         canad�
## 2419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      caribbean
## 2420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          casos
## 2421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chose
## 2422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       citizens
## 2423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          climb
## 2424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         clinic
## 2425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       clinical
## 2426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        closure
## 2427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           como
## 2428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        company
## 2429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     completely
## 2430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    confinement
## 2431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     continuing
## 2432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         couple
## 2433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         create
## 2434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          c�est
## 2435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dangerous
## 2436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       declares
## 2437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         demand
## 2438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        discuss
## 2439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dominican
## 2440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          drive
## 2441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        effects
## 2442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       endroits
## 2443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        england
## 2444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         expert
## 2445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         expos�
## 2446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      extremely
## 2447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           faux
## 2448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fermeture
## 2449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         flight
## 2450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          focus
## 2451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fuck
## 2452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           govt
## 2453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         growth
## 2454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hands
## 2455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       happened
## 2456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hockey
## 2457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hopes
## 2458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hot
## 2459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          house
## 2460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lzudvfrjnv"
## 2461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          human
## 2462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        imagine
## 2463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    immediately
## 2464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       immunity
## 2465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      incidence
## 2466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     infectious
## 2467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        inmates
## 2468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         issued
## 2469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           i�ve
## 2470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jobs
## 2471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           john
## 2472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           king
## 2473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lead
## 2474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          level
## 2475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        maladie
## 2476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          means
## 2477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mpp
## 2478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             nb
## 2479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         normal
## 2480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nurse
## 2481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nurses
## 2482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ongoing
## 2483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ou
## 2484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pandemia
## 2485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parents
## 2486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pass
## 2487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pero
## 2488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           peut
## 2489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        picture
## 2490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        players
## 2491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pourriez
## 2492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          power
## 2493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       practice
## 2494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   predeparture
## 2495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       programs
## 2496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      providing
## 2497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quand
## 2498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rampant
## 2499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          reach
## 2500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recently
## 2501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refusing
## 2502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        removed
## 2503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reuters
## 2504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           roll
## 2505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sector
## 2506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    significant
## 2507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         single
## 2508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        society
## 2509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        special
## 2510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spoke
## 2511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             st
## 2512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         status
## 2513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stayathome
## 2514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         strong
## 2515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         summer
## 2516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sun
## 2517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        surging
## 2518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           talk
## 2519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          teams
## 2520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          temps
## 2521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         threat
## 2522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          todos
## 2523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tool
## 2524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       toujours
## 2525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           trip
## 2526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trudeau
## 2527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unique
## 2528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  unprecedented
## 2529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             va
## 2530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vacationed
## 2531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vaccinating
## 2532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vacuna
## 2533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       veterans
## 2534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           warn
## 2535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        windsor
## 2536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   windsoressex
## 2537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         winter
## 2538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            won
## 2539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          worst
## 2540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          youth
## 2541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @erinotoole
## 2542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @googlenews
## 2543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @lornenystrom
## 2544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @thesispi
## 2545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #fordfailedkids
## 2546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #fordfailedthepeople
## 2547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #nomorelockdowns
## 2548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #ontarioschools
## 2549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f637>
## 2550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            1st
## 2551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aged
## 2552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          april
## 2553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arrival
## 2554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brunswick
## 2555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ce
## 2556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       citizens
## 2557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         closed
## 2558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           code
## 2559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    communities
## 2560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         comply
## 2561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            con
## 2562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     continuing
## 2563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       covid19�
## 2564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crisis
## 2565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         curfew
## 2566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          c�est
## 2567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dans
## 2568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       december
## 2569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          d�c�s
## 2570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             el
## 2571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      emergency
## 2572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      employees
## 2573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         encore
## 2574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        experts
## 2575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exposed
## 2576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         failed
## 2577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          faire
## 2578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        feeling
## 2579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        finally
## 2580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fine
## 2581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     guidelines
## 2582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           half
## 2583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      isolating
## 2584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      isolation
## 2585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          issue
## 2586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         issues
## 2587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            job
## 2588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kits
## 2589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           labs
## 2590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          level
## 2591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         linked
## 2592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       manitoba
## 2593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          march
## 2594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mental
## 2595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        moderna
## 2596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           move
## 2597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         moving
## 2598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       national
## 2599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   newfoundland
## 2600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             nl
## 2601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          north
## 2602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        officer
## 2603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     officially
## 2604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ou
## 2605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       outbreak
## 2606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            par
## 2607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        patient
## 2608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pay
## 2609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         policy
## 2610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      political
## 2611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        private
## 2612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       protocol
## 2613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      provinces
## 2614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           real
## 2615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recovered
## 2616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        regular
## 2617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rest
## 2618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rising
## 2619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           role
## 2620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sant�
## 2621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       saturday
## 2622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         simple
## 2623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           site
## 2624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stores
## 2625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          story
## 2626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         strong
## 2627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sunday
## 2628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         thread
## 2629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          times
## 2630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trudeau
## 2631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             tv
## 2632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     understand
## 2633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           unit
## 2634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            vax
## 2635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           vous
## 2636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          white
## 2637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     widespread
## 2638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          woman
## 2639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �tre
## 2640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cbchealth
## 2641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @cbcnews
## 2642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cityofnorthbay
## 2643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cityoftoronto
## 2644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @francoislegault
## 2645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @jennkfrench
## 2646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @keithbaldrey
## 2647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @lplapresse
## 2648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ottawahealth
## 2649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @samoosterhoff
## 2650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @steinibrown
## 2651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @thespec
## 2652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @youtube
## 2653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ableg
## 2654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #bc
## 2655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #compoundingpharmacy
## 2656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covid19qc
## 2657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #love
## 2658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #medication
## 2659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #nlpoli
## 2660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ottawa
## 2661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #pandemicpay
## 2662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #strongertogether
## 2663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #topoli
## 2664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #urbanstreetphotogallery�
## 2665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #yeg
## 2666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #ygk
## 2667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0001f1e8><u+0001f1e6>
## 2668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           12th
## 2669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            1st
## 2670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            5th
## 2671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     activities
## 2672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     admissions
## 2673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         admits
## 2674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adrian
## 2675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aller
## 2676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       allowing
## 2677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         amount
## 2678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        annonc�
## 2679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ans
## 2680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           anti
## 2681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     antistigma
## 2682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            app
## 2683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aren�t
## 2684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ass
## 2685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       assembly
## 2686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     assistance
## 2687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      attention
## 2688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aussi
## 2689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ave
## 2690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aware
## 2691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      awareness
## 2692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bar
## 2693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       barriers
## 2694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          basis
## 2695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bay
## 2696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beautiful
## 2697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         begins
## 2698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        benefit
## 2699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       birthday
## 2700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bit
## 2701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bmo
## 2702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bmw
## 2703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bodies
## 2704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bonne
## 2705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           boss
## 2706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          break
## 2707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bridge
## 2708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         br�sil
## 2709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       building
## 2710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        canadas
## 2711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cancer
## 2712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     catharines
## 2713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         caused
## 2714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      celebrate
## 2715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ceo
## 2716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cerb
## 2717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chercheurs
## 2718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chinas
## 2719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          claim
## 2720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       claiming
## 2721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       clinical
## 2722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        closure
## 2723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      combating
## 2724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     commercial
## 2725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  communication
## 2726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       compared
## 2727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       complete
## 2728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confident
## 2729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     confirmed�
## 2730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                congratulations
## 2731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     considered
## 2732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   construction
## 2733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       contacts
## 2734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       contract
## 2735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cord
## 2736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cost
## 2737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       counties
## 2738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          court
## 2739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cover
## 2740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       covering
## 2741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      coverings
## 2742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       creating
## 2743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crise
## 2744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crises
## 2745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          curve
## 2746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       customer
## 2747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         danger
## 2748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        decided
## 2749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deemed
## 2750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      delivered
## 2751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      derni�res
## 2752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       derri�re
## 2753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dimanche
## 2754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        discuss
## 2755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     discussing
## 2756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     discussion
## 2757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       diseases
## 2758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         double
## 2759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      drivethru
## 2760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          d�but
## 2761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           d�j�
## 2762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    effectively
## 2763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        elderly
## 2764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           elle
## 2765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       employee
## 2766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        enfants
## 2767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         entire
## 2768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            era
## 2769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         estate
## 2770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       expected
## 2771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        failure
## 2772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           faut
## 2773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      featuring
## 2774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fell
## 2775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fire
## 2776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           firm
## 2777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fitness
## 2778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        florida
## 2779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        focused
## 2780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fois
## 2781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         france
## 2782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fuck
## 2783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gain
## 2784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gathering
## 2785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           geri
## 2786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gonna
## 2787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gov�t
## 2788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gradually
## 2789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grants
## 2790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        grocery
## 2791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         guests
## 2792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      haldimand
## 2793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hall
## 2794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         halton
## 2795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hands
## 2796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           has�
## 2797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ha�ti
## 2798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hearing
## 2799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        helpful
## 2800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hitting
## 2801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                hospitalization
## 2802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   hospitalized
## 2803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hosting
## 2804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hotels
## 2805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      household
## 2806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        housing
## 2807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hpsc
## 2808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/qcj0pttkn1
## 2809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/urygcelnfi
## 2810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hub
## 2811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      humphreys
## 2812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ice
## 2813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       identify
## 2814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     importance
## 2815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        improve
## 2816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       included
## 2817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     incredibly
## 2818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     indigenous
## 2819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        indiqu�
## 2820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      infecting
## 2821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     initiative
## 2822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      insurance
## 2823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      interview
## 2824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            it�
## 2825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           joke
## 2826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         justin
## 2827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kills
## 2828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             kr
## 2829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        landing
## 2830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         launch
## 2831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lcbo
## 2832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          leave
## 2833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         letter
## 2834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lift
## 2835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lifting
## 2836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       listings
## 2837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           li�s
## 2838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             lo
## 2839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     maintenant
## 2840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        maladie
## 2841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mercredi
## 2842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mixtape
## 2843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       montr�al
## 2844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mort
## 2845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mouri24
## 2846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      municipal
## 2847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          music
## 2848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nest
## 2849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nigeria
## 2850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         notice
## 2851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       notified
## 2852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ns
## 2853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ny
## 2854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        offered
## 2855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     officially
## 2856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        onetime
## 2857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      operating
## 2858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        outdoor
## 2859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           paid
## 2860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parties
## 2861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          party
## 2862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         patios
## 2863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          peace
## 2864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      permanent
## 2865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      permitted
## 2866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        persons
## 2867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    perspective
## 2868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pick
## 2869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      political
## 2870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pool
## 2871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       positifs
## 2872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  postsecondary
## 2873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      potential
## 2874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pourrait
## 2875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pozitif
## 2876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       practice
## 2877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prepared
## 2878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      preparing
## 2879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    prestations
## 2880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prevented
## 2881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        product
## 2882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           prof
## 2883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       programs
## 2884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prolonger
## 2885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    propagation
## 2886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       property
## 2887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       proposed
## 2888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       protocol
## 2889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      provision
## 2890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          qu�il
## 2891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          raise
## 2892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        receive
## 2893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reform
## 2894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    regulations
## 2895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         relies
## 2896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reminder
## 2897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        removed
## 2898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reopened
## 2899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      responses
## 2900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ride
## 2901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rights
## 2902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          risks
## 2903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sans
## 2904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sat
## 2905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      scheduled
## 2906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          serve
## 2907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       settings
## 2908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sexual
## 2909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shown
## 2910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shutdown
## 2911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          simon
## 2912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           slow
## 2913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           soap
## 2914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sources
## 2915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          speak
## 2916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     specialist
## 2917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spend
## 2918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spending
## 2919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spring
## 2920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       standard
## 2921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           star
## 2922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stock
## 2923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stopped
## 2924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         strong
## 2925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       struggle
## 2926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stupid
## 2927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       survived
## 2928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        systems
## 2929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          table
## 2930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          talks
## 2931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          terms
## 2932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       toujours
## 2933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tourism
## 2934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tourists
## 2935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tracers
## 2936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tracking
## 2937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trade
## 2938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 transportation
## 2939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     travelling
## 2940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ttc
## 2941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      umbilical
## 2942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unable
## 2943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     underlying
## 2944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           unit
## 2945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        updated
## 2946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          urban
## 2947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             va
## 2948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            vie
## 2949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       violence
## 2950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         warden
## 2951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wasn�t
## 2952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          we�ll
## 2953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   windsoressex
## 2954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wine
## 2955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wonderful
## 2956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           word
## 2957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wouldn�t
## 2958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         you�ve
## 2959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            �it
## 2960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @bctf
## 2961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bogochisaac
## 2962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cdnchange
## 2963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @erinotoole
## 2964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @intouchwit
## 2965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @johntory
## 2966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @youtube
## 2967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #covid19canada
## 2968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #lockdown
## 2969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #longtermcare
## 2970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #ontariolockdown
## 2971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #pandemie
## 2972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #physicaldistancing
## 2973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #topoli
## 2974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #virus
## 2975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f637>
## 2976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0648>
## 2977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+06a9><u+06d2>
## 2978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+2705>
## 2979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            2nd
## 2980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            3rd
## 2981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 administration
## 2982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       affected
## 2983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        airport
## 2984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        anxiety
## 2985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    authorities
## 2986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      authority
## 2987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bank
## 2988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bien
## 2989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bon
## 2990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           boss
## 2991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        britain
## 2992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          broke
## 2993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brought
## 2994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brunswick
## 2995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bubbles
## 2996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     businesses
## 2997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cabinet
## 2998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       campaign
## 2999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        canadas
## 3000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cancelled
## 3001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        capital
## 3002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         caused
## 3003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        centres
## 3004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      childcare
## 3005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         church
## 3006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cities
## 3007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     colleagues
## 3008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        college
## 3009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conditions
## 3010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    condolences
## 3011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      continued
## 3012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         contra
## 3013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    contracting
## 3014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cousin
## 3015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       covering
## 3016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ctv
## 3017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           curb
## 3018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          david
## 3019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dead
## 3020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dealing
## 3021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dear
## 3022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       delivery
## 3023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         didn�t
## 3024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      direction
## 3025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       distance
## 3026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       domestic
## 3027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       economic
## 3028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       election
## 3029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       eligible
## 3030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        enfants
## 3031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           este
## 3032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          event
## 3033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       evidence
## 3034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exposure
## 3035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        failure
## 3036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fair
## 3037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       february
## 3038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fin
## 3039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         flying
## 3040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ford�s
## 3041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         formal
## 3042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fort
## 3043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         france
## 3044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          funds
## 3045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gta
## 3046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           half
## 3047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      happening
## 3048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hay
## 3049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          heart
## 3050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           held
## 3051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          highs
## 3052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hillier
## 3053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hold
## 3054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               hospitalizations
## 3055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   hospitalized
## 3056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hour
## 3057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4m67s1we9k.
## 3058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/q2vg53xnam
## 3059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/qzyagwwfz5
## 3060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/woi0ka8i8n
## 3061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       h�pitaux
## 3062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ice
## 3063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     identified
## 3064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        impacts
## 3065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        initial
## 3066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        janvier
## 3067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jours
## 3068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        keeping
## 3069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          korea
## 3070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lack
## 3071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           late
## 3072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         latino
## 3073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                lavaldesrapides
## 3074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         leader
## 3075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     leadership
## 3076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leaving
## 3077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         letter
## 3078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           leur
## 3079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lies
## 3080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         locked
## 3081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         london
## 3082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lowest
## 3083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ma
## 3084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     management
## 3085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          manor
## 3086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         masque
## 3087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mayor
## 3088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meaning
## 3089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mexico
## 3090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        michael
## 3091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       michelle
## 3092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mind
## 3093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ministers
## 3094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        minutes
## 3095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           miss
## 3096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mistake
## 3097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      modelling
## 3098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          moins
## 3099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       montreal
## 3100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       multiple
## 3101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       m�decins
## 3102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          notre
## 3103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nouvelle
## 3104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       november
## 3105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    opportunity
## 3106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   organisation
## 3107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            oui
## 3108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    overwhelmed
## 3109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pandemics
## 3110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     passengers
## 3111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pearson
## 3112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         period
## 3113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pilot
## 3114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       planning
## 3115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           play
## 3116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        playing
## 3117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      political
## 3118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        popular
## 3119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       positivo
## 3120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      postponed
## 3121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pourquoi
## 3122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prayers
## 3123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prepared
## 3124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          price
## 3125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      professor
## 3126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      protected
## 3127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reason
## 3128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reckless
## 3129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       regional
## 3130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reopen
## 3131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      resources
## 3132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rest
## 3133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     restaurant
## 3134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    restaurants
## 3135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         return
## 3136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rugby
## 3137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           r�le
## 3138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         scared
## 3139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           seek
## 3140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      september
## 3141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       severity
## 3142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sewage
## 3143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sharing
## 3144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shutdown
## 3145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           site
## 3146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        slammed
## 3147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          soins
## 3148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         source
## 3149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          steps
## 3150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stress
## 3151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        suggest
## 3152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       supports
## 3153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sus
## 3154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             td
## 3155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             te
## 3156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tells
## 3157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          test�
## 3158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        they�re
## 3159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thinking
## 3160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          this�
## 3161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        today�s
## 3162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tough
## 3163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        treated
## 3164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      treatment
## 3165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trips
## 3166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trois
## 3167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             tv
## 3168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     understand
## 3169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          units
## 3170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          urged
## 3171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       variants
## 3172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vecteurs
## 3173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       violence
## 3174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      voluntary
## 3175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            vos
## 3176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          watch
## 3177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       watching
## 3178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         what�s
## 3179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          woman
## 3180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           word
## 3181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           zone
## 3182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             �i
## 3183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @citynewsto
## 3184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @sflecce
## 3185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @voiceoffranky
## 3186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #covidvaccine
## 3187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #fordfailedontario
## 3188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #getvaccinated
## 3189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #happynewyear
## 3190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #lifestyle
## 3191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #omnicron
## 3192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #pandemic
## 3193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #toronto
## 3194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+2705>
## 3195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           20th
## 3196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         accept
## 3197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ago
## 3198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            aka
## 3199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alert
## 3200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         answer
## 3201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        anxiety
## 3202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aware
## 3203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          based
## 3204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        billion
## 3205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        booking
## 3206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       boosters
## 3207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bring
## 3208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bringing
## 3209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           card
## 3210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cdc
## 3211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           chez
## 3212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          class
## 3213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       compared
## 3214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conditions
## 3215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        country
## 3216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           date
## 3217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dates
## 3218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deadly
## 3219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dining
## 3220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     discovered
## 3221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        effects
## 3222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             eh
## 3223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      estimated
## 3224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     facilities
## 3225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fda
## 3226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forced
## 3227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          games
## 3228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gop
## 3229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    governments
## 3230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grant
## 3231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hands
## 3232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hours
## 3233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           idea
## 3234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        imagine
## 3235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       inperson
## 3236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         island
## 3237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        isolate
## 3238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        janvier
## 3239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            joe
## 3240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               labradorgrenfell
## 3241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leading
## 3242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        liberal
## 3243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           line
## 3244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      listening
## 3245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lost
## 3246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lying
## 3247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mandate
## 3248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         market
## 3249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           math
## 3250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             mb
## 3251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           meet
## 3252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 misinformation
## 3253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           m�me
## 3254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            n95
## 3255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             nb
## 3256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          night
## 3257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           note
## 3258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         notice
## 3259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      personnel
## 3260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    politicians
## 3261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          popup
## 3262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           post
## 3263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       previous
## 3264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        primary
## 3265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        psykisk
## 3266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      published
## 3267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quickly
## 3268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ready
## 3269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        recover
## 3270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       remember
## 3271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reopen
## 3272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       resource
## 3273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         result
## 3274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        results
## 3275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rules
## 3276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       schedule
## 3277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         select
## 3278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sera
## 3279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         severe
## 3280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          start
## 3281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         starts
## 3282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       supposed
## 3283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         taking
## 3284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        telling
## 3285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          temps
## 3286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           told
## 3287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tonight
## 3288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tout
## 3289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          watch
## 3290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          won�t
## 3291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wrong
## 3292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      yesterday
## 3293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cmohalberta
## 3294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @colindmello
## 3295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @dolybegum
## 3296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @dpcdsbschools
## 3297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @epdevilla
## 3298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @etfopeel
## 3299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @globeandmail
## 3300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @healthmac
## 3301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @janephilpott
## 3302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @jkenney
## 3303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @jremarchant
## 3304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @missinewsroom
## 3305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nokhadakroub
## 3306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @oneducation
## 3307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @osstfd19
## 3308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @peeldailynews
## 3309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @peelschools
## 3310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @raymondchopc
## 3311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @regionofpeel
## 3312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @thewechu
## 3313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @vijaythanimpp
## 3314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #barrie
## 3315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #bearskennel
## 3316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #bizresilience
## 3317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #boxing
## 3318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #cbridge
## 3319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #churchbell
## 3320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #corona
## 3321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covid<u+30fc>19
## 3322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #covid19nfld
## 3323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #covid19ontario
## 3324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #covid19�
## 3325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #healthylifestyle
## 3326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #instabear�
## 3327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #lockdown
## 3328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #meditation
## 3329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #museumseh
## 3330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #mysterypicture
## 3331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #ontariospirit
## 3332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #peace
## 3333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #pride
## 3334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #pridemonth
## 3335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #realestate
## 3336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #stayinformed
## 3337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #who
## 3338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f914>
## 3339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            1pm
## 3340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           25th
## 3341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            7th
## 3342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            8th
## 3343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        abandon
## 3344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     absolutely
## 3345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       academic
## 3346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  accessibility
## 3347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  acknowledging
## 3348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            add
## 3349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adding
## 3350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      addressed
## 3351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     addressing
## 3352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        advance
## 3353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         advise
## 3354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         affect
## 3355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      affecting
## 3356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           afin
## 3357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        african
## 3358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       airports
## 3359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alarm
## 3360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alive
## 3361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       alliance
## 3362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         annual
## 3363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ann�e
## 3364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         answer
## 3365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      antiblack
## 3366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ap
## 3367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          apple
## 3368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    application
## 3369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   applications
## 3370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        applied
## 3371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arruda
## 3372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         artist
## 3373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    association
## 3374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      australia
## 3375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         author
## 3376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      authority
## 3377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          autre
## 3378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          award
## 3379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       battling
## 3380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          beats
## 3381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           beer
## 3382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        beijing
## 3383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bid
## 3384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bike
## 3385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       billions
## 3386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bonnie
## 3387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        booking
## 3388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        borders
## 3389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bottom
## 3390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            box
## 3391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      briefings
## 3392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             bs
## 3393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bullshit
## 3394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bungled
## 3395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          buses
## 3396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  b�n�ficiaires
## 3397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            car
## 3398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          catch
## 3399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chanson
## 3400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      childrens
## 3401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chine
## 3402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chose
## 3403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chris
## 3404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        circles
## 3405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        closing
## 3406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cluster
## 3407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       clusters
## 3408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        coaches
## 3409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          coast
## 3410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cold
## 3411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         combat
## 3412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         common
## 3413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      completed
## 3414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    complicated
## 3415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  comprehensive
## 3416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     concernant
## 3417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conclusion
## 3418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     confidence
## 3419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       confirms
## 3420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      contagion
## 3421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contagious
## 3422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        content
## 3423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        context
## 3424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cookies
## 3425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cool
## 3426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cope
## 3427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cops
## 3428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             coronavirusrelated
## 3429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          costs
## 3430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cours
## 3431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crawley
## 3432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crowd
## 3433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crowded
## 3434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crowds
## 3435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        culture
## 3436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       curbside
## 3437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         curfew
## 3438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dad
## 3439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           damn
## 3440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          david
## 3441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         death�
## 3442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       declares
## 3443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        delayed
## 3444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         delays
## 3445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       designed
## 3446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      desperate
## 3447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             di
## 3448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       diabetes
## 3449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      direction
## 3450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disabilities
## 3451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disability
## 3452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       disabled
## 3453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       district
## 3454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             dm
## 3455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      donations
## 3456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          doubt
## 3457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dreams
## 3458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          drops
## 3459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             d�
## 3460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           d�un
## 3461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          d�une
## 3462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eases
## 3463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        eastern
## 3464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       effected
## 3465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          elles
## 3466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      emotional
## 3467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ems
## 3468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        enforce
## 3469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          envoy
## 3470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       equality
## 3471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          essex
## 3472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           este
## 3473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       everyday
## 3474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      excellent
## 3475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     exhibition
## 3476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    experienced
## 3477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exposure
## 3478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       extended
## 3479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          extra
## 3480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            eye
## 3481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          faced
## 3482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        faculty
## 3483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          false
## 3484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         father
## 3485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           feed
## 3486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          files
## 3487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fin
## 3488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        finance
## 3489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fine
## 3490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fix
## 3491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           flat
## 3492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       focusing
## 3493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      followers
## 3494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        foreign
## 3495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      formation
## 3496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           for�
## 3497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fourth
## 3498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      framework
## 3499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fucking
## 3500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       generous
## 3501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gloves
## 3502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gmt
## 3503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           golf
## 3504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       goodness
## 3505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gov
## 3506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           grad
## 3507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        grapple
## 3508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        growing
## 3509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         growth
## 3510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gta
## 3511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          guard
## 3512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            guy
## 3513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         harder
## 3514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          have�
## 3515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         helped
## 3516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   highlighting
## 3517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     highlights
## 3518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hiv
## 3519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hoax
## 3520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        holding
## 3521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          holds
## 3522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hopkins
## 3523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/jtexzsg8e7
## 3524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hug
## 3525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          human
## 3526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hygiene
## 3527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ideas
## 3528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          image
## 3529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        imagine
## 3530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        impacto
## 3531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     impossible
## 3532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   impressions�
## 3533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       includes
## 3534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     individual
## 3535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           inmo
## 3536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     innovative
## 3537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       internet
## 3538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 interpretation
## 3539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      involving
## 3540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         issued
## 3541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            is�
## 3542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          italy
## 3543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           i�ll
## 3544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jean
## 3545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            joe
## 3546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          johns
## 3547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         joined
## 3548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    journalists
## 3549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          katie
## 3550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            kid
## 3551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        konfime
## 3552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               konfimep�toprens
## 3553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         korean
## 3554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         labour
## 3555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       language
## 3556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          latin
## 3557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        letting
## 3558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       liberals
## 3559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lies
## 3560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lieu
## 3561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          links
## 3562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      listening
## 3563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       location
## 3564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           loss
## 3565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         losses
## 3566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lundi
## 3567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lung
## 3568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lying
## 3569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      l�ontario
## 3570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      l�pid�mie
## 3571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mail
## 3572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        malades
## 3573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      malaspina
## 3574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        managed
## 3575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mardi
## 3576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mark
## 3577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         masque
## 3578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        masques
## 3579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          meals
## 3580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          meant
## 3581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       meetings
## 3582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        message
## 3583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         metric
## 3584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   metropolitan
## 3585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mild
## 3586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       military
## 3587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      minist�re
## 3588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        minutes
## 3589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mississauga
## 3590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mobile
## 3591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          model
## 3592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         moment
## 3593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          moody
## 3594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          moved
## 3595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 municipalities
## 3596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         murder
## 3597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      musicians
## 3598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         native
## 3599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nature
## 3600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       navigate
## 3601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nephew
## 3602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nervous
## 3603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nice
## 3604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        norfolk
## 3605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          notre
## 3606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nouvelle
## 3607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        operate
## 3608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     operations
## 3609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      operators
## 3610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        opinion
## 3611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       outcomes
## 3612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          panel
## 3613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     parliament
## 3614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    participate
## 3615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         partir
## 3616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    partnership
## 3617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           path
## 3618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          patio
## 3619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           paul
## 3620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       peaceful
## 3621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pendant
## 3622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pending
## 3623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peoples
## 3624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        perform
## 3625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        person�
## 3626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          phone
## 3627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        picking
## 3628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pleased
## 3629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           poll
## 3630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pop
## 3631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      positives
## 3632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      postponed
## 3633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        powell�
## 3634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prayers
## 3635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    predictions
## 3636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prevention
## 3637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pride
## 3638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        privacy
## 3639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      processes
## 3640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        produce
## 3641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     production
## 3642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   professional
## 3643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      professor
## 3644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      programme
## 3645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prot�ger
## 3646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        publish
## 3647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pushing
## 3648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    quarantaine
## 3649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quiet
## 3650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rapport
## 3651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          reach
## 3652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        realize
## 3653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reduced
## 3654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reducing
## 3655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     registered
## 3656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         remote
## 3657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reproductive
## 3658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        require
## 3659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       required
## 3660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         resort
## 3661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rest
## 3662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        restart
## 3663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        returns
## 3664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reveal
## 3665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            rid
## 3666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          riots
## 3667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rises
## 3668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rnaught�
## 3669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rule
## 3670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sadly
## 3671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          saved
## 3672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      secretary
## 3673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sectors
## 3674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       severity
## 3675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sha
## 3676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shields
## 3677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shift
## 3678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shutdowns
## 3679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         simple
## 3680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sit
## 3681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       slightly
## 3682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sobre
## 3683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       societal
## 3684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spoke
## 3685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stable
## 3686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stand
## 3687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      standards
## 3688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        staying
## 3689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stigmabase
## 3690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stigma�
## 3691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        streets
## 3692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     structural
## 3693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      submitted
## 3694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sufficient
## 3695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sun
## 3696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     supporters
## 3697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       surprise
## 3698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     surprising
## 3699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        surveys
## 3700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       survival
## 3701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      survivors
## 3702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          susan
## 3703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sympt�mes
## 3704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tackle
## 3705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           taux
## 3706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          taxes
## 3707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             te
## 3708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          teams
## 3709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      telegraph
## 3710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        telling
## 3711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          temps
## 3712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thankful
## 3713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          that�
## 3714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        they�re
## 3715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      threatens
## 3716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         timely
## 3717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tom
## 3718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        touched
## 3719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tough
## 3720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tourist
## 3721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           town
## 3722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trained
## 3723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           trip
## 3724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trumps
## 3725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   unacceptable
## 3726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          union
## 3727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   university�s
## 3728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  unprecedented
## 3729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unsafe
## 3730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unwell
## 3731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       upcoming
## 3732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       upgrades
## 3733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         urgent
## 3734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        useless
## 3735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         valued
## 3736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        variety
## 3737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          varun
## 3738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           vary
## 3739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        victims
## 3740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ville
## 3741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  visualization
## 3742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           voir
## 3743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        walking
## 3744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wanna
## 3745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      washrooms
## 3746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     widespread
## 3747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wife
## 3748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        windows
## 3749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          woman
## 3750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        worship
## 3751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wuhan
## 3752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            �in
## 3753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    �intertidal
## 3754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �realtime
## 3755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �tait
## 3756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @arrudahoracio
## 3757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @canadianglen
## 3758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cephealth
## 3759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @citimmcanada
## 3760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @citynews
## 3761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @dfisman
## 3762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @elisaperego78
## 3763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @haulerlong
## 3764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lonestarlivin
## 3765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @picardonhealth
## 3766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           @rfi
## 3767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ucpcaucus
## 3768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @wdgpublichealth
## 3769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #abpoli
## 3770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #alberta
## 3771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #bced
## 3772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #bcpoli
## 3773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #cdnhealth
## 3774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #coronavirus
## 3775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #covid19vaccine
## 3776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #dougford
## 3777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #hamont
## 3778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #team
## 3779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f447>
## 3780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f64f>
## 3781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f6a8>
## 3782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+062f><u+0631>
## 3783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0648><u+0627><u+06a9><u+0633><u+0646>
## 3784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          14day
## 3785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            20h
## 3786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ability
## 3787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         abroad
## 3788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       absolute
## 3789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     addressing
## 3790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           adds
## 3791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adhere
## 3792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     administer
## 3793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      advocates
## 3794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         albany
## 3795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        angeles
## 3796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     antibodies
## 3797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    appointment
## 3798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       approuv�
## 3799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       approves
## 3800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          april
## 3801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arrive
## 3802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    association
## 3803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      attention
## 3804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          avant
## 3805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        average
## 3806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          avoid
## 3807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            a�n
## 3808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           baby
## 3809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bars
## 3810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bas
## 3811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bed
## 3812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        beijing
## 3813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bell
## 3814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bharat
## 3815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        billion
## 3816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bit
## 3817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bloqu�
## 3818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           book
## 3819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bracing
## 3820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       briefing
## 3821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         broken
## 3822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          brown
## 3823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           camp
## 3824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       campagne
## 3825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        capitol
## 3826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         caring
## 3827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ces
## 3828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cet
## 3829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      childhood
## 3830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chinese
## 3831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         choose
## 3832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chris
## 3833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chsld
## 3834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         claims
## 3835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        climate
## 3836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clinics
## 3837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         combat
## 3838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         common
## 3839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      concerned
## 3840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conference
## 3841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     confidence
## 3842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       confirms
## 3843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contracted
## 3844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cost
## 3845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       countrys
## 3846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cover
## 3847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       creating
## 3848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       creative
## 3849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      criminals
## 3850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       critical
## 3851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cuando
## 3852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             da
## 3853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dad
## 3854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dance
## 3855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       daughter
## 3856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deadly
## 3857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deputy
## 3858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        develop
## 3859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      developed
## 3860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    development
## 3861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diagnosed
## 3862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     distancing
## 3863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   distribution
## 3864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       download
## 3865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         driver
## 3866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           drop
## 3867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�montre
## 3868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           east
## 3869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      effective
## 3870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     elementary
## 3871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    enforcement
## 3872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          enjoy
## 3873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ensure
## 3874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          enter
## 3875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       entering
## 3876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        episode
## 3877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     escalating
## 3878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           esta
## 3879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      estimates
## 3880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             eu
## 3881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exaggerated
## 3882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      excellent
## 3883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         expect
## 3884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    experiences
## 3885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          extra
## 3886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        extreme
## 3887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       facebook
## 3888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       facility
## 3889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         factor
## 3890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fait
## 3891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           faut
## 3892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        feeling
## 3893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           film
## 3894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fines
## 3895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fly
## 3896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fois
## 3897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forced
## 3898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forget
## 3899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fun
## 3900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gens
## 3901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gop
## 3902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grand
## 3903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           grim
## 3904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       guidance
## 3905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           h1n1
## 3906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hall
## 3907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       handling
## 3908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        heading
## 3909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hearing
## 3910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          helse
## 3911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          henry
## 3912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hey
## 3913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hill
## 3914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        history
## 3915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hits
## 3916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           host
## 3917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hoy
## 3918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/eghymg52cv
## 3919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/oifxqh9vxx
## 3920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ici
## 3921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ils
## 3922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        include
## 3923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       included
## 3924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       includes
## 3925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      increased
## 3926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       industry
## 3927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         israel
## 3928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            jab
## 3929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            joe
## 3930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jour
## 3931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kenora
## 3932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        killing
## 3933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kits
## 3934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         larger
## 3935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        largest
## 3936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          larry
## 3937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       launched
## 3938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          let�s
## 3939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lines
## 3940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        logique
## 3941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        louang�
## 3942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            low
## 3943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lutter
## 3944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             l�
## 3945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       maintain
## 3946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       manitoba
## 3947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mars
## 3948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        massive
## 3949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             mb
## 3950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        measure
## 3951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           meet
## 3952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mers
## 3953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mes
## 3954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ministre
## 3955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ministry
## 3956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        missing
## 3957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             mo
## 3958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mois
## 3959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mom
## 3960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         moment
## 3961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         morgue
## 3962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mother
## 3963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          moved
## 3964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ms
## 3965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          music
## 3966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ng
## 3967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nolan
## 3968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            nos
## 3969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nouvelles
## 3970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          offer
## 3971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        offered
## 3972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         offers
## 3973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         oneill
## 3974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ontarios
## 3975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            on�
## 3976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       operator
## 3977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        opinion
## 3978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           page
## 3979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          paper
## 3980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      paramedic
## 3981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           park
## 3982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        passent
## 3983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         paying
## 3984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pc
## 3985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        percent
## 3986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      personnel
## 3987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      personnes
## 3988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 pfizerbiontech
## 3989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          photo
## 3990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        placing
## 3991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pourront
## 3992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ppl
## 3993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    precautions
## 3994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pregnant
## 3995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       premi�re
## 3996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pressures
## 3997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prison
## 3998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      privilege
## 3999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       products
## 4000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        project
## 4001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          proof
## 4002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          prove
## 4003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   provincewide
## 4004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pushing
## 4005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             p�
## 4006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          queda
## 4007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quotidien
## 4008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          randy
## 4009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recommended
## 4010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 recordbreaking
## 4011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     remembered
## 4012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       resident
## 4013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         resign
## 4014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       resigned
## 4015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        respect
## 4016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         restos
## 4017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     retirement
## 4018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            rid
## 4019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          robin
## 4020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rolled
## 4021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rolling
## 4022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        r�cente
## 4023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         r�seau
## 4024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         safely
## 4025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sask
## 4026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     scientists
## 4027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         scotia
## 4028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       security
## 4029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        selfish
## 4030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sell
## 4031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          selon
## 4032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       semaines
## 4033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sept
## 4034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shares
## 4035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sharp
## 4036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shipment
## 4037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shocking
## 4038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          short
## 4039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shouldn�t
## 4040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           shut
## 4041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        similar
## 4042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sites
## 4043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           slap
## 4044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sports
## 4045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           spot
## 4046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        staying
## 4047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stepping
## 4048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stormont
## 4049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       strategy
## 4050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         street
## 4051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stupid
## 4052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             su
## 4053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sud
## 4054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suffering
## 4055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        summary
## 4056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          super
## 4057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        surgery
## 4058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    surrounding
## 4059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       survival
## 4060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          swann
## 4061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          table
## 4062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          talks
## 4063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        teacher
## 4064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        telling
## 4065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    temporarily
## 4066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         thread
## 4067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        totally
## 4068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tougher
## 4069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         toutes
## 4070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           town
## 4071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      traveling
## 4072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trust
## 4073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ucp
## 4074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   unacceptable
## 4075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    uncertainty
## 4076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     underlying
## 4077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   universities
## 4078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         uptake
## 4079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        urgency
## 4080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           veut
## 4081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       violated
## 4082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       waterloo
## 4083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         weekly
## 4084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        western
## 4085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          words
## 4086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            wow
## 4087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          zhgmt
## 4088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �les
## 4089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            �we
## 4090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @algonquintheatr
## 4091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @youtube
## 4092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #alberta
## 4093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #banffmountainfilmfestival
## 4094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #couvrefeu
## 4095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covid19ab
## 4096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #covid19nfld
## 4097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #covidvariant
## 4098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #dougford
## 4099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #health
## 4100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #ottcity
## 4101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #sports
## 4102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #staysafe
## 4103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #votefordout2022
## 4104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f9d0>
## 4105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           19th
## 4106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            2nd
## 4107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        actions
## 4108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   administered
## 4109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          agree
## 4110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            aid
## 4111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         amount
## 4112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      announces
## 4113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            app
## 4114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        article
## 4115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aussi
## 4116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     australian
## 4117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  automatically
## 4118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            aux
## 4119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bad
## 4120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        benefit
## 4121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blessed
## 4122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          board
## 4123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bonne
## 4124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bunch
## 4125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bye
## 4126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          calls
## 4127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         center
## 4128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      checklist
## 4129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          china
## 4130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chinas
## 4131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        classes
## 4132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clinics
## 4133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        closing
## 4134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conservative
## 4135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     considered
## 4136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    coronavirus
## 4137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        correct
## 4138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      countries
## 4139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coverage
## 4140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       covid�19
## 4141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       critical
## 4142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crois
## 4143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dear
## 4144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       decision
## 4145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          delta
## 4146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dementia
## 4147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deux
## 4148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diagnosed
## 4149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     discharges
## 4150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       diseases
## 4151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     distancing
## 4152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doctors
## 4153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     documented
## 4154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             es
## 4155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            eve
## 4156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         events
## 4157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exposure
## 4158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       facility
## 4159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fait
## 4160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fran�ois
## 4161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        friends
## 4162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      frontline
## 4163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   grandparents
## 4164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         growth
## 4165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          guess
## 4166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         halton
## 4167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         happen
## 4168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        haven�t
## 4169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          helse
## 4170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hit
## 4171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hitting
## 4172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hold
## 4173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hundreds
## 4174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ici
## 4175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       impacted
## 4176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    information
## 4177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         insane
## 4178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            it�
## 4179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            i�d
## 4180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           i�ve
## 4181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         killed
## 4182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   labconfirmed
## 4183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lack
## 4184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           late
## 4185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          legal
## 4186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          limit
## 4187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lol
## 4188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lots
## 4189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            low
## 4190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         memory
## 4191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mesures
## 4192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       military
## 4193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mind
## 4194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         missed
## 4195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       modified
## 4196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       morrison
## 4197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mother
## 4198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mutations
## 4199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           n95s
## 4200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nation
## 4201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nest
## 4202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ontarios
## 4203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ontario�s
## 4204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      outbreaks
## 4205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           paid
## 4206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      passeport
## 4207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       passport
## 4208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            peu
## 4209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         player
## 4210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        players
## 4211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pm
## 4212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       practice
## 4213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          prime
## 4214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pris
## 4215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        product
## 4216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        program
## 4217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             qr
## 4218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      questions
## 4219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rampant
## 4220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rates
## 4221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reality
## 4222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        receive
## 4223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      receiving
## 4224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recently
## 4225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recoveries
## 4226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        release<u+fe0f><u+20e3>
## 4227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         relief
## 4228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reopening
## 4229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reschedule
## 4230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      residents
## 4231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ridiculous
## 4232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rights
## 4233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            run
## 4234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sad
## 4235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            saq
## 4236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sarscov2
## 4237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      scheduled
## 4238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        seating
## 4239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        service
## 4240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            set
## 4241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           shut
## 4242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         simply
## 4243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         single
## 4244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         source
## 4245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spaces
## 4246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        started
## 4247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sun
## 4248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          super
## 4249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        talking
## 4250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tax
## 4251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       teachers
## 4252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tennis
## 4253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        they�re
## 4254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      thousands
## 4255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tickets
## 4256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tired
## 4257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tous
## 4258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       training
## 4259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   transmission
## 4260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          treat
## 4261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trump
## 4262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           type
## 4263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        updated
## 4264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vaccin
## 4265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vaccinal
## 4266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   vaccinations
## 4267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vaccins
## 4268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vaccin�s
## 4269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wait
## 4270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          warns
## 4271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        website
## 4272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            �we
## 4273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @billgates
## 4274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cathmckenna
## 4275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @cdnchamberofcom�s
## 4276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @cihiicis
## 4277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @citimmcanada
## 4278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cityofvancouver
## 4279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cphocanada
## 4280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @creativegroupin
## 4281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ctvbarrienews
## 4282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ctvottawa
## 4283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cybersoleil
## 4284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @dfisman
## 4285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @directtravelcan
## 4286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @directtravelinc
## 4287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dtvacations
## 4288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @googlenews
## 4289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ikeacanada
## 4290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jmcelroy
## 4291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @kellyclarkson
## 4292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @kflaph
## 4293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lesservicesdt
## 4294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @macleodlisa
## 4295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mathbernier
## 4296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @melindagates
## 4297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nationalpost
## 4298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @oprah
## 4299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @pattyhajdu
## 4300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rosiebarton
## 4301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @rtcom
## 4302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @stephenmcneil
## 4303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @unwomen
## 4304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @uoft
## 4305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #abpoli
## 4306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #alberta
## 4307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #alratv
## 4308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #assnat
## 4309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #blm
## 4310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #calgaryheartbeats
## 4311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #capitalpups
## 4312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #covid19canada
## 4313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #english
## 4314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #fitness
## 4315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #georgefloyd
## 4316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #german
## 4317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #germany�
## 4318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #goharshahi
## 4319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #hamont
## 4320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #heartbeatslive
## 4321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #iamauniversalsufi
## 4322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #idareyou
## 4323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #idareyoutolove
## 4324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #indigenoustourismbc
## 4325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #local
## 4326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #longtermcare
## 4327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #lovequotes
## 4328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #loveyourself
## 4329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #masks
## 4330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #mississauga
## 4331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #physicaldistancing
## 4332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #pigeon
## 4333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #pq
## 4334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #quarantine
## 4335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #quarantinelife
## 4336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #sixfeetapart
## 4337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #spain
## 4338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #spanish
## 4339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #stevensoncaraballo
## 4340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #tvanouvelles
## 4341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #uk
## 4342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #virus
## 4343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #whyeyecare
## 4344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #world
## 4345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #yaletown
## 4346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #younusalgohar
## 4347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #yvr
## 4348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f447>
## 4349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f44f>
## 4350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f489>
## 4351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f62d>
## 4352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f6a8>calgary
## 4353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           $22b
## 4354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           100k
## 4355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           10th
## 4356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           16th
## 4357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            20s
## 4358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           20th
## 4359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          24hrs
## 4360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             2e
## 4361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             3d
## 4362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           58pm
## 4363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            9th
## 4364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ability
## 4365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 accountability
## 4366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       accuracy
## 4367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       accurate
## 4368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          actor
## 4369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        actress
## 4370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adapting
## 4371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      adjusting
## 4372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adults
## 4373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      adversely
## 4374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       advocacy
## 4375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      advocates
## 4376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       affaires
## 4377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        affects
## 4378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         afford
## 4379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aimed
## 4380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ainsi
## 4381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           all�
## 4382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ambassador
## 4383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      amenities
## 4384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         angela
## 4385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      animation
## 4386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       announce
## 4387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        answers
## 4388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      antiasian
## 4389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     antiracist
## 4390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        anxiety
## 4391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     apparently
## 4392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           apps
## 4393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          arabe
## 4394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       argument
## 4395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arrive
## 4396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       articles
## 4397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        artwork
## 4398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ashley
## 4399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          assam
## 4400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      associate
## 4401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       assuming
## 4402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       attended
## 4403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      attribute
## 4404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aunz
## 4405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aura
## 4406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aurait
## 4407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          avait
## 4408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      batteries
## 4409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bear
## 4410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           beat
## 4411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     behaviours
## 4412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bigger
## 4413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bikes
## 4414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        biotech
## 4415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          blame
## 4416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          blind
## 4417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            blm
## 4418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           blue
## 4419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bobby
## 4420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bonus
## 4421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          brand
## 4422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bravo
## 4423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      broadband
## 4424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brothers
## 4425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brutality
## 4426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bubble
## 4427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bunch
## 4428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          burke
## 4429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         butter
## 4430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         buying
## 4431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           calm
## 4432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     candidates
## 4433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cardinal
## 4434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cards
## 4435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        careful
## 4436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     caregivers
## 4437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cases�
## 4438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        casinos
## 4439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         caucus
## 4440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        causing
## 4441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        central
## 4442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      certaines
## 4443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       certains
## 4444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chain
## 4445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chains
## 4446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chair
## 4447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chairs
## 4448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           chat
## 4449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chavez
## 4450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       checking
## 4451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chemicals
## 4452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         choose
## 4453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       choosing
## 4454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chosen
## 4455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          click
## 4456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        climate
## 4457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       climbing
## 4458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          clubs
## 4459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cmoh
## 4460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      coalition
## 4461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         coffee
## 4462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        comment
## 4463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      commented
## 4464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       comments
## 4465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     commitment
## 4466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        compare
## 4467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     compassion
## 4468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   compensation
## 4469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     completely
## 4470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conference
## 4471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confusion
## 4472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        conna�t
## 4473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        connect
## 4474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        conseil
## 4475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       constant
## 4476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    constrained
## 4477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      consumers
## 4478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 contaminations
## 4479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      continued
## 4480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  contributions
## 4481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     controlled
## 4482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      corporate
## 4483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        correct
## 4484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      correctly
## 4485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        corrupt
## 4486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cor�e
## 4487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cottage
## 4488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cough
## 4489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      country�s
## 4490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        courage
## 4491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coverage
## 4492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            covernationofficial
## 4493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 covid19related
## 4494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    credibility
## 4495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crucial
## 4496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cry
## 4497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cure
## 4498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cuts
## 4499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dan
## 4500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         daniel
## 4501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dare
## 4502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         debate
## 4503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deceased
## 4504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        decline
## 4505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dedication
## 4506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     delivering
## 4507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      democracy
## 4508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     democratic
## 4509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deployed
## 4510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dept
## 4511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         detect
## 4512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      determine
## 4513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deux
## 4514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deuxi�me
## 4515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      developed
## 4516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   developments
## 4517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        devenir
## 4518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diagnosis
## 4519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   difficulties
## 4520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      directory
## 4521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disappointed
## 4522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disinfectant
## 4523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       document
## 4524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            don
## 4525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         donald
## 4526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        donated
## 4527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        donn�es
## 4528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dos
## 4529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       download
## 4530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          drama
## 4531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         driven
## 4532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         drives
## 4533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        driving
## 4534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dun
## 4535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dune
## 4536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         durham
## 4537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�cembre
## 4538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�cision
## 4539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            d�s
## 4540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         d��tat
## 4541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          d��t�
## 4542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          earth
## 4543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         easier
## 4544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         easily
## 4545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           easy
## 4546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       edmonton
## 4547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        educate
## 4548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        effects
## 4549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          effet
## 4550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         effort
## 4551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       election
## 4552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     employment
## 4553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    encouraging
## 4554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        endgame
## 4555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        engaged
## 4556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     engagement
## 4557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        english
## 4558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       enjoying
## 4559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     enregistr�
## 4560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      equipment
## 4561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      establish
## 4562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    established
## 4563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       european
## 4564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      everyones
## 4565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        evicted
## 4566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      evictions
## 4567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exacerbated
## 4568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    examination
## 4569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         excuse
## 4570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exemption
## 4571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         expand
## 4572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   experimental
## 4573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exploring
## 4574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      extension
## 4575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        extreme
## 4576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      extremely
## 4577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         factor
## 4578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fair
## 4579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          falls
## 4580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       familiar
## 4581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        famille
## 4582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fans
## 4583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         farmer
## 4584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fault
## 4585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       favorite
## 4586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fax
## 4587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           feat
## 4588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           feds
## 4589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fees
## 4590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       festival
## 4591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         filled
## 4592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        finding
## 4593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      firstever
## 4594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fixed
## 4595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           flag
## 4596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        forever
## 4597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           form
## 4598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      forprofit
## 4599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          forum
## 4600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        friston
## 4601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          from�
## 4602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fruit
## 4603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     frustrated
## 4604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        f�vrier
## 4605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gained
## 4606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           game
## 4607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          games
## 4608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gary
## 4609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gender
## 4610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      generated
## 4611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          germs
## 4612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           girl
## 4613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       globally
## 4614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         golden
## 4615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        goodbye
## 4616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         google
## 4617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grade
## 4618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     graduation
## 4619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           grew
## 4620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ground
## 4621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        grounds
## 4622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           grow
## 4623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grupo
## 4624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      guarantee
## 4625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         guelph
## 4626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gym
## 4627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           g�r�
## 4628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ha
## 4629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         habits
## 4630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       haircuts
## 4631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         handle
## 4632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hardest
## 4633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hate
## 4634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hausse
## 4635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        health�
## 4636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          heard
## 4637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          here�
## 4638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           he�s
## 4639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           his�
## 4640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hockey
## 4641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hometown
## 4642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hommage
## 4643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         honour
## 4644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    hospitality
## 4645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               hospitalizations
## 4646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           host
## 4647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hristova
## 4648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/8b8jtxkcvh
## 4649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/yvnemj2mle
## 4650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hugging
## 4651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       humanity
## 4652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hungry
## 4653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        husband
## 4654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hygienists
## 4655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       h�pitaux
## 4656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       identity
## 4657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ignore
## 4658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ignoring
## 4659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        illegal
## 4660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       immunity
## 4661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    implemented
## 4662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      incidents
## 4663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   indianorigin
## 4664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     industries
## 4665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   informations
## 4666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    inhabitants
## 4667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     insecurity
## 4668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        insight
## 4669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        instock
## 4670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   instructions
## 4671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   intersection
## 4672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    interviewed
## 4673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  investigation
## 4674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         invite
## 4675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        invited
## 4676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      italienne
## 4677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          japon
## 4678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jilin
## 4679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           karl
## 4680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kenya
## 4681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kirkey
## 4682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            kma
## 4683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kumasi
## 4684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          labor
## 4685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           laid
## 4686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lake
## 4687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       laquelle
## 4688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lawyer
## 4689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lax
## 4690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          leads
## 4691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           leah
## 4692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         leaves
## 4693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        liberal
## 4694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lie
## 4695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lire
## 4696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lisa
## 4697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         listed
## 4698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       listened
## 4699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      literally
## 4700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        loblaws
## 4701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         locked
## 4702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      loosening
## 4703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  lorganisation
## 4704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lucky
## 4705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lungs
## 4706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      l�afrique
## 4707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           l�ge
## 4708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       maintain
## 4709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       maladies
## 4710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     management
## 4711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       managing
## 4712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mannix
## 4713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          maori
## 4714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          maria
## 4715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        massage
## 4716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mayors
## 4717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           meal
## 4718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meaning
## 4719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        measure
## 4720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       medicine
## 4721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       memories
## 4722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         memory
## 4723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          merci
## 4724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mes
## 4725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mess
## 4726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       messages
## 4727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mettre
## 4728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          midst
## 4729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      migration
## 4730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      milliards
## 4731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mine
## 4732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       minority
## 4733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         missed
## 4734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        missing
## 4735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mom
## 4736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mon
## 4737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       morrison
## 4738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mortes
## 4739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mountain
## 4740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mourir
## 4741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     moussignac
## 4742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          moves
## 4743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          movie
## 4744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       murdered
## 4745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   newfoundland
## 4746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          newly
## 4747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            nhs
## 4748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nick
## 4749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          noida
## 4750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nouvelles
## 4751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nphet
## 4752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nuestro
## 4753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nurse
## 4754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            nyc
## 4755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             nz
## 4756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             n�
## 4757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   occupational
## 4758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       occurred
## 4759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    officielles
## 4760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ombudsman
## 4761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          only�
## 4762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     opposition
## 4763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          organ
## 4764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  organisations
## 4765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ou
## 4766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       outdoors
## 4767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         owners
## 4768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        package
## 4769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        painful
## 4770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pandemias
## 4771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          parce
## 4772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         passes
## 4773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        passing
## 4774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pass�
## 4775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          patel
## 4776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pathetic
## 4777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pc
## 4778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         peaked
## 4779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         peanut
## 4780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pensezvous
## 4781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   performances
## 4782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     personally
## 4783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       personne
## 4784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            peu
## 4785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           peur
## 4786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         phases
## 4787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     physicians
## 4788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pickup
## 4789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          polio
## 4790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    populations
## 4791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        portant
## 4792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          porte
## 4793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       position
## 4794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         posted
## 4795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pourraient
## 4796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          power
## 4797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     practicing
## 4798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pre
## 4799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        predict
## 4800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pregnant
## 4801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       premiers
## 4802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        premium
## 4803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prendre
## 4804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   preparedness
## 4805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prevalence
## 4806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       previous
## 4807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      processed
## 4808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       produces
## 4809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        profits
## 4810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       profound
## 4811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prolonged
## 4812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        promote
## 4813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       promoted
## 4814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     protective
## 4815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     province�s
## 4816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pr�pos�s
## 4817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pr�sente
## 4818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pr�sent�
## 4819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pr�vention
## 4820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  psychological
## 4821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       publique
## 4822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pushed
## 4823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quand
## 4824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quartiers
## 4825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quelque
## 4826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quick
## 4827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           quon
## 4828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      qu�b�cois
## 4829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          radio
## 4830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         raised
## 4831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        raising
## 4832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ranks
## 4833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rapidement
## 4834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rapidly
## 4835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rapport�
## 4836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rcce
## 4837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rebuild
## 4838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rebuilding
## 4839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        recalls
## 4840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      receiving
## 4841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recognition
## 4842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recognize
## 4843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recommended
## 4844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recoveries
## 4845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refusing
## 4846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         regime
## 4847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        regular
## 4848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      regularly
## 4849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      regulated
## 4850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           reid
## 4851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       relation
## 4852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       relaunch
## 4853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      releasing
## 4854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reminded
## 4855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rendre
## 4856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rent
## 4857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rentals
## 4858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        request
## 4859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reserve
## 4860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      residency
## 4861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       resident
## 4862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      resilient
## 4863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    respiratory
## 4864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 responsibility
## 4865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          reste
## 4866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     retirement
## 4867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         retour
## 4868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       returned
## 4869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        richard
## 4870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rising
## 4871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        risking
## 4872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        roadmap
## 4873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rock
## 4874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        routine
## 4875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rural
## 4876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rush
## 4877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ryan
## 4878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         r�gion
## 4879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     r�sidences
## 4880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          said�
## 4881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sask
## 4882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sea
## 4883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        seating
## 4884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     secr�taire
## 4885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       semaines
## 4886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         served
## 4887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        serving
## 4888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        setting
## 4889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shameful
## 4890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sharon
## 4891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           shit
## 4892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shoppers
## 4893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          short
## 4894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shortterm
## 4895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shouldn�t
## 4896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shout
## 4897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shoutout
## 4898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sight
## 4899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         signed
## 4900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  significantly
## 4901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         silent
## 4902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sites
## 4903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         slowed
## 4904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          smile
## 4905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         soccer
## 4906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sociales
## 4907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           soit
## 4908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       solution
## 4909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sooner
## 4910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       souffrir
## 4911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sound
## 4912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       southern
## 4913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            spa
## 4914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spaces
## 4915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         speech
## 4916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spent
## 4917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spots
## 4918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      starbucks
## 4919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stated
## 4920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           stem
## 4921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stephen
## 4922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stewart
## 4923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    stigmatised
## 4924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stopping
## 4925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stops
## 4926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stress
## 4927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stroke
## 4928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stronger
## 4929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stuart
## 4930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        student
## 4931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stuff
## 4932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         subtle
## 4933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sue
## 4934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suffering
## 4935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suggested
## 4936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suggesting
## 4937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     supplement
## 4938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                suppl�mentaires
## 4939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      surgeries
## 4940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       survenus
## 4941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    susceptible
## 4942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suspension
## 4943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          su�de
## 4944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sweden
## 4945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        swedens
## 4946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          swept
## 4947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       syndrome
## 4948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       systemic
## 4949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tackles
## 4950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         taiwan
## 4951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tam
## 4952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tank
## 4953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       targeted
## 4954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          taste
## 4955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tears
## 4956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          teens
## 4957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tells
## 4958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    temperature
## 4959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       terrible
## 4960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      territory
## 4961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           text
## 4962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         themed
## 4963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        thomson
## 4964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       timeline
## 4965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      timeofuse
## 4966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         timing
## 4967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tiny
## 4968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tip
## 4969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          todos
## 4970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tops
## 4971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         touch�
## 4972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        touch�s
## 4973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        traffic
## 4974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       training
## 4975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    transmitted
## 4976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trauma
## 4977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       treating
## 4978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     treatments
## 4979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trends
## 4980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trips
## 4981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trois
## 4982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trouble
## 4983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tr�s
## 4984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tumilty
## 4985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ucp
## 4986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            uks
## 4987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            una
## 4988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    uncertainty
## 4989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            und
## 4990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     undergoing
## 4991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  understanding
## 4992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       underway
## 4993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unions
## 4994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      unmasking
## 4995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unpaid
## 4996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            up�
## 4997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ur
## 4998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         urging
## 4999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          usual
## 5000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       varadkar
## 5001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vaughan
## 5002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vehicles
## 5003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vendredi
## 5004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ventilators
## 5005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       victimes
## 5006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          vital
## 5007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      volunteer
## 5008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          votes
## 5009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         voting
## 5010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wajid
## 5011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ward
## 5012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         warned
## 5013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wasaga
## 5014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wash
## 5015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        watched
## 5016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        weather
## 5017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        weren�t
## 5018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           who�
## 5019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          who�s
## 5020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wild
## 5021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wildlife
## 5022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wipes
## 5023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      workforce
## 5024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         worlds
## 5025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        world�s
## 5026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             x3
## 5027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           yard
## 5028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    yesterday�s
## 5029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         you�ll
## 5030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             �s
## 5031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �tat
## 5032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �tatsunis
## 5033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �this
## 5034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @570news
## 5035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @aaronderfel
## 5036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @adriandix
## 5037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @brucearthur
## 5038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cdubesante
## 5039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @collingwoodtday
## 5040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @covid19canada
## 5041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @covid19qc
## 5042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @cp24
## 5043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ctvcalgary
## 5044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ctvkitchener
## 5045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @drbonniehenry
## 5046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @drfullertonmpp
## 5047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @drjacobsrad
## 5048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @fdnpetf
## 5049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @googlenews
## 5050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @govcanhealth
## 5051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @gravelarc
## 5052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @hlgatell
## 5053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @jfrobergeqc
## 5054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @lepoint
## 5055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @lopezobrador
## 5056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @luongphucnguyen
## 5057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @martinkoskinen
## 5058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @meghanmccain
## 5059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @modernatx
## 5060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nightshiftmd
## 5061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ontariocollege
## 5062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @pfizer
## 5063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @premierscottmoe
## 5064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @profsbva
## 5065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @reporterryan
## 5066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rncnouvellesat
## 5067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @secpompeo
## 5068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @thesispi
## 5069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @wrrecord
## 5070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #abhealth
## 5071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #ambiance
## 5072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #business
## 5073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #colors
## 5074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covid<u+30fc>19
## 5075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covid19on
## 5076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covid19sk
## 5077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #covidvaccination
## 5078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #entertainment
## 5079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #happynewyear2021
## 5080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #healthcare
## 5081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #healthcareworkers
## 5082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #humournoir
## 5083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #jfdupuis
## 5084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ldnont
## 5085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #lecentrosherbrooke
## 5086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #nightphotography
## 5087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #quarantaine
## 5088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #sant�
## 5089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #sherbrooke
## 5090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #sherbydowntown
## 5091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #sherbylove
## 5092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #shotofhope
## 5093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #thankyou
## 5094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #wearebsfstrong
## 5095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #yyc
## 5096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f489>
## 5097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f622>
## 5098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f62d>
## 5099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0001f644><u+0001f644>
## 5100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f914>
## 5101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+0001f937><u+200d><u+2640><u+fe0f>
## 5102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0627><u+0644><u+0645><u+0627><u+0646>
## 5103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+062a><u+062d><u+0648><u+06cc><u+0644>
## 5104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+2764><u+fe0f>
## 5105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+27a1><u+fe0f>
## 5106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           13th
## 5107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      25yearold
## 5108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            6th
## 5109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     aboriginal
## 5110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     absolutely
## 5111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         accept
## 5112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      accidents
## 5113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        account
## 5114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       accounts
## 5115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        achieve
## 5116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    acknowledge
## 5117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         acting
## 5118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        actress
## 5119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     admissions
## 5120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        adultes
## 5121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      advantage
## 5122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        advised
## 5123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         afford
## 5124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         agents
## 5125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            aid
## 5126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ailleurs
## 5127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aller
## 5128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       allowing
## 5129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         amount
## 5130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ang
## 5131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       appealed
## 5132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aqu�
## 5133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           army
## 5134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arrival
## 5135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        artists
## 5136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     assessment
## 5137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         athome
## 5138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      attending
## 5139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aura
## 5140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aussi
## 5141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          autre
## 5142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         auzgmt
## 5143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             av
## 5144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          avait
## 5145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       awaiting
## 5146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aware
## 5147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        backlog
## 5148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bad
## 5149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ban
## 5150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           barn
## 5151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          batch
## 5152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         battle
## 5153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       battling
## 5154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bet
## 5155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            be�
## 5156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bike
## 5157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          blame
## 5158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blaming
## 5159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           blog
## 5160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           blue
## 5161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       boarding
## 5162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bonnin
## 5163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         border
## 5164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        borders
## 5165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           born
## 5166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        botched
## 5167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            box
## 5168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boxing
## 5169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          brain
## 5170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bright
## 5171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         brings
## 5172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          build
## 5173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bureaucratie
## 5174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            by�
## 5175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     california
## 5176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       capacit�
## 5177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            car
## 5178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          carry
## 5179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       catching
## 5180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cavan
## 5181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cdc
## 5182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cela
## 5183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cent
## 5184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       certains
## 5185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ceux
## 5186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    challenging
## 5187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        charged
## 5188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        citizen
## 5189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       citynews
## 5190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          citys
## 5191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          claim
## 5192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       claiming
## 5193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          clair
## 5194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        classes
## 5195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          clean
## 5196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        closing
## 5197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          clubs
## 5198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      colleague
## 5199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     collective
## 5200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       colleges
## 5201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        coming�
## 5202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         comit�
## 5203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       comments
## 5204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  communication
## 5205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       compared
## 5206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     compassion
## 5207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      completed
## 5208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  complications
## 5209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        concern
## 5210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        connect
## 5211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conservative
## 5212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    consignment
## 5213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conspiracy
## 5214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    consumption
## 5215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        context
## 5216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       contract
## 5217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cool
## 5218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         coping
## 5219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            covid19<u+0001f9a0>
## 5220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         covid�
## 5221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cowards
## 5222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             cp
## 5223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crazy
## 5224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        created
## 5225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crowd
## 5226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        curfews
## 5227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      customers
## 5228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           damn
## 5229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dates
## 5230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        decided
## 5231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      democrats
## 5232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      derni�res
## 5233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        deserve
## 5234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deux
## 5235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     developing
## 5236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             di
## 5237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       diabetes
## 5238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dimanche
## 5239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         direct
## 5240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       directed
## 5241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        disease
## 5242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       diseases
## 5243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       district
## 5244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dollars
## 5245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           door
## 5246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          doubt
## 5247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          draft
## 5248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dream
## 5249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           drew
## 5250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dribs
## 5251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          d�but
## 5252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          d�c�s
## 5253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           d�ge
## 5254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    educational
## 5255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       efficace
## 5256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        elected
## 5257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          email
## 5258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        empathy
## 5259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          empty
## 5260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       enjoying
## 5261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    environment
## 5262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       epidemic
## 5263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            eso
## 5264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          essex
## 5265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         estate
## 5266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         etches
## 5267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        excited
## 5268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exercise
## 5269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   experiencing
## 5270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exponential
## 5271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exposed
## 5272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      extending
## 5273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           eyes
## 5274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fail
## 5275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fake
## 5276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fan
## 5277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fantastic
## 5278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         faster
## 5279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           feds
## 5280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         female
## 5281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      financial
## 5282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fine
## 5283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fire
## 5284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        floride
## 5285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        focused
## 5286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forest
## 5287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        forever
## 5288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      forprofit
## 5289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fourth
## 5290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fran�ais
## 5291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          from�
## 5292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        funeral
## 5293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            f�r
## 5294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gautam
## 5295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gestion
## 5296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         giving
## 5297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           glad
## 5298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gloves
## 5299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           goal
## 5300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   gouvernement
## 5301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gps
## 5302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          graph
## 5303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           grew
## 5304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           grey
## 5305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        groupes
## 5306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         guelph
## 5307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gut
## 5308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        g�n�ral
## 5309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ha
## 5310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hand
## 5311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         handle
## 5312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        harmful
## 5313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hawaii
## 5314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          helps
## 5315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           herd
## 5316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         herpes
## 5317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hesitant
## 5318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hiring
## 5319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        holding
## 5320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       honoured
## 5321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        horizon
## 5322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   hospitalised
## 5323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hotel
## 5324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hpsc
## 5325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/o27x9fx9cx
## 5326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/t6brzxfdt0
## 5327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ignore
## 5328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          image
## 5329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            imo
## 5330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    implemented
## 5331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         impose
## 5332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        imposed
## 5333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      improving
## 5334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        inching
## 5335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     incredibly
## 5336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         indian
## 5337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     indigenous
## 5338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          inept
## 5339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 infrastructure
## 5340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      injection
## 5341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inoculated
## 5342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         inside
## 5343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      instagram
## 5344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      intensifs
## 5345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  investigating
## 5346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  investigation
## 5347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       investir
## 5348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      involving
## 5349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         iphone
## 5350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           i�ll
## 5351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jabs
## 5352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jail
## 5353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          james
## 5354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jeunes
## 5355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        johnson
## 5356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          joint
## 5357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          juste
## 5358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          karen
## 5359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kenneys
## 5360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         killed
## 5361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lake
## 5362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           land
## 5363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       launches
## 5364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          leads
## 5365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lien
## 5366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ligne
## 5367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        limited
## 5368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       limiting
## 5369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         linked
## 5370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         listen
## 5371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         livrer
## 5372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        logical
## 5373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lord
## 5374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           loss
## 5375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lots
## 5376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           main
## 5377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       majority
## 5378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  manufacturing
## 5379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mark
## 5380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mcdonalds
## 5381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          meals
## 5382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          meant
## 5383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mecfs
## 5384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       medicine
## 5385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        membres
## 5386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      messaging
## 5387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            met
## 5388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         middle
## 5389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           milk
## 5390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mine
## 5391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 misinformation
## 5392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         missed
## 5393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mississauga
## 5394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mla
## 5395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mobile
## 5396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          model
## 5397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mon
## 5398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          monde
## 5399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          money
## 5400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       montr�al
## 5401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mood
## 5402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         moving
## 5403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            m�s
## 5404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             na
## 5405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         native
## 5406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nature
## 5407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ndp
## 5408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            nhl
## 5409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        niagara
## 5410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nice
## 5411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nombre
## 5412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           noon
## 5413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nope
## 5414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           now�
## 5415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     occupation
## 5416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        october
## 5417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       offering
## 5418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       olympics
## 5419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          onset
## 5420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         orange
## 5421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        outcome
## 5422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       outlined
## 5423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     overcoming
## 5424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       overtime
## 5425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              oxfordastrazeneca
## 5426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pandemic�
## 5427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parties
## 5428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       partners
## 5429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    partnership
## 5430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           peel
## 5431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pendant
## 5432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peoples
## 5433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       people�s
## 5434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       personne
## 5435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        persons
## 5436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    perspective
## 5437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pharma
## 5438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          phase
## 5439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         photos
## 5440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        planned
## 5441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          plays
## 5442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    populations
## 5443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       position
## 5444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         posted
## 5445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    predictions
## 5446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prepare
## 5447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      preparing
## 5448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        presque
## 5449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        primary
## 5450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          prime
## 5451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prisons
## 5452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        proches
## 5453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           prof
## 5454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   professional
## 5455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  professionals
## 5456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    projections
## 5457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       promised
## 5458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       promoted
## 5459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        protest
## 5460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          proud
## 5461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      providers
## 5462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pr�cipit�es
## 5463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   psychologist
## 5464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       purchase
## 5465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        purpose
## 5466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             qa
## 5467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quarter
## 5468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quebecers
## 5469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          queue
## 5470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quick
## 5471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           quil
## 5472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          qu�on
## 5473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        qwanoes
## 5474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           race
## 5475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         raised
## 5476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rallying
## 5477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reaches
## 5478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reading
## 5479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ready
## 5480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reality
## 5481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         recall
## 5482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       receives
## 5483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recovered
## 5484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            red
## 5485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        refused
## 5486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    regulations
## 5487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rely
## 5488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       remotely
## 5489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         remove
## 5490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    researchers
## 5491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     responding
## 5492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 responsibility
## 5493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       resulted
## 5494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      resulting
## 5495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      returning
## 5496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rich
## 5497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rights
## 5498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rink
## 5499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         risque
## 5500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           road
## 5501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rule
## 5502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        r�gions
## 5503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          safer
## 5504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sait
## 5505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         samedi
## 5506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       schedule
## 5507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      scientist
## 5508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         secret
## 5509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           send
## 5510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       separate
## 5511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sera
## 5512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ses
## 5513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sex
## 5514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shaming
## 5515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shelley
## 5516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sherbrooke
## 5517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shift
## 5518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shingoose
## 5519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           shit
## 5520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shown
## 5521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         signed
## 5522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          signs
## 5523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         simply
## 5524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      singleday
## 5525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ski
## 5526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          smile
## 5527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      snowbirds
## 5528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        soaring
## 5529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           soir
## 5530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           soit
## 5531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       solution
## 5532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      solutions
## 5533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sounds
## 5534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spanish
## 5535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spend
## 5536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spots
## 5537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spreads
## 5538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spring
## 5539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       staffing
## 5540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stand
## 5541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           step
## 5542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stopped
## 5543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       straight
## 5544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        strain�
## 5545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stricter
## 5546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     struggling
## 5547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stuck
## 5548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        student
## 5549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        success
## 5550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           suis
## 5551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         suisse
## 5552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       supplies
## 5553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         supply
## 5554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     supporters
## 5555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   surmortalit�
## 5556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      survivors
## 5557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        syst�me
## 5558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tardives
## 5559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         taught
## 5560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      temporary
## 5561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     terrifying
## 5562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    territories
## 5563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ticket
## 5564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tickets
## 5565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tighter
## 5566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           till
## 5567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tired
## 5568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tonight
## 5569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tools
## 5570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          toque
## 5571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tour
## 5572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tourism
## 5573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trace
## 5574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          train
## 5575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       training
## 5576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       transfer
## 5577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        travels
## 5578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tribute
## 5579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trinity
## 5580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tr�s
## 5581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tune
## 5582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tweet
## 5583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tweets
## 5584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             um
## 5585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            una
## 5586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unable
## 5587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     university
## 5588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         urgent
## 5589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         urging
## 5590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            usa
## 5591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          usual
## 5592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vacations
## 5593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vaccine�
## 5594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vaccin�s
## 5595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vancouver
## 5596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            vax
## 5597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ventilation
## 5598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          vient
## 5599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       violates
## 5600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          viral
## 5601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      virtually
## 5602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        viruses
## 5603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           vive
## 5604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          voici
## 5605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wage
## 5606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wake
## 5607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           walk
## 5608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         walkin
## 5609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wechu
## 5610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wellbeing
## 5611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wife
## 5612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            win
## 5613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         worlds
## 5614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        world�s
## 5615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             yo
## 5616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �and
## 5617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �breaking
## 5618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �covid19�
## 5619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �g�s
## 5620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            �if
## 5621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �lus
## 5622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             �r
## 5623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �tre
## 5624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �very
## 5625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �when
## 5626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @bcndp
## 5627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @cbcpei
## 5628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cdubesante
## 5629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @celliottability
## 5630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @cladams2
## 5631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cphocanada
## 5632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @dogrates
## 5633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @globeandmail
## 5634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jarmstrongbc
## 5635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @jkenney
## 5636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @liberalparty
## 5637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @manfellow2
## 5638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nowthatsdusty
## 5639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @nytimes
## 5640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ojhlofficial
## 5641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ontliberal
## 5642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ottawahealth
## 5643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @premierscottmoe
## 5644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @rockineve
## 5645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @stevendelduca
## 5646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @thetyee
## 5647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @torontostar
## 5648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @twitter
## 5649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #abpoli
## 5650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #bced
## 5651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #booster
## 5652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #canadians
## 5653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #coteh
## 5654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #curfew
## 5655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #dog
## 5656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #dogs
## 5657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #firebonniehenry
## 5658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #happynewyear2022
## 5659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #longcovid
## 5660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #novascotia
## 5661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #omicronvariant
## 5662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #ontpoli
## 5663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ottawa
## 5664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #pfizer
## 5665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #rockineve2022
## 5666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #trudeau
## 5667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #vaccine
## 5668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #ygk
## 5669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ^rd
## 5670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0001f1e8><u+0001f1e6>
## 5671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0001f449><u+0001f3fc>
## 5672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f914>
## 5673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+2728>
## 5674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+fe0f><u+20e3>news
## 5675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            3rd
## 5676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            60s
## 5677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            80s
## 5678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      accounted
## 5679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       accurate
## 5680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         actual
## 5681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          added
## 5682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        address
## 5683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         advice
## 5684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       affected
## 5685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         afford
## 5686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            air
## 5687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       airborne
## 5688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        amazing
## 5689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       analysis
## 5690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ann�e
## 5691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        appears
## 5692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       approach
## 5693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       approved
## 5694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aren�t
## 5695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arruda
## 5696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   asymptomatic
## 5697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       athletes
## 5698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      australia
## 5699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      authority
## 5700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         b16402
## 5701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bank
## 5702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bc�s
## 5703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           beds
## 5704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          betty
## 5705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          biden
## 5706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bien
## 5707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          blind
## 5708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          blood
## 5709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       briefing
## 5710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        british
## 5711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bullshit
## 5712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            buy
## 5713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      canadians
## 5714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   cancellation
## 5715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cape
## 5716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cas
## 5717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        causing
## 5718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cdn
## 5719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        charter
## 5720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chinese
## 5721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clients
## 5722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        climate
## 5723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         closes
## 5724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           club
## 5725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          clubs
## 5726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         coffee
## 5727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     collective
## 5728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         common
## 5729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   communicable
## 5730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        compare
## 5731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       complete
## 5732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  comprehensive
## 5733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      concerned
## 5734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       concerns
## 5735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conference
## 5736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      continues
## 5737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          costs
## 5738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        council
## 5739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         couple
## 5740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          court
## 5741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cups
## 5742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dance
## 5743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dangerous
## 5744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dead
## 5745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dealing
## 5746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       delivery
## 5747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         demand
## 5748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       detected
## 5749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        develop
## 5750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     developing
## 5751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    development
## 5752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       diabetes
## 5753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         didn�t
## 5754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            die
## 5755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dies
## 5756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       director
## 5757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        discuss
## 5758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       distance
## 5759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         doctor
## 5760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doesn�t
## 5761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doivent
## 5762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dollars
## 5763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         double
## 5764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          doubt
## 5765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       download
## 5766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dub�
## 5767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       edmonton
## 5768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      educators
## 5769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      encourage
## 5770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         energy
## 5771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      essential
## 5772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       evidence
## 5773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      excellent
## 5774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exercise
## 5775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exhausted
## 5776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         expect
## 5777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       expected
## 5778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         expert
## 5779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exponential
## 5780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fatality
## 5781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fit
## 5782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fixed
## 5783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          focus
## 5784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fontaine
## 5785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           food
## 5786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forget
## 5787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fucking
## 5788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fun
## 5789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         future
## 5790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           game
## 5791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            god
## 5792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gonna
## 5793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       guidance
## 5794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gym
## 5795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      happiness
## 5796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          heart
## 5797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hockey
## 5798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                hospitalization
## 5799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hosting
## 5800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      household
## 5801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/addxhm9dl6
## 5802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/kmdivmnjwn
## 5803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/qxaxun9mjr
## 5804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/ylrazlp085
## 5805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/ymfkhu79rs
## 5806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ice
## 5807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           icus
## 5808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         immune
## 5809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inability
## 5810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       includes
## 5811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     increasing
## 5812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          india
## 5813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         infant
## 5814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      infection
## 5815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         inside
## 5816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      introduce
## 5817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       invented
## 5818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          joint
## 5819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           joke
## 5820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          juste
## 5821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        justice
## 5822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kill
## 5823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            kit
## 5824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lawrence
## 5825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          leave
## 5826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leaving
## 5827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            led
## 5828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           left
## 5829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           leur
## 5830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      liberties
## 5831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lies
## 5832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lieu
## 5833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        limited
## 5834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       longterm
## 5835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lurgence
## 5836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ma
## 5837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     management
## 5838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mark
## 5839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     medication
## 5840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          merci
## 5841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        message
## 5842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         middle
## 5843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mike
## 5844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mis
## 5845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        missing
## 5846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mom
## 5847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          movie
## 5848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mrna
## 5849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mutation
## 5850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nice
## 5851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nonurgent
## 5852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nonvaccin�s
## 5853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nose
## 5854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nous
## 5855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          novak
## 5856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ns
## 5857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nsha
## 5858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      occupancy
## 5859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         office
## 5860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        opinion
## 5861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       opposite
## 5862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       outdoors
## 5863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           page
## 5864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pain
## 5865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      passagers
## 5866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      passports
## 5867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           paul
## 5868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pause
## 5869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        payment
## 5870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    perspective
## 5871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         plenty
## 5872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         police
## 5873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       politics
## 5874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pop
## 5875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         portal
## 5876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       position
## 5877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     positivity
## 5878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       positivo
## 5879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      president
## 5880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pressing
## 5881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          prior
## 5882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     procedures
## 5883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       programs
## 5884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          proof
## 5885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         proper
## 5886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prot�ger
## 5887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        putting
## 5888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quand
## 5889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recorded
## 5890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recovery
## 5891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reduce
## 5892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reduced
## 5893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         remain
## 5894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reminder
## 5895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rendezvous
## 5896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    rescheduled
## 5897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    researchers
## 5898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        respect
## 5899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     retirement
## 5900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reusable
## 5901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           road
## 5902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         robust
## 5903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        roughly
## 5904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rounds
## 5905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         safely
## 5906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sans
## 5907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         season
## 5908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          selon
## 5909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           send
## 5910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         senior
## 5911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        seniors
## 5912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sensitive
## 5913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       services
## 5914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shares
## 5915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shops
## 5916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         silver
## 5917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sites
## 5918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sitting
## 5919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   skyrocketing
## 5920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           slow
## 5921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       solution
## 5922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sports
## 5923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sqdc
## 5924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stage
## 5925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        streets
## 5926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       suggests
## 5927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       supports
## 5928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sweeping
## 5929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             te
## 5930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          teams
## 5931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        there�s
## 5932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thinking
## 5933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         todays
## 5934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         today�
## 5935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           toll
## 5936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tools
## 5937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        totally
## 5938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           town
## 5939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tracing
## 5940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          track
## 5941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         triple
## 5942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       trustees
## 5943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tr�s
## 5944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        twitter
## 5945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     underlying
## 5946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      universal
## 5947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        updates
## 5948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          urine
## 5949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vaccinate
## 5950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vaccin�
## 5951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           view
## 5952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        virtual
## 5953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         virus�
## 5954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     volunteers
## 5955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          votre
## 5956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vraiment
## 5957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        waiting
## 5958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       watching
## 5959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        weather
## 5960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wine
## 5961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        worried
## 5962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          worry
## 5963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          worst
## 5964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            wow
## 5965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         year�s
## 5966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             �i
## 5967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �there
## 5968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @211ontario
## 5969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @adriandix
## 5970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @africanunion
## 5971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @aircanada
## 5972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @amazon
## 5973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @andreafeller2
## 5974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @atiimf
## 5975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @bccrns
## 5976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bernardo1130
## 5977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @blainehiggs
## 5978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bogochisaac
## 5979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bramptonecodev
## 5980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bramptonreddit
## 5981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bramptontransit
## 5982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bucksexton
## 5983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @bzubyk
## 5984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @canadaslifeline
## 5985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @canadiantire
## 5986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @canageseniors
## 5987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cbcqueenspark
## 5988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cdndrs4medicare
## 5989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @chefhawksworth
## 5990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @cmadocs
## 5991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @cmhcca
## 5992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @cnpea
## 5993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @cp24
## 5994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @cpchq
## 5995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @discoprincess
## 5996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @dougwhillans
## 5997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @drewdilkens
## 5998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @drfullertonmpp
## 5999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @drianweissman
## 6000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @dzakor
## 6001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ericbchanteur
## 6002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @fareedzakaria
## 6003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @farmboy
## 6004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @flagrantdolphin
## 6005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @fpchampagne
## 6006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @geronursing
## 6007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @globalmedicdmgf
## 6008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @globalnews
## 6009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @gofundme
## 6010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @gotransit
## 6011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @huffpost
## 6012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @imfcapdev
## 6013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @inspq
## 6014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ipoliticsca
## 6015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @jamnguy
## 6016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jjhorgan
## 6017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @kennedystewart
## 6018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @kevinsmithuhn
## 6019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @lavoixtva
## 6020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @leideniusshaye
## 6021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @lkizaba
## 6022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mailonline
## 6023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @makecansocergr8
## 6024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @marissenmark
## 6025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @marthamaccallum
## 6026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @medeirosmartin
## 6027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @michaelfordto
## 6028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mozaquamarine
## 6029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @nbcnews
## 6030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @nejm
## 6031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @onpsych
## 6032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ontariocofc
## 6033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ontarioissoccer
## 6034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @onthumanrights
## 6035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @orilliamatters
## 6036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ottawacity
## 6037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @parscale
## 6038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @pascalberube
## 6039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @phacgc
## 6040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @picardonhealth
## 6041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @potus
## 6042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @proletarikat
## 6043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @realcandaceo
## 6044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @salvella
## 6045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @scottbluerye
## 6046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @scottdellinger
## 6047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @seniorsfirstbc
## 6048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @shoshanahjacobs
## 6049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @srsadvocatebc
## 6050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @thejagmeetsingh
## 6051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           @uhn
## 6052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @uofg
## 6053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @uoftmeddean
## 6054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @uoftsu
## 6055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @utmfastpitch
## 6056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @valplante
## 6057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @webmd
## 6058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @whitecapsfc
## 6059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @yorkregiongovt
## 6060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @yvonne4tn
## 6061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #agriculture
## 6062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #aptti
## 6063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #architecture
## 6064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #beautiful
## 6065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #blacklivesmattters
## 6066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #bmw
## 6067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #brampoli
## 6068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #breaking
## 6069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #canadaeh
## 6070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #canadaslifeline
## 6071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #cdnecon
## 6072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #children
## 6073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #collingwood
## 6074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #communitynews
## 6075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covi<u+0307>d19
## 6076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covid19ns
## 6077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #covidcanada
## 6078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #covidontario
## 6079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #covidrecovery
## 6080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #day77
## 6081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #delivery
## 6082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #differenttogether
## 6083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #dogs
## 6084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #donorsareessential
## 6085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #downtownvancouver
## 6086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #economy
## 6087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #edmonton
## 6088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #emilytjandra
## 6089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #entrepreneurship
## 6090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #fluwatchers
## 6091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #georgefloydfuneral
## 6092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #gpab
## 6093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #gta
## 6094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #hairday
## 6095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #healthcare
## 6096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #hedgehog
## 6097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #humanpuppy�
## 6098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #instagay�
## 6099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #jobs
## 6100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #june
## 6101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #lawrenceduplessis
## 6102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #londonontario
## 6103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #loveislove
## 6104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #lovers
## 6105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #loveyou
## 6106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #manitoba
## 6107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #mentalhealth
## 6108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #mercedesbenz
## 6109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #montreal
## 6110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #mspphaitiucrp
## 6111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #mtllifestyle�
## 6112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #mysterypicture�
## 6113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #needoutofthehouse
## 6114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #newmusic2020
## 6115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #newnormal
## 6116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #nojusticenopeace
## 6117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #nothingwilleverbethesame
## 6118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #onted
## 6119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #ottawastrong
## 6120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #outside
## 6121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #pandemia
## 6122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #pei
## 6123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #peru
## 6124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #phase2
## 6125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #protest
## 6126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #protests2020
## 6127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #protests�
## 6128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #quarantine�
## 6129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #quarentinelife
## 6130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #reopening
## 6131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #rmt
## 6132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #rx
## 6133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #safety
## 6134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #safetyfirst
## 6135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #saljublossom
## 6136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #sauvetagef�ministe
## 6137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #scarbto
## 6138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #selfie
## 6139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #showbiz
## 6140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #socialmedia
## 6141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #spaceandtime
## 6142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #spacetimecontinuum
## 6143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #starbucks
## 6144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #sumer416
## 6145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #summer
## 6146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #teflindo
## 6147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #theworldhaschanged
## 6148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #travel
## 6149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #triphop2020
## 6150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #trump
## 6151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #trumphasnoplan
## 6152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #update
## 6153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #urbanstreetphotography�
## 6154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #walkingwithemily
## 6155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #walkingwithfamily
## 6156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #wasagabeach
## 6157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #washyourhands
## 6158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #wayneduplessis
## 6159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #wearamask
## 6160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #wednesdaymorning
## 6161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #weekend
## 6162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #wfh
## 6163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #winnipeg
## 6164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #yyccc
## 6165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+0001f1e8><u+0001f1e6><u+0001f341>
## 6166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f3b6>
## 6167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f3c8>
## 6168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f525>
## 6169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f602>
## 6170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f61e>
## 6171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f644>
## 6172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f64c>
## 6173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0001f64f><u+0001f64f>
## 6174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f6a6>reopening
## 6175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f6d1>do
## 6176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f7e5>
## 6177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f7e8>
## 6178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f926><u+0001f3fc><u+200d><u+2640><u+fe0f>
## 6179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+0001f926><u+200d><u+2642><u+fe0f>
## 6180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+2063>
## 6181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+2063><u+2800>
## 6182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+2600><u+fe0f>
## 6183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+270d><u+fe0f>
## 6184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+2764><u+0001f56f>
## 6185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+27a1><u+fe0f>
## 6186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+2800>
## 6187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            0<u+fe0f><u+20e3>8<u+fe0f><u+20e3>0<u+fe0f><u+20e3>
## 6188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            0<u+fe0f><u+20e3>9<u+fe0f><u+20e3>2<u+fe0f><u+20e3>
## 6189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            0<u+fe0f><u+20e3>9<u+fe0f><u+20e3>7<u+fe0f><u+20e3>
## 6190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           10am
## 6191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           11am
## 6192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          14day
## 6193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           15th
## 6194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             1m
## 6195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          2i�me
## 6196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            30s
## 6197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            3rd
## 6198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             5g
## 6199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            6pm
## 6200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            6th
## 6201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            7pm
## 6202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     abandoning
## 6203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         about�
## 6204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           abpa
## 6205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        absolue
## 6206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          acabo
## 6207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        academy
## 6208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     accelerate
## 6209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       accepted
## 6210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     accessible
## 6211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      accessing
## 6212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    accommodate
## 6213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        accused
## 6214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        accuses
## 6215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        achieve
## 6216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      activists
## 6217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           acts
## 6218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        acutely
## 6219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           adam
## 6220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          adapt
## 6221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      addiction
## 6222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       addition
## 6223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           adds
## 6224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adequately
## 6225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adhere
## 6226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 administration
## 6227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adopting
## 6228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      advantage
## 6229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     advocating
## 6230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        affect�
## 6231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       affluent
## 6232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  affordability
## 6233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       africain
## 6234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       africa�s
## 6235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  again�waiving
## 6236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           agco
## 6237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aged
## 6238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         agents
## 6239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           agir
## 6240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         agreed
## 6241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      agreement
## 6242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   agricultural
## 6243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ahs
## 6244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ai
## 6245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       airlines
## 6246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            aka
## 6247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          akele
## 6248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      akuajones
## 6249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alaska
## 6250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alberta�s
## 6251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          album
## 6252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alcohol
## 6253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         algoma
## 6254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       allaient
## 6255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alter
## 6256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        altered
## 6257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aman
## 6258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        amnesty
## 6259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        amounts
## 6260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           anba
## 6261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          andor
## 6262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         andrew
## 6263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        android
## 6264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       angelina
## 6265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          angry
## 6266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        animals
## 6267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           anna
## 6268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           anne
## 6269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    anniversary
## 6270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        annonce
## 6271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         anplis
## 6272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       antibody
## 6273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 antiretroviral
## 6274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   antispitting
## 6275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             antistigmatisation
## 6276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        antoine
## 6277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ao�t
## 6278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     apparition
## 6279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      applauded
## 6280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        applies
## 6281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      appointed
## 6282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  approximately
## 6283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      architect
## 6284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        archway
## 6285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arising
## 6286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arlene
## 6287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arrival
## 6288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     artificial
## 6289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        artists
## 6290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          asahi
## 6291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ashraf
## 6292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            asi
## 6293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           asia
## 6294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aspects
## 6295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        assault
## 6296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         assess
## 6297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         assist
## 6298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   associations
## 6299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      assouplir
## 6300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        assured
## 6301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       athletes
## 6302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       atlantic
## 6303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        attacks
## 6304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       attempts
## 6305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      attending
## 6306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     attention�
## 6307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            at�
## 6308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     aujourdhui
## 6309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aunt
## 6310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         autres
## 6311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             av
## 6312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   availability
## 6313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           avez
## 6314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       awaiting
## 6315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         awaits
## 6316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        awesome
## 6317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          a�n�s
## 6318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     background
## 6319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     backtracks
## 6320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          badly
## 6321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ball
## 6322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          banks
## 6323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         barely
## 6324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          barre
## 6325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        barrier
## 6326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bars
## 6327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          basic
## 6328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bcs
## 6329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bell
## 6330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ben
## 6331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bernard
## 6332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         beware
## 6333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bhi
## 6334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bhumi
## 6335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          birds
## 6336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bitch
## 6337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bits
## 6338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            biz
## 6339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bizarre
## 6340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blackwell
## 6341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         blamed
## 6342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         blancs
## 6343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blessing
## 6344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blindness
## 6345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bloomfield
## 6346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           blow
## 6347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          blues
## 6348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bogus
## 6349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       boisvert
## 6350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bombardier
## 6351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bonfire
## 6352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         booked
## 6353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bored
## 6354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bother
## 6355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bottles
## 6356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bought
## 6357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boxcar
## 6358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         brakes
## 6359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         brands
## 6360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brazils
## 6361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         breach
## 6362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      breakdown
## 6363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      breathing
## 6364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brentwood
## 6365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        britain
## 6366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          broke
## 6367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         broken
## 6368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          brown
## 6369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brunswicker
## 6370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             bu
## 6371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bubbles
## 6372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        buckner
## 6373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          buddy
## 6374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         buhari
## 6375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          built
## 6376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bump
## 6377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bureaucrats
## 6378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         burned
## 6379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         burton
## 6380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        busonly
## 6381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           but�
## 6382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         buyers
## 6383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bylaws
## 6384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cabinet
## 6385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cad
## 6386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       calculus
## 6387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       campagne
## 6388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    campbellton
## 6389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         campus
## 6390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       canadien
## 6391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         canad�
## 6392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   cancellation
## 6393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cancels
## 6394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      candidate
## 6395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cantave
## 6396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            caq
## 6397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           card
## 6398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cared
## 6399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         career
## 6400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         carers
## 6401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      caribbean
## 6402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       carolina
## 6403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        carries
## 6404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          carry
## 6405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           casa
## 6406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cash
## 6407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cast
## 6408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             cb
## 6409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             cc
## 6410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ccma
## 6411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ceba
## 6412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cela
## 6413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     celebrated
## 6414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    celebrating
## 6415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   celebrations
## 6416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cell
## 6417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cells
## 6418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         center
## 6419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       centskwh
## 6420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        century
## 6421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ceremony
## 6422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      certified
## 6423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ceux
## 6424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chamber
## 6425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       champion
## 6426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chances
## 6427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       changing
## 6428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        channel
## 6429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chanteuse
## 6430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chaos
## 6431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chapter
## 6432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        charged
## 6433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        charges
## 6434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         charvi
## 6435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chato
## 6436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chatted
## 6437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chaturvedi
## 6438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chaude
## 6439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         checks
## 6440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cheeses
## 6441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           chez
## 6442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   childminding
## 6443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         child�
## 6444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chilliwack
## 6445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chinois
## 6446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         choice
## 6447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          choicejustsayingcharminglyapocalyptic
## 6448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      christine
## 6449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      christmas
## 6450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       churches
## 6451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ci
## 6452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    circumspect
## 6453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  circumstances
## 6454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        citizen
## 6455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    citizenship
## 6456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clarify
## 6457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clarity
## 6458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         clause
## 6459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cleanest
## 6460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     clinicians
## 6461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clinics
## 6462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          clock
## 6463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         closer
## 6464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cne
## 6465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          coach
## 6466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cochair
## 6467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     collateral
## 6468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      colleague
## 6469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     collecting
## 6470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     collection
## 6471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    collingwood
## 6472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            colombiebritannique
## 6473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     columbians
## 6474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        combien
## 6475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    commissions
## 6476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         commit
## 6477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     committees
## 6478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          comms
## 6479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 communications
## 6480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   comparaisons
## 6481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     comparison
## 6482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        complex
## 6483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  complications
## 6484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    compromised
## 6485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      condition
## 6486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    conditioner
## 6487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        confin�
## 6488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confusing
## 6489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          congo
## 6490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   congregation
## 6491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      connected
## 6492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     connecting
## 6493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    consecutive
## 6494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   considerably
## 6495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      considers
## 6496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     consistent
## 6497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conspiracy
## 6498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   consultation
## 6499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contaminated
## 6500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contamin�s
## 6501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  contemplating
## 6502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         contra
## 6503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contracter
## 6504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      contraire
## 6505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       contrast
## 6506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contribute
## 6507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    contributed
## 6508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contributing
## 6509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contribution
## 6510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    controversy
## 6511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      contr�les
## 6512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  conversations
## 6513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    convocation
## 6514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cooperation
## 6515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         coping
## 6516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           copy
## 6517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cork
## 6518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       corktown
## 6519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cornerstone
## 6520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   corporations
## 6521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cotnam
## 6522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        counter
## 6523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 countermeasure
## 6524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       counting
## 6525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       countrys
## 6526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        courses
## 6527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     courthouse
## 6528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cousin
## 6529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         craggs
## 6530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       craindre
## 6531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           crap
## 6532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cream
## 6533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        creates
## 6534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         creche
## 6535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          creek
## 6536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cricket
## 6537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                criminalisation
## 6538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       criteria
## 6539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     criticised
## 6540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cross
## 6541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crossing
## 6542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cruel
## 6543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crushed
## 6544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cuando
## 6545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cuisine
## 6546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        curbing
## 6547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        curfews
## 6548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        curious
## 6549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cycle
## 6550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             da
## 6551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         damage
## 6552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dam�rique
## 6553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dancing
## 6554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        daniela
## 6555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dashboard
## 6556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dat
## 6557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       daughter
## 6558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dautres
## 6559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dayiti
## 6560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deaf
## 6561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          deals
## 6562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         debido
## 6563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         debunk
## 6564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dec
## 6565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         decent
## 6566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  decriminalize
## 6567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deeply
## 6568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       defended
## 6569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        defends
## 6570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        deficit
## 6571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        defined
## 6572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       definite
## 6573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      defunding
## 6574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      delicious
## 6575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        deliver
## 6576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       delivers
## 6577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          delma
## 6578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      demanding
## 6579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dementia
## 6580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    demographic
## 6581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    demonstrate
## 6582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        denmark
## 6583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      depending
## 6584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     depressing
## 6585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deprived
## 6586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dernier
## 6587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          derry
## 6588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        deserve
## 6589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deserves
## 6590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         design
## 6591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        destroy
## 6592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     destroying
## 6593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    destruction
## 6594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   determinants
## 6595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         devant
## 6596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     developing
## 6597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       devotees
## 6598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        devrait
## 6599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dhawan
## 6600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dhawan�s
## 6601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dianne
## 6602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   dictatorship
## 6603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dieu
## 6604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      difficile
## 6605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dining
## 6606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dinner
## 6607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     directives
## 6608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      directors
## 6609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       disagree
## 6610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  disappointing
## 6611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     discharged
## 6612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disclosure
## 6613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   discouraging
## 6614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     discovered
## 6615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                discrimination�
## 6616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    discussions
## 6617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disinfection
## 6618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 disinformation
## 6619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disponibles
## 6620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               disproportionate
## 6621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disruption
## 6622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  distanciation
## 6623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       distinct
## 6624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     distribute
## 6625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    distributed
## 6626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   distribution
## 6627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disturbing
## 6628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dit
## 6629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         divide
## 6630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dlm
## 6631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            doc
## 6632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    documenting
## 6633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dogs
## 6634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           doit
## 6635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        donegal
## 6636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          donne
## 6637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           door
## 6638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dose
## 6639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doubled
## 6640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       downward
## 6641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dress
## 6642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          drink
## 6643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         driver
## 6644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         droits
## 6645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dropping
## 6646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dry
## 6647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dutch
## 6648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  d�confinement
## 6649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           d�ni
## 6650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      d�pistage
## 6651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eager
## 6652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   earlierstage
## 6653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         eating
## 6654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        editors
## 6655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            edt
## 6656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          elder
## 6657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      eliminate
## 6658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     eliminated
## 6659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    eliminating
## 6660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ella
## 6661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        elliott
## 6662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          emily
## 6663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emmanuel
## 6664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        emplois
## 6665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       employer
## 6666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       employ�s
## 6667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      encourage
## 6668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         endure
## 6669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         energy
## 6670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         engage
## 6671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      engineers
## 6672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       englands
## 6673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        engulfs
## 6674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        enjoyed
## 6675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    enregistr�s
## 6676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ensues
## 6677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        entered
## 6678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         enters
## 6679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       entitled
## 6680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          entre
## 6681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  entrepreneurs
## 6682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  environmental
## 6683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           epic
## 6684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       episodes
## 6685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        equipos
## 6686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         equity
## 6687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     eradicates
## 6688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            esp
## 6689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          estce
## 6690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          estoy
## 6691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           est�
## 6692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          est�n
## 6693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ethical
## 6694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          evans
## 6695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 everincreasing
## 6696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          evict
## 6697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        examine
## 6698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       examiner
## 6699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      examining
## 6700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         exceed
## 6701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         excess
## 6702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exciting
## 6703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exclusive
## 6704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exdragon
## 6705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exhorte
## 6706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          exist
## 6707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         existe
## 6708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        existed
## 6709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       existing
## 6710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           exit
## 6711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       expanded
## 6712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   expectations
## 6713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      expecting
## 6714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       expenses
## 6715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    explanation
## 6716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        explore
## 6717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        express
## 6718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      expressed
## 6719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     extensions
## 6720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         extent
## 6721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  extraordinary
## 6722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      facemasks
## 6723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         facile
## 6724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   facilitating
## 6725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        factory
## 6726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        failing
## 6727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fails
## 6728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fairly
## 6729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fallen
## 6730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fashion
## 6731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fatigue
## 6732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fa�on
## 6733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             fb
## 6734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fda
## 6735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fearful
## 6736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        feature
## 6737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       features
## 6738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       february
## 6739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          feels
## 6740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fellow
## 6741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ferait
## 6742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fever
## 6743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fights
## 6744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           file
## 6745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fill
## 6746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       findings
## 6747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         first�
## 6748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fit
## 6749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flatten
## 6750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      flattened
## 6751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           flea
## 6752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flights
## 6753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          flood
## 6754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flowers
## 6755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fluid
## 6756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flulike
## 6757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fluwatcher
## 6758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fly
## 6759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          foley
## 6760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fond
## 6761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       football
## 6762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forces
## 6763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forgot
## 6764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          forms
## 6765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             fr
## 6766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fragile
## 6767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fraser
## 6768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         french
## 6769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         frente
## 6770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       friendly
## 6771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       friend�s
## 6772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    frontliners
## 6773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     frontlines
## 6774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ft
## 6775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fulltime
## 6776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fundraiser
## 6777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fundraising
## 6778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        funeral
## 6779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       funerals
## 6780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        f�d�ral
## 6781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           f�te
## 6782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gains
## 6783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gallery
## 6784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gaps
## 6785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          garda
## 6786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gasolina
## 6787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gay
## 6788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gaza
## 6789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gear
## 6790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gens
## 6791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        germany
## 6792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             gh
## 6793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gift
## 6794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          girls
## 6795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      giveathon
## 6796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           goal
## 6797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gop
## 6798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gore
## 6799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gospel
## 6800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gouverneur
## 6801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   government�s
## 6802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      governors
## 6803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grads
## 6804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gradual
## 6805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      graduates
## 6806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grande
## 6807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   grandparents
## 6808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          graph
## 6809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gratitude
## 6810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         graves
## 6811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     greenhouse
## 6812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        greeted
## 6813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       greffier
## 6814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grips
## 6815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grown
## 6816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gtha
## 6817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         guerre
## 6818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          guide
## 6819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         guilty
## 6820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gyms
## 6821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          g�ant
## 6822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           h1n1
## 6823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hahaha
## 6824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          haida
## 6825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   hairdressers
## 6826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hallie
## 6827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           halt
## 6828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hang
## 6829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hanging
## 6830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hardships
## 6831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hasta
## 6832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hat
## 6833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           heal
## 6834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hearings
## 6835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          heron
## 6836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      highburry
## 6837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      highlight
## 6838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hills
## 6839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hinshaw
## 6840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hire
## 6841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hired
## 6842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       historic
## 6843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hole
## 6844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        holiday
## 6845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       holidays
## 6846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hollywood
## 6847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        holyoke
## 6848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   homelessness
## 6849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hosts
## 6850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hourly
## 6851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         houses
## 6852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ht
## 6853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/0nxjwo85fi
## 6854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/1jrexemj6z
## 6855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/6nb6tblcuk
## 6856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/c0j67k5qpr
## 6857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/cpyhre87tz
## 6858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/csqfbfmbp5
## 6859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/cyukeolrd9
## 6860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/d6xvuteh3z
## 6861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/exspmgekga
## 6862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/fyys7kbeuy
## 6863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/idl9s83k11
## 6864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/kurbcp5knk
## 6865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/l2onyset8u
## 6866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/l8d1mwbivu
## 6867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/pnywthdgyq
## 6868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/qyxxnsccjl
## 6869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/rruxooe5bb
## 6870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/thoj9t0laa
## 6871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/wthnp9gq8t
## 6872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/zp4kky02mw
## 6873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/zsy8m5apja
## 6874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           huit
## 6875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hunting
## 6876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ici
## 6877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ideal
## 6878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    identifying
## 6879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          idiot
## 6880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            if�
## 6881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ig
## 6882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ikea
## 6883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  illconsidered
## 6884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    immigration
## 6885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         impede
## 6886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   implementing
## 6887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   implications
## 6888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      importing
## 6889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         impose
## 6890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     impressive
## 6891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   improvements
## 6892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  inadvertently
## 6893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inclusion
## 6894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inconsistent
## 6895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     increasing
## 6896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          index
## 6897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     indicators
## 6898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        indique
## 6899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    individuals
## 6900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     industrial
## 6901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    inefficient
## 6902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inequities
## 6903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        infect�
## 6904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       infect�s
## 6905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inflammation
## 6906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       infrared
## 6907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   initialement
## 6908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    initiatives
## 6909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         injury
## 6910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          input
## 6911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        inquiry
## 6912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inscriptions
## 6913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        insists
## 6914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inspectors
## 6915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        inspire
## 6916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       inspires
## 6917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      instagram
## 6918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      installed
## 6919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       instaur�
## 6920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      institute
## 6921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  institutional
## 6922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   institutions
## 6923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   intelligence
## 6924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    intensifies
## 6925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     intentions
## 6926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     introduced
## 6927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  investigating
## 6928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 investigations
## 6929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      investing
## 6930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     investment
## 6931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      investors
## 6932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        invites
## 6933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           iraq
## 6934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         irish�
## 6935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     irrelevant
## 6936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  irresponsible
## 6937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        isolate
## 6938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         israel
## 6939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         isra�l
## 6940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        issuing
## 6941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          it�ll
## 6942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ivison
## 6943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      izquierda
## 6944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jack
## 6945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jade
## 6946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         janhvi
## 6947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        january
## 6948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jess
## 6949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jesus
## 6950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jets
## 6951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jeudi
## 6952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jewish
## 6953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     jiggauncut
## 6954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        johnson
## 6955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          joins
## 6956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jos�
## 6957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jour
## 6958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        journey
## 6959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jours
## 6960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           juan
## 6961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jueves
## 6962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            jug
## 6963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         juiced
## 6964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        juillet
## 6965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         junior
## 6966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jury
## 6967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        justify
## 6968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           j�ai
## 6969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  kapoorstarrer
## 6970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          karim
## 6971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kasei
## 6972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kassem
## 6973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kendi�
## 6974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           khan
## 6975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kick
## 6976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kidding
## 6977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kill
## 6978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        killing
## 6979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kiss
## 6980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kissing
## 6981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         koreas
## 6982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kudos
## 6983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kumari
## 6984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kyla
## 6985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lab
## 6986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         labels
## 6987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       labrador
## 6988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lady
## 6989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lambton
## 6990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lam�rique
## 6991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           land
## 6992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       landlord
## 6993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      landlords
## 6994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lartiste
## 6995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          laser
## 6996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lasting
## 6997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         latine
## 6998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         latinx
## 6999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          laura
## 7000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lauren
## 7001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           laws
## 7002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lawyers
## 7003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         league
## 7004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           leak
## 7005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lean
## 7006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lease
## 7007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leaving
## 7008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lecce
## 7009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          legal
## 7010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      legendary
## 7011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            leo
## 7012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lepers
## 7013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lesly
## 7014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           leur
## 7015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          leurs
## 7016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lgbtq+
## 7017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      libraries
## 7018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        library
## 7019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        licence
## 7020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       licences
## 7021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       licensed
## 7022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lien
## 7023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lighter
## 7024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     likelihood
## 7025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        linings
## 7026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              lionessboutiquess
## 7027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        listing
## 7028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     litigation
## 7029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          li�es
## 7030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           loan
## 7031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         loblaw
## 7032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         locals
## 7033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        located
## 7034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      locations
## 7035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lock
## 7036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          locum
## 7037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           loms
## 7038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         looked
## 7039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       loosened
## 7040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lors
## 7041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         losing
## 7042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lourd
## 7043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lower
## 7044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          loyal
## 7045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           luck
## 7046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lunch
## 7047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         luxury
## 7048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   l�universit�
## 7049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       l��gypte
## 7050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         l��tat
## 7051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           maga
## 7052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       magazine
## 7053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          maine
## 7054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        majeure
## 7055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         malgr�
## 7056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          malik
## 7057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          malls
## 7058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   malnutrition
## 7059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  manifestation
## 7060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 manifestations
## 7061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         manner
## 7062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  manufacturing
## 7063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           maps
## 7064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       marchers
## 7065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   marginalized
## 7066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        markers
## 7067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        markets
## 7068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        markham
## 7069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          marks
## 7070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    marlborough
## 7071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mars
## 7072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         masked
## 7073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    maskwearing
## 7074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  massachusetts
## 7075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          matin
## 7076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        matthew
## 7077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mayo
## 7078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mediation
## 7079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      medicines
## 7080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         medics
## 7081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      medtronic
## 7082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   menstruation
## 7083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mention
## 7084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mentioned
## 7085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           menu
## 7086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mesa
## 7087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         method
## 7088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         metric<u+0001f6a6>with
## 7089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          metro
## 7090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mettent
## 7091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mexique
## 7092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mia
## 7093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              microdermabrasion
## 7094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       midlands
## 7095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       midmarch
## 7096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mill
## 7097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         miller
## 7098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         milles
## 7099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mindful
## 7100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          minds
## 7101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mindset
## 7102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mining
## 7103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      minnesota
## 7104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         minute
## 7105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mobility
## 7106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mode
## 7107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         modern
## 7108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        moderna
## 7109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           modi
## 7110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  modifications
## 7111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mod�les
## 7112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mohena
## 7113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        moncton
## 7114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mondiales
## 7115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        monitor
## 7116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mon�taire
## 7117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          more�
## 7118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          morin
## 7119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mortality
## 7120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       motivate
## 7121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       movement
## 7122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         movers
## 7123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             mp
## 7124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            msm
## 7125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mundo
## 7126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mural
## 7127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      murderers
## 7128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          murio
## 7129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         muslim
## 7130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          myths
## 7131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       m�decins
## 7132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            m�s
## 7133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nada
## 7134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nadeen
## 7135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nagaland
## 7136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        napping
## 7137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      narrative
## 7138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nationale
## 7139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nationals
## 7140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     navigating
## 7141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nearby
## 7142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      negative�
## 7143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 neighbourhoods
## 7144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     neighbours
## 7145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    netherlands
## 7146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       networks
## 7147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           new�
## 7148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nguyen
## 7149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nicely
## 7150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nisra
## 7151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nivel
## 7152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             nl
## 7153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nomination
## 7154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       noncovid
## 7155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     noncovid19
## 7156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nonmedical
## 7157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nonprofit
## 7158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nonprofits
## 7159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       normalcy
## 7160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         normes
## 7161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         norths
## 7162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      northwood
## 7163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nosotros
## 7164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          notes
## 7165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  notifications
## 7166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         noting
## 7167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           not�
## 7168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               nouveaubrunswick
## 7169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           now�
## 7170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            npr
## 7171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nuestra
## 7172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            n�a
## 7173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          n�est
## 7174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   observations
## 7175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          occur
## 7176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      occurring
## 7177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        oconnor
## 7178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         oliver
## 7179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       omission
## 7180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           omni
## 7181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         oneill
## 7182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        online�
## 7183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            opt
## 7184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       optimism
## 7185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           oral
## 7186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  organisation�
## 7187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       organize
## 7188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      organized
## 7189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           orgs
## 7190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       original
## 7191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            or�
## 7192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             os
## 7193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ott
## 7194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        otumfuo
## 7195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     outbastard
## 7196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        outlets
## 7197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       outlined
## 7198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    outstanding
## 7199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       overcome
## 7200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       overseas
## 7201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      oversight
## 7202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    overwhelmed
## 7203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   overwhelming
## 7204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          owned
## 7205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pa
## 7206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pack
## 7207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pain
## 7208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     palliative
## 7209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pandemics
## 7210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pandemie
## 7211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parallels
## 7212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     paramedics
## 7213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          paris
## 7214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parkway
## 7215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    participant
## 7216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   participated
## 7217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  participating
## 7218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pase
## 7219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          passe
## 7220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       patience
## 7221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        patrons
## 7222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pdt
## 7223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pei
## 7224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pelley
## 7225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pen
## 7226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      penalties
## 7227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       people��
## 7228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        percent
## 7229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        perfect
## 7230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      perfectly
## 7231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      performed
## 7232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     performing
## 7233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        periods
## 7234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         permis
## 7235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          perte
## 7236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pete
## 7237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          peter
## 7238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         peuple
## 7239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           peut
## 7240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         peuton
## 7241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       peut�tre
## 7242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peuvent
## 7243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           peyi
## 7244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           phil
## 7245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      physician
## 7246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pic
## 7247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pieces
## 7248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pied
## 7249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pioneer
## 7250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pipelines
## 7251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pire
## 7252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          plain
## 7253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        plaisir
## 7254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       plateaus
## 7255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      platforms
## 7256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         played
## 7257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    playgrounds
## 7258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          plays
## 7259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           plea
## 7260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pleasure
## 7261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         plenty
## 7262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pls
## 7263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      plusieurs
## 7264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            poc
## 7265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        podcast
## 7266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          poder
## 7267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       policing
## 7268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     polici�res
## 7269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    politicians
## 7270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       politics
## 7271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     politiques
## 7272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        popplug
## 7273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        popular
## 7274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          popup
## 7275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      porcupine
## 7276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         portal
## 7277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         porter
## 7278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      portraits
## 7279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pos
## 7280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      positions
## 7281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     positively
## 7282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     positivity
## 7283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    possibility
## 7284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       possibly
## 7285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      postcovid
## 7286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          poste
## 7287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         poster
## 7288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      postgrads
## 7289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        postive
## 7290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pourquoi
## 7291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pourra
## 7292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       poursuit
## 7293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pouvoir
## 7294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pozitif50
## 7295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pr
## 7296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  practitioners
## 7297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     precovid19
## 7298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     predicated
## 7299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        preempt
## 7300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    preexisting
## 7301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      premier�s
## 7302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   preparations
## 7303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prepare
## 7304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prepares
## 7305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         presse
## 7306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    preventable
## 7307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prince
## 7308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          prior
## 7309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prisons
## 7310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    privacidade
## 7311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     privileged
## 7312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      procedure
## 7313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        proceed
## 7314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       proceeds
## 7315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     processing
## 7316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prochain
## 7317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     profession
## 7318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     professors
## 7319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     programmes
## 7320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    projections
## 7321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       promised
## 7322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      promoted�
## 7323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         proper
## 7324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     protecting
## 7325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      protocole
## 7326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           prov
## 7327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          prove
## 7328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         proven
## 7329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      providers
## 7330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prymak
## 7331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pr�s
## 7332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pr�sent
## 7333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pr�t
## 7334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pr�visions
## 7335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pr�vu
## 7336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pts
## 7337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pu
## 7338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        public�
## 7339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pueblo
## 7340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       punitive
## 7341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      purchased
## 7342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pushes
## 7343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          p�rou
## 7344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        qualify
## 7345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quality
## 7346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         quatre
## 7347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quatri�me
## 7348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quell
## 7349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       quelques
## 7350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           quil
## 7351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       quizzthe
## 7352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           quoi
## 7353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quote
## 7354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         qu�ils
## 7355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        racisme
## 7356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        racism�
## 7357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rain
## 7358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          raisa
## 7359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ramp
## 7360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ranked
## 7361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rapid
## 7362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 rassemblements
## 7363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rated
## 7364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            raw
## 7365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           raza
## 7366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       realtime
## 7367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reasons
## 7368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         recall
## 7369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recalled
## 7370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recherche
## 7371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recipients
## 7372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recognized
## 7373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recognizing
## 7374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recommend
## 7375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 reconciliation
## 7376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recovering
## 7377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recovers
## 7378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recrutement
## 7379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reduction
## 7380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reeling
## 7381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reflect
## 7382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reflections
## 7383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         refund
## 7384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         refuse
## 7385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        regatta
## 7386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         regina
## 7387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      registers
## 7388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           regs
## 7389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reimagine
## 7390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          relax
## 7391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     relaxation
## 7392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        relaxed
## 7393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       releases
## 7394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    religieuses
## 7395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       remained
## 7396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         remind
## 7397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        removal
## 7398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         remove
## 7399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        removes
## 7400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       removing
## 7401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rendu
## 7402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          renew
## 7403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        renewal
## 7404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      repayment
## 7405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       replaced
## 7406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          reply
## 7407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       report�e
## 7408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         repost
## 7409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reprendre
## 7410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     represents
## 7411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reproduction
## 7412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     repr�sente
## 7413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       requests
## 7414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       requires
## 7415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     researcher
## 7416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       resolved
## 7417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      respecter
## 7418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     respecting
## 7419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    respondents
## 7420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     responders
## 7421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     responding
## 7422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ressources
## 7423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rester
## 7424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       resulted
## 7425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       resuming
## 7426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      retailers
## 7427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        retenir
## 7428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    retroactive
## 7429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      returning
## 7430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reverse
## 7431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        revient
## 7432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rhubarb
## 7433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rickyblingfreshikonz
## 7434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rien
## 7435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rinks
## 7436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rioting
## 7437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          risen
## 7438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          river
## 7439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      riverside
## 7440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rnaught
## 7441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         robert
## 7442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rocks
## 7443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           roll
## 7444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rolling
## 7445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ross
## 7446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        roundup
## 7447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            row
## 7448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          royal
## 7449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           runs
## 7450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         russia
## 7451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        russias
## 7452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ryanair
## 7453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         r�gles
## 7454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        r�ponse
## 7455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     r�publique
## 7456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sait
## 7457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sam
## 7458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          saman
## 7459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       samantha
## 7460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sample
## 7461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sanitized
## 7462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sanitizing
## 7463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          saraf
## 7464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sarcasm
## 7465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sars
## 7466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          scary
## 7467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       schedule
## 7468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         scheme
## 7469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       scotians
## 7470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         screen
## 7471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        screens
## 7472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         scrubs
## 7473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         search
## 7474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       seasonal
## 7475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        seasons
## 7476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           seat
## 7477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         secret
## 7478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           seek
## 7479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        segment
## 7480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         select
## 7481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       selfcare
## 7482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sell
## 7483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sellers
## 7484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sen
## 7485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sending
## 7486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        senegal
## 7487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       separate
## 7488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     separately
## 7489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         serait
## 7490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sessions
## 7491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sest
## 7492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sets
## 7493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sewers
## 7494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sexually
## 7495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shame
## 7496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shape
## 7497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       share�to
## 7498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sharp
## 7499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     shattering
## 7500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            shd
## 7501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sheaghdha
## 7502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shelter
## 7503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          she�s
## 7504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shipments
## 7505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shirt
## 7506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shocking
## 7507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shoes
## 7508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shoot
## 7509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shooting
## 7510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shortfall
## 7511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           shot
## 7512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shots
## 7513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shrink
## 7514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       siddhant
## 7515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        signage
## 7516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         silver
## 7517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  simcoemuskoka
## 7518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sincere
## 7519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sing
## 7520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      singleday
## 7521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sits
## 7522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           size
## 7523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          skill
## 7524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         skills
## 7525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           skin
## 7526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sleep
## 7527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         slight
## 7528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            smh
## 7529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           snap
## 7530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sniff
## 7531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     snowballed
## 7532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      socialize
## 7533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       socially
## 7534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           soft
## 7535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         soient
## 7536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           soin
## 7537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          soins
## 7538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          solve
## 7539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            som
## 7540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       somerset
## 7541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sons
## 7542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sophia
## 7543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sorts
## 7544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sounds
## 7545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sourire
## 7546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sous
## 7547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         speaks
## 7548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   specifically
## 7549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spikes
## 7550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          spray
## 7551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spreaders
## 7552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spreads
## 7553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   sp�cialistes
## 7554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         square
## 7555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       srascov2
## 7556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       staffers
## 7557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         staged
## 7558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    stakeholder
## 7559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       standing
## 7560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stateowned
## 7561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         status
## 7562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        stepped
## 7563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sti
## 7564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stick
## 7565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stimulus
## 7566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stole
## 7567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stone
## 7568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          storm
## 7569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         storm�
## 7570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         strain
## 7571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       stranded
## 7572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      strat�gie
## 7573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    streamlined
## 7574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stressing
## 7575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       studies�
## 7576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          style
## 7577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             su
## 7578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        subject
## 7579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     subsaharan
## 7580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      subscribe
## 7581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      subsidies
## 7582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        subsidy
## 7583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    substantial
## 7584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         subway
## 7585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   successfully
## 7586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sucks
## 7587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   sudam�ricain
## 7588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sudden
## 7589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sufferers
## 7590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        suggest
## 7591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suggestion
## 7592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        suicide
## 7593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       suicides
## 7594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          suite
## 7595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         summit
## 7596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      supported
## 7597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       supports
## 7598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       supposed
## 7599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         surely
## 7600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       surgeons
## 7601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    surgisphere
## 7602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        survive
## 7603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        suspect
## 7604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      suspected
## 7605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    sustainable
## 7606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sustaining
## 7607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         swann�
## 7608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sweden�s
## 7609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sweet
## 7610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    symptomatic
## 7611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      synthetic
## 7612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     s�ajoutent
## 7613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       s�curit�
## 7614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           s�il
## 7615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tackling
## 7616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        takeout
## 7617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tally
## 7618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tammy
## 7619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tanking
## 7620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      taoiseach
## 7621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          taper
## 7622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         target
## 7623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tattoo
## 7624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         taught
## 7625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       teaching
## 7626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           teen
## 7627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      telephone
## 7628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   temperatures
## 7629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      temporada
## 7630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 temporairement
## 7631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tener
## 7632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tension
## 7633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tensions
## 7634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tentative
## 7635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    territories
## 7636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tester
## 7637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       testing�
## 7638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      thailands
## 7639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          than�
## 7640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         thatll
## 7641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        theatre
## 7642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     theatrical
## 7643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      theorists
## 7644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          thern
## 7645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        they�ve
## 7646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         thirds
## 7647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          this�
## 7648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       threaten
## 7649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     threatened
## 7650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        thrives
## 7651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ticket
## 7652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tiens
## 7653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           till
## 7654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    timminsarea
## 7655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tire
## 7656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tirelessly
## 7657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          title
## 7658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        toddler
## 7659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        toehold
## 7660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ton
## 7661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tool
## 7662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tools
## 7663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          topic
## 7664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         topics
## 7665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       toronto�
## 7666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         totals
## 7667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         total�
## 7668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          touch
## 7669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       touching
## 7670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tournament
## 7671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      toutefois
## 7672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      townships
## 7673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         traced
## 7674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tragedy
## 7675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          train
## 7676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trainer
## 7677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      transport
## 7678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    traumatized
## 7679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        travail
## 7680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     travellers
## 7681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        treated
## 7682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         treats
## 7683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trials
## 7684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tribute
## 7685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      triggered
## 7686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tristar
## 7687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      troisi�me
## 7688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trreb
## 7689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       trucking
## 7690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trucks
## 7691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       trulieve
## 7692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trusted
## 7693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tue
## 7694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        twoweek
## 7695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tyler
## 7696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           type
## 7697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          type1
## 7698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ultimately
## 7699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             um
## 7700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          uncle
## 7701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    underserved
## 7702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     unexpected
## 7703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   unidentified
## 7704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      universal
## 7705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        unknown
## 7706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     unreliable
## 7707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     unreported
## 7708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     unresolved
## 7709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unruly
## 7710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unveil
## 7711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        unveils
## 7712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          upper
## 7713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         uptake
## 7714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         uptick
## 7715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         upturn
## 7716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           urge
## 7717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            usa
## 7718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       vacation
## 7719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    vaccination
## 7720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         valeur
## 7721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       valuable
## 7722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vargas
## 7723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          vegas
## 7724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          veins
## 7725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           vers
## 7726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           veut
## 7727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         viajes
## 7728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       victoria
## 7729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         videos
## 7730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          viele
## 7731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         vienen
## 7732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          vient
## 7733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        viewing
## 7734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            vil
## 7735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        village
## 7736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        viruses
## 7737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      virusfree
## 7738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         virus�
## 7739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            vis
## 7740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       visi�res
## 7741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          vista
## 7742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          voice
## 7743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          voici
## 7744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   volunteering
## 7745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vornado
## 7746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            vos
## 7747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          votre
## 7748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        voulait
## 7749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         voyage
## 7750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          vying
## 7751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wages
## 7752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        walmart
## 7753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           warm
## 7754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        warming
## 7755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       warriors
## 7756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wars
## 7757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wary
## 7758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wastewater
## 7759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       watchdog
## 7760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          waves
## 7761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wealth
## 7762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         week�s
## 7763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          weigh
## 7764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         weight
## 7765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       welcomes
## 7766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      welcoming
## 7767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wellbeing
## 7768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     wellington
## 7769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wellness
## 7770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        western
## 7771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            wet
## 7772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 whiteunderwood
## 7773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        william
## 7774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wilma
## 7775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            win
## 7776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wineries
## 7777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wing
## 7778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       winnipeg
## 7779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wins
## 7780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wishes
## 7781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        witness
## 7782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     woodbridge
## 7783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       workdays
## 7784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     workplaces
## 7785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      worldwide
## 7786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         world�
## 7787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      worsening
## 7788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wright
## 7789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         writer
## 7790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        written
## 7791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             x5
## 7792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ya
## 7793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         year�s
## 7794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        yelling
## 7795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         yellow
## 7796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             yg
## 7797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        youtube
## 7798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           you�
## 7799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             yr
## 7800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     zealanders
## 7801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           zeev
## 7802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             zh
## 7803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �american
## 7804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            �as
## 7805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �china
## 7806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �coolie
## 7807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �covid
## 7808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �covid19
## 7809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �cytokine
## 7810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �experts�
## 7811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �gunjan
## 7812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �g�es
## 7813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �i�m
## 7814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �mission
## 7815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �now
## 7816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �social
## 7817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �stigma
## 7818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �tats
## 7819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �there
## 7820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �tude
## 7821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �viter
## 7822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �you
## 7823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @afhto
## 7824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ahsmedia
## 7825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @alykhanabdulla
## 7826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @amerikangirlll
## 7827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @anitaoakville
## 7828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @antoniosabatojr
## 7829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @arlenedickinson
## 7830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @bbcworldservice
## 7831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @bjmcbc
## 7832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cbccalgary
## 7833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @cbcnews
## 7834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @cbcpei
## 7835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @cdcgov
## 7836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @chelseahandler
## 7837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @cini333
## 7838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @citycynthia
## 7839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           @cnn
## 7840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @coachrankine
## 7841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cowaninsurance
## 7842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ctvnewsnorthern
## 7843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ctvottawa
## 7844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ctvwinnipeg
## 7845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @davidkaplanmd
## 7846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @dremilyportermd
## 7847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @dsiletsdaniel1
## 7848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @excelsior
## 7849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ez4u2sayjanis
## 7850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @fleines
## 7851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @fragolinadivina
## 7852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @fundstrat
## 7853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @gataluna21
## 7854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           @gop
## 7855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @gregdurocher
## 7856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @hblodget
## 7857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @inspq
## 7858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @isapicard
## 7859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @ivyomd
## 7860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jbellava
## 7861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jimwatsonottawa
## 7862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jjhorgan
## 7863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @jmmcgrath
## 7864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @keithbaldrey
## 7865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kyliejanekremer
## 7866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @lapresse
## 7867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lavignep007
## 7868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @marcomendicino
## 7869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mariokaryeras
## 7870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @marwahrizqy
## 7871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mathiasbrunet
## 7872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mattwolfab
## 7873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @maude102
## 7874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @mbgov
## 7875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mghtoronto
## 7876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mikerosoft1
## 7877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mohamedtahiri
## 7878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @morgannec
## 7879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nationalpost
## 7880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ocfppresident
## 7881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @ongov
## 7882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @onthealth
## 7883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ontparamedic
## 7884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ottawahealth
## 7885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @patrickdery
## 7886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @psicedum
## 7887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @queerthoughts
## 7888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @radiocanadainfo
## 7889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @randyhillier
## 7890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @rebelnewsonline
## 7891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @retiredcdnrjb
## 7892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @richardzussman
## 7893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @rnao
## 7894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rosiebarton
## 7895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @royalcdnlegion
## 7896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @sebbovetsrc
## 7897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @sflecce
## 7898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @shandro
## 7899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @sogcorg
## 7900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @stcatstandard
## 7901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @sunrickbell
## 7902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @terraathome
## 7903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @thenccih
## 7904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @topublichealth
## 7905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @torontomedics
## 7906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @torontopearson
## 7907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @trevorp17397909
## 7908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ubakaogbogu
## 7909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           @uhn
## 7910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @vchhealthcare
## 7911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #albertans
## 7912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #anxiety
## 7913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #assnat
## 7914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #bollywood
## 7915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #breaking
## 7916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #canadas
## 7917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #canpoli
## 7918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #capitol
## 7919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #chloroquine
## 7920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ckont
## 7921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #clean
## 7922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #community
## 7923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #communitynews
## 7924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #couvrefeu
## 7925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #couvrefeu20h
## 7926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covid19bc
## 7927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covid19nb
## 7928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covidalert
## 7929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covidavion
## 7930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covidisairborne
## 7931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #depression
## 7932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #endcovideverywhere
## 7933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #facepalm
## 7934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #fordfailedontario
## 7935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #fordfailedthepeople
## 7936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #gettheshot
## 7937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #grandcrossoverservice
## 7938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #grantsgourmet
## 7939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #halometrics
## 7940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #happynewyear
## 7941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #hydroxycholoroquine
## 7942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #lockdownontario
## 7943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #lol
## 7944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #lossprevention
## 7945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #manitoba
## 7946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #mbpoli
## 7947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #mefloquine
## 7948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #mentalhealthawareness
## 7949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #nb
## 7950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #nbhealth
## 7951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #nccihwebinar
## 7952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #neurotoxicity
## 7953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #onrc
## 7954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #onted
## 7955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #pei
## 7956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #psychotherapist
## 7957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #psychotherapy
## 7958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #quebec
## 7959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #quinism
## 7960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #quinoline
## 7961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #qu�bec
## 7962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #realestate
## 7963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #retail
## 7964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #retailproblems
## 7965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #safetyfirst
## 7966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #selfcare
## 7967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #smallbusiness
## 7968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #sterile
## 7969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #storesecurity
## 7970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #todoestar�bien
## 7971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #twug
## 7972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #vaccin
## 7973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #vaccines
## 7974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #ventilation
## 7975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #votefordout2022
## 7976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #wearamask
## 7977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #wpg
## 7978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #yeg
## 7979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #youth
## 7980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #yqg
## 7981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0001f1fa><u+0001f1f8>
## 7982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f441>
## 7983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f442>
## 7984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f449>
## 7985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f4c8>
## 7986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f4c8>growth
## 7987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f602>
## 7988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f603>
## 7989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f610>
## 7990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f61e>
## 7991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f644>
## 7992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f973>
## 7993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+0001f9a0>infections
## 7994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0432>
## 7995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0434><u+043b><u+044f>
## 7996                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+043f><u+0440><u+0430><u+043a><u+0442><u+0438><u+0447><u+0435><u+0441><u+043a><u+0438>
## 7997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0628><u+0631>
## 7998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+062a><u+0648>
## 7999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+062a><u+06cc><u+0631><u+0627>
## 8000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+062f><u+0646><u+06cc><u+0627>
## 8001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0641><u+064a>
## 8002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+06a9><u+0627><u+0634>
## 8003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+06c1><u+06cc>
## 8004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+2620><u+fe0f>deaths
## 8005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+26a0><u+fe0f>
## 8006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+2714><u+fe0f>
## 8007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+2935><u+fe0f>
## 8008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           14th
## 8009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            1er
## 8010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        20hours
## 8011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            20s
## 8012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           28th
## 8013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            2pm
## 8014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             2x
## 8015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           35pm
## 8016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             5h
## 8017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          72hrs
## 8018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            8pm
## 8019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            8th
## 8020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    accelerates
## 8021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   acceleration
## 8022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 accountability
## 8023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      acc�l�rer
## 8024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        actions
## 8025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      activists
## 8026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         actual
## 8027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          acute
## 8028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adding
## 8029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  administering
## 8030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adults
## 8031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       advocacy
## 8032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        affairs
## 8033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         affect
## 8034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           afin
## 8035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         agenda
## 8036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     aggressive
## 8037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         agreed
## 8038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aide
## 8039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ainsi
## 8040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ako
## 8041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alarms
## 8042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       alastair
## 8043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alerte
## 8044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           algo
## 8045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alive
## 8046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         allard
## 8047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          allez
## 8048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alors
## 8049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        amplify
## 8050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       analysis
## 8051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         animal
## 8052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  announcements
## 8053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ann�e
## 8054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ann�es
## 8055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       answered
## 8056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          antes
## 8057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    antibiotics
## 8058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        anymore
## 8059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      apologize
## 8060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     apparently
## 8061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        appears
## 8062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        apple�s
## 8063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    application
## 8064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   applications
## 8065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        applies
## 8066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          apply
## 8067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   appreciation
## 8068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     approaches
## 8069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       approval
## 8070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        approve
## 8071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           arab
## 8072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            arm
## 8073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           arms
## 8074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arrest
## 8075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arruda
## 8076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           arts
## 8077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          asahi
## 8078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           asap
## 8079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          asian
## 8080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ass
## 8081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            as�
## 8082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       athletes
## 8083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      attacking
## 8084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        attacks
## 8085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       atteinte
## 8086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       atteints
## 8087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       attended
## 8088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aucun
## 8089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          audit
## 8090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      augmenter
## 8091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aunt
## 8092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aupr�s
## 8093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         auront
## 8094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aurora
## 8095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     australias
## 8096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      autorit�s
## 8097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         autour
## 8098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          await
## 8099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          award
## 8100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           azul
## 8101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            b2b
## 8102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         babies
## 8103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bar
## 8104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        barbara
## 8105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         barely
## 8106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           base
## 8107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          basic
## 8108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                bassaintlaurent
## 8109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bcg
## 8110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bcs
## 8111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bc�s
## 8112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           beat
## 8113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       beaucoup
## 8114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        before�
## 8115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         begins
## 8116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      behaviour
## 8117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bench
## 8118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       benefits
## 8119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bhavna
## 8120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bias
## 8121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          biden
## 8122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bient�t
## 8123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        biggest
## 8124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bill
## 8125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       billions
## 8126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bio
## 8127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          birth
## 8128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       birthday
## 8129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bma
## 8130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bodies
## 8131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           body
## 8132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          books
## 8133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bosses
## 8134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bottas
## 8135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bound
## 8136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bow
## 8137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          braid
## 8138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brampton
## 8139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  breastfeeding
## 8140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bridge
## 8141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brossard
## 8142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brother
## 8143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brothers
## 8144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          buena
## 8145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bueno
## 8146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        buffalo
## 8147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bunch
## 8148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        burnaby
## 8149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           busy
## 8150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bus�
## 8151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         buying
## 8152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bylaw
## 8153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            c19
## 8154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            caf
## 8155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          caf�s
## 8156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     calculator
## 8157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         campus
## 8158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        canada�
## 8159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cancel
## 8160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cancelling
## 8161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cancels
## 8162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        canucks
## 8163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        captain
## 8164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        capture
## 8165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        careful
## 8166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     caregivers
## 8167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cars
## 8168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        casjour
## 8169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cat
## 8170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          catch
## 8171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         caucus
## 8172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        causing
## 8173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    celebrating
## 8174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cell
## 8175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cellphone
## 8176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         center
## 8177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        central
## 8178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chairman
## 8179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chamber
## 8180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        changed
## 8181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chanson
## 8182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       charcoal
## 8183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         charge
## 8184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        charles
## 8185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chats
## 8186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   chauffailles
## 8187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        checked
## 8188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       checking
## 8189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           chef
## 8190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cherchez
## 8191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            chi
## 8192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chicago
## 8193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chinas
## 8194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chirurgies
## 8195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      christine
## 8196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       churches
## 8197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cine
## 8198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cities�
## 8199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          civic
## 8200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          civil
## 8201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clarity
## 8202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          class
## 8203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     classrooms
## 8204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        clifton
## 8205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     clinically
## 8206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         closer
## 8207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             cm
## 8208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          coast
## 8209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cognitive
## 8210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coherent
## 8211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cohort
## 8212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       columbia
## 8213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      columbias
## 8214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          comet
## 8215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        comment
## 8216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      commerces
## 8217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     commercial
## 8218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   commissioner
## 8219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      committed
## 8220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    communicate
## 8221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     communiqu�
## 8222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      companies
## 8223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     compatible
## 8224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         comply
## 8225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     comptables
## 8226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         compte
## 8227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      concluded
## 8228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    conferences
## 8229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confiance
## 8230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confident
## 8231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  confinamiento
## 8232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   confirmation
## 8233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confusion
## 8234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       congress
## 8235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    connecticut
## 8236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     considered
## 8237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   consistently
## 8238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   constituents
## 8239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        consult
## 8240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      contained
## 8241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      contamin�
## 8242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        content
## 8243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      contract�
## 8244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conversation
## 8245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      convicted
## 8246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cork
## 8247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             coronavirusrelated
## 8248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   coronavirus�
## 8249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        correct
## 8250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   correctional
## 8251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         costco
## 8252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        council
## 8253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        counter
## 8254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       counties
## 8255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      country�s
## 8256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         county
## 8257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        courses
## 8258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          court
## 8259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         courts
## 8260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         couvre
## 8261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        covaxin
## 8262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        creates
## 8263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crews
## 8264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       criminal
## 8265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crise
## 8266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cual
## 8267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cubes
## 8268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          culpa
## 8269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cultural
## 8270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cup
## 8271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        curtail
## 8272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          curve
## 8273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cut
## 8274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         c�digo
## 8275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       c�tenord
## 8276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        c�toyer
## 8277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         daily�
## 8278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dan
## 8279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         daniel
## 8280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dark
## 8281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dashboard
## 8282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deadline
## 8283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deaf
## 8284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        debemos
## 8285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           debt
## 8286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deceased
## 8287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         decide
## 8288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         declan
## 8289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        decline
## 8290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deeply
## 8291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     definitive
## 8292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         delays
## 8293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deliberada
## 8294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   deliberately
## 8295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      delivered
## 8296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        demande
## 8297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        demands
## 8298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  demonstrating
## 8299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deny
## 8300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    departments
## 8301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dernier
## 8302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       derni�re
## 8303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     designated
## 8304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     desjardins
## 8305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   destinations
## 8306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         devant
## 8307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dia
## 8308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diagnosis
## 8309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dici
## 8310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          diego
## 8311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diffusion
## 8312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       diligent
## 8313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dimos
## 8314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     directives
## 8315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       directly
## 8316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   discouraged�
## 8317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     discovered
## 8318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 discrimination
## 8319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      discusses
## 8320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     discussion
## 8321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    discussions
## 8322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disgusting
## 8323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dispel
## 8324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disponible
## 8325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dispositif
## 8326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             disproportionately
## 8327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    documentary
## 8328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           doit
## 8329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       domicile
## 8330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         donald
## 8331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        donegal
## 8332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     downloaded
## 8333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       downtown
## 8334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dozens
## 8335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          drabs
## 8336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dunne
## 8337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   durcissement
## 8338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dwindling
## 8339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           d�as
## 8340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           d�en
## 8341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          d�ici
## 8342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           d�j�
## 8343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            d�s
## 8344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   d�sinfectant
## 8345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         d��tre
## 8346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        earlier
## 8347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          earth
## 8348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         easter
## 8349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            eat
## 8350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ecce
## 8351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ed
## 8352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         editor
## 8353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      educating
## 8354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       efficacy
## 8355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             eh
## 8356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         eight�
## 8357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     eisenhower
## 8358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         emails
## 8359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        emerged
## 8360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    emergencies
## 8361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     emergency�
## 8362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emirates
## 8363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       employee
## 8364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     employment
## 8365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        empower
## 8366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        endured
## 8367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        english
## 8368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          enjeu
## 8369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     enqu�teurs
## 8370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         enrich
## 8371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          entry
## 8372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         envers
## 8373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        equally
## 8374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     equivalent
## 8375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             er
## 8376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        erdogan
## 8377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          erken
## 8378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ese
## 8379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         esposa
## 8380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        estamos
## 8381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          estce
## 8382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       estimate
## 8383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ethical
## 8384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       european
## 8385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        evident
## 8386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       evisitnb
## 8387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          exact
## 8388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       examples
## 8389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         excess
## 8390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      excovid19
## 8391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        excuses
## 8392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     executives
## 8393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exhausted
## 8394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     exhausting
## 8395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     exhibition
## 8396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         exists
## 8397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         expand
## 8398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       expanded
## 8399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    experienced
## 8400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       explains
## 8401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exposures
## 8402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      expressed
## 8403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    extendicare
## 8404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        extends
## 8405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        factors
## 8406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        faculty
## 8407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          faith
## 8408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fall
## 8409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fallen
## 8410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        familia
## 8411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         father
## 8412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fatherinlaw
## 8413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fatigue
## 8414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fears
## 8415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            feb
## 8416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           feed
## 8417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fellow
## 8418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fellows
## 8419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fermer
## 8420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ffs
## 8421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fianna
## 8422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fiasco
## 8423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          field
## 8424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         figure
## 8425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          final
## 8426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       finances
## 8427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       findings
## 8428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         finger
## 8429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fired
## 8430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      firstwave
## 8431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fitness
## 8432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fix
## 8433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     flattening
## 8434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       flexible
## 8435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          floor
## 8436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         floors
## 8437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        florida
## 8438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             fn
## 8439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      followers
## 8440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       followup
## 8441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           font
## 8442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       football
## 8443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          force
## 8444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      forefront
## 8445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        foreign
## 8446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          forma
## 8447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       formally
## 8448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         format
## 8449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                forphoneonlyfortabletportraitupfortabletlandscapeupfordesktopupforwidedesktopup
## 8450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fortnight
## 8451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fortunate
## 8452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      framework
## 8453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          frank
## 8454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       freezers
## 8455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    frightening
## 8456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     frustrated
## 8457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fr�o
## 8458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fueron
## 8459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fund
## 8460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        funding
## 8461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        furious
## 8462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       further�
## 8463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        f�vrier
## 8464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gained
## 8465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         galway
## 8466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gardens
## 8467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gasp�sie
## 8468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gatherings
## 8469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     georgetown
## 8470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             gh
## 8471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gift
## 8472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           glow
## 8473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gobierno
## 8474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            god
## 8475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gofundme
## 8476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gong
## 8477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         google
## 8478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gouv
## 8479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gov
## 8480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   government�s
## 8481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       governor
## 8482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gov�t
## 8483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gracias
## 8484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grade
## 8485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     graduation
## 8486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grant
## 8487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  grantsgourmet
## 8488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grippe
## 8489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gross
## 8490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grown
## 8491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          guest
## 8492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          guide
## 8493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gulati
## 8494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           guys
## 8495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gu�rison
## 8496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gyrophares
## 8497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hair
## 8498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        halifax
## 8499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           halt
## 8500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         halton
## 8501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hancock
## 8502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         harder
## 8503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hardest
## 8504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hardesthit
## 8505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           harm
## 8506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hate
## 8507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        haven�t
## 8508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       healthy�
## 8509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          heal�
## 8510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  heartbreaking
## 8511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         helped
## 8512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         heroes
## 8513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hesitancy
## 8514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         heures
## 8515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            he�
## 8516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       highways
## 8517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hitting
## 8518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hoax
## 8519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       homeland
## 8520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   homelessness
## 8521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          home�
## 8522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         honest
## 8523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        honesty
## 8524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     honourable
## 8525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hopeful
## 8526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hoping
## 8527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         horgan
## 8528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         horror
## 8529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hosford
## 8530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hospitales
## 8531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               hospitalisations
## 8532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                hospitalization
## 8533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hosting
## 8534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        housing
## 8535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hps
## 8536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/5j8lqefdvw
## 8537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/bvrdrjx5k3
## 8538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/df9sluejvw
## 8539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/ffxdlgbxvn
## 8540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/gwuz5yyqys
## 8541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/h6lotv4v7b
## 8542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/hpkebvrbcy
## 8543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/j35c69mrcd
## 8544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/mmfbofxsfg
## 8545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/mwcwxyx1ai
## 8546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/o09cnvezxo
## 8547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/px3mx4i58k
## 8548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/qdzdzycval
## 8549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/qk5fwasjee
## 8550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/qoltsr17gm
## 8551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/rerdujkx0q
## 8552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/suql6qpvrs
## 8553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/uozsef4kq6
## 8554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/xaybnp4rgx
## 8555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/yqj91pnejv
## 8556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/yv4b0vqkfb
## 8557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/zbhavvfgso
## 8558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/zjunixwdjz
## 8559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hubs
## 8560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hug
## 8561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hugs
## 8562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hundreds
## 8563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        husband
## 8564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      husband�s
## 8565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hyderabad
## 8566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hypocrisy
## 8567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        h�pital
## 8568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           icbt
## 8569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           icus
## 8570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          icymi
## 8571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         idiots
## 8572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ifp11
## 8573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ignoring
## 8574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        immense
## 8575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         immune
## 8576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  immunizations
## 8577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        impact�
## 8578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      implement
## 8579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       imposing
## 8580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         income
## 8581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      increases
## 8582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    independent
## 8583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        indepth
## 8584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     individual
## 8585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       infect�s
## 8586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     initiative
## 8587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        injured
## 8588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inmediato
## 8589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     innovative
## 8590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inoculate
## 8591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inoculations
## 8592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       instance
## 8593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      institute
## 8594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  institutional
## 8595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      insurance
## 8596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           inte
## 8597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       internal
## 8598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                internationally
## 8599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                interprovincial
## 8600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     interviews
## 8601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         intn�l
## 8602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     introduces
## 8603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    investments
## 8604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      irelands�
## 8605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ironic
## 8606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       isolated
## 8607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        israeli
## 8608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            is�
## 8609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          italy
## 8610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ivermectine
## 8611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ivermictine
## 8612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            i�d
## 8613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            jai
## 8614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jason
## 8615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         javais
## 8616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jean
## 8617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jennifer
## 8618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jessica
## 8619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jesus
## 8620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             jf
## 8621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          joins
## 8622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           joke
## 8623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        journal
## 8624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      judgement
## 8625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          julie
## 8626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jusqu�au
## 8627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jusqu��
## 8628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    kapuskasing
## 8629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kellyann
## 8630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kerala
## 8631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kick
## 8632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kicks
## 8633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kidney
## 8634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kirkland
## 8635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      kitchener
## 8636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        knowing
## 8637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         koulla
## 8638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          krgmt
## 8639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lab
## 8640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lagging
## 8641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lair
## 8642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         langar
## 8643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         laptop
## 8644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          latin
## 8645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         latinx
## 8646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       laughing
## 8647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         launch
## 8648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      launching
## 8649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          laval
## 8650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           laws
## 8651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        leading
## 8652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lecce
## 8653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            led
## 8654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          legal
## 8655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         legend
## 8656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lessons
## 8657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        letting
## 8658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           liar
## 8659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          links
## 8660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lire
## 8661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lisez
## 8662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          liste
## 8663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lists
## 8664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       listuguj
## 8665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lits
## 8666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lived
## 8667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            liz
## 8668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       location
## 8669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         locker
## 8670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     logistical
## 8671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lol
## 8672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           loms
## 8673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       longhaul
## 8674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lontario
## 8675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lose
## 8676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         losses
## 8677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lower
## 8678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       luchando
## 8679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lucky
## 8680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lying
## 8681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        l�ann�e
## 8682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   l�gislateurs
## 8683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           l�un
## 8684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mad
## 8685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mains
## 8686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    maintaining
## 8687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        managed
## 8688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        manager
## 8689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      manitobas
## 8690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          maori
## 8691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      maritimes
## 8692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        martian
## 8693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mary
## 8694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mary�s
## 8695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        masacre
## 8696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        maureen
## 8697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        maximum
## 8698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mayo
## 8699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mcbride
## 8700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           meal
## 8701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            med
## 8702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           meds
## 8703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meeting
## 8704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       memories
## 8705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          memos
## 8706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          menos
## 8707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mentioned
## 8708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          meses
## 8709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       messages
## 8710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mexican
## 8711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mia
## 8712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       midnight
## 8713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       migrants
## 8714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mike
## 8715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mild
## 8716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          miles
## 8717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       military
## 8718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       minority
## 8719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mins
## 8720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mirror
## 8721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mis
## 8722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     misleading
## 8723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mission
## 8724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              misunderstandings
## 8725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mixed
## 8726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mob
## 8727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mobility
## 8728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         models
## 8729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mondiale
## 8730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          moral
## 8731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         morena
## 8732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mothers
## 8733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mothers�
## 8734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mountain
## 8735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          moyen
## 8736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mps
## 8737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        muertes
## 8738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      municipal
## 8739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        musical
## 8740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         muslim
## 8741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mutate
## 8742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mutations
## 8743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          myths
## 8744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         m�xico
## 8745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           n95s
## 8746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          naive
## 8747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         naming
## 8748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      narrative
## 8749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nationally
## 8750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      national�
## 8751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     navigating
## 8752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nearing
## 8753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      neighbour
## 8754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      newmarket
## 8755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nigeria
## 8756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nightly
## 8757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        normale
## 8758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          norms
## 8759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         norths
## 8760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      northwest
## 8761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        norv�ge
## 8762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         notice
## 8763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       noticias
## 8764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nouveau
## 8765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nouveaux
## 8766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ns
## 8767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nuestro
## 8768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nuig
## 8769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nulle
## 8770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       numbers�
## 8771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nurse�s
## 8772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ny
## 8773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nygard
## 8774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            n�a
## 8775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          n�est
## 8776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       n�gatifs
## 8777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        n��tait
## 8778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         objets
## 8779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    obligations
## 8780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        obvious
## 8781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             oc
## 8782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            oct
## 8783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            odi
## 8784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         oneday
## 8785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      operating
## 8786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     operations
## 8787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         opioid
## 8788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  opportunities
## 8789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     opposition
## 8790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     optimistic
## 8791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           opts
## 8792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           oral
## 8793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   organization
## 8794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           otra
## 8795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ottawas
## 8796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       outdoors
## 8797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        outlook
## 8798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    outstanding
## 8799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ouverts
## 8800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       overseas
## 8801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     overseeing
## 8802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       overview
## 8803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          owned
## 8804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          owner
## 8805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pages
## 8806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pain
## 8807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          panel
## 8808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          parar
## 8809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parkway
## 8810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parsing
## 8811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         partir
## 8812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        partner
## 8813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     partnering
## 8814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         passes
## 8815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        passion
## 8816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pathetic
## 8817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        patrick
## 8818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pei
## 8819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pending
## 8820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     percentage
## 8821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        perfect
## 8822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     personally
## 8823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   perspectives
## 8824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           peux
## 8825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         philip
## 8826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          phone
## 8827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         phones
## 8828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     physically
## 8829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pictures
## 8830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pied
## 8831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pivoted
## 8832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         player
## 8833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           plea
## 8834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pleine
## 8835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      plusieurs
## 8836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pneumonia
## 8837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         point�
## 8838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      policiers
## 8839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       policies
## 8840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       politics
## 8841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           poll
## 8842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pose
## 8843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          poser
## 8844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        positif
## 8845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     positivity
## 8846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       possibly
## 8847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    postprimary
## 8848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    potentially
## 8849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pourra
## 8850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        poverty
## 8851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         powers
## 8852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ppe
## 8853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pr
## 8854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      practices
## 8855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pray
## 8856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prefer
## 8857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       premiers
## 8858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prenez
## 8859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     preordered
## 8860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    prepandemic
## 8861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prepares
## 8862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          press
## 8863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         presse
## 8864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pressures�
## 8865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pretending
## 8866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pretty
## 8867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prevented
## 8868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prices
## 8869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      printemps
## 8870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prisoners
## 8871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        privacy
## 8872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     procedures
## 8873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    procedures�
## 8874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prochaines
## 8875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       procured
## 8876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    procurement
## 8877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       produced
## 8878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     programmes
## 8879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    programming
## 8880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       progress
## 8881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        promote
## 8882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     protecting
## 8883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     protesting
## 8884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prot�ger
## 8885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prueba
## 8886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pr�ts
## 8887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pr�vention
## 8888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     psychology
## 8889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                psychotherapist
## 8890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        psykisk
## 8891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pts
## 8892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pu
## 8893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pubs
## 8894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pues
## 8895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         punjab
## 8896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pupils
## 8897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       purposes
## 8898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          purse
## 8899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           push
## 8900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         quavec
## 8901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quebecs
## 8902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         queens
## 8903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quien
## 8904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quils
## 8905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           quoi
## 8906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           quon
## 8907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quote
## 8908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     qu�b�coise
## 8909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          qu�il
## 8910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          races
## 8911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         racial
## 8912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         racism
## 8913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rage
## 8914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         raises
## 8915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         raison
## 8916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        raisons
## 8917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ramp
## 8918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rapides
## 8919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rapidly
## 8920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reached
## 8921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reaching
## 8922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        read�httpstcogbdtzeci3y
## 8923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reasons
## 8924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          recap
## 8925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recipients
## 8926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recognition
## 8927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recoveries
## 8928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         redman
## 8929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       referred
## 8930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reflects
## 8931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         regime
## 8932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       regiment
## 8933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       register
## 8934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     registered
## 8935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   relationship
## 8936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      relatives
## 8937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       relevant
## 8938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      religious
## 8939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      remaining
## 8940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        remains
## 8941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reminded
## 8942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rendezvous
## 8943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rendu
## 8944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rent
## 8945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reopening
## 8946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           reps
## 8947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     republican
## 8948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     requesting
## 8949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       requests
## 8950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    requirement
## 8951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         requis
## 8952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    residential
## 8953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      resilient
## 8954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       resolved
## 8955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     respectent
## 8956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      responded
## 8957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     responders
## 8958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    responsible
## 8959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        restart
## 8960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          reste
## 8961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rester
## 8962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    restriction
## 8963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      resultado
## 8964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     resultscda
## 8965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         retail
## 8966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      retailers
## 8967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       returned
## 8968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        returns
## 8969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reveal
## 8970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       revealed
## 8971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reveals
## 8972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rick
## 8973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ride
## 8974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ring
## 8975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          risks
## 8976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rivm
## 8977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            rod
## 8978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        roughly
## 8979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     roundtable
## 8980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        roundup
## 8981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          route
## 8982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            row
## 8983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          royal
## 8984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             rs
## 8985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             rt
## 8986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rt�s
## 8987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   rulebreakers
## 8988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            run
## 8989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rush
## 8990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            rwe
## 8991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ryan
## 8992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         r�gion
## 8993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        r�ponse
## 8994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      r�sidents
## 8995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       r�sultat
## 8996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         r�sume
## 8997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             sa
## 8998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sabah
## 8999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sacrifices
## 9000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sadly
## 9001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          said�
## 9002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         saliva
## 9003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          salsa
## 9004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        samples
## 9005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           samt
## 9006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sarah
## 9007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sars
## 9008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sarscov2
## 9009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      saskatoon
## 9010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           scam
## 9011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scarborough
## 9012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         scheme
## 9013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     scientific
## 9014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        scotias
## 9015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      screaming
## 9016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         screen
## 9017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      screening
## 9018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          secim
## 9019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      secretary
## 9020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        secteur
## 9021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          seeks
## 9022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  selfisolating
## 9023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        selling
## 9024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         semble
## 9025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        senator
## 9026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      septembre
## 9027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ser
## 9028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         serait
## 9029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           serb
## 9030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         series
## 9031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         serres
## 9032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       servants
## 9033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         serves
## 9034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sets
## 9035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      seventeen
## 9036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       severely
## 9037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          se�or
## 9038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sh1tty
## 9039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sha
## 9040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shame
## 9041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shandong
## 9042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shared
## 9043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sheesh
## 9044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          shelf
## 9045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shield
## 9046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shipments
## 9047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           shop
## 9048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shopping
## 9049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          siege
## 9050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  significantly
## 9051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   similarities
## 9052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sincere
## 9053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sisters
## 9054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            sit
## 9055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sits
## 9056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sixth
## 9057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           size
## 9058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         skills
## 9059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           slam
## 9060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          slams
## 9061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         slated
## 9062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sleep
## 9063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sleeves
## 9064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          smart
## 9065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           soar
## 9066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          solid
## 9067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           solo
## 9068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          solve
## 9069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sonu
## 9070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sood
## 9071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sorted
## 9072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          souls
## 9073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sources
## 9074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           sous
## 9075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          space
## 9076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spaces
## 9077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          speak
## 9078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     specialist
## 9079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spikes
## 9080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     spiralling
## 9081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spokesman
## 9082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   spokesperson
## 9083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sport
## 9084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spreader
## 9085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spreaders
## 9086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         square
## 9087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     staggering
## 9088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stall
## 9089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       standard
## 9090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       standing
## 9091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stands
## 9092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           star
## 9093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         starts
## 9094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stated
## 9095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     statistics
## 9096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stayed
## 9097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sterile
## 9098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stiff
## 9099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stood
## 9100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          store
## 9101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         strang
## 9102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        streets
## 9103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stressful
## 9104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stressing
## 9105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         stroke
## 9106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      strongest
## 9107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       strongly
## 9108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       struggle
## 9109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        studies
## 9110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          stuff
## 9111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        subsidy
## 9112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   substitution
## 9113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     successful
## 9114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         succ�s
## 9115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       suddenly
## 9116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         suffer
## 9117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       suffered
## 9118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     sufficient
## 9119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suggestion
## 9120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        suicide
## 9121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  superspreader
## 9122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     supporting
## 9123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       supposed
## 9124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     supposedly
## 9125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        surface
## 9126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      surgeries
## 9127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      surpassed
## 9128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      surpasses
## 9129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        surreal
## 9130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         survey
## 9131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        survive
## 9132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       survivor
## 9133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        suspend
## 9134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sverige
## 9135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sweden
## 9136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      sympt�mes
## 9137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             s�
## 9138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tackle
## 9139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tactics
## 9140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        talking
## 9141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tally
## 9142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tambi�n
## 9143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         target
## 9144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        targets
## 9145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tarugo
## 9146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           task
## 9147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           taux
## 9148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tax
## 9149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      taxpayers
## 9150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             tb
## 9151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tccbc
## 9152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tel
## 9153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         temple
## 9154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tengo
## 9155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          terme
## 9156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          terra
## 9157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       terrible
## 9158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       thankful
## 9159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          that�
## 9160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     therapists
## 9161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        therapy
## 9162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        they�ll
## 9163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      threatens
## 9164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        thunder
## 9165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   thunderchild
## 9166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tied
## 9167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tighten
## 9168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     tightening
## 9169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tightens
## 9170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tiktok
## 9171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  timesensitive
## 9172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tjapukai
## 9173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         todays
## 9174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tokyo
## 9175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tomando
## 9176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ton
## 9177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tone
## 9178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       torontos
## 9179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       toronto�
## 9180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      toronto�s
## 9181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        touched
## 9182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trabajo
## 9183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          track
## 9184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tracker
## 9185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tracking
## 9186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tradition
## 9187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tragic
## 9188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trained
## 9189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  transmissible
## 9190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       transmit
## 9191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   transparency
## 9192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    transparent
## 9193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        transpo
## 9194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      transport
## 9195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 transportation
## 9196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        travail
## 9197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   travailleurs
## 9198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      travelers
## 9199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       treating
## 9200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     treatments
## 9201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trend
## 9202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       triggers
## 9203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trusts
## 9204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          truth
## 9205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tr�panier
## 9206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tsunami
## 9207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tuned
## 9208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        tweeted
## 9209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   t�l�phonique
## 9210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ugh
## 9211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            uks
## 9212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    unavailable
## 9213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   unbelievable
## 9214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  underreported
## 9215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           unge
## 9216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          unges
## 9217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unlike
## 9218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            uno
## 9219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         unsafe
## 9220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        unusual
## 9221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       upcoming
## 9222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       updating
## 9223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          users
## 9224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       varadkar
## 9225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         varf�r
## 9226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       variante
## 9227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         versus
## 9228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            vez
## 9229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         victim
## 9230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       victoria
## 9231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          vid�o
## 9232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vigueur
## 9233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     virologist
## 9234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         virus�
## 9235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         visits
## 9236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vitamin
## 9237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           voir
## 9238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           vols
## 9239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         volume
## 9240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         voters
## 9241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      voyageurs
## 9242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            v�a
## 9243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         waived
## 9244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        walking
## 9245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            war
## 9246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ward
## 9247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wasn�t
## 9248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    wastewaters
## 9249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          water
## 9250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         week�s
## 9251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          weird
## 9252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       welcomed
## 9253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      welcoming
## 9254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       wellness
## 9255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            we�
## 9256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           we�d
## 9257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          we�ll
## 9258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         whitty
## 9259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     widespread
## 9260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wild
## 9261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         wisdom
## 9262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          with�
## 9263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             wk
## 9264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        women�s
## 9265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      wonderful
## 9266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          woods
## 9267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      worrisome
## 9268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          worry
## 9269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           wrap
## 9270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          write
## 9271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wrote
## 9272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            wsj
## 9273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     yakovishin
## 9274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         year�s
## 9275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         yellow
## 9276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       yiasouma
## 9277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            yup
## 9278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �30m
## 9279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �broken
## 9280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       �closion
## 9281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �dark
## 9282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �filmed
## 9283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     �horrific�
## 9284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    �increasing
## 9285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            �it
## 9286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            �la
## 9287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �like
## 9288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           �our
## 9289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �this
## 9290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            �to
## 9291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ��le
## 9292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @amyshere
## 9293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ansovald
## 9294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @bonomia
## 9295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @brianlilley
## 9296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @canadianglen
## 9297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @canadiensmtl
## 9298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cdnchange
## 9299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @cheo
## 9300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cityoftoronto
## 9301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cityofvancouver
## 9302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cooper4sae
## 9303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @dfisman
## 9304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @dorisgrinspun
## 9305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @drmoayedi
## 9306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @duty2warn
## 9307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @eatsfood2
## 9308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @garycharnock3
## 9309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @globalnewsto
## 9310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @govnb
## 9311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @hstefansonmb
## 9312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @iamsrkclub
## 9313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @icpresents
## 9314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @imgrund
## 9315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @irfandhalla
## 9316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @ivisonj
## 9317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jjhorgan
## 9318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jrodgers
## 9319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @jyotigondek
## 9320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kawarthachamber
## 9321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @kflaph
## 9322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @maxfawcett
## 9323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @mrcog3nt
## 9324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mtlgazette
## 9325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @nbcnews
## 9326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @oaemonline
## 9327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @oilerslive
## 9328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @patnutana
## 9329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @peoplespca
## 9330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @pmoindia
## 9331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @potus
## 9332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @premierbhiggs
## 9333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @reghelwer
## 9334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @richardzussman
## 9335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @rnao
## 9336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ryanwal28487747
## 9337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sunwingvacay
## 9338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @taimhuynh
## 9339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @timbousquet
## 9340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @tn4k3
## 9341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @tvanouvelles
## 9342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @twitterbrasil
## 9343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @uasagwara
## 9344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @vaxhunterscan
## 9345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @verified
## 9346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @whymaja
## 9347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           @wsj
## 9348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #abiyahmed
## 9349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ableg
## 9350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #assnat
## 9351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #bcedenhancedmeasures
## 9352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #boosterjab
## 9353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #breaking
## 9354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #caq
## 9355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #china
## 9356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #covaxin
## 9357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covid19ns
## 9358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covid19qc
## 9359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #covid19sk
## 9360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #covidon
## 9361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #distancelearning
## 9362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #donotcomplyever
## 9363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #dougfordresign
## 9364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #fitness
## 9365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #flurona
## 9366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #freedom
## 9367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #hamont
## 9368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #ihu
## 9369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #ihuvariant
## 9370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #mandates
## 9371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #mandatoryvaccination
## 9372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #manitoba
## 9373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #mbpoli
## 9374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #mississauga
## 9375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #moderna
## 9376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #nbpoli
## 9377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #nevervoteconservative
## 9378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #news
## 9379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #nightcurfew
## 9380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #oilers
## 9381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #omicronvarient
## 9382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #omicronvirus
## 9383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #ontariocovid
## 9384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #polmtl
## 9385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #publichealth
## 9386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #qu�bec
## 9387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #restrictions
## 9388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #rockineve�
## 9389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #sante
## 9390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #skpoli
## 9391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #stayathome
## 9392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #supportlocal
## 9393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #truth
## 9394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #truthmatters
## 9395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #tyranny
## 9396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #vaccinemandate
## 9397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #vaccinepassports
## 9398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #wearamask
## 9399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #whl
## 9400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #yxe
## 9401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f30e>
## 9402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f44d>
## 9403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f495>
## 9404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+0001f497>$60month
## 9405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0001f4e2><u+0001f4e2>
## 9406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f517>
## 9407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f609>
## 9408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f61e>
## 9409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f642>
## 9410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f64c>
## 9411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f64f>
## 9412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f6d1>stop
## 9413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f923>
## 9414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f92c>
## 9415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+0001f937><u+200d><u+2642><u+fe0f>
## 9416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f974>
## 9417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0627><u+0628>
## 9418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0644><u+0626><u+06d2>
## 9419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       <u+0645><u+0631><u+06cc>
## 9420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+06a9><u+06cc>
## 9421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+06a9><u+06d2>
## 9422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+06c1><u+06d2>
## 9423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+2139><u+fe0f>
## 9424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+260e><u+fe0f>
## 9425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+26a0><u+fe0f>
## 9426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+2764><u+fe0f>tutu
## 9427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+27a1><u+fe0f>httpstcophaslcglsz<u+2b05><u+fe0f>
## 9428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+bc31><u+c2e0>
## 9429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        101100k
## 9430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           10pm
## 9431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      2022goals
## 9432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          350pm
## 9433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           67pm
## 9434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            6th
## 9435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            70s
## 9436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            7th
## 9437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         absent
## 9438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    absenteeism
## 9439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    accommodate
## 9440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        account
## 9441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        accused
## 9442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           acne
## 9443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            act
## 9444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            add
## 9445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     administer
## 9446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     administr�
## 9447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      admitting
## 9448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adults
## 9449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      advocates
## 9450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         africa
## 9451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       africa�s
## 9452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      afternoon
## 9453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ahead
## 9454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ailleurs
## 9455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ailments
## 9456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    air�transat
## 9457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             al
## 9458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      albertans
## 9459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       allowing
## 9460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alors
## 9461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alpha
## 9462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alzheimer
## 9463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         amazon
## 9464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       american
## 9465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      americans
## 9466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          amgmt
## 9467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           anti
## 9468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     apparently
## 9469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         appeal
## 9470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        appeals
## 9471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          apply
## 9472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           appt
## 9473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          appts
## 9474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arrived
## 9475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     assessment
## 9476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    astrazeneca
## 9477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       atlantic
## 9478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        attempt
## 9479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      attention
## 9480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    australia�s
## 9481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        authors
## 9482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         autres
## 9483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            avg
## 9484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        awesome
## 9485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           a�os
## 9486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        balance
## 9487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ballet
## 9488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       barbados
## 9489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           base
## 9490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       basement
## 9491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          begin
## 9492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beginning
## 9493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        beijing
## 9494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ben
## 9495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       benefits
## 9496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bio
## 9497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bird
## 9498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          black
## 9499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          blame
## 9500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bless
## 9501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           body
## 9502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         booked
## 9503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bord
## 9504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           born
## 9505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bother
## 9506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            boy
## 9507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         branch
## 9508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      breakdown
## 9509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   breakthrough
## 9510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         breath
## 9511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         brings
## 9512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brother
## 9513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          brown
## 9514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           buck
## 9515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         budget
## 9516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          built
## 9517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        burnaby
## 9518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cafes
## 9519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        calgary
## 9520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       canada�s
## 9521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cancelled
## 9522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cancelling
## 9523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cancun
## 9524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cannabis
## 9525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 cardiovascular
## 9526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cares
## 9527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      caseloads
## 9528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          catch
## 9529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       catching
## 9530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         caught
## 9531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cautious
## 9532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cbd
## 9533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ceci
## 9534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    celebration
## 9535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cells
## 9536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        centers
## 9537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cet
## 9538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ceux
## 9539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chain
## 9540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chance
## 9541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         charge
## 9542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          check
## 9543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         choose
## 9544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chose
## 9545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      christmas
## 9546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chronic
## 9547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        circuit
## 9548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          citys
## 9549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          civic
## 9550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          civil
## 9551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          claim
## 9552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         claims
## 9553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       climbing
## 9554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       clinical
## 9555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           clip
## 9556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         closer
## 9557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       closures
## 9558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          coast
## 9559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cobro
## 9560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            cod
## 9561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     colleagues
## 9562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      collected
## 9563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        college
## 9564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         colour
## 9565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       columbia
## 9566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           coma
## 9567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    combination
## 9568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        company
## 9569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       companys
## 9570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  compassionate
## 9571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     complaints
## 9572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     completely
## 9573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        concern
## 9574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       concerts
## 9575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confusing
## 9576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conspiracy
## 9577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       contacts
## 9578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contaminer
## 9579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      continued
## 9580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    contracting
## 9581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       contrast
## 9582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         contre
## 9583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    controversy
## 9584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          count
## 9585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      couvrefeu
## 9586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cover
## 9587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        covered
## 9588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      covid19��
## 9589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         covid�
## 9590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coworker
## 9591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crash
## 9592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crises
## 9593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        curious
## 9594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dad
## 9595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          daily
## 9596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dangereux
## 9597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          danti
## 9598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          david
## 9599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        decided
## 9600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      declining
## 9601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deep
## 9602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           deer
## 9603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         defeat
## 9604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deflecting
## 9605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          delay
## 9606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         delays
## 9607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      democracy
## 9608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      democrats
## 9609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        destroy
## 9610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      determine
## 9611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         devant
## 9612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     difference
## 9613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      difficult
## 9614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       directed
## 9615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       directly
## 9616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      discovery
## 9617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dismissed
## 9618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    distributed
## 9619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       document
## 9620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dolt
## 9621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            don
## 9622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        donated
## 9623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          drive
## 9624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         driven
## 9625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dropped
## 9626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           drug
## 9627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          drugs
## 9628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         drugs�
## 9629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dying
## 9630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        d�clar�
## 9631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              d�hospitalisation
## 9632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        earlier
## 9633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          earth
## 9634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           easy
## 9635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ebola
## 9636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        economy
## 9637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     elementary
## 9638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       elevator
## 9639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          email
## 9640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emergent
## 9641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        empathy
## 9642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     employment
## 9643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          empty
## 9644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        endemic
## 9645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ensure
## 9646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          enter
## 9647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       entering
## 9648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            esp
## 9649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           esta
## 9650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             eu
## 9651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exceeds
## 9652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exception
## 9653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         excess
## 9654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          exig�
## 9655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      existence
## 9656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         expand
## 9657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     experience
## 9658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    experienced
## 9659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          extra
## 9660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      extremely
## 9661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         facing
## 9662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        failure
## 9663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fake
## 9664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          false
## 9665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fans
## 9666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           farm
## 9667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fast
## 9668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           faut
## 9669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fa�on
## 9670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fear
## 9671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           feds
## 9672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       feelings
## 9673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          feels
## 9674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       festival
## 9675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fewer
## 9676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           file
## 9677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      financial
## 9678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       finished
## 9679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fired
## 9680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fizdale
## 9681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flights
## 9682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flowers
## 9683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flulike
## 9684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flurona
## 9685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fluwatcher
## 9686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        focused
## 9687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forces
## 9688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fords
## 9689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           form
## 9690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fort
## 9691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        forward
## 9692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fought
## 9693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fourth
## 9694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       freaking
## 9695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fredericton
## 9696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        freedom
## 9697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       freedoms
## 9698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        freiner
## 9699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         friend
## 9700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    frustration
## 9701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fuck
## 9702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fund
## 9703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          funds
## 9704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gen
## 9705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gens
## 9706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ginoogaming
## 9707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         giving
## 9708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           glad
## 9709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          glass
## 9710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      governing
## 9711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       governor
## 9712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grail
## 9713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grand
## 9714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grande
## 9715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       grateful
## 9716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gross
## 9717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ground
## 9718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         groupe
## 9719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        growing
## 9720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         guilty
## 9721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gun
## 9722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            guy
## 9723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      habitants
## 9724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         handle
## 9725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   handwringing
## 9726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       happened
## 9727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hcws
## 9728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           head
## 9729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       headache
## 9730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        healthy
## 9731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           health�minister�jeanyves�duclos�said
## 9732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        heather
## 9733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          heavy
## 9734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        helping
## 9735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         heroes
## 9736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         heures
## 9737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hide
## 9738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          higgs
## 9739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         highly
## 9740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       highrisk
## 9741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hill
## 9742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        holiday
## 9743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           holy
## 9744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         honour
## 9745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        horacio
## 9746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         horror
## 9747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                hospitalisation
## 9748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hour
## 9749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          house
## 9750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        houston
## 9751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/4hjlpr0her
## 9752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/5lhwt6eufn
## 9753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/5ruhfjqbus
## 9754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/9jj98xagqi
## 9755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/ajrholrecj
## 9756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/cc8crfrwwi
## 9757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/d3nkpg8wkc
## 9758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/d7wwvlnqbu
## 9759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/dd8sx96lhw
## 9760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/iuh7d3y6zf
## 9761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/kxzfvbqmn7
## 9762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/nybh8krcne
## 9763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/q01jd16yov
## 9764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/tupxaoafl6
## 9765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/txf0nrimov
## 9766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/ug8gsq18jw
## 9767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/uyteyuvajq
## 9768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/wzwfmzshpe
## 9769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        https://t.co/zxoe6mbcrj
## 9770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       humanity
## 9771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ihu
## 9772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        illegal
## 9773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ils
## 9774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    immigration
## 9775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       immunity
## 9776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   immunization
## 9777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       imperial
## 9778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     importante
## 9779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        imposes
## 9780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       inaction
## 9781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      incidence
## 9782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        inclass
## 9783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      increased
## 9784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   indefinitely
## 9785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        indoors
## 9786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         infect
## 9787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     infectious
## 9788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inflation
## 9789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   influenceurs
## 9790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      influenza
## 9791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       informed
## 9792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     innovative
## 9793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      insurance
## 9794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         intent
## 9795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      interview
## 9796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         invade
## 9797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         invest
## 9798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       involved
## 9799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ireland
## 9800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            isc
## 9801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          isn�t
## 9802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jabs
## 9803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jason
## 9804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jesp�re
## 9805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jogador
## 9806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           john
## 9807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           join
## 9808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jour
## 9809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           june
## 9810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jury
## 9811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jusqu�
## 9812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            jva
## 9813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           j�ai
## 9814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        keeping
## 9815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kenney
## 9816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            key
## 9817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        killing
## 9818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kills
## 9819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kindness
## 9820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      knowledge
## 9821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           laps
## 9822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            las
## 9823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lead
## 9824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     leadership
## 9825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     lethbridge
## 9826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          leurs
## 9827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         levels
## 9828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lift
## 9829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lights
## 9830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          likes
## 9831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       limiting
## 9832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lining
## 9833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lions
## 9834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         liquor
## 9835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lire
## 9836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         listen
## 9837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lived
## 9838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           li�s
## 9839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             lo
## 9840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      locations
## 9841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lock
## 9842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         locked
## 9843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lois
## 9844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lonely
## 9845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         looked
## 9846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lord
## 9847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            los
## 9848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          loved
## 9849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lowest
## 9850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ltc
## 9851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           luck
## 9852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lucky
## 9853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lui
## 9854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      l�article
## 9855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        l�inspq
## 9856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       majority
## 9857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          makes
## 9858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mall
## 9859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          malls
## 9860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       managing
## 9861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     manitobans
## 9862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         martin
## 9863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        masking
## 9864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         matter
## 9865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        matters
## 9866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          means
## 9867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   measurements
## 9868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            med
## 9869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       medicine
## 9870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            meg
## 9871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mers
## 9872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mesure
## 9873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mettre
## 9874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       midnight
## 9875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        midterm
## 9876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mine
## 9877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ministre
## 9878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ministry
## 9879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      minist�re
## 9880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        minutes
## 9881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           miss
## 9882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mississauga
## 9883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mobile
## 9884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      modelling
## 9885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         modern
## 9886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           moes
## 9887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            moi
## 9888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mon
## 9889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     monoclonal
## 9890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          month
## 9891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       montr�al
## 9892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mortality
## 9893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mot
## 9894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mounts
## 9895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       m�decins
## 9896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nail
## 9897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          named
## 9898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nastiest
## 9899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ni
## 9900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nonsense
## 9901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         normal
## 9902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        normal�
## 9903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          noses
## 9904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      notifying
## 9905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nouveaux
## 9906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nouvelle
## 9907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       november
## 9908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nshas
## 9909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nsha�s
## 9910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nuremberg
## 9911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nurse
## 9912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            nyt
## 9913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        n�gatif
## 9914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          obese
## 9915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    observation
## 9916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          offer
## 9917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       offering
## 9918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         offers
## 9919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       official
## 9920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     of�covid19
## 9921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       olympics
## 9922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             om
## 9923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            omg
## 9924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ont
## 9925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      operators
## 9926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       opinions
## 9927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        opioids
## 9928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   organization
## 9929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        outdoor
## 9930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     outrageous
## 9931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         owners
## 9932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             o�
## 9933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pages
## 9934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pants
## 9935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parking
## 9936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          parle
## 9937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  participantes
## 9938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  participating
## 9939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  participation
## 9940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parties
## 9941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       partners
## 9942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pass
## 9943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         passed
## 9944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pauses
## 9945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pc
## 9946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           peak
## 9947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        percent
## 9948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         period
## 9949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     personally
## 9950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       personas
## 9951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      personnes
## 9952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pharmacists
## 9953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          piece
## 9954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pilot
## 9955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           piss
## 9956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        planned
## 9957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          plans
## 9958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      plusieurs
## 9959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         poised
## 9960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   politicizing
## 9961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        polling
## 9962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          polls
## 9963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         porter
## 9964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        positif
## 9965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      positives
## 9966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       possibly
## 9967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          posts
## 9968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      potential
## 9969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pourrait
## 9970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pouvez
## 9971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ppl
## 9972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pre
## 9973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    precautions
## 9974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       predicts
## 9975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      preferred
## 9976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       premiers
## 9977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      preschool
## 9978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         presse
## 9979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pressure
## 9980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pretty
## 9981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prevention
## 9982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       princess
## 9983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       priority
## 9984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     production
## 9985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   professional
## 9986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       properly
## 9987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     protecting
## 9988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       protects
## 9989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        protest
## 9990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          proud
## 9991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       provided
## 9992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      providers
## 9993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      providing
## 9994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        puisque
## 9995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          purge
## 9996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        p�blica
## 9997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             qc
## 9998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quality
## 9999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     quarantine
## 10000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     quebecers
## 10001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         queen
## 10002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quoi
## 10003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quon
## 10004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         qu�on
## 10005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        raison
## 10006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       raisons
## 10007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ramener
## 10008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ran
## 10009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rand
## 10010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rapides
## 10011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rapidtest
## 10012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rdv
## 10013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       readily
## 10014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reading
## 10015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reasons
## 10016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   recommended
## 10017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       records
## 10018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refused
## 10019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      regional
## 10020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      register
## 10021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  registration
## 10022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   regulations
## 10023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rejected
## 10024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      relevant
## 10025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    remarkable
## 10026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        remote
## 10027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   requirement
## 10028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reserve
## 10029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reset
## 10030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       respond
## 10031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                responsibility
## 10032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      retrieve
## 10033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     returning
## 10034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        reveal
## 10035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        review
## 10036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rings
## 10037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        risque
## 10038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      risquent
## 10039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        robert
## 10040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     routinely
## 10041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rtpcr
## 10042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       running
## 10043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ryan
## 10044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        saison
## 10045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sales
## 10046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         salud
## 10047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sant頻
## 10048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sars
## 10049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sask
## 10050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         scare
## 10051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         scott
## 10052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    scrambling
## 10053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      security
## 10054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sending
## 10055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      separate
## 10056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ser
## 10057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       serbian
## 10058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         serve
## 10059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ser�
## 10060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      settings
## 10061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         share
## 10062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shared
## 10063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sharing
## 10064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       shelter
## 10065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shenzhen
## 10066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shifting
## 10067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        shifts
## 10068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      shortage
## 10069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         shown
## 10070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sign
## 10071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 significantly
## 10072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         signs
## 10073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          sils
## 10074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     singleday
## 10075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          snow
## 10076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sobeys
## 10077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      socalled
## 10078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        soccer
## 10079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       society
## 10080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     solutions
## 10081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      souhaite
## 10082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sound
## 10083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sounds
## 10084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         speak
## 10085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      speaking
## 10086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       special
## 10087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   specialized
## 10088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      specific
## 10089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   speculation
## 10090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      spending
## 10091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spent
## 10092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spike
## 10093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spikes
## 10094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        spirit
## 10095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         spite
## 10096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  spokesperson
## 10097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     spreading
## 10098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       spread�
## 10099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stanhope
## 10100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          star
## 10101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stepping
## 10102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         steps
## 10103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      stpierre
## 10104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        strang
## 10105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     stressful
## 10106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      struggle
## 10107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     struggles
## 10108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                studentspupils
## 10109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        studio
## 10110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sucks
## 10111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suffering
## 10112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     suggested
## 10113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          suis
## 10114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        summer
## 10115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       sunwing
## 10116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       surgery
## 10117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               surging�covid19
## 10118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       swedish
## 10119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        sweeps
## 10120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         sweet
## 10121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   symptomatic
## 10122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       systems
## 10123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        taiwan
## 10124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         taxes
## 10125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         teach
## 10126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tech
## 10127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tells
## 10128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   temporarily
## 10129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     temporary
## 10130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    terminates
## 10131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      terrible
## 10132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                testpositivity
## 10133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tf
## 10134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    thankfully
## 10135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        theory
## 10136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         this�
## 10137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     threatens
## 10138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        thwart
## 10139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           tim
## 10140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       today�s
## 10141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tooi
## 10142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          tool
## 10143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           top
## 10144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tracking
## 10145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       transat
## 10146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 transmissible
## 10147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     transport
## 10148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  travailleurs
## 10149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       treated
## 10150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      treating
## 10151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    treatments
## 10152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trend
## 10153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trial
## 10154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          trip
## 10155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        trumps
## 10156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         trust
## 10157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            tu
## 10158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       tuesday<u+2764><u+fe0f>
## 10159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      tuesdays
## 10160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         tweet
## 10161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          t�es
## 10162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            um
## 10163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           una
## 10164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   uncertainty
## 10165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 uncomfortable
## 10166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      unhoused
## 10167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        unions
## 10168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        united
## 10169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        unit�s
## 10170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       unknown
## 10171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        unused
## 10172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      unvaxxed
## 10173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         upset
## 10174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          urge
## 10175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         urged
## 10176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        urgent
## 10177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           us�
## 10178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          utah
## 10179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vaccines�
## 10180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     vacunadas
## 10181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      vaseline
## 10182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        vaxers
## 10183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          vaxx
## 10184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         venir
## 10185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ventilated
## 10186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ventilation
## 10187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        verdun
## 10188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         views
## 10189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    violations
## 10190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      violence
## 10191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     virtually
## 10192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          visa
## 10193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       visited
## 10194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    volleyball
## 10195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        volume
## 10196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         voter
## 10197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        voters
## 10198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        voulez
## 10199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        voyage
## 10200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           war
## 10201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    warehouses
## 10202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wasn�t
## 10203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         water
## 10204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        wealth
## 10205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        weapon
## 10206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       weekend
## 10207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        weeks�
## 10208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          we�d
## 10209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         we�ve
## 10210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        what�s
## 10211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         who�s
## 10212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        window
## 10213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wing
## 10214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          wolf
## 10215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         women
## 10216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         words
## 10217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     workplace
## 10218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         worse
## 10219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          yeah
## 10220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           yup
## 10221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �and
## 10222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        �coles
## 10223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     �flurona�
## 10224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �ihu�
## 10225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          �new
## 10226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      �pisodes
## 10227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    �provinces
## 10228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            �s
## 10229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         �tait
## 10230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ��contribution
## 10231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @1005freshradio
## 10232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @100menmh
## 10233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @11mediator
## 10234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @311toronto
## 10235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @3mendous
## 10236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @5kids1condo
## 10237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @5nelgrove
## 10238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @680news
## 10239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @7jours
## 10240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @aaronwherry
## 10241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @abamaga
## 10242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @abbyellin
## 10243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @abcustomcoach
## 10244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @academicmatters
## 10245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @acspcanada
## 10246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @act2endracism
## 10247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @activeforlife
## 10248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @adamsmiller
## 10249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @addthis
## 10250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @adeccocanada
## 10251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @adidas
## 10252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @adrianalagrange
## 10253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @aeroplan
## 10254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @afdbgroup
## 10255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @afpottawa
## 10256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @africacdc
## 10257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @africanunionun
## 10258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @afrochampions
## 10259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @aftncanada
## 10260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @agaplatform
## 10261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @agentemily
## 10262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ahsmedia
## 10263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @albertandp
## 10264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @albertayoda
## 10265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @albinomouse
## 10266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @alcouzens
## 10267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @alexiscossette
## 10268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @alexpanetta
## 10269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @alexshiff
## 10270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @aliciakeys
## 10271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @allankgrillmd
## 10272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @alloexo
## 10273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @allthysons01
## 10274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @allywalker1
## 10275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @alumniubc
## 10276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @am980news
## 10277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @amazon�s
## 10278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @aminazafar
## 10279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @amostoh
## 10280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @anastasiasmihai
## 10281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @andrewlazarus4
## 10282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @andrewrphysics
## 10283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @aningaproject
## 10284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @anitaoakville
## 10285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @anjakaradeglija
## 10286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @annerspierse
## 10287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @annie05236587
## 10288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @anutin
## 10289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @arbiter04032000
## 10290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @arnoldmonto
## 10291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @arrudahoracio
## 10292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ashleyburkecbc
## 10293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @asicanada
## 10294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @aspphysician
## 10295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @astonmartin
## 10296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @atensnut
## 10297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @atulocal113
## 10298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @aucmoussafaki
## 10299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @aueconomy
## 10300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @auschwitzmuseum
## 10301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @avalonmall
## 10302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @avitmfg
## 10303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @aylanx
## 10304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @azfamily
## 10305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @b3infos
## 10306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @back2basicsv
## 10307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bankofcanada
## 10308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @barbadamski
## 10309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @barbaraannsley
## 10310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @barbicide
## 10311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @barronsonline
## 10312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @baseballbc
## 10313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @baseballontario
## 10314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @batmanfredmann
## 10315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @bbcnews
## 10316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bbcworld
## 10317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @bc1
## 10318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bcauditorgen
## 10319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @bcpoli
## 10320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bdocanadaag
## 10321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @belfastlive�
## 10322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @bell
## 10323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bellbaygolfclub
## 10324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bellobob
## 10325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bemoprepared
## 10326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @benrutgers
## 10327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @benspurr
## 10328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @beyondgc2020
## 10329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bigherm3953
## 10330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bilalnkhan2
## 10331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @billespn
## 10332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @billhanage
## 10333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @billmaher
## 10334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @billmorneau
## 10335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @billschaper
## 10336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @bionicinbuff
## 10337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @bivnews
## 10338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bizcouncilofcan
## 10339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @blackvotersmtr
## 10340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @bluezones
## 10341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bobbijean2016
## 10342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bobrae48
## 10343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @borisjohnson
## 10344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @bowinnma
## 10345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @bowulf
## 10346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @bradfordpearson
## 10347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @bramhamdaphne
## 10348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bramptonsc
## 10349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @braydonmoreso
## 10350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @breaking911
## 10351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @brentsampson14
## 10352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @brightkolleen
## 10353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @brucearthur
## 10354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @bryanmanio
## 10355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @brystfa
## 10356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @btnonline
## 10357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @bucklynn123
## 10358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @business
## 10359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @c19collective
## 10360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cabotlinks
## 10361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cadthacmts
## 10362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @calawaypark
## 10363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @calynnmirwin
## 10364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @camguthrie
## 10365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @canadafp
## 10366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @canadagoose
## 10367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @canadainitaly
## 10368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           @canadaslifeline�is
## 10369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @canadatrade
## 10370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @canadianpm
## 10371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @candlelighters1
## 10372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @cangeo
## 10373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @canhcpakistan
## 10374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @capatipatrick
## 10375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @capedoctors
## 10376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @caprosperity
## 10377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @carlyasilver
## 10378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @carmeeeny
## 10379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @carolejames
## 10380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @carolforden
## 10381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @carolyntrono
## 10382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @carongan1
## 10383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @carsonbirdgs
## 10384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @casecold
## 10385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cateringfungi
## 10386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cattyhuang
## 10387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @cbc
## 10388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cbcearlyedition
## 10389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cbcfletch
## 10390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cbckatie
## 10391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cbclondon
## 10392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cbcmorganpassi
## 10393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @cbcnl
## 10394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cbcpodcasts�
## 10395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cbctoronto
## 10396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @cbs46
## 10397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ccabuildsyyc
## 10398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ccciccic
## 10399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ccelderlaw
## 10400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @cdnbeer
## 10401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cdnminhealth
## 10402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @celinebardet
## 10403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @centrallhin
## 10404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cestabro
## 10405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @cfifekw
## 10406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cgsquared3
## 10407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @chamberdisciple
## 10408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @chamberoffice1
## 10409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @charitablefury
## 10410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @chatovargassv
## 10411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @chatsseniors
## 10412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cheesetrader1
## 10413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cheknews
## 10414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @chellesalas
## 10415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @cherylosborne50
## 10416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @chexnewswatch
## 10417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @chglobalhealth
## 10418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @chidinwatu
## 10419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @chiefpeggtfs
## 10420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @chrissurano
## 10421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @christineayip
## 10422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @chuddles11
## 10423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @chunacesar
## 10424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @chwkchamber
## 10425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @chwkrecovery
## 10426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @citybrampton
## 10427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @citycynthia
## 10428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @citynewsmtl
## 10429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cityofhamilton
## 10430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cityoflakes
## 10431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @cityofldnont
## 10432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @cityofvaughan
## 10433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cjajournal
## 10434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @cjayanta
## 10435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cjchivers
## 10436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @cjsr
## 10437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @clewandowski
## 10438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cmajblogs
## 10439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @cmhc
## 10440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cmoengland
## 10441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cnntravel
## 10442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @coalitiondocs
## 10443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @colincarriecpc
## 10444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @colleenflood2
## 10445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @collegeofnurses
## 10446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @comfortpaul
## 10447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @commcommg
## 10448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @communicatto
## 10449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @conservamos
## 10450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @corduroybabie
## 10451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @cotemarquis
## 10452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @coubroughcbc
## 10453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @covidsurg
## 10454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @cpactv
## 10455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @cpsaca
## 10456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @crabbits9
## 10457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @crabbvicki
## 10458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @craigsearle1
## 10459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @crocerossa
## 10460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @crossroadsintl
## 10461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @crtceng
## 10462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ctvnews
## 10463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ctvregina
## 10464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ctvshannon
## 10465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @ctvw5
## 10466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ctvwindsor
## 10467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @cubaminrex
## 10468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @culturemontreal
## 10469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @curiouscast
## 10470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @cyn9383johnson
## 10471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @cyochmans
## 10472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @daddarius
## 10473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @daileysuzanne
## 10474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dalhousieu
## 10475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @daltonpompey
## 10476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @dancarteroshawa
## 10477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @danieljleemd
## 10478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @danielriolo
## 10479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @daniglaad
## 10480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @daniwebb
## 10481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @dankahnem6a2k18
## 10482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @datarealminc
## 10483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @daveeby
## 10484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @davelackie
## 10485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @david5705
## 10486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @davidangel9999
## 10487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @davidcarr333
## 10488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @davidstaplesyeg
## 10489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dawnbazely
## 10490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dbelardomd
## 10491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @debishamcga
## 10492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @debradynes
## 10493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @decidenowacp
## 10494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @decider
## 10495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @deemangin
## 10496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @deepakanandmpp
## 10497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @deevybee
## 10498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @deloitte
## 10499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @deloitteus
## 10500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @demetriosnab
## 10501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @depressh0e
## 10502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @devanboomen
## 10503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @diazcanelb
## 10504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @djordjevukosav7
## 10505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @dmuthuk
## 10506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @docsavagetju
## 10507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @doctorwibble
## 10508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @dominiccardy
## 10509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @donaldlepp
## 10510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @donmillshfx
## 10511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @doritmi
## 10512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @douga536
## 10513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @douglasdowney
## 10514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @downtowncharles
## 10515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @drainvillepm
## 10516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @drbonniehenry
## 10517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @drbonnyhenry
## 10518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @drbrignall
## 10519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @drdagly
## 10520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @drdavidtranter
## 10521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @drerichoskins
## 10522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @drewbarnes
## 10523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @drjoshuatepper
## 10524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @drjvmd
## 10525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @drmarthagulati
## 10526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @drmmartind
## 10527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @drmohammadosler
## 10528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @droz
## 10529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @drps
## 10530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @drquinncapers4
## 10531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @drsarahmunro
## 10532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @drseisenberg
## 10533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @drsylvainroy
## 10534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @dsryerson
## 10535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @dubsndoo
## 10536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @dulithaj
## 10537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @dunstewart
## 10538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @durhamhealth
## 10539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @dylanchan94
## 10540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @eadgop
## 10541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @eaigletech
## 10542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @eastersealsab
## 10543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ecaofficial
## 10544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @echosvedettes
## 10545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @edhollett
## 10546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @edtubb
## 10547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @edyong209
## 10548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @effieonb
## 10549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ejwilson81
## 10550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @elderabuseont
## 10551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @eliotandvine
## 10552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @eliredman
## 10553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @elizztweets
## 10554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @embamexcan
## 10555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @emiliorivera48
## 10556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @emilypotter18
## 10557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @englishpaul07
## 10558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @entrepreneurind
## 10559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @epdevillas
## 10560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @ergm33
## 10561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @erickroussel5
## 10562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @erindurant42
## 10563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @espnwwos
## 10564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @etiennedostie
## 10565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @etmemorial
## 10566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @ettube
## 10567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @eucommission
## 10568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @evecatherine
## 10569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @eventbrite
## 10570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @exergysolution
## 10571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @exlarson
## 10572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @expediaca
## 10573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @fabulavancouver
## 10574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @familyfeudca
## 10575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @fatmaonoodles
## 10576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @fbcfcn
## 10577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @fcmonline
## 10578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @fdnpetf
## 10579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @feliciajcox
## 10580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @feloniousmunk
## 10581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @femiadegbulugbe
## 10582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @fgagnon5
## 10583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @filion1
## 10584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @firawle
## 10585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @firefly909
## 10586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @fischmandavid
## 10587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @fishoceanscan
## 10588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @fiski70
## 10589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @flashdrivetech
## 10590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @flitesurgn
## 10591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @folieurbaine
## 10592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @fontainesfs
## 10593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @footballsask
## 10594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @fordcanada
## 10595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @foreignofficepk
## 10596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @forgerat
## 10597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @foxnews
## 10598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @fp2p
## 10599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @franconomics
## 10600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @franknewmanhr
## 10601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @franktmcveety
## 10602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @friedbergeric
## 10603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           @ft
## 10604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @fuiwontdowhatu1
## 10605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @fullofrishi
## 10606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @fullvapor
## 10607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @g4474denise
## 10608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gabrielpizza
## 10609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gaccorporate
## 10610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @gbennett64
## 10611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @gcwhitecaps
## 10612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @geigernews
## 10613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @geno1955
## 10614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @geoffbuxcey
## 10615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @georgetakei
## 10616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @georgiastraight
## 10617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @gerrydee
## 10618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @getgutsycanada
## 10619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @getrepost
## 10620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @gidmk
## 10621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @giffordtweet
## 10622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @gilliansplace
## 10623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gilmourwendy
## 10624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @gingerrt215
## 10625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ginnylauren
## 10626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @glajoiejdq
## 10627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @glblctznimpact
## 10628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @glenkorstrom
## 10629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @globalbc
## 10630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @globalfishwatch
## 10631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @globalmontreal
## 10632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @globalnb
## 10633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @globalptbo
## 10634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @gmcfht
## 10635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @gmehra1981
## 10636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @gmleunghku
## 10637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @golfergirl2018
## 10638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @gonggasgirl
## 10639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @govnb
## 10640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @govnl
## 10641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @govpei
## 10642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @gppridesociety
## 10643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @grahamslaughter
## 10644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @graphicmatt
## 10645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @grayrealm
## 10646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gregdurocher
## 10647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @gregrickford
## 10648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @greycat45
## 10649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @grisparada
## 10650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @grtrow
## 10651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @gtconway3d
## 10652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @guardian
## 10653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @guelphchamber
## 10654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @guelphtoday
## 10655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @hamhealth
## 10656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @hamiltonecdev
## 10657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hamiltonfammed
## 10658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hamontqueers
## 10659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @handmadekathy
## 10660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @harris1961
## 10661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @harvardchansph
## 10662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @hbobrow1hbobrow
## 10663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @healthdpt
## 10664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @healthydebate
## 10665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @helenkennedy
## 10666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @hendog451
## 10667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @heylandsberg
## 10668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @hfxgov
## 10669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hiflyairline
## 10670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @hightempohocky
## 10671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @hillarylmcbride
## 10672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @hockeyns
## 10673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @hocspeaker
## 10674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @hollyswain
## 10675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @homedepotcanada
## 10676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @hopeforward2
## 10677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @horizonsd205
## 10678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @horizonsdujapon
## 10679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @hqca
## 10680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @hrnofcanada
## 10681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @hugodumas
## 10682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @hwcdsb
## 10683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @hwdsb
## 10684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @hydar24
## 10685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @hydroone
## 10686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ianbremmer
## 10687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @iantostenson
## 10688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @iciacadie
## 10689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @iciradiocanada
## 10690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @icsavings
## 10691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @iedmmontreal
## 10692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @iheartradioca
## 10693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ihpmeuoft
## 10694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @iingwen
## 10695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ilfordphoto
## 10696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @imaginecanada
## 10697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @imarpeperu
## 10698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @imthedarkknight
## 10699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @inanna1814
## 10700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @infoculture
## 10701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ingrahamangle
## 10702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ingridwaldron
## 10703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @innovatecalgary
## 10704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @insidevaccines
## 10705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @intfedageing
## 10706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @invancouber
## 10707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @isabellecharest
## 10708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ishaberry2
## 10709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @isienvision
## 10710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @italyincanada
## 10711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @itzprinceajayi
## 10712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @iyuse
## 10713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @izabonn
## 10714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jackthehatphoto
## 10715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jacquioneill
## 10716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @jagius
## 10717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jaimefraser
## 10718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jamesdieckhoff
## 10719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @janisirwin
## 10720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @jannmeds
## 10721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jasminaalstontv
## 10722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @jasonavery
## 10723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @jasonjohn2
## 10724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jasonluan88
## 10725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jattamensah
## 10726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @javapostprod
## 10727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @javerias
## 10728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @jaykarnes
## 10729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @jbabister
## 10730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jbmhfoundation
## 10731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jdemontreal
## 10732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jennykwanbc
## 10733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jeremybailey
## 10734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @jeromelandry
## 10735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @jerrypdias
## 10736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @jestrbob
## 10737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @jfrobergeqc
## 10738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jhsdurhamregion
## 10739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jillslastword
## 10740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @jimecliff
## 10741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @jimwatsonottawa
## 10742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jjgomezcamacho
## 10743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @jkellyca
## 10744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jmirpub
## 10745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @jnorthcottcbc
## 10746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jobrant
## 10747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @joecressy
## 10748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @joelhardenondp
## 10749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @johnjeddore
## 10750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @johnlwumz
## 10751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @johnrockdoc
## 10752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @jordan29204982
## 10753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @josefinavidalf
## 10754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @josephwongut
## 10755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @jpaulson49
## 10756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jpsoucy
## 10757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @jrandyh50
## 10758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @jrjchair
## 10759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @jsource
## 10760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @jtoyat
## 10761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @jucoroute
## 10762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @julienacosta
## 10763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @just4thecause
## 10764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @jyangstar
## 10765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @kahowlett
## 10766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @kai101497
## 10767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @kalegozer
## 10768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @karen4growers
## 10769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @katecallen
## 10770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @kateleeibd
## 10771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kathleenganley
## 10772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @katlarue7
## 10773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @kellygrant1
## 10774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kenningtonsays
## 10775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kerrvillagebia
## 10776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @kevinault
## 10777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @kevinrns
## 10778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @khnews
## 10779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @kikkiplanet
## 10780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @kimfcoates
## 10781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @kingdomofevan
## 10782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kinsellawarren
## 10783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @kissottawa
## 10784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @kjeefe
## 10785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @klongmire
## 10786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @kman11697257
## 10787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @krisster81
## 10788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @kristaguloien
## 10789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @kristynwongtam
## 10790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @ksorbs
## 10791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @kstateturk
## 10792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @kumailn
## 10793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @kurtdillon9
## 10794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lacyjohnsonmn
## 10795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lallyally2
## 10796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @landingai
## 10797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @langdean1
## 10798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @lapressesports
## 10799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @laradiopirate
## 10800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lauramaelindo
## 10801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @laurenpelley
## 10802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lauriescottpc
## 10803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @le985fm
## 10804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @leelaaheer
## 10805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @lenirobredo
## 10806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lepostitsfff
## 10807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @lfpress
## 10808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lidettadesse
## 10809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lifelinektown
## 10810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lifesavingon
## 10811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @lilykittycat99
## 10812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lindalabrosse
## 10813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @lisamurkowski
## 10814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @lithiumca
## 10815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @livmendelsohn
## 10816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @lizayuzda
## 10817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @llatraverse
## 10818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @lntransit
## 10819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @loblaws
## 10820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @loblawson
## 10821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @lolahensley
## 10822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @longasucan2
## 10823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @longondoeteni
## 10824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lornenystrom
## 10825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @lowes
## 10826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @lowescanadacorp
## 10827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @lpsmediaoffice
## 10828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @lstone
## 10829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ltamblynwatts
## 10830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @lukequinton
## 10831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @lussid
## 10832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @lydieomanga
## 10833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @lylerath
## 10834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @lyndseys2020
## 10835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @lynesworld
## 10836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @maanfarms
## 10837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @madeupengineer
## 10838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @madpharmacist1
## 10839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @mamadeb
## 10840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @marclacey
## 10841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @marcpaquet
## 10842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @margueritecaq
## 10843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mariadkins92
## 10844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @markajp19
## 10845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @markbreen
## 10846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @markconnollycbc
## 10847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @markledanny
## 10848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @markthebrewer
## 10849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @marotomichelle
## 10850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @marshiehilgs
## 10851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @martaetynkowski
## 10852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @martinlukk
## 10853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @martistone�
## 10854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @marycjordan
## 10855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @marykoco
## 10856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @maryng
## 10857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @matpvi
## 10858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mattfromnl
## 10859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mattgallowaycbc
## 10860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @matthancock
## 10861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mattnegrin
## 10862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @matty53259001
## 10863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @maureenpolitics
## 10864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @maxbergeron71
## 10865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @mbuhari
## 10866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mcdonaldscanada
## 10867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @mcfunny
## 10868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mcmasterfammed
## 10869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mcmasteru
## 10870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @meanwhileincana
## 10871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @medcouncilcan
## 10872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mediajps
## 10873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @medmira
## 10874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @meghanmccain
## 10875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mehdialoosh
## 10876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @mehdirhasan
## 10877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mennasedky
## 10878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mennomedia
## 10879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mercedesnicoll
## 10880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @merlinofcanada
## 10881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @metrolinx
## 10882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @mgodro2
## 10883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mheffernan
## 10884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @michaelchongmp
## 10885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @michaelheaver
## 10886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @michaelianblack
## 10887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @michaeljfoxorg�s
## 10888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @michaelkwan
## 10889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @michangoonga
## 10890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @michellesplant
## 10891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mikey4493
## 10892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @mimetic
## 10893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ministremccann
## 10894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @minproduccion
## 10895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @minrelchile
## 10896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @minsanterdc
## 10897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @minsapcuba
## 10898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @miwayhelps
## 10899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @mizbon
## 10900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mizzo12902394
## 10901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mlander87321751
## 10902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mlipsitch
## 10903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mlmorris64
## 10904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @mls
## 10905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mmajunkie
## 10906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mmburton
## 10907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @modelpriceguy
## 10908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @mohawkemotions
## 10909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @mondoalberta
## 10910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @monstatofu
## 10911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @montemcnaughton
## 10912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @morganralston
## 10913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mpjulian
## 10914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mrjohnnyhuynh
## 10915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @mrrobotcodebrkr
## 10916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @mshospital
## 10917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mstrixter
## 10918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @mtlville
## 10919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @mtracey
## 10920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @mymunkone
## 10921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @mysafeproject
## 10922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @myunitedway
## 10923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @myunitedway�s
## 10924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nachristakis
## 10925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nanokun1
## 10926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @narendramodi
## 10927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nassnigeria
## 10928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nastyoldwomyn
## 10929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @natbrochu
## 10930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nateglubish
## 10931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nayibbukele
## 10932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @nbcla
## 10933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @nbdocs
## 10934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nbennettbiv
## 10935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ncdcgov
## 10936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ncgovernor
## 10937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ndaliozegbe
## 10938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @ndp
## 10939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @neontaster
## 10940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nepadagency
## 10941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @netnewsledger
## 10942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @newdyogi
## 10943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @newsdio
## 10944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @newsmaker
## 10945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @neyka
## 10946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @nghoussoub
## 10947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ngrsenate
## 10948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @nhl
## 10949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @nhsengland
## 10950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @nhswhistleblowr
## 10951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @niantichelp
## 10952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @nickallen789
## 10953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nicktrop
## 10954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nicoledoray
## 10955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nicolemunro
## 10956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @nigeriantribune
## 10957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @nikgoing4gold
## 10958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @njguy51
## 10959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @nlmsb
## 10960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @nlpublibraries
## 10961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @nobskat
## 10962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @nofiaagri
## 10963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @nolore
## 10964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @norareed
## 10965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @northerntrust
## 10966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @nseducation
## 10967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @nserccrsng
## 10968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @nsgeu
## 10969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @nsgov
## 10970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @nshealth
## 10971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @nspector4
## 10972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ntyravgdramaqun
## 10973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @nuttallreports
## 10974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @nuzzel
## 10975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ny05367858
## 10976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @nyandeng17
## 10977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @nyrr
## 10978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @nyudental
## 10979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         @oaci
## 10980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @oakvillechamber
## 10981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @oakvilledwntown
## 10982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @obiwandwighto
## 10983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @obrieniph
## 10984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ocasipolicy
## 10985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @oceanaperu
## 10986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @odbfoundation
## 10987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @officialdgispr
## 10988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @oilmenproblems
## 10989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @omeraziz12
## 10990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @onemileatatime
## 10991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @onlabour
## 10992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @onlongtermcare
## 10993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @ontarioparks
## 10994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @ontdad
## 10995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @ontenergyboard�s
## 10996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @onthospitalassn
## 10997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @onyeactivemd
## 10998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @orgsforimpact
## 10999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @orlatinsley
## 11000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @orussellrussell
## 11001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @oshawacentre
## 11002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @oshawacity
## 11003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @oshawaexpress
## 11004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @oshawagenerals
## 11005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @oslerfoundation
## 11006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @oslerhealth
## 11007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @ottawareporter
## 11008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ouilyan
## 11009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ourcommons
## 11010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @outhitrecord
## 11011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @parkinsoncanada
## 11012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @partiquebecois
## 11013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @pascal1rodier
## 11014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @patfortini
## 11015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @pathou1
## 11016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @patrickbrownont
## 11017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @patrickdarot
## 11018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @patrickdery
## 11019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @pattyarquette
## 11020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @pattywinsa
## 11021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @paulchisholm
## 11022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @paulgimson
## 11023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @paullanemha
## 11024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @pedroperezcuban
## 11025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @peelpolice
## 11026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @people
## 11027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @peterzimonjic
## 11028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @peteschaad
## 11029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @pgmatters
## 11030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @phaki75
## 11031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @phalliance
## 11032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @phcouille
## 11033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @phillyparttwo
## 11034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @philthe4cstr
## 11035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @phoebeayers
## 11036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @photoshoplee
## 11037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @piattopizzeria
## 11038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @pingcanada
## 11039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @plasticdoe
## 11040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @pmethiopia
## 11041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @pnpcbc
## 11042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @pokernews
## 11043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @policyschool
## 11044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @politico
## 11045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @politicsfisher
## 11046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @ponderosaresort
## 11047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @popeyedbarkin
## 11048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @porcupinehu
## 11049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @postteneblire
## 11050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @prada
## 11051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @predictmedix
## 11052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @premierscottmoe
## 11053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @prideeskasoni
## 11054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @princepolity
## 11055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @prochile
## 11056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @provaxtexan
## 11057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ptbohealth
## 11058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ptcnetwork
## 11059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @puglaas
## 11060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @pulte
## 11061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @pumbarger
## 11062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @pwaldieglobe
## 11063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @pwats
## 11064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @quebecasf
## 11065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @quetonysaintvil
## 11066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @racheldolhunmd
## 11067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @radiocanadainfo
## 11068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @raeon
## 11069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @rainalgoma
## 11070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @rajmehta
## 11071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @raman618
## 11072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rauolduke1975
## 11073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @rbcwealth
## 11074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @realcdnss
## 11075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @realdoctormike
## 11076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @rebbrewgreasy1
## 11077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rebbrewregina
## 11078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @rebelnewsonline
## 11079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @redcrosscanada
## 11080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @redlianak
## 11081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @redsonika
## 11082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @refinery29
## 11083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @regina1775
## 11084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @reginaregionhba
## 11085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @remokingscty
## 11086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @renatomariotti
## 11087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @renctyparamedic
## 11088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @reporton
## 11089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @repr13
## 11090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @rethinkgreen
## 11091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @reuters
## 11092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @reverendofdoubt
## 11093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @richardmartinc
## 11094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @richardzussman
## 11095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @rickanderson
## 11096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ricktourand
## 11097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ridercharm
## 11098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @risettemd
## 11099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rivistamicron
## 11100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @rkhamsi
## 11101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @rmazar
## 11102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @rmcsport
## 11103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @rmtao
## 11104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @rob29
## 11105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @robacooper
## 11106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @robertbenzie
## 11107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @robertfife
## 11108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @robertlustigmd
## 11109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @robinthemurr
## 11110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @roboliphant
## 11111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @robshawbc
## 11112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @roccorossito
## 11113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @roguetrader842
## 11114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rolfatwarwick
## 11115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @roninytimes
## 11116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @rossalex3
## 11117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @rossromanossm
## 11118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @rougepark
## 11119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @rudygiuliani
## 11120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @rugbyontario
## 11121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @runhack
## 11122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ruthkapelus
## 11123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @rvcisco
## 11124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ryanafournier
## 11125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ryanatlfpress
## 11126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @saanich
## 11127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sabaeitizaz
## 11128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sacredheartchs
## 11129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @saeeds05
## 11130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @salacnalsv
## 11131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @samlapradecfre
## 11132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @sarahelago
## 11133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @sarahwaltonnews
## 11134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @sarahxpeterson
## 11135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @sarakepp
## 11136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sarniaontario
## 11137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @saskiahouttuin
## 11138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sasktrucking
## 11139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @sassafraz2
## 11140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sassywinemama
## 11141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @savechildrencan
## 11142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @scottatempyrean
## 11143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @scottreidcpc
## 11144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @scottsimonsays
## 11145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @seanschofer
## 11146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @seguincbc
## 11147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sehealthsehc
## 11148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @selfieblood
## 11149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @senategop
## 11150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @senatortimscott
## 11151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @senatorwanda
## 11152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @senekaspiro
## 11153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @serrazina777
## 11154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @servicecanadae
## 11155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @setfht
## 11156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @seunokin
## 11157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @shakibas
## 11158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @shandro
## 11159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @shaniatwain
## 11160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @shannadelic
## 11161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @shannbil
## 11162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @sharkawymd
## 11163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @shawnmenard1
## 11164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @shawsandy
## 11165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sheilkapadia
## 11166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @shelleycarroll
## 11167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sheryllings
## 11168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @sherylwillwrite
## 11169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @shirleesharkey
## 11170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @shoffmania�s
## 11171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @shoochoux
## 11172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @shoreclub
## 11173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @showbizznet
## 11174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @shulmanlawfirm
## 11175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @shyguy2012
## 11176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sicknotweak
## 11177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @sinaihemeob
## 11178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @sjack68
## 11179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @skellyhamilton
## 11180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @skepticj
## 11181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @skyeryanchek
## 11182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @skylark007
## 11183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @slavamalamud
## 11184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @slivrerimouski
## 11185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @slkshewolf
## 11186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @smcwoof
## 11187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @smdhealthunit
## 11188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @smiley37555
## 11189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @snpperu
## 11190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @sobeys
## 11191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @soficerrato
## 11192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sofipapamarko
## 11193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @solidfooting
## 11194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @sootoday
## 11195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @soprettyjewelry
## 11196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @soyjoseyoutuber
## 11197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @spaikin
## 11198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @spatotalfitness
## 11199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @sportsjimshow
## 11200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @srosayul
## 11201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ssottweets
## 11202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @stahpl
## 11203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @statcaneng
## 11204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @stevenlebron
## 11205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @stjosephslondon
## 11206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @stopcensorship7
## 11207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @stphnmaher
## 11208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @strangrobert
## 11209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @strava
## 11210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @stubhub
## 11211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @stupug90
## 11212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @subreichile
## 11213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @sucresaletva
## 11214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @sugarman
## 11215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @suncor
## 11216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @superfannav
## 11217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @surgisphere
## 11218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @suryodipuro
## 11219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @susanhennessey
## 11220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @susanscranton
## 11221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @susanwelch7
## 11222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @sutterink
## 11223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @suzioneill
## 11224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @suzost
## 11225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @swedishchf
## 11226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @swordthechemist
## 11227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @sydneyuni
## 11228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @tarajago
## 11229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @tcafrica
## 11230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @tdinsurance
## 11231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tdotmonkey
## 11232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @teamcanada999
## 11233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @teamstubhub
## 11234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @tedesg
## 11235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @tegan4618
## 11236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @telus
## 11237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @telussupport
## 11238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @tenderlymag
## 11239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @teplitzer1
## 11240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @teprichardson
## 11241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          @thchospital<u+2800>
## 11242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @theagenda
## 11243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @thecurrentcbc
## 11244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @thedrpaul
## 11245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @thelancet
## 11246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @theloft32
## 11247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thelowerdeckhfx
## 11248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @theorossi
## 11249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @therealvempyre
## 11250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @therealyotung
## 11251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @theresaboyle
## 11252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @therickhoweshow
## 11253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thesmacleodshow
## 11254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @thesophislife
## 11255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @theurbancowboy
## 11256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thisisdrkbeauty
## 11257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @thisoffendsmetv
## 11258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @thomaskaine5
## 11259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @thompson37
## 11260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @threekretans
## 11261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @timcast
## 11262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @timetotravelca
## 11263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @timiskamingmoh
## 11264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @timothylewis
## 11265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @tinasalama2
## 11266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @tljkelly
## 11267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @toadamvaughan
## 11268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @todayvillee
## 11269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @toddsmithpc
## 11270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @tofinochamber
## 11271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @tomvandebelt
## 11272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @toonforbrains
## 11273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @tophbbq
## 11274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @torontofire
## 11275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             @torontolibrary�s
## 11276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @tourismcb
## 11277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @tourismtofino
## 11278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @tourismucluelet
## 11279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @townofwhitby
## 11280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @tpffa
## 11281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @traumagasdoc
## 11282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @travisdhanraj
## 11283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @trevortombe
## 11284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @trevortombes
## 11285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @troydee
## 11286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @trulieve
## 11287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ttchelps
## 11288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ttcriders
## 11289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @tusantaofficial
## 11290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @tvanouvelles
## 11291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @tvareseau
## 11292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @twitter
## 11293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @twstdbro
## 11294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @tysonfoods
## 11295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @tywalsh
## 11296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @ubcosoe
## 11297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @ubctbirds�
## 11298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @ucpcaucus
## 11299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @ufgator198589
## 11300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @uitpanz
## 11301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @umich
## 11302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @ummcnews
## 11303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @unexplained
## 11304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @unherd
## 11305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @unitedwayeo
## 11306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @unpubott
## 11307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @uofgcomputing
## 11308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @uoftbmsa
## 11309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @uoftcitiesyorkuniversity
## 11310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @uoftnews
## 11311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @upexpress
## 11312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @urmakea
## 11313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @usaskdentistry
## 11314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @usatoday
## 11315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @utsdhouston
## 11316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @uwhalifax
## 11317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @vadeboncoeural
## 11318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @vancouverite
## 11319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @vancouversun
## 11320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @vemcoteam
## 11321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @veraetches
## 11322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @veritasever
## 11323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @viasportbc
## 11324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @vibe105to
## 11325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @vilavaite
## 11326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @villacortelis
## 11327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @vipconcierge
## 11328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @vmochama
## 11329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @vocmben
## 11330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @voxdotcom
## 11331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @w2salliance
## 11332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @walmartcanada
## 11333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    @waraujo64
## 11334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @wdcanada
## 11335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @weathernetwork
## 11336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @wfpjasonbell
## 11337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @wherebuffloroam
## 11338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @whitecapsceo
## 11339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @whopakistan
## 11340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @wilkinson4bc
## 11341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @willbouw
## 11342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @windsoritedotca
## 11343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @winnipegharvest
## 11344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @winnipegnews
## 11345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @wmpdll
## 11346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @woodbinetbs
## 11347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @worksafebc
## 11348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @wrrecord
## 11349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @wudunn
## 11350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       @wxdyck
## 11351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @yahoofinance
## 11352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     @yarrrsky
## 11353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 @yasminarebel
## 11354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @yasmohammedxx
## 11355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        @ycdsb
## 11356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @ydentremont
## 11357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @yellowsmama
## 11358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @yfcmatt
## 11359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               @yorkparamedics
## 11360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @youngocato
## 11361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @youralberta
## 11362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  @yourcaledon
## 11363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                @yourtvwindsor
## 11364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @youthwrite
## 11365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @yrtviva
## 11366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @zahraeb
## 11367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      @zfrmrza
## 11368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              @zoecharalambo18
## 11369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   @zoetwodots
## 11370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #a380
## 11371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #ab
## 11372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #abbusiness
## 11373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #abed
## 11374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #aca2020
## 11375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #acabose
## 11376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #acconvocation
## 11377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #acproud
## 11378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #advertising
## 11379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #advocacymatters
## 11380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #advocate
## 11381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #africa
## 11382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #afrobeats
## 11383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #afrohair
## 11384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #ageism
## 11385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #aherotoo
## 11386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #airbourne
## 11387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #ajax65
## 11388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #alllivesmater
## 11389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #alonetogether
## 11390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #alumniproud
## 11391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #americansincanada
## 11392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #anchoveta
## 11393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #andratuttobene
## 11394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #animation2d
## 11395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #anime
## 11396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #antifa
## 11397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #apartmentbuilding
## 11398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #approach
## 11399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #apps
## 11400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #argyle
## 11401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #art
## 11402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #artdengroundmoviment
## 11403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #artforkidshub
## 11404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #artworks
## 11405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #asktheallergist
## 11406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #astia
## 11407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #asylumseekers
## 11408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #aurora
## 11409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #babybear
## 11410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #backinthegame
## 11411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #backtoschool
## 11412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #badcustomerservice
## 11413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #bail
## 11414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #bailhearing
## 11415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #bandcampfriday
## 11416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #bankofcanada
## 11417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #barbershop
## 11418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #bc1
## 11419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #bcliberal
## 11420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #bcndp
## 11421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #bcnlegends
## 11422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #bcooli
## 11423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #bcpoli
## 11424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #bctourismmatters
## 11425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #bcwine
## 11426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #beatthevirus
## 11427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #beaumont
## 11428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #bebryst
## 11429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #beingplayed
## 11430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #belayscience
## 11431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #besserwisser
## 11432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #betterdays
## 11433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #bettertogetherthp
## 11434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #bharatbiotech
## 11435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #bigtent
## 11436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #biosecurity
## 11437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #bird
## 11438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #birdiesnotbogeys
## 11439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #blacklifematters
## 11440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #blacklivesmattertoronto
## 11441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #blacktaildeer
## 11442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #blacktwitter
## 11443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #blakelivesmatter
## 11444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #blegends
## 11445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #blissful
## 11446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #blmprotest
## 11447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #blmtoronto
## 11448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #blmvancouver
## 11449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #blogger
## 11450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #bloggingcommunity
## 11451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #bloodforlife
## 11452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #bluemountain
## 11453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #bluemountainvillage
## 11454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #bluesky
## 11455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #bmwsam
## 11456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #bodyfat
## 11457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #booking
## 11458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #brampton�s
## 11459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #brandmarketing
## 11460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #brantcountydelivers
## 11461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #brantforddelivers
## 11462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #brantford�
## 11463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #breton
## 11464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #bridge
## 11465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #brossard
## 11466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #brothersbarbershop
## 11467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #buckaday
## 11468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #bucklake
## 11469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #bunkerbitch
## 11470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #bunkerina
## 11471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #bureau
## 11472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #burlington
## 11473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #burlon
## 11474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #businesses
## 11475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #businessimpact
## 11476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #buyers
## 11477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #cabinfever
## 11478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #cafeto
## 11479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #calmar
## 11480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #cambcoc
## 11481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #camp
## 11482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #campbellton
## 11483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #camping
## 11484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #canadaearsavers
## 11485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #canadaemergencywagesubsidy
## 11486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #canadamoves
## 11487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #canadapost
## 11488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #canoncanada
## 11489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #canpl
## 11490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #canwest
## 11491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #capilanou�s
## 11492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #caq
## 11493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #cardio
## 11494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #care
## 11495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #career
## 11496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #careeradvice
## 11497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #caringchampion
## 11498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #carpool
## 11499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #ccfvirtualgolf
## 11500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #ccicforum2020
## 11501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #cement
## 11502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #centech
## 11503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #cerb
## 11504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #challengestoday
## 11505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #chambers
## 11506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #charities
## 11507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #charterrights
## 11508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #cheerismysport
## 11509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #chihuahua
## 11510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #childcare
## 11511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #childrenactivities
## 11512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #chilliwack
## 11513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #chilliwackfc
## 11514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #chillvenue
## 11515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #china
## 11516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #chinese
## 11517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #chiro
## 11518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #chsld��
## 11519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #churchdoors
## 11520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #cityofpg
## 11521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #cl
## 11522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #classic
## 11523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #climate
## 11524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #climatechange
## 11525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #cnn
## 11526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #cocktails
## 11527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #coldfact
## 11528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #collaboration
## 11529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #colour
## 11530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #comfortfood
## 11531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #commercialcleaning
## 11532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #commitedtoyoursafety�
## 11533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #commonsense
## 11534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #comox
## 11535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #comoxvalley
## 11536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #compscied
## 11537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #concrete
## 11538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #confinement
## 11539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #constitutionalrights
## 11540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #contacttracing
## 11541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #corktownto
## 11542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #coronationpark
## 11543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #coronavirusmemes
## 11544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #coronavirusmemes<u+0001f602><u+0001f602><u+0001f602>
## 11545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #coronaviruson
## 11546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #corydon
## 11547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #countyofbrant
## 11548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #covi
## 11549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #covid19manitoba
## 11550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covid19mb
## 11551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #covid19memes
## 11552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covid19nb
## 11553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covid19threeshotchallenge
## 11554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #covid19toronto
## 11555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #covidab
## 11556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covidfree
## 11557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covidiots
## 11558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #covidlearning
## 11559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #covidns
## 11560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #covidtent
## 11561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #covidupdate
## 11562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #crazysocks4docs
## 11563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #creative
## 11564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #criminallaw
## 11565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #criminallawyer
## 11566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #crystalheadvodka
## 11567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #cuarentena
## 11568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #cuba
## 11569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #curling
## 11570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #curseof
## 11571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #customersatisfaction
## 11572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #cybersecurity
## 11573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #cyberstrategy
## 11574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #cycling
## 11575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #dataprivacy
## 11576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #daycamp
## 11577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #deaths
## 11578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #debradynesfamilyhouse
## 11579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #deer
## 11580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #dentalcare
## 11581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #desescalada
## 11582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #devon
## 11583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #digitalmarketing
## 11584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #digitalparent
## 11585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #disability
## 11586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #disabilityrights
## 11587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #disinfecting
## 11588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #disinfectingmat
## 11589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #distractions
## 11590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #dog
## 11591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #dogsoftwitter
## 11592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #dogsofworld
## 11593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #dominatrix
## 11594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #donate
## 11595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #dontletyourguarddown
## 11596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #dorados
## 11597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #dosanddonts
## 11598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #downsyndromecanada
## 11599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #drama�
## 11600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #drivercheck
## 11601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #drkheals
## 11602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #drones
## 11603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #ecommerce
## 11604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #edm2020
## 11605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #edmontonactivities�
## 11606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #edmtontonjournal
## 11607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #edu
## 11608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #educateyourself
## 11609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #effects
## 11610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #elderabuse
## 11611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #electrical
## 11612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #electropop2020
## 11613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #emeraldessentials
## 11614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #endpolio
## 11615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #endthelockdown
## 11616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #endwildlifetrade
## 11617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #enfantbilingue
## 11618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #entrancemats
## 11619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #epicpandemicresponsefail
## 11620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #essentialservice
## 11621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #essentialworkers
## 11622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #estherisman
## 11623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #eurpoeancarspecialist�
## 11624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #exergy
## 11625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #exorcist
## 11626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #expert
## 11627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #explorebclocal
## 11628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #exploreyukon
## 11629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #eyes
## 11630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #facstyle
## 11631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #factualbasedinformation
## 11632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #familiares
## 11633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #familyfeud
## 11634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #fangirl
## 11635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #fase1
## 11636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #fearmongering
## 11637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #feministbailout
## 11638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #femmes
## 11639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #fencesandrocketsdontstopvirusesdumbass
## 11640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #filmjune
## 11641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #findyourpurpose
## 11642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #fireher
## 11643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #firstaid
## 11644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #firstnation
## 11645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #fisheries
## 11646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #fitnessgoals
## 11647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #flattenthecurve
## 11648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #flowers
## 11649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #fnf
## 11650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #follow
## 11651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #followtherules
## 11652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #foodallergies
## 11653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #foodallergy
## 11654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #forbes
## 11655                                                                                                                                                                                                                                                                                                                                                                                                                                      #fordfordcanadafordcustomlineclassiccarcarreviewscovid19covid19coronavirusenglehartenglehartontariocoreyfoulemautomotive
## 11656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #forkids
## 11657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #france
## 11658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #fraud
## 11659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #freshair
## 11660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #fridayvibes
## 11661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #frontlineheroes
## 11662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #fundraiser
## 11663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #fundraising
## 11664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #funnymemes
## 11665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #futureofwork
## 11666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #gamemyclass
## 11667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #garden
## 11668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #gc2020
## 11669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #gcdigital
## 11670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #gerrydee
## 11671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #getoutside
## 11672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #gettested
## 11673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #ghana
## 11674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #gibraltarmarket
## 11675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #gintonic
## 11676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #girllove
## 11677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #givechwk
## 11678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #given
## 11679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #globalcitizen
## 11680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #globalrunningday
## 11681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #globalrunningday2020
## 11682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #golf
## 11683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #golfcourse
## 11684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #golfing
## 11685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #goodnews
## 11686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #goodspirits
## 11687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #goodtimes
## 11688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #governor
## 11689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #graditude�
## 11690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #graffiti
## 11691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #grandparents
## 11692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #greatidea
## 11693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #greatlakes
## 11694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #greenscreen
## 11695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #greenteam
## 11696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #grief
## 11697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #grizzlysanitize
## 11698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #gsd
## 11699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #gtasoccer
## 11700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #gtp2020
## 11701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #guelph
## 11702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #gym
## 11703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #gymresultssaintjohngym
## 11704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #halifax
## 11705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #hamilton
## 11706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #handsanitizer
## 11707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #happyness
## 11708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #hardestworkerintheroom
## 11709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #harlequin
## 11710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #hauntedhouse
## 11711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #hawkesbury
## 11712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #headcovergoals
## 11713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #healing
## 11714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #healthandsafety
## 11715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #healthandwellness
## 11716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #healthcareheroes
## 11717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #healthequity
## 11718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #healthy
## 11719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #heartlinkslondon
## 11720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #hespeler
## 11721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #hfx
## 11722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #hidalgocleaners
## 11723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #hifly
## 11724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #highered
## 11725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #highstreet
## 11726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #hitmusic
## 11727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #hole2
## 11728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #hollywood
## 11729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #hope
## 11730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #hopeforpeople
## 11731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #horizonstrong
## 11732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #houses
## 11733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #housing
## 11734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #hurricaneseason
## 11735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #hw
## 11736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #ibd
## 11737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #icantbreathe
## 11738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #icanucandiy
## 11739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #icymi
## 11740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #iffo
## 11741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #imfc
## 11742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #indigenouscanada
## 11743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #indigenoustourismbusiness
## 11744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #indigenoustoursm
## 11745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #infectiousdiseasesbill
## 11746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #infrastructure
## 11747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #inittogether
## 11748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #innovation
## 11749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #innovationcouncil
## 11750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #internationalstudent
## 11751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #investedinyou
## 11752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #investing
## 11753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #investinkids
## 11754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #ipactwitter
## 11755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #isol�sensemble
## 11756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #italy
## 11757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #janiking
## 11758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #japanuniversity
## 11759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #jasonsfunctionaltrainingstudio
## 11760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #jillyandtyty
## 11761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #jiujitsu
## 11762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #joannedykeman
## 11763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #job
## 11764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #jobscaledon
## 11765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #jobtip
## 11766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #johnhopkins
## 11767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #johnprine
## 11768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #jokeoftheweek
## 11769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #juin2020
## 11770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #justice4blacklives
## 11771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #justice4blackliveswinnipeg
## 11772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #justiceforgeorge
## 11773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #justiceforgeorgefloyd
## 11774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #justmyopinion
## 11775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #jw�tpououleta
## 11776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #karate
## 11777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #karat�
## 11778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #keepitintheshortgrass
## 11779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #kidsareamazing
## 11780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #kidsmentalhealth
## 11781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #kingofclean
## 11782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #kingstonontario�
## 11783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #klassiq
## 11784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #labconnect
## 11785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #lacurfew
## 11786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #lakeontario
## 11787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #lancetgate
## 11788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #landscapepainter
## 11789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #langley
## 11790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #las
## 11791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #latergram
## 11792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #lavonsnouslesmains
## 11793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #lawyers
## 11794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #leatherfashion
## 11795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #leduc
## 11796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #leduccounty
## 11797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #leducphysio
## 11798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #letsdothis
## 11799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #life
## 11800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #lights
## 11801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #likes
## 11802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #live
## 11803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #liveunderpar
## 11804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #localbusiness
## 11805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #localeconomy
## 11806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #locallove
## 11807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #lockdown2020
## 11808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #lockdownlessons
## 11809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #lodge
## 11810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #logistics
## 11811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #lovetheview
## 11812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #loveyou�
## 11813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #macedonia
## 11814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #madeinontario
## 11815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #maharashtra
## 11816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #makeamericagreatbyelectinganewpresident
## 11817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #mameacad�mique
## 11818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #manmade
## 11819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #marshlake
## 11820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #masochist
## 11821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #masque
## 11822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #mccraepark
## 11823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #mecfs
## 11824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #meckerer
## 11825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #medical
## 11826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #medicalhealth
## 11827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #meetcanada
## 11828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #memes
## 11829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #mentalhealthawareness
## 11830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #mentalhealthwebinar
## 11831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #mercedesbenzamg
## 11832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #merica
## 11833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #metoo
## 11834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #micdrop
## 11835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #michaelsolomon�
## 11836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #millet
## 11837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #milton
## 11838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #mindfulcommunication
## 11839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #mississaugalakeshore
## 11840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #mobileoffice
## 11841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #monday
## 11842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #mondaysmomentum
## 11843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #mondaythoughts
## 11844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #montrealplanes
## 11845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #montr�al
## 11846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #moreliesfromwhitehouae
## 11847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #mortgage
## 11848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #motivationalmonday
## 11849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #movers
## 11850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #moving
## 11851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #mso
## 11852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #mtl�
## 11853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #mumbai
## 11854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #music
## 11855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #musiclife
## 11856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #muskoka
## 11857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #my
## 11858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #mylittlepal
## 11859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #naija
## 11860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #nationalaccessibilityweek
## 11861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #nationallifeguard
## 11862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #nationalparks
## 11863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #nationalurbanpark
## 11864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #natoinnovationhub
## 11865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #nature
## 11866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #nb
## 11867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #nbpoli
## 11868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #neighbours
## 11869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #nejmgate
## 11870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #netflix
## 11871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #networking
## 11872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #new
## 11873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #newhomes
## 11874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #newmarket
## 11875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #newnormal2020
## 11876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #niagarawinecountry
## 11877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #nieghbours
## 11878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #nitricoxide
## 11879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #nlwx
## 11880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #nochildlaborday
## 11881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #nofilter
## 11882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #nonprofit
## 11883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #nooneisimmune
## 11884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #normal
## 11885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #northerncanada
## 11886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #northernontario
## 11887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #nothingbutmondays
## 11888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #ns
## 11889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #nurse
## 11890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #nursesrock
## 11891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #nyrrvolvovirtualracing
## 11892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #oakville
## 11893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #odbf
## 11894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #office
## 11895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #ojibwayshores
## 11896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #olympicviewgolfcourse
## 11897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #onbayliving
## 11898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #one
## 11899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #onetable
## 11900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #oneworld
## 11901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #onlinelearning
## 11902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #onlinesafety
## 11903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #onlineservices
## 11904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #onlinetutoring
## 11905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #onpc
## 11906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #onpse
## 11907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #onstorm
## 11908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #ontarioassociationofoptometrists
## 11909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #ontariooptometrists
## 11910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #ontariorealestateassociation
## 11911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #ontariorealtorparty
## 11912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ontarios
## 11913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #ontariotogether
## 11914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #opinion
## 11915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #opseu
## 11916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #optometrist
## 11917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #ottawamurals
## 11918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #ottawa�
## 11919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #ottbike
## 11920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #ottnews
## 11921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #outbreak
## 11922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #outdoors
## 11923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #overcome
## 11924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #pacrimregion
## 11925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #painting
## 11926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #pandemicart
## 11927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #pand�mie
## 11928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #pantherhockey
## 11929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #paramedics
## 11930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #parisdelivers
## 11931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #parksandrecreation
## 11932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #parliament
## 11933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #patioseason
## 11934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #peaceandlove
## 11935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #photo
## 11936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #photodocumentary�
## 11937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #physicianwellness
## 11938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #physiotherapy
## 11939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #pigeonlake
## 11940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #playball
## 11941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #pmjt
## 11942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #pnpcbc
## 11943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #podcastinterview
## 11944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #polcan
## 11945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #police
## 11946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #polmtl
## 11947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #polvsad
## 11948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #pond
## 11949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #pondphotography
## 11950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #postpromise
## 11951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #potstocks
## 11952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #ppes
## 11953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #premiertents
## 11954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #pride2020
## 11955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #prideskull
## 11956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #princeedwardisland
## 11957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #privacy
## 11958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #procheaidantes
## 11959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #property
## 11960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #protech
## 11961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #protocols
## 11962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #publichealth
## 11963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #puke
## 11964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #pulleypickuo
## 11965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #purejoy
## 11966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #purplehair
## 11967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #quarantineschool
## 11968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #quebec
## 11969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #quer�taro
## 11970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #racism
## 11971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #radiationoncology
## 11972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #reading
## 11973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #realtor
## 11974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #reconnaissance
## 11975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #record
## 11976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #reflection
## 11977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #regressiveconservatives
## 11978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #reinon
## 11979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #relationshipsmatter
## 11980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #renewableenergy
## 11981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #renewpei
## 11982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #renfrew
## 11983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #repost
## 11984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #resigntrump
## 11985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #respecteachother
## 11986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #respectworkers
## 11987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #retouraubureau
## 11988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #retreatspace
## 11989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #retweets
## 11990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #riots2020
## 11991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #rip
## 11992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #rmcombine
## 11993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #roadmap2recovery
## 11994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #robotgraduation
## 11995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #royalscissors
## 11996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #runforthefund
## 11997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #r�alit�sf�ministes
## 11998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #sadomasochism
## 11999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #safety1st
## 12000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #safetytips
## 12001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #sameday
## 12002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #samirumer
## 12003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #sanitizeshoes
## 12004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #sanitizingmats
## 12005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #sant�
## 12006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #sarcoidosis
## 12007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sarscov2
## 12008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #saskatchewan
## 12009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #savealife
## 12010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #savestraycats
## 12011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #savewithstories
## 12012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #sciart
## 12013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #scoop2020
## 12014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #scrubs
## 12015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #sdoh
## 12016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #searchingforsugarman
## 12017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #seasonal
## 12018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #secondwave
## 12019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #selfcare
## 12020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #selfietime
## 12021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #selfishndp
## 12022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #selfishselfie
## 12023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #seniors
## 12024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #services
## 12025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #service�
## 12026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #share
## 12027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #shipping
## 12028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #shopcambridge
## 12029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #shoplocal
## 12030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #shopping�
## 12031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #shotshotshotshotshotshots
## 12032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #showlove
## 12033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #sjam
## 12034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #skpoli
## 12035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #skulls
## 12036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #smallbusiness
## 12037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #smallbusinessmarketing
## 12038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #smm
## 12039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #soccer
## 12040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #socialmediamanagement
## 12041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #sogo
## 12042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sogobudo
## 12043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #sogobudodojo
## 12044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #sogobudolaval
## 12045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #sograteful
## 12046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #solarenergy
## 12047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #solongandthanksforallthefish
## 12048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #songs
## 12049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #sorosfundedriots
## 12050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #soundcloud
## 12051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #southasia
## 12052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #southkorea
## 12053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #southwesternontario
## 12054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #speedlite
## 12055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #spiritualsupport
## 12056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #splitcosts
## 12057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #sports
## 12058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #sportsphotographer
## 12059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #sportsphotography
## 12060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #stage2
## 12061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #stayhealthy
## 12062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #staysafestayhealthy
## 12063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #staysafe�
## 12064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #stem
## 12065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #sterlinghonda
## 12066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #stgeorgedelivers
## 12067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #stopthespread
## 12068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #storage
## 12069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #storm
## 12070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #street
## 12071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #streetphotography
## 12072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #stress
## 12073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #sumer
## 12074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #summer2020
## 12075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #summeractivities
## 12076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #summertime
## 12077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #summervibes
## 12078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sunpeaks
## 12079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #sunshine
## 12080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #supplychain
## 12081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #support
## 12082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #surveillance
## 12083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #sushi
## 12084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #swansea
## 12085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #symptoms
## 12086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #taiseikarate
## 12087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #talentedcoworkers
## 12088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #tbay
## 12089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #tdinsurance
## 12090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #tdot
## 12091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #teachbetter
## 12092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #teamevents
## 12093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #teampeoplefirst
## 12094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #telemedicine
## 12095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #telework
## 12096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #tentguystrong
## 12097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #tents
## 12098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #texas
## 12099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #tgif
## 12100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #thankyou
## 12101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #thankyou�
## 12102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #thebluemountain
## 12103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #thehealthygc
## 12104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #thepurgeanarchy
## 12105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #thethirdpath
## 12106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #thewho
## 12107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #thismatters
## 12108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #thorsby
## 12109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #thunder
## 12110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #thursday
## 12111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #timetotravel
## 12112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #tofino
## 12113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #together
## 12114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #togetherfromaways
## 12115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #together�
## 12116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #torontophotographer
## 12117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #torontophotography
## 12118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #torontopolyclinic
## 12119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #torontopremiunoutlet
## 12120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #torontosoccer
## 12121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #tpc
## 12122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #traffic
## 12123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #transit
## 12124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #transportation�
## 12125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #travelrestrictions
## 12126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #trees
## 12127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #triage
## 12128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #trudeau
## 12129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #trudeaumustgo
## 12130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #trumpdictatorship
## 12131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #trumpisanidiot
## 12132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #trumporamerica
## 12133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #trumptaxreturns
## 12134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #tuesday
## 12135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #tuesdaythoughts
## 12136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #tunnel
## 12137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #tunnelvision
## 12138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #tweeps
## 12139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #twitter
## 12140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #twitterdoctors
## 12141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #uas
## 12142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ucalgary
## 12143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #ucluelet
## 12144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                #ucpcorruption
## 12145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #umami
## 12146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #unbc
## 12147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #uofc
## 12148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #uoftgrad20
## 12149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #urbangraffitisbcn
## 12150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #usports
## 12151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #vacation
## 12152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #vaccineswork
## 12153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #vancouverisland
## 12154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #vancouverisland�
## 12155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #vandalism
## 12156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #ventilators
## 12157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #verschw�rungstheoretiker
## 12158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #vet
## 12159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #vetenaryhospital
## 12160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #vfx
## 12161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #virtualgraduation
## 12162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #virtualhugs
## 12163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #virtualrace
## 12164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #virtualrideforheart
## 12165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #vistacare
## 12166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #vulnerable
## 12167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #walk
## 12168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #walking
## 12169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #warburg
## 12170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #wasaga
## 12171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               #wasagabusiness
## 12172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #weaad2020
## 12173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #wearamask2savelives
## 12174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           #wereinthistogether
## 12175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #westandtogether
## 12176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   #wetaskiwin
## 12177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             #wewillgetthroughthis<u+0001f499>
## 12178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #whatdoyouneedcleaned
## 12179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #windsor
## 12180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #windsoressex
## 12181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         #wnbr
## 12182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  #wnbrtoronto
## 12183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #wnbrtoronto2020
## 12184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #womensrights
## 12185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 #workfromhome
## 12186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #worklife�workfromhomelife��workfromhomeproblems
## 12187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #worldbank
## 12188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #worldenvironmentday
## 12189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #worthit
## 12190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #yegbiz
## 12191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #yegcc
## 12192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #yegcoffee
## 12193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #yeggarden
## 12194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #yeglocal
## 12195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #yegwine
## 12196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      #yorkies
## 12197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #yorku
## 12198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            #youthmentalhealth
## 12199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #yqg
## 12200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              #yqgstandsstrong
## 12201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #yqr
## 12202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        #yukon
## 12203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #yul
## 12204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       #yycmds
## 12205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #yyj
## 12206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          #yyz
## 12207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    #zamanilaw
## 12208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     #zweifler
## 12209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         +136k
## 12210                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001d439><u+0001d459><u+0001d462><u+0001d456><u+0001d451><u+0001d44e><u+0001d460><u+2063>
## 12211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001d43a><u+0001d452><u+0001d45c>
## 12212                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001d43c><u+0001d45b><u+0001d45a><u+0001d45c><u+0001d44f><u+0001d456><u+0001d459><u+0001d456><u+0001d44e><u+0001d45f><u+0001d456><u+0001d44e><u+0001d460>
## 12213                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001d5d5><u+0001d5f2><u+0001d5f0><u+0001d5ee><u+0001d602><u+0001d600><u+0001d5f2>
## 12214                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001d5da><u+0001d5dc><u+0001d5e9><u+0001d5d8><u+0001d5d4><u+0001d5ea><u+0001d5d4><u+0001d5ec>
## 12215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001d5db><u+0001d5e8><u+0001d5da><u+0001d5d8>
## 12216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001d5ee><u+0001d5ff><u+0001d5f2>
## 12217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001d5f3><u+0001d5fc><u+0001d5ff>
## 12218                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001d5f4><u+0001d5ff><u+0001d5ee><u+0001d601><u+0001d5f2><u+0001d5f3><u+0001d602><u+0001d5f9>
## 12219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001d604><u+0001d5f2>
## 12220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001d606><u+0001d5fc><u+0001d602>
## 12221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f1e8><u+0001f1e6><u+0001f1e8><u+0001f1e6><u+0001f1e8><u+0001f1e6>
## 12222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f1e8><u+0001f1e6><u+0001f64f><u+0001f1fa><u+0001f1f8><u+0001f61c>
## 12223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f1e8><u+0001f1ed>
## 12224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f1e8><u+0001f1ed>er
## 12225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f1e8><u+0001f1fa>
## 12226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f1ed><u+0001f1f9>
## 12227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f1f5><u+0001f1f0>
## 12228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f1f8><u+0001f1ea>
## 12229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f1f8><u+0001f1f8>
## 12230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f1fa><u+0001f1f8><u+2764><u+fe0f><u+0001f1e8><u+0001f1e6>
## 12231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f308>
## 12232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f308><u+0001f308><u+0001f308>
## 12233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f30e>
## 12234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f30e><u+0001f30d><u+0001f30f>
## 12235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f31e><u+0001f3d6><u+0001f3ca><u+200d><u+2642><u+fe0f><u+2600><u+fe0f>
## 12236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f31e><u+0001f415>
## 12237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f327>
## 12238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f331><u+0001f955><u+2764>
## 12239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f338>
## 12240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f343>
## 12241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f353>
## 12242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f37b>
## 12243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f37e><u+0001f637>
## 12244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f381><u+0001f499>
## 12245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f382><u+0001f382>
## 12246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f388>
## 12247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f389>
## 12248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f393>
## 12249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f3a7>
## 12250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f3c6>
## 12251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f3eb>
## 12252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f3ec>
## 12253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 <u+0001f446>canadianukrainian
## 12254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f447>check
## 12255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f449>
## 12256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f449><u+0001f3fd>clerkship
## 12257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f449><u+0001f3fd>preclerkship
## 12258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f449><u+0001f3fd>student
## 12259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+0001f449><u+0001f3fd>ume
## 12260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f449>httpstcobtchr4x7ql
## 12261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f44b>
## 12262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f44d><u+0001f3fb>
## 12263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f44d><u+0001f3fb><u+0001f600>
## 12264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f44e><u+0001f3fb>
## 12265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f44e><u+0001f3fb>down
## 12266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f44f><u+0001f3fb>
## 12267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f44f><u+0001f44f>
## 12268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f479><u+0001f92e><u+0001f402><u+0001f4a9>
## 12269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f47a><u+0001f925>
## 12270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f486><u+200d><u+2640><u+fe0f>
## 12271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f48b>and
## 12272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f48c><u+0001f609>
## 12273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f48d>michaels
## 12274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f494><u+0001f494>
## 12275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f494><u+26be><u+fe0f>
## 12276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f496>
## 12277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f499>
## 12278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f49a>
## 12279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f49a><u+0001f49b><u+0001f499><u+2764><u+fe0f>
## 12280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f4a1>
## 12281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f4a5>yute
## 12282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f4af>
## 12283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f4bb>
## 12284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f4c8>
## 12285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f4cd>912
## 12286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f4e2>
## 12287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               <u+0001f4e3>are
## 12288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f4f2>
## 12289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f4f7>
## 12290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f4f8>photosfetish
## 12291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f517>
## 12292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f53d>
## 12293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f596><u+2764><u+fe0f><u+0001f1e8><u+0001f1e6>
## 12294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f5a4><u+0001f5a4><u+0001f5a4>
## 12295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f5fa>
## 12296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f600><u+0001f44d>
## 12297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f601>
## 12298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f602><u+0001f602>
## 12299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+0001f602>covid19
## 12300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f603>
## 12301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f606>
## 12302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f609><u+0001f44d><u+0001f3fd>
## 12303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f60a><u+0001f447>
## 12304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f60d>
## 12305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f60e>
## 12306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f612>
## 12307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f614>
## 12308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f616>
## 12309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f61c>
## 12310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f61f>
## 12311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f620>
## 12312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f621>almost
## 12313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f622>
## 12314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f622><u+0001f3e5><u+0001f621>
## 12315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f624>
## 12316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f62c>
## 12317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f62d><u+0001f62d><u+0001f62d>
## 12318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f62d><u+0001f970>
## 12319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f630>
## 12320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f631>
## 12321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f633>
## 12322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+0001f633>ldnont
## 12323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f637><u+0001f914>
## 12324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f640>
## 12325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f643>
## 12326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     <u+0001f644><u+0001f644>i
## 12327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f64c><u+0001f3fb>
## 12328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f64f>
## 12329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f64f><u+0001f3fb>
## 12330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f64f><u+0001f3fb><u+0001f603>
## 12331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f64f><u+0001f499>
## 12332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f680>
## 12333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    <u+0001f680><u+0001f4a3>ai
## 12334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f687><u+0001f68e><u+0001f689><u+0001f68d>
## 12335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f68d>
## 12336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f691>
## 12337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f692><u+2764><u+fe0f>
## 12338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f6a6>
## 12339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f6a8><u+0001f6a8><u+0001f6a8>
## 12340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f6ab>
## 12341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f6ab>2m
## 12342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           <u+0001f6d1>clients
## 12343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f6d2>
## 12344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f6e3>
## 12345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f90d>
## 12346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f917>
## 12347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f918><u+0001f3fb>
## 12348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f918><u+0001f3fb><u+0001f497>
## 12349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f91e><u+26be><u+fe0f><u+2600><u+fe0f><u+0001f334>galveston
## 12350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f920><u+0001f912>
## 12351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f926><u+0001f3fb><u+200d><u+2640><u+fe0f>
## 12352                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f926><u+0001f3fd><u+200d><u+2642><u+fe0f><u+2b50><u+2b50><u+2b50><u+2b50><u+2b50><u+2b50>
## 12353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f926><u+200d><u+2640><u+fe0f>
## 12354                                                                                                                                                                                                                                                                                                                          <u+0001f926><u+200d><u+2640><u+fe0f><u+0001f926><u+200d><u+2640><u+fe0f><u+0001f926><u+200d><u+2640><u+fe0f><u+0001f621><u+0001f621><u+0001f621><u+0001f621><u+0001f621><u+0001f621><u+0001f621><u+0001f621><u+0001f621><u+0001f621>
## 12355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f928>
## 12356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f929>
## 12357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f92c>httpstcoh3jze1cklc
## 12358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f92d>
## 12359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f937><u+0001f3fd><u+200d><u+2642><u+fe0f>
## 12360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f942>
## 12361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f94c>
## 12362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0001f973><u+0001f4a8><u+0001f4a8><u+0001f4a8>
## 12363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f973><u+0001f973>
## 12364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f973><u+0001f973><u+0001f973>
## 12365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f974>
## 12366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f976>
## 12367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f97a>
## 12368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             <u+0001f987>gives
## 12369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f9a0><u+0001f629>
## 12370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+0001f9a0>is
## 12371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f9a0>transmission
## 12372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+0001f9d0><u+0001f92a><u+0001f602>
## 12373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0001f9d8><u+0001f3fb><u+200d><u+2640><u+fe0f><u+0001f33f><u+0001f33a>
## 12374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f9e4>
## 12375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+0001f9ed><u+0001f9ed><u+0001f9ed><u+0001f9ed><u+0001f9ed>
## 12376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0622><u+0644><u+0628><u+0631><u+062a><u+0627>
## 12377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0627><u+0645><u+0631><u+0648><u+0632>
## 12378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+062c><u+062f><u+06cc><u+062f>
## 12379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+062c><u+0648><u+0646>
## 12380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+062f><u+0631>
## 12381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+0641><u+0642><u+0637>
## 12382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+0645><u+0648><u+0631><u+062f>
## 12383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+06a9><u+0631><u+0648><u+0646><u+0627>
## 12384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+06f2><u+06f0><u+06f2><u+06f0>
## 12385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+06f5>
## 12386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+06f7>
## 12387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  <u+2066>globalnewsto<u+2069>
## 12388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   <u+2066>pointedward<u+2069>
## 12389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+2193>
## 12390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+2611><u+fe0f>
## 12391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+2620><u+0001f480><u+0001f4a9>
## 12392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+2639>
## 12393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+2666><u+fe0f>
## 12394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+267f><u+fe0f>
## 12395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+2696><u+fe0f>
## 12396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+26bd>
## 12397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+26bd><u+fe0f><u+0001f1e8><u+0001f1e6>
## 12398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+26be>
## 12399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+26be><u+0001f4aa><u+0001f44d>
## 12400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+26d4><u+fe0f>
## 12401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+2702><u+fe0f>
## 12402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                <u+2705>justin
## 12403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+2708>
## 12404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+270a><u+0001f3fe>
## 12405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+270c><u+fe0f>
## 12406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+2728>
## 12407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+2728><u+2728>
## 12408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+2728>lashbossto
## 12409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          <u+2764><u+fe0f>love
## 12410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         <u+2764><u+fe0f>nicks
## 12411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            <u+27a1><u+fe0f>httpstcoddbgyturto
## 12412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              <u+2935><u+fe0f>
## 12413                                                                                                                                                                                                                                                                                                                                                                                                                                                      <u+2b07><u+fe0f><u+0001f943><u+0001f377><u+0001f37a><u+0001f378><u+0001f389><u+0001f943><u+2b07><u+fe0f>
## 12414                                                                                                                                                                                                                                                                                                                                                                             <u+4ece><u+90a3><u+4e2a><u+8001><u+5934><u+7684><u+8ba4><u+8bc6><u+548c><u+53cd><u+5e94><u+6765><u+770b><u+4ed6><u+5341><u+4e4b><u+516b><u+4e5d><u+4f1a><u+51fa><u+95e8><u+7684>�
## 12415 <u+9694><u+58c1><u+7684><u+9694><u+58c1><u+533b><u+751f><u+5faa><u+5faa><u+5584><u+8bf1><u+5bf9><u+4e00><u+4e2a><u+8001><u+5934><u+8bf4><u+4f60><u+6700><u+8fd1><u+6ca1><u+542c><u+65b0><u+95fb><u+4e48><u+ff1f><u+4f60><u+53ef><u+80fd><u+5f97><u+4e86>covid19<u+3002><u+5bf9><u+4f60><u+4e0d><u+80fd><u+51fa><u+95e8><u+3002><u+5bf9><u+4f60><u+4e0d><u+80fd><u+642d><u+516c><u+4ea4><u+8f66><u+800c><u+4e14><u+73b0><u+5728><u+4e5f><u+6ca1><u+6709><u+516c><u+4ea4><u+8f66><u+4e86><u+51cc><u+6668><u+4e24><u+70b9><u+4e86><u+3002><u+5bf9><u+5728>public
## 12416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ~930am
## 12417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ~austrailian
## 12418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          $10k
## 12419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          $10z
## 12420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         $150m
## 12421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         $166m
## 12422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       $25hour
## 12423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          $2hr
## 12424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          $40k
## 12425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          $65m
## 12426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          $88m
## 12427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     $billions
## 12428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         $pmed
## 12429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        $pmedf
## 12430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        $tcnnf
## 12431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         $trul
## 12432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       $trulwt
## 12433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           0<u+fe0f><u+20e3>7<u+fe0f><u+20e3>3<u+fe0f><u+20e3>
## 12434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           0<u+fe0f><u+20e3>7<u+fe0f><u+20e3>4<u+fe0f><u+20e3>
## 12435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           0<u+fe0f><u+20e3>8<u+fe0f><u+20e3>4<u+fe0f><u+20e3>
## 12436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           0<u+fe0f><u+20e3>8<u+fe0f><u+20e3>7<u+fe0f><u+20e3>
## 12437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           0<u+fe0f><u+20e3>9<u+fe0f><u+20e3>0<u+fe0f><u+20e3>
## 12438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  000customers
## 12439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    0234listen
## 12440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           1<u+fe0f><u+20e3>0<u+fe0f><u+20e3>0<u+fe0f><u+20e3>
## 12441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           1<u+fe0f><u+20e3>0<u+fe0f><u+20e3>2<u+fe0f><u+20e3>
## 12442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           1<u+fe0f><u+20e3>0<u+fe0f><u+20e3>5<u+fe0f><u+20e3>
## 12443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           1<u+fe0f><u+20e3>3<u+fe0f><u+20e3>2<u+fe0f><u+20e3>
## 12444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           1<u+fe0f><u+20e3>9<u+fe0f><u+20e3>2<u+fe0f><u+20e3>
## 12445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              100400pm<u+0001f64c><u+0001f3fb>
## 12446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         100th
## 12447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    103yearold
## 12448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  1059newsroom
## 12449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    107million
## 12450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         10am�
## 12451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           10s
## 12452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         112th
## 12453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        1159pm
## 12454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          11pm
## 12455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         11uni
## 12456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        1230pm
## 12457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         123rf
## 12458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        1244pm
## 12459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     124street
## 12460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         125pm
## 12461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       128�kwh
## 12462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           12m
## 12463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          12pm
## 12464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      133�last
## 12465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          13th
## 12466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         140am
## 12467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        147�in
## 12468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     14yearold
## 12469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    150gonayiv
## 12470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          15gy
## 12471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   1651covid19
## 12472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         16x20
## 12473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           17h
## 12474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         17h00
## 12475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          17th
## 12476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 180kwad�bouk�
## 12477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          18th
## 12478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      18�pause
## 12479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       19hacen
## 12480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           1er
## 12481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         1mile
## 12482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           1nt
## 12483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      1ntnerds
## 12484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      1yearold
## 12485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         200mm
## 12486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         2020s
## 12487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        20fold
## 12488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          20�s
## 12489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          21st
## 12490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    22<u+2728>
## 12491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 223kwad�bouk�
## 12492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     229senmak
## 12493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       233kfou
## 12494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 241kwad�bouk�
## 12495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 249kwad�bouk�
## 12496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          24hr
## 12497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 254kwad�bouk�
## 12498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         260g$
## 12499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          26th
## 12500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     26yearold
## 12501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        27�mai
## 12502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          28th
## 12503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       296kfou
## 12504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           29i
## 12505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          2day
## 12506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           2k+
## 12507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            2m
## 12508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           2pm
## 12509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         2they
## 12510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     300+deadhealthcareworkers
## 12511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          300k
## 12512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         30day
## 12513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         30s1m
## 12514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        30year
## 12515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          31st
## 12516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     31yearold
## 12517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   321magazine
## 12518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       344kfou
## 12519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       352kfou
## 12520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           37m
## 12521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          38th
## 12522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   3danimation
## 12523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           3pm
## 12524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       400acre
## 12525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       400kfou
## 12526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          400s
## 12527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           40m
## 12528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   40something
## 12529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       413taba
## 12530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          420m
## 12531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      45minute
## 12532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       462taba
## 12533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    46increase
## 12534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        47okap
## 12535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       497taba
## 12536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         4this
## 12537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            4x
## 12538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  502petyonvil
## 12539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           50k
## 12540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                50shadesofgrey
## 12541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       512taba
## 12542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     51yearold
## 12543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       522taba
## 12544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         530pm
## 12545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      5yearold
## 12546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          60s�
## 12547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       613cats
## 12548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         620am
## 12549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               63okapsitesol�y
## 12550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  673petyonvil
## 12551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      69mibal�
## 12552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           6ft
## 12553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           6ix
## 12554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        6pm8pm
## 12555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           70s
## 12556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  729petyonvil
## 12557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  745petyonvil
## 12558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  770petyonvil
## 12559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          7jun
## 12560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          7yrs
## 12561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         800am
## 12562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     80yearold
## 12563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         830am
## 12564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     84yearold
## 12565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          85yr
## 12566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               876ixfreshikon�
## 12567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     89yearold
## 12568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          90�s
## 12569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        931pm�
## 12570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      94mibal�
## 12571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     94yearold
## 12572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       94yrold
## 12573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        9am9pm
## 12574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           9pm
## 12575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      a2020015
## 12576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aap
## 12577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aaronwolfcreekgolfcom
## 12578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     abandoned
## 12579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aber
## 12580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       abiding
## 12581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aborde
## 12582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    aboriginal
## 12583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 aboriginalled
## 12584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         abrir
## 12585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      absolute
## 12586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      abubakar
## 12587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        abused
## 12588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       abysmal
## 12589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ac
## 12590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aca
## 12591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      academia
## 12592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     academy�s
## 12593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   accelerates
## 12594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  acceleration
## 12595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    acceptance
## 12596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      accident
## 12597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                accommodations
## 12598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  accompanying
## 12599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        accord
## 12600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   accumulated
## 12601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     accuracy�
## 12602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      acc�l�re
## 12603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       achev�e
## 12604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      achilles
## 12605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          acid
## 12606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  acknowledged
## 12607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aconsej�
## 12608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     acordamos
## 12609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     acquiring
## 12610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        actifs
## 12611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        acting
## 12612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         actitiviesrestaurants
## 12613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      activate
## 12614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      activism
## 12615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        activ�
## 12616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      actuelle
## 12617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  actuellement
## 12618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         acute
## 12619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adapter
## 12620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     addresses
## 12621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       addthis
## 12622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adherence
## 12623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      adhering
## 12624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        adh�re
## 12625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        adjust
## 12626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    adjustment
## 12627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          adjustmentschildcare
## 12628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         admin
## 12629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              administration�s
## 12630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                administrative
## 12631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        admire
## 12632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       admirez
## 12633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     admitted�
## 12634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ado
## 12635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    adolescent
## 12636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   adolescents
## 12637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        adolfo
## 12638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adopt
## 12639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adoptadas
## 12640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adoptar
## 12641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adore
## 12642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      adquirir
## 12643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      adress�e
## 12644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adriandix
## 12645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ads
## 12646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           adt
## 12647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         adult
## 12648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      adultery
## 12649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    advantages
## 12650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    advantage�
## 12651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     adventure
## 12652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                advertisement�
## 12653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   advertising
## 12654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       advices
## 12655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       advice�
## 12656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       advised
## 12657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       adviser
## 12658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       advises
## 12659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    advisories
## 12660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      advisors
## 12661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      advocate
## 12662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    aeropuerto
## 12663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aerosols
## 12664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      affaibli
## 12665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        affair
## 12666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       affaire
## 12667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       affairs
## 12668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       affecte
## 12669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     affidavit
## 12670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    affiliated
## 12671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     affirmait
## 12672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       affirm�
## 12673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     afflicted
## 12674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     affluence
## 12675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        afghan
## 12676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   afghanistan
## 12677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           afn
## 12678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       africas
## 12679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                afroam�ricains
## 12680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     aftermath
## 12681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  afterschool�
## 12682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ag
## 12683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  againcovid19
## 12684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      against�
## 12685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        again�
## 12686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        agence
## 12687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ages
## 12688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          age�
## 12689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  aggressively
## 12690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aggv
## 12691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       agility
## 12692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     agitation
## 12693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     agonizing
## 12694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ago�
## 12695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      agreeing
## 12696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    agreements
## 12697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  agreementshttpstcooscxcsww7o
## 12698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   agriculture
## 12699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    aguantando
## 12700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ahhh
## 12701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ahmed
## 12702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ahuntsic
## 12703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aidan
## 12704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   aidanpineriverfoundationcom
## 12705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aider
## 12706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aiding
## 12707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aids
## 12708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aiguided
## 12709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aiims
## 12710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ailleurs
## 12711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aims
## 12712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ain�t
## 12713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      airborne
## 12714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   aislamiento
## 12715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ait
## 12716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ajax
## 12717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ajoutait
## 12718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          akin
## 12719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aksepte
## 12720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       aktif44
## 12721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     akturning
## 12722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       alarmed
## 12723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alarming
## 12724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       albatcp
## 12725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        albert
## 12726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    alcanzar�n
## 12727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alek
## 12728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    aleksandra
## 12729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alexander
## 12730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alexis
## 12731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       alguien
## 12732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   alhamdoliah
## 12733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alhamzah
## 12734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alicia
## 12735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aliens
## 12736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         align
## 12737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alimentos
## 12738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 alisonbrenzel
## 12739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         allah
## 12740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         allan
## 12741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      allcause
## 12742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    allegiance
## 12743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     allemande
## 12744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       allergy
## 12745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       allied�
## 12746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    allireland
## 12747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     allocated
## 12748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        allons
## 12749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        allow�
## 12750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    alltoorare
## 12751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       all�ger
## 12752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alongside
## 12753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  alourdissant
## 12754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alpha
## 12755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      alphabet
## 12756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       alreday
## 12757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alrededor
## 12758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         also�
## 12759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      altering
## 12760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     alternate
## 12761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   alternative
## 12762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alto
## 12763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    altogether
## 12764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         altus
## 12765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          alum
## 12766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        alumni
## 12767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       alvarez
## 12768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         alway
## 12769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        amanda
## 12770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amass�s
## 12771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       amateur
## 12772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        amazed
## 12773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     amazingly
## 12774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ambiciones
## 12775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ambulance
## 12776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ameen
## 12777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          amen
## 12778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         amina
## 12779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          amir
## 12780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          amis
## 12781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          amor
## 12782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     amounting
## 12783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     amplified
## 12784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     amplifier
## 12785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           amy
## 12786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    am�ricains
## 12787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   anachronism
## 12788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      analysed
## 12789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      analysis
## 12790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       analyst
## 12791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     analytics
## 12792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       analyze
## 12793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anantnag
## 12794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       anarchy
## 12795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          anda
## 12796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        anders
## 12797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     andragogy
## 12798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        andrea
## 12799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  andregyalist
## 12800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     androgens
## 12801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anecdotal
## 12802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        anemic
## 12803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         angel
## 12804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        angles
## 12805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      anglican
## 12806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        animal
## 12807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      animated
## 12808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anitblack
## 12809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  announcement<u+2757><u+fe0f>
## 12810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 announcements
## 12811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    announcing
## 12812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      annoying
## 12813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    annulation
## 12814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        annul�
## 12815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ann�e<u+0001f609>
## 12816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        anonse
## 12817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   anonymis�es
## 12818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     answering
## 12819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ant
## 12820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    antibodies
## 12821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   anticipated
## 12822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    anticipent
## 12823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     anticorps
## 12824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   anticovid19
## 12825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            antidiscrimination
## 12826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  antiepidemic
## 12827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        antifa
## 12828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  antilockdown
## 12829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            antistigmatization
## 12830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      antitnfs
## 12831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     antitrump
## 12832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     antiviral
## 12833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         anti�
## 12834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       antoniv
## 12835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ants
## 12836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         antwi
## 12837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           an�
## 12838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     an�terior
## 12839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aoife
## 12840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aotearoa
## 12841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        apakah
## 12842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       apalear
## 12843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aparte
## 12844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    apartments
## 12845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           api
## 12846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     apologize
## 12847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    apologizes
## 12848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        apoyar
## 12849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      appara�t
## 12850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       apparue
## 12851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        appeal
## 12852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      appealed
## 12853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       appeals
## 12854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    appearance
## 12855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       applaud
## 12856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      applause
## 12857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 applicability
## 12858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   applicables
## 12859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    applicants
## 12860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      applies�
## 12861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   appreciable
## 12862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   appreciated
## 12863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  appreciative
## 12864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      apprenne
## 12865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 apprentissage
## 12866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   approaching
## 12867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      approche
## 12868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 appropriately
## 12869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      approval
## 12870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       approve
## 12871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        appuy�
## 12872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         app�d
## 12873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ar
## 12874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arabias
## 12875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arasinda
## 12876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arbeit
## 12877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   arbitration
## 12878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    archbishop
## 12879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       archive
## 12880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ardern
## 12881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        argued
## 12882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arise
## 12883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arisen
## 12884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arizona
## 12885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 armamentarium
## 12886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         armed
## 12887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         arm�s
## 12888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aroni
## 12889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arrache
## 12890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arrange
## 12891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  arrangements
## 12892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arrangent
## 12893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         array
## 12894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arrests
## 12895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      arrivals
## 12896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arrives
## 12897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arrows
## 12898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        arr�t�
## 12899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       arsalan
## 12900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     arsenault
## 12901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      artistry
## 12902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          arts
## 12903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      asamblea
## 12904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ash
## 12905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ashamed
## 12906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         asian
## 12907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        asked�
## 12908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         asker
## 12909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     asociados
## 12910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      asosiasi
## 12911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     asparagus
## 12912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        assams
## 12913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     assaulted
## 12914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      assemble
## 12915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     assemblys
## 12916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         asses
## 12917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      assessed
## 12918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       asshole
## 12919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     assistant
## 12920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        assume
## 12921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        assure
## 12922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       assurer
## 12923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        asthma
## 12924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  astronomical
## 12925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  asymptomatic
## 12926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               asymptomatiques
## 12927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                asynchronously
## 12928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           as�
## 12929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           atb
## 12930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      atheists
## 12931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      athletic
## 12932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    atholville
## 12933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          atil
## 12934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       atlarge
## 12935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       atorado
## 12936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       atreven
## 12937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        attack
## 12938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       attaran
## 12939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     atteindre
## 12940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     atteintes
## 12941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      atteints
## 12942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attempting
## 12943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attendance
## 12944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     attendant
## 12945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     attendees
## 12946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      attendez
## 12947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      attorney
## 12948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       attract
## 12949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attracting
## 12950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       attrap�
## 12951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    attributed
## 12952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   atualizados
## 12953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         at�httpstcom2irsljokk
## 12954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     aubrechts
## 12955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    aucklander
## 12956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       auction
## 12957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aucun
## 12958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        aucune
## 12959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      audacity
## 12960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          audi
## 12961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      audience
## 12962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         audio
## 12963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   audiovisual
## 12964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         audit
## 12965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aug
## 12966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  augmentation
## 12967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     augmenter
## 12968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      augment�
## 12969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  augustnlpoli
## 12970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           aun
## 12971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        auquel
## 12972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        auront
## 12973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     auschwitz
## 12974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      austeros
## 12975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   authorities
## 12976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          auto
## 12977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     automne��
## 12978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       autopsy
## 12979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   autoridades
## 12980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      autoris�
## 12981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   autoritaire
## 12982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     autoroute
## 12983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  autrociously
## 12984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      auxquels
## 12985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       avaient
## 12986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        avance
## 12987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      avancent
## 12988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     avantages
## 12989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        avenir
## 12990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      averaged
## 12991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      average�
## 12992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       averted
## 12993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   avertissent
## 12994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         aveux
## 12995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      aviation
## 12996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     avoidable
## 12997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      avoiding
## 12998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     avoisiner
## 12999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         avons
## 13000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         avril
## 13001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         await
## 13002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       awaited
## 13003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        awayhe
## 13004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          awed
## 13005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         awful
## 13006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          axel
## 13007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ayer
## 13008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ayisyen
## 13009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          aziz
## 13010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           a�n
## 13011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         a�reo
## 13012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        a�rien
## 13013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ba
## 13014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        babosa
## 13015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        baby�s
## 13016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  back<u+2728>
## 13017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     backfired
## 13018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bacteria
## 13019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        badass
## 13020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       baddest
## 13021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      badinait
## 13022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bafou�es
## 13023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bag
## 13024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bags
## 13025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bahwa
## 13026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bail
## 13027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bain
## 13028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        baisse
## 13029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       baisser
## 13030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         baker
## 13031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bakery
## 13032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bakit
## 13033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        balade
## 13034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       balance
## 13035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      balayage
## 13036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       balcons
## 13037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       baldwin
## 13038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         balmy
## 13039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bandcamp
## 13040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         banff
## 13041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bankingloan
## 13042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  bankruptcies
## 13043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        banned
## 13044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        banner
## 13045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       banners
## 13046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        banque
## 13047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bapat�
## 13048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       baptis�
## 13049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     barbados�
## 13050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       barbers
## 13051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   barbershops
## 13052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     barbicide
## 13053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      baristas
## 13054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       barnett
## 13055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        barred
## 13056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       barrera
## 13057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        barrie
## 13058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      barrie�s
## 13059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bas
## 13060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    baseball�s
## 13061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      baseline
## 13062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      basement
## 13063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bash
## 13064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     basically
## 13065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        basis�
## 13066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        basket
## 13067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    basketball
## 13068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               bassaintlaurent
## 13069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bastard
## 13070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bataille
## 13071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bateau
## 13072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bats
## 13073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       battles
## 13074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bauchi
## 13075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                bbchaveyoursay
## 13076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bcoz
## 13077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bcp
## 13078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bcsalumni
## 13079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       beaches
## 13080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bears
## 13081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       beating
## 13082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          beau
## 13083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        beauce
## 13084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   beautifully
## 13085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    becausewhy
## 13086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bed
## 13087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bedroom
## 13088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          beef
## 13089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         been�
## 13090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bees
## 13091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       begging
## 13092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        behalf
## 13093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      behavior
## 13094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    behavioral
## 13095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     behaviour
## 13096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      beijings
## 13097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  beispiellose
## 13098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       belated
## 13099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             belfastliveonline
## 13100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      belfast�
## 13101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       belgian
## 13102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        belief
## 13103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      believed
## 13104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      believes
## 13105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         belle
## 13106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       beloved
## 13107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     benchmark
## 13108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    benchmarks
## 13109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bendavid
## 13110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bendito
## 13111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    beneficial
## 13112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 beneficiaries
## 13113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    benefitted
## 13114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      benefit�
## 13115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          benz
## 13116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bercovici
## 13117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       berries
## 13118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       beshear
## 13119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bestworst
## 13120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       better�
## 13121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      better��
## 13122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      between�
## 13123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           be�
## 13124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bffs
## 13125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bharat
## 13126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bicycle
## 13127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        biddle
## 13128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bids
## 13129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bienaim�
## 13130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bienestar
## 13131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bigoted
## 13132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        biking
## 13133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  billionaires
## 13134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bills
## 13135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       biobank
## 13136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               biostatistician
## 13137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bipartisan
## 13138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    birchmount
## 13139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bird
## 13140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         birth
## 13141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          birx
## 13142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bitterman
## 13143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bitters
## 13144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bk
## 13145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blackout
## 13146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    blackowned
## 13147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         blais
## 13148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blaming
## 13149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   blanchfield
## 13150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bless
## 13151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blessed
## 13152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blewett
## 13153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       blindly
## 13154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         blink
## 13155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         block
## 13156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        blocks
## 13157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          blog<u+2728><u+2728>
## 13158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blogging
## 13159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           blood<u+0001fa78>at
## 13160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bloody
## 13161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blooming
## 13162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bloordale
## 13163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      blossoms
## 13164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         blown
## 13165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bls
## 13166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bl�mer
## 13167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bmc
## 13168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bo1
## 13169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       boarded
## 13170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          boat
## 13171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bogoch
## 13172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bollywood
## 13173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bolsonaro
## 13174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bolsonaros
## 13175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bolted
## 13176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bombardment
## 13177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    bongaigaon
## 13178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bonjour
## 13179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       booklet
## 13180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          boom
## 13181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       booming
## 13182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boris
## 13183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bosses
## 13184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bosss
## 13185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        boston
## 13186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       botched
## 13187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bothered
## 13188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bots
## 13189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bottomed
## 13190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bounce
## 13191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bounds
## 13192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bourke
## 13193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boute
## 13194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bowie
## 13195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         boxes
## 13196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           boy
## 13197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bozo
## 13198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            bp
## 13199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        braced
## 13200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      braganza
## 13201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         brain
## 13202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brainpower
## 13203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      bramalea
## 13204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brampton�s
## 13205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        branch
## 13206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       branded
## 13207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      branding
## 13208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brandon
## 13209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         brant
## 13210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brantfords
## 13211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  brantnorfolk
## 13212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brasil
## 13213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         brass
## 13214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         braun
## 13215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       braveen
## 13216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      breaches
## 13217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bread
## 13218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     breakfast
## 13219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       breakin
## 13220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     breaking�
## 13221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        breaks
## 13222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        breath
## 13223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brehaut
## 13224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       breslin
## 13225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         brian
## 13226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         briar
## 13227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bridgepoint
## 13228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bridgette
## 13229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       briefly
## 13230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bright
## 13231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brigitte
## 13232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brindar
## 13233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      britain�
## 13234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      british�
## 13235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     broadbent
## 13236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       broader
## 13237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bronson
## 13238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       brother
## 13239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brownley
## 13240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   bruccoleris
## 13241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      brunello
## 13242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brunswicks
## 13243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brunswick�
## 13244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         brush
## 13245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        brutal
## 13246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   brutalement
## 13247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brutalidad
## 13248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     brutalist
## 13249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     brutalit�
## 13250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    brutalit�s
## 13251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bryden
## 13252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bryst
## 13253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           btw
## 13254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          buck
## 13255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        buddha
## 13256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        buddy�
## 13257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   budg�taires
## 13258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bueno
## 13259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       buffalo
## 13260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       buffets
## 13261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bugs
## 13262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      builders
## 13263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     buildings
## 13264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bullet
## 13265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bully
## 13266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         bumps
## 13267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     bunkerina
## 13268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        buoyed
## 13269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         buoys
## 13270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        burden
## 13271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bureau
## 13272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                bureaucratique
## 13273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        burger
## 13274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        burial
## 13275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       burials
## 13276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    burlington
## 13277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          burn
## 13278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              burner�advocates
## 13279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       burning
## 13280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       burnout
## 13281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         burns
## 13282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       bursary
## 13283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       burundi
## 13284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           bus
## 13285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         busca
## 13286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bush
## 13287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       busiest
## 13288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             businessasvirtual
## 13289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     business�
## 13290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bust
## 13291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          bus�
## 13292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          butt
## 13293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  butteralmond
## 13294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      butthere
## 13295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       buttons
## 13296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       but�you
## 13297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           buy
## 13298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         buyer
## 13299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        bypass
## 13300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        byward
## 13301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           by�
## 13302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ca
## 13303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cab
## 13304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cabal
## 13305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cabin
## 13306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cada
## 13307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cadets
## 13308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cadre
## 13309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      caffeine
## 13310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       caitlyn
## 13311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    calculates
## 13312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    calendrier
## 13313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      caliente
## 13314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    california
## 13315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       callers
## 13316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      calltext
## 13317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       calming
## 13318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        calmly
## 13319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cambridge
## 13320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cameras
## 13321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    camouflage
## 13322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     campaigns
## 13323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      campbell
## 13324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        campbelltonrestigouche
## 13325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       campers
## 13326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      campers�
## 13327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     campfires
## 13328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   campgrounds
## 13329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       camping
## 13330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    campobello
## 13331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        campto
## 13332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       campus�
## 13333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  canadakatana
## 13334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      canadaus
## 13335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       canada�
## 13336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    canada��httpstcorllszapei9
## 13337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   canadiennes
## 13338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    canadiense
## 13339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         canal
## 13340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   cancelation
## 13341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      canceled
## 13342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cancre
## 13343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cancun
## 13344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       candice
## 13345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     candidats
## 13346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                candlelighters
## 13347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        canelo
## 13348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        canine
## 13349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       canmore
## 13350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cannabis
## 13351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cano
## 13352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cansados
## 13353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       canyons
## 13354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cao
## 13355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cap
## 13356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      capacit�
## 13357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       capital
## 13358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   capitalcare
## 13359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    capitalism
## 13360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       caption
## 13361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      caption�
## 13362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       capture
## 13363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      captured
## 13364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      captures
## 13365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     capturing
## 13366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cara
## 13367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       caravan
## 13368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      caravana
## 13369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cara�bes
## 13370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cardiac
## 13371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       careers
## 13372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     carefully
## 13373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                careretirement
## 13374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cares
## 13375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     carespade
## 13376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        caring
## 13377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      carnaval
## 13378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       carried
## 13379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       carroll
## 13380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       carrots
## 13381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cars
## 13382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cart
## 13383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cartes
## 13384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  cartographic
## 13385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         carts
## 13386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      caseload
## 13387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        casino
## 13388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          caso
## 13389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         casos
## 13390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cassidy
## 13391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        castle
## 13392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   catagorized
## 13393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      catalyst
## 13394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  catastrophes
## 13395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  catastrophic
## 13396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      catching
## 13397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      category
## 13398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     caterings
## 13399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cath
## 13400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 cathaoirleach
## 13401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     catharine
## 13402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cattle
## 13403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          caus
## 13404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       causada
## 13405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         caus�
## 13406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      caution�
## 13407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cautious
## 13408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       caveats
## 13409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cbcs
## 13410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cci
## 13411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ccpour
## 13412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ccrc
## 13413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cdio
## 13414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cdn
## 13415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cdns
## 13416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cdo
## 13417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cea
## 13418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ceap
## 13419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ceases
## 13420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ceci
## 13421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cedarval
## 13422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       celebra
## 13423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    celebrates
## 13424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   celebration
## 13425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         celle
## 13426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cema
## 13427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cemetery
## 13428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    censorship
## 13429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       centers
## 13430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   centralized
## 13431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      centres�
## 13432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    centretown
## 13433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ceremonies
## 13434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cerim�nias
## 13435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  certificates
## 13436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 certification
## 13437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cesarean
## 13438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cesb
## 13439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cess�
## 13440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cet
## 13441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chacun
## 13442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    challenged
## 13443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    chambersso
## 13444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chambre
## 13445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 championships
## 13446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       changer
## 13447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    changeront
## 13448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      channels
## 13449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chanter
## 13450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chaque
## 13451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      charging
## 13452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      charming
## 13453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       charted
## 13454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        charts
## 13455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chartwell
## 13456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chasing
## 13457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             chavistamadurista
## 13458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           chavistasmaduristas
## 13459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cha�nes
## 13460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cheaper
## 13461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cheat
## 13462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cheating
## 13463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       checkin
## 13464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     checklist
## 13465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         checkmypostlikefollow
## 13466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      checkout
## 13467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cheers
## 13468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chef
## 13469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cheltenham
## 13470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cheques
## 13471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cher
## 13472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cherry
## 13473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cheryl
## 13474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chester
## 13475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chew
## 13476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chewing
## 13477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   chicheemaun
## 13478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chic�
## 13479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chiefs
## 13480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        chief�
## 13481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chiffres
## 13482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        childs
## 13483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chili
## 13484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chinas�
## 13485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       china�s
## 13486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               chinesecanadian
## 13487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chinoise
## 13488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chinoises
## 13489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chippewas
## 13490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       choices
## 13491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       choking
## 13492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chol�ra
## 13493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          chop
## 13494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        choses
## 13495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     christian
## 13496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      christie
## 13497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   christopher
## 13498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       chronic
## 13499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   chronicling
## 13500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chrystia
## 13501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      chubbier
## 13502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     chumpster
## 13503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         chung
## 13504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   churchgoers
## 13505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      churchwe
## 13506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ch�mage
## 13507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cia
## 13508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ciclo
## 13509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cider
## 13510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ciel<u+0001f64f>
## 13511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cigarette
## 13512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  cinquefrondi
## 13513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cin�parcs
## 13514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         circa
## 13515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       circle�
## 13516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        citing
## 13517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     citoyenes
## 13518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    citybycity
## 13519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               citymississauga
## 13520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cityrun
## 13521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         city�
## 13522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        city�s
## 13523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ciudadanos
## 13524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ciussscomtl
## 13525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         civil
## 13526                                                                                                                                                                                                                                                                                                                                                                                                                                                                            civilians<u+0001f649><u+0001f649><u+0001f649><u+0001f62c><u+0001f62c>theresutwould
## 13527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        civils
## 13528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ck
## 13529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       claimed
## 13530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      claimed�
## 13531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        claire
## 13532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     clamoring
## 13533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          clan
## 13534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      clapping
## 13535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         clare
## 13536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       clarens
## 13537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                classification
## 13538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    classified
## 13539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      classify
## 13540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    classrooms
## 13541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cleans
## 13542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cleared
## 13543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        client
## 13544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cliff
## 13545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         climb
## 13546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       climbed
## 13547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        climb�
## 13548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       clinic�
## 13549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          clip
## 13550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       closely
## 13551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        closes
## 13552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       closest
## 13553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cloth
## 13554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cloud
## 13555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          clue
## 13556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     clustered
## 13557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         clyne
## 13558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cl�ment
## 13559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cm4620
## 13560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cma
## 13561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         coade
## 13562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coastal
## 13563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    coauthored
## 13564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cochrane
## 13565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cocoa
## 13566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cocoon
## 13567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          code
## 13568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         codes
## 13569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         coeur
## 13570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cognizance
## 13571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cohort
## 13572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      coiffeur
## 13573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   coincidence
## 13574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        coinc�
## 13575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        coitus
## 13576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cojen
## 13577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       colbert
## 13578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         colby
## 13579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     collapsed
## 13580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     collation
## 13581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       collect
## 13582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  collectively
## 13583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      collect�
## 13584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      colledge
## 13585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   colloquisms
## 13586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coll�ge
## 13587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      colombie
## 13588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         color
## 13589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     colorless
## 13590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        colour
## 13591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        column
## 13592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        col�re
## 13593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     combattre
## 13594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   combination
## 13595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      combined
## 13596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         comer
## 13597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      comercio
## 13598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     comfirmed
## 13599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   comfortable
## 13600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        comigo
## 13601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      commence
## 13602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  commencement
## 13603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      commends
## 13604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   commentator
## 13605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      commerce
## 13606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                commercialized
## 13607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    commission
## 13608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  commissioner
## 13609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   commitments
## 13610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     committed
## 13611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       commons
## 13612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   communaut�s
## 13613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  communicable
## 13614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   communicate
## 13615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 communicators
## 13616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    communique
## 13617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   communiquer
## 13618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    communiqu�
## 13619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        communityalleytrappers
## 13620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   community�s
## 13621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     commuters
## 13622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          como
## 13623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 comorbidities
## 13624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         comox
## 13625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    companions
## 13626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    comparable
## 13627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      compares
## 13628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     comparing
## 13629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   compatriots
## 13630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   compitiendo
## 13631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   complacency
## 13632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    complacent
## 13633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      completa
## 13634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      completo
## 13635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    compliance
## 13636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     complicit
## 13637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      complied
## 13638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       complot
## 13639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     complying
## 13640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      compl�te
## 13641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      composer
## 13642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     composers
## 13643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    compounded
## 13644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   comprennent
## 13645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       compris
## 13646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    compromise
## 13647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    comptables
## 13648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      comptait
## 13649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        compt�
## 13650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        comp�s
## 13651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   comp�tences
## 13652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    comunicado
## 13653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     concealed
## 13654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 concentration
## 13655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      concerne
## 13656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      concern�
## 13657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      concerts
## 13658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    concierges
## 13659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  conciliation
## 13660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   concitoyens
## 13661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     concluded
## 13662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  concluded�dr
## 13663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    concluding
## 13664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    concoction
## 13665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      concrete
## 13666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     condemned
## 13667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  conditioning
## 13668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         condo
## 13669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   condolences
## 13670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       conduct
## 13671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    conducting
## 13672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conestoga
## 13673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          conf
## 13674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        confed
## 13675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 confederation
## 13676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conferences
## 13677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   conferencia
## 13678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  conferencias
## 13679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confin�e
## 13680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  confirmation
## 13681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confirme
## 13682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      confirm�
## 13683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     confirm�s
## 13684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      conflict
## 13685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    conflicted
## 13686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conforama
## 13687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     congested
## 13688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             congestionhousing
## 13689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      congrats
## 13690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  congratulate
## 13691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   congregated
## 13692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  connaissance
## 13693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    connection
## 13694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     connemara
## 13695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  conradmblack
## 13696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cons
## 13697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     consensus
## 13698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       consent
## 13699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  consequences
## 13700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  conservatism
## 13701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 consideration
## 13702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              consid�rablement
## 13703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   consignment
## 13704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  consistently
## 13705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 consolidation
## 13706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  conspiracy|s
## 13707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     conspired
## 13708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    constantly
## 13709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  constituents
## 13710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  constitution
## 13711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                constitutional
## 13712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       consult
## 13713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     consulted
## 13714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    consulting
## 13715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               consumerspeople
## 13716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  consumidores
## 13717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   consumption
## 13718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   cons�quence
## 13719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  cons�quences
## 13720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      contact�
## 13721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contagiarse
## 13722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 contamination
## 13723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contamin�
## 13724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   contamin�es
## 13725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    contenci�n
## 13726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      content�
## 13727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      contexte
## 13728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     continent
## 13729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    contingent
## 13730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   continually
## 13731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  continuation
## 13732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     continuei
## 13733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    continuity
## 13734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 contournement
## 13735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     contracts
## 13736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 contrairement
## 13737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                contrataciones
## 13738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               contrev�rifi�es
## 13739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      controls
## 13740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      contr�le
## 13741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    contr�l�e�
## 13742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cont�d
## 13743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 convalescendo
## 13744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  convalescent
## 13745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    convencido
## 13746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    convenient
## 13747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     convening
## 13748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    convention
## 13749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     convicted
## 13750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         convo
## 13751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     convocada
## 13752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         con�u
## 13753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cook
## 13754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cookie
## 13755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cooks
## 13756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cooped
## 13757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        coopts
## 13758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   coordinated
## 13759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  coordination
## 13760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        copper
## 13761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       copper�
## 13762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     copyright
## 13763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          core
## 13764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          corn
## 13765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        corner
## 13766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     cornerman
## 13767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       corners
## 13768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 coronaviruses
## 13769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  coronaviruss
## 13770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  coronavirus�
## 13771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       corona�
## 13772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  corona�virus
## 13773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coroner
## 13774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     coronilla
## 13775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         corps
## 13776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        corps�
## 13777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  corrupciones
## 13778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    corrupci�n
## 13779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cosechas
## 13780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cosh
## 13781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         costa
## 13782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        costar
## 13783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       costume
## 13784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       coudonc
## 13785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      coughing
## 13786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        could�
## 13787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      could�ve
## 13788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          coun
## 13789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   councillors
## 13790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   counselling
## 13791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               counterargument
## 13792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    countries�
## 13793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     country��
## 13794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        counts
## 13795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                countybycounty
## 13796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         coupe
## 13797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       courier
## 13798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      coursing
## 13799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      courteys
## 13800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      courting
## 13801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      courtney
## 13802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        courts
## 13803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       covered
## 13804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        covert
## 13805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      covid+19
## 13806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           covid19<u+0001f494>
## 13807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           covid19<u+0001f637>
## 13808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           covid19<u+0001f9a0><u+2620><u+fe0f>
## 13809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   covid19<u+2049><u+fe0f><u+0001f4e6><u+0001f690><u+0001f4a8>
## 13810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     covid1957
## 13811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     covid19jftsjftsstrong<u+0001f4aa><u+0001f4aa><u+0001f4aa>
## 13812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    covid19lbs
## 13813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              covid19lieberals
## 13814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                covid19removed
## 13815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      covid19s
## 13816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          covid19stigmaleprosy
## 13817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     covid19un
## 13818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     covid19we
## 13819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     covid19�s
## 13820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   covid19�why
## 13821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     covidfree
## 13822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  covidrelated
## 13823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        covid�
## 13824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      covid�19
## 13825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     covid�19�
## 13826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cow
## 13827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        coward
## 13828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     coworkers
## 13829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         co�t�
## 13830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cpmo
## 13831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cpn
## 13832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cpr
## 13833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cps
## 13834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cpsychi
## 13835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cra
## 13836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crac
## 13837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crack
## 13838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cracks
## 13839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         craic
## 13840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cranks
## 13841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crash
## 13842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       craving
## 13843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             crazy<u+0001f602>
## 13844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        crchum
## 13845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crdha
## 13846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       creared
## 13847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      creation
## 13848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      creative
## 13849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       creches
## 13850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      credible
## 13851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   creditcardd
## 13852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cree
## 13853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      creeping
## 13854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   crematorium
## 13855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          creo
## 13856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cressy
## 13857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          crew
## 13858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cried
## 13859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      criminal
## 13860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crisis�
## 13861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         criss
## 13862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        critic
## 13863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    critically
## 13864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     criticism
## 13865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     critiquer
## 13866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      croisant
## 13867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crossed
## 13868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crosses
## 13869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 crossimmunity
## 13870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     crosswalk
## 13871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      crowding
## 13872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cru
## 13873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cruise
## 13874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cruises
## 13875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cruise�s
## 13876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         crush
## 13877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crusted
## 13878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cruz
## 13879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       crystal
## 13880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cr�er
## 13881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cr�ole
## 13882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cso
## 13883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ctmp
## 13884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ctv<u+2600><u+fe0f>
## 13885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 cuantificando
## 13886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cuba
## 13887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cuckoo
## 13888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cue
## 13889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cukup
## 13890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       culbert
## 13891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      culinary
## 13892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   cultivation
## 13893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cultural
## 13894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cultures
## 13895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cum
## 13896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cumulative
## 13897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cumule
## 13898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cumul�
## 13899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cuomo
## 13900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cup
## 13901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          cupe
## 13902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       curated
## 13903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         curbs
## 13904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       curlers
## 13905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       curling
## 13906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    curriculum
## 13907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         curso
## 13908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cursory
## 13909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     curtailed
## 13910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        curtis
## 13911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cushion
## 13912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    cushioning
## 13913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       custody
## 13914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    customline
## 13915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cutest
## 13916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cutrious
## 13917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           cwi
## 13918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         cyber
## 13919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cycling
## 13920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cycling�
## 13921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       cyclone
## 13922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        cystic
## 13923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      cytokine
## 13924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       c�etait
## 13925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     c�l�brons
## 13926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          c�mo
## 13927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        c�tait
## 13928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 c�tedesneiges
## 13929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          c�t�
## 13930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     c��taient
## 13931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          daca
## 13932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dados
## 13933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     daffaires
## 13934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    daltoniens
## 13935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dalys
## 13936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dam
## 13937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       damages
## 13938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          damb
## 13939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        damnit
## 13940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dance
## 13941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dancer
## 13942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dangereuse
## 13943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dangers
## 13944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dann
## 13945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dano
## 13946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dany
## 13947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dar
## 13948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       darache
## 13949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         darcy
## 13950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dart
## 13951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dartmouth
## 13952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      database
## 13953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dataset
## 13954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         date�
## 13955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dattente
## 13956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     daughters
## 13957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      daunting
## 13958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        david�
## 13959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        davies
## 13960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         davis
## 13961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        davril
## 13962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dawn
## 13963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dawson
## 13964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      daycares
## 13965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dayhey
## 13966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dayisadore
## 13967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      daytoday
## 13968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dbei
## 13969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dc
## 13970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ddoumag�
## 13971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ddsb
## 13972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deadline
## 13973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dealt
## 13974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dean
## 13975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deane
## 13976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          deau
## 13977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        debajo
## 13978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       debated
## 13979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      debating
## 13980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          debe
## 13981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      debunked
## 13982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         debut
## 13983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        decade
## 13984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       decades
## 13985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        decals
## 13986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 decarbonising
## 13987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      december
## 13988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 decentralized
## 13989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deces
## 13990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        decide
## 13991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         decir
## 13992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      decisive
## 13993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    decisively
## 13994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        declan
## 13995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   declaration
## 13996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      declined
## 13997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     declining
## 13998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    decolonise
## 13999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dedicated
## 14000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   dedications
## 14001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        deejay
## 14002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          deem
## 14003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          deep
## 14004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         deepa
## 14005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        deeper
## 14006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deepest
## 14007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       default
## 14008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      defeated
## 14009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     defeating
## 14010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        defend
## 14011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     defending
## 14012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       defense
## 14013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deferred
## 14014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    deficiency
## 14015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        defied
## 14016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       defines
## 14017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    definition
## 14018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        defund
## 14019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dehcho
## 14020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dehydrator
## 14021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dela
## 14022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      delahaut
## 14023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      delaying
## 14024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        delay�
## 14025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   deleterious
## 14026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    deliberate
## 14027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  deliberately
## 14028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  deliberation
## 14029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     delivery�
## 14030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    deloitte�s
## 14031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         delta
## 14032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         delve
## 14033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      demander
## 14034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    demandeurs
## 14035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       demands
## 14036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       demand�
## 14037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   demeurenthttpstcop3vs7uk3fv
## 14038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              demilitarization
## 14039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        demise
## 14040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     democrats
## 14041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  demonstrated
## 14042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                demonstrations
## 14043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    demostrado
## 14044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       demploi
## 14045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         denis
## 14046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        denley
## 14047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       density
## 14048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dentist
## 14049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dentistry
## 14050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dentists
## 14051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     deonandan
## 14052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  departamento
## 14053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     departmet
## 14054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        depend
## 14055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dependency
## 14056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       depends
## 14057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  depopulating
## 14058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deposit
## 14059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      deposits
## 14060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      derailed
## 14061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       derecha
## 14062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     derechito
## 14063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      derni�re
## 14064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      descanse
## 14065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   description
## 14066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       deserts
## 14067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     desgracia
## 14068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    designated
## 14069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      designer
## 14070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     designers
## 14071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     designing
## 14072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        desire
## 14073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          desk
## 14074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       desmond
## 14075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        despot
## 14076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      desquels
## 14077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   destination
## 14078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  destinations
## 14079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      detached
## 14080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        detail
## 14081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       details<u+27a1><u+fe0f>
## 14082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      detained
## 14083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      detalles
## 14084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    detectarlo
## 14085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      detected
## 14086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     detection
## 14087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       detects
## 14088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     detergent
## 14089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 deterioration
## 14090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    determines
## 14091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     detriment
## 14092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     detroiter
## 14093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      devaient
## 14094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   devastating
## 14095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       develop
## 14096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    developers
## 14097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        devenu
## 14098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       devenue
## 14099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        device
## 14100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       devices
## 14101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        devine
## 14102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       devises
## 14103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        devoid
## 14104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        devoir
## 14105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     devolving
## 14106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    devonshire
## 14107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    devotional
## 14108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         devra
## 14109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     devraient
## 14110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       devriez
## 14111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   dexposition
## 14112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dgn
## 14113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dharvard
## 14114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 dhypertension
## 14115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dia
## 14116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       diab�te
## 14117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     diagnoses
## 14118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    diagnostic
## 14119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       diagram
## 14120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    diamandiev
## 14121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     diberikan
## 14122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dice
## 14123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dicen
## 14124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dici
## 14125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dictadura
## 14126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          did�
## 14127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       did�you
## 14128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          die�
## 14129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   diferencias
## 14130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   differences
## 14131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   difference�
## 14132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     differing
## 14133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    difficult�
## 14134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       diff�re
## 14135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    diff�rence
## 14136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  dificultades
## 14137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dif�cil
## 14138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dig
## 14139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       digging
## 14140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        digits
## 14141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dignity
## 14142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diligent
## 14143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dima
## 14144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dime
## 14145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diminuer
## 14146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    diminution
## 14147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dincidents
## 14148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dine
## 14149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 dinformations
## 14150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dio
## 14151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dip
## 14152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dipped
## 14153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dira
## 14154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dire
## 14155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     directeur
## 14156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   directional
## 14157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     directive
## 14158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    directores
## 14159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               directorgeneral
## 14160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      directos
## 14161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   directtoott
## 14162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       diriger
## 14163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dis
## 14164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disappear
## 14165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disasters
## 14166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disastrous
## 14167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    discipline
## 14168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 disconnection
## 14169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      discount
## 14170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    discounts�
## 14171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    discourage
## 14172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      discrete
## 14173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  discriminate
## 14174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               discriminatoire
## 14175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    discrimine
## 14176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disentangle
## 14177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disgusting
## 14178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dishes
## 14179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dishhard
## 14180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  disinfecting
## 14181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 disinterested
## 14182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dismissal
## 14183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disorders
## 14184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 dispara�tront
## 14185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disparities
## 14186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disparity
## 14187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  dispensaries
## 14188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       display
## 14189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     displayed
## 14190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   displeasure
## 14191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disponible
## 14192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    disposable
## 14193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      disposal
## 14194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disposing
## 14195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             disproportionally
## 14196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dispute
## 14197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      disputes
## 14198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     disrupted
## 14199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   disruptions
## 14200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dissidence
## 14201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dissipates
## 14202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        distancing��only�there
## 14203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       distant
## 14204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      distants
## 14205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      distract
## 14206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   distraction
## 14207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    distressed
## 14208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    distribuer
## 14209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  distributing
## 14210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       distrik
## 14211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ditching
## 14212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      diverges
## 14213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     diversity
## 14214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       divider
## 14215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        divina
## 14216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      division
## 14217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       divorce
## 14218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dix
## 14219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 djdeejaybanks
## 14220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dmv
## 14221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          docs
## 14222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       doctor�
## 14223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     documents
## 14224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dodged
## 14225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dodger
## 14226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dodging
## 14227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dodgy
## 14228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      doesn�t�
## 14229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          doh�
## 14230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       doivent
## 14231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           doj
## 14232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dojust
## 14233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dollar
## 14234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        domain
## 14235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      domestic
## 14236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dominant
## 14237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     dominican
## 14238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       donates
## 14239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         donna
## 14240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     donneront
## 14241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dooooowwwn
## 14242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        doover
## 14243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dorigine
## 14244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dor�navant
## 14245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         doses
## 14246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dots
## 14247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dottawa
## 14248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      doubling
## 14249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       douglas
## 14250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    dowardward
## 14251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       down1st
## 14252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    downsizing
## 14253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     downtowns
## 14254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      downturn
## 14255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dozen
## 14256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dozens
## 14257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           do�
## 14258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          do�s
## 14259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dq
## 14260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         draft
## 14261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       drafted
## 14262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        drafts
## 14263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          drag
## 14264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dragon
## 14265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dramatic
## 14266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  dramatically
## 14267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         drank
## 14268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   drastically
## 14269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          draw
## 14270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       drawing
## 14271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         drawn
## 14272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dream
## 14273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      drinking
## 14274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       drivein
## 14275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      driveins
## 14276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   drivercheck
## 14277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      driver�s
## 14278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      driveteq
## 14279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    drivethrus
## 14280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      drmonica
## 14281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         droit
## 14282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dropin
## 14283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       droplet
## 14284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dropoff
## 14285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dropped
## 14286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      dropzone
## 14287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         drove
## 14288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                drsidmukherjee
## 14289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          drum
## 14290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dr�
## 14291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            dt
## 14292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dubai
## 14293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dublin�
## 14294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          duck
## 14295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ducks
## 14296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dudes
## 14297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        dugout
## 14298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             duhovdenpentecost
## 14299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dumb
## 14300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dunne
## 14301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          duos
## 14302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     duplicate
## 14303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dur
## 14304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      durable�
## 14305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         duram
## 14306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        durant
## 14307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      durement
## 14308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         durie
## 14309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          duro
## 14310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       durring
## 14311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         dur�e
## 14312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           dus
## 14313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          dusk
## 14314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       dynamic
## 14315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           d�a
## 14316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        d�abia
## 14317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   d�accomplir
## 14318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               d�affrontements
## 14319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   d�approuver
## 14320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    d�artistes
## 14321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          d�as
## 14322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�asile
## 14323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     d�attente
## 14324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 d�aujourd�hui
## 14325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     d�auteurs
## 14326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�autre
## 14327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�avoir
## 14328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 d�caissements
## 14329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     d�cennies
## 14330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�cider
## 14331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        d�cid�
## 14332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     d�cisions
## 14333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�clar�
## 14334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      d�clar�s
## 14335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        d�clin
## 14336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      d�cr�ter
## 14337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        d�c�d�
## 14338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      d�c�d�es
## 14339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�c�d�s
## 14340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     d�emplois
## 14341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      d�espoir
## 14342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              d�extraordinaire
## 14343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    d�fectueux
## 14344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�fense
## 14345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   d�ficientes
## 14346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�ficit
## 14347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�funts
## 14348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      d�h�tel|
## 14349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         d�ici
## 14350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�lares
## 14351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     d�marches
## 14352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        d�ment
## 14353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  d�mocratique
## 14354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      d�nombr�
## 14355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         d�oyo
## 14356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        d�part
## 14357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�pass�
## 14358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�pens�
## 14359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�pist�
## 14360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      d�pist�s
## 14361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   d�pressions
## 14362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�put�s
## 14363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   d�quipement
## 14364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    d�sactiver
## 14365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      d�sastre
## 14366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               d�sorganisation
## 14367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�tails
## 14368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     d�tention
## 14369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      d�tourn�
## 14370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         d�tre
## 14371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      d�tresse
## 14372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      d�valuer
## 14373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       d�voil�
## 14374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    d��picerie
## 14375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        d��tre
## 14376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eapo
## 14377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      earliest
## 14378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      earnings
## 14379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         earns
## 14380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ease�
## 14381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           eat
## 14382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        eaters
## 14383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ebola
## 14384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ec
## 14385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        echoes
## 14386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ecommerce
## 14387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          econ
## 14388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  economically
## 14389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     economics
## 14390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      economy�
## 14391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      econom�a
## 14392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    eco�n�mico
## 14393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ed
## 14394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                edbendaagzijig
## 14395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eddy
## 14396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          edge
## 14397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     edinburgh
## 14398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       editing
## 14399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     editorial
## 14400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     edkaagmik
## 14401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      educated
## 14402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     educators
## 14403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        edward
## 14404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        eerily
## 14405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 effectivement
## 14406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      effectue
## 14407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     effectu�s
## 14408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    efficiency
## 14409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     efficient
## 14410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  effortlessly
## 14411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       effort�
## 14412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eggs
## 14413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      egyptian
## 14414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       egypt�s
## 14415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ehpad
## 14416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ei
## 14417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        eighth
## 14418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        elders
## 14419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       eleanor
## 14420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         elect
## 14421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       elected
## 14422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     elections
## 14423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      elective
## 14424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      electric
## 14425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    electrical
## 14426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      electron
## 14427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      elements
## 14428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      elephant
## 14429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      elevated
## 14430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         elgin
## 14431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           eli
## 14432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   eligibility
## 14433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     elizabeth
## 14434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eloy
## 14435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         elses
## 14436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           elt
## 14437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            em
## 14438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emailed
## 14439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        emails
## 14440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   embajadores
## 14441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   embarrassed
## 14442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  embarrassing
## 14443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      embraced
## 14444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         emerg
## 14445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        emerge
## 14446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emerged
## 14447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emerges
## 14448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      emerging
## 14449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          emma
## 14450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emmasq1
## 14451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       empathy
## 14452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      emphasis
## 14453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          employmentnetworking
## 14454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emport�
## 14455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       emp�che
## 14456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        enable
## 14457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   encountered
## 14458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    encouraged
## 14459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    encourages
## 14460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   endangering
## 14461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     endangers
## 14462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     endeuill�
## 14463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       endjuly
## 14464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       endless
## 14465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      endorses
## 14466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       endroit
## 14467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      endtoend
## 14468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       endures
## 14469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   enewsletter
## 14470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      enforced
## 14471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   enforcement
## 14472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      enfreint
## 14473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     enfrentar
## 14474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      england�
## 14475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 enlightenment
## 14476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       enquiry
## 14477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    enregistre
## 14478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  enregistrent
## 14479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   enseignants
## 14480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 enseignements
## 14481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ensemble
## 14482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     enshrined
## 14483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    enterprise
## 14484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      enterrer
## 14485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      enterr�s
## 14486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  enthusiastic
## 14487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       entire�
## 14488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      entonces
## 14489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    entreaties
## 14490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       entrega
## 14491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  entrepreneur
## 14492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   entreprises
## 14493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          enuh
## 14494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    enumerando
## 14495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       envante
## 14496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   envedetteca
## 14497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       environ
## 14498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 environnement
## 14499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             environnementales
## 14500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eowc
## 14501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           epa
## 14502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           epi
## 14503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     epicentre
## 14504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       epidemi
## 14505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     epidemics
## 14506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               epidemiological
## 14507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     epilinked
## 14508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       episode
## 14509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       equally
## 14510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      equipped
## 14511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     equitable
## 14512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   equivalents
## 14513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     eradicate
## 14514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         erase
## 14515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eric
## 14516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      erickson
## 14517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       errands
## 14518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       erratic
## 14519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         error
## 14520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          err�
## 14521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           eru
## 14522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        erving
## 14523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       escapes
## 14524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           eso
## 14525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       espa�ol
## 14526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        espera
## 14527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          espn
## 14528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      esp�rons
## 14529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          essa
## 14530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   essentially
## 14531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          esta
## 14532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        estaba
## 14533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        estado
## 14534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       estados
## 14535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       estando
## 14536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         estar
## 14537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         estas
## 14538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      esteemed
## 14539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     estimates
## 14540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          esto
## 14541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        etches
## 14542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ethan
## 14543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ethics
## 14544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ethnicity
## 14545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     etobicoke
## 14546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         etwas
## 14547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          euch
## 14548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      euphoric
## 14549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          euro
## 14550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                eurosettlement
## 14551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    evaluation
## 14552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       evelina
## 14553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      evenings
## 14554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        evento
## 14555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       eventos
## 14556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        event�
## 14557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ever<u+0001f62d><u+2764><u+fe0f>
## 14558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    everbefore
## 14559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   evergrowing
## 14560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          everyone<u+0001f4aa>wednesdaymorning
## 14561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 evidencebased
## 14562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        eviten
## 14563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       evoking
## 14564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     evolution
## 14565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      evolving
## 14566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ew
## 14567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ewashko
## 14568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exacerbate
## 14569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exacerb�
## 14570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         exact
## 14571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        exames
## 14572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      examples
## 14573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   exceedingly
## 14574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      excelled
## 14575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    excellence
## 14576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 exceptionally
## 14577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    excitement
## 14578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    executives
## 14579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     exemplary
## 14580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exemple
## 14581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exemples
## 14582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exentos
## 14583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exercise
## 14584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     exhausted
## 14585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exhaustive
## 14586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  exhaustively
## 14587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    exhibiting
## 14588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         exige
## 14589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      existent
## 14590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exister
## 14591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exorcism
## 14592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     expansion
## 14593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    expendable
## 14594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       expense
## 14595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     expensive
## 14596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    experiment
## 14597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  experimented
## 14598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     expertise
## 14599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               expertiseonpoli
## 14600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        expiry
## 14601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       explain
## 14602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    explicitly
## 14603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exploser
## 14604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     explosive
## 14605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        export
## 14606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       exposes
## 14607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      exposing
## 14608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      expos�es
## 14609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      express�
## 14610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     extending
## 14611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     extensive
## 14612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        eyeing
## 14613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eyes
## 14614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          eygh
## 14615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       f$cking
## 14616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           f$k
## 14617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    face�mask�
## 14618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    facilitate
## 14619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    factchecks
## 14620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       facture
## 14621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fail
## 14622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         faire
## 14623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       faisait
## 14624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       faisant
## 14625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         faite
## 14626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         faith
## 14627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      faithful
## 14628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fala
## 14629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fallecieran
## 14630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       falling
## 14631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         falta
## 14632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        faltan
## 14633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    familiares
## 14634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      familles
## 14635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        famous
## 14636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fana
## 14637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fancier
## 14638                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fantastic<u+2b50><u+fe0f><u+2b50><u+fe0f><u+2b50><u+fe0f><u+2b50><u+fe0f><u+2b50><u+fe0f>
## 14639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          faqs
## 14640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fares
## 14641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     farewells
## 14642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  farfelues�httpstcobft3y9fpfm
## 14643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       farmers
## 14644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          farrellrollingnewsie
## 14645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fascinating
## 14646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fascism
## 14647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fascist
## 14648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fasttrack
## 14649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  fasttracking
## 14650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fat
## 14651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fatality
## 14652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fathers
## 14653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fatiguant
## 14654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fatima
## 14655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fauci
## 14656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      faudrait
## 14657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   favipiravir
## 14658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         favor
## 14659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     favorably
## 14660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        favour
## 14661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fbappleamazonnetflix
## 14662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fc
## 14663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fck
## 14664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fcks
## 14665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fdr
## 14666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      feathers
## 14667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           feb
## 14668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fed
## 14669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     federally
## 14670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    federation
## 14671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      federica
## 14672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fee
## 14673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      feedback
## 14674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       feeding
## 14675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         feeds
## 14676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      feelings
## 14677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          feet
## 14678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         felt�
## 14679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        female
## 14680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       females
## 14681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      feminist
## 14682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         femme
## 14683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fencing
## 14684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       feraton
## 14685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ferguson
## 14686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ferm�es
## 14687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ferreira
## 14688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ferry
## 14689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fertility
## 14690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fervently
## 14691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fevers
## 14692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fewest
## 14693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fh
## 14694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fibetv
## 14695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fibrosis
## 14696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fid�les
## 14697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fieldwork
## 14698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fighter
## 14699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fighters
## 14700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        figure
## 14701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       figured
## 14702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         filed
## 14703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        filed�
## 14704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        filing
## 14705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      filipino
## 14706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     filling��
## 14707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fills
## 14708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        filmar
## 14709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       filming
## 14710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      finalise
## 14711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     finalyear
## 14712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      finances
## 14713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    financiera
## 14714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     financing
## 14715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      finanzas
## 14716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     findings�
## 14717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fineday
## 14718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fines
## 14719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        finess
## 14720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        finest
## 14721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fingerless
## 14722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fingers
## 14723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fini
## 14724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        finish
## 14725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     finishing
## 14726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        finkle
## 14727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       finland
## 14728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fins
## 14729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fintan
## 14730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       firstly
## 14731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  firstquarter
## 14732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fiscal
## 14733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fischoff
## 14734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fisheries
## 14735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fittest
## 14736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fiveyear
## 14737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 fixedwireless
## 14738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fixes
## 14739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         flame
## 14740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flames
## 14741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         flaws
## 14742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fled
## 14743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fleet
## 14744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  fleksibiltas
## 14745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    flemingdon
## 14746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fletchers
## 14747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          flew
## 14748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   flexibility
## 14749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         flies
## 14750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flight
## 14751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      floating
## 14752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       flocked
## 14753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      flocking
## 14754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         floor
## 14755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      florence
## 14756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flower
## 14757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       flowing
## 14758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fluff
## 14759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         flung
## 14760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          flux
## 14761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         flyer
## 14762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        flying
## 14763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fml
## 14764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fo
## 14765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      focalise
## 14766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       focuses
## 14767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       follow�
## 14768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fonction
## 14769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  fonctionnent
## 14770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fonctions
## 14771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fond�e
## 14772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fond�s
## 14773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fontes
## 14774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         food�
## 14775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fool
## 14776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fooling
## 14777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       foolish
## 14778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          foot
## 14779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    footpatrol
## 14780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         footy
## 14781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fordnation
## 14782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ford�s
## 14783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      forecast
## 14784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     forecasts
## 14785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    foreigners
## 14786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        forein
## 14787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   foreseeable
## 14788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      foresees
## 14789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      forestry
## 14790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       forging
## 14791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     forgotten
## 14792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forme
## 14793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        formes
## 14794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       formule
## 14795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fort
## 14796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         forte
## 14797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fortified
## 14798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   fortunately
## 14799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       fortune
## 14800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        foster
## 14801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       foster�
## 14802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fought
## 14803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         foule
## 14804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  foundational
## 14805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       founder
## 14806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      founding
## 14807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fountain
## 14808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fourphase
## 14809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         foyer
## 14810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            fp
## 14811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fracciones
## 14812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fraction
## 14813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fragmented
## 14814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         frais
## 14815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        framed
## 14816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  francepresse
## 14817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   franchement
## 14818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       franchi
## 14819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   francophone
## 14820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   frankcarsonbirdgoalieschool
## 14821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fran�ois
## 14822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       frapper
## 14823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fraudsters
## 14824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  fraudulently
## 14825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           frc
## 14826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      freaking
## 14827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          fred
## 14828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       freedom
## 14829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      freeland
## 14830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        freely
## 14831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     freerange
## 14832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         free�
## 14833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    freighters
## 14834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      frequent
## 14835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       freshen
## 14836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fresh�
## 14837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       friday�
## 14838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      friedman
## 14839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               friendcolleague
## 14840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    friendship
## 14841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        frisun
## 14842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     frivolous
## 14843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  from�science
## 14844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fronting
## 14845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    fronti�res
## 14846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        frozen
## 14847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         fruad
## 14848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        frugal
## 14849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   frustrating
## 14850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   frustration
## 14851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fr�res
## 14852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      fucktard
## 14853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fue
## 14854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    functional
## 14855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        funded
## 14856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     fundraise
## 14857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fund��
## 14858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      funerali
## 14859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         funny
## 14860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       furious
## 14861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        furore
## 14862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         furry
## 14863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      further�
## 14864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        fuyuki
## 14865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           fyi
## 14866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         f�cil
## 14867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     f�d�rales
## 14868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   f�d�ralisme
## 14869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         f�rde
## 14870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gab
## 14871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gabon
## 14872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gabriel
## 14873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gagnerez
## 14874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gagn�
## 14875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gail
## 14876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gaining
## 14877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         galen
## 14878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gambling
## 14879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      game<u+0001f4d3><u+0001f34e><u+0001f3c0>
## 14880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  gamechanging
## 14881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  gamesmanship
## 14882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gaming
## 14883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ganglip
## 14884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ganz
## 14885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gap
## 14886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        garage
## 14887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      garantit
## 14888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gardai
## 14889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       garda��
## 14890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         garde
## 14891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        garden
## 14892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     garderobe
## 14893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      garfield
## 14894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gargled
## 14895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gargling
## 14896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       garners
## 14897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gars
## 14898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gasp�
## 14899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gastar
## 14900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gate
## 14901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gates
## 14902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gatesa
## 14903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gathered
## 14904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gautam
## 14905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gave�
## 14906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            gb
## 14907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gdp
## 14908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         geary
## 14909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gee
## 14910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             geleistet<u+0001f4aa><u+0001f3fc>
## 14911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      general�
## 14912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       generar
## 14913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    generation
## 14914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     generator
## 14915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     genera�da
## 14916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      genetics
## 14917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        genius
## 14918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         genre
## 14919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gente
## 14920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         geoff
## 14921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    geographic
## 14922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       geohive
## 14923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     geraldine
## 14924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gerd
## 14925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 germanycanada
## 14926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gerrard
## 14927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gerry
## 14928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gertrude
## 14929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gervais
## 14930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      getting�
## 14931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         giant
## 14932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        giants
## 14933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gigliotti
## 14934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gilmour
## 14935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gin
## 14936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ginawa
## 14937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ginette
## 14938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         girl�
## 14939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gist
## 14940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       glacial
## 14941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        glance
## 14942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       glasses
## 14943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  glendaluymes
## 14944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     glengarry
## 14945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 globetrotters
## 14946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        glocal
## 14947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        glover
## 14948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          glow
## 14949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       glubish
## 14950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          glut
## 14951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gms
## 14952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gnarled
## 14953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gnat
## 14954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       goahead
## 14955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              goal<u+0001f495>
## 14956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       goalies
## 14957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         goals
## 14958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gobiernos
## 14959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    gobsmacked
## 14960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       goddard
## 14961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  goddaughters
## 14962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       goffman
## 14963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       goggles
## 14964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gohead
## 14965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gold
## 14966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gon
## 14967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gongshow
## 14968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      goodnews
## 14969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         good�
## 14970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      googling
## 14971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gosse
## 14972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gotta
## 14973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gourdes
## 14974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gouv
## 14975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               gouvernementale
## 14976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gouv�t
## 14977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      governer
## 14978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     governing
## 14979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  governmental
## 14980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gov�ts
## 14981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gown
## 14982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gowriluk�
## 14983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         goyal
## 14984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          go�t
## 14985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       grabbed
## 14986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      grabbing
## 14987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grace
## 14988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    gradjanski
## 14989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      graduate
## 14990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     graduated
## 14991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    graduating
## 14992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        graham
## 14993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 grandchildren
## 14994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 granddaughter
## 14995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       grandes
## 14996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   grandfather
## 14997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       grandma
## 14998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   grandmother
## 14999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       grandpa
## 15000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                grandparenting
## 15001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       granted
## 15002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     granville
## 15003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       graphic
## 15004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      graphics
## 15005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     graphique
## 15006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     grappling
## 15007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grass
## 15008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    grassroots
## 15009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grave
## 15010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    graveyards
## 15011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     greatness
## 15012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        great�
## 15013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        greece
## 15014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         greed
## 15015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  greenhosuses
## 15016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   greenhouses
## 15017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         greer
## 15018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     grenville
## 15019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         greta
## 15020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gretzky
## 15021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        grewal
## 15022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          grid
## 15023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       grill�s
## 15024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gripita
## 15025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        grippe
## 15026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       grippes
## 15027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         groom
## 15028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   grotesquely
## 15029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     groundhog
## 15030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        groupe
## 15031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       growers
## 15032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      growlers
## 15033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         grows
## 15034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    gro�artige
## 15035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       gtawide
## 15036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          gtfo
## 15037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        guaid�
## 15038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    guangzhou�
## 15039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      guarding
## 15040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        guards
## 15041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       guelphs
## 15042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     guideline
## 15043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   guidelines�
## 15044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     guidlines
## 15045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gun
## 15046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          guns
## 15047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gupta
## 15048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      gustaria
## 15049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gut
## 15050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          guys
## 15051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         gu�ri
## 15052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        gu�ris
## 15053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     gu�risons
## 15054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           gvt
## 15055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 g�nderdigimiz
## 15056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  g�n�ralement
## 15057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  g�n�ralistes
## 15058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       h2o4all
## 15059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       habitat
## 15060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hacen
## 15061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hacer
## 15062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hadn�t
## 15063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      haida�s�
## 15064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hailed
## 15065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 hairdressers�
## 15066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         haiti
## 15067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hai�
## 15068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       halifax
## 15069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     halloween
## 15070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        halted
## 15071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hambruna
## 15072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    hamilton�s
## 15073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hammock
## 15074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  hamontmarket
## 15075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hamper
## 15076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hampered
## 15077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ham�n
## 15078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           han
## 15079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hancock
## 15080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        handed
## 15081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       handful
## 15082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      handicap
## 15083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     handicaps
## 15084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       handled
## 15085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      handmade
## 15086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   handshaking
## 15087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hands�
## 15088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         handy
## 15089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hand�
## 15090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       happend
## 15091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 happeningshop
## 15092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           har
## 15093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hardhit
## 15094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hardwon
## 15095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   harebrained
## 15096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        harlem
## 15097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          harm
## 15098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         harms
## 15099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      harper�s
## 15100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hart
## 15101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       harvard
## 15102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       harvest
## 15103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hashtag
## 15104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hasmat
## 15105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hasn�t
## 15106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hastens
## 15107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hates
## 15108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hatt
## 15109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          haul
## 15110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          haut
## 15111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       haven�t
## 15112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         haydn
## 15113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ha�tien
## 15114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ha�tiennes
## 15115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            hc
## 15116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hcq
## 15117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     headcount
## 15118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     headlines
## 15119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 headquartered
## 15120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         heads
## 15121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        heads�
## 15122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         heals
## 15123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     healtcare
## 15124                                                                                                                                                                                                                                                                                                                                                                                                                                                       health<u+7ed9><u+4f60><u+6253><u+7535><u+8bdd><u+4e4b><u+524d><u+4f60><u+4e0d><u+80fd><u+51fa><u+95e8>�
## 15125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   healthcare�
## 15126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 healthcovid19
## 15127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       healths
## 15128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    healthwise
## 15129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     heartbeat
## 15130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    heartbreak
## 15131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 heartbreaking
## 15132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   heartbroken
## 15133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     heartfelt
## 15134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hearts
## 15135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     heathcare
## 15136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       heather
## 15137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    heatstroke
## 15138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       heavily
## 15139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         heavy
## 15140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          heck
## 15141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          heel
## 15142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         helen
## 15143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   helpteamatb
## 15144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         help�
## 15145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         helse
## 15146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     helsevern
## 15147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hendry
## 15148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        henley
## 15149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        herald
## 15150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        herbal
## 15151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          herd
## 15152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hereby�
## 15153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hero
## 15154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    heroesjust
## 15155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        heroic
## 15156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          her�
## 15157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hess
## 15158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        heurte
## 15159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          he�d
## 15160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hhahahahahahahahahahhah
## 15161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hide
## 15162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hideout
## 15163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hides
## 15164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hiding
## 15165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hierva
## 15166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      highland
## 15167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   highlighted
## 15168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      highrisk
## 15169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       highway
## 15170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hike
## 15171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               him<u+2764><u+fe0f><u+0001f970>
## 15172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hindrance
## 15173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    hindustani
## 15174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hinges
## 15175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hiring
## 15176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hirji
## 15177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    historical
## 15178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    histrionic
## 15179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   hivinfected
## 15180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hizli
## 15181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hlinka
## 15182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hmm
## 15183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hmmm
## 15184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hoarding
## 15185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hochunk
## 15186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hogwild
## 15187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         holes
## 15188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       holguin
## 15189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     holocaust
## 15190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      holohan�
## 15191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          holy
## 15192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     homedon�t
## 15193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      homeless
## 15194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         home�
## 15195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hommes
## 15196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         honda
## 15197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        honest
## 15198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hong
## 15199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       honneur
## 15200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         honor
## 15201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       honorer
## 15202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       honours
## 15203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         honte
## 15204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hoo<u+2763><u+fe0f>
## 15205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hooked
## 15206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hooray
## 15207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hop
## 15208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hoping
## 15209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hopping
## 15210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hora
## 15211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         horan
## 15212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        horgan
## 15213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hornets
## 15214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       horreur
## 15215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      horrible
## 15216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      horrific
## 15217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       horrors
## 15218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        horses
## 15219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hosp
## 15220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hospitais
## 15221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   hospitalier
## 15222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  hospitalised
## 15223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 hospitalis�es
## 15224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  hospitalis�s
## 15225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hospital�
## 15226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hostage
## 15227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hotline
## 15228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      hotspots
## 15229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hotter
## 15230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    households
## 15231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        howard
## 15232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          how�
## 15233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hoy
## 15234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hpv
## 15235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hsc
## 15236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hseni
## 15237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hsiglobal
## 15238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/06doiewvpc
## 15239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/07ewqtjrvc
## 15240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/07wcs7g0z6
## 15241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/08a78c496x
## 15242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/096egzyxnz
## 15243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/09clmqpkfa
## 15244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0buh61woaz
## 15245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0dmgo9za5e
## 15246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0f6mbrqcb7
## 15247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0f7xvej0aq
## 15248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0frlcbppwb
## 15249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0fzxcty5og
## 15250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0gokl4jyp1
## 15251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0grwx8ytp0
## 15252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0jmvxk0ayv
## 15253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0kfxh80vdx
## 15254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0lx2t7fqog
## 15255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0lxpudvtwx
## 15256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0mkf2cb7ug
## 15257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0nhq1xaqsm
## 15258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0niioafk9c
## 15259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0oizfp8oum
## 15260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0qdt8myir5
## 15261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0sk5wteesh
## 15262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0tadgvedcv
## 15263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0tvb7vupk3
## 15264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0xf2gqozsc
## 15265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0xob74ks1t
## 15266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0xumicityz
## 15267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0yc99khf3o
## 15268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/0zrdiwjxnv
## 15269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/101bf5fda1
## 15270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/14yxa3pcey
## 15271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/17zt4yoszi
## 15272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/18lu3flbsx
## 15273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/18wgv0yi2v
## 15274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1b3birn3bz
## 15275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1bylkzdfz9
## 15276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1bzvu97lsy
## 15277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1c5i4legtt
## 15278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1d5ki7siaa
## 15279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1eds9s3jys
## 15280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1ekfycy805
## 15281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1eqy3wh6kp
## 15282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1fhapkgdnk
## 15283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1grf0kts6j
## 15284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1h3ldbpy1b
## 15285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1hoimmemh0
## 15286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1ilvcq9x4w
## 15287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1j5zvaz9ib
## 15288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1l8p51iieh
## 15289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1lekguxt1s
## 15290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1m9b38ffgc
## 15291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1mi7mskwth
## 15292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1mzcjfjuci
## 15293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1n7o5z8mu8
## 15294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1nsmvbi3kg
## 15295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1oxrtdefa2
## 15296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1plz6d3meq
## 15297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1pyvmmpyfd
## 15298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1q6hlljan5
## 15299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1s4ebgznla
## 15300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1sl0zjhtaj
## 15301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1sxwauuuvz
## 15302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1u3tz45wkl
## 15303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1vvchovwq2
## 15304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1w3pnu4rpp
## 15305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1wavrmclpj
## 15306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1wmtehq7wb
## 15307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/1zahsv9vqw
## 15308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/23t8qvqfhn
## 15309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/23u8cyvkjs
## 15310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/25ahbyfjx8
## 15311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/25oj1wscn1
## 15312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/29kdulp2ze
## 15313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2apu9w7wyz
## 15314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2ck0z88pqj
## 15315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2clfelvjkj
## 15316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2cmul0pkcu
## 15317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2djkorcqgn
## 15318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2dmclp2znd
## 15319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2gj3icdaj2
## 15320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2gmp94kgn8
## 15321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2h7km1dbpl
## 15322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2hp5iyouhp
## 15323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2hsgnvwm5n
## 15324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2inuib4snv
## 15325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2j8mvvqrlm
## 15326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2julmlcifc
## 15327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2k2awizgjm
## 15328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2kangzh9jk
## 15329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2kbqgwglze
## 15330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2lkzdbp0ou
## 15331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2lwkctxx92
## 15332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2m4pw8nsvk
## 15333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2mdjuzuod2
## 15334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2mdrftomtb
## 15335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2mi9zh2msh
## 15336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2rcvntjqt3
## 15337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2rm3ygl0i8
## 15338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2rxqys51uq
## 15339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2rzsen5vkw
## 15340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2s20gnhsqb
## 15341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2s20gnz4fb
## 15342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2sf79fs8nc
## 15343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2sp7rknoa3
## 15344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2sytnixbc3
## 15345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2ubj7zrlva
## 15346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2utcehnlwg
## 15347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2v9azt94nc
## 15348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/2x4hbuqtnu
## 15349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/30p02hsbl1
## 15350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/33cpngej5y
## 15351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/35fwaj2v4j
## 15352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/35hiwilxu3
## 15353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3670rnek45
## 15354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/38dnluydxa
## 15355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/38lgpdqiet
## 15356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3a1mamu4ye
## 15357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3apyt9ne1c
## 15358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3bis3cwm8a
## 15359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3bivtfvspj
## 15360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3buolg27qk
## 15361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3bykdizzoq
## 15362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3c91evxl9d
## 15363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3dxijvtc9c
## 15364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3hd5ymneia
## 15365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3hm2gur2mr
## 15366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3i7fatyfpc
## 15367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3igjp4wrns
## 15368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3ii0ckzwtt
## 15369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3iukl3brcb
## 15370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3jk7mish4b
## 15371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3judrsgxdh
## 15372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3kgvnxr0hq
## 15373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3kluzpt6pn
## 15374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3l21txnfe2
## 15375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3l8ln0eapo
## 15376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3lw5nfujv8
## 15377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3ner1ciope
## 15378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3oa8cu18pl
## 15379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3odp87nco7
## 15380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3ool7f4sk7
## 15381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3ouslfgb7r
## 15382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3qfkllffkd
## 15383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3qo9nae4ja
## 15384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3qrxzobrpg
## 15385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3r3o9ereo5
## 15386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3s1uqum2cc
## 15387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3soq4f6ec8
## 15388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3usbgck0c1
## 15389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3uuicaxhic
## 15390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3uut0zqzhm
## 15391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3uuxi4otaa
## 15392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3vualw5huc
## 15393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3xbefbpr0j
## 15394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3yvhoszcoa
## 15395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/3yz3onyfhr
## 15396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/40e365acpc
## 15397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/40lp8vpibf
## 15398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/42g4lzpdeh
## 15399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/442khaxgzw
## 15400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/47pvqrgeba
## 15401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/48mjhmaiea
## 15402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/48vtnbydcb
## 15403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/49bckbcrkz
## 15404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4ahejxmmi9
## 15405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4bclj89cop
## 15406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4bxcqgp5kj
## 15407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4cahyr8gb4
## 15408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4dle417bvt
## 15409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4ebdu8pxpc
## 15410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4fl6ivloq7
## 15411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4gd5suv7ph
## 15412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4gqjvlrzsu
## 15413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4gvty4w2zw
## 15414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4hb7wmhmfo
## 15415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4hbvy6xriq
## 15416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4heqlk7inz
## 15417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4hmgfuc0f4
## 15418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4hqmx6kt92
## 15419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4ird3lrdfn
## 15420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4jehtkxo3u
## 15421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4jflwnmkmh
## 15422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4keveksyp9
## 15423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4kjs2tc7y4
## 15424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4kn7uxoyso
## 15425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4krl71jnzr
## 15426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4ldesqshav
## 15427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4mb9gkfm2r
## 15428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4n8cpxjmsk
## 15429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4npoxmvwmz
## 15430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4p8ij9qpk1
## 15431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4qa0n1yfbg
## 15432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4qf947dkvp
## 15433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4rygpd2oql
## 15434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4snobfogoe
## 15435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4vp2q9a8pf
## 15436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4wckrqp4bi
## 15437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4wpqb9zobr
## 15438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4wxep9bcpu
## 15439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4wxwctfcnr
## 15440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/4xqsu6cbif
## 15441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/50ll1ktyn2
## 15442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/51wwiaeuqa
## 15443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/54kjcvjvby
## 15444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/54kjcvjvby.
## 15445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/55edny22vj
## 15446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/565fjabwnc
## 15447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/58uuqfjctk
## 15448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5b77xvrznj
## 15449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5blng7cfoh
## 15450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5czp8g82vt
## 15451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5esciotsuu
## 15452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5ewq1lwga1
## 15453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5eybl8cc4x
## 15454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5fakcyc4oq
## 15455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5fhxvviiv5
## 15456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5fsyrc9noj
## 15457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5htkcusq5e
## 15458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5im5wpbljs
## 15459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5irdxgs5dj
## 15460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5jxy64jpvo
## 15461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5kaksuoobf
## 15462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5krfojjzac
## 15463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5lpfvzk4ga
## 15464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5lxcqphsob
## 15465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5ml9vfzgwt
## 15466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5mnletqyzr
## 15467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5niiydc9vd
## 15468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5oc0gvi04b
## 15469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5os7kqhuar
## 15470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5ovmkbt9tc
## 15471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5q1bju8dyw
## 15472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5qcage0yhu
## 15473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5qkcanucy7
## 15474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5qkrg1nks6
## 15475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5rh3pkgo9r
## 15476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5spocbw7mx
## 15477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5sxykt5a6e
## 15478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5t8ewztl4p
## 15479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5tduh2xwr4
## 15480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5txfjiixtv
## 15481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5ulz4qgjx4
## 15482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5uq2kdskfs
## 15483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5v6d2rf6ui
## 15484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5w363yxnyz
## 15485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5wuxxxiitx
## 15486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5xizrmjhav
## 15487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5yrcqjslep
## 15488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/5z5babp3ku
## 15489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/64arjvavtf
## 15490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/65u3bpjbbh
## 15491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/674vetfj68
## 15492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/67ah7qe9kw
## 15493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/68b2xirc10
## 15494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/69uuamo35h
## 15495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6aq6ushsce
## 15496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6djdzfp0j3
## 15497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6dvgjo9xtx
## 15498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6edauyssug
## 15499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6ewfej1apj
## 15500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6h14bwsjhs
## 15501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6h6mdyx55r
## 15502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6hkcpgrn2d
## 15503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6i50qx3qn5
## 15504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6ifysskuqz
## 15505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6jg5hqi8bo
## 15506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6jhbfavbta
## 15507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6jqgk3iffb
## 15508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6lvhzms6ej
## 15509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6n84kbabfm
## 15510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6o7zd0nydk
## 15511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6qcnvq3pgg
## 15512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6qrzv1py4j
## 15513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6r5uljfb4v
## 15514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6rpjcsp3nx
## 15515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6ruoe4a4hb
## 15516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6rxnaq2kde
## 15517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6tkywzq2vf
## 15518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6twmhk9e2m
## 15519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6utdewugjy
## 15520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6wtuig9opq
## 15521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6wtunkhdby
## 15522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6wvwusrptd
## 15523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6wz4k4w2um
## 15524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6xnfxfqelw
## 15525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6y67opza5n
## 15526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6ypmy4uctp
## 15527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6zawjakq9e
## 15528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6zi5rucvk1
## 15529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/6zztp3lhuw
## 15530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/70fmcx8yos
## 15531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/75cjp8p5a1
## 15532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/75flaauzm9
## 15533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/75q1ytbwul
## 15534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/780tscw9n4
## 15535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/792hhoqned
## 15536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7a4xk86psq
## 15537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7anb9nkjkr
## 15538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7arxnxlhqj
## 15539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7ccworoneg
## 15540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7ckv0tpeoy
## 15541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7cmk76q6sq
## 15542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7d58nserob
## 15543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7eh2sldkhd
## 15544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7fsiy28pgp
## 15545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7hcx1bj3ou
## 15546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7hk7jtpejs
## 15547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7jigcoyoiu
## 15548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7kstdkiypu
## 15549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7kuwsozqj1
## 15550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7laugfq0rn
## 15551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7lidn4vnxz
## 15552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7m1hictneh
## 15553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7m1hx97mdc
## 15554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7m4xyc8qpm
## 15555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7omubp7huk
## 15556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7pfztfg0cj
## 15557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7pu0uyw3uk
## 15558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7qbs2my9wx
## 15559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7scfhrjie5
## 15560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7ujttkll5f
## 15561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7ukccvi9gz
## 15562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7vs5ei75qh
## 15563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7w9zshwceu
## 15564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7wgemulbhy
## 15565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7y7vvpcllm
## 15566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7ycl1ekwac
## 15567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7ykucxrq7q
## 15568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7zh0tzgpq5
## 15569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/7zm3xprvqj
## 15570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/81lkqbebzc
## 15571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/83ktromsqt
## 15572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/86xzobj3o9
## 15573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/88s9b7srbs
## 15574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8a1ss6matu
## 15575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8b5ywxjkqa
## 15576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8brotaogun
## 15577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8c5wxyaj0i
## 15578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8chwlralyg
## 15579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8emgrklowf
## 15580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8f2p0nzyp8
## 15581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8fddy2bgqn
## 15582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8gacgc3fn6
## 15583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8gqd4tcc4a
## 15584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8gx9xfljhx
## 15585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8hdjyjppio
## 15586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8huucvprs2
## 15587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8jbsvkz6ss
## 15588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8jqj1as83s
## 15589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8kf2mc8csb
## 15590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8kylew8dhh
## 15591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8lmbe30jys
## 15592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8lo05ye5as
## 15593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8n7c6roh3d
## 15594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8ok57bkuqo
## 15595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8oopiiq6hi
## 15596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8ozeqrvopu
## 15597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8pqjcap5q8
## 15598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8qgq2vbjha
## 15599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8qydi0x3aw
## 15600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8r2a4ncl4b
## 15601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8rfm3vjkkw
## 15602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8rmkc01jev
## 15603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8srx4wwzip
## 15604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8susqrsdrt
## 15605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8tb84zzsjy
## 15606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8tfyut4iee
## 15607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8tkszdkmve
## 15608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8uj0jyi6ij
## 15609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8vaxzxusj2
## 15610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8vi6yimsrn
## 15611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8vlytmms8b
## 15612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8vmukekphe
## 15613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8vrkr2gzls
## 15614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8wtplqyans
## 15615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8wvftmsczv
## 15616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8wwyi2ynmi
## 15617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8xc1wz7inr
## 15618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/8yygt3tno7
## 15619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/90t49v0uaw
## 15620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/91pdksgund
## 15621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/92j0zk3ez7
## 15622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/92ozrig0yb
## 15623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/95foqftk1u
## 15624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/95qifzluko
## 15625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/968gh4qlzo
## 15626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/98vbjcmlnp
## 15627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9a1t5myeqj
## 15628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9apd20sjag
## 15629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9aqtrzowes
## 15630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9av91khkzt
## 15631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9avwhuctcg
## 15632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9avwhulil8
## 15633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9b9txyim86
## 15634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9bgnmgyymj
## 15635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9bx1kfqunr
## 15636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9cmh52hh65
## 15637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9dfho1syjc
## 15638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9es141fkjt
## 15639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9hel3aogdq
## 15640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9jvloguzqv
## 15641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9kbzs8t2ca
## 15642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9ku1srx1pk
## 15643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9la3zn4fim
## 15644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9ln3gxwd35
## 15645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9moal9njm3
## 15646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9nkwjnrqtn
## 15647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9nnuvvpazt
## 15648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9noaz5zgwp
## 15649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9nzxd3k6ib
## 15650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9ooddndagj
## 15651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9ovlnuj2wd
## 15652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9ow8caiq0a
## 15653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9oziityhf2
## 15654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9p0ehakrlk
## 15655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9p4orxelfq
## 15656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9p52353z4s
## 15657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9puejzbug8
## 15658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9q9vkgw8ys
## 15659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9rd5zsft2w
## 15660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9rg0lc2hha
## 15661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9rta4ykaea
## 15662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9saedach7x
## 15663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9sqlfzjxwp
## 15664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9truk63030
## 15665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9twjwkejbc
## 15666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9uom8fi6vx
## 15667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9vcfu7jhcc
## 15668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9vefmoapiq
## 15669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9vhe8kipil
## 15670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9wemkihjda
## 15671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9whemoi8oq
## 15672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9wmulavhpi
## 15673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9woy3x6gzm
## 15674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9xoel38sz4
## 15675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9xtacddzvl
## 15676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9xyuhf80ap
## 15677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9yvxdy33fi
## 15678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9zmd3zptck
## 15679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9zq9cfck4q
## 15680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/9zvki4hlzk
## 15681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a2me06fyn2
## 15682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a2ne0chspd
## 15683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a36cjr1a44
## 15684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a3odzd9wmp
## 15685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a5glqgsmnm
## 15686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a5gwks1hbg
## 15687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a5medqthqq
## 15688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a5xplwoook
## 15689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a6ae7txqpp
## 15690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a6cwyjenim
## 15691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a6kvlpkcwa
## 15692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a6vdihyaak
## 15693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a7zdjfsndv
## 15694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a7ziseveoe
## 15695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a8f8lwkz6n
## 15696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a8kasgndk0
## 15697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/a9sxtm3nzq
## 15698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aa5sruk81z
## 15699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aac8tipomf
## 15700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aazwyktv8z
## 15701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ab5vyiyvtg
## 15702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/abqp25isxm
## 15703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ac31uhy7rz
## 15704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/acazhhn9ip
## 15705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/acxfp1albb
## 15706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/acykmy3xcr
## 15707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ad2hwbs3yj
## 15708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ad7vapit9w
## 15709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ad96w3gq3b
## 15710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ade1feorf8
## 15711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/adgaee3dlg
## 15712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/adiwglmjfi
## 15713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/adwao8ybk4
## 15714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aejaskfu3k
## 15715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aepxxebq5u
## 15716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aeyeiw4vel
## 15717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/af4wam9rmv
## 15718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/affqahyyy2
## 15719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/afqjye8ana
## 15720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/afqw1wfeas
## 15721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/afwlaa0p4q
## 15722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/agppirtdvg
## 15723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aia8stku1f
## 15724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aihiykxilj
## 15725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ainzrlpjzj
## 15726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aitqcggfxa
## 15727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aitx0hiduh
## 15728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aiug5vffxu
## 15729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aiwbbuodzk
## 15730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aj0fso9mym
## 15731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ajxqlrjeo6
## 15732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/akiavlwouy
## 15733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/akozyxlopz
## 15734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/al1odaqhj9
## 15735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/al5pcvryjb
## 15736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/alu8jpsiyk
## 15737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/alvepmblq9
## 15738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/amy4t4e86v
## 15739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/anmb5oysef
## 15740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/anuyklvzhf
## 15741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aobnilpyt9
## 15742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aosk2txypl
## 15743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aoty1izcwt
## 15744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aouadi5jtj
## 15745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aowl1n1p3p
## 15746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/apakqqzxzl
## 15747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/apkbvniisp
## 15748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/apkmrzaycv
## 15749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/apqcqcqhsa
## 15750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aqjd38s2rs
## 15751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aqnv9nc4ta
## 15752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ari1hip7xb
## 15753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/arqun4vuqs
## 15754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/arvzguczo4
## 15755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/asbozb6saf
## 15756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/asfbsothpn
## 15757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/asrzwcf5kn
## 15758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/at4qnb1ic9
## 15759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/atpbeqkpec
## 15760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/auewwirmzj
## 15761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/auiqkqvfqg
## 15762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/auwmlg0rzy
## 15763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/avhyjibnd3
## 15764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/avmpysljab
## 15765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/avvukrlfnh
## 15766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aw0agtq7gq
## 15767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aw92ygagms
## 15768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/awbpwry4gr
## 15769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aweecsf0rq
## 15770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/awubjw0qsj
## 15771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ax7jcy96no
## 15772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ax7rf3htcp
## 15773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/axi4phgcua
## 15774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/axjfkzsllm
## 15775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/axmxveii4s
## 15776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/aydmvk4oal
## 15777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/az4nt8btz9
## 15778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/azuasqfwzj
## 15779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/b0erwjwraf
## 15780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/b0eyfq571v
## 15781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/b13i8sfamy
## 15782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/b3asw8etb4
## 15783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/b3llsxkmgi
## 15784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/b46buvxi7i
## 15785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/b6mvnnsh55
## 15786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/b6z7yjuf0p
## 15787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/b77yfxgxre
## 15788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/b7ymptntyy
## 15789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/b8739xzuom
## 15790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/b8erxuupn0
## 15791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bafdrus8ct
## 15792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bavegpwbxl
## 15793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bb9opye98e
## 15794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bbcxrjjhy3
## 15795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bbd5tnmgjs
## 15796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bbvs2vwpo3
## 15797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bc7jxplqje
## 15798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bcciwz6gse
## 15799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bche1gci92
## 15800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bdqzrckby4
## 15801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/belbawb4em
## 15802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/berjqxpmde
## 15803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bfbtocg2yh
## 15804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bfldsuqdaq
## 15805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bfqylyusx2
## 15806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bfwjo0d0w2
## 15807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bgeowwjtgz
## 15808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bgo6sseezx
## 15809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bgyof36nxb
## 15810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bh66kitaot
## 15811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bhrk6uvdnl
## 15812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bi47ol5kid
## 15813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bi4s0ouhom
## 15814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bicfwz8gr9
## 15815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/billz0iiss
## 15816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bjfzz8lv6r
## 15817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bjht4dgbgf
## 15818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bjr3ybppyf
## 15819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bjybhjbtsp
## 15820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bk50qtjqxb
## 15821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/blluajf6tg
## 15822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/blthplghlf
## 15823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/blxz8frfai
## 15824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bmexovvtku
## 15825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bmlgyrhsfc
## 15826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bmm0s4zzoq
## 15827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bn4umvea6s
## 15828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bndozhzbds
## 15829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bnvbq91wka
## 15830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bojrnyhohr
## 15831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bpcmn5ie0n
## 15832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bpm4wb5quk
## 15833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bpocmu9x55
## 15834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bq4sxuctxf
## 15835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bq4ug65q8o
## 15836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bqct94pfhc
## 15837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/br6kga9ads
## 15838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/brabdel67t
## 15839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/brhkqq1o0y
## 15840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/brloonn8yo
## 15841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/brpgjjtiph
## 15842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/brqqsaacrh
## 15843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/brvkh96zwm
## 15844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bsaidp09hf
## 15845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bsbhryvsov
## 15846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bt9aui1xwu
## 15847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/btyzamvrmi
## 15848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bvtcycpoyk
## 15849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bw0g7bfpkh
## 15850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bwzf9vk6jz
## 15851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bx4q67hksg
## 15852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bxdc9ioncn
## 15853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bxgzk6r9ej
## 15854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/by169o9zoz
## 15855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/by8gvbc2ae
## 15856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/byhonbhagc
## 15857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bypudhf6hl
## 15858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bzdzjsqvzk
## 15859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bzg2kfhzdb
## 15860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bzv4tnevry
## 15861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/bzynbynzvh
## 15862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c0a8rqsdvk
## 15863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c0vmbysy4n
## 15864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c14w1gmvad
## 15865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c3i3khevp6
## 15866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c3xphflnls
## 15867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c4dpuq2zco
## 15868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c59igf6u4u
## 15869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c5doukobjm
## 15870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c6rdez3cpb
## 15871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c6tszfwmlq
## 15872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c78zchcjrj
## 15873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c7gmz3isjv
## 15874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c9e4o9wxng
## 15875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/c9k9pywhqo
## 15876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ca8ecuac3i
## 15877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/caajnjrpn6
## 15878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cajehbkadf
## 15879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cbbemkmi3q
## 15880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cbjfohyzn1
## 15881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cbktljsgld
## 15882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cbwmnb03qi
## 15883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cbxmbmkxhj
## 15884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cc0ako7epe
## 15885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cc3tt78949
## 15886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cchkxaaxs4
## 15887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cd5441sqfq
## 15888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cdtocxx5bh
## 15889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cdw8bmxrvj
## 15890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cealy528sx
## 15891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/celuhdhxrr
## 15892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ceppl6herc
## 15893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cero9iy9ns
## 15894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ceyvoydorh
## 15895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cfdtbikswg
## 15896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cfldr6ck5n
## 15897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cfmllazjqp
## 15898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cge0ukblfe
## 15899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cgqcz8agzh
## 15900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cgvie7rvn3
## 15901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ch2a4oi6d1
## 15902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ch2aojpafz
## 15903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/chfumlwah3
## 15904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/chkotfoygw
## 15905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/churbrkalu
## 15906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ci9lv2ooaf
## 15907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ciqcxr0iv2
## 15908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cisaoiqnwx
## 15909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cjrqcaedn7
## 15910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ckicotsdoz
## 15911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ckw9g0thjl
## 15912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cle2vvkmwo
## 15913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cllmyun7mm
## 15914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/clm03m0xxo
## 15915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/clovblvgxu
## 15916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/clwrvealht
## 15917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cmoe8xu0n0
## 15918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cmp0b9klro
## 15919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cmr4em4bnk
## 15920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cnrg1wktvs
## 15921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/coua6xkhkn
## 15922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/covlgzzcag
## 15923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/coxmk5apn4
## 15924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cp9jped6lg
## 15925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cpesi0y2kv
## 15926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cpkyrvgdsv
## 15927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cpq6w1znte
## 15928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cqbiwbo2g3
## 15929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cqkhhh3kns
## 15930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/crfsuk4c4o
## 15931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/crjgetaowd
## 15932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/crsrzt3myl
## 15933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/crznhaqxew
## 15934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cs9tzbfaaw
## 15935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/csx6hsp2lu
## 15936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ctatuhbtlf
## 15937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cthlpf1mul
## 15938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cu3mwq4bga
## 15939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/culcwvt1cy
## 15940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cupqrr97uo
## 15941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cvyytiyr9b
## 15942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cwpqfhq1om
## 15943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cwyufihnyn
## 15944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cx9z4mwrwz
## 15945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cxosb1klfa
## 15946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cxzb4fali8
## 15947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cy13jldpma
## 15948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cy1m5tcmr5
## 15949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cy8qj8ra86
## 15950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cyqo9gonp4
## 15951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/czqscrdtly
## 15952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/cztzyikfeg
## 15953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/czv9ihwfl7
## 15954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d1gcmhylyh
## 15955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d4bbudb4tl
## 15956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d4pxhq3ult
## 15957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d5lvyqmxop
## 15958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d65qbesj7v
## 15959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d6avj7tdby
## 15960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d6yurgcorp
## 15961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d7cvzohjkt
## 15962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d7vi6p5nz7
## 15963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d89ri3uem9
## 15964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d8ugccizyv
## 15965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d95unowu2c
## 15966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d9adec9qmi
## 15967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d9komp163b
## 15968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/d9omvaams0
## 15969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/da05sfsiot
## 15970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/da1vgz74rb
## 15971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/db1i7456gu
## 15972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/db7ivkncza
## 15973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dba3tpgp39
## 15974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dbfk0y7jcf
## 15975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dbkytqw4vz
## 15976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dbrfbmzs65
## 15977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dcojwtovkb
## 15978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dd6pnzubka
## 15979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/de1nrihxte
## 15980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/de9nmjbwm3
## 15981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/deadwcbix7
## 15982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/deoaujojad
## 15983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dfblibxior
## 15984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dfybjfype2
## 15985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dgf5jxzk41
## 15986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dgse9bozzl
## 15987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dgz4xvdblr
## 15988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dh7eonlui4
## 15989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dh8j8pikuj
## 15990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dhidpuga7m
## 15991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dhqhptjfpg
## 15992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dhrtbxyu4f
## 15993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dialahtdqo
## 15994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ditkqmeely
## 15995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/djw0bzgdbk
## 15996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/djwqbtmmnd
## 15997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dk3fvk05rd
## 15998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dkjwlgxele
## 15999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dkq3jppeds
## 16000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dlgneft6ut
## 16001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dltr7nsoci
## 16002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dluk1edzin
## 16003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dmsebzs9o0
## 16004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dmxf8tyckz
## 16005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dncgqfqy7s
## 16006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dngcsxtslr
## 16007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dok8fbfxy3
## 16008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/dopi6wunk1.
## 16009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/dpcgfqh7ui!
## 16010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dpyfhwwctx
## 16011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dpzxrwxzuh
## 16012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dqhmwadv7y
## 16013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dqiogvozco
## 16014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dqqiuegmpz
## 16015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dr5lpu6lzd
## 16016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/drmimnfhwi
## 16017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/drnbg7bvff
## 16018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/drqhsexte4
## 16019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dseo1a6kd6
## 16020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dssynr96m7
## 16021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dt6lqpfp0r
## 16022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dtcflrmn8y
## 16023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dtw0w8t1tp
## 16024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dukx3bbftb
## 16025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/duwm0jdgq1
## 16026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dvsujhbqjo
## 16027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dvyl1e8cp7
## 16028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dw08va2m6e
## 16029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dwdafvtvql
## 16030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dwemqdrbvl
## 16031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dwgsk1zvt0
## 16032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dwxiazko44
## 16033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dwxm4gig1c
## 16034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dwxxqkq9si
## 16035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dwyqxs3jrq
## 16036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dxo4putd3t
## 16037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dyb0nzbepa
## 16038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dzliqliwew
## 16039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dzsbvtnlho
## 16040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/dzww5x5etm
## 16041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/e0xnnftzr5
## 16042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/e1eojt3nje
## 16043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/e1fqpjgwwg
## 16044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/e2hmhlmf5q
## 16045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/e2zbu6rquw
## 16046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/e4v9nje4fy
## 16047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/e4wqmieyux
## 16048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/e5b8bvuujw
## 16049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/e5sbantmqi
## 16050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/e6p45pxemu
## 16051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/e9vt6pxcsp
## 16052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eaodiqadby
## 16053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ebckoqsh9b
## 16054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eblhfpelyw
## 16055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ebubo0hiif
## 16056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ecmnndnynu
## 16057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ect9zlug4s
## 16058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eda2bnmtyl
## 16059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/edgh873bdz
## 16060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/edjllcv3bq
## 16061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ee8e8iqvkd
## 16062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eegggsc74m
## 16063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eeifcyh2ul
## 16064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eeulmthn7h
## 16065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eevs2nvxjx
## 16066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eg4wgkpwxr
## 16067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eghjmxh8fb
## 16068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/egw0jtouya
## 16069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/egyagdt1kr
## 16070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/egymc1n7rw
## 16071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eh4y4rbmwe
## 16072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ehaph5j86g
## 16073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ehbomvdji0
## 16074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ehcwpcoube
## 16075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ei4ahwbsj9
## 16076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eihjwldvjr
## 16077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eipkiqrism
## 16078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eir0qngdsp
## 16079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eirvrp84hf
## 16080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eiult0nx7z
## 16081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eiyic1de2y
## 16082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ej7nqp4q7p
## 16083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ejadqumr7n
## 16084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ejpblpcriv
## 16085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ek2i4ibvn8
## 16086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ekmwrawfuu
## 16087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/el0s3siekd
## 16088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eljpnuwhwq
## 16089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/elqguml785
## 16090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/em7tq4c8ks
## 16091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/emaw4et3ed
## 16092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/emgyzenqmf
## 16093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/emosxnbzcp
## 16094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/enirgxhtpp
## 16095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/enxneffll9
## 16096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eojsov7qoa
## 16097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eotqbmtxk7
## 16098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ep0jxkrbjp
## 16099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ep4njpohvo
## 16100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eqhnq5rpvc
## 16101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eqnzzbu6sj
## 16102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/erjkyzkhfk
## 16103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/esgarnjqjl
## 16104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/esj1uoyfha
## 16105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eszabp3mof
## 16106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/et1sh5hig3
## 16107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eth96wlbw8
## 16108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/etjzghxe3o
## 16109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eup02oyrrb
## 16110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/euq3bm7vqi
## 16111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eutr6gdfiz
## 16112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/euvvayajzs
## 16113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ev8zsgsz8r
## 16114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ew51u45rab
## 16115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/exia9whymy
## 16116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eycvrcuiiz
## 16117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eyeuhkvbme
## 16118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/eysgalpypg
## 16119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ezcfepwd0g
## 16120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ezocisn9f0
## 16121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ezz7axk9jj
## 16122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/f0b3fedkyx
## 16123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/f1n1q6ma0d
## 16124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/f4qavep89u
## 16125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/f5u4murs2e
## 16126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/f6gqmyoxpb
## 16127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/f77vyoj8de
## 16128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/f7tn67czhd
## 16129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/f7za6uj6vp
## 16130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/f8hompvtww
## 16131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/f8oslxjkr6
## 16132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/f9pihhj533
## 16133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fabzojdtva
## 16134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/faq2cpxt5l
## 16135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/faz7hpoj07
## 16136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fbav4ag2mg
## 16137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fbbu4jhjye
## 16138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fbi0sy8ek2
## 16139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fc0klkxnir
## 16140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fchilq9ss0
## 16141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fcupx6u901
## 16142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fdbxxwlmm8
## 16143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fdeue2ggoe
## 16144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fdjvvhnf7o
## 16145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fdn6z0m7gx
## 16146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/feih9iycsk
## 16147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fezrhxo2re
## 16148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fezvvb37yz
## 16149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ff7nc7vtc8
## 16150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ffhnvtreup
## 16151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ffpghfwalz
## 16152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fgso5woxlp
## 16153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fgz9slmp54
## 16154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fh5xc70bpa
## 16155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fhodu6poaw
## 16156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fhsay2a04n
## 16157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fihqnevhem
## 16158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fjcg9bce3p
## 16159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fkogwuiapr
## 16160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fkqemocvcb
## 16161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fkzgfvtuvb
## 16162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fl5xynqxv7
## 16163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fmnqp9wrbx
## 16164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fmq6aqsvif
## 16165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fmvyod9kcs
## 16166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fmxl6zuxca
## 16167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fnfjguhezx
## 16168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fnjtp3kccw
## 16169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fpejhjfg5z
## 16170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fpx6auluqz
## 16171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fq8ccgfczg
## 16172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fqakdlep6m
## 16173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fqjxkskln7
## 16174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fqs8ddnpvd
## 16175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fqsij6pvqp
## 16176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fsrio2cduk
## 16177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fst0ij9ft3
## 16178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fstzzrgbbf
## 16179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fsumifj9ol
## 16180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fswhdfytiv
## 16181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ftgjikgw6q
## 16182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ftnfwaq394
## 16183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ftz0e27kot
## 16184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fuhoyjfjhr
## 16185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fukktwr2p9
## 16186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fuklfzjodf
## 16187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/furszlf6s6
## 16188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fuud9y7hnt
## 16189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fuvazsrmig
## 16190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fv3wjwnfwn
## 16191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fvamtyom1l
## 16192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fvgapwjfgi
## 16193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fvhrescfd9
## 16194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fvsgmhyksr
## 16195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fvsmxn9kqr
## 16196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fw4uak0gs0
## 16197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fwn1wdgy0u
## 16198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fx9x8t3frf
## 16199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fxj04awvbl
## 16200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fy8qqk3fh9
## 16201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fydisngpj2
## 16202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fywzvq9xd2
## 16203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fzaqoehlva
## 16204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fzk0uqtdma
## 16205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fznphrvpwi
## 16206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fzssdistbg
## 16207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/fzzv0gt3li
## 16208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g010jmxnjn
## 16209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g0hozvonlp
## 16210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g0qvlp5ymn
## 16211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g2iqyvpgol
## 16212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g3eftaw1uw
## 16213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g3imsg8tte
## 16214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g3yneki2bg
## 16215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g5ef9lhizn
## 16216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g5hc4xifkj
## 16217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g6yfvtksd7
## 16218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g7l6g8g1nf
## 16219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g8xtpraefa
## 16220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/g9c0ncybvj
## 16221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gaeje7i4tg
## 16222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gafchns40j
## 16223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gahmgc16e0
## 16224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gajelmtvje
## 16225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gak5khk5k8
## 16226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gb5ksbos4d
## 16227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gb72hfhrk9
## 16228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gbhjyw5n1w
## 16229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gbsq4pvman
## 16230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gctvo1hfmq
## 16231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gdf2oxivzh
## 16232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gdyn1vpasm
## 16233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/getuqgvivk
## 16234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gexfjcwii6
## 16235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gfhgqdnddv
## 16236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gfiv1boxef
## 16237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gfrcqufuaj
## 16238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ggbghrxj41
## 16239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ggqxbrq2ni
## 16240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ghtgdwqluu
## 16241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gi5snnk6l2
## 16242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/gi9y2oq3ez.
## 16243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gixsrfjzgr
## 16244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gj6y7eclqt
## 16245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gjfyzp9bnl
## 16246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gjnblcwblk
## 16247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gjtk4aynyh
## 16248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gkksktpq3n
## 16249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/glkwjn16t0
## 16250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/glqvfgdlmk
## 16251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gmipev4web
## 16252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gmsf0znq9l
## 16253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gmsled8oqy
## 16254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gnjpftda88
## 16255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gnsngp46wl
## 16256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gnxeyujvms
## 16257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gnz2pxi6lw
## 16258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/go1rnevkws
## 16259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/goksrqfinu
## 16260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gp4axmy0er
## 16261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gpalermshk
## 16262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gpdrjlfxqr
## 16263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gpolwheglk
## 16264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gpugbuz8v0
## 16265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gq5ye8zt0r
## 16266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gqnse63wec
## 16267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/grh5e6u1vp
## 16268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/grypas5dmh
## 16269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gt3tjgmmxe
## 16270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gtheherrfy
## 16271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gtmesjnavc
## 16272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gtqs41kag9
## 16273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gumtsq5pem
## 16274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gurdv3iyu6
## 16275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gux9kfxtb4
## 16276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gvyfefnhcd
## 16277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gwricofzzk
## 16278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gxcozlr03d
## 16279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gxdnxxogup
## 16280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gxem7pbsx9
## 16281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gxjj4pofoa
## 16282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gxn8ohws20
## 16283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gxzkibobmn
## 16284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gyihbjuols
## 16285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gyzmwka0ve
## 16286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/gzwvydbkku
## 16287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h0emecpi3k
## 16288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h0ffpm7b4k
## 16289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h0sykj9cvt
## 16290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h16ceyzaws
## 16291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h1icmla1iz
## 16292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h1p4vz0ae1
## 16293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h1tfjq4hc3
## 16294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h32o15c7aj
## 16295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h3jze1kjmc
## 16296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h51v4jziox
## 16297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h5qniloipt
## 16298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h5svlktwrx
## 16299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h67sjfycdv
## 16300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/h8czfshwbm
## 16301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ha2jz16qhz
## 16302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/haui1zhtky
## 16303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hbfsosyhvs
## 16304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hbrrsu5bsp
## 16305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hcnldvdbrt
## 16306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/heb4rag7r8
## 16307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hegabnsteg
## 16308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hemlgnvsei
## 16309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hennh99ng6
## 16310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/heykadeh0e
## 16311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hfgqyxk2u9
## 16312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hfmyvdjbay
## 16313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hgbqygnjxr
## 16314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hgfvr5nlug
## 16315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hgg6bgqndg
## 16316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hgtnxrokoo
## 16317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hgx5ajxjmd
## 16318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hgz3nzwnbe
## 16319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hh9trofwrt
## 16320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hhacbagjrt
## 16321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hhoxwgfzkl
## 16322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hitwfqi5k7
## 16323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hj7vhoz5fk
## 16324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hjjwldegyd
## 16325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hjktdllula
## 16326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hjy3yhpirw
## 16327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hkavpu8ywb
## 16328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hkehjnbu5b
## 16329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hksvzl1fsw
## 16330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hku6lovrsk
## 16331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hlazfhrrjm
## 16332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hlzzamsutb
## 16333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hmgvycewrb
## 16334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hmhlw6pwl2
## 16335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hmkleoup8d
## 16336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hmqiewmt5t
## 16337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hna7mq9d5g
## 16338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hnnsyjuuoj
## 16339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hnoaxinkun
## 16340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/hokwica64x,
## 16341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hp6rblfmcy
## 16342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hpqjclwiy0
## 16343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hrdeuewg1w
## 16344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hrx4vfzkcu
## 16345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hrxfq9aml1
## 16346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hs8yudolgr
## 16347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hsalwcuakc
## 16348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hst6weqhxu
## 16349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ht4bxu8zex
## 16350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/huisautypc
## 16351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/huu6d2pr6o
## 16352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/huupsmgcgk
## 16353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hva0dypepy
## 16354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hva2cd5r02
## 16355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hvhvpdy52z
## 16356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hvjwziubtw
## 16357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hvxktdjdsd
## 16358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hwa9l0kdt2
## 16359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hwiixr3ytg
## 16360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hwk0izrzpv
## 16361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hx4ss8eh7r
## 16362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hx5b3nrizu
## 16363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hxllsad5or
## 16364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hy7tdhss7l
## 16365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hybzdouqh1
## 16366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/hzpvmfolz2
## 16367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i0efxe0iow
## 16368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i1genxlju9
## 16369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i1thlaboz1
## 16370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i2ijhcbewk
## 16371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i2kjtvu8ww
## 16372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i379zqwzh4
## 16373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i4o0ul02eu
## 16374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i5gn7c7itm
## 16375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i5vhbdiqba
## 16376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i74oocisgd
## 16377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i7kfpmmzmd
## 16378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i7scgh6zyv
## 16379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i8negdj7ic
## 16380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/i8pewy6gkc
## 16381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ia97t6hfeu
## 16382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iaakgxtwzy
## 16383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iawyy1ybll
## 16384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ib6vbrgil2
## 16385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ib81aq3gis
## 16386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ibipug21n1
## 16387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ibtebm0e2i
## 16388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ichkvgtuv7
## 16389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/icj57xloxi
## 16390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ickaswnhmg
## 16391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/idywjamnxx
## 16392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/idzpdyfxon
## 16393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ielokq9c9q
## 16394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ieub4ainja
## 16395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ifiuoyfa9n
## 16396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/igotje62ui
## 16397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ih5qxsb71j
## 16398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ihe9rv8nxs
## 16399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ihf6ouzzj1
## 16400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ihf8j0e6ww
## 16401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ihicy7s0xx
## 16402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ii8wtsofrw
## 16403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iidxcsojue
## 16404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iihrmsnhzq
## 16405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iikxs89i9q
## 16406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ijoaq3qibm
## 16407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ijug8kim8d
## 16408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ikfraddu6f
## 16409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/il8t7ffqtj
## 16410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/illcgqf48a
## 16411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ilmxuzbrow
## 16412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/imbdsshqi8
## 16413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/imczzwbce4
## 16414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/imomc2xn08
## 16415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/in7q6hrx0z
## 16416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/inqivmr0c2
## 16417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/int7rtsygb
## 16418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/inzhspklet
## 16419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iobep1knq3
## 16420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ioi9i8ky6v
## 16421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iozlecsrb8
## 16422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ipeo6tnsek
## 16423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ipitv5bo6r
## 16424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iqbofcqqhz
## 16425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iqvl7jxook
## 16426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ir3en4a1n3
## 16427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/is7wmcamr5
## 16428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/it53zuoobz
## 16429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iuba5h7zjo
## 16430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iuza1m8z7p
## 16431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ivbhrzib3l
## 16432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ivbptzyk1z
## 16433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ivc2ibohlk
## 16434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ivcksb6d4p
## 16435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ivfaxyawu1
## 16436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iwapmrninz
## 16437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iwmhkqu2fx
## 16438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ixtx5uura1
## 16439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/iykod3d3fk
## 16440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/izdkz5noy9
## 16441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/izo7rml0ud
## 16442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/izpqrwgorm
## 16443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/izwim1ca04
## 16444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/j014n3gehn
## 16445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/j0wfjkhvsj
## 16446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/j30yvdwws5
## 16447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/j4mok67j2y
## 16448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/j6z0mp8tcx
## 16449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/j82lyivdmw
## 16450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/j83mmefjop
## 16451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/j8mnbwlmgy
## 16452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/j8tdxnyiqm
## 16453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/j8xsyvufoo
## 16454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/j9gvjkqzyc
## 16455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ja1rpqr2t1
## 16456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jagvlqhwoi
## 16457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jb4kx6u599
## 16458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jctfs2xv5s
## 16459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jdfwpld347
## 16460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jdnwskktgw
## 16461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jdvfiqtfm3
## 16462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jeicgdka9t
## 16463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jeo7zvwvco
## 16464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jf4xw9jypc
## 16465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jfeekpixap
## 16466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jfoqezsulv
## 16467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jfrsgv4sxh
## 16468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jfsyid4h94
## 16469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jfzmxv1mvd
## 16470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jg8fjcamou
## 16471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jgpolk2tmz
## 16472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jh62bb3qi9
## 16473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jhlfreolk4
## 16474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jhmn3p3bbg
## 16475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jhwak4tmy7
## 16476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jidwq8kzqd
## 16477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jis48oxmjy
## 16478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jj8cbvhumf
## 16479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jjeesywj58
## 16480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jl1fcnpjnv
## 16481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jm9nu5tyhp
## 16482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/jmj1a2ct9y,
## 16483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jmrkgtr0s5
## 16484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jnqowno1hs
## 16485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jnt7bdzapr
## 16486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jo1urvbcaw
## 16487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jorstze8xv
## 16488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jposdajktw
## 16489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jppfhvgioh
## 16490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jpyekvli5y
## 16491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jqzsdndh22
## 16492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jrqrdqkkca
## 16493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jrzi5sljxv
## 16494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/js5qvd2vn9
## 16495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/js75p3fbla
## 16496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jscnl3ox3h
## 16497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jt9rslmzox
## 16498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jutsh32l1d
## 16499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/juudphrgdu
## 16500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jv0djjeyru
## 16501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jv6hwccyi1
## 16502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jvibbla99j
## 16503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jwh5hhotob
## 16504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jwmrypmfgr
## 16505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jwpbt7sqk1
## 16506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jwzdmsngae
## 16507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jx6dqqscyx
## 16508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jxhxz8hxsk
## 16509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jxxqclwf2a
## 16510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jyougrcomy
## 16511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jz5aawcwds
## 16512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jzfv1koyno
## 16513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jzy57lhyqj
## 16514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/jzzeekguc1
## 16515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/k2mwntntih
## 16516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/k2viwbnk85
## 16517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/k3knkfpydp
## 16518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/k5lpvt4nl5
## 16519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/k6szq8ykj3
## 16520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/k7orqdv0wo
## 16521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/k8ot9rysfu
## 16522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/k8pzdqxshz
## 16523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/k93ncbfrdu
## 16524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/k99f2ekxv1
## 16525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/k9wurkcdtz
## 16526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kao7ufzas7
## 16527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kb3qbhpvld
## 16528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kbiro2dg60
## 16529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kbluqkjcer
## 16530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kbm4gprol6
## 16531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kceyfy0jve
## 16532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kclqg1wn80
## 16533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kdezjd2nh7
## 16534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kdgeii2yk1
## 16535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kdgnxcvtya
## 16536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kdu1jdduvo
## 16537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kezpzyw8bs
## 16538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kf1zkxoxxd
## 16539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kff1c225ai
## 16540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kfjbdwetos
## 16541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kfwh8ud535
## 16542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kg1kypzccd
## 16543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kgcofjj3a4
## 16544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/khzpmdmexy
## 16545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ki5lsukgti
## 16546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ki77fmzcb3
## 16547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kiiocs3mni
## 16548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kj3rfzxf1l
## 16549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kjkz5h6rgo
## 16550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kjpxdhz1vs
## 16551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kkolawnim1
## 16552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/klertwiaiz
## 16553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kllwk2g43b
## 16554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kloleff5gh
## 16555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kmkby8a4p1
## 16556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kmqa9ya9x7
## 16557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kmqgiypbcl
## 16558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ko1fcyb9zx
## 16559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/koae18iwch
## 16560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kocazrbigh
## 16561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kolasqpiap
## 16562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/koojxhyr28
## 16563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kopzhsojqr
## 16564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kpstie8abb
## 16565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kpxll0mfmn
## 16566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kpz2ykxoxj
## 16567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kpzwx7wxam
## 16568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kq70169ke9
## 16569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kqecv4s0kp
## 16570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kqijtmg5qn
## 16571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kqmdbq3b9z
## 16572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kqndzsmsbx
## 16573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kqqulgq4ia
## 16574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kqtdupuc63
## 16575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kr4iqcakrk
## 16576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kracygyf0y
## 16577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/krq1skjwc1
## 16578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/krtflrmfcm
## 16579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ksg15nbwqk
## 16580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ksluv9x83g
## 16581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ktxfajagia
## 16582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ku35oyv9f6
## 16583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ku3ggsb31q
## 16584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kvccopjatf
## 16585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kvdnhaanoj
## 16586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kwat1zq5uo
## 16587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kwrlj8feop
## 16588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kwvekpmid1
## 16589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kx7hjitmux
## 16590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kxdzzgspre
## 16591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kyvfitjziz
## 16592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kzcz1la3mf
## 16593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kzdu31zyel
## 16594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kzfw3mufff
## 16595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/kzrojha8jj
## 16596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l3cy4uvrlp
## 16597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l3im8xrqoo
## 16598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l4ofinqewj
## 16599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l4ua2pquyt
## 16600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l62fvj3otb
## 16601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l6hq1eazhb
## 16602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l6qrqpxt7e
## 16603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l80zb6zwot
## 16604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l895lyhule
## 16605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l8fwrb7tay
## 16606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l8giznq0tk
## 16607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l8t7il5vyj
## 16608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l975xcysgm
## 16609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l9mjop01zf
## 16610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/l9xznkynwn
## 16611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lah5wxg3y4
## 16612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lar68d3vkb
## 16613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lb0bigvq3y
## 16614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lbeowgnxvi
## 16615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lbk6oadfot
## 16616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lc3ff1fk1w
## 16617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lc9m5yyjis
## 16618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lcdtjiwmmh
## 16619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lcjay6zqic
## 16620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lcn5twfb2f
## 16621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ldfw5utzhs
## 16622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ldkrkuhh0z
## 16623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ldvaw3usmi
## 16624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lewx1ev2m3
## 16625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lfevyguvil
## 16626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lfgwmxsp4j
## 16627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lfrxhp1qdn
## 16628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lfve7mexd6
## 16629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lgrjithy7o
## 16630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lh6onxzq9y
## 16631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lh7taaebcm
## 16632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lhvkwdl6hq
## 16633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lifz52ynyj
## 16634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/liw2cm1gox
## 16635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ljjqkkfmto
## 16636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ljtopesca9
## 16637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ljzlseqf9p
## 16638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ljzubldf5v
## 16639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lk4vyhzfep
## 16640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lkyx7bfpm0
## 16641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ll5q0iie7h
## 16642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/llb5t0jxfk
## 16643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/llesjbl0oo
## 16644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lljpgdz6va
## 16645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/llm55i04rk
## 16646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/llrtu4oagh
## 16647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lmn2anc4j5
## 16648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lmnvbsnqgv
## 16649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lmvui5a72o
## 16650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lnfegmz2ui
## 16651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lnjrbnn66p
## 16652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lpxdb8wkt6
## 16653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lqdfvpjbe6
## 16654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lqmnp3gu57
## 16655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lqybkeebc9
## 16656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lrjlbaaymi
## 16657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lrlqowtjed
## 16658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lsmxyvrjmx
## 16659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/luiwsr0pry
## 16660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lvq73pcwvj
## 16661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lw83p3xvo6
## 16662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lwa6mvos8m
## 16663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lwbmsrgv6o
## 16664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lwcuyfxkjl
## 16665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lwh0pvbqzs
## 16666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lwni59jyso
## 16667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lws4cdlczr
## 16668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lxcxzxy31m
## 16669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lxewpmqyth
## 16670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lxxajbkaoh
## 16671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lzpclbdgl8
## 16672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lzrxdcgg5s
## 16673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lzthzbujg6
## 16674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/lztygtjjui
## 16675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m080aaoczf
## 16676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m29u5sykln
## 16677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m2ifaz1rqb
## 16678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m2qnpjzquf
## 16679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m3bfjxdbvm
## 16680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m3ekwejta6
## 16681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m3fe91cczt
## 16682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m3kgzpl6uq
## 16683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m3onusb9vm
## 16684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m3rvpgxcsz
## 16685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m48lwn8l3r
## 16686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m4m7mnlttk
## 16687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m4n1juc2rc
## 16688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m4oofzgsxc
## 16689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m4vm7cljpn
## 16690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m4zf2voe3v
## 16691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m69dxpmhtg
## 16692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m6lidkxfz0
## 16693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m6zpbx691z
## 16694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m8ensalbxd
## 16695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m9djhqaf9p
## 16696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m9ivdyjqed
## 16697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/m9qnbezcmo
## 16698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mam0xnfuc7
## 16699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/maqzv8nmm4
## 16700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mbfcl2ibki
## 16701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mbfeffnlsq
## 16702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mbjf9vffvt
## 16703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mbq7vrz8fd
## 16704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mbquauwdgt
## 16705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mbrosyx3tj
## 16706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mbtpv7npyf
## 16707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mbtwhhvlx7
## 16708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mbuwwwkp3z
## 16709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mbwc92xf4y
## 16710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mc25tf4bib
## 16711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mc71rg6auf
## 16712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mcblzbgyyn
## 16713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mcbs04bx1w
## 16714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/md2tzxx3du
## 16715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mddfgzxjnd
## 16716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mewzrhc04y
## 16717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mfcfa0yy9t
## 16718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mflgep7syt
## 16719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mfq7tivlbp
## 16720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mg0wqbditq
## 16721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mg3gniy2gl
## 16722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mg3mjtieco
## 16723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mgl6z7ndgt
## 16724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mh6lnicbfh
## 16725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mhf2mijdgx
## 16726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mhhu5nvhx7
## 16727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mifjjslc3j
## 16728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mihnuzikzj
## 16729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mj6myr1ykd
## 16730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mjugsfw0ey
## 16731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mkbirqrw1x
## 16732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mkhle5lekk
## 16733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mktbbdlg5u
## 16734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ml7fmdplet
## 16735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/mlifxnj4ou,
## 16736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mlikuj7sgf
## 16737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mlosde2scx
## 16738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mlp1asjxrd
## 16739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mlwxjzitpp
## 16740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mlzf4g9vjm
## 16741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mmdvjpjve0
## 16742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mmfzvqfmrx
## 16743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mmlqp26air
## 16744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mmmg0ynns8
## 16745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mmvhn4aefi
## 16746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mn23l9y6ht
## 16747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mnao2fswov
## 16748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mnqidkjnur
## 16749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mo8zl3pded
## 16750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/moq4bkjprz
## 16751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/moqv4pfaqc
## 16752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mp63odbsgs
## 16753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mp6jwnhp4q
## 16754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mpbgx5t1lv
## 16755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mphg8gtp0m
## 16756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mpk4bcwgw3
## 16757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mpwsudydbq
## 16758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mq2wn4vcp7
## 16759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mqya8wubpe
## 16760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mrwttolmuy
## 16761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mshkofsumb
## 16762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mshqzer2av
## 16763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mt7irnnvhv
## 16764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mtcv48czvp
## 16765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mtfsx4oxt7
## 16766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mu6ntafvbv
## 16767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/muk5xw47wv
## 16768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mvadkf3ajg
## 16769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mwbm2iwnnp
## 16770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mwu7lhfzfs
## 16771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mxk9bdcgas
## 16772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mxlwlsbrki
## 16773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mydhhh8u6v
## 16774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/myypbdcx72
## 16775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mza6ksqc8w
## 16776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mzk6oyhgyd
## 16777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/mztk1vpk3t
## 16778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/n0pvc4njay
## 16779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/n1in4zfble
## 16780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/n39nytk7d0
## 16781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/n3cjbujbpn
## 16782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/n3ehrhjkhd
## 16783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/n5i6latxjj
## 16784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/n6rod4yyo8
## 16785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/n7vl9rmryn
## 16786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/n8cmy4wrhb
## 16787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/n8qllxjlw9
## 16788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/na45btcndr
## 16789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/naxyofyjvu
## 16790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nbkfyugieb
## 16791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nbtoang7b0
## 16792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ncqfkjdn2x
## 16793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ndhupt3qdz
## 16794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ndkeutv9cc
## 16795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ne57akifoj
## 16796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nejhn7jpm4
## 16797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/netupuewei
## 16798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/new0041t4g
## 16799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nf0vnjclr6
## 16800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nf3ilye6ro
## 16801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nfbjvmartu
## 16802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nfbublodyg
## 16803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nfi7fi2jox
## 16804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nfxtddtxhv
## 16805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ngfbbwcsop
## 16806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nh8bctffm8
## 16807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nhtt4tpouq
## 16808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/njauc251hh
## 16809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/njm62dedhv
## 16810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nkw6favhv3
## 16811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nlgtfhtvwx
## 16812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nlgxxuaibq
## 16813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nlhjv8azw6
## 16814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nlji6zes9o
## 16815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nm7zf6ysxg
## 16816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nm8xi98xew
## 16817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nna6lftrnc
## 16818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nnkcso7lmu
## 16819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/no8deynpja
## 16820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/noavoptqeo
## 16821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nobtkynplq
## 16822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nodimgtdj8
## 16823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/noenm3s4jz
## 16824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/noikca3wvc
## 16825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nop0c8qflz
## 16826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/npjt3wcter
## 16827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/npkr6ihsim
## 16828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/npphlfb3c4
## 16829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/npv8hh1rhk
## 16830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/npwug9fuvb
## 16831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/npyuksrrbr
## 16832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/npzi32chbm
## 16833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nqlgtug6yx
## 16834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nrcgkljrhh
## 16835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nrlqxv7gho
## 16836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ns5s44jjtf
## 16837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nsby9ymyln
## 16838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nsiqalrtlk
## 16839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nskl5wyeya
## 16840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ntcki5vn3c
## 16841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ntvrmpyga4
## 16842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nu2wy8kght
## 16843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nuerftwt9u
## 16844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nuw8kiifd6
## 16845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nvxqaxvvcw
## 16846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nwbfltowfk
## 16847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nwfjso1zaa
## 16848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nwivggtwdg
## 16849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nxejhwzssy
## 16850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nxu2udzkng
## 16851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ny5byltpbb
## 16852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nya0q68llz
## 16853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nyem7f2anm
## 16854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nyp5cadfie
## 16855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nys66mwhc1
## 16856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nz1q0mo9ky
## 16857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nzah1eycb1
## 16858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/nzwb8pu56v
## 16859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o06foebmuc
## 16860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o0oy6dmpr0
## 16861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o0xhqtynbs
## 16862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o0zw7qdeuj
## 16863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o1p6bdf5h8
## 16864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o2j1afo95w
## 16865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o2ose8pxtf
## 16866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o37xybl8n5
## 16867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o48fk96xsp
## 16868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o4br3nwnin
## 16869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o5ys7li9oi
## 16870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o61n7scvgw
## 16871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o7fxhb3u06
## 16872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o817spgzcl
## 16873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o83vfybmnq
## 16874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o94ze73xy4
## 16875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o95il0nesd
## 16876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/o9cfa6s0eg
## 16877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oake1bpyxp
## 16878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oaxa35qxmj
## 16879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oboebkegli
## 16880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/obwhw1fjik
## 16881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oc5rlnnpbf
## 16882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ocx3ujv5ab
## 16883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/odytlwb4jx
## 16884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oe0r0ppyam
## 16885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oe5ukop2lm
## 16886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oerbx9x4jg
## 16887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oet0z9ugfv
## 16888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/of6ciduioc
## 16889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ofl1tpowzq
## 16890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/og9arbc0sk
## 16891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oggxxobpgh
## 16892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ogtuqujxn8
## 16893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oh23bbmy7v
## 16894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ohkd6rohvu
## 16895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ohmx9xcrgm
## 16896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oi7jhm3i2d
## 16897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oi9sdiwtch
## 16898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oib5wepgqd
## 16899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oiesu0umh3
## 16900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oitjo2puau
## 16901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oj0hob1nxn
## 16902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ojmx5pcpej
## 16903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ojppbqsr7k
## 16904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oksmepb9tv
## 16905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ol73vlxzce
## 16906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/olrspzeen7
## 16907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/omhbtdget4
## 16908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/onedvv6hew
## 16909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/onwcbhfb2b
## 16910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/onxvc728b8
## 16911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oo9fr19npp
## 16912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oog50qsc9q
## 16913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oohnh5glze
## 16914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ooik4a18pm
## 16915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ooxjiyemlm
## 16916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/optj5gv1hf
## 16917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/optrkjczev
## 16918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oq06jlaowb
## 16919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oqada38nut
## 16920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oqqwusuqtk
## 16921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oqwdorcozf
## 16922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oqwznk5tzg
## 16923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/orl07kqaqc
## 16924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/orxqzptvqd
## 16925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/os3l49b5cv
## 16926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/osc6nxsz37
## 16927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oss4ioyhzx
## 16928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oto2fqr1xy
## 16929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oto5fjcvws
## 16930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/otslhiisiz
## 16931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oturv8u0xb
## 16932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/otvaid6nql
## 16933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oukgm4a3ug
## 16934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ouvceozdsk
## 16935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ovaiho1sun
## 16936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ovvlkbmm8q
## 16937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/owlq6nallr
## 16938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ox9wmftuvl
## 16939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oxgr9j6fmk
## 16940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oxogfagxqt
## 16941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oxspnbmuct
## 16942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oy03ns6jo8
## 16943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/oyrwuzrzac
## 16944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ozcxqekmqv
## 16945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ozqpuh4da9
## 16946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p1crmxdsyl
## 16947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p1lgyg6xve
## 16948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p1scykwmfj
## 16949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p1yhs607zv
## 16950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p28efrzks8
## 16951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p2kxk5qptx
## 16952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p2wicalzc9
## 16953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p4cd6vq3gl
## 16954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p4wj1ghpsi
## 16955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p52y63kfme
## 16956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p6bcw5w7y0
## 16957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p8y3se0n0x
## 16958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/p9wpl3jy6t
## 16959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/paerzgzpu2
## 16960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pan1dekn1w
## 16961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/papqvjkqvb
## 16962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pbjb7tnlsl
## 16963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pbltikhiqy
## 16964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pbmfkpqclj
## 16965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pcga7u7igg
## 16966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pd626sua07
## 16967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pdpdxqrehy
## 16968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pdslpul8he
## 16969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pe1l7g0nqr
## 16970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pe79kkm0ut
## 16971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ped10gv6yg
## 16972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pfgiutwuva
## 16973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pfmngerfvr
## 16974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pfpkfynhqg
## 16975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pfu3v5w6si
## 16976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pg2vlvdubp
## 16977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pgdlild5sx
## 16978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pgsdj5ufwp
## 16979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ph7uzbnapb
## 16980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/phfgfwvfkl
## 16981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/phrofq2ypd
## 16982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/phvg5odese
## 16983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/piazpai70s
## 16984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pihbrc8ztt
## 16985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/piskkwjnqb
## 16986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/piulxqwgtz
## 16987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pjf7xkfxa4
## 16988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pjoysyjuwf
## 16989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pjqy6q8yue
## 16990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pjuwz8vygh
## 16991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pjwmfgbdty
## 16992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pjy4dgujqe
## 16993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pk4f66e2gz
## 16994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pkd99jdisq
## 16995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pkq5dbucsa
## 16996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/plblhcfyiw
## 16997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/plnfbdp0ie
## 16998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/plvyhrbuwo
## 16999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pmc24c3lfs
## 17000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pmofr7tjst
## 17001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pnffqebvhc
## 17002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pnmg9u5esk
## 17003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/po8lvjj6ul
## 17004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/poobxy6zot
## 17005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/potc6zzb7r
## 17006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/potona0nnb
## 17007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/poyhmr6k44
## 17008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pp2fkehuqx
## 17009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pp2tyzggmv
## 17010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pp9mlvmqqe
## 17011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ppafucz7kk
## 17012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ppjl8izik2
## 17013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pppnegmqw8
## 17014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pqgzo3ytvw
## 17015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pqkxinutxi
## 17016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pqoi840pjh
## 17017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pqsnmhoxc3
## 17018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/prgowb9o6y
## 17019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/psdeohjq4e
## 17020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/psfht4ppbb
## 17021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pshrew7cws
## 17022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/psinhz37xi
## 17023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/psmnnzhpal
## 17024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pt2xwry8ng
## 17025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pt6kyopysx
## 17026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pt7uazge9b
## 17027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pte2xehm63
## 17028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ptnqarryrr
## 17029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ptoh5eqv98
## 17030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ptx7qyaeeo
## 17031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pufjryot34
## 17032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/puloujnpox
## 17033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pusyukifmx
## 17034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/puzc0cbjgz
## 17035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pva94ycr1i
## 17036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pvdzyx5sao
## 17037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pvgdgzurye
## 17038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pvnwnhurhz
## 17039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pvwmswdrq2
## 17040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pwohxomg9e
## 17041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pwu40w0mqv
## 17042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pwwud7lrb7
## 17043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pwywcqbqor
## 17044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pxvxdkhvjy
## 17045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/py79xhhumw
## 17046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pydmlhstke
## 17047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pyuiewwptm
## 17048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/pzpzfxmsaz
## 17049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q0c2z7phoe
## 17050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q0lxc4zvvg
## 17051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q1hn69pvyg
## 17052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q1tv2evpap
## 17053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q29avesbkg
## 17054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q2on6tq1tj
## 17055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q3vywdaj6v
## 17056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q575g9ozxx
## 17057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q5disisnfk
## 17058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q707dcfixv
## 17059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q76aos5jea
## 17060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q7bqwhmwni
## 17061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q7kaprpxfd
## 17062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q7kpvq6ytc
## 17063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q89jqljboe
## 17064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q8gzzcouzj
## 17065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/q9dwvypxnn
## 17066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qa8jry8vtt
## 17067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qawrckaz1y
## 17068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qbimv95jik
## 17069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qbiuvckq6r
## 17070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qcet38dqur
## 17071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qdgpjktdkf
## 17072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qdpmpgo18b
## 17073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qefjiwktdu
## 17074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qeg8fowi8n
## 17075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qeklvktiwv
## 17076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qfl6k8rdm7
## 17077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qgtwdp5rxy
## 17078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qgufeku5w9
## 17079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qh15z4onzn
## 17080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qhhim7yylt
## 17081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qhq22jaqnh
## 17082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qhvpv0qw73
## 17083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qhvzlaij3z
## 17084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qhyfxujsv0
## 17085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qi751069r6
## 17086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qimz5h7okp
## 17087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qiwjj8u8mv
## 17088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qjhr9rwyre
## 17089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qjhtklbzl4
## 17090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qjtdv9ukml
## 17091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qjzscjawb8
## 17092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qk9zf5k2u1
## 17093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qkfclejfpo
## 17094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qkv0s9hxmd
## 17095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qlevhws5hg
## 17096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qlex4p94n2
## 17097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qlmsvpxvpo
## 17098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qlvoqjmlrq
## 17099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qlwwzf3wkk
## 17100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qmboianqzo
## 17101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qmepi21r6d
## 17102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qn7g2mb4ke
## 17103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qnpj12pj23
## 17104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qphzmy6htw
## 17105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qpjsmawj4t
## 17106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qppt8fjt20
## 17107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qr5mk7fkby
## 17108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qr6awwoo2o
## 17109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qrbhbgag3x
## 17110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qrm2mmjl8y
## 17111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qrmvuomk3f
## 17112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qrni7xhlva
## 17113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qro0nxwzqy
## 17114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qs0oqui4xy
## 17115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qs0uddl7wd
## 17116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qsdka4anzr
## 17117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qsw69jmbjj
## 17118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qtlfsb1dlk
## 17119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qtqdani3dl
## 17120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qtzzj2zb7u
## 17121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qudsm7i6uk
## 17122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/quogtjwzzx
## 17123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qv3sq0mlaa
## 17124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qvanuxbs9w
## 17125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qvftipkt9p
## 17126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qvpevl84o9
## 17127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qvsp6xvzp4
## 17128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qwhmwnfocd
## 17129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qxk2kt0nsf
## 17130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qxmxfstdn3
## 17131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qxntk8e42o
## 17132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qy6cvts9nc
## 17133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qy8tdzm3ql
## 17134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qyxcps1cz6
## 17135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qzogkxcppc
## 17136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/qzxk1b7pnx
## 17137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/r0m1pec5kp
## 17138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/r3ezksqsa0
## 17139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/r3fvnl66sz
## 17140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/r3t0q2euxi
## 17141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/r4crbtc4yu
## 17142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/r5g4r5b0wo
## 17143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/r5zfrfxgs3
## 17144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/r5zret8gru
## 17145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/r7s1wmd7hm
## 17146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/r9ci8jviay
## 17147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ra2iwpuzqb
## 17148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ratv2ck0ea
## 17149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ravbvu9pq6
## 17150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rb2ldnhzhp
## 17151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rbrss1zm0k
## 17152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rc10jsgr5i
## 17153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rcj5k1jiim
## 17154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rdbgnfpkup
## 17155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rehw0cwqmr
## 17156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/reogw0pcpz
## 17157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rf3upctign
## 17158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rfpanva11b
## 17159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rfuh0nbnzw
## 17160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rfyorpfxj7
## 17161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rfzgwowd5l
## 17162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rg1avmnwgu
## 17163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rgc4qfoeua
## 17164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rgnzpmkmts
## 17165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rgzzo4bnph
## 17166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rhc9bdahn7
## 17167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rhgjs6m97m
## 17168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ri1sfp15ox
## 17169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ridezwjsj1
## 17170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rjtbyeu2w8
## 17171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rkp1yp5mag
## 17172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rkujr05lqh
## 17173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rl9i38s6xv
## 17174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rm0eiidkpm
## 17175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rm6w7im70x
## 17176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rmbb2w0vmf
## 17177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rmjjtugxjx
## 17178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rmkjacfiiv
## 17179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rmlloonx1o
## 17180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rnt18jw7cx
## 17181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rohswheieu
## 17182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rovbzpzom8
## 17183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rpuxfa8bun
## 17184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rpxtposyy5
## 17185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rqgzptv3w4
## 17186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rr8bhyhb1c
## 17187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rri5ib0jbq
## 17188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rrk9ewppgc
## 17189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rrwp2jlvqt
## 17190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rrwubslxfk
## 17191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rsnvxdmgqh
## 17192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rth6uyawmb
## 17193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rua81d4krn
## 17194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rugi4gadoz
## 17195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ruthmszgir
## 17196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rvgdfnqbu9
## 17197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rvwzlsbj6k
## 17198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rvys4nwsqp
## 17199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rw6eakd8bl
## 17200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rwelrs52ll
## 17201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rwfnstpvxt
## 17202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rwgpdvuodo
## 17203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ryc4ljgw2z
## 17204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rymr14fu65
## 17205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rza2n2e1bm
## 17206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rzervsyrnl
## 17207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/rzztwjq3p8
## 17208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s1fowhqfpk
## 17209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s1fvkpvjfl
## 17210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s1hu5mwija
## 17211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s2tb3mycrz
## 17212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s3k3liouyo
## 17213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s3oet0sd4i
## 17214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s3u74ih3ah
## 17215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s42bz28fzc
## 17216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s4dxtruoje
## 17217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s4ekh0j81f
## 17218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s4wn3ewur8
## 17219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s5gabuybzy
## 17220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s6kho7mgue
## 17221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s781duszgo
## 17222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s7akxeti6l
## 17223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/s7qxknkw7s
## 17224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sau9bxxp75
## 17225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/say3asavmk
## 17226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sbb1cauak7
## 17227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sbdoswwvot
## 17228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sbjwbcivtb
## 17229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/scjmlerb3c
## 17230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/scjs7omub5
## 17231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sdgmqcyfuz
## 17232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sdhwlw9ezd
## 17233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sdmtkruqjx
## 17234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sdnbpjx5xm
## 17235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sdp4r6sard
## 17236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sdyvwg6cge
## 17237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sebxfzbv8w
## 17238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/semnac5k8b
## 17239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/setzghgeah
## 17240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sf3zjtsscb
## 17241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sfckovpwfe
## 17242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sg5ote7ieb
## 17243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sg7dr1of1h
## 17244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sgauzlapyz
## 17245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sgehe9c0ff
## 17246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sgfoubxs4o
## 17247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sgfslejzss
## 17248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sgpgjxbued
## 17249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sgsages35r
## 17250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/shnb2xwope
## 17251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/shtmvlb6l8
## 17252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/shzohge7s2
## 17253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/si2dh5jgvm
## 17254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/si2pdmzawz
## 17255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/siqwn84juq
## 17256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sjm0vyo8tr
## 17257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sk1pcqg7ld
## 17258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/skz9nkydna
## 17259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sl7vvjywan
## 17260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/slabmdhpjl
## 17261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sluzhr3pnq
## 17262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sm9n5td0eq
## 17263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/smq9qdzyjm
## 17264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/snjyavtulq
## 17265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sojk6ttnyq
## 17266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sorod62wuu
## 17267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/spclf44r3p
## 17268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/spe54yocyq
## 17269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/spmqwuasiy
## 17270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/spvhthwcgi
## 17271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/spwuntu9ww
## 17272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sqbfirg31v
## 17273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sqcpffikyq
## 17274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sqppjw9qyf
## 17275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/srcj1mou8r
## 17276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/srekwuuj9n
## 17277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/srtwetaqcd
## 17278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/srxq4gxdji
## 17279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/srzh2ircex
## 17280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ssuwuwvvl2
## 17281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sttqnrkbba
## 17282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sudnnjbrnt
## 17283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/suhiwwyv3u
## 17284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sv331t2p0u
## 17285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sv3keo2qxc
## 17286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/svi8g2vkp4
## 17287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/svjdsf1i9y
## 17288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/svq9qp43mq
## 17289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/svzwnaafyf
## 17290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/swc976sfsq
## 17291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/swirwwxgoe
## 17292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/swqrru7f8r
## 17293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/swygazdvc9
## 17294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/swyop3bsjp
## 17295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/sxahgotvmq
## 17296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/szccfmc78e
## 17297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t0c4mv3adt
## 17298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t0fxyisjz4
## 17299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t0t0batagx
## 17300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t11d850tyc
## 17301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t1mt8lt46g
## 17302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t1nvhg3uly
## 17303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t1tqwwdrdq
## 17304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t2bv2szjjr
## 17305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t2vscrvlcb
## 17306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t40srvblof
## 17307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t4azc8ykh7
## 17308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t4ed1hhf2f
## 17309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t4pmtbia4a
## 17310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t8q57drod9
## 17311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t9gunidcsp
## 17312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/t9ksq5avbg
## 17313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ta49ojlrkl
## 17314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tabpr6ol0e
## 17315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tait4xwhcd
## 17316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tbgjwid5qj
## 17317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tbtnfr4nsg
## 17318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tbyrjtmiee
## 17319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tc7dl8rfwv
## 17320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tcl2eeiz69
## 17321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tcprfr3b39
## 17322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tcru2bcstx
## 17323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tcrzt53w1l
## 17324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tczubjyjwz
## 17325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/td3rx8j2wt
## 17326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tdguahiwic
## 17327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tdnkibdmnf
## 17328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tf9v0psekd
## 17329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tfbv2e57kh
## 17330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tffftzxmdi
## 17331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tfj6pcrt4m
## 17332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tfnuxfjyn1
## 17333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tfrjpsl6xo
## 17334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tgbvt2vl8p
## 17335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tgrezxyzvl
## 17336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tgthmvxur6
## 17337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tgymrk6hdn
## 17338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/thhhxwadjg
## 17339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ti4nyiimja
## 17340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ti91sr7jzt
## 17341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tihhhirsft
## 17342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tikbylep8w
## 17343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/timtxngqbp
## 17344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tjcxiptdqi
## 17345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tjiya62ke0
## 17346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tk3jp62n2i
## 17347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tk88yylukf
## 17348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tljwxsuf3f
## 17349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tmd6lw7ihc
## 17350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tmeu6lj5tb
## 17351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tmklanjklv
## 17352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tn2c9sg45b
## 17353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tn4wfbct4q
## 17354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tne5ihn4l2
## 17355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tnjpv4ws3y
## 17356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tnpkklxyoo
## 17357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tntokxermt
## 17358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/to928gkybq
## 17359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           https://t.co/tofudkl2ns<u+0001f61e>
## 17360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tolg4qnfl1
## 17361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ton5blrk5m
## 17362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/top2nynuwn
## 17363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/top2nywk4p
## 17364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tos21wcnja
## 17365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tpr4nrtwx5
## 17366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tqjofyjqt1
## 17367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/treu78zgi7
## 17368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/trhhvsenrc
## 17369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/trjhaiy3qo
## 17370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tsc7qc9kuv
## 17371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tsduxqu9yw
## 17372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tslrgf7rv7
## 17373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tsrotkizgp
## 17374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tsstdposon
## 17375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tsw3nsaxqf
## 17376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tud49oes3z
## 17377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tuelf1jy5j
## 17378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tumcdd8es8
## 17379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tuqbkclsi4
## 17380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tuqk7xqrm3
## 17381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/turqy4eeeb
## 17382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tuvydah8yr
## 17383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tv75wwf5a0
## 17384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tw3x1qdbrw
## 17385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/twcgmjgb8d
## 17386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/twf2ic9vul
## 17387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/twi8h3tklv
## 17388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/twofa4vifm
## 17389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/twqc8gvygp
## 17390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/twrg26rwbj
## 17391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/txmyls4img
## 17392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/txotkvtchw
## 17393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/txrmxlc12j
## 17394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tz1gkulgmp
## 17395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tzbrqyurtb
## 17396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tzh7e3qmin
## 17397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tzifppr3xg
## 17398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tzjivydoot
## 17399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/tzt5snbhvu
## 17400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u0hnouiyk2
## 17401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u0plax7obg
## 17402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u2qomv6nxy
## 17403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u3ntcuspjo
## 17404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u3urakbrb9
## 17405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u4bvpmnugf
## 17406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u5uadynkoi
## 17407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u6csf3oxk6
## 17408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u6nieaepic
## 17409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u6qesnk1hi
## 17410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u6xa2oa7um
## 17411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u7jimqnpdi
## 17412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u84lvhvpnp
## 17413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u8b9idrx33
## 17414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u8pieiujj8
## 17415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u9bpmd2unq
## 17416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/u9gz2lb0pd
## 17417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uac3focajj
## 17418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uamgrsh6q3
## 17419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uauvkx7igr
## 17420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uc29wn9uja
## 17421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uccdckbkjc
## 17422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uckpgkaulj
## 17423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ucoxmnz0st
## 17424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ud7uup7j94
## 17425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ud8wjuahjx
## 17426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/udf70cio1w
## 17427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/udiroe47ld
## 17428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/udlbnpj5ky
## 17429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/udnnu5rl5e
## 17430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/udrgvzllnz
## 17431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uec5kjirc1
## 17432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uenjisqcd5
## 17433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uf6vb8bbvp
## 17434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ufejrufyhc
## 17435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ufgg88yf4x
## 17436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ugd2gldu71
## 17437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ugkyh3lxwp
## 17438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ugllavidyq
## 17439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ugndr0uc7h
## 17440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ugw84fmoq1
## 17441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ugyonzgfbx
## 17442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uhbxw7tdpv
## 17443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uhn9nlrfqe
## 17444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uiljliloca
## 17445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uj5hpoif8n
## 17446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ujlvre04xl
## 17447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ujm8hzwlhk
## 17448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ujn2aw43yd
## 17449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ukmbwiu18c
## 17450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ukvl2lo3xq
## 17451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ukypcvraer
## 17452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ulgofqjp5e
## 17453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ulkycrdmqj
## 17454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ulp0knma8d
## 17455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ulpzufur9v
## 17456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/um9ljoaop4
## 17457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/umhqpys3vj
## 17458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/umuhaq9aiv
## 17459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/una3bopkv4
## 17460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/unv0gfbvjr
## 17461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uobaqubs3y
## 17462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uobffb3yxn
## 17463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uouey8vg4u
## 17464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/up8qv0criu
## 17465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/upeewtf6y0
## 17466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/upfktxwqvt
## 17467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uqzzbmzzem
## 17468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ur49zhexls
## 17469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/urjrcvoiip
## 17470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/usjooqfiqt
## 17471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/utj470xwbp
## 17472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/utmibejtgj
## 17473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/utttjnhokq
## 17474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/utu8lwb6jx
## 17475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/utwzwk72wy
## 17476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uueoyov9jv
## 17477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uugxsf0vky
## 17478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uulhpixqh9
## 17479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uvlu15uaon
## 17480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uvqabw7sal
## 17481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uwkgjxsrf3
## 17482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uwts1daowf
## 17483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uxhsdzwzan
## 17484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uxsne2myqr
## 17485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uy8xm8do4i
## 17486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uzh3uakgv6
## 17487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uznhxjyvnt
## 17488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/uzqz2r5sab
## 17489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/v1do5c8pyn
## 17490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/v2folz2xae
## 17491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/v2zjzdagdl
## 17492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/v31tgnt1np
## 17493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/v3v9fbt2y4
## 17494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/v4u5cfjucz
## 17495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/v5yhlmrffp
## 17496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/v76srfqdtf
## 17497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/v8a7mpmeju
## 17498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/v9pmpbbknn
## 17499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/v9vocatlav
## 17500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/va5sbuz9d9
## 17501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/va5wgkydnq
## 17502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vaoy4sxwfu
## 17503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vartcctxcl
## 17504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vbixflwyuw
## 17505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vbjdevydao
## 17506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vbmyegat3s
## 17507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vckw5f6w2f
## 17508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vcuuyfgplo
## 17509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vdpf2lneoe
## 17510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vdv7tv7trj
## 17511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ve0yvmegag
## 17512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vebv8gysrx
## 17513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/veke3fgjqo
## 17514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vem81x5vgv
## 17515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vexoljxrtt
## 17516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vfh9uowtu1
## 17517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vfpfhca6wj
## 17518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vfriiyi3ts
## 17519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vgpwjdqztd
## 17520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vgql6vb6ts
## 17521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vgrc9u7tgs
## 17522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vjfdgd06it
## 17523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vktzzxwhdt
## 17524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vkwyn0jweh
## 17525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vlqaktojvf
## 17526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vlu77hgfkv
## 17527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vml6jmm0zl
## 17528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vmre21ktot
## 17529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vmznksdbzm
## 17530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vngml1ajce
## 17531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/voeludy3na
## 17532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vooujz8yxf
## 17533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vorkdyq6bq
## 17534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vpaktvdlcs
## 17535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vphydaoeaj
## 17536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vpkdrnqmpb
## 17537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vq7tqvnnrw
## 17538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vqrvrj7ei1
## 17539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vrcy5fvgg0
## 17540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vrsjsechpf
## 17541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vs5mc8nwlo
## 17542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vs7jmslgka
## 17543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vsqap1bd8b
## 17544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vsytnmhuum
## 17545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vumcxcvlfs
## 17546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vumexvknjm
## 17547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vupvryx7dp
## 17548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vutlbtubue
## 17549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vuwpafbkkp
## 17550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vv6iwcjrr5
## 17551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vves71oemr
## 17552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vwehfqwzwg
## 17553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vwf8q19hvo
## 17554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vwkca6qcth
## 17555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vwoazcvgbm
## 17556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vwxwdhdsmn
## 17557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vxcpg4ckr8
## 17558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vxkce1c0gy
## 17559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vych6jtcwl
## 17560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vykqmqyavh
## 17561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vyl5k3rm4q
## 17562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/vzhaq5qmng
## 17563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w0hpjtjc8p
## 17564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w0ssrhymwr
## 17565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w1dim4a1cy
## 17566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w28ojbfqcl
## 17567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w2bnys1oxz
## 17568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w2lzoqsgon
## 17569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w2mtkowqff
## 17570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w3fnuexfyz
## 17571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w4jqnd49zx
## 17572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w4tp2mrt6n
## 17573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w5z0q1wprh
## 17574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w71blpj6ch
## 17575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w76pwngcer
## 17576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w785sanbzq
## 17577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/w9nywfmldn
## 17578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wawihczrnd
## 17579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wc7ziguvwr
## 17580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wchnaaqayf
## 17581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wcrqcph8vs
## 17582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wdmrko2ivs
## 17583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wdoih7kcsy
## 17584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wfz23ulr8s
## 17585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wgh5heeitu
## 17586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wh1wcnhtyh
## 17587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wh3tpqmrwd
## 17588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/whqg5eboxx
## 17589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wi8tnvo8ut
## 17590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wian4b8elp
## 17591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wiqsgc0ahg
## 17592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wiskwhwrjh
## 17593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wjqwwnixvt
## 17594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wjrju4k7jk
## 17595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wjs0gihnxg
## 17596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wjtavluaws
## 17597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wkfskq3vnw
## 17598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wljtv7mr5b
## 17599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wmatamcvxr
## 17600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wmdzvkmunq
## 17601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wmessuv8lv
## 17602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wmjsj9z6b2
## 17603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wogg5d7lm5
## 17604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wppuzm58lc
## 17605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wptwb7qltj
## 17606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wpxp2zokhp
## 17607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wq26rknflw
## 17608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wqvpk3ajpp
## 17609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wqzsgo4oea
## 17610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wr6y72cswj
## 17611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wrg4slxhzk
## 17612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wsapiwj2it
## 17613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wsxf5wngcb
## 17614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wt57l36ikl
## 17615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wtau9otmwm
## 17616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wtdpztkc6n
## 17617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wuhfjjevxu
## 17618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wumhfyaobn
## 17619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wutvkeosrf
## 17620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wvehwtlhan
## 17621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wvznrenwnq
## 17622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wwnbp0pbhd
## 17623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wwudzvfw6o
## 17624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wxbiqoee9v
## 17625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wxlhwwviyg
## 17626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wxtsuxg1vo
## 17627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wxwzkgjxzl
## 17628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wydymb76g5
## 17629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wyniojsafh
## 17630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wyu9tcj1cp
## 17631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wz2u6vyszn
## 17632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wz92ggqxge
## 17633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wzp0qeklbi
## 17634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/wzv2j9roh1
## 17635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/x27dmabzsz.
## 17636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/x4hhrtzszu
## 17637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/x4lh8tsocs
## 17638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/x5ddr6spws
## 17639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/x6ezd3ghft
## 17640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/x7wzmoutcy
## 17641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/x9x6loy1qb
## 17642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xabciprxmq
## 17643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xajhspfbgy
## 17644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xam1qlq5r6
## 17645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xapt1wr7oq
## 17646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xaqnydfrne
## 17647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xaydjdkbnz
## 17648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xcef7yjsfx
## 17649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xcfk3p0tpp
## 17650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xcgho39w1j
## 17651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xczpuas5vp
## 17652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xd2k8texav
## 17653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xdgtbvr0a8
## 17654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xdkiegubmp
## 17655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xea7rnth0q
## 17656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xeb4llyzrz
## 17657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xfbzecoilf
## 17658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xfi70bcs62
## 17659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xg4o0c1pmk
## 17660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xgjtlimtta
## 17661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xgtuafeiy7
## 17662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xh0p65psn4
## 17663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xhobbae28r
## 17664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xhy0qq6bs0
## 17665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xie3rbaify
## 17666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xk84ods8ws
## 17667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xkqw7cy66u
## 17668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xksrbebwca
## 17669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xkumkgr3cf
## 17670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xlib3gvrbs
## 17671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xls4q63cvq
## 17672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xlyzpctyxd
## 17673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xmps5esaf3
## 17674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xmsfnbaqlq
## 17675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xndgdamoht
## 17676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xnpyc5ezet
## 17677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xodyt2mhkf
## 17678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xoqdyzjley
## 17679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xoyvbbgqxn
## 17680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xpfkuh7pxy
## 17681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xpkhux05xf
## 17682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xpkleellr4
## 17683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xpwoispvvj
## 17684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xqila77qri
## 17685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xqkyirlj3k
## 17686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xqrbf1enjr
## 17687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xr2hfazbok
## 17688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/xrgdlynyac�
## 17689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xrsdl8d19m
## 17690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xsd5mpojyc
## 17691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xsqiv7i5sj
## 17692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xsqwedmqyy
## 17693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xt74rqp6lv
## 17694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xtbngt12wq
## 17695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xtdf4pa6ci
## 17696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xu2c3bgi65
## 17697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xuizxdo1dd
## 17698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xulotdyt5w
## 17699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xuqnvriuqn
## 17700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xusymveae5
## 17701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xuunjlz8i2
## 17702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xuwm2tdil6
## 17703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xw08inmrti
## 17704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xw9yceczcq
## 17705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xwe9ybh1d3
## 17706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xwx9grdxeu
## 17707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xx1o8exnhf
## 17708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xxct6yayoq
## 17709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xxjpiaxtlw
## 17710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xxmapbxyds
## 17711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xxrgrwygm6
## 17712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xyhfu7flw3
## 17713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xyk9azogrm
## 17714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xylhrupmfl
## 17715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xylodwhu4g
## 17716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xyqxt10xue
## 17717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xzhwbeau1g
## 17718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xznng4kszh
## 17719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xzovupn590
## 17720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xzxocckf1h
## 17721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      https://t.co/xzylyl4egq)
## 17722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/xzz6gxs8jy
## 17723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y0czx7sufz
## 17724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y18ck8c4td
## 17725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y1gcprtptb
## 17726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y1qlrmymat
## 17727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y1xn1cvshv
## 17728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y1ycbxdqnj
## 17729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y2xiecmzba
## 17730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y3zsbz78dn
## 17731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y4xq8atvty
## 17732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y4yb7snpww
## 17733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y5bdulothf
## 17734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y5nxoj1z0j
## 17735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y65hrael7v
## 17736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y6gbhcwoym
## 17737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y6prcsahbu
## 17738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y7pexr5c4y
## 17739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y83goqlpau
## 17740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y87dkglsbv
## 17741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y9eokcjtdh
## 17742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/y9ppt9tm3h
## 17743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yaltalhss2
## 17744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yayp3p89do
## 17745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yazp0wwpuj
## 17746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ybl7emsnwz
## 17747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ybxdbv2po3
## 17748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ycae2snn0s
## 17749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ycjrbqwfkj
## 17750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ycpblwionx
## 17751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yd2aupydix
## 17752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ydbamxewcu
## 17753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ydlcatha2t
## 17754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ye16xobywt
## 17755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yebajvgpze
## 17756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yegrxe9org
## 17757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yewczy8txa
## 17758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yezimxkoih
## 17759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yfd1po4boz
## 17760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yfwjmnfi1m
## 17761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yfxbn4jwe3
## 17762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yg5xkptoav
## 17763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ygahje7ijx
## 17764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yge1p9jerk
## 17765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yha3hwqy52
## 17766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yie12yxcvx
## 17767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yietwf2y6f
## 17768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yive4fbmnk
## 17769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yj07wpuf1m
## 17770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yj1utflzdb
## 17771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yjlk4hpjwe
## 17772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yjloxytn6c
## 17773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yk1ojcn3qx
## 17774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yk9wepb3js
## 17775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yklrdlciu0
## 17776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yl8msabluc
## 17777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yldgto7dti
## 17778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ylir04aoiv
## 17779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ylysawghfq
## 17780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ym2heyoenw
## 17781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ymcyeylqwb
## 17782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ymhjolkebo
## 17783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ymijwh5rz7
## 17784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ymnywvcuk2
## 17785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ymrjhbmsz2
## 17786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yn2dxshxcn
## 17787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ynaatds6oj
## 17788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yncubgxrdh
## 17789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yndgtau45m
## 17790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yngumpawwh
## 17791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yno8f51ojk
## 17792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ynocomyoax
## 17793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yojeyigc0c
## 17794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ypaneayorq
## 17795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ypmoeqmugk
## 17796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ypqxnjflna
## 17797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yqh24i8ylw
## 17798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yqjdg3msfv
## 17799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yqmrlfnxuf
## 17800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yr1fhetpfk
## 17801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yrkz7enhk6
## 17802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yrkzn8gz57
## 17803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yrmiyiheah
## 17804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ysaklmicl1
## 17805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ysfx8ukooj
## 17806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ysrslbzsli
## 17807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ysuwnhj3ka
## 17808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yu4m6bryb8
## 17809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yubcftcdmp
## 17810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yugdc9cui8
## 17811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yuzxb8eild
## 17812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yvia3jadmt
## 17813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yvt1mda7f5
## 17814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yw5vliwkhi
## 17815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ywjknfuidy
## 17816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ywjryedtrb
## 17817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yxbqrc5xja
## 17818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yxl4jsdqt5
## 17819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yxlyhtwotf
## 17820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yxophwno4m
## 17821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yxwp9g3dec
## 17822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yy0tizzhgx
## 17823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yydu27ptag
## 17824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yyhqrmghhc
## 17825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yysywgtutq
## 17826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yywh3j9gad
## 17827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yzjr32ibbt
## 17828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yzmabxljtp
## 17829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yztow2irgs
## 17830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/yzzwiuvcbo
## 17831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/z0jmix2nwd
## 17832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/z2hlswcchw
## 17833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/z2lxmqviue
## 17834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/z2psolihsr
## 17835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/z3zb0czaxw
## 17836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/z4qzatcdmt
## 17837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/z4tp4vylai
## 17838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/z4xzrvsvx7
## 17839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/z6kwuptlge
## 17840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/z7vv86wmkf
## 17841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/z8hjd2embn
## 17842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zagcrqe8v8
## 17843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zan1yz1ydv
## 17844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zayl8uglib
## 17845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zbcrziz0qg
## 17846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zblidiaa3j
## 17847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zblwfypld8
## 17848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zbnkri8cns
## 17849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zbvc7nwyej
## 17850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zclr1vuzb3
## 17851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zcmwy0j6i0
## 17852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zcq4sjl5qb
## 17853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zcupjr7mcl
## 17854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zdeoi4rftj
## 17855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zdlxa5sas2
## 17856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zdowm5a39a
## 17857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zdqyufamzp
## 17858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zepmu0trwj
## 17859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zer2arcvb8
## 17860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zfcigfhwfm
## 17861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zfvcheswp2
## 17862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zfvi8qeaca
## 17863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zgnqrw6tye
## 17864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zgqbkr2svv
## 17865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zgqspv10bb
## 17866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zhaawz0kzh
## 17867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zhoqaxnsyk
## 17868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zieiiut9gg
## 17869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zikkskeeny
## 17870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ziop7vfb9o
## 17871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zit5av911l
## 17872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ziukuxihih
## 17873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zjxzwqvf0h
## 17874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zktvlkf5um
## 17875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zlcaznsvjj
## 17876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zlr4pmxsvo
## 17877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zma2kft8n7
## 17878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/znamxe1gkx
## 17879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/znnkybhmug
## 17880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zo2ycs4ztl
## 17881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zpicyyqsvy
## 17882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zptcnpsjn6
## 17883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zpyh8vis7r
## 17884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zqovhorgf3
## 17885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zqygj6sgv6
## 17886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zqyw99sp0p
## 17887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zrpndpizfy
## 17888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zrww3cvkqk
## 17889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zsegy5safj
## 17890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zsjdm3y50i
## 17891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zsv36c2fsx
## 17892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zsyitzmtgx
## 17893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zt6nd22pd8
## 17894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/ztsjsfupni
## 17895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zu8f8ciioz
## 17896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zuhfclvlus
## 17897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zv2eseipn4
## 17898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zv94nzut7k
## 17899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zvbltdgfrb
## 17900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zvdouoph6p
## 17901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zvelwwng4g
## 17902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zvjpfc7rrt
## 17903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zwdwuekayf
## 17904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zwrc3qj5po
## 17905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zx0fs2bvfp
## 17906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zxmstdnho8
## 17907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zy0ozsgcq8
## 17908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zy61esqjdk
## 17909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zz4m6romat
## 17910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       https://t.co/zzs5ewiryu
## 17911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            httpstco3kud3jnyx7
## 17912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            httpstcoc21yfo9sr7
## 17913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            httpstcorrwubslxfk
## 17914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            httpstcouyledji7qb
## 17915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hues
## 17916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       huffman
## 17917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hugh
## 17918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hugs
## 17919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         huish
## 17920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hukum
## 17921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hulshof
## 17922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           hum
## 17923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       humains
## 17924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   humanitaire
## 17925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        humans
## 17926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     humidity�
## 17927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hunch
## 17928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hundred�s
## 17929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hungary
## 17930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hunger
## 17931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hunters
## 17932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       hurac�n
## 17933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hurdle
## 17934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          hurt
## 17935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         hurts
## 17936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        hybrid
## 17937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     hyderabad
## 17938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    hygienethe
## 17939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  hypertension
## 17940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       h�bitos
## 17941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          h�te
## 17942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ia
## 17943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           iag
## 17944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          iata
## 17945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          iccc
## 17946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ich
## 17947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ida�
## 17948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    identifies
## 17949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ideology
## 17950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           idf
## 17951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ifa
## 17952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ifb
## 17953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           iii
## 17954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ikpeazu
## 17955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      illfated
## 17956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  illustration
## 17957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    illustrent
## 17958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ilo
## 17959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ilusionen
## 17960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        images
## 17961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       imagina
## 17962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      imaginez
## 17963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        imapct
## 17964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       imbecil
## 17965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          imho
## 17966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     immigrant
## 17967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    immunityis
## 17968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           imo
## 17969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     impacting
## 17970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        impala
## 17971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    imperative
## 17972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      imperial
## 17973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      implicit
## 17974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        import
## 17975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   importance�
## 17976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    importante
## 17977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       importe
## 17978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     imposable
## 17979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      imposing
## 17980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  impoverished
## 17981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    impression
## 17982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      improved
## 17983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   improvement
## 17984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     improvise
## 17985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    inadequate
## 17986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inaugural
## 17987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  incarcerated
## 17988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 incarceration
## 17989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        inches
## 17990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     incidence
## 17991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    incidences
## 17992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      incident
## 17993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          incl
## 17994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inclined
## 17995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inclusive
## 17996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    incluyendo
## 17997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        income
## 17998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  incompetence
## 17999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   incompetent
## 18000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  incomp�tence
## 18001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 inconvenience
## 18002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   incorporate
## 18003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     increases
## 18004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  increasingly
## 18005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        incredible<u+0001fa7a>
## 18006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    incubation
## 18007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      incurred
## 18008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    indefinite
## 18009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     indelible
## 18010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    indemnit�s
## 18011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   independent
## 18012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        indian
## 18013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       india�s
## 18014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       indices
## 18015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        indigo
## 18016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    indirectly
## 18017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           individualsfamilies
## 18018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   individuels
## 18019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    indocanada
## 18020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   indon�siens
## 18021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       indoors
## 18022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  indorebased�
## 18023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        inept�
## 18024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  inequalities
## 18025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    inevitable
## 18026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    inevitably
## 18027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        infect
## 18028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              infectioncontrol
## 18029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 infectionsand
## 18030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inferior
## 18031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   infertility
## 18032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     infestado
## 18033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       infinie
## 18034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  inflammatory
## 18035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    influencer
## 18036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     influenza
## 18037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   infographic
## 18038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        infohttpstcobljhb2qxef
## 18039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        inform
## 18040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     informado
## 18041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            informationdeficit
## 18042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   informative
## 18043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     informing
## 18044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       inform�
## 18045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         infra
## 18046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               infrastructures
## 18047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inhaling
## 18048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inherent
## 18049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inhibitor
## 18050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        inhome
## 18051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inhumaine
## 18052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inhumane
## 18053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       initial
## 18054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     initially
## 18055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           initiatives<u+2063>
## 18056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     injecting
## 18057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    injunction
## 18058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      injuries
## 18059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     injustice
## 18060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ink
## 18061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        inmate
## 18062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 innefficiency
## 18063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     innovated
## 18064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   innovations
## 18065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inondations
## 18066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         inout
## 18067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inperson
## 18068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       inquire
## 18069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inquiries
## 18070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inqui�te
## 18071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        insane
## 18072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      insanity
## 18073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inscrire
## 18074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      insecure
## 18075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    insensible
## 18076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    insightful
## 18077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      insights
## 18078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inspections
## 18079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   inspiration
## 18080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  installation
## 18081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 installations
## 18082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      installs
## 18083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      instance
## 18084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     instances
## 18085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     instantly
## 18086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 instinctively
## 18087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             institutionalised
## 18088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       instore
## 18089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      insuring
## 18090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        intact
## 18091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      integral
## 18092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         intel
## 18093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   intelektual
## 18094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               intellectuelles
## 18095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   intelligent
## 18096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     intensive
## 18097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        intent
## 18098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      interact
## 18099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  interactions
## 18100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   interactive
## 18101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     intercare
## 18102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 intercommunal
## 18103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   intercourse
## 18104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     interdire
## 18105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     interdite
## 18106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    interferon
## 18107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       interim
## 18108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      interior
## 18109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  intermission
## 18110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               internationales
## 18111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  interpreters
## 18112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 interpreters�
## 18113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               interprovincial
## 18114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                intersectional
## 18115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                intervenciones
## 18116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 interventions
## 18117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              inter�nacionales
## 18118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      intimate
## 18119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   intolerable
## 18120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         intro
## 18121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    introduces
## 18122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   introducing
## 18123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   introverted
## 18124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      int�gral
## 18125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  int�ressante
## 18126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    invaluable
## 18127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      invasion
## 18128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     inventory
## 18129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      invested
## 18130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   investigate
## 18131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  investigator
## 18132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 investigators
## 18133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  investissons
## 18134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   investments
## 18135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    invisibles
## 18136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    invisible�
## 18137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      invitant
## 18138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    invitation
## 18139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      inviting
## 18140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   involvement
## 18141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  invulnerable
## 18142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           iom
## 18143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ios
## 18144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ipac
## 18145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ipsos
## 18146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          irak
## 18147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ircc
## 18148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 irelanddublin
## 18149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          irfu
## 18150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          iron
## 18151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   irradiation
## 18152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 irresponsable
## 18153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    irreverent
## 18154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         isaac
## 18155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     islandthe
## 18156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       island�
## 18157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         isnew
## 18158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       israeli
## 18159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          issa
## 18160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       issued�
## 18161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       issues�
## 18162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ist
## 18163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       isthmus
## 18164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       italian
## 18165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       italien
## 18166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          item
## 18167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         items
## 18168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       itself�
## 18169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ivermectin
## 18170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ivesons
## 18171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       izazovu
## 18172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            i�
## 18173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jacinda
## 18174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jackson
## 18175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      jacynthe
## 18176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jai
## 18177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jail
## 18178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jamaica
## 18179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jamais
## 18180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    jambusters
## 18181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jamie
## 18182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jan
## 18183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jane
## 18184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         janis
## 18185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jannah
## 18186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       janvier
## 18187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jardins
## 18188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jasons
## 18189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jdq
## 18190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    jeffbbaker
## 18191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jen
## 18192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jenn
## 18193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jenny
## 18194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jeremy
## 18195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jersey
## 18196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jesp�re
## 18197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jessica
## 18198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jetzt
## 18199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jewel
## 18200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jewell
## 18201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     jewellery
## 18202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            jg
## 18203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ji
## 18204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jill
## 18205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jim
## 18206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jinping
## 18207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            jk
## 18208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                jk<u+0001f637>
## 18209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            jo
## 18210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          joan
## 18211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      jobless�
## 18212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  johannesburg
## 18213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       joining
## 18214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         joint
## 18215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jokes
## 18216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        joking
## 18217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jon
## 18218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jongle
## 18219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jorge
## 18220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           jos
## 18221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        joseph
## 18222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jounen
## 18223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   journaliste
## 18224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      journals
## 18225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       journ�e
## 18226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           joy
## 18227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        judges
## 18228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      judgment
## 18229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     jugadores
## 18230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          juge
## 18231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        jugent
## 18232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         julia
## 18233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jump
## 18234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jumping
## 18235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         jumps
## 18236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     jun112020
## 18237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          junk
## 18238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        junkie
## 18239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          jun�
## 18240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 jurisdictions
## 18241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      jusquici
## 18242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     jusqu�ici
## 18243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       jusqu��
## 18244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         juste
## 18245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        justes
## 18246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     justifier
## 18247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     justifi�e
## 18248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       justine
## 18249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        j�sais
## 18250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kaduna
## 18251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kakani
## 18252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  kaleidoscope
## 18253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kamala
## 18254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       karen19
## 18255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       karen�s
## 18256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kargil
## 18257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         karin
## 18258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kashmir
## 18259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      kathleen
## 18260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       katrina
## 18261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kay�
## 18262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ke
## 18263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         keane
## 18264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kearney
## 18265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                keeleybarnable
## 18266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           keg
## 18267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kehlata
## 18268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        keiran
## 18269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      kekayaan
## 18270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kelly
## 18271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  kemampuannya
## 18272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kembali
## 18273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    kempenfelt
## 18274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kenney
## 18275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      kentucky
## 18276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kenyans
## 18277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      kenyans�
## 18278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kerry
## 18279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kevin
## 18280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      keystone
## 18281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        khalid
## 18282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   khanstarrer
## 18283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        khan�s
## 18284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kicked
## 18285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kiddo
## 18286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kildare
## 18287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       killers
## 18288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      killings
## 18289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kim
## 18290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kin
## 18291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 kindergartens
## 18292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      kindness
## 18293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kinds
## 18294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kingdom
## 18295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     kingpondethronerecordz416
## 18296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      kinshasa
## 18297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kinsmen
## 18298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     kissenger
## 18299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kit
## 18300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             kitchenerwaterloo
## 18301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kits�
## 18302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kitting
## 18303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kitty
## 18304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kiwi
## 18305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kiwis
## 18306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    kleingburg
## 18307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            km
## 18308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          knee
## 18309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    kneecapped
## 18310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         knees
## 18311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        knight
## 18312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       knights
## 18313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         knope
## 18314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       knowing
## 18315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     knowledge
## 18316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   know�esther
## 18317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      kobinger
## 18318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      komsumuz
## 18319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  konfimedelma
## 18320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       kongers
## 18321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kontrollkommisjonene
## 18322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       koolaid
## 18323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              korchinskipaquet
## 18324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       korean�
## 18325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        korona
## 18326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kovacs
## 18327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      kowalski
## 18328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         krass
## 18329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ktn
## 18330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      kurasawa
## 18331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            kw
## 18332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          kwph
## 18333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           kya
## 18334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        kyla�s
## 18335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         kyles
## 18336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           k�m
## 18337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   laboratoire
## 18338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    laboratory
## 18339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            laboratorytopublic
## 18340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          labs
## 18341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                labs�processed
## 18342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  lachalandage
## 18343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lacra
## 18344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ladministration
## 18345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ladronismos
## 18346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    laferri�re
## 18347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lafp
## 18348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lagos
## 18349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lags
## 18350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lair
## 18351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        laisse
## 18352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lake�
## 18353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lakh
## 18354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lakou
## 18355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     lanalogie
## 18356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     lancaster
## 18357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lance
## 18358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lanc�
## 18359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              land<u+0001f447>
## 18360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      landings
## 18361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      landmark
## 18362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lane
## 18363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     languages
## 18364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       langues
## 18365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lanka
## 18366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lann�e
## 18367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         laois
## 18368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   lapparition
## 18369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lara
## 18370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    largescale
## 18371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       largest
## 18372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      larticle
## 18373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lasagna
## 18374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lasalle
## 18375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lashbossto
## 18376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lashing
## 18377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        latina
## 18378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      latitude
## 18379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        laughs
## 18380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       laurier
## 18381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    laustralie
## 18382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lautomne
## 18383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         laval
## 18384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lavarini
## 18385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lavender
## 18386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lavent
## 18387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lav�
## 18388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lawrence
## 18389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lawsuit
## 18390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lay
## 18391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        layoff
## 18392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       layoffs
## 18393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lazarovrollingnewsie
## 18394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    la�covid19
## 18395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              lcbogallivanting
## 18396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lead�
## 18397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     learnings
## 18398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           led
## 18399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          led�
## 18400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lee
## 18401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       legally
## 18402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        legend
## 18403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       leger�s
## 18404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     legislate
## 18405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   legislation
## 18406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   legislators
## 18407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   legislature
## 18408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    legitimate
## 18409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       leisure
## 18410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lemieux
## 18411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lemonade
## 18412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lemons
## 18413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lemploi
## 18414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lend
## 18415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lengthy
## 18416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lennox
## 18417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   lentreprise
## 18418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lenvers
## 18419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leonardo
## 18420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lepore
## 18421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lequel
## 18422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lesquelles
## 18423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lesser
## 18424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lesson
## 18425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     lessonbut
## 18426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lethbridge
## 18427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            lethbridgemedicine
## 18428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lethnicit�
## 18429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       letters
## 18430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    leug�nisme
## 18431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lever
## 18432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      leverage
## 18433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      levesque
## 18434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lev�
## 18435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lewis
## 18436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lex
## 18437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ley
## 18438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        le�ons
## 18439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lgbt
## 18440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lgbts
## 18441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lheure
## 18442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lhsc
## 18443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lhypoth�se
## 18444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lh�pital
## 18445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            li
## 18446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   liabilities
## 18447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     liability
## 18448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         libby
## 18449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      liberate
## 18450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       liberty
## 18451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       libert�
## 18452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         libya
## 18453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lice
## 18454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     licencier
## 18455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lied
## 18456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   lieutenants
## 18457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lie�
## 18458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               lifethreatening
## 18459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lifetime
## 18460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          liga
## 18461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     lightened
## 18462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ligne
## 18463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lignes
## 18464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ligue
## 18465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         likes
## 18466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lil
## 18467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lilac
## 18468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lily
## 18469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    limbedelma
## 18470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         limes
## 18471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   limitations
## 18472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       limiter
## 18473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      limiting
## 18474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        limits
## 18475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      limit�es
## 18476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       limpiar
## 18477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   limpiaremos
## 18478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lin
## 18479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lindsay
## 18480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lindustrie
## 18481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lined
## 18482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lineups
## 18483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    linfection
## 18484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  linformation
## 18485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lipoid
## 18486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lipscomb
## 18487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        liquor
## 18488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lisacambridgechambercom
## 18489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         listed<u+0001f4cd>198
## 18490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        listes
## 18491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lists
## 18492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       literal
## 18493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lits
## 18494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      littleno
## 18495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       livable
## 18496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              live<u+0001f49a>
## 18497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lived
## 18498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lively
## 18499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         liver
## 18500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     livestock
## 18501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    livestream
## 18502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  livetweeting
## 18503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        livres
## 18504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    llegaremos
## 18505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         llego
## 18506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        llevar
## 18507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lleve
## 18508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         llevo
## 18509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                lloydminster�s
## 18510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lmao
## 18511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lnjp
## 18512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         loans
## 18513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     lobbyists
## 18514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lobster
## 18515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       locally
## 18516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               locallyproduced
## 18517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     location�
## 18518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                lockdownsocial
## 18519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          loco
## 18520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       locusts
## 18521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lodge
## 18522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           log
## 18523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         logic
## 18524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           loh
## 18525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           loi
## 18526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          loin
## 18527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lois
## 18528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     loitering
## 18529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          loma
## 18530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   longlasting
## 18531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        longos
## 18532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           longprairiepharmacy
## 18533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        longue
## 18534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lontario
## 18535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lonu
## 18536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          loom
## 18537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       looters
## 18538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         loree
## 18539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lorraine
## 18540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    lorsquelle
## 18541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  lorsqu�elles
## 18542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         loses
## 18543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       losing�
## 18544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              lottiesskateshop
## 18545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        louise
## 18546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lounge
## 18547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lourdeur
## 18548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lover
## 18549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lovers
## 18550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         loves
## 18551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        loving
## 18552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      lowering
## 18553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     lowincome
## 18554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lowlife
## 18555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lowpay
## 18556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lowtech
## 18557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lpbo
## 18558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lubec
## 18559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        lucena
## 18560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        luchar
## 18561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       luckily
## 18562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lucy
## 18563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           lui
## 18564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          luis
## 18565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     lunchtime
## 18566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lunn
## 18567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          lure
## 18568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lurks
## 18569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           luv
## 18570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lynch
## 18571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       lyrical
## 18572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         lysol
## 18573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            l�
## 18574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           l�a
## 18575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       l�acc�s
## 18576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   l�adversit�
## 18577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     l�alg�rie
## 18578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           l�approvisionnement
## 18579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        l�aube
## 18580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       l�autre
## 18581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       l�avoir
## 18582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      l�chelle
## 18583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         l�der
## 18584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    l�dessus��
## 18585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     l�endroit
## 18586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     l�extr�me
## 18587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       l�heure
## 18588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          l�hydroxychloroquine
## 18589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     l�h�pital
## 18590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                l�interdiction
## 18591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     l�lection
## 18592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    l�objectif
## 18593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         l�ong
## 18594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       l�ordre
## 18595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    l�picentre
## 18596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         l�tat
## 18597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      l�thique
## 18598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          l�t�
## 18599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  l�ventualit�
## 18600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    l�volution
## 18601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   l��picentre
## 18602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    l��pid�mie
## 18603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   l��radiquer
## 18604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          m40i
## 18605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ma
## 18606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    macgabhann
## 18607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        machar
## 18608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       machine
## 18609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      machines
## 18610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mad
## 18611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       madness
## 18612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 madridbarajas
## 18613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         magic
## 18614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   magistrate�
## 18615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     magnified
## 18616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     magnitude
## 18617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 maharashtra�s
## 18618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mahers
## 18619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mailing
## 18620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mains
## 18621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mainstream
## 18622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    maintained
## 18623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   maintaining
## 18624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   maintenant�
## 18625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      maintenu
## 18626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     majonchos
## 18627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  majoritaires
## 18628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        makati
## 18629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          maki
## 18630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       making�
## 18631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mal
## 18632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               malheureusement
## 18633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mall
## 18634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mallnlpoli
## 18635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        malone
## 18636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         malos
## 18637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    malparidos
## 18638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mal�z
## 18639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               man<u+0001f62d>
## 18640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       manager
## 18641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      managers
## 18642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     managment
## 18643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mancini
## 18644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mandate
## 18645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mandhro
## 18646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       manejar
## 18647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    manfaatkan
## 18648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mani
## 18649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  manipulating
## 18650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  manipulation
## 18651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    manitobans
## 18652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         manos
## 18653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       manquez
## 18654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         manto
## 18655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        manual
## 18656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 manufacturers
## 18657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 maoritargeted
## 18658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      marathon
## 18659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          marc
## 18660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        marche
## 18661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       marches
## 18662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         marco
## 18663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mardan
## 18664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         marea
## 18665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mareneros
## 18666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   marginalize
## 18667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    marguerite
## 18668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mari
## 18669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mariacianu
## 18670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mariae296
## 18671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mariages
## 18672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         marie
## 18673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     marieanne
## 18674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      marienne
## 18675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       marilyn
## 18676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      maritime
## 18677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      marketed
## 18678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     marketing
## 18679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             marketingbranding
## 18680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       market�
## 18681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      marriage
## 18682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       married
## 18683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     marsavril
## 18684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         marsh
## 18685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mart
## 18686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      marybeth
## 18687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mascot
## 18688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        masiva
## 18689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       masking
## 18690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       masklet
## 18691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       maskswe
## 18692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mask�
## 18693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       masqu�s
## 18694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        massif
## 18695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        master
## 18696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mat
## 18697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mater
## 18698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      material
## 18699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     materials
## 18700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      maternal
## 18701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mati�re
## 18702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       matraca
## 18703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mats
## 18704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       matters
## 18705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mauvais
## 18706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           max
## 18707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       maximum
## 18708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      maxville
## 18709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mayfield
## 18710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      maynooth
## 18711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mayor�s
## 18712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       maythis
## 18713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mcconkey
## 18714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mcdonnel
## 18715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mcdonnell
## 18716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mchugh
## 18717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mcintyre
## 18718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mcmillan
## 18719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mcwhinney
## 18720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            md
## 18721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               me<u+0001f449><u+0001f3ff>there
## 18722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       meadows
## 18723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    meaningful
## 18724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meanwe
## 18725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           measlesmumpsrubella
## 18726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       measley
## 18727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      measured
## 18728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         meath
## 18729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mechanism
## 18730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      medecine
## 18731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        media�
## 18732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         medic
## 18733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  medicamentos
## 18734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       medidas
## 18735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        medium
## 18736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     medlemmer
## 18737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          meds
## 18738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      meeting�
## 18739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   meeting�may
## 18740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         meets
## 18741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     meilleurs
## 18742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       melihat
## 18743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       melinda
## 18744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       melissa
## 18745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     membertou
## 18746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      membrane
## 18747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        membre
## 18748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       menezes
## 18749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mens
## 18750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mentally
## 18751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mental�
## 18752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mentioning
## 18753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         men�e
## 18754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         men�s
## 18755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mer
## 18756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mercies
## 18757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         merck
## 18758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mercy
## 18759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         merde
## 18760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         merit
## 18761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       merkley
## 18762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     merupakan
## 18763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     messaging
## 18764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       messing
## 18765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mesure
## 18766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      metaphor
## 18767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     metaphors
## 18768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        meters
## 18769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         metre
## 18770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         meurt
## 18771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         meute
## 18772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mevs
## 18773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mexicos
## 18774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           me�
## 18775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mha
## 18776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mhas
## 18777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            mi
## 18778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mic
## 18779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      michelin
## 18780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         micro
## 18781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     microcosm
## 18782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 microdroplets
## 18783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              microelectronics
## 18784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    microphone
## 18785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    microscope
## 18786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mid
## 18787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      midapril
## 18788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       midland
## 18789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       midsept
## 18790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     midwives�
## 18791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      might�be
## 18792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      migrants
## 18793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    millennium
## 18794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      milliers
## 18795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   millonarias
## 18796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      millones
## 18797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       millson
## 18798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    millstream
## 18799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        milton
## 18800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           min
## 18801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     minassian
## 18802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   mindfulness
## 18803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mineros
## 18804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      minibars
## 18805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       minimal
## 18806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      minimize
## 18807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     minimizes
## 18808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    minimizing
## 18809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       minimum
## 18810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ministerio
## 18811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         minor
## 18812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    minorities
## 18813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       minors�
## 18814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         minus
## 18815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       miracle
## 18816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mis
## 18817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             misclassification
## 18818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 misclassified
## 18819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                misconceptions
## 18820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  misdiagnosed
## 18821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     miserably
## 18822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    mishandled
## 18823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    misleading
## 18824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mismatch
## 18825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     misplaced
## 18826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mission
## 18827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mistakes
## 18828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        misted
## 18829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 misunderstood
## 18830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mitch
## 18831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mitchell
## 18832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mithu
## 18833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mitigate
## 18834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         miway
## 18835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mix
## 18836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mixup
## 18837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mi�rcoles
## 18838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mlas
## 18839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mlhu
## 18840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mls�
## 18841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mma
## 18842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mob
## 18843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               mobilewellbeing
## 18844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  mobilisation
## 18845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mobilize
## 18846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mobilized
## 18847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mocking
## 18848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      modeling
## 18849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     modelling
## 18850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        models
## 18851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      moderate
## 18852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       modular
## 18853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         modus
## 18854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mod�le
## 18855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           moh
## 18856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mohamed
## 18857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mohammad
## 18858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      molecule
## 18859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     molecules
## 18860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        momemt
## 18861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       momento
## 18862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       moments
## 18863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         momma
## 18864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mommasome
## 18865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mondays
## 18866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 monde<u+0001f62d><u+0001f62d>
## 18867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mondial
## 18868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       monica�
## 18869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        monied
## 18870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     monitored
## 18871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    monitoring
## 18872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        monkey
## 18873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      monstres
## 18874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         monte
## 18875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       monthly
## 18876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          monthsaprilseptember
## 18877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  monthtomonth
## 18878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        montre
## 18879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   montr�alais
## 18880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  montr�alaise
## 18881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  montr�alnord
## 18882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    montr�al��
## 18883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  monumentally
## 18884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        moody�
## 18885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mooncrazy
## 18886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      moorings
## 18887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         moose
## 18888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      moosonee
## 18889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        morbid
## 18890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mordicus
## 18891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       morgues
## 18892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      morning�
## 18893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            morning�s�standing
## 18894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       morocco
## 18895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mortalit�
## 18896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mortgage
## 18897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mortgages
## 18898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mos
## 18899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               mosaicsclothing
## 18900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       moscows
## 18901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mosque
## 18902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mostrar
## 18903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   motheroftwo
## 18904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mother�
## 18905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mother�s
## 18906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        motifs
## 18907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        motion
## 18908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         motor
## 18909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mottley
## 18910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         motus
## 18911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mound
## 18912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mount
## 18913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mounts
## 18914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mouth
## 18915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mouvement
## 18916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   moveinready
## 18917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         move�
## 18918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        movies
## 18919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     movilidad
## 18920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       moyenne
## 18921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mpp
## 18922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mps
## 18923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mpt
## 18924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               mrprimeminister
## 18925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mtg
## 18926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mtl
## 18927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mts�
## 18928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        muchos
## 18929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         much�
## 18930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mucking
## 18931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mueller
## 18932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         muere
## 18933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        muerto
## 18934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         muise
## 18935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         muito
## 18936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       muliaga
## 18937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         multi
## 18938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             multigenerational
## 18939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  multilingual
## 18940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      multiple
## 18941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      multiply
## 18942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mumbai
## 18943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mums
## 18944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mundial
## 18945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  mundialmente
## 18946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          musa
## 18947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      mushroom
## 18948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             music<u+0001f918>
## 18949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        mutate
## 18950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       mutated
## 18951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          mvmt
## 18952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         mvnos
## 18953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           mxx
## 18954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     mystified
## 18955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        myths�
## 18956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         m�dia
## 18957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   m�dicaments
## 18958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  m�diterran�e
## 18959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       m�lania
## 18960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       m�moire
## 18961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        m�sica
## 18962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         m�tis
## 18963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         m�tre
## 18964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        m�tres
## 18965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            na
## 18966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nabarro
## 18967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nacientes
## 18968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        naciri
## 18969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nagar
## 18970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nagoya
## 18971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nail
## 18972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         naime
## 18973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nairn
## 18974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nairobi
## 18975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         naked
## 18976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         names
## 18977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nancy
## 18978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nap
## 18979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    narcissist
## 18980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nardi
## 18981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      narendra
## 18982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nasdaq
## 18983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       natalia
## 18984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  nationaliser
## 18985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   nationalism
## 18986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     national�
## 18987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nationwide
## 18988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   nationwide�
## 18989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nation�s
## 18990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nato
## 18991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       natural
## 18992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     naturally
## 18993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    naturelles
## 18994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nat�l
## 18995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        navait
## 18996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        naveed
## 18997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      naysayer
## 18998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nba
## 18999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nbiizh
## 19000                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nbru
## 19001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nb�s
## 19002                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ncaa
## 19003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nearfrom
## 19004                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nearnormal
## 19005                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    necesarias
## 19006                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   necessarily
## 19007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    necessary�
## 19008                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   necessities
## 19009                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          neck
## 19010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       needed�
## 19011                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                negativecnnbrk
## 19012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    negatively
## 19013                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     negatives
## 19014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    negligence
## 19015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   negotiating
## 19016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      neighbor
## 19017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  neighborhood
## 19018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 neighborhoods
## 19019                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   neighbours�
## 19020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nelson
## 19021                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nenette
## 19022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nenshi
## 19023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    neoliberal
## 19024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nepal
## 19025                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nerd
## 19026                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       netflix
## 19027                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          neuf
## 19028                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       neufeld
## 19029                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  neurological
## 19030                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  neutralisent
## 19031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nevada
## 19032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     newbridge
## 19033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      newcomer
## 19034                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       newmont
## 19035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       newsday
## 19036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     newspaper
## 19037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     newswatch
## 19038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         news�
## 19039                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nexistent
## 19040                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      neyaashiinigamiingninwag
## 19041                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nfl
## 19042                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ngek
## 19043                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ngola
## 19044                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nhls
## 19045                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     niagarast
## 19046                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     niagara�s
## 19047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nicholas
## 19048                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nicma
## 19049                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nicole
## 19050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               nigeria<u+0001f1f3><u+0001f1ec>
## 19051                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nig�rian
## 19052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nije
## 19053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ninja
## 19054                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ni�
## 19055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nkurunziza
## 19056                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nlru
## 19057                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nobody�s
## 19058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          noch
## 19059                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        noelle
## 19060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         noise
## 19061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nollaig
## 19062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nombreuses
## 19063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nominating
## 19064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nonenglish
## 19065                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   nonetheless
## 19066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nonna
## 19067                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             nonpharmaceutical
## 19068                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                nonrespiratory
## 19069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      nonsense
## 19070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nont
## 19071                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nordstrom
## 19072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     normality
## 19073                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       normal�
## 19074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     normal�on
## 19075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         norme
## 19076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   northampton
## 19077                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     northeast
## 19078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  northeastern
## 19079                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     northern�
## 19080                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    northsouth
## 19081                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       notable
## 19082                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       notably
## 19083                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     notamment
## 19084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               notaweaponofwar
## 19085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         noted
## 19086                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        noted�
## 19087                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         notez
## 19088                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         note�
## 19089                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  notforprofit
## 19090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 notforprofits
## 19091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       notices
## 19092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       noticia
## 19093                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        notify
## 19094                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         not�s
## 19095                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nou
## 19096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nourriture
## 19097                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nouveau
## 19098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nov
## 19099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       novelty
## 19100                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nows
## 19101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            np
## 19102                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nrph
## 19103                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        nscece
## 19104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nsg
## 19105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nspcc
## 19106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nuclear
## 19107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nucleic
## 19108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nudge
## 19109                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           nue
## 19110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nuit
## 19111                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      numerous
## 19112                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        num�ro
## 19113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       nurses�
## 19114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     nutrition
## 19115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    nutritious
## 19116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nuts
## 19117                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  nuuchahnulth
## 19118                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         nyaho
## 19119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          nytt
## 19120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        n�ayez
## 19121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    n�cessaire
## 19122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      n�chappe
## 19123                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   n�emp�chera
## 19124                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           n�o
## 19125                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      n�taient
## 19126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           oao
## 19127                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         obese
## 19128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   obfuscation
## 19129                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        obliga
## 19130                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     obligeant
## 19131                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       oblig�s
## 19132                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     oblivious
## 19133                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   observation
## 19134                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       observe
## 19135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      observed
## 19136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      observer
## 19137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      observ�s
## 19138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     obsession
## 19139                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     obstacles
## 19140                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      obtained
## 19141                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       obvious
## 19142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      occident
## 19143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     occupancy
## 19144                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       occuper
## 19145                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        occurs
## 19146                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       october
## 19147                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          odbf
## 19148                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           odd
## 19149                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          odds
## 19150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              odds<u+0001f603>
## 19151                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           odi
## 19152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          odsp
## 19153                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        oeuvre
## 19154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         offbc
## 19155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        offers
## 19156                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      officers
## 19157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      officer�
## 19158                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                officiellement
## 19159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       offpeak
## 19160                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       offsale
## 19161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        offset
## 19162                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        offuce
## 19163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      oilfield
## 19164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    oireachtas
## 19165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     okapdelma
## 19166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 okapp�toprens
## 19167                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        okezie
## 19168                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          oleh
## 19169                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ollie
## 19170                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ollies
## 19171                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       olympic
## 19172                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            om
## 19173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           omg
## 19174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ominously
## 19175                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        omr�de
## 19176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                on<u+0001f609>
## 19177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        oneday
## 19178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      onethird
## 19179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          one�
## 19180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          onge
## 19181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         onset
## 19182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ontarian
## 19183                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ontarioquebec
## 19184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ontario�
## 19185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       onwards
## 19186                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            op
## 19187                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          opal
## 19188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    opaskwayak
## 19189                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          opdl
## 19190                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          opds
## 19191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          oped
## 19192                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      openedup
## 19193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            openingctvatlantic
## 19194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      openness
## 19195                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      operandi
## 19196                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   operational
## 19197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           oph
## 19198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      opinions
## 19199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     oposici�n
## 19200                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           opp
## 19201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      opponent
## 19202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       opposed
## 19203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      opposing
## 19204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         opted
## 19205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       optimal
## 19206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       options
## 19207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      options�
## 19208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     optometry
## 19209                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    op�rations
## 19210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       oranges
## 19211                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       orchard
## 19212                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ordinaires
## 19213                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ordnance
## 19214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ordonn�
## 19215                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 organisateurs
## 19216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     organised
## 19217                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    organisers
## 19218                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 organizadores
## 19219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    organizers
## 19220                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   orientaci�n
## 19221                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     orientals
## 19222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       orillia
## 19223                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       orsquo�
## 19224                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ortiz
## 19225                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    oseiasibey
## 19226                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ostalo
## 19227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ostracising
## 19228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         osuna
## 19229                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       other�s
## 19230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        otoole
## 19231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ots
## 19232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        oublie
## 19233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        oubli�
## 19234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       oubli�e
## 19235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      oubli�es
## 19236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       oubli�s
## 19237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          oura
## 19238                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          our�
## 19239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      outboard
## 19240                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  outbreak<u+0001f97a><u+0001f97a><u+0001f97a>
## 19241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 outbreakcheck
## 19242                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     outbreak�
## 19243                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      outdated
## 19244                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         outhttpstcoyckjlmhsoq
## 19245                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        outing
## 19246                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       outland
## 19247                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  outofcontrol
## 19248                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     outofhome
## 19249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   outpatients
## 19250                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  outrageously
## 19251                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          outs
## 19252                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     outstrips
## 19253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ouvert
## 19254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ouverture�
## 19255                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     overblown
## 19256                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    overblown�
## 19257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  overcrowding
## 19258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     overheard
## 19259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      overload
## 19260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    overloaded
## 19261                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    overnight�
## 19262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  overreaction
## 19263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       oversee
## 19264                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               oversee�lineups
## 19265                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     overtakes
## 19266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       overton
## 19267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     overtrain
## 19268                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      overview
## 19269                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    overweight
## 19270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         over�
## 19271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ovo
## 19272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          owha
## 19273                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ownership
## 19274                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   oxygenlevel
## 19275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        oyster
## 19276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        oyugis
## 19277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           p44
## 19278                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pab
## 19279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pacemaker
## 19280                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pachuca
## 19281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pacifique
## 19282                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      packages
## 19283                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pact
## 19284                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pads
## 19285                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    paediatric
## 19286                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    paedophile
## 19287                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pagamos
## 19288                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pagos
## 19289                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      paiement
## 19290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         paint
## 19291                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       painted
## 19292                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       painter
## 19293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      painting
## 19294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     paintings
## 19295                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pais
## 19296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pak
## 19297                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pakistani
## 19298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pal
## 19299                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pale
## 19300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     palmsized
## 19301                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         palos
## 19302                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      palpable
## 19303                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     paludisme
## 19304                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pams
## 19305                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       panacea
## 19306                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         panam
## 19307                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  pancreatitis
## 19308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pandadundo
## 19309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pandemia
## 19310                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               pandemicrelated
## 19311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pandemik
## 19312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      panelist
## 19313                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     panelists
## 19314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         panic
## 19315                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        panier
## 19316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      panorama
## 19317                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       panther
## 19318                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pape
## 19319                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     paramount
## 19320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      paranoia
## 19321                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pardon
## 19322                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       parecer
## 19323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pareil
## 19324                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parent�s
## 19325                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parishes
## 19326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parker
## 19327                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      parkette
## 19328                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   parkinson�s
## 19329                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 parliamentary
## 19330                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     parliment
## 19331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parmis
## 19332                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parole
## 19333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       parquet
## 19334                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parrot
## 19335                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         part1
## 19336                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       partial
## 19337                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     partially
## 19338                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  participants
## 19339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   participar�
## 19340                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 participation
## 19341                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     particip�
## 19342                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              particuli�rement
## 19343                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        partie
## 19344                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      partiers
## 19345                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      partisan
## 19346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    partnering
## 19347                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            partnershipfunding
## 19348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       partout
## 19349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     partridge
## 19350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        parts�
## 19351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  pascalberube
## 19352                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       passant
## 19353                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       passed�
## 19354                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     passenger
## 19355                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        passer
## 19356                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  passionately
## 19357                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     passively
## 19358                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         paste
## 19359                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pastor
## 19360                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pastoral
## 19361                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pas�
## 19362                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        patels
## 19363                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         paten
## 19364                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pateron
## 19365                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pathogen
## 19366                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pathogenic
## 19367                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         paths
## 19368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     patienter
## 19369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     patiently
## 19370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       patrick
## 19371                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      patterns
## 19372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         paul�
## 19373                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pause
## 19374                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pauvret�
## 19375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         payel
## 19376                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         payer
## 19377                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           paz
## 19378                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pa�s
## 19379                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pd
## 19380                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pdg
## 19381                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             pdtechintegration
## 19382                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    peacefully
## 19383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         peaks
## 19384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pearl
## 19385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pearson
## 19386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pedagogy
## 19387                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pedersen
## 19388                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pedestrian
## 19389                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pedi
## 19390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pednekar
## 19391                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peeing
## 19392                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          peek
## 19393                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          peer
## 19394                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pego
## 19395                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     penalized
## 19396                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       penalty
## 19397                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      penchent
## 19398                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pengajar
## 19399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        penned
## 19400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  pennsylvania
## 19401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      penokean
## 19402                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pensait
## 19403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        penser
## 19404                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pensez
## 19405                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pensezy
## 19406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pensiez
## 19407                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pentyful
## 19408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       people�
## 19409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      people�s
## 19410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    people�the
## 19411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          peor
## 19412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         peppa
## 19413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       peppaskulldedanceragain
## 19414                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       peppers
## 19415                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     percapita
## 19416                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     perceived
## 19417                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       perdues
## 19418                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     periodfor
## 19419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       periodo
## 19420                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       period�
## 19421                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    permanente
## 19422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   permanentes
## 19423                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        permet
## 19424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     permettre
## 19425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   permissible
## 19426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        permit
## 19427                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pero
## 19428                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  perpetrators
## 19429                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      perplexe
## 19430                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         perro
## 19431                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      perruque
## 19432                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    persistent
## 19433                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   personally�
## 19434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  perspectives
## 19435                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  perspective�
## 19436                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      persuade
## 19437                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pertes
## 19438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pertinent
## 19439                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      perturbe
## 19440                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      peruvian
## 19441                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          per�
## 19442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      peshawar
## 19443                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pessimiste
## 19444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pessoas
## 19445                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pet
## 19446                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        peters
## 19447                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     petfinder
## 19448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         petri
## 19449                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        petrie
## 19450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ph
## 19451                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pha
## 19452                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   pharmacists
## 19453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        phased
## 19454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       phasing
## 19455                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           phe
## 19456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        phelan
## 19457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  philadelphia
## 19458                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               philanthropists
## 19459                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  philanthropy
## 19460                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       philipe
## 19461                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       philips
## 19462                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   philosopher
## 19463                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      philpott
## 19464                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  photographed
## 19465                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 photographers
## 19466                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  photographic
## 19467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           physicallydistanced
## 19468                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   physically�
## 19469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      physique
## 19470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pi
## 19471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        piatto
## 19472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        picard
## 19473                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        picked
## 19474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pickleball
## 19475                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         picks
## 19476                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pickup�
## 19477                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        picnic
## 19478                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           picture<u+0001f605>
## 19479                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pictured
## 19480                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pie
## 19481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pierce
## 19482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pietro
## 19483                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pigons
## 19484                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pilot
## 19485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pincher
## 19486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ping
## 19487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pink
## 19488                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pins
## 19489                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pints
## 19490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pipes
## 19491                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pipke
## 19492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pity
## 19493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pivot
## 19494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pivoted
## 19495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pizzas
## 19496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pizzeria
## 19497                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pi�a
## 19498                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pi�tons
## 19499                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         plac�
## 19500                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        planes
## 19501                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        planet
## 19502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       plan�te
## 19503                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     plaquenil
## 19504                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        plasma
## 19505                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       plastic
## 19506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         plate
## 19507                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        plates
## 19508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   platforming
## 19509                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       platoon
## 19510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         platt
## 19511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         platz
## 19512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          play<u+25b6><u+fe0f>
## 19513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        player
## 19514                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         plead
## 19515                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pleading
## 19516                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pleas
## 19517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pleasant
## 19518                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   pleasurable
## 19519                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pledge
## 19520                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pledges
## 19521                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pleurait
## 19522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pleure
## 19523                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pley
## 19524                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        plight
## 19525                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          plug
## 19526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       plunged
## 19527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       plupart
## 19528                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pmp
## 19529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pneumonia
## 19530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pobinili
## 19531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pocs
## 19532                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           podcast<u+0001f447>
## 19533                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       podr�an
## 19534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pods
## 19535                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pogne
## 19536                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       poirier
## 19537                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      poisoned
## 19538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         poker
## 19539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pokerstars
## 19540                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pokusavaju
## 19541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         polar
## 19542                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     policiaca
## 19543                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     policiers
## 19544                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     polici�re
## 19545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  policymakers
## 19546                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       polic�a
## 19547                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   politically
## 19548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     politique
## 19549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         polls
## 19550                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      polluted
## 19551                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     polluting
## 19552                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pollution
## 19553                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         polly
## 19554                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pologne
## 19555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        poorly
## 19556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pope
## 19557                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            popplugproductions
## 19558                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      popplug�
## 19559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     popula��o
## 19560                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        porque
## 19561                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  portauprince
## 19562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       portera
## 19563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      portrait
## 19564                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      portugal
## 19565                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        porzio
## 19566                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         poses
## 19567                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       positif
## 19568                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    positioned
## 19569                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     positive�
## 19570                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  postblackout
## 19571                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    posteraros
## 19572                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        postes
## 19573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     posthaste
## 19574                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  postlockdown
## 19575                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      postpone
## 19576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       potable
## 19577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  potentially�
## 19578                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    potential�
## 19579                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               potentiellement
## 19580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         potus
## 19581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pouches
## 19582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pounce
## 19583                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pounds
## 19584                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  pourraitelle
## 19585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    poursuivre
## 19586                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pouss�e
## 19587                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pouvez
## 19588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       powered
## 19589                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      powerful
## 19590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    powerhouse
## 19591                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   pozitif2056
## 19592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pozitif45
## 19593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pozitif51
## 19594                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pozitif54
## 19595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ppes
## 19596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ppe�s
## 19597                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     practiced
## 19598                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pragmatic
## 19599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prairie
## 19600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prairies
## 19601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       praised
## 19602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       praises
## 19603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pramod
## 19604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pran
## 19605                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pray
## 19606                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prayer
## 19607                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       praying
## 19608                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         precs
## 19609                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     predatory
## 19610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     predicted
## 19611                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      predicts
## 19612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      predict�
## 19613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     preferred
## 19614                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pregnancy
## 19615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   preincipaux
## 19616                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prejudice
## 19617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prekosyon
## 19618                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      premium�
## 19619                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      premi�re
## 19620                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   preocupados
## 19621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prepaid
## 19622                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   prepandemic
## 19623                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prepping
## 19624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     preprints
## 19625                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  presbyterian
## 19626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  prescreening
## 19627                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  prescription
## 19628                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 prescriptions
## 19629                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      presence
## 19630                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  presentation
## 19631                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  preservation
## 19632                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    presidente
## 19633                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       presque
## 19634                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pressing
## 19635                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               pressu<u+1e5b>e
## 19636                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pressure
## 19637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        press�
## 19638                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pretences
## 19639                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pretend
## 19640                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pretoria
## 19641                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pretzels
## 19642                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        preuve
## 19643                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prevalent
## 19644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    preventing
## 19645                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      prevents
## 19646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       preview
## 19647                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pricefixer
## 19648                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       priests
## 19649                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        primed
## 19650                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      primrose
## 19651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         prine
## 19652                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     printable
## 19653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      printing
## 19654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    priorities
## 19655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    prioritise
## 19656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prison�as
## 19657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      private�
## 19658                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     privilege
## 19659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       priv�es
## 19660                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          prix
## 19661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     proactive
## 19662                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   problematic
## 19663                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     probl�mes
## 19664                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prochaine
## 19665                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        proche
## 19666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       proches
## 19667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       procure
## 19668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   procurement
## 19669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     producers
## 19670                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     producing
## 19671                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      products
## 19672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               professionalism
## 19673                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                professionnels
## 19674                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       profile
## 19675                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        profit
## 19676                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      profiter
## 19677                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         profs
## 19678                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     profusely
## 19679                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   programming
## 19680                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   progressing
## 19681                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   progression
## 19682                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   progressive
## 19683                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   prohibiting
## 19684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prohibits
## 19685                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     projected
## 19686                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        projet
## 19687                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       projets
## 19688                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prolong�e
## 19689                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      promise�
## 19690                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     promising
## 19691                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        prompt
## 19692                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prompts
## 19693                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    propaganda
## 19694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       propage
## 19695                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      propager
## 19696                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   properganda
## 19697                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  prophylactic
## 19698                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    proportion
## 19699                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   proposition
## 19700                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  propositions
## 19701                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       propos�
## 19702                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     propos�es
## 19703                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 propri�taires
## 19704                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     prospects
## 19705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    prosp�rera
## 19706                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   protections
## 19707                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 protectionsno
## 19708                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 protestsriots
## 19709                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                protestsstupid
## 19710                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        protiv
## 19711                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prot�ge
## 19712                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                prot�geonsnous
## 19713                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  prot�geznous
## 19714                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  prot�gezvous
## 19715                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       prouver
## 19716                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      provibce
## 19717                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                provincesunset
## 19718                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  provincewide
## 19719                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             provincialfederal
## 19720                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       proving
## 19721                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    provisions
## 19722                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       proviso
## 19723                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      provokes
## 19724                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      provoqu�
## 19725                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     provoqu�e
## 19726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    provoqu�es
## 19727                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     proximity
## 19728                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pruebas
## 19729                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   pr�c�dentes
## 19730                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pr�f�rant
## 19731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                pr�occupations
## 19732                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pr�pare
## 19733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pr�pos�
## 19734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pr�sentait
## 19735                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pr�sentent
## 19736                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     pr�sident
## 19737                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                pr�sidentielle
## 19738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pr�sid�
## 19739                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      pr�texte
## 19740                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    pr�ventive
## 19741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   pr�voyaient
## 19742                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pr�vue
## 19743                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pr�vus
## 19744                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pr�x
## 19745                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ps
## 19746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 pssscowmidget
## 19747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         psw�s
## 19748                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 psychiatrists
## 19749                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  psychologist
## 19750                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    psychology
## 19751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  psychosocial
## 19752                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       psykisk
## 19753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            pt
## 19754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pubity
## 19755                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   publication
## 19756                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  publications
## 19757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  publichealth
## 19758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  publicitaire
## 19759                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       publics
## 19760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      public�s
## 19761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     publiques
## 19762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     publishes
## 19763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    publishing
## 19764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pubquak
## 19765                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pubs
## 19766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         puedo
## 19767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         puffs
## 19768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     puissance
## 19769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      puissant
## 19770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      puissiez
## 19771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          pull
## 19772                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       pulling
## 19773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pulls
## 19774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         pulse
## 19775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        punish
## 19776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     punishing
## 19777                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pup
## 19778                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        pupils
## 19779                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         puppy
## 19780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pur
## 19781                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      purchase
## 19782                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       purpose
## 19783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          put�
## 19784                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           pvt
## 19785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         p�kin
## 19786                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      p�nuries
## 19787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          p�re
## 19788                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       p�riode
## 19789                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            qc
## 19790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    quadrupled
## 19791                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     qualified
## 19792                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      qualquer
## 19793                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         quang
## 19794                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quantity
## 19795                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quarks
## 19796                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       quarter
## 19797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     quebecers
## 19798                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       quebecs
## 19799                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         quece
## 19800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         queda
## 19801                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quedar�n
## 19802                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         queen
## 19803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       queen�s
## 19804                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quel
## 19805                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          quen
## 19806                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        queria
## 19807                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       queries
## 19808                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 questionnaire
## 19809                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                questionnaires
## 19810                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       quest�o
## 19811                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quickly�
## 19812                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quirks
## 19813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quiserem
## 19814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      quitamos
## 19815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        quoted
## 19816                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     quotidien
## 19817                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           qu�
## 19818                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   qu�ailleurs
## 19819                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   qu�b�coises
## 19820                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      qu�estce
## 19821                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        qu�une
## 19822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        r0wlet
## 19823                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rabia
## 19824                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rabson
## 19825                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      racebase
## 19826                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   racialiazed
## 19827                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    racialized
## 19828                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         radar
## 19829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      radesign
## 19830                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  radevidecemo
## 19831                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       radhika
## 19832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      radicale
## 19833                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        raffle
## 19834                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      raffling
## 19835                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rafiki
## 19836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rahb�
## 19837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      railways
## 19838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rainbow
## 19839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rainy
## 19840                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ramage
## 19841                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ramifications
## 19842                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ramped
## 19843                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ramsaroop
## 19844                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ran
## 19845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       randall
## 19846                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        random
## 19847                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    randomized
## 19848                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         range
## 19849                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rant
## 19850                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rants
## 19851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rappel�s
## 19852                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    rapportant
## 19853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rashed
## 19854                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rashid
## 19855                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rasirila
## 19856                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 rassemblement
## 19857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rat
## 19858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ravine
## 19859                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rawstory
## 19860                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        raywat
## 19861                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        razina
## 19862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rchange
## 19863                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rci
## 19864                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rcmp
## 19865                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           rdc
## 19866                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reaching
## 19867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       readies
## 19868                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       reading
## 19869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reads
## 19870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      realised
## 19871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      realizar
## 19872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      realized
## 19873                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        realms
## 19874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       realtor
## 19875                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     realtors�
## 19876                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rear
## 19877                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reasonable
## 19878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reassess
## 19879                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reassure
## 19880                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rebates
## 19881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      rebattre
## 19882                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reboarded
## 19883                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rebound
## 19884                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         recap
## 19885                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        recede
## 19886                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      receding
## 19887                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      receives
## 19888                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recensait
## 19889                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recens�
## 19890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recentrage
## 19891                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recession
## 19892                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recevoir
## 19893                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recivieran
## 19894                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reckless
## 19895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  recognizable
## 19896                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recognizes
## 19897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  recommandait
## 19898                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  recommandent
## 19899                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                recommendation
## 19900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  recommending
## 19901                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recommends
## 19902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reconnait
## 19903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reconnects
## 19904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                reconstruction
## 19905                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       recopie
## 19906                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recorded�
## 19907                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     recording
## 19908                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recreation
## 19909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    recruiting
## 19910                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      recruter
## 19911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         recul
## 19912                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        recul�
## 19913                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      redesign
## 19914                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      redfield
## 19915                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                redistributing
## 19916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          redo
## 19917                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        redone
## 19918                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       redoute
## 19919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     redrawing
## 19920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reductions
## 19921                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     redundant
## 19922                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reelected
## 19923                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         reels
## 19924                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reengage
## 19925                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       referee
## 19926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reference
## 19927                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     referrals
## 19928                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      referred
## 19929                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        refer�
## 19930                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      refinery
## 19931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        refize
## 19932                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reflected
## 19933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refrain
## 19934                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reframes
## 19935                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refresh
## 19936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    refreshing
## 19937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      refunded
## 19938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refusal
## 19939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      refusals
## 19940                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refused
## 19941                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       refuses
## 19942                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        refus�
## 19943                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        refute
## 19944                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      regained
## 19945                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    regionally
## 19946                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         regis
## 19947                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  registration
## 19948                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   regretfully
## 19949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       regrets
## 19950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    regulation
## 19951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    regulatory
## 19952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rehab
## 19953                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  rehabilitate
## 19954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         rehan
## 19955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     rehearsal
## 19956                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reimagining
## 19957                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reimbursed
## 19958                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reinforce
## 19959                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reinforced
## 19960                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reinforces
## 19961                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reinforcing
## 19962                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reinstated
## 19963                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reintegrate
## 19964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 reintegrating
## 19965                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   reintroduce
## 19966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rejects
## 19967                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       relance
## 19968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     relatable
## 19969                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      related�
## 19970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      relating
## 19971                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     relations
## 19972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  relationship
## 19973                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        released�comprehensive
## 19974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      reliable
## 19975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        relics
## 19976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     religious
## 19977                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      relocate
## 19978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reluctant
## 19979                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          rely
## 19980                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rel�che
## 19981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     remained�
## 19982                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     remaining
## 19983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    remarkably
## 19984                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        remedy
## 19985                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     remembers
## 19986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      remercie
## 19987                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     remercier
## 19988                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     reminders
## 19989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         remit
## 19990                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      remotely
## 19991                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     remplac�s
## 19992                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   rendezvous�
## 19993                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        rendue
## 19994                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     renforcer
## 19995                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       renfrew
## 19996                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     renovated
## 19997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       rentrer
## 19998                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reopenings
## 19999                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    reopening�
##          n total         freq
## 1     2147 48044 4.468820e-02
## 2     1457 31391 4.641458e-02
## 3      624 16761 3.722928e-02
## 4      547 48044 1.138540e-02
## 5      435 48044 9.054200e-03
## 6      428 48044 8.908501e-03
## 7      396 48044 8.242444e-03
## 8      384 31391 1.223281e-02
## 9      372 48044 7.742902e-03
## 10     313 31391 9.971011e-03
## 11     290 31391 9.238317e-03
## 12     266 48044 5.536591e-03
## 13     252 48044 5.245192e-03
## 14     251 16761 1.497524e-02
## 15     249 31391 7.932210e-03
## 16     233 48044 4.849721e-03
## 17     219 48044 4.558322e-03
## 18     217 48044 4.516693e-03
## 19     213 31391 6.785384e-03
## 20     212 31391 6.753528e-03
## 21     212 31391 6.753528e-03
## 22     207 48044 4.308550e-03
## 23     187 31391 5.957121e-03
## 24     170 31391 5.415565e-03
## 25     156 31391 4.969577e-03
## 26     148 48044 3.080510e-03
## 27     141 31391 4.491733e-03
## 28     137 48044 2.851553e-03
## 29     136 48044 2.830738e-03
## 30     125 48044 2.601782e-03
## 31     124 31391 3.950177e-03
## 32     120 48044 2.497710e-03
## 33     117 48044 2.435268e-03
## 34     117 16761 6.980490e-03
## 35     114 16761 6.801503e-03
## 36     113 48044 2.352011e-03
## 37     113 31391 3.599758e-03
## 38     110 48044 2.289568e-03
## 39     110 16761 6.562854e-03
## 40     108 48044 2.247939e-03
## 41     102 48044 2.123054e-03
## 42     102 31391 3.249339e-03
## 43      99 31391 3.153770e-03
## 44      99 31391 3.153770e-03
## 45      96 31391 3.058201e-03
## 46      95 48044 1.977354e-03
## 47      93 48044 1.935726e-03
## 48      92 48044 1.914911e-03
## 49      90 48044 1.873283e-03
## 50      90 48044 1.873283e-03
## 51      89 48044 1.852469e-03
## 52      89 48044 1.852469e-03
## 53      88 31391 2.803351e-03
## 54      87 48044 1.810840e-03
## 55      84 31391 2.675926e-03
## 56      84 16761 5.011634e-03
## 57      83 48044 1.727583e-03
## 58      83 48044 1.727583e-03
## 59      82 48044 1.706769e-03
## 60      81 48044 1.685955e-03
## 61      81 48044 1.685955e-03
## 62      78 48044 1.623512e-03
## 63      78 16761 4.653660e-03
## 64      77 48044 1.602698e-03
## 65      76 48044 1.581883e-03
## 66      76 48044 1.581883e-03
## 67      76 31391 2.421076e-03
## 68      75 48044 1.561069e-03
## 69      74 48044 1.540255e-03
## 70      73 48044 1.519441e-03
## 71      73 48044 1.519441e-03
## 72      73 16761 4.355349e-03
## 73      72 31391 2.293651e-03
## 74      72 31391 2.293651e-03
## 75      72 16761 4.295686e-03
## 76      70 16761 4.176362e-03
## 77      69 48044 1.436183e-03
## 78      67 48044 1.394555e-03
## 79      67 48044 1.394555e-03
## 80      67 48044 1.394555e-03
## 81      67 31391 2.134370e-03
## 82      66 31391 2.102513e-03
## 83      65 48044 1.352926e-03
## 84      65 48044 1.352926e-03
## 85      65 16761 3.878050e-03
## 86      64 31391 2.038801e-03
## 87      63 48044 1.311298e-03
## 88      63 48044 1.311298e-03
## 89      62 48044 1.290484e-03
## 90      61 48044 1.269669e-03
## 91      61 48044 1.269669e-03
## 92      60 31391 1.911376e-03
## 93      60 31391 1.911376e-03
## 94      59 48044 1.228041e-03
## 95      59 48044 1.228041e-03
## 96      59 48044 1.228041e-03
## 97      59 16761 3.520076e-03
## 98      58 48044 1.207227e-03
## 99      58 48044 1.207227e-03
## 100     58 48044 1.207227e-03
## 101     58 31391 1.847663e-03
## 102     57 48044 1.186412e-03
## 103     57 48044 1.186412e-03
## 104     57 48044 1.186412e-03
## 105     57 48044 1.186412e-03
## 106     57 31391 1.815807e-03
## 107     57 31391 1.815807e-03
## 108     56 31391 1.783951e-03
## 109     56 16761 3.341089e-03
## 110     55 48044 1.144784e-03
## 111     55 48044 1.144784e-03
## 112     55 48044 1.144784e-03
## 113     55 31391 1.752095e-03
## 114     55 31391 1.752095e-03
## 115     54 31391 1.720238e-03
## 116     54 31391 1.720238e-03
## 117     53 48044 1.103155e-03
## 118     53 48044 1.103155e-03
## 119     53 31391 1.688382e-03
## 120     52 31391 1.656526e-03
## 121     52 31391 1.656526e-03
## 122     51 48044 1.061527e-03
## 123     51 48044 1.061527e-03
## 124     51 48044 1.061527e-03
## 125     51 31391 1.624669e-03
## 126     50 48044 1.040713e-03
## 127     50 48044 1.040713e-03
## 128     50 48044 1.040713e-03
## 129     50 48044 1.040713e-03
## 130     50 48044 1.040713e-03
## 131     50 31391 1.592813e-03
## 132     50 31391 1.592813e-03
## 133     50 16761 2.983116e-03
## 134     49 48044 1.019898e-03
## 135     49 48044 1.019898e-03
## 136     49 48044 1.019898e-03
## 137     49 48044 1.019898e-03
## 138     49 31391 1.560957e-03
## 139     49 31391 1.560957e-03
## 140     49 31391 1.560957e-03
## 141     48 48044 9.990842e-04
## 142     48 48044 9.990842e-04
## 143     48 48044 9.990842e-04
## 144     48 48044 9.990842e-04
## 145     48 48044 9.990842e-04
## 146     48 31391 1.529101e-03
## 147     48 31391 1.529101e-03
## 148     48 16761 2.863791e-03
## 149     47 48044 9.782699e-04
## 150     47 31391 1.497244e-03
## 151     47 16761 2.804129e-03
## 152     46 48044 9.574557e-04
## 153     46 48044 9.574557e-04
## 154     46 48044 9.574557e-04
## 155     46 48044 9.574557e-04
## 156     46 48044 9.574557e-04
## 157     46 48044 9.574557e-04
## 158     46 31391 1.465388e-03
## 159     46 31391 1.465388e-03
## 160     46 16761 2.744466e-03
## 161     45 48044 9.366414e-04
## 162     45 48044 9.366414e-04
## 163     45 31391 1.433532e-03
## 164     45 31391 1.433532e-03
## 165     45 31391 1.433532e-03
## 166     44 48044 9.158272e-04
## 167     44 48044 9.158272e-04
## 168     44 48044 9.158272e-04
## 169     44 48044 9.158272e-04
## 170     44 16761 2.625142e-03
## 171     44 16761 2.625142e-03
## 172     43 48044 8.950129e-04
## 173     43 48044 8.950129e-04
## 174     43 48044 8.950129e-04
## 175     43 16761 2.565479e-03
## 176     42 48044 8.741987e-04
## 177     42 31391 1.337963e-03
## 178     42 16761 2.505817e-03
## 179     42 16761 2.505817e-03
## 180     41 48044 8.533844e-04
## 181     41 48044 8.533844e-04
## 182     41 31391 1.306107e-03
## 183     41 31391 1.306107e-03
## 184     40 48044 8.325701e-04
## 185     40 48044 8.325701e-04
## 186     40 48044 8.325701e-04
## 187     40 48044 8.325701e-04
## 188     40 48044 8.325701e-04
## 189     40 31391 1.274251e-03
## 190     40 31391 1.274251e-03
## 191     39 48044 8.117559e-04
## 192     39 31391 1.242394e-03
## 193     39 31391 1.242394e-03
## 194     39 31391 1.242394e-03
## 195     39 31391 1.242394e-03
## 196     38 48044 7.909416e-04
## 197     38 48044 7.909416e-04
## 198     38 48044 7.909416e-04
## 199     38 48044 7.909416e-04
## 200     38 48044 7.909416e-04
## 201     38 48044 7.909416e-04
## 202     38 48044 7.909416e-04
## 203     38 48044 7.909416e-04
## 204     38 48044 7.909416e-04
## 205     38 48044 7.909416e-04
## 206     38 31391 1.210538e-03
## 207     38 31391 1.210538e-03
## 208     38 31391 1.210538e-03
## 209     38 16761 2.267168e-03
## 210     38 16761 2.267168e-03
## 211     37 48044 7.701274e-04
## 212     37 48044 7.701274e-04
## 213     37 48044 7.701274e-04
## 214     37 31391 1.178682e-03
## 215     37 31391 1.178682e-03
## 216     37 16761 2.207506e-03
## 217     37 16761 2.207506e-03
## 218     36 48044 7.493131e-04
## 219     36 48044 7.493131e-04
## 220     36 48044 7.493131e-04
## 221     36 48044 7.493131e-04
## 222     36 48044 7.493131e-04
## 223     36 48044 7.493131e-04
## 224     36 48044 7.493131e-04
## 225     36 31391 1.146826e-03
## 226     36 31391 1.146826e-03
## 227     36 31391 1.146826e-03
## 228     36 31391 1.146826e-03
## 229     36 16761 2.147843e-03
## 230     36 16761 2.147843e-03
## 231     36 16761 2.147843e-03
## 232     35 48044 7.284989e-04
## 233     35 48044 7.284989e-04
## 234     35 48044 7.284989e-04
## 235     35 31391 1.114969e-03
## 236     35 31391 1.114969e-03
## 237     35 31391 1.114969e-03
## 238     35 16761 2.088181e-03
## 239     35 16761 2.088181e-03
## 240     35 16761 2.088181e-03
## 241     34 48044 7.076846e-04
## 242     34 48044 7.076846e-04
## 243     34 48044 7.076846e-04
## 244     34 48044 7.076846e-04
## 245     34 31391 1.083113e-03
## 246     34 31391 1.083113e-03
## 247     34 31391 1.083113e-03
## 248     34 31391 1.083113e-03
## 249     34 31391 1.083113e-03
## 250     34 31391 1.083113e-03
## 251     34 16761 2.028519e-03
## 252     34 16761 2.028519e-03
## 253     33 48044 6.868704e-04
## 254     33 48044 6.868704e-04
## 255     33 48044 6.868704e-04
## 256     33 48044 6.868704e-04
## 257     33 48044 6.868704e-04
## 258     33 31391 1.051257e-03
## 259     33 31391 1.051257e-03
## 260     33 16761 1.968856e-03
## 261     33 16761 1.968856e-03
## 262     32 48044 6.660561e-04
## 263     32 48044 6.660561e-04
## 264     32 48044 6.660561e-04
## 265     32 48044 6.660561e-04
## 266     32 48044 6.660561e-04
## 267     32 31391 1.019400e-03
## 268     32 31391 1.019400e-03
## 269     32 31391 1.019400e-03
## 270     32 31391 1.019400e-03
## 271     32 31391 1.019400e-03
## 272     32 31391 1.019400e-03
## 273     32 16761 1.909194e-03
## 274     31 48044 6.452419e-04
## 275     31 48044 6.452419e-04
## 276     31 48044 6.452419e-04
## 277     31 48044 6.452419e-04
## 278     31 48044 6.452419e-04
## 279     31 48044 6.452419e-04
## 280     31 48044 6.452419e-04
## 281     31 48044 6.452419e-04
## 282     31 31391 9.875442e-04
## 283     31 31391 9.875442e-04
## 284     31 31391 9.875442e-04
## 285     31 31391 9.875442e-04
## 286     31 16761 1.849532e-03
## 287     31 16761 1.849532e-03
## 288     30 48044 6.244276e-04
## 289     30 48044 6.244276e-04
## 290     30 48044 6.244276e-04
## 291     30 48044 6.244276e-04
## 292     30 48044 6.244276e-04
## 293     30 48044 6.244276e-04
## 294     30 48044 6.244276e-04
## 295     30 48044 6.244276e-04
## 296     30 48044 6.244276e-04
## 297     30 48044 6.244276e-04
## 298     30 48044 6.244276e-04
## 299     30 48044 6.244276e-04
## 300     30 48044 6.244276e-04
## 301     30 31391 9.556879e-04
## 302     30 31391 9.556879e-04
## 303     30 31391 9.556879e-04
## 304     30 31391 9.556879e-04
## 305     30 16761 1.789869e-03
## 306     30 16761 1.789869e-03
## 307     30 16761 1.789869e-03
## 308     29 48044 6.036134e-04
## 309     29 48044 6.036134e-04
## 310     29 48044 6.036134e-04
## 311     29 48044 6.036134e-04
## 312     29 48044 6.036134e-04
## 313     29 31391 9.238317e-04
## 314     29 31391 9.238317e-04
## 315     29 31391 9.238317e-04
## 316     29 16761 1.730207e-03
## 317     29 16761 1.730207e-03
## 318     28 48044 5.827991e-04
## 319     28 48044 5.827991e-04
## 320     28 48044 5.827991e-04
## 321     28 48044 5.827991e-04
## 322     28 48044 5.827991e-04
## 323     28 48044 5.827991e-04
## 324     28 48044 5.827991e-04
## 325     28 48044 5.827991e-04
## 326     28 48044 5.827991e-04
## 327     28 31391 8.919754e-04
## 328     28 31391 8.919754e-04
## 329     28 31391 8.919754e-04
## 330     28 31391 8.919754e-04
## 331     28 31391 8.919754e-04
## 332     28 31391 8.919754e-04
## 333     28 16761 1.670545e-03
## 334     28 16761 1.670545e-03
## 335     28 16761 1.670545e-03
## 336     27 48044 5.619848e-04
## 337     27 48044 5.619848e-04
## 338     27 48044 5.619848e-04
## 339     27 48044 5.619848e-04
## 340     27 48044 5.619848e-04
## 341     27 48044 5.619848e-04
## 342     27 48044 5.619848e-04
## 343     27 48044 5.619848e-04
## 344     27 48044 5.619848e-04
## 345     27 48044 5.619848e-04
## 346     27 48044 5.619848e-04
## 347     27 48044 5.619848e-04
## 348     27 31391 8.601191e-04
## 349     27 31391 8.601191e-04
## 350     27 31391 8.601191e-04
## 351     27 16761 1.610882e-03
## 352     27 16761 1.610882e-03
## 353     27 16761 1.610882e-03
## 354     26 48044 5.411706e-04
## 355     26 48044 5.411706e-04
## 356     26 48044 5.411706e-04
## 357     26 48044 5.411706e-04
## 358     26 48044 5.411706e-04
## 359     26 48044 5.411706e-04
## 360     26 48044 5.411706e-04
## 361     26 48044 5.411706e-04
## 362     26 31391 8.282629e-04
## 363     26 31391 8.282629e-04
## 364     26 31391 8.282629e-04
## 365     26 31391 8.282629e-04
## 366     26 31391 8.282629e-04
## 367     26 31391 8.282629e-04
## 368     26 16761 1.551220e-03
## 369     26 16761 1.551220e-03
## 370     26 16761 1.551220e-03
## 371     26 16761 1.551220e-03
## 372     25 48044 5.203563e-04
## 373     25 48044 5.203563e-04
## 374     25 48044 5.203563e-04
## 375     25 48044 5.203563e-04
## 376     25 48044 5.203563e-04
## 377     25 48044 5.203563e-04
## 378     25 48044 5.203563e-04
## 379     25 48044 5.203563e-04
## 380     25 48044 5.203563e-04
## 381     25 48044 5.203563e-04
## 382     25 31391 7.964066e-04
## 383     25 31391 7.964066e-04
## 384     25 31391 7.964066e-04
## 385     25 31391 7.964066e-04
## 386     25 16761 1.491558e-03
## 387     25 16761 1.491558e-03
## 388     24 48044 4.995421e-04
## 389     24 48044 4.995421e-04
## 390     24 48044 4.995421e-04
## 391     24 48044 4.995421e-04
## 392     24 48044 4.995421e-04
## 393     24 48044 4.995421e-04
## 394     24 48044 4.995421e-04
## 395     24 48044 4.995421e-04
## 396     24 48044 4.995421e-04
## 397     24 31391 7.645503e-04
## 398     24 31391 7.645503e-04
## 399     24 31391 7.645503e-04
## 400     24 31391 7.645503e-04
## 401     24 31391 7.645503e-04
## 402     24 31391 7.645503e-04
## 403     24 31391 7.645503e-04
## 404     24 16761 1.431895e-03
## 405     24 16761 1.431895e-03
## 406     24 16761 1.431895e-03
## 407     23 48044 4.787278e-04
## 408     23 48044 4.787278e-04
## 409     23 48044 4.787278e-04
## 410     23 48044 4.787278e-04
## 411     23 48044 4.787278e-04
## 412     23 48044 4.787278e-04
## 413     23 48044 4.787278e-04
## 414     23 48044 4.787278e-04
## 415     23 48044 4.787278e-04
## 416     23 48044 4.787278e-04
## 417     23 31391 7.326941e-04
## 418     23 31391 7.326941e-04
## 419     23 31391 7.326941e-04
## 420     23 31391 7.326941e-04
## 421     23 31391 7.326941e-04
## 422     23 31391 7.326941e-04
## 423     23 31391 7.326941e-04
## 424     23 16761 1.372233e-03
## 425     22 48044 4.579136e-04
## 426     22 48044 4.579136e-04
## 427     22 48044 4.579136e-04
## 428     22 48044 4.579136e-04
## 429     22 48044 4.579136e-04
## 430     22 48044 4.579136e-04
## 431     22 48044 4.579136e-04
## 432     22 48044 4.579136e-04
## 433     22 48044 4.579136e-04
## 434     22 48044 4.579136e-04
## 435     22 31391 7.008378e-04
## 436     22 31391 7.008378e-04
## 437     22 31391 7.008378e-04
## 438     22 31391 7.008378e-04
## 439     22 31391 7.008378e-04
## 440     22 31391 7.008378e-04
## 441     22 31391 7.008378e-04
## 442     22 16761 1.312571e-03
## 443     22 16761 1.312571e-03
## 444     22 16761 1.312571e-03
## 445     21 48044 4.370993e-04
## 446     21 48044 4.370993e-04
## 447     21 48044 4.370993e-04
## 448     21 48044 4.370993e-04
## 449     21 48044 4.370993e-04
## 450     21 48044 4.370993e-04
## 451     21 48044 4.370993e-04
## 452     21 48044 4.370993e-04
## 453     21 48044 4.370993e-04
## 454     21 48044 4.370993e-04
## 455     21 48044 4.370993e-04
## 456     21 48044 4.370993e-04
## 457     21 48044 4.370993e-04
## 458     21 48044 4.370993e-04
## 459     21 48044 4.370993e-04
## 460     21 48044 4.370993e-04
## 461     21 48044 4.370993e-04
## 462     21 31391 6.689816e-04
## 463     21 31391 6.689816e-04
## 464     21 31391 6.689816e-04
## 465     21 31391 6.689816e-04
## 466     21 31391 6.689816e-04
## 467     21 31391 6.689816e-04
## 468     21 31391 6.689816e-04
## 469     21 31391 6.689816e-04
## 470     21 31391 6.689816e-04
## 471     21 31391 6.689816e-04
## 472     21 31391 6.689816e-04
## 473     21 31391 6.689816e-04
## 474     21 16761 1.252909e-03
## 475     21 16761 1.252909e-03
## 476     21 16761 1.252909e-03
## 477     21 16761 1.252909e-03
## 478     21 16761 1.252909e-03
## 479     20 48044 4.162851e-04
## 480     20 48044 4.162851e-04
## 481     20 48044 4.162851e-04
## 482     20 48044 4.162851e-04
## 483     20 48044 4.162851e-04
## 484     20 48044 4.162851e-04
## 485     20 48044 4.162851e-04
## 486     20 48044 4.162851e-04
## 487     20 48044 4.162851e-04
## 488     20 48044 4.162851e-04
## 489     20 48044 4.162851e-04
## 490     20 48044 4.162851e-04
## 491     20 48044 4.162851e-04
## 492     20 48044 4.162851e-04
## 493     20 48044 4.162851e-04
## 494     20 48044 4.162851e-04
## 495     20 48044 4.162851e-04
## 496     20 48044 4.162851e-04
## 497     20 48044 4.162851e-04
## 498     20 48044 4.162851e-04
## 499     20 48044 4.162851e-04
## 500     20 48044 4.162851e-04
## 501     20 48044 4.162851e-04
## 502     20 48044 4.162851e-04
## 503     20 48044 4.162851e-04
## 504     20 31391 6.371253e-04
## 505     20 31391 6.371253e-04
## 506     20 31391 6.371253e-04
## 507     20 31391 6.371253e-04
## 508     20 31391 6.371253e-04
## 509     20 31391 6.371253e-04
## 510     20 31391 6.371253e-04
## 511     20 16761 1.193246e-03
## 512     20 16761 1.193246e-03
## 513     20 16761 1.193246e-03
## 514     20 16761 1.193246e-03
## 515     20 16761 1.193246e-03
## 516     20 16761 1.193246e-03
## 517     19 48044 3.954708e-04
## 518     19 48044 3.954708e-04
## 519     19 48044 3.954708e-04
## 520     19 48044 3.954708e-04
## 521     19 48044 3.954708e-04
## 522     19 48044 3.954708e-04
## 523     19 48044 3.954708e-04
## 524     19 48044 3.954708e-04
## 525     19 48044 3.954708e-04
## 526     19 48044 3.954708e-04
## 527     19 48044 3.954708e-04
## 528     19 48044 3.954708e-04
## 529     19 48044 3.954708e-04
## 530     19 48044 3.954708e-04
## 531     19 48044 3.954708e-04
## 532     19 48044 3.954708e-04
## 533     19 48044 3.954708e-04
## 534     19 48044 3.954708e-04
## 535     19 48044 3.954708e-04
## 536     19 48044 3.954708e-04
## 537     19 31391 6.052690e-04
## 538     19 31391 6.052690e-04
## 539     19 31391 6.052690e-04
## 540     19 31391 6.052690e-04
## 541     19 31391 6.052690e-04
## 542     19 31391 6.052690e-04
## 543     19 31391 6.052690e-04
## 544     19 31391 6.052690e-04
## 545     19 31391 6.052690e-04
## 546     19 31391 6.052690e-04
## 547     19 31391 6.052690e-04
## 548     19 31391 6.052690e-04
## 549     19 31391 6.052690e-04
## 550     19 16761 1.133584e-03
## 551     19 16761 1.133584e-03
## 552     19 16761 1.133584e-03
## 553     19 16761 1.133584e-03
## 554     19 16761 1.133584e-03
## 555     19 16761 1.133584e-03
## 556     18 48044 3.746566e-04
## 557     18 48044 3.746566e-04
## 558     18 48044 3.746566e-04
## 559     18 48044 3.746566e-04
## 560     18 48044 3.746566e-04
## 561     18 48044 3.746566e-04
## 562     18 48044 3.746566e-04
## 563     18 48044 3.746566e-04
## 564     18 48044 3.746566e-04
## 565     18 48044 3.746566e-04
## 566     18 48044 3.746566e-04
## 567     18 48044 3.746566e-04
## 568     18 48044 3.746566e-04
## 569     18 48044 3.746566e-04
## 570     18 48044 3.746566e-04
## 571     18 48044 3.746566e-04
## 572     18 48044 3.746566e-04
## 573     18 48044 3.746566e-04
## 574     18 48044 3.746566e-04
## 575     18 48044 3.746566e-04
## 576     18 48044 3.746566e-04
## 577     18 48044 3.746566e-04
## 578     18 48044 3.746566e-04
## 579     18 48044 3.746566e-04
## 580     18 48044 3.746566e-04
## 581     18 31391 5.734128e-04
## 582     18 31391 5.734128e-04
## 583     18 31391 5.734128e-04
## 584     18 31391 5.734128e-04
## 585     18 31391 5.734128e-04
## 586     18 31391 5.734128e-04
## 587     18 31391 5.734128e-04
## 588     18 31391 5.734128e-04
## 589     18 31391 5.734128e-04
## 590     18 31391 5.734128e-04
## 591     18 31391 5.734128e-04
## 592     18 31391 5.734128e-04
## 593     18 16761 1.073922e-03
## 594     18 16761 1.073922e-03
## 595     18 16761 1.073922e-03
## 596     18 16761 1.073922e-03
## 597     18 16761 1.073922e-03
## 598     18 16761 1.073922e-03
## 599     18 16761 1.073922e-03
## 600     18 16761 1.073922e-03
## 601     18 16761 1.073922e-03
## 602     17 48044 3.538423e-04
## 603     17 48044 3.538423e-04
## 604     17 48044 3.538423e-04
## 605     17 48044 3.538423e-04
## 606     17 48044 3.538423e-04
## 607     17 48044 3.538423e-04
## 608     17 48044 3.538423e-04
## 609     17 48044 3.538423e-04
## 610     17 48044 3.538423e-04
## 611     17 48044 3.538423e-04
## 612     17 48044 3.538423e-04
## 613     17 48044 3.538423e-04
## 614     17 48044 3.538423e-04
## 615     17 48044 3.538423e-04
## 616     17 48044 3.538423e-04
## 617     17 48044 3.538423e-04
## 618     17 48044 3.538423e-04
## 619     17 48044 3.538423e-04
## 620     17 48044 3.538423e-04
## 621     17 48044 3.538423e-04
## 622     17 48044 3.538423e-04
## 623     17 48044 3.538423e-04
## 624     17 48044 3.538423e-04
## 625     17 48044 3.538423e-04
## 626     17 48044 3.538423e-04
## 627     17 48044 3.538423e-04
## 628     17 48044 3.538423e-04
## 629     17 48044 3.538423e-04
## 630     17 48044 3.538423e-04
## 631     17 48044 3.538423e-04
## 632     17 31391 5.415565e-04
## 633     17 31391 5.415565e-04
## 634     17 31391 5.415565e-04
## 635     17 31391 5.415565e-04
## 636     17 31391 5.415565e-04
## 637     17 31391 5.415565e-04
## 638     17 31391 5.415565e-04
## 639     17 31391 5.415565e-04
## 640     17 31391 5.415565e-04
## 641     17 31391 5.415565e-04
## 642     17 31391 5.415565e-04
## 643     17 31391 5.415565e-04
## 644     17 31391 5.415565e-04
## 645     17 31391 5.415565e-04
## 646     17 31391 5.415565e-04
## 647     17 31391 5.415565e-04
## 648     17 31391 5.415565e-04
## 649     17 31391 5.415565e-04
## 650     17 16761 1.014259e-03
## 651     17 16761 1.014259e-03
## 652     17 16761 1.014259e-03
## 653     17 16761 1.014259e-03
## 654     17 16761 1.014259e-03
## 655     17 16761 1.014259e-03
## 656     17 16761 1.014259e-03
## 657     17 16761 1.014259e-03
## 658     17 16761 1.014259e-03
## 659     16 48044 3.330281e-04
## 660     16 48044 3.330281e-04
## 661     16 48044 3.330281e-04
## 662     16 48044 3.330281e-04
## 663     16 48044 3.330281e-04
## 664     16 48044 3.330281e-04
## 665     16 48044 3.330281e-04
## 666     16 48044 3.330281e-04
## 667     16 48044 3.330281e-04
## 668     16 48044 3.330281e-04
## 669     16 48044 3.330281e-04
## 670     16 48044 3.330281e-04
## 671     16 48044 3.330281e-04
## 672     16 48044 3.330281e-04
## 673     16 48044 3.330281e-04
## 674     16 48044 3.330281e-04
## 675     16 48044 3.330281e-04
## 676     16 48044 3.330281e-04
## 677     16 48044 3.330281e-04
## 678     16 48044 3.330281e-04
## 679     16 48044 3.330281e-04
## 680     16 48044 3.330281e-04
## 681     16 48044 3.330281e-04
## 682     16 48044 3.330281e-04
## 683     16 48044 3.330281e-04
## 684     16 48044 3.330281e-04
## 685     16 48044 3.330281e-04
## 686     16 48044 3.330281e-04
## 687     16 48044 3.330281e-04
## 688     16 48044 3.330281e-04
## 689     16 31391 5.097002e-04
## 690     16 31391 5.097002e-04
## 691     16 31391 5.097002e-04
## 692     16 31391 5.097002e-04
## 693     16 31391 5.097002e-04
## 694     16 31391 5.097002e-04
## 695     16 31391 5.097002e-04
## 696     16 31391 5.097002e-04
## 697     16 31391 5.097002e-04
## 698     16 31391 5.097002e-04
## 699     16 31391 5.097002e-04
## 700     16 31391 5.097002e-04
## 701     16 31391 5.097002e-04
## 702     16 31391 5.097002e-04
## 703     16 31391 5.097002e-04
## 704     16 16761 9.545970e-04
## 705     16 16761 9.545970e-04
## 706     16 16761 9.545970e-04
## 707     16 16761 9.545970e-04
## 708     16 16761 9.545970e-04
## 709     16 16761 9.545970e-04
## 710     16 16761 9.545970e-04
## 711     16 16761 9.545970e-04
## 712     16 16761 9.545970e-04
## 713     16 16761 9.545970e-04
## 714     16 16761 9.545970e-04
## 715     15 48044 3.122138e-04
## 716     15 48044 3.122138e-04
## 717     15 48044 3.122138e-04
## 718     15 48044 3.122138e-04
## 719     15 48044 3.122138e-04
## 720     15 48044 3.122138e-04
## 721     15 48044 3.122138e-04
## 722     15 48044 3.122138e-04
## 723     15 48044 3.122138e-04
## 724     15 48044 3.122138e-04
## 725     15 48044 3.122138e-04
## 726     15 48044 3.122138e-04
## 727     15 48044 3.122138e-04
## 728     15 48044 3.122138e-04
## 729     15 48044 3.122138e-04
## 730     15 48044 3.122138e-04
## 731     15 48044 3.122138e-04
## 732     15 48044 3.122138e-04
## 733     15 48044 3.122138e-04
## 734     15 48044 3.122138e-04
## 735     15 48044 3.122138e-04
## 736     15 48044 3.122138e-04
## 737     15 48044 3.122138e-04
## 738     15 48044 3.122138e-04
## 739     15 48044 3.122138e-04
## 740     15 48044 3.122138e-04
## 741     15 48044 3.122138e-04
## 742     15 48044 3.122138e-04
## 743     15 48044 3.122138e-04
## 744     15 48044 3.122138e-04
## 745     15 48044 3.122138e-04
## 746     15 48044 3.122138e-04
## 747     15 48044 3.122138e-04
## 748     15 48044 3.122138e-04
## 749     15 48044 3.122138e-04
## 750     15 48044 3.122138e-04
## 751     15 48044 3.122138e-04
## 752     15 48044 3.122138e-04
## 753     15 48044 3.122138e-04
## 754     15 48044 3.122138e-04
## 755     15 48044 3.122138e-04
## 756     15 31391 4.778440e-04
## 757     15 31391 4.778440e-04
## 758     15 31391 4.778440e-04
## 759     15 31391 4.778440e-04
## 760     15 31391 4.778440e-04
## 761     15 31391 4.778440e-04
## 762     15 31391 4.778440e-04
## 763     15 31391 4.778440e-04
## 764     15 31391 4.778440e-04
## 765     15 31391 4.778440e-04
## 766     15 31391 4.778440e-04
## 767     15 31391 4.778440e-04
## 768     15 31391 4.778440e-04
## 769     15 31391 4.778440e-04
## 770     15 31391 4.778440e-04
## 771     15 31391 4.778440e-04
## 772     15 31391 4.778440e-04
## 773     15 31391 4.778440e-04
## 774     15 31391 4.778440e-04
## 775     15 31391 4.778440e-04
## 776     15 31391 4.778440e-04
## 777     15 31391 4.778440e-04
## 778     15 31391 4.778440e-04
## 779     15 31391 4.778440e-04
## 780     15 31391 4.778440e-04
## 781     15 16761 8.949347e-04
## 782     15 16761 8.949347e-04
## 783     15 16761 8.949347e-04
## 784     15 16761 8.949347e-04
## 785     15 16761 8.949347e-04
## 786     15 16761 8.949347e-04
## 787     15 16761 8.949347e-04
## 788     15 16761 8.949347e-04
## 789     15 16761 8.949347e-04
## 790     15 16761 8.949347e-04
## 791     14 48044 2.913996e-04
## 792     14 48044 2.913996e-04
## 793     14 48044 2.913996e-04
## 794     14 48044 2.913996e-04
## 795     14 48044 2.913996e-04
## 796     14 48044 2.913996e-04
## 797     14 48044 2.913996e-04
## 798     14 48044 2.913996e-04
## 799     14 48044 2.913996e-04
## 800     14 48044 2.913996e-04
## 801     14 48044 2.913996e-04
## 802     14 48044 2.913996e-04
## 803     14 48044 2.913996e-04
## 804     14 48044 2.913996e-04
## 805     14 48044 2.913996e-04
## 806     14 48044 2.913996e-04
## 807     14 48044 2.913996e-04
## 808     14 48044 2.913996e-04
## 809     14 48044 2.913996e-04
## 810     14 48044 2.913996e-04
## 811     14 48044 2.913996e-04
## 812     14 48044 2.913996e-04
## 813     14 48044 2.913996e-04
## 814     14 48044 2.913996e-04
## 815     14 48044 2.913996e-04
## 816     14 48044 2.913996e-04
## 817     14 48044 2.913996e-04
## 818     14 48044 2.913996e-04
## 819     14 48044 2.913996e-04
## 820     14 48044 2.913996e-04
## 821     14 48044 2.913996e-04
## 822     14 48044 2.913996e-04
## 823     14 48044 2.913996e-04
## 824     14 48044 2.913996e-04
## 825     14 48044 2.913996e-04
## 826     14 31391 4.459877e-04
## 827     14 31391 4.459877e-04
## 828     14 31391 4.459877e-04
## 829     14 31391 4.459877e-04
## 830     14 31391 4.459877e-04
## 831     14 31391 4.459877e-04
## 832     14 31391 4.459877e-04
## 833     14 31391 4.459877e-04
## 834     14 31391 4.459877e-04
## 835     14 31391 4.459877e-04
## 836     14 31391 4.459877e-04
## 837     14 31391 4.459877e-04
## 838     14 31391 4.459877e-04
## 839     14 31391 4.459877e-04
## 840     14 31391 4.459877e-04
## 841     14 31391 4.459877e-04
## 842     14 31391 4.459877e-04
## 843     14 31391 4.459877e-04
## 844     14 16761 8.352724e-04
## 845     14 16761 8.352724e-04
## 846     14 16761 8.352724e-04
## 847     14 16761 8.352724e-04
## 848     14 16761 8.352724e-04
## 849     14 16761 8.352724e-04
## 850     14 16761 8.352724e-04
## 851     14 16761 8.352724e-04
## 852     13 48044 2.705853e-04
## 853     13 48044 2.705853e-04
## 854     13 48044 2.705853e-04
## 855     13 48044 2.705853e-04
## 856     13 48044 2.705853e-04
## 857     13 48044 2.705853e-04
## 858     13 48044 2.705853e-04
## 859     13 48044 2.705853e-04
## 860     13 48044 2.705853e-04
## 861     13 48044 2.705853e-04
## 862     13 48044 2.705853e-04
## 863     13 48044 2.705853e-04
## 864     13 48044 2.705853e-04
## 865     13 48044 2.705853e-04
## 866     13 48044 2.705853e-04
## 867     13 48044 2.705853e-04
## 868     13 48044 2.705853e-04
## 869     13 48044 2.705853e-04
## 870     13 48044 2.705853e-04
## 871     13 48044 2.705853e-04
## 872     13 48044 2.705853e-04
## 873     13 48044 2.705853e-04
## 874     13 48044 2.705853e-04
## 875     13 48044 2.705853e-04
## 876     13 48044 2.705853e-04
## 877     13 48044 2.705853e-04
## 878     13 48044 2.705853e-04
## 879     13 48044 2.705853e-04
## 880     13 48044 2.705853e-04
## 881     13 48044 2.705853e-04
## 882     13 48044 2.705853e-04
## 883     13 48044 2.705853e-04
## 884     13 48044 2.705853e-04
## 885     13 48044 2.705853e-04
## 886     13 48044 2.705853e-04
## 887     13 48044 2.705853e-04
## 888     13 48044 2.705853e-04
## 889     13 48044 2.705853e-04
## 890     13 48044 2.705853e-04
## 891     13 48044 2.705853e-04
## 892     13 48044 2.705853e-04
## 893     13 48044 2.705853e-04
## 894     13 48044 2.705853e-04
## 895     13 48044 2.705853e-04
## 896     13 48044 2.705853e-04
## 897     13 48044 2.705853e-04
## 898     13 48044 2.705853e-04
## 899     13 48044 2.705853e-04
## 900     13 48044 2.705853e-04
## 901     13 48044 2.705853e-04
## 902     13 48044 2.705853e-04
## 903     13 48044 2.705853e-04
## 904     13 48044 2.705853e-04
## 905     13 48044 2.705853e-04
## 906     13 48044 2.705853e-04
## 907     13 48044 2.705853e-04
## 908     13 48044 2.705853e-04
## 909     13 48044 2.705853e-04
## 910     13 48044 2.705853e-04
## 911     13 48044 2.705853e-04
## 912     13 48044 2.705853e-04
## 913     13 48044 2.705853e-04
## 914     13 31391 4.141314e-04
## 915     13 31391 4.141314e-04
## 916     13 31391 4.141314e-04
## 917     13 31391 4.141314e-04
## 918     13 31391 4.141314e-04
## 919     13 31391 4.141314e-04
## 920     13 31391 4.141314e-04
## 921     13 31391 4.141314e-04
## 922     13 31391 4.141314e-04
## 923     13 31391 4.141314e-04
## 924     13 31391 4.141314e-04
## 925     13 31391 4.141314e-04
## 926     13 31391 4.141314e-04
## 927     13 31391 4.141314e-04
## 928     13 31391 4.141314e-04
## 929     13 31391 4.141314e-04
## 930     13 31391 4.141314e-04
## 931     13 31391 4.141314e-04
## 932     13 31391 4.141314e-04
## 933     13 31391 4.141314e-04
## 934     13 31391 4.141314e-04
## 935     13 31391 4.141314e-04
## 936     13 31391 4.141314e-04
## 937     13 31391 4.141314e-04
## 938     13 31391 4.141314e-04
## 939     13 31391 4.141314e-04
## 940     13 31391 4.141314e-04
## 941     13 31391 4.141314e-04
## 942     13 31391 4.141314e-04
## 943     13 31391 4.141314e-04
## 944     13 31391 4.141314e-04
## 945     13 31391 4.141314e-04
## 946     13 31391 4.141314e-04
## 947     13 31391 4.141314e-04
## 948     13 31391 4.141314e-04
## 949     13 31391 4.141314e-04
## 950     13 31391 4.141314e-04
## 951     13 31391 4.141314e-04
## 952     13 31391 4.141314e-04
## 953     13 16761 7.756100e-04
## 954     13 16761 7.756100e-04
## 955     13 16761 7.756100e-04
## 956     13 16761 7.756100e-04
## 957     13 16761 7.756100e-04
## 958     13 16761 7.756100e-04
## 959     13 16761 7.756100e-04
## 960     13 16761 7.756100e-04
## 961     13 16761 7.756100e-04
## 962     13 16761 7.756100e-04
## 963     13 16761 7.756100e-04
## 964     13 16761 7.756100e-04
## 965     13 16761 7.756100e-04
## 966     13 16761 7.756100e-04
## 967     13 16761 7.756100e-04
## 968     13 16761 7.756100e-04
## 969     13 16761 7.756100e-04
## 970     13 16761 7.756100e-04
## 971     13 16761 7.756100e-04
## 972     12 48044 2.497710e-04
## 973     12 48044 2.497710e-04
## 974     12 48044 2.497710e-04
## 975     12 48044 2.497710e-04
## 976     12 48044 2.497710e-04
## 977     12 48044 2.497710e-04
## 978     12 48044 2.497710e-04
## 979     12 48044 2.497710e-04
## 980     12 48044 2.497710e-04
## 981     12 48044 2.497710e-04
## 982     12 48044 2.497710e-04
## 983     12 48044 2.497710e-04
## 984     12 48044 2.497710e-04
## 985     12 48044 2.497710e-04
## 986     12 48044 2.497710e-04
## 987     12 48044 2.497710e-04
## 988     12 48044 2.497710e-04
## 989     12 48044 2.497710e-04
## 990     12 48044 2.497710e-04
## 991     12 48044 2.497710e-04
## 992     12 48044 2.497710e-04
## 993     12 48044 2.497710e-04
## 994     12 48044 2.497710e-04
## 995     12 48044 2.497710e-04
## 996     12 48044 2.497710e-04
## 997     12 48044 2.497710e-04
## 998     12 48044 2.497710e-04
## 999     12 48044 2.497710e-04
## 1000    12 48044 2.497710e-04
## 1001    12 48044 2.497710e-04
## 1002    12 48044 2.497710e-04
## 1003    12 48044 2.497710e-04
## 1004    12 48044 2.497710e-04
## 1005    12 48044 2.497710e-04
## 1006    12 48044 2.497710e-04
## 1007    12 48044 2.497710e-04
## 1008    12 48044 2.497710e-04
## 1009    12 48044 2.497710e-04
## 1010    12 48044 2.497710e-04
## 1011    12 48044 2.497710e-04
## 1012    12 48044 2.497710e-04
## 1013    12 48044 2.497710e-04
## 1014    12 48044 2.497710e-04
## 1015    12 48044 2.497710e-04
## 1016    12 48044 2.497710e-04
## 1017    12 48044 2.497710e-04
## 1018    12 48044 2.497710e-04
## 1019    12 48044 2.497710e-04
## 1020    12 48044 2.497710e-04
## 1021    12 31391 3.822752e-04
## 1022    12 31391 3.822752e-04
## 1023    12 31391 3.822752e-04
## 1024    12 31391 3.822752e-04
## 1025    12 31391 3.822752e-04
## 1026    12 31391 3.822752e-04
## 1027    12 31391 3.822752e-04
## 1028    12 31391 3.822752e-04
## 1029    12 31391 3.822752e-04
## 1030    12 31391 3.822752e-04
## 1031    12 31391 3.822752e-04
## 1032    12 31391 3.822752e-04
## 1033    12 31391 3.822752e-04
## 1034    12 31391 3.822752e-04
## 1035    12 31391 3.822752e-04
## 1036    12 31391 3.822752e-04
## 1037    12 31391 3.822752e-04
## 1038    12 31391 3.822752e-04
## 1039    12 31391 3.822752e-04
## 1040    12 31391 3.822752e-04
## 1041    12 31391 3.822752e-04
## 1042    12 31391 3.822752e-04
## 1043    12 31391 3.822752e-04
## 1044    12 31391 3.822752e-04
## 1045    12 31391 3.822752e-04
## 1046    12 31391 3.822752e-04
## 1047    12 31391 3.822752e-04
## 1048    12 31391 3.822752e-04
## 1049    12 31391 3.822752e-04
## 1050    12 31391 3.822752e-04
## 1051    12 31391 3.822752e-04
## 1052    12 31391 3.822752e-04
## 1053    12 31391 3.822752e-04
## 1054    12 31391 3.822752e-04
## 1055    12 31391 3.822752e-04
## 1056    12 31391 3.822752e-04
## 1057    12 16761 7.159477e-04
## 1058    12 16761 7.159477e-04
## 1059    12 16761 7.159477e-04
## 1060    12 16761 7.159477e-04
## 1061    12 16761 7.159477e-04
## 1062    12 16761 7.159477e-04
## 1063    12 16761 7.159477e-04
## 1064    12 16761 7.159477e-04
## 1065    12 16761 7.159477e-04
## 1066    12 16761 7.159477e-04
## 1067    12 16761 7.159477e-04
## 1068    12 16761 7.159477e-04
## 1069    12 16761 7.159477e-04
## 1070    12 16761 7.159477e-04
## 1071    12 16761 7.159477e-04
## 1072    12 16761 7.159477e-04
## 1073    12 16761 7.159477e-04
## 1074    12 16761 7.159477e-04
## 1075    12 16761 7.159477e-04
## 1076    11 48044 2.289568e-04
## 1077    11 48044 2.289568e-04
## 1078    11 48044 2.289568e-04
## 1079    11 48044 2.289568e-04
## 1080    11 48044 2.289568e-04
## 1081    11 48044 2.289568e-04
## 1082    11 48044 2.289568e-04
## 1083    11 48044 2.289568e-04
## 1084    11 48044 2.289568e-04
## 1085    11 48044 2.289568e-04
## 1086    11 48044 2.289568e-04
## 1087    11 48044 2.289568e-04
## 1088    11 48044 2.289568e-04
## 1089    11 48044 2.289568e-04
## 1090    11 48044 2.289568e-04
## 1091    11 48044 2.289568e-04
## 1092    11 48044 2.289568e-04
## 1093    11 48044 2.289568e-04
## 1094    11 48044 2.289568e-04
## 1095    11 48044 2.289568e-04
## 1096    11 48044 2.289568e-04
## 1097    11 48044 2.289568e-04
## 1098    11 48044 2.289568e-04
## 1099    11 48044 2.289568e-04
## 1100    11 48044 2.289568e-04
## 1101    11 48044 2.289568e-04
## 1102    11 48044 2.289568e-04
## 1103    11 48044 2.289568e-04
## 1104    11 48044 2.289568e-04
## 1105    11 48044 2.289568e-04
## 1106    11 48044 2.289568e-04
## 1107    11 48044 2.289568e-04
## 1108    11 48044 2.289568e-04
## 1109    11 48044 2.289568e-04
## 1110    11 48044 2.289568e-04
## 1111    11 48044 2.289568e-04
## 1112    11 48044 2.289568e-04
## 1113    11 48044 2.289568e-04
## 1114    11 48044 2.289568e-04
## 1115    11 48044 2.289568e-04
## 1116    11 48044 2.289568e-04
## 1117    11 48044 2.289568e-04
## 1118    11 48044 2.289568e-04
## 1119    11 48044 2.289568e-04
## 1120    11 48044 2.289568e-04
## 1121    11 48044 2.289568e-04
## 1122    11 48044 2.289568e-04
## 1123    11 48044 2.289568e-04
## 1124    11 48044 2.289568e-04
## 1125    11 48044 2.289568e-04
## 1126    11 48044 2.289568e-04
## 1127    11 48044 2.289568e-04
## 1128    11 48044 2.289568e-04
## 1129    11 48044 2.289568e-04
## 1130    11 48044 2.289568e-04
## 1131    11 48044 2.289568e-04
## 1132    11 48044 2.289568e-04
## 1133    11 48044 2.289568e-04
## 1134    11 48044 2.289568e-04
## 1135    11 48044 2.289568e-04
## 1136    11 48044 2.289568e-04
## 1137    11 48044 2.289568e-04
## 1138    11 48044 2.289568e-04
## 1139    11 48044 2.289568e-04
## 1140    11 48044 2.289568e-04
## 1141    11 48044 2.289568e-04
## 1142    11 48044 2.289568e-04
## 1143    11 48044 2.289568e-04
## 1144    11 48044 2.289568e-04
## 1145    11 31391 3.504189e-04
## 1146    11 31391 3.504189e-04
## 1147    11 31391 3.504189e-04
## 1148    11 31391 3.504189e-04
## 1149    11 31391 3.504189e-04
## 1150    11 31391 3.504189e-04
## 1151    11 31391 3.504189e-04
## 1152    11 31391 3.504189e-04
## 1153    11 31391 3.504189e-04
## 1154    11 31391 3.504189e-04
## 1155    11 31391 3.504189e-04
## 1156    11 31391 3.504189e-04
## 1157    11 31391 3.504189e-04
## 1158    11 31391 3.504189e-04
## 1159    11 31391 3.504189e-04
## 1160    11 31391 3.504189e-04
## 1161    11 31391 3.504189e-04
## 1162    11 31391 3.504189e-04
## 1163    11 31391 3.504189e-04
## 1164    11 31391 3.504189e-04
## 1165    11 31391 3.504189e-04
## 1166    11 31391 3.504189e-04
## 1167    11 31391 3.504189e-04
## 1168    11 31391 3.504189e-04
## 1169    11 31391 3.504189e-04
## 1170    11 31391 3.504189e-04
## 1171    11 31391 3.504189e-04
## 1172    11 31391 3.504189e-04
## 1173    11 31391 3.504189e-04
## 1174    11 31391 3.504189e-04
## 1175    11 31391 3.504189e-04
## 1176    11 31391 3.504189e-04
## 1177    11 31391 3.504189e-04
## 1178    11 31391 3.504189e-04
## 1179    11 31391 3.504189e-04
## 1180    11 31391 3.504189e-04
## 1181    11 31391 3.504189e-04
## 1182    11 31391 3.504189e-04
## 1183    11 31391 3.504189e-04
## 1184    11 31391 3.504189e-04
## 1185    11 31391 3.504189e-04
## 1186    11 31391 3.504189e-04
## 1187    11 31391 3.504189e-04
## 1188    11 31391 3.504189e-04
## 1189    11 31391 3.504189e-04
## 1190    11 31391 3.504189e-04
## 1191    11 16761 6.562854e-04
## 1192    11 16761 6.562854e-04
## 1193    11 16761 6.562854e-04
## 1194    11 16761 6.562854e-04
## 1195    11 16761 6.562854e-04
## 1196    11 16761 6.562854e-04
## 1197    11 16761 6.562854e-04
## 1198    11 16761 6.562854e-04
## 1199    11 16761 6.562854e-04
## 1200    11 16761 6.562854e-04
## 1201    11 16761 6.562854e-04
## 1202    11 16761 6.562854e-04
## 1203    10 48044 2.081425e-04
## 1204    10 48044 2.081425e-04
## 1205    10 48044 2.081425e-04
## 1206    10 48044 2.081425e-04
## 1207    10 48044 2.081425e-04
## 1208    10 48044 2.081425e-04
## 1209    10 48044 2.081425e-04
## 1210    10 48044 2.081425e-04
## 1211    10 48044 2.081425e-04
## 1212    10 48044 2.081425e-04
## 1213    10 48044 2.081425e-04
## 1214    10 48044 2.081425e-04
## 1215    10 48044 2.081425e-04
## 1216    10 48044 2.081425e-04
## 1217    10 48044 2.081425e-04
## 1218    10 48044 2.081425e-04
## 1219    10 48044 2.081425e-04
## 1220    10 48044 2.081425e-04
## 1221    10 48044 2.081425e-04
## 1222    10 48044 2.081425e-04
## 1223    10 48044 2.081425e-04
## 1224    10 48044 2.081425e-04
## 1225    10 48044 2.081425e-04
## 1226    10 48044 2.081425e-04
## 1227    10 48044 2.081425e-04
## 1228    10 48044 2.081425e-04
## 1229    10 48044 2.081425e-04
## 1230    10 48044 2.081425e-04
## 1231    10 48044 2.081425e-04
## 1232    10 48044 2.081425e-04
## 1233    10 48044 2.081425e-04
## 1234    10 48044 2.081425e-04
## 1235    10 48044 2.081425e-04
## 1236    10 48044 2.081425e-04
## 1237    10 48044 2.081425e-04
## 1238    10 48044 2.081425e-04
## 1239    10 48044 2.081425e-04
## 1240    10 48044 2.081425e-04
## 1241    10 48044 2.081425e-04
## 1242    10 48044 2.081425e-04
## 1243    10 48044 2.081425e-04
## 1244    10 48044 2.081425e-04
## 1245    10 48044 2.081425e-04
## 1246    10 48044 2.081425e-04
## 1247    10 48044 2.081425e-04
## 1248    10 48044 2.081425e-04
## 1249    10 48044 2.081425e-04
## 1250    10 48044 2.081425e-04
## 1251    10 48044 2.081425e-04
## 1252    10 48044 2.081425e-04
## 1253    10 48044 2.081425e-04
## 1254    10 48044 2.081425e-04
## 1255    10 48044 2.081425e-04
## 1256    10 48044 2.081425e-04
## 1257    10 48044 2.081425e-04
## 1258    10 48044 2.081425e-04
## 1259    10 48044 2.081425e-04
## 1260    10 48044 2.081425e-04
## 1261    10 48044 2.081425e-04
## 1262    10 48044 2.081425e-04
## 1263    10 48044 2.081425e-04
## 1264    10 48044 2.081425e-04
## 1265    10 48044 2.081425e-04
## 1266    10 48044 2.081425e-04
## 1267    10 48044 2.081425e-04
## 1268    10 48044 2.081425e-04
## 1269    10 48044 2.081425e-04
## 1270    10 48044 2.081425e-04
## 1271    10 48044 2.081425e-04
## 1272    10 48044 2.081425e-04
## 1273    10 48044 2.081425e-04
## 1274    10 48044 2.081425e-04
## 1275    10 48044 2.081425e-04
## 1276    10 48044 2.081425e-04
## 1277    10 48044 2.081425e-04
## 1278    10 48044 2.081425e-04
## 1279    10 48044 2.081425e-04
## 1280    10 48044 2.081425e-04
## 1281    10 48044 2.081425e-04
## 1282    10 48044 2.081425e-04
## 1283    10 48044 2.081425e-04
## 1284    10 31391 3.185626e-04
## 1285    10 31391 3.185626e-04
## 1286    10 31391 3.185626e-04
## 1287    10 31391 3.185626e-04
## 1288    10 31391 3.185626e-04
## 1289    10 31391 3.185626e-04
## 1290    10 31391 3.185626e-04
## 1291    10 31391 3.185626e-04
## 1292    10 31391 3.185626e-04
## 1293    10 31391 3.185626e-04
## 1294    10 31391 3.185626e-04
## 1295    10 31391 3.185626e-04
## 1296    10 31391 3.185626e-04
## 1297    10 31391 3.185626e-04
## 1298    10 31391 3.185626e-04
## 1299    10 31391 3.185626e-04
## 1300    10 31391 3.185626e-04
## 1301    10 31391 3.185626e-04
## 1302    10 31391 3.185626e-04
## 1303    10 31391 3.185626e-04
## 1304    10 31391 3.185626e-04
## 1305    10 31391 3.185626e-04
## 1306    10 31391 3.185626e-04
## 1307    10 31391 3.185626e-04
## 1308    10 31391 3.185626e-04
## 1309    10 31391 3.185626e-04
## 1310    10 31391 3.185626e-04
## 1311    10 31391 3.185626e-04
## 1312    10 31391 3.185626e-04
## 1313    10 31391 3.185626e-04
## 1314    10 31391 3.185626e-04
## 1315    10 31391 3.185626e-04
## 1316    10 31391 3.185626e-04
## 1317    10 31391 3.185626e-04
## 1318    10 31391 3.185626e-04
## 1319    10 31391 3.185626e-04
## 1320    10 31391 3.185626e-04
## 1321    10 31391 3.185626e-04
## 1322    10 31391 3.185626e-04
## 1323    10 31391 3.185626e-04
## 1324    10 31391 3.185626e-04
## 1325    10 31391 3.185626e-04
## 1326    10 31391 3.185626e-04
## 1327    10 31391 3.185626e-04
## 1328    10 16761 5.966231e-04
## 1329    10 16761 5.966231e-04
## 1330    10 16761 5.966231e-04
## 1331    10 16761 5.966231e-04
## 1332    10 16761 5.966231e-04
## 1333    10 16761 5.966231e-04
## 1334    10 16761 5.966231e-04
## 1335    10 16761 5.966231e-04
## 1336    10 16761 5.966231e-04
## 1337    10 16761 5.966231e-04
## 1338    10 16761 5.966231e-04
## 1339    10 16761 5.966231e-04
## 1340    10 16761 5.966231e-04
## 1341    10 16761 5.966231e-04
## 1342    10 16761 5.966231e-04
## 1343    10 16761 5.966231e-04
## 1344    10 16761 5.966231e-04
## 1345    10 16761 5.966231e-04
## 1346    10 16761 5.966231e-04
## 1347    10 16761 5.966231e-04
## 1348    10 16761 5.966231e-04
## 1349    10 16761 5.966231e-04
## 1350    10 16761 5.966231e-04
## 1351    10 16761 5.966231e-04
## 1352    10 16761 5.966231e-04
## 1353    10 16761 5.966231e-04
## 1354    10 16761 5.966231e-04
## 1355    10 16761 5.966231e-04
## 1356     9 48044 1.873283e-04
## 1357     9 48044 1.873283e-04
## 1358     9 48044 1.873283e-04
## 1359     9 48044 1.873283e-04
## 1360     9 48044 1.873283e-04
## 1361     9 48044 1.873283e-04
## 1362     9 48044 1.873283e-04
## 1363     9 48044 1.873283e-04
## 1364     9 48044 1.873283e-04
## 1365     9 48044 1.873283e-04
## 1366     9 48044 1.873283e-04
## 1367     9 48044 1.873283e-04
## 1368     9 48044 1.873283e-04
## 1369     9 48044 1.873283e-04
## 1370     9 48044 1.873283e-04
## 1371     9 48044 1.873283e-04
## 1372     9 48044 1.873283e-04
## 1373     9 48044 1.873283e-04
## 1374     9 48044 1.873283e-04
## 1375     9 48044 1.873283e-04
## 1376     9 48044 1.873283e-04
## 1377     9 48044 1.873283e-04
## 1378     9 48044 1.873283e-04
## 1379     9 48044 1.873283e-04
## 1380     9 48044 1.873283e-04
## 1381     9 48044 1.873283e-04
## 1382     9 48044 1.873283e-04
## 1383     9 48044 1.873283e-04
## 1384     9 48044 1.873283e-04
## 1385     9 48044 1.873283e-04
## 1386     9 48044 1.873283e-04
## 1387     9 48044 1.873283e-04
## 1388     9 48044 1.873283e-04
## 1389     9 48044 1.873283e-04
## 1390     9 48044 1.873283e-04
## 1391     9 48044 1.873283e-04
## 1392     9 48044 1.873283e-04
## 1393     9 48044 1.873283e-04
## 1394     9 48044 1.873283e-04
## 1395     9 48044 1.873283e-04
## 1396     9 48044 1.873283e-04
## 1397     9 48044 1.873283e-04
## 1398     9 48044 1.873283e-04
## 1399     9 48044 1.873283e-04
## 1400     9 48044 1.873283e-04
## 1401     9 48044 1.873283e-04
## 1402     9 48044 1.873283e-04
## 1403     9 48044 1.873283e-04
## 1404     9 48044 1.873283e-04
## 1405     9 48044 1.873283e-04
## 1406     9 48044 1.873283e-04
## 1407     9 48044 1.873283e-04
## 1408     9 48044 1.873283e-04
## 1409     9 48044 1.873283e-04
## 1410     9 48044 1.873283e-04
## 1411     9 48044 1.873283e-04
## 1412     9 48044 1.873283e-04
## 1413     9 48044 1.873283e-04
## 1414     9 48044 1.873283e-04
## 1415     9 48044 1.873283e-04
## 1416     9 48044 1.873283e-04
## 1417     9 48044 1.873283e-04
## 1418     9 48044 1.873283e-04
## 1419     9 48044 1.873283e-04
## 1420     9 48044 1.873283e-04
## 1421     9 48044 1.873283e-04
## 1422     9 48044 1.873283e-04
## 1423     9 48044 1.873283e-04
## 1424     9 48044 1.873283e-04
## 1425     9 48044 1.873283e-04
## 1426     9 48044 1.873283e-04
## 1427     9 48044 1.873283e-04
## 1428     9 48044 1.873283e-04
## 1429     9 48044 1.873283e-04
## 1430     9 48044 1.873283e-04
## 1431     9 48044 1.873283e-04
## 1432     9 48044 1.873283e-04
## 1433     9 48044 1.873283e-04
## 1434     9 48044 1.873283e-04
## 1435     9 48044 1.873283e-04
## 1436     9 48044 1.873283e-04
## 1437     9 48044 1.873283e-04
## 1438     9 48044 1.873283e-04
## 1439     9 48044 1.873283e-04
## 1440     9 48044 1.873283e-04
## 1441     9 48044 1.873283e-04
## 1442     9 48044 1.873283e-04
## 1443     9 48044 1.873283e-04
## 1444     9 48044 1.873283e-04
## 1445     9 48044 1.873283e-04
## 1446     9 48044 1.873283e-04
## 1447     9 48044 1.873283e-04
## 1448     9 48044 1.873283e-04
## 1449     9 48044 1.873283e-04
## 1450     9 31391 2.867064e-04
## 1451     9 31391 2.867064e-04
## 1452     9 31391 2.867064e-04
## 1453     9 31391 2.867064e-04
## 1454     9 31391 2.867064e-04
## 1455     9 31391 2.867064e-04
## 1456     9 31391 2.867064e-04
## 1457     9 31391 2.867064e-04
## 1458     9 31391 2.867064e-04
## 1459     9 31391 2.867064e-04
## 1460     9 31391 2.867064e-04
## 1461     9 31391 2.867064e-04
## 1462     9 31391 2.867064e-04
## 1463     9 31391 2.867064e-04
## 1464     9 31391 2.867064e-04
## 1465     9 31391 2.867064e-04
## 1466     9 31391 2.867064e-04
## 1467     9 31391 2.867064e-04
## 1468     9 31391 2.867064e-04
## 1469     9 31391 2.867064e-04
## 1470     9 31391 2.867064e-04
## 1471     9 31391 2.867064e-04
## 1472     9 31391 2.867064e-04
## 1473     9 31391 2.867064e-04
## 1474     9 31391 2.867064e-04
## 1475     9 31391 2.867064e-04
## 1476     9 31391 2.867064e-04
## 1477     9 31391 2.867064e-04
## 1478     9 31391 2.867064e-04
## 1479     9 31391 2.867064e-04
## 1480     9 31391 2.867064e-04
## 1481     9 31391 2.867064e-04
## 1482     9 31391 2.867064e-04
## 1483     9 31391 2.867064e-04
## 1484     9 31391 2.867064e-04
## 1485     9 31391 2.867064e-04
## 1486     9 31391 2.867064e-04
## 1487     9 31391 2.867064e-04
## 1488     9 31391 2.867064e-04
## 1489     9 31391 2.867064e-04
## 1490     9 31391 2.867064e-04
## 1491     9 31391 2.867064e-04
## 1492     9 31391 2.867064e-04
## 1493     9 31391 2.867064e-04
## 1494     9 31391 2.867064e-04
## 1495     9 31391 2.867064e-04
## 1496     9 31391 2.867064e-04
## 1497     9 31391 2.867064e-04
## 1498     9 31391 2.867064e-04
## 1499     9 31391 2.867064e-04
## 1500     9 31391 2.867064e-04
## 1501     9 31391 2.867064e-04
## 1502     9 31391 2.867064e-04
## 1503     9 31391 2.867064e-04
## 1504     9 31391 2.867064e-04
## 1505     9 31391 2.867064e-04
## 1506     9 31391 2.867064e-04
## 1507     9 31391 2.867064e-04
## 1508     9 31391 2.867064e-04
## 1509     9 31391 2.867064e-04
## 1510     9 31391 2.867064e-04
## 1511     9 31391 2.867064e-04
## 1512     9 31391 2.867064e-04
## 1513     9 31391 2.867064e-04
## 1514     9 31391 2.867064e-04
## 1515     9 31391 2.867064e-04
## 1516     9 31391 2.867064e-04
## 1517     9 31391 2.867064e-04
## 1518     9 31391 2.867064e-04
## 1519     9 31391 2.867064e-04
## 1520     9 31391 2.867064e-04
## 1521     9 31391 2.867064e-04
## 1522     9 31391 2.867064e-04
## 1523     9 31391 2.867064e-04
## 1524     9 31391 2.867064e-04
## 1525     9 31391 2.867064e-04
## 1526     9 31391 2.867064e-04
## 1527     9 31391 2.867064e-04
## 1528     9 16761 5.369608e-04
## 1529     9 16761 5.369608e-04
## 1530     9 16761 5.369608e-04
## 1531     9 16761 5.369608e-04
## 1532     9 16761 5.369608e-04
## 1533     9 16761 5.369608e-04
## 1534     9 16761 5.369608e-04
## 1535     9 16761 5.369608e-04
## 1536     9 16761 5.369608e-04
## 1537     9 16761 5.369608e-04
## 1538     9 16761 5.369608e-04
## 1539     9 16761 5.369608e-04
## 1540     9 16761 5.369608e-04
## 1541     9 16761 5.369608e-04
## 1542     9 16761 5.369608e-04
## 1543     9 16761 5.369608e-04
## 1544     9 16761 5.369608e-04
## 1545     9 16761 5.369608e-04
## 1546     9 16761 5.369608e-04
## 1547     9 16761 5.369608e-04
## 1548     9 16761 5.369608e-04
## 1549     9 16761 5.369608e-04
## 1550     9 16761 5.369608e-04
## 1551     9 16761 5.369608e-04
## 1552     9 16761 5.369608e-04
## 1553     9 16761 5.369608e-04
## 1554     9 16761 5.369608e-04
## 1555     9 16761 5.369608e-04
## 1556     9 16761 5.369608e-04
## 1557     9 16761 5.369608e-04
## 1558     9 16761 5.369608e-04
## 1559     9 16761 5.369608e-04
## 1560     9 16761 5.369608e-04
## 1561     9 16761 5.369608e-04
## 1562     8 48044 1.665140e-04
## 1563     8 48044 1.665140e-04
## 1564     8 48044 1.665140e-04
## 1565     8 48044 1.665140e-04
## 1566     8 48044 1.665140e-04
## 1567     8 48044 1.665140e-04
## 1568     8 48044 1.665140e-04
## 1569     8 48044 1.665140e-04
## 1570     8 48044 1.665140e-04
## 1571     8 48044 1.665140e-04
## 1572     8 48044 1.665140e-04
## 1573     8 48044 1.665140e-04
## 1574     8 48044 1.665140e-04
## 1575     8 48044 1.665140e-04
## 1576     8 48044 1.665140e-04
## 1577     8 48044 1.665140e-04
## 1578     8 48044 1.665140e-04
## 1579     8 48044 1.665140e-04
## 1580     8 48044 1.665140e-04
## 1581     8 48044 1.665140e-04
## 1582     8 48044 1.665140e-04
## 1583     8 48044 1.665140e-04
## 1584     8 48044 1.665140e-04
## 1585     8 48044 1.665140e-04
## 1586     8 48044 1.665140e-04
## 1587     8 48044 1.665140e-04
## 1588     8 48044 1.665140e-04
## 1589     8 48044 1.665140e-04
## 1590     8 48044 1.665140e-04
## 1591     8 48044 1.665140e-04
## 1592     8 48044 1.665140e-04
## 1593     8 48044 1.665140e-04
## 1594     8 48044 1.665140e-04
## 1595     8 48044 1.665140e-04
## 1596     8 48044 1.665140e-04
## 1597     8 48044 1.665140e-04
## 1598     8 48044 1.665140e-04
## 1599     8 48044 1.665140e-04
## 1600     8 48044 1.665140e-04
## 1601     8 48044 1.665140e-04
## 1602     8 48044 1.665140e-04
## 1603     8 48044 1.665140e-04
## 1604     8 48044 1.665140e-04
## 1605     8 48044 1.665140e-04
## 1606     8 48044 1.665140e-04
## 1607     8 48044 1.665140e-04
## 1608     8 48044 1.665140e-04
## 1609     8 48044 1.665140e-04
## 1610     8 48044 1.665140e-04
## 1611     8 48044 1.665140e-04
## 1612     8 48044 1.665140e-04
## 1613     8 48044 1.665140e-04
## 1614     8 48044 1.665140e-04
## 1615     8 48044 1.665140e-04
## 1616     8 48044 1.665140e-04
## 1617     8 48044 1.665140e-04
## 1618     8 48044 1.665140e-04
## 1619     8 48044 1.665140e-04
## 1620     8 48044 1.665140e-04
## 1621     8 48044 1.665140e-04
## 1622     8 48044 1.665140e-04
## 1623     8 48044 1.665140e-04
## 1624     8 48044 1.665140e-04
## 1625     8 48044 1.665140e-04
## 1626     8 48044 1.665140e-04
## 1627     8 48044 1.665140e-04
## 1628     8 48044 1.665140e-04
## 1629     8 48044 1.665140e-04
## 1630     8 48044 1.665140e-04
## 1631     8 48044 1.665140e-04
## 1632     8 48044 1.665140e-04
## 1633     8 48044 1.665140e-04
## 1634     8 48044 1.665140e-04
## 1635     8 48044 1.665140e-04
## 1636     8 48044 1.665140e-04
## 1637     8 48044 1.665140e-04
## 1638     8 48044 1.665140e-04
## 1639     8 48044 1.665140e-04
## 1640     8 48044 1.665140e-04
## 1641     8 48044 1.665140e-04
## 1642     8 48044 1.665140e-04
## 1643     8 48044 1.665140e-04
## 1644     8 48044 1.665140e-04
## 1645     8 48044 1.665140e-04
## 1646     8 48044 1.665140e-04
## 1647     8 48044 1.665140e-04
## 1648     8 48044 1.665140e-04
## 1649     8 48044 1.665140e-04
## 1650     8 48044 1.665140e-04
## 1651     8 48044 1.665140e-04
## 1652     8 48044 1.665140e-04
## 1653     8 48044 1.665140e-04
## 1654     8 48044 1.665140e-04
## 1655     8 48044 1.665140e-04
## 1656     8 48044 1.665140e-04
## 1657     8 48044 1.665140e-04
## 1658     8 48044 1.665140e-04
## 1659     8 48044 1.665140e-04
## 1660     8 48044 1.665140e-04
## 1661     8 48044 1.665140e-04
## 1662     8 48044 1.665140e-04
## 1663     8 48044 1.665140e-04
## 1664     8 48044 1.665140e-04
## 1665     8 48044 1.665140e-04
## 1666     8 48044 1.665140e-04
## 1667     8 48044 1.665140e-04
## 1668     8 48044 1.665140e-04
## 1669     8 48044 1.665140e-04
## 1670     8 48044 1.665140e-04
## 1671     8 48044 1.665140e-04
## 1672     8 48044 1.665140e-04
## 1673     8 48044 1.665140e-04
## 1674     8 48044 1.665140e-04
## 1675     8 48044 1.665140e-04
## 1676     8 48044 1.665140e-04
## 1677     8 48044 1.665140e-04
## 1678     8 48044 1.665140e-04
## 1679     8 48044 1.665140e-04
## 1680     8 48044 1.665140e-04
## 1681     8 48044 1.665140e-04
## 1682     8 48044 1.665140e-04
## 1683     8 48044 1.665140e-04
## 1684     8 48044 1.665140e-04
## 1685     8 48044 1.665140e-04
## 1686     8 48044 1.665140e-04
## 1687     8 48044 1.665140e-04
## 1688     8 48044 1.665140e-04
## 1689     8 48044 1.665140e-04
## 1690     8 48044 1.665140e-04
## 1691     8 48044 1.665140e-04
## 1692     8 48044 1.665140e-04
## 1693     8 48044 1.665140e-04
## 1694     8 48044 1.665140e-04
## 1695     8 48044 1.665140e-04
## 1696     8 31391 2.548501e-04
## 1697     8 31391 2.548501e-04
## 1698     8 31391 2.548501e-04
## 1699     8 31391 2.548501e-04
## 1700     8 31391 2.548501e-04
## 1701     8 31391 2.548501e-04
## 1702     8 31391 2.548501e-04
## 1703     8 31391 2.548501e-04
## 1704     8 31391 2.548501e-04
## 1705     8 31391 2.548501e-04
## 1706     8 31391 2.548501e-04
## 1707     8 31391 2.548501e-04
## 1708     8 31391 2.548501e-04
## 1709     8 31391 2.548501e-04
## 1710     8 31391 2.548501e-04
## 1711     8 31391 2.548501e-04
## 1712     8 31391 2.548501e-04
## 1713     8 31391 2.548501e-04
## 1714     8 31391 2.548501e-04
## 1715     8 31391 2.548501e-04
## 1716     8 31391 2.548501e-04
## 1717     8 31391 2.548501e-04
## 1718     8 31391 2.548501e-04
## 1719     8 31391 2.548501e-04
## 1720     8 31391 2.548501e-04
## 1721     8 31391 2.548501e-04
## 1722     8 31391 2.548501e-04
## 1723     8 31391 2.548501e-04
## 1724     8 31391 2.548501e-04
## 1725     8 31391 2.548501e-04
## 1726     8 31391 2.548501e-04
## 1727     8 31391 2.548501e-04
## 1728     8 31391 2.548501e-04
## 1729     8 31391 2.548501e-04
## 1730     8 31391 2.548501e-04
## 1731     8 31391 2.548501e-04
## 1732     8 31391 2.548501e-04
## 1733     8 31391 2.548501e-04
## 1734     8 31391 2.548501e-04
## 1735     8 31391 2.548501e-04
## 1736     8 31391 2.548501e-04
## 1737     8 31391 2.548501e-04
## 1738     8 31391 2.548501e-04
## 1739     8 31391 2.548501e-04
## 1740     8 31391 2.548501e-04
## 1741     8 31391 2.548501e-04
## 1742     8 31391 2.548501e-04
## 1743     8 31391 2.548501e-04
## 1744     8 31391 2.548501e-04
## 1745     8 31391 2.548501e-04
## 1746     8 31391 2.548501e-04
## 1747     8 31391 2.548501e-04
## 1748     8 31391 2.548501e-04
## 1749     8 31391 2.548501e-04
## 1750     8 31391 2.548501e-04
## 1751     8 31391 2.548501e-04
## 1752     8 31391 2.548501e-04
## 1753     8 31391 2.548501e-04
## 1754     8 31391 2.548501e-04
## 1755     8 31391 2.548501e-04
## 1756     8 31391 2.548501e-04
## 1757     8 31391 2.548501e-04
## 1758     8 31391 2.548501e-04
## 1759     8 31391 2.548501e-04
## 1760     8 31391 2.548501e-04
## 1761     8 31391 2.548501e-04
## 1762     8 31391 2.548501e-04
## 1763     8 31391 2.548501e-04
## 1764     8 31391 2.548501e-04
## 1765     8 31391 2.548501e-04
## 1766     8 31391 2.548501e-04
## 1767     8 31391 2.548501e-04
## 1768     8 31391 2.548501e-04
## 1769     8 31391 2.548501e-04
## 1770     8 31391 2.548501e-04
## 1771     8 31391 2.548501e-04
## 1772     8 16761 4.772985e-04
## 1773     8 16761 4.772985e-04
## 1774     8 16761 4.772985e-04
## 1775     8 16761 4.772985e-04
## 1776     8 16761 4.772985e-04
## 1777     8 16761 4.772985e-04
## 1778     8 16761 4.772985e-04
## 1779     8 16761 4.772985e-04
## 1780     8 16761 4.772985e-04
## 1781     8 16761 4.772985e-04
## 1782     8 16761 4.772985e-04
## 1783     8 16761 4.772985e-04
## 1784     8 16761 4.772985e-04
## 1785     8 16761 4.772985e-04
## 1786     8 16761 4.772985e-04
## 1787     8 16761 4.772985e-04
## 1788     8 16761 4.772985e-04
## 1789     8 16761 4.772985e-04
## 1790     8 16761 4.772985e-04
## 1791     8 16761 4.772985e-04
## 1792     8 16761 4.772985e-04
## 1793     8 16761 4.772985e-04
## 1794     8 16761 4.772985e-04
## 1795     8 16761 4.772985e-04
## 1796     8 16761 4.772985e-04
## 1797     8 16761 4.772985e-04
## 1798     8 16761 4.772985e-04
## 1799     8 16761 4.772985e-04
## 1800     8 16761 4.772985e-04
## 1801     8 16761 4.772985e-04
## 1802     8 16761 4.772985e-04
## 1803     8 16761 4.772985e-04
## 1804     8 16761 4.772985e-04
## 1805     8 16761 4.772985e-04
## 1806     8 16761 4.772985e-04
## 1807     8 16761 4.772985e-04
## 1808     8 16761 4.772985e-04
## 1809     8 16761 4.772985e-04
## 1810     8 16761 4.772985e-04
## 1811     8 16761 4.772985e-04
## 1812     8 16761 4.772985e-04
## 1813     8 16761 4.772985e-04
## 1814     8 16761 4.772985e-04
## 1815     8 16761 4.772985e-04
## 1816     8 16761 4.772985e-04
## 1817     8 16761 4.772985e-04
## 1818     8 16761 4.772985e-04
## 1819     8 16761 4.772985e-04
## 1820     8 16761 4.772985e-04
## 1821     8 16761 4.772985e-04
## 1822     8 16761 4.772985e-04
## 1823     8 16761 4.772985e-04
## 1824     8 16761 4.772985e-04
## 1825     7 48044 1.456998e-04
## 1826     7 48044 1.456998e-04
## 1827     7 48044 1.456998e-04
## 1828     7 48044 1.456998e-04
## 1829     7 48044 1.456998e-04
## 1830     7 48044 1.456998e-04
## 1831     7 48044 1.456998e-04
## 1832     7 48044 1.456998e-04
## 1833     7 48044 1.456998e-04
## 1834     7 48044 1.456998e-04
## 1835     7 48044 1.456998e-04
## 1836     7 48044 1.456998e-04
## 1837     7 48044 1.456998e-04
## 1838     7 48044 1.456998e-04
## 1839     7 48044 1.456998e-04
## 1840     7 48044 1.456998e-04
## 1841     7 48044 1.456998e-04
## 1842     7 48044 1.456998e-04
## 1843     7 48044 1.456998e-04
## 1844     7 48044 1.456998e-04
## 1845     7 48044 1.456998e-04
## 1846     7 48044 1.456998e-04
## 1847     7 48044 1.456998e-04
## 1848     7 48044 1.456998e-04
## 1849     7 48044 1.456998e-04
## 1850     7 48044 1.456998e-04
## 1851     7 48044 1.456998e-04
## 1852     7 48044 1.456998e-04
## 1853     7 48044 1.456998e-04
## 1854     7 48044 1.456998e-04
## 1855     7 48044 1.456998e-04
## 1856     7 48044 1.456998e-04
## 1857     7 48044 1.456998e-04
## 1858     7 48044 1.456998e-04
## 1859     7 48044 1.456998e-04
## 1860     7 48044 1.456998e-04
## 1861     7 48044 1.456998e-04
## 1862     7 48044 1.456998e-04
## 1863     7 48044 1.456998e-04
## 1864     7 48044 1.456998e-04
## 1865     7 48044 1.456998e-04
## 1866     7 48044 1.456998e-04
## 1867     7 48044 1.456998e-04
## 1868     7 48044 1.456998e-04
## 1869     7 48044 1.456998e-04
## 1870     7 48044 1.456998e-04
## 1871     7 48044 1.456998e-04
## 1872     7 48044 1.456998e-04
## 1873     7 48044 1.456998e-04
## 1874     7 48044 1.456998e-04
## 1875     7 48044 1.456998e-04
## 1876     7 48044 1.456998e-04
## 1877     7 48044 1.456998e-04
## 1878     7 48044 1.456998e-04
## 1879     7 48044 1.456998e-04
## 1880     7 48044 1.456998e-04
## 1881     7 48044 1.456998e-04
## 1882     7 48044 1.456998e-04
## 1883     7 48044 1.456998e-04
## 1884     7 48044 1.456998e-04
## 1885     7 48044 1.456998e-04
## 1886     7 48044 1.456998e-04
## 1887     7 48044 1.456998e-04
## 1888     7 48044 1.456998e-04
## 1889     7 48044 1.456998e-04
## 1890     7 48044 1.456998e-04
## 1891     7 48044 1.456998e-04
## 1892     7 48044 1.456998e-04
## 1893     7 48044 1.456998e-04
## 1894     7 48044 1.456998e-04
## 1895     7 48044 1.456998e-04
## 1896     7 48044 1.456998e-04
## 1897     7 48044 1.456998e-04
## 1898     7 48044 1.456998e-04
## 1899     7 48044 1.456998e-04
## 1900     7 48044 1.456998e-04
## 1901     7 48044 1.456998e-04
## 1902     7 48044 1.456998e-04
## 1903     7 48044 1.456998e-04
## 1904     7 48044 1.456998e-04
## 1905     7 48044 1.456998e-04
## 1906     7 48044 1.456998e-04
## 1907     7 48044 1.456998e-04
## 1908     7 48044 1.456998e-04
## 1909     7 48044 1.456998e-04
## 1910     7 48044 1.456998e-04
## 1911     7 48044 1.456998e-04
## 1912     7 48044 1.456998e-04
## 1913     7 48044 1.456998e-04
## 1914     7 48044 1.456998e-04
## 1915     7 48044 1.456998e-04
## 1916     7 48044 1.456998e-04
## 1917     7 48044 1.456998e-04
## 1918     7 48044 1.456998e-04
## 1919     7 48044 1.456998e-04
## 1920     7 48044 1.456998e-04
## 1921     7 48044 1.456998e-04
## 1922     7 48044 1.456998e-04
## 1923     7 48044 1.456998e-04
## 1924     7 48044 1.456998e-04
## 1925     7 48044 1.456998e-04
## 1926     7 48044 1.456998e-04
## 1927     7 48044 1.456998e-04
## 1928     7 48044 1.456998e-04
## 1929     7 48044 1.456998e-04
## 1930     7 48044 1.456998e-04
## 1931     7 48044 1.456998e-04
## 1932     7 48044 1.456998e-04
## 1933     7 48044 1.456998e-04
## 1934     7 48044 1.456998e-04
## 1935     7 48044 1.456998e-04
## 1936     7 48044 1.456998e-04
## 1937     7 48044 1.456998e-04
## 1938     7 48044 1.456998e-04
## 1939     7 48044 1.456998e-04
## 1940     7 48044 1.456998e-04
## 1941     7 48044 1.456998e-04
## 1942     7 48044 1.456998e-04
## 1943     7 48044 1.456998e-04
## 1944     7 48044 1.456998e-04
## 1945     7 48044 1.456998e-04
## 1946     7 48044 1.456998e-04
## 1947     7 48044 1.456998e-04
## 1948     7 48044 1.456998e-04
## 1949     7 48044 1.456998e-04
## 1950     7 48044 1.456998e-04
## 1951     7 48044 1.456998e-04
## 1952     7 48044 1.456998e-04
## 1953     7 48044 1.456998e-04
## 1954     7 48044 1.456998e-04
## 1955     7 48044 1.456998e-04
## 1956     7 48044 1.456998e-04
## 1957     7 48044 1.456998e-04
## 1958     7 48044 1.456998e-04
## 1959     7 48044 1.456998e-04
## 1960     7 48044 1.456998e-04
## 1961     7 48044 1.456998e-04
## 1962     7 48044 1.456998e-04
## 1963     7 48044 1.456998e-04
## 1964     7 48044 1.456998e-04
## 1965     7 48044 1.456998e-04
## 1966     7 48044 1.456998e-04
## 1967     7 48044 1.456998e-04
## 1968     7 48044 1.456998e-04
## 1969     7 48044 1.456998e-04
## 1970     7 48044 1.456998e-04
## 1971     7 48044 1.456998e-04
## 1972     7 48044 1.456998e-04
## 1973     7 48044 1.456998e-04
## 1974     7 48044 1.456998e-04
## 1975     7 48044 1.456998e-04
## 1976     7 48044 1.456998e-04
## 1977     7 48044 1.456998e-04
## 1978     7 48044 1.456998e-04
## 1979     7 48044 1.456998e-04
## 1980     7 48044 1.456998e-04
## 1981     7 48044 1.456998e-04
## 1982     7 48044 1.456998e-04
## 1983     7 48044 1.456998e-04
## 1984     7 48044 1.456998e-04
## 1985     7 48044 1.456998e-04
## 1986     7 48044 1.456998e-04
## 1987     7 48044 1.456998e-04
## 1988     7 48044 1.456998e-04
## 1989     7 48044 1.456998e-04
## 1990     7 48044 1.456998e-04
## 1991     7 48044 1.456998e-04
## 1992     7 48044 1.456998e-04
## 1993     7 48044 1.456998e-04
## 1994     7 31391 2.229939e-04
## 1995     7 31391 2.229939e-04
## 1996     7 31391 2.229939e-04
## 1997     7 31391 2.229939e-04
## 1998     7 31391 2.229939e-04
## 1999     7 31391 2.229939e-04
## 2000     7 31391 2.229939e-04
## 2001     7 31391 2.229939e-04
## 2002     7 31391 2.229939e-04
## 2003     7 31391 2.229939e-04
## 2004     7 31391 2.229939e-04
## 2005     7 31391 2.229939e-04
## 2006     7 31391 2.229939e-04
## 2007     7 31391 2.229939e-04
## 2008     7 31391 2.229939e-04
## 2009     7 31391 2.229939e-04
## 2010     7 31391 2.229939e-04
## 2011     7 31391 2.229939e-04
## 2012     7 31391 2.229939e-04
## 2013     7 31391 2.229939e-04
## 2014     7 31391 2.229939e-04
## 2015     7 31391 2.229939e-04
## 2016     7 31391 2.229939e-04
## 2017     7 31391 2.229939e-04
## 2018     7 31391 2.229939e-04
## 2019     7 31391 2.229939e-04
## 2020     7 31391 2.229939e-04
## 2021     7 31391 2.229939e-04
## 2022     7 31391 2.229939e-04
## 2023     7 31391 2.229939e-04
## 2024     7 31391 2.229939e-04
## 2025     7 31391 2.229939e-04
## 2026     7 31391 2.229939e-04
## 2027     7 31391 2.229939e-04
## 2028     7 31391 2.229939e-04
## 2029     7 31391 2.229939e-04
## 2030     7 31391 2.229939e-04
## 2031     7 31391 2.229939e-04
## 2032     7 31391 2.229939e-04
## 2033     7 31391 2.229939e-04
## 2034     7 31391 2.229939e-04
## 2035     7 31391 2.229939e-04
## 2036     7 31391 2.229939e-04
## 2037     7 31391 2.229939e-04
## 2038     7 31391 2.229939e-04
## 2039     7 31391 2.229939e-04
## 2040     7 31391 2.229939e-04
## 2041     7 31391 2.229939e-04
## 2042     7 31391 2.229939e-04
## 2043     7 31391 2.229939e-04
## 2044     7 31391 2.229939e-04
## 2045     7 31391 2.229939e-04
## 2046     7 31391 2.229939e-04
## 2047     7 31391 2.229939e-04
## 2048     7 31391 2.229939e-04
## 2049     7 31391 2.229939e-04
## 2050     7 31391 2.229939e-04
## 2051     7 31391 2.229939e-04
## 2052     7 31391 2.229939e-04
## 2053     7 31391 2.229939e-04
## 2054     7 31391 2.229939e-04
## 2055     7 31391 2.229939e-04
## 2056     7 31391 2.229939e-04
## 2057     7 31391 2.229939e-04
## 2058     7 31391 2.229939e-04
## 2059     7 31391 2.229939e-04
## 2060     7 31391 2.229939e-04
## 2061     7 31391 2.229939e-04
## 2062     7 31391 2.229939e-04
## 2063     7 31391 2.229939e-04
## 2064     7 31391 2.229939e-04
## 2065     7 31391 2.229939e-04
## 2066     7 31391 2.229939e-04
## 2067     7 31391 2.229939e-04
## 2068     7 31391 2.229939e-04
## 2069     7 31391 2.229939e-04
## 2070     7 31391 2.229939e-04
## 2071     7 31391 2.229939e-04
## 2072     7 31391 2.229939e-04
## 2073     7 31391 2.229939e-04
## 2074     7 31391 2.229939e-04
## 2075     7 31391 2.229939e-04
## 2076     7 31391 2.229939e-04
## 2077     7 31391 2.229939e-04
## 2078     7 31391 2.229939e-04
## 2079     7 31391 2.229939e-04
## 2080     7 31391 2.229939e-04
## 2081     7 31391 2.229939e-04
## 2082     7 31391 2.229939e-04
## 2083     7 31391 2.229939e-04
## 2084     7 31391 2.229939e-04
## 2085     7 31391 2.229939e-04
## 2086     7 31391 2.229939e-04
## 2087     7 31391 2.229939e-04
## 2088     7 31391 2.229939e-04
## 2089     7 31391 2.229939e-04
## 2090     7 31391 2.229939e-04
## 2091     7 31391 2.229939e-04
## 2092     7 31391 2.229939e-04
## 2093     7 31391 2.229939e-04
## 2094     7 31391 2.229939e-04
## 2095     7 31391 2.229939e-04
## 2096     7 31391 2.229939e-04
## 2097     7 16761 4.176362e-04
## 2098     7 16761 4.176362e-04
## 2099     7 16761 4.176362e-04
## 2100     7 16761 4.176362e-04
## 2101     7 16761 4.176362e-04
## 2102     7 16761 4.176362e-04
## 2103     7 16761 4.176362e-04
## 2104     7 16761 4.176362e-04
## 2105     7 16761 4.176362e-04
## 2106     7 16761 4.176362e-04
## 2107     7 16761 4.176362e-04
## 2108     7 16761 4.176362e-04
## 2109     7 16761 4.176362e-04
## 2110     7 16761 4.176362e-04
## 2111     7 16761 4.176362e-04
## 2112     7 16761 4.176362e-04
## 2113     7 16761 4.176362e-04
## 2114     7 16761 4.176362e-04
## 2115     7 16761 4.176362e-04
## 2116     7 16761 4.176362e-04
## 2117     7 16761 4.176362e-04
## 2118     7 16761 4.176362e-04
## 2119     7 16761 4.176362e-04
## 2120     7 16761 4.176362e-04
## 2121     7 16761 4.176362e-04
## 2122     7 16761 4.176362e-04
## 2123     7 16761 4.176362e-04
## 2124     7 16761 4.176362e-04
## 2125     7 16761 4.176362e-04
## 2126     7 16761 4.176362e-04
## 2127     7 16761 4.176362e-04
## 2128     7 16761 4.176362e-04
## 2129     7 16761 4.176362e-04
## 2130     7 16761 4.176362e-04
## 2131     7 16761 4.176362e-04
## 2132     7 16761 4.176362e-04
## 2133     7 16761 4.176362e-04
## 2134     7 16761 4.176362e-04
## 2135     7 16761 4.176362e-04
## 2136     7 16761 4.176362e-04
## 2137     7 16761 4.176362e-04
## 2138     7 16761 4.176362e-04
## 2139     7 16761 4.176362e-04
## 2140     7 16761 4.176362e-04
## 2141     7 16761 4.176362e-04
## 2142     7 16761 4.176362e-04
## 2143     7 16761 4.176362e-04
## 2144     7 16761 4.176362e-04
## 2145     7 16761 4.176362e-04
## 2146     7 16761 4.176362e-04
## 2147     7 16761 4.176362e-04
## 2148     7 16761 4.176362e-04
## 2149     7 16761 4.176362e-04
## 2150     7 16761 4.176362e-04
## 2151     7 16761 4.176362e-04
## 2152     7 16761 4.176362e-04
## 2153     7 16761 4.176362e-04
## 2154     7 16761 4.176362e-04
## 2155     7 16761 4.176362e-04
## 2156     7 16761 4.176362e-04
## 2157     7 16761 4.176362e-04
## 2158     7 16761 4.176362e-04
## 2159     7 16761 4.176362e-04
## 2160     7 16761 4.176362e-04
## 2161     7 16761 4.176362e-04
## 2162     7 16761 4.176362e-04
## 2163     6 48044 1.248855e-04
## 2164     6 48044 1.248855e-04
## 2165     6 48044 1.248855e-04
## 2166     6 48044 1.248855e-04
## 2167     6 48044 1.248855e-04
## 2168     6 48044 1.248855e-04
## 2169     6 48044 1.248855e-04
## 2170     6 48044 1.248855e-04
## 2171     6 48044 1.248855e-04
## 2172     6 48044 1.248855e-04
## 2173     6 48044 1.248855e-04
## 2174     6 48044 1.248855e-04
## 2175     6 48044 1.248855e-04
## 2176     6 48044 1.248855e-04
## 2177     6 48044 1.248855e-04
## 2178     6 48044 1.248855e-04
## 2179     6 48044 1.248855e-04
## 2180     6 48044 1.248855e-04
## 2181     6 48044 1.248855e-04
## 2182     6 48044 1.248855e-04
## 2183     6 48044 1.248855e-04
## 2184     6 48044 1.248855e-04
## 2185     6 48044 1.248855e-04
## 2186     6 48044 1.248855e-04
## 2187     6 48044 1.248855e-04
## 2188     6 48044 1.248855e-04
## 2189     6 48044 1.248855e-04
## 2190     6 48044 1.248855e-04
## 2191     6 48044 1.248855e-04
## 2192     6 48044 1.248855e-04
## 2193     6 48044 1.248855e-04
## 2194     6 48044 1.248855e-04
## 2195     6 48044 1.248855e-04
## 2196     6 48044 1.248855e-04
## 2197     6 48044 1.248855e-04
## 2198     6 48044 1.248855e-04
## 2199     6 48044 1.248855e-04
## 2200     6 48044 1.248855e-04
## 2201     6 48044 1.248855e-04
## 2202     6 48044 1.248855e-04
## 2203     6 48044 1.248855e-04
## 2204     6 48044 1.248855e-04
## 2205     6 48044 1.248855e-04
## 2206     6 48044 1.248855e-04
## 2207     6 48044 1.248855e-04
## 2208     6 48044 1.248855e-04
## 2209     6 48044 1.248855e-04
## 2210     6 48044 1.248855e-04
## 2211     6 48044 1.248855e-04
## 2212     6 48044 1.248855e-04
## 2213     6 48044 1.248855e-04
## 2214     6 48044 1.248855e-04
## 2215     6 48044 1.248855e-04
## 2216     6 48044 1.248855e-04
## 2217     6 48044 1.248855e-04
## 2218     6 48044 1.248855e-04
## 2219     6 48044 1.248855e-04
## 2220     6 48044 1.248855e-04
## 2221     6 48044 1.248855e-04
## 2222     6 48044 1.248855e-04
## 2223     6 48044 1.248855e-04
## 2224     6 48044 1.248855e-04
## 2225     6 48044 1.248855e-04
## 2226     6 48044 1.248855e-04
## 2227     6 48044 1.248855e-04
## 2228     6 48044 1.248855e-04
## 2229     6 48044 1.248855e-04
## 2230     6 48044 1.248855e-04
## 2231     6 48044 1.248855e-04
## 2232     6 48044 1.248855e-04
## 2233     6 48044 1.248855e-04
## 2234     6 48044 1.248855e-04
## 2235     6 48044 1.248855e-04
## 2236     6 48044 1.248855e-04
## 2237     6 48044 1.248855e-04
## 2238     6 48044 1.248855e-04
## 2239     6 48044 1.248855e-04
## 2240     6 48044 1.248855e-04
## 2241     6 48044 1.248855e-04
## 2242     6 48044 1.248855e-04
## 2243     6 48044 1.248855e-04
## 2244     6 48044 1.248855e-04
## 2245     6 48044 1.248855e-04
## 2246     6 48044 1.248855e-04
## 2247     6 48044 1.248855e-04
## 2248     6 48044 1.248855e-04
## 2249     6 48044 1.248855e-04
## 2250     6 48044 1.248855e-04
## 2251     6 48044 1.248855e-04
## 2252     6 48044 1.248855e-04
## 2253     6 48044 1.248855e-04
## 2254     6 48044 1.248855e-04
## 2255     6 48044 1.248855e-04
## 2256     6 48044 1.248855e-04
## 2257     6 48044 1.248855e-04
## 2258     6 48044 1.248855e-04
## 2259     6 48044 1.248855e-04
## 2260     6 48044 1.248855e-04
## 2261     6 48044 1.248855e-04
## 2262     6 48044 1.248855e-04
## 2263     6 48044 1.248855e-04
## 2264     6 48044 1.248855e-04
## 2265     6 48044 1.248855e-04
## 2266     6 48044 1.248855e-04
## 2267     6 48044 1.248855e-04
## 2268     6 48044 1.248855e-04
## 2269     6 48044 1.248855e-04
## 2270     6 48044 1.248855e-04
## 2271     6 48044 1.248855e-04
## 2272     6 48044 1.248855e-04
## 2273     6 48044 1.248855e-04
## 2274     6 48044 1.248855e-04
## 2275     6 48044 1.248855e-04
## 2276     6 48044 1.248855e-04
## 2277     6 48044 1.248855e-04
## 2278     6 48044 1.248855e-04
## 2279     6 48044 1.248855e-04
## 2280     6 48044 1.248855e-04
## 2281     6 48044 1.248855e-04
## 2282     6 48044 1.248855e-04
## 2283     6 48044 1.248855e-04
## 2284     6 48044 1.248855e-04
## 2285     6 48044 1.248855e-04
## 2286     6 48044 1.248855e-04
## 2287     6 48044 1.248855e-04
## 2288     6 48044 1.248855e-04
## 2289     6 48044 1.248855e-04
## 2290     6 48044 1.248855e-04
## 2291     6 48044 1.248855e-04
## 2292     6 48044 1.248855e-04
## 2293     6 48044 1.248855e-04
## 2294     6 48044 1.248855e-04
## 2295     6 48044 1.248855e-04
## 2296     6 48044 1.248855e-04
## 2297     6 48044 1.248855e-04
## 2298     6 48044 1.248855e-04
## 2299     6 48044 1.248855e-04
## 2300     6 48044 1.248855e-04
## 2301     6 48044 1.248855e-04
## 2302     6 48044 1.248855e-04
## 2303     6 48044 1.248855e-04
## 2304     6 48044 1.248855e-04
## 2305     6 48044 1.248855e-04
## 2306     6 48044 1.248855e-04
## 2307     6 48044 1.248855e-04
## 2308     6 48044 1.248855e-04
## 2309     6 48044 1.248855e-04
## 2310     6 48044 1.248855e-04
## 2311     6 48044 1.248855e-04
## 2312     6 48044 1.248855e-04
## 2313     6 48044 1.248855e-04
## 2314     6 48044 1.248855e-04
## 2315     6 48044 1.248855e-04
## 2316     6 48044 1.248855e-04
## 2317     6 48044 1.248855e-04
## 2318     6 48044 1.248855e-04
## 2319     6 48044 1.248855e-04
## 2320     6 48044 1.248855e-04
## 2321     6 48044 1.248855e-04
## 2322     6 48044 1.248855e-04
## 2323     6 48044 1.248855e-04
## 2324     6 48044 1.248855e-04
## 2325     6 48044 1.248855e-04
## 2326     6 48044 1.248855e-04
## 2327     6 48044 1.248855e-04
## 2328     6 48044 1.248855e-04
## 2329     6 48044 1.248855e-04
## 2330     6 48044 1.248855e-04
## 2331     6 48044 1.248855e-04
## 2332     6 48044 1.248855e-04
## 2333     6 48044 1.248855e-04
## 2334     6 48044 1.248855e-04
## 2335     6 48044 1.248855e-04
## 2336     6 48044 1.248855e-04
## 2337     6 48044 1.248855e-04
## 2338     6 48044 1.248855e-04
## 2339     6 48044 1.248855e-04
## 2340     6 48044 1.248855e-04
## 2341     6 48044 1.248855e-04
## 2342     6 48044 1.248855e-04
## 2343     6 48044 1.248855e-04
## 2344     6 48044 1.248855e-04
## 2345     6 48044 1.248855e-04
## 2346     6 48044 1.248855e-04
## 2347     6 48044 1.248855e-04
## 2348     6 48044 1.248855e-04
## 2349     6 48044 1.248855e-04
## 2350     6 48044 1.248855e-04
## 2351     6 48044 1.248855e-04
## 2352     6 48044 1.248855e-04
## 2353     6 48044 1.248855e-04
## 2354     6 48044 1.248855e-04
## 2355     6 48044 1.248855e-04
## 2356     6 48044 1.248855e-04
## 2357     6 48044 1.248855e-04
## 2358     6 48044 1.248855e-04
## 2359     6 48044 1.248855e-04
## 2360     6 48044 1.248855e-04
## 2361     6 48044 1.248855e-04
## 2362     6 48044 1.248855e-04
## 2363     6 48044 1.248855e-04
## 2364     6 48044 1.248855e-04
## 2365     6 48044 1.248855e-04
## 2366     6 48044 1.248855e-04
## 2367     6 48044 1.248855e-04
## 2368     6 48044 1.248855e-04
## 2369     6 48044 1.248855e-04
## 2370     6 48044 1.248855e-04
## 2371     6 48044 1.248855e-04
## 2372     6 48044 1.248855e-04
## 2373     6 48044 1.248855e-04
## 2374     6 48044 1.248855e-04
## 2375     6 48044 1.248855e-04
## 2376     6 48044 1.248855e-04
## 2377     6 48044 1.248855e-04
## 2378     6 48044 1.248855e-04
## 2379     6 48044 1.248855e-04
## 2380     6 48044 1.248855e-04
## 2381     6 48044 1.248855e-04
## 2382     6 48044 1.248855e-04
## 2383     6 48044 1.248855e-04
## 2384     6 48044 1.248855e-04
## 2385     6 48044 1.248855e-04
## 2386     6 48044 1.248855e-04
## 2387     6 48044 1.248855e-04
## 2388     6 48044 1.248855e-04
## 2389     6 48044 1.248855e-04
## 2390     6 48044 1.248855e-04
## 2391     6 48044 1.248855e-04
## 2392     6 31391 1.911376e-04
## 2393     6 31391 1.911376e-04
## 2394     6 31391 1.911376e-04
## 2395     6 31391 1.911376e-04
## 2396     6 31391 1.911376e-04
## 2397     6 31391 1.911376e-04
## 2398     6 31391 1.911376e-04
## 2399     6 31391 1.911376e-04
## 2400     6 31391 1.911376e-04
## 2401     6 31391 1.911376e-04
## 2402     6 31391 1.911376e-04
## 2403     6 31391 1.911376e-04
## 2404     6 31391 1.911376e-04
## 2405     6 31391 1.911376e-04
## 2406     6 31391 1.911376e-04
## 2407     6 31391 1.911376e-04
## 2408     6 31391 1.911376e-04
## 2409     6 31391 1.911376e-04
## 2410     6 31391 1.911376e-04
## 2411     6 31391 1.911376e-04
## 2412     6 31391 1.911376e-04
## 2413     6 31391 1.911376e-04
## 2414     6 31391 1.911376e-04
## 2415     6 31391 1.911376e-04
## 2416     6 31391 1.911376e-04
## 2417     6 31391 1.911376e-04
## 2418     6 31391 1.911376e-04
## 2419     6 31391 1.911376e-04
## 2420     6 31391 1.911376e-04
## 2421     6 31391 1.911376e-04
## 2422     6 31391 1.911376e-04
## 2423     6 31391 1.911376e-04
## 2424     6 31391 1.911376e-04
## 2425     6 31391 1.911376e-04
## 2426     6 31391 1.911376e-04
## 2427     6 31391 1.911376e-04
## 2428     6 31391 1.911376e-04
## 2429     6 31391 1.911376e-04
## 2430     6 31391 1.911376e-04
## 2431     6 31391 1.911376e-04
## 2432     6 31391 1.911376e-04
## 2433     6 31391 1.911376e-04
## 2434     6 31391 1.911376e-04
## 2435     6 31391 1.911376e-04
## 2436     6 31391 1.911376e-04
## 2437     6 31391 1.911376e-04
## 2438     6 31391 1.911376e-04
## 2439     6 31391 1.911376e-04
## 2440     6 31391 1.911376e-04
## 2441     6 31391 1.911376e-04
## 2442     6 31391 1.911376e-04
## 2443     6 31391 1.911376e-04
## 2444     6 31391 1.911376e-04
## 2445     6 31391 1.911376e-04
## 2446     6 31391 1.911376e-04
## 2447     6 31391 1.911376e-04
## 2448     6 31391 1.911376e-04
## 2449     6 31391 1.911376e-04
## 2450     6 31391 1.911376e-04
## 2451     6 31391 1.911376e-04
## 2452     6 31391 1.911376e-04
## 2453     6 31391 1.911376e-04
## 2454     6 31391 1.911376e-04
## 2455     6 31391 1.911376e-04
## 2456     6 31391 1.911376e-04
## 2457     6 31391 1.911376e-04
## 2458     6 31391 1.911376e-04
## 2459     6 31391 1.911376e-04
## 2460     6 31391 1.911376e-04
## 2461     6 31391 1.911376e-04
## 2462     6 31391 1.911376e-04
## 2463     6 31391 1.911376e-04
## 2464     6 31391 1.911376e-04
## 2465     6 31391 1.911376e-04
## 2466     6 31391 1.911376e-04
## 2467     6 31391 1.911376e-04
## 2468     6 31391 1.911376e-04
## 2469     6 31391 1.911376e-04
## 2470     6 31391 1.911376e-04
## 2471     6 31391 1.911376e-04
## 2472     6 31391 1.911376e-04
## 2473     6 31391 1.911376e-04
## 2474     6 31391 1.911376e-04
## 2475     6 31391 1.911376e-04
## 2476     6 31391 1.911376e-04
## 2477     6 31391 1.911376e-04
## 2478     6 31391 1.911376e-04
## 2479     6 31391 1.911376e-04
## 2480     6 31391 1.911376e-04
## 2481     6 31391 1.911376e-04
## 2482     6 31391 1.911376e-04
## 2483     6 31391 1.911376e-04
## 2484     6 31391 1.911376e-04
## 2485     6 31391 1.911376e-04
## 2486     6 31391 1.911376e-04
## 2487     6 31391 1.911376e-04
## 2488     6 31391 1.911376e-04
## 2489     6 31391 1.911376e-04
## 2490     6 31391 1.911376e-04
## 2491     6 31391 1.911376e-04
## 2492     6 31391 1.911376e-04
## 2493     6 31391 1.911376e-04
## 2494     6 31391 1.911376e-04
## 2495     6 31391 1.911376e-04
## 2496     6 31391 1.911376e-04
## 2497     6 31391 1.911376e-04
## 2498     6 31391 1.911376e-04
## 2499     6 31391 1.911376e-04
## 2500     6 31391 1.911376e-04
## 2501     6 31391 1.911376e-04
## 2502     6 31391 1.911376e-04
## 2503     6 31391 1.911376e-04
## 2504     6 31391 1.911376e-04
## 2505     6 31391 1.911376e-04
## 2506     6 31391 1.911376e-04
## 2507     6 31391 1.911376e-04
## 2508     6 31391 1.911376e-04
## 2509     6 31391 1.911376e-04
## 2510     6 31391 1.911376e-04
## 2511     6 31391 1.911376e-04
## 2512     6 31391 1.911376e-04
## 2513     6 31391 1.911376e-04
## 2514     6 31391 1.911376e-04
## 2515     6 31391 1.911376e-04
## 2516     6 31391 1.911376e-04
## 2517     6 31391 1.911376e-04
## 2518     6 31391 1.911376e-04
## 2519     6 31391 1.911376e-04
## 2520     6 31391 1.911376e-04
## 2521     6 31391 1.911376e-04
## 2522     6 31391 1.911376e-04
## 2523     6 31391 1.911376e-04
## 2524     6 31391 1.911376e-04
## 2525     6 31391 1.911376e-04
## 2526     6 31391 1.911376e-04
## 2527     6 31391 1.911376e-04
## 2528     6 31391 1.911376e-04
## 2529     6 31391 1.911376e-04
## 2530     6 31391 1.911376e-04
## 2531     6 31391 1.911376e-04
## 2532     6 31391 1.911376e-04
## 2533     6 31391 1.911376e-04
## 2534     6 31391 1.911376e-04
## 2535     6 31391 1.911376e-04
## 2536     6 31391 1.911376e-04
## 2537     6 31391 1.911376e-04
## 2538     6 31391 1.911376e-04
## 2539     6 31391 1.911376e-04
## 2540     6 31391 1.911376e-04
## 2541     6 16761 3.579739e-04
## 2542     6 16761 3.579739e-04
## 2543     6 16761 3.579739e-04
## 2544     6 16761 3.579739e-04
## 2545     6 16761 3.579739e-04
## 2546     6 16761 3.579739e-04
## 2547     6 16761 3.579739e-04
## 2548     6 16761 3.579739e-04
## 2549     6 16761 3.579739e-04
## 2550     6 16761 3.579739e-04
## 2551     6 16761 3.579739e-04
## 2552     6 16761 3.579739e-04
## 2553     6 16761 3.579739e-04
## 2554     6 16761 3.579739e-04
## 2555     6 16761 3.579739e-04
## 2556     6 16761 3.579739e-04
## 2557     6 16761 3.579739e-04
## 2558     6 16761 3.579739e-04
## 2559     6 16761 3.579739e-04
## 2560     6 16761 3.579739e-04
## 2561     6 16761 3.579739e-04
## 2562     6 16761 3.579739e-04
## 2563     6 16761 3.579739e-04
## 2564     6 16761 3.579739e-04
## 2565     6 16761 3.579739e-04
## 2566     6 16761 3.579739e-04
## 2567     6 16761 3.579739e-04
## 2568     6 16761 3.579739e-04
## 2569     6 16761 3.579739e-04
## 2570     6 16761 3.579739e-04
## 2571     6 16761 3.579739e-04
## 2572     6 16761 3.579739e-04
## 2573     6 16761 3.579739e-04
## 2574     6 16761 3.579739e-04
## 2575     6 16761 3.579739e-04
## 2576     6 16761 3.579739e-04
## 2577     6 16761 3.579739e-04
## 2578     6 16761 3.579739e-04
## 2579     6 16761 3.579739e-04
## 2580     6 16761 3.579739e-04
## 2581     6 16761 3.579739e-04
## 2582     6 16761 3.579739e-04
## 2583     6 16761 3.579739e-04
## 2584     6 16761 3.579739e-04
## 2585     6 16761 3.579739e-04
## 2586     6 16761 3.579739e-04
## 2587     6 16761 3.579739e-04
## 2588     6 16761 3.579739e-04
## 2589     6 16761 3.579739e-04
## 2590     6 16761 3.579739e-04
## 2591     6 16761 3.579739e-04
## 2592     6 16761 3.579739e-04
## 2593     6 16761 3.579739e-04
## 2594     6 16761 3.579739e-04
## 2595     6 16761 3.579739e-04
## 2596     6 16761 3.579739e-04
## 2597     6 16761 3.579739e-04
## 2598     6 16761 3.579739e-04
## 2599     6 16761 3.579739e-04
## 2600     6 16761 3.579739e-04
## 2601     6 16761 3.579739e-04
## 2602     6 16761 3.579739e-04
## 2603     6 16761 3.579739e-04
## 2604     6 16761 3.579739e-04
## 2605     6 16761 3.579739e-04
## 2606     6 16761 3.579739e-04
## 2607     6 16761 3.579739e-04
## 2608     6 16761 3.579739e-04
## 2609     6 16761 3.579739e-04
## 2610     6 16761 3.579739e-04
## 2611     6 16761 3.579739e-04
## 2612     6 16761 3.579739e-04
## 2613     6 16761 3.579739e-04
## 2614     6 16761 3.579739e-04
## 2615     6 16761 3.579739e-04
## 2616     6 16761 3.579739e-04
## 2617     6 16761 3.579739e-04
## 2618     6 16761 3.579739e-04
## 2619     6 16761 3.579739e-04
## 2620     6 16761 3.579739e-04
## 2621     6 16761 3.579739e-04
## 2622     6 16761 3.579739e-04
## 2623     6 16761 3.579739e-04
## 2624     6 16761 3.579739e-04
## 2625     6 16761 3.579739e-04
## 2626     6 16761 3.579739e-04
## 2627     6 16761 3.579739e-04
## 2628     6 16761 3.579739e-04
## 2629     6 16761 3.579739e-04
## 2630     6 16761 3.579739e-04
## 2631     6 16761 3.579739e-04
## 2632     6 16761 3.579739e-04
## 2633     6 16761 3.579739e-04
## 2634     6 16761 3.579739e-04
## 2635     6 16761 3.579739e-04
## 2636     6 16761 3.579739e-04
## 2637     6 16761 3.579739e-04
## 2638     6 16761 3.579739e-04
## 2639     6 16761 3.579739e-04
## 2640     5 48044 1.040713e-04
## 2641     5 48044 1.040713e-04
## 2642     5 48044 1.040713e-04
## 2643     5 48044 1.040713e-04
## 2644     5 48044 1.040713e-04
## 2645     5 48044 1.040713e-04
## 2646     5 48044 1.040713e-04
## 2647     5 48044 1.040713e-04
## 2648     5 48044 1.040713e-04
## 2649     5 48044 1.040713e-04
## 2650     5 48044 1.040713e-04
## 2651     5 48044 1.040713e-04
## 2652     5 48044 1.040713e-04
## 2653     5 48044 1.040713e-04
## 2654     5 48044 1.040713e-04
## 2655     5 48044 1.040713e-04
## 2656     5 48044 1.040713e-04
## 2657     5 48044 1.040713e-04
## 2658     5 48044 1.040713e-04
## 2659     5 48044 1.040713e-04
## 2660     5 48044 1.040713e-04
## 2661     5 48044 1.040713e-04
## 2662     5 48044 1.040713e-04
## 2663     5 48044 1.040713e-04
## 2664     5 48044 1.040713e-04
## 2665     5 48044 1.040713e-04
## 2666     5 48044 1.040713e-04
## 2667     5 48044 1.040713e-04
## 2668     5 48044 1.040713e-04
## 2669     5 48044 1.040713e-04
## 2670     5 48044 1.040713e-04
## 2671     5 48044 1.040713e-04
## 2672     5 48044 1.040713e-04
## 2673     5 48044 1.040713e-04
## 2674     5 48044 1.040713e-04
## 2675     5 48044 1.040713e-04
## 2676     5 48044 1.040713e-04
## 2677     5 48044 1.040713e-04
## 2678     5 48044 1.040713e-04
## 2679     5 48044 1.040713e-04
## 2680     5 48044 1.040713e-04
## 2681     5 48044 1.040713e-04
## 2682     5 48044 1.040713e-04
## 2683     5 48044 1.040713e-04
## 2684     5 48044 1.040713e-04
## 2685     5 48044 1.040713e-04
## 2686     5 48044 1.040713e-04
## 2687     5 48044 1.040713e-04
## 2688     5 48044 1.040713e-04
## 2689     5 48044 1.040713e-04
## 2690     5 48044 1.040713e-04
## 2691     5 48044 1.040713e-04
## 2692     5 48044 1.040713e-04
## 2693     5 48044 1.040713e-04
## 2694     5 48044 1.040713e-04
## 2695     5 48044 1.040713e-04
## 2696     5 48044 1.040713e-04
## 2697     5 48044 1.040713e-04
## 2698     5 48044 1.040713e-04
## 2699     5 48044 1.040713e-04
## 2700     5 48044 1.040713e-04
## 2701     5 48044 1.040713e-04
## 2702     5 48044 1.040713e-04
## 2703     5 48044 1.040713e-04
## 2704     5 48044 1.040713e-04
## 2705     5 48044 1.040713e-04
## 2706     5 48044 1.040713e-04
## 2707     5 48044 1.040713e-04
## 2708     5 48044 1.040713e-04
## 2709     5 48044 1.040713e-04
## 2710     5 48044 1.040713e-04
## 2711     5 48044 1.040713e-04
## 2712     5 48044 1.040713e-04
## 2713     5 48044 1.040713e-04
## 2714     5 48044 1.040713e-04
## 2715     5 48044 1.040713e-04
## 2716     5 48044 1.040713e-04
## 2717     5 48044 1.040713e-04
## 2718     5 48044 1.040713e-04
## 2719     5 48044 1.040713e-04
## 2720     5 48044 1.040713e-04
## 2721     5 48044 1.040713e-04
## 2722     5 48044 1.040713e-04
## 2723     5 48044 1.040713e-04
## 2724     5 48044 1.040713e-04
## 2725     5 48044 1.040713e-04
## 2726     5 48044 1.040713e-04
## 2727     5 48044 1.040713e-04
## 2728     5 48044 1.040713e-04
## 2729     5 48044 1.040713e-04
## 2730     5 48044 1.040713e-04
## 2731     5 48044 1.040713e-04
## 2732     5 48044 1.040713e-04
## 2733     5 48044 1.040713e-04
## 2734     5 48044 1.040713e-04
## 2735     5 48044 1.040713e-04
## 2736     5 48044 1.040713e-04
## 2737     5 48044 1.040713e-04
## 2738     5 48044 1.040713e-04
## 2739     5 48044 1.040713e-04
## 2740     5 48044 1.040713e-04
## 2741     5 48044 1.040713e-04
## 2742     5 48044 1.040713e-04
## 2743     5 48044 1.040713e-04
## 2744     5 48044 1.040713e-04
## 2745     5 48044 1.040713e-04
## 2746     5 48044 1.040713e-04
## 2747     5 48044 1.040713e-04
## 2748     5 48044 1.040713e-04
## 2749     5 48044 1.040713e-04
## 2750     5 48044 1.040713e-04
## 2751     5 48044 1.040713e-04
## 2752     5 48044 1.040713e-04
## 2753     5 48044 1.040713e-04
## 2754     5 48044 1.040713e-04
## 2755     5 48044 1.040713e-04
## 2756     5 48044 1.040713e-04
## 2757     5 48044 1.040713e-04
## 2758     5 48044 1.040713e-04
## 2759     5 48044 1.040713e-04
## 2760     5 48044 1.040713e-04
## 2761     5 48044 1.040713e-04
## 2762     5 48044 1.040713e-04
## 2763     5 48044 1.040713e-04
## 2764     5 48044 1.040713e-04
## 2765     5 48044 1.040713e-04
## 2766     5 48044 1.040713e-04
## 2767     5 48044 1.040713e-04
## 2768     5 48044 1.040713e-04
## 2769     5 48044 1.040713e-04
## 2770     5 48044 1.040713e-04
## 2771     5 48044 1.040713e-04
## 2772     5 48044 1.040713e-04
## 2773     5 48044 1.040713e-04
## 2774     5 48044 1.040713e-04
## 2775     5 48044 1.040713e-04
## 2776     5 48044 1.040713e-04
## 2777     5 48044 1.040713e-04
## 2778     5 48044 1.040713e-04
## 2779     5 48044 1.040713e-04
## 2780     5 48044 1.040713e-04
## 2781     5 48044 1.040713e-04
## 2782     5 48044 1.040713e-04
## 2783     5 48044 1.040713e-04
## 2784     5 48044 1.040713e-04
## 2785     5 48044 1.040713e-04
## 2786     5 48044 1.040713e-04
## 2787     5 48044 1.040713e-04
## 2788     5 48044 1.040713e-04
## 2789     5 48044 1.040713e-04
## 2790     5 48044 1.040713e-04
## 2791     5 48044 1.040713e-04
## 2792     5 48044 1.040713e-04
## 2793     5 48044 1.040713e-04
## 2794     5 48044 1.040713e-04
## 2795     5 48044 1.040713e-04
## 2796     5 48044 1.040713e-04
## 2797     5 48044 1.040713e-04
## 2798     5 48044 1.040713e-04
## 2799     5 48044 1.040713e-04
## 2800     5 48044 1.040713e-04
## 2801     5 48044 1.040713e-04
## 2802     5 48044 1.040713e-04
## 2803     5 48044 1.040713e-04
## 2804     5 48044 1.040713e-04
## 2805     5 48044 1.040713e-04
## 2806     5 48044 1.040713e-04
## 2807     5 48044 1.040713e-04
## 2808     5 48044 1.040713e-04
## 2809     5 48044 1.040713e-04
## 2810     5 48044 1.040713e-04
## 2811     5 48044 1.040713e-04
## 2812     5 48044 1.040713e-04
## 2813     5 48044 1.040713e-04
## 2814     5 48044 1.040713e-04
## 2815     5 48044 1.040713e-04
## 2816     5 48044 1.040713e-04
## 2817     5 48044 1.040713e-04
## 2818     5 48044 1.040713e-04
## 2819     5 48044 1.040713e-04
## 2820     5 48044 1.040713e-04
## 2821     5 48044 1.040713e-04
## 2822     5 48044 1.040713e-04
## 2823     5 48044 1.040713e-04
## 2824     5 48044 1.040713e-04
## 2825     5 48044 1.040713e-04
## 2826     5 48044 1.040713e-04
## 2827     5 48044 1.040713e-04
## 2828     5 48044 1.040713e-04
## 2829     5 48044 1.040713e-04
## 2830     5 48044 1.040713e-04
## 2831     5 48044 1.040713e-04
## 2832     5 48044 1.040713e-04
## 2833     5 48044 1.040713e-04
## 2834     5 48044 1.040713e-04
## 2835     5 48044 1.040713e-04
## 2836     5 48044 1.040713e-04
## 2837     5 48044 1.040713e-04
## 2838     5 48044 1.040713e-04
## 2839     5 48044 1.040713e-04
## 2840     5 48044 1.040713e-04
## 2841     5 48044 1.040713e-04
## 2842     5 48044 1.040713e-04
## 2843     5 48044 1.040713e-04
## 2844     5 48044 1.040713e-04
## 2845     5 48044 1.040713e-04
## 2846     5 48044 1.040713e-04
## 2847     5 48044 1.040713e-04
## 2848     5 48044 1.040713e-04
## 2849     5 48044 1.040713e-04
## 2850     5 48044 1.040713e-04
## 2851     5 48044 1.040713e-04
## 2852     5 48044 1.040713e-04
## 2853     5 48044 1.040713e-04
## 2854     5 48044 1.040713e-04
## 2855     5 48044 1.040713e-04
## 2856     5 48044 1.040713e-04
## 2857     5 48044 1.040713e-04
## 2858     5 48044 1.040713e-04
## 2859     5 48044 1.040713e-04
## 2860     5 48044 1.040713e-04
## 2861     5 48044 1.040713e-04
## 2862     5 48044 1.040713e-04
## 2863     5 48044 1.040713e-04
## 2864     5 48044 1.040713e-04
## 2865     5 48044 1.040713e-04
## 2866     5 48044 1.040713e-04
## 2867     5 48044 1.040713e-04
## 2868     5 48044 1.040713e-04
## 2869     5 48044 1.040713e-04
## 2870     5 48044 1.040713e-04
## 2871     5 48044 1.040713e-04
## 2872     5 48044 1.040713e-04
## 2873     5 48044 1.040713e-04
## 2874     5 48044 1.040713e-04
## 2875     5 48044 1.040713e-04
## 2876     5 48044 1.040713e-04
## 2877     5 48044 1.040713e-04
## 2878     5 48044 1.040713e-04
## 2879     5 48044 1.040713e-04
## 2880     5 48044 1.040713e-04
## 2881     5 48044 1.040713e-04
## 2882     5 48044 1.040713e-04
## 2883     5 48044 1.040713e-04
## 2884     5 48044 1.040713e-04
## 2885     5 48044 1.040713e-04
## 2886     5 48044 1.040713e-04
## 2887     5 48044 1.040713e-04
## 2888     5 48044 1.040713e-04
## 2889     5 48044 1.040713e-04
## 2890     5 48044 1.040713e-04
## 2891     5 48044 1.040713e-04
## 2892     5 48044 1.040713e-04
## 2893     5 48044 1.040713e-04
## 2894     5 48044 1.040713e-04
## 2895     5 48044 1.040713e-04
## 2896     5 48044 1.040713e-04
## 2897     5 48044 1.040713e-04
## 2898     5 48044 1.040713e-04
## 2899     5 48044 1.040713e-04
## 2900     5 48044 1.040713e-04
## 2901     5 48044 1.040713e-04
## 2902     5 48044 1.040713e-04
## 2903     5 48044 1.040713e-04
## 2904     5 48044 1.040713e-04
## 2905     5 48044 1.040713e-04
## 2906     5 48044 1.040713e-04
## 2907     5 48044 1.040713e-04
## 2908     5 48044 1.040713e-04
## 2909     5 48044 1.040713e-04
## 2910     5 48044 1.040713e-04
## 2911     5 48044 1.040713e-04
## 2912     5 48044 1.040713e-04
## 2913     5 48044 1.040713e-04
## 2914     5 48044 1.040713e-04
## 2915     5 48044 1.040713e-04
## 2916     5 48044 1.040713e-04
## 2917     5 48044 1.040713e-04
## 2918     5 48044 1.040713e-04
## 2919     5 48044 1.040713e-04
## 2920     5 48044 1.040713e-04
## 2921     5 48044 1.040713e-04
## 2922     5 48044 1.040713e-04
## 2923     5 48044 1.040713e-04
## 2924     5 48044 1.040713e-04
## 2925     5 48044 1.040713e-04
## 2926     5 48044 1.040713e-04
## 2927     5 48044 1.040713e-04
## 2928     5 48044 1.040713e-04
## 2929     5 48044 1.040713e-04
## 2930     5 48044 1.040713e-04
## 2931     5 48044 1.040713e-04
## 2932     5 48044 1.040713e-04
## 2933     5 48044 1.040713e-04
## 2934     5 48044 1.040713e-04
## 2935     5 48044 1.040713e-04
## 2936     5 48044 1.040713e-04
## 2937     5 48044 1.040713e-04
## 2938     5 48044 1.040713e-04
## 2939     5 48044 1.040713e-04
## 2940     5 48044 1.040713e-04
## 2941     5 48044 1.040713e-04
## 2942     5 48044 1.040713e-04
## 2943     5 48044 1.040713e-04
## 2944     5 48044 1.040713e-04
## 2945     5 48044 1.040713e-04
## 2946     5 48044 1.040713e-04
## 2947     5 48044 1.040713e-04
## 2948     5 48044 1.040713e-04
## 2949     5 48044 1.040713e-04
## 2950     5 48044 1.040713e-04
## 2951     5 48044 1.040713e-04
## 2952     5 48044 1.040713e-04
## 2953     5 48044 1.040713e-04
## 2954     5 48044 1.040713e-04
## 2955     5 48044 1.040713e-04
## 2956     5 48044 1.040713e-04
## 2957     5 48044 1.040713e-04
## 2958     5 48044 1.040713e-04
## 2959     5 48044 1.040713e-04
## 2960     5 31391 1.592813e-04
## 2961     5 31391 1.592813e-04
## 2962     5 31391 1.592813e-04
## 2963     5 31391 1.592813e-04
## 2964     5 31391 1.592813e-04
## 2965     5 31391 1.592813e-04
## 2966     5 31391 1.592813e-04
## 2967     5 31391 1.592813e-04
## 2968     5 31391 1.592813e-04
## 2969     5 31391 1.592813e-04
## 2970     5 31391 1.592813e-04
## 2971     5 31391 1.592813e-04
## 2972     5 31391 1.592813e-04
## 2973     5 31391 1.592813e-04
## 2974     5 31391 1.592813e-04
## 2975     5 31391 1.592813e-04
## 2976     5 31391 1.592813e-04
## 2977     5 31391 1.592813e-04
## 2978     5 31391 1.592813e-04
## 2979     5 31391 1.592813e-04
## 2980     5 31391 1.592813e-04
## 2981     5 31391 1.592813e-04
## 2982     5 31391 1.592813e-04
## 2983     5 31391 1.592813e-04
## 2984     5 31391 1.592813e-04
## 2985     5 31391 1.592813e-04
## 2986     5 31391 1.592813e-04
## 2987     5 31391 1.592813e-04
## 2988     5 31391 1.592813e-04
## 2989     5 31391 1.592813e-04
## 2990     5 31391 1.592813e-04
## 2991     5 31391 1.592813e-04
## 2992     5 31391 1.592813e-04
## 2993     5 31391 1.592813e-04
## 2994     5 31391 1.592813e-04
## 2995     5 31391 1.592813e-04
## 2996     5 31391 1.592813e-04
## 2997     5 31391 1.592813e-04
## 2998     5 31391 1.592813e-04
## 2999     5 31391 1.592813e-04
## 3000     5 31391 1.592813e-04
## 3001     5 31391 1.592813e-04
## 3002     5 31391 1.592813e-04
## 3003     5 31391 1.592813e-04
## 3004     5 31391 1.592813e-04
## 3005     5 31391 1.592813e-04
## 3006     5 31391 1.592813e-04
## 3007     5 31391 1.592813e-04
## 3008     5 31391 1.592813e-04
## 3009     5 31391 1.592813e-04
## 3010     5 31391 1.592813e-04
## 3011     5 31391 1.592813e-04
## 3012     5 31391 1.592813e-04
## 3013     5 31391 1.592813e-04
## 3014     5 31391 1.592813e-04
## 3015     5 31391 1.592813e-04
## 3016     5 31391 1.592813e-04
## 3017     5 31391 1.592813e-04
## 3018     5 31391 1.592813e-04
## 3019     5 31391 1.592813e-04
## 3020     5 31391 1.592813e-04
## 3021     5 31391 1.592813e-04
## 3022     5 31391 1.592813e-04
## 3023     5 31391 1.592813e-04
## 3024     5 31391 1.592813e-04
## 3025     5 31391 1.592813e-04
## 3026     5 31391 1.592813e-04
## 3027     5 31391 1.592813e-04
## 3028     5 31391 1.592813e-04
## 3029     5 31391 1.592813e-04
## 3030     5 31391 1.592813e-04
## 3031     5 31391 1.592813e-04
## 3032     5 31391 1.592813e-04
## 3033     5 31391 1.592813e-04
## 3034     5 31391 1.592813e-04
## 3035     5 31391 1.592813e-04
## 3036     5 31391 1.592813e-04
## 3037     5 31391 1.592813e-04
## 3038     5 31391 1.592813e-04
## 3039     5 31391 1.592813e-04
## 3040     5 31391 1.592813e-04
## 3041     5 31391 1.592813e-04
## 3042     5 31391 1.592813e-04
## 3043     5 31391 1.592813e-04
## 3044     5 31391 1.592813e-04
## 3045     5 31391 1.592813e-04
## 3046     5 31391 1.592813e-04
## 3047     5 31391 1.592813e-04
## 3048     5 31391 1.592813e-04
## 3049     5 31391 1.592813e-04
## 3050     5 31391 1.592813e-04
## 3051     5 31391 1.592813e-04
## 3052     5 31391 1.592813e-04
## 3053     5 31391 1.592813e-04
## 3054     5 31391 1.592813e-04
## 3055     5 31391 1.592813e-04
## 3056     5 31391 1.592813e-04
## 3057     5 31391 1.592813e-04
## 3058     5 31391 1.592813e-04
## 3059     5 31391 1.592813e-04
## 3060     5 31391 1.592813e-04
## 3061     5 31391 1.592813e-04
## 3062     5 31391 1.592813e-04
## 3063     5 31391 1.592813e-04
## 3064     5 31391 1.592813e-04
## 3065     5 31391 1.592813e-04
## 3066     5 31391 1.592813e-04
## 3067     5 31391 1.592813e-04
## 3068     5 31391 1.592813e-04
## 3069     5 31391 1.592813e-04
## 3070     5 31391 1.592813e-04
## 3071     5 31391 1.592813e-04
## 3072     5 31391 1.592813e-04
## 3073     5 31391 1.592813e-04
## 3074     5 31391 1.592813e-04
## 3075     5 31391 1.592813e-04
## 3076     5 31391 1.592813e-04
## 3077     5 31391 1.592813e-04
## 3078     5 31391 1.592813e-04
## 3079     5 31391 1.592813e-04
## 3080     5 31391 1.592813e-04
## 3081     5 31391 1.592813e-04
## 3082     5 31391 1.592813e-04
## 3083     5 31391 1.592813e-04
## 3084     5 31391 1.592813e-04
## 3085     5 31391 1.592813e-04
## 3086     5 31391 1.592813e-04
## 3087     5 31391 1.592813e-04
## 3088     5 31391 1.592813e-04
## 3089     5 31391 1.592813e-04
## 3090     5 31391 1.592813e-04
## 3091     5 31391 1.592813e-04
## 3092     5 31391 1.592813e-04
## 3093     5 31391 1.592813e-04
## 3094     5 31391 1.592813e-04
## 3095     5 31391 1.592813e-04
## 3096     5 31391 1.592813e-04
## 3097     5 31391 1.592813e-04
## 3098     5 31391 1.592813e-04
## 3099     5 31391 1.592813e-04
## 3100     5 31391 1.592813e-04
## 3101     5 31391 1.592813e-04
## 3102     5 31391 1.592813e-04
## 3103     5 31391 1.592813e-04
## 3104     5 31391 1.592813e-04
## 3105     5 31391 1.592813e-04
## 3106     5 31391 1.592813e-04
## 3107     5 31391 1.592813e-04
## 3108     5 31391 1.592813e-04
## 3109     5 31391 1.592813e-04
## 3110     5 31391 1.592813e-04
## 3111     5 31391 1.592813e-04
## 3112     5 31391 1.592813e-04
## 3113     5 31391 1.592813e-04
## 3114     5 31391 1.592813e-04
## 3115     5 31391 1.592813e-04
## 3116     5 31391 1.592813e-04
## 3117     5 31391 1.592813e-04
## 3118     5 31391 1.592813e-04
## 3119     5 31391 1.592813e-04
## 3120     5 31391 1.592813e-04
## 3121     5 31391 1.592813e-04
## 3122     5 31391 1.592813e-04
## 3123     5 31391 1.592813e-04
## 3124     5 31391 1.592813e-04
## 3125     5 31391 1.592813e-04
## 3126     5 31391 1.592813e-04
## 3127     5 31391 1.592813e-04
## 3128     5 31391 1.592813e-04
## 3129     5 31391 1.592813e-04
## 3130     5 31391 1.592813e-04
## 3131     5 31391 1.592813e-04
## 3132     5 31391 1.592813e-04
## 3133     5 31391 1.592813e-04
## 3134     5 31391 1.592813e-04
## 3135     5 31391 1.592813e-04
## 3136     5 31391 1.592813e-04
## 3137     5 31391 1.592813e-04
## 3138     5 31391 1.592813e-04
## 3139     5 31391 1.592813e-04
## 3140     5 31391 1.592813e-04
## 3141     5 31391 1.592813e-04
## 3142     5 31391 1.592813e-04
## 3143     5 31391 1.592813e-04
## 3144     5 31391 1.592813e-04
## 3145     5 31391 1.592813e-04
## 3146     5 31391 1.592813e-04
## 3147     5 31391 1.592813e-04
## 3148     5 31391 1.592813e-04
## 3149     5 31391 1.592813e-04
## 3150     5 31391 1.592813e-04
## 3151     5 31391 1.592813e-04
## 3152     5 31391 1.592813e-04
## 3153     5 31391 1.592813e-04
## 3154     5 31391 1.592813e-04
## 3155     5 31391 1.592813e-04
## 3156     5 31391 1.592813e-04
## 3157     5 31391 1.592813e-04
## 3158     5 31391 1.592813e-04
## 3159     5 31391 1.592813e-04
## 3160     5 31391 1.592813e-04
## 3161     5 31391 1.592813e-04
## 3162     5 31391 1.592813e-04
## 3163     5 31391 1.592813e-04
## 3164     5 31391 1.592813e-04
## 3165     5 31391 1.592813e-04
## 3166     5 31391 1.592813e-04
## 3167     5 31391 1.592813e-04
## 3168     5 31391 1.592813e-04
## 3169     5 31391 1.592813e-04
## 3170     5 31391 1.592813e-04
## 3171     5 31391 1.592813e-04
## 3172     5 31391 1.592813e-04
## 3173     5 31391 1.592813e-04
## 3174     5 31391 1.592813e-04
## 3175     5 31391 1.592813e-04
## 3176     5 31391 1.592813e-04
## 3177     5 31391 1.592813e-04
## 3178     5 31391 1.592813e-04
## 3179     5 31391 1.592813e-04
## 3180     5 31391 1.592813e-04
## 3181     5 31391 1.592813e-04
## 3182     5 31391 1.592813e-04
## 3183     5 16761 2.983116e-04
## 3184     5 16761 2.983116e-04
## 3185     5 16761 2.983116e-04
## 3186     5 16761 2.983116e-04
## 3187     5 16761 2.983116e-04
## 3188     5 16761 2.983116e-04
## 3189     5 16761 2.983116e-04
## 3190     5 16761 2.983116e-04
## 3191     5 16761 2.983116e-04
## 3192     5 16761 2.983116e-04
## 3193     5 16761 2.983116e-04
## 3194     5 16761 2.983116e-04
## 3195     5 16761 2.983116e-04
## 3196     5 16761 2.983116e-04
## 3197     5 16761 2.983116e-04
## 3198     5 16761 2.983116e-04
## 3199     5 16761 2.983116e-04
## 3200     5 16761 2.983116e-04
## 3201     5 16761 2.983116e-04
## 3202     5 16761 2.983116e-04
## 3203     5 16761 2.983116e-04
## 3204     5 16761 2.983116e-04
## 3205     5 16761 2.983116e-04
## 3206     5 16761 2.983116e-04
## 3207     5 16761 2.983116e-04
## 3208     5 16761 2.983116e-04
## 3209     5 16761 2.983116e-04
## 3210     5 16761 2.983116e-04
## 3211     5 16761 2.983116e-04
## 3212     5 16761 2.983116e-04
## 3213     5 16761 2.983116e-04
## 3214     5 16761 2.983116e-04
## 3215     5 16761 2.983116e-04
## 3216     5 16761 2.983116e-04
## 3217     5 16761 2.983116e-04
## 3218     5 16761 2.983116e-04
## 3219     5 16761 2.983116e-04
## 3220     5 16761 2.983116e-04
## 3221     5 16761 2.983116e-04
## 3222     5 16761 2.983116e-04
## 3223     5 16761 2.983116e-04
## 3224     5 16761 2.983116e-04
## 3225     5 16761 2.983116e-04
## 3226     5 16761 2.983116e-04
## 3227     5 16761 2.983116e-04
## 3228     5 16761 2.983116e-04
## 3229     5 16761 2.983116e-04
## 3230     5 16761 2.983116e-04
## 3231     5 16761 2.983116e-04
## 3232     5 16761 2.983116e-04
## 3233     5 16761 2.983116e-04
## 3234     5 16761 2.983116e-04
## 3235     5 16761 2.983116e-04
## 3236     5 16761 2.983116e-04
## 3237     5 16761 2.983116e-04
## 3238     5 16761 2.983116e-04
## 3239     5 16761 2.983116e-04
## 3240     5 16761 2.983116e-04
## 3241     5 16761 2.983116e-04
## 3242     5 16761 2.983116e-04
## 3243     5 16761 2.983116e-04
## 3244     5 16761 2.983116e-04
## 3245     5 16761 2.983116e-04
## 3246     5 16761 2.983116e-04
## 3247     5 16761 2.983116e-04
## 3248     5 16761 2.983116e-04
## 3249     5 16761 2.983116e-04
## 3250     5 16761 2.983116e-04
## 3251     5 16761 2.983116e-04
## 3252     5 16761 2.983116e-04
## 3253     5 16761 2.983116e-04
## 3254     5 16761 2.983116e-04
## 3255     5 16761 2.983116e-04
## 3256     5 16761 2.983116e-04
## 3257     5 16761 2.983116e-04
## 3258     5 16761 2.983116e-04
## 3259     5 16761 2.983116e-04
## 3260     5 16761 2.983116e-04
## 3261     5 16761 2.983116e-04
## 3262     5 16761 2.983116e-04
## 3263     5 16761 2.983116e-04
## 3264     5 16761 2.983116e-04
## 3265     5 16761 2.983116e-04
## 3266     5 16761 2.983116e-04
## 3267     5 16761 2.983116e-04
## 3268     5 16761 2.983116e-04
## 3269     5 16761 2.983116e-04
## 3270     5 16761 2.983116e-04
## 3271     5 16761 2.983116e-04
## 3272     5 16761 2.983116e-04
## 3273     5 16761 2.983116e-04
## 3274     5 16761 2.983116e-04
## 3275     5 16761 2.983116e-04
## 3276     5 16761 2.983116e-04
## 3277     5 16761 2.983116e-04
## 3278     5 16761 2.983116e-04
## 3279     5 16761 2.983116e-04
## 3280     5 16761 2.983116e-04
## 3281     5 16761 2.983116e-04
## 3282     5 16761 2.983116e-04
## 3283     5 16761 2.983116e-04
## 3284     5 16761 2.983116e-04
## 3285     5 16761 2.983116e-04
## 3286     5 16761 2.983116e-04
## 3287     5 16761 2.983116e-04
## 3288     5 16761 2.983116e-04
## 3289     5 16761 2.983116e-04
## 3290     5 16761 2.983116e-04
## 3291     5 16761 2.983116e-04
## 3292     5 16761 2.983116e-04
## 3293     4 48044 8.325701e-05
## 3294     4 48044 8.325701e-05
## 3295     4 48044 8.325701e-05
## 3296     4 48044 8.325701e-05
## 3297     4 48044 8.325701e-05
## 3298     4 48044 8.325701e-05
## 3299     4 48044 8.325701e-05
## 3300     4 48044 8.325701e-05
## 3301     4 48044 8.325701e-05
## 3302     4 48044 8.325701e-05
## 3303     4 48044 8.325701e-05
## 3304     4 48044 8.325701e-05
## 3305     4 48044 8.325701e-05
## 3306     4 48044 8.325701e-05
## 3307     4 48044 8.325701e-05
## 3308     4 48044 8.325701e-05
## 3309     4 48044 8.325701e-05
## 3310     4 48044 8.325701e-05
## 3311     4 48044 8.325701e-05
## 3312     4 48044 8.325701e-05
## 3313     4 48044 8.325701e-05
## 3314     4 48044 8.325701e-05
## 3315     4 48044 8.325701e-05
## 3316     4 48044 8.325701e-05
## 3317     4 48044 8.325701e-05
## 3318     4 48044 8.325701e-05
## 3319     4 48044 8.325701e-05
## 3320     4 48044 8.325701e-05
## 3321     4 48044 8.325701e-05
## 3322     4 48044 8.325701e-05
## 3323     4 48044 8.325701e-05
## 3324     4 48044 8.325701e-05
## 3325     4 48044 8.325701e-05
## 3326     4 48044 8.325701e-05
## 3327     4 48044 8.325701e-05
## 3328     4 48044 8.325701e-05
## 3329     4 48044 8.325701e-05
## 3330     4 48044 8.325701e-05
## 3331     4 48044 8.325701e-05
## 3332     4 48044 8.325701e-05
## 3333     4 48044 8.325701e-05
## 3334     4 48044 8.325701e-05
## 3335     4 48044 8.325701e-05
## 3336     4 48044 8.325701e-05
## 3337     4 48044 8.325701e-05
## 3338     4 48044 8.325701e-05
## 3339     4 48044 8.325701e-05
## 3340     4 48044 8.325701e-05
## 3341     4 48044 8.325701e-05
## 3342     4 48044 8.325701e-05
## 3343     4 48044 8.325701e-05
## 3344     4 48044 8.325701e-05
## 3345     4 48044 8.325701e-05
## 3346     4 48044 8.325701e-05
## 3347     4 48044 8.325701e-05
## 3348     4 48044 8.325701e-05
## 3349     4 48044 8.325701e-05
## 3350     4 48044 8.325701e-05
## 3351     4 48044 8.325701e-05
## 3352     4 48044 8.325701e-05
## 3353     4 48044 8.325701e-05
## 3354     4 48044 8.325701e-05
## 3355     4 48044 8.325701e-05
## 3356     4 48044 8.325701e-05
## 3357     4 48044 8.325701e-05
## 3358     4 48044 8.325701e-05
## 3359     4 48044 8.325701e-05
## 3360     4 48044 8.325701e-05
## 3361     4 48044 8.325701e-05
## 3362     4 48044 8.325701e-05
## 3363     4 48044 8.325701e-05
## 3364     4 48044 8.325701e-05
## 3365     4 48044 8.325701e-05
## 3366     4 48044 8.325701e-05
## 3367     4 48044 8.325701e-05
## 3368     4 48044 8.325701e-05
## 3369     4 48044 8.325701e-05
## 3370     4 48044 8.325701e-05
## 3371     4 48044 8.325701e-05
## 3372     4 48044 8.325701e-05
## 3373     4 48044 8.325701e-05
## 3374     4 48044 8.325701e-05
## 3375     4 48044 8.325701e-05
## 3376     4 48044 8.325701e-05
## 3377     4 48044 8.325701e-05
## 3378     4 48044 8.325701e-05
## 3379     4 48044 8.325701e-05
## 3380     4 48044 8.325701e-05
## 3381     4 48044 8.325701e-05
## 3382     4 48044 8.325701e-05
## 3383     4 48044 8.325701e-05
## 3384     4 48044 8.325701e-05
## 3385     4 48044 8.325701e-05
## 3386     4 48044 8.325701e-05
## 3387     4 48044 8.325701e-05
## 3388     4 48044 8.325701e-05
## 3389     4 48044 8.325701e-05
## 3390     4 48044 8.325701e-05
## 3391     4 48044 8.325701e-05
## 3392     4 48044 8.325701e-05
## 3393     4 48044 8.325701e-05
## 3394     4 48044 8.325701e-05
## 3395     4 48044 8.325701e-05
## 3396     4 48044 8.325701e-05
## 3397     4 48044 8.325701e-05
## 3398     4 48044 8.325701e-05
## 3399     4 48044 8.325701e-05
## 3400     4 48044 8.325701e-05
## 3401     4 48044 8.325701e-05
## 3402     4 48044 8.325701e-05
## 3403     4 48044 8.325701e-05
## 3404     4 48044 8.325701e-05
## 3405     4 48044 8.325701e-05
## 3406     4 48044 8.325701e-05
## 3407     4 48044 8.325701e-05
## 3408     4 48044 8.325701e-05
## 3409     4 48044 8.325701e-05
## 3410     4 48044 8.325701e-05
## 3411     4 48044 8.325701e-05
## 3412     4 48044 8.325701e-05
## 3413     4 48044 8.325701e-05
## 3414     4 48044 8.325701e-05
## 3415     4 48044 8.325701e-05
## 3416     4 48044 8.325701e-05
## 3417     4 48044 8.325701e-05
## 3418     4 48044 8.325701e-05
## 3419     4 48044 8.325701e-05
## 3420     4 48044 8.325701e-05
## 3421     4 48044 8.325701e-05
## 3422     4 48044 8.325701e-05
## 3423     4 48044 8.325701e-05
## 3424     4 48044 8.325701e-05
## 3425     4 48044 8.325701e-05
## 3426     4 48044 8.325701e-05
## 3427     4 48044 8.325701e-05
## 3428     4 48044 8.325701e-05
## 3429     4 48044 8.325701e-05
## 3430     4 48044 8.325701e-05
## 3431     4 48044 8.325701e-05
## 3432     4 48044 8.325701e-05
## 3433     4 48044 8.325701e-05
## 3434     4 48044 8.325701e-05
## 3435     4 48044 8.325701e-05
## 3436     4 48044 8.325701e-05
## 3437     4 48044 8.325701e-05
## 3438     4 48044 8.325701e-05
## 3439     4 48044 8.325701e-05
## 3440     4 48044 8.325701e-05
## 3441     4 48044 8.325701e-05
## 3442     4 48044 8.325701e-05
## 3443     4 48044 8.325701e-05
## 3444     4 48044 8.325701e-05
## 3445     4 48044 8.325701e-05
## 3446     4 48044 8.325701e-05
## 3447     4 48044 8.325701e-05
## 3448     4 48044 8.325701e-05
## 3449     4 48044 8.325701e-05
## 3450     4 48044 8.325701e-05
## 3451     4 48044 8.325701e-05
## 3452     4 48044 8.325701e-05
## 3453     4 48044 8.325701e-05
## 3454     4 48044 8.325701e-05
## 3455     4 48044 8.325701e-05
## 3456     4 48044 8.325701e-05
## 3457     4 48044 8.325701e-05
## 3458     4 48044 8.325701e-05
## 3459     4 48044 8.325701e-05
## 3460     4 48044 8.325701e-05
## 3461     4 48044 8.325701e-05
## 3462     4 48044 8.325701e-05
## 3463     4 48044 8.325701e-05
## 3464     4 48044 8.325701e-05
## 3465     4 48044 8.325701e-05
## 3466     4 48044 8.325701e-05
## 3467     4 48044 8.325701e-05
## 3468     4 48044 8.325701e-05
## 3469     4 48044 8.325701e-05
## 3470     4 48044 8.325701e-05
## 3471     4 48044 8.325701e-05
## 3472     4 48044 8.325701e-05
## 3473     4 48044 8.325701e-05
## 3474     4 48044 8.325701e-05
## 3475     4 48044 8.325701e-05
## 3476     4 48044 8.325701e-05
## 3477     4 48044 8.325701e-05
## 3478     4 48044 8.325701e-05
## 3479     4 48044 8.325701e-05
## 3480     4 48044 8.325701e-05
## 3481     4 48044 8.325701e-05
## 3482     4 48044 8.325701e-05
## 3483     4 48044 8.325701e-05
## 3484     4 48044 8.325701e-05
## 3485     4 48044 8.325701e-05
## 3486     4 48044 8.325701e-05
## 3487     4 48044 8.325701e-05
## 3488     4 48044 8.325701e-05
## 3489     4 48044 8.325701e-05
## 3490     4 48044 8.325701e-05
## 3491     4 48044 8.325701e-05
## 3492     4 48044 8.325701e-05
## 3493     4 48044 8.325701e-05
## 3494     4 48044 8.325701e-05
## 3495     4 48044 8.325701e-05
## 3496     4 48044 8.325701e-05
## 3497     4 48044 8.325701e-05
## 3498     4 48044 8.325701e-05
## 3499     4 48044 8.325701e-05
## 3500     4 48044 8.325701e-05
## 3501     4 48044 8.325701e-05
## 3502     4 48044 8.325701e-05
## 3503     4 48044 8.325701e-05
## 3504     4 48044 8.325701e-05
## 3505     4 48044 8.325701e-05
## 3506     4 48044 8.325701e-05
## 3507     4 48044 8.325701e-05
## 3508     4 48044 8.325701e-05
## 3509     4 48044 8.325701e-05
## 3510     4 48044 8.325701e-05
## 3511     4 48044 8.325701e-05
## 3512     4 48044 8.325701e-05
## 3513     4 48044 8.325701e-05
## 3514     4 48044 8.325701e-05
## 3515     4 48044 8.325701e-05
## 3516     4 48044 8.325701e-05
## 3517     4 48044 8.325701e-05
## 3518     4 48044 8.325701e-05
## 3519     4 48044 8.325701e-05
## 3520     4 48044 8.325701e-05
## 3521     4 48044 8.325701e-05
## 3522     4 48044 8.325701e-05
## 3523     4 48044 8.325701e-05
## 3524     4 48044 8.325701e-05
## 3525     4 48044 8.325701e-05
## 3526     4 48044 8.325701e-05
## 3527     4 48044 8.325701e-05
## 3528     4 48044 8.325701e-05
## 3529     4 48044 8.325701e-05
## 3530     4 48044 8.325701e-05
## 3531     4 48044 8.325701e-05
## 3532     4 48044 8.325701e-05
## 3533     4 48044 8.325701e-05
## 3534     4 48044 8.325701e-05
## 3535     4 48044 8.325701e-05
## 3536     4 48044 8.325701e-05
## 3537     4 48044 8.325701e-05
## 3538     4 48044 8.325701e-05
## 3539     4 48044 8.325701e-05
## 3540     4 48044 8.325701e-05
## 3541     4 48044 8.325701e-05
## 3542     4 48044 8.325701e-05
## 3543     4 48044 8.325701e-05
## 3544     4 48044 8.325701e-05
## 3545     4 48044 8.325701e-05
## 3546     4 48044 8.325701e-05
## 3547     4 48044 8.325701e-05
## 3548     4 48044 8.325701e-05
## 3549     4 48044 8.325701e-05
## 3550     4 48044 8.325701e-05
## 3551     4 48044 8.325701e-05
## 3552     4 48044 8.325701e-05
## 3553     4 48044 8.325701e-05
## 3554     4 48044 8.325701e-05
## 3555     4 48044 8.325701e-05
## 3556     4 48044 8.325701e-05
## 3557     4 48044 8.325701e-05
## 3558     4 48044 8.325701e-05
## 3559     4 48044 8.325701e-05
## 3560     4 48044 8.325701e-05
## 3561     4 48044 8.325701e-05
## 3562     4 48044 8.325701e-05
## 3563     4 48044 8.325701e-05
## 3564     4 48044 8.325701e-05
## 3565     4 48044 8.325701e-05
## 3566     4 48044 8.325701e-05
## 3567     4 48044 8.325701e-05
## 3568     4 48044 8.325701e-05
## 3569     4 48044 8.325701e-05
## 3570     4 48044 8.325701e-05
## 3571     4 48044 8.325701e-05
## 3572     4 48044 8.325701e-05
## 3573     4 48044 8.325701e-05
## 3574     4 48044 8.325701e-05
## 3575     4 48044 8.325701e-05
## 3576     4 48044 8.325701e-05
## 3577     4 48044 8.325701e-05
## 3578     4 48044 8.325701e-05
## 3579     4 48044 8.325701e-05
## 3580     4 48044 8.325701e-05
## 3581     4 48044 8.325701e-05
## 3582     4 48044 8.325701e-05
## 3583     4 48044 8.325701e-05
## 3584     4 48044 8.325701e-05
## 3585     4 48044 8.325701e-05
## 3586     4 48044 8.325701e-05
## 3587     4 48044 8.325701e-05
## 3588     4 48044 8.325701e-05
## 3589     4 48044 8.325701e-05
## 3590     4 48044 8.325701e-05
## 3591     4 48044 8.325701e-05
## 3592     4 48044 8.325701e-05
## 3593     4 48044 8.325701e-05
## 3594     4 48044 8.325701e-05
## 3595     4 48044 8.325701e-05
## 3596     4 48044 8.325701e-05
## 3597     4 48044 8.325701e-05
## 3598     4 48044 8.325701e-05
## 3599     4 48044 8.325701e-05
## 3600     4 48044 8.325701e-05
## 3601     4 48044 8.325701e-05
## 3602     4 48044 8.325701e-05
## 3603     4 48044 8.325701e-05
## 3604     4 48044 8.325701e-05
## 3605     4 48044 8.325701e-05
## 3606     4 48044 8.325701e-05
## 3607     4 48044 8.325701e-05
## 3608     4 48044 8.325701e-05
## 3609     4 48044 8.325701e-05
## 3610     4 48044 8.325701e-05
## 3611     4 48044 8.325701e-05
## 3612     4 48044 8.325701e-05
## 3613     4 48044 8.325701e-05
## 3614     4 48044 8.325701e-05
## 3615     4 48044 8.325701e-05
## 3616     4 48044 8.325701e-05
## 3617     4 48044 8.325701e-05
## 3618     4 48044 8.325701e-05
## 3619     4 48044 8.325701e-05
## 3620     4 48044 8.325701e-05
## 3621     4 48044 8.325701e-05
## 3622     4 48044 8.325701e-05
## 3623     4 48044 8.325701e-05
## 3624     4 48044 8.325701e-05
## 3625     4 48044 8.325701e-05
## 3626     4 48044 8.325701e-05
## 3627     4 48044 8.325701e-05
## 3628     4 48044 8.325701e-05
## 3629     4 48044 8.325701e-05
## 3630     4 48044 8.325701e-05
## 3631     4 48044 8.325701e-05
## 3632     4 48044 8.325701e-05
## 3633     4 48044 8.325701e-05
## 3634     4 48044 8.325701e-05
## 3635     4 48044 8.325701e-05
## 3636     4 48044 8.325701e-05
## 3637     4 48044 8.325701e-05
## 3638     4 48044 8.325701e-05
## 3639     4 48044 8.325701e-05
## 3640     4 48044 8.325701e-05
## 3641     4 48044 8.325701e-05
## 3642     4 48044 8.325701e-05
## 3643     4 48044 8.325701e-05
## 3644     4 48044 8.325701e-05
## 3645     4 48044 8.325701e-05
## 3646     4 48044 8.325701e-05
## 3647     4 48044 8.325701e-05
## 3648     4 48044 8.325701e-05
## 3649     4 48044 8.325701e-05
## 3650     4 48044 8.325701e-05
## 3651     4 48044 8.325701e-05
## 3652     4 48044 8.325701e-05
## 3653     4 48044 8.325701e-05
## 3654     4 48044 8.325701e-05
## 3655     4 48044 8.325701e-05
## 3656     4 48044 8.325701e-05
## 3657     4 48044 8.325701e-05
## 3658     4 48044 8.325701e-05
## 3659     4 48044 8.325701e-05
## 3660     4 48044 8.325701e-05
## 3661     4 48044 8.325701e-05
## 3662     4 48044 8.325701e-05
## 3663     4 48044 8.325701e-05
## 3664     4 48044 8.325701e-05
## 3665     4 48044 8.325701e-05
## 3666     4 48044 8.325701e-05
## 3667     4 48044 8.325701e-05
## 3668     4 48044 8.325701e-05
## 3669     4 48044 8.325701e-05
## 3670     4 48044 8.325701e-05
## 3671     4 48044 8.325701e-05
## 3672     4 48044 8.325701e-05
## 3673     4 48044 8.325701e-05
## 3674     4 48044 8.325701e-05
## 3675     4 48044 8.325701e-05
## 3676     4 48044 8.325701e-05
## 3677     4 48044 8.325701e-05
## 3678     4 48044 8.325701e-05
## 3679     4 48044 8.325701e-05
## 3680     4 48044 8.325701e-05
## 3681     4 48044 8.325701e-05
## 3682     4 48044 8.325701e-05
## 3683     4 48044 8.325701e-05
## 3684     4 48044 8.325701e-05
## 3685     4 48044 8.325701e-05
## 3686     4 48044 8.325701e-05
## 3687     4 48044 8.325701e-05
## 3688     4 48044 8.325701e-05
## 3689     4 48044 8.325701e-05
## 3690     4 48044 8.325701e-05
## 3691     4 48044 8.325701e-05
## 3692     4 48044 8.325701e-05
## 3693     4 48044 8.325701e-05
## 3694     4 48044 8.325701e-05
## 3695     4 48044 8.325701e-05
## 3696     4 48044 8.325701e-05
## 3697     4 48044 8.325701e-05
## 3698     4 48044 8.325701e-05
## 3699     4 48044 8.325701e-05
## 3700     4 48044 8.325701e-05
## 3701     4 48044 8.325701e-05
## 3702     4 48044 8.325701e-05
## 3703     4 48044 8.325701e-05
## 3704     4 48044 8.325701e-05
## 3705     4 48044 8.325701e-05
## 3706     4 48044 8.325701e-05
## 3707     4 48044 8.325701e-05
## 3708     4 48044 8.325701e-05
## 3709     4 48044 8.325701e-05
## 3710     4 48044 8.325701e-05
## 3711     4 48044 8.325701e-05
## 3712     4 48044 8.325701e-05
## 3713     4 48044 8.325701e-05
## 3714     4 48044 8.325701e-05
## 3715     4 48044 8.325701e-05
## 3716     4 48044 8.325701e-05
## 3717     4 48044 8.325701e-05
## 3718     4 48044 8.325701e-05
## 3719     4 48044 8.325701e-05
## 3720     4 48044 8.325701e-05
## 3721     4 48044 8.325701e-05
## 3722     4 48044 8.325701e-05
## 3723     4 48044 8.325701e-05
## 3724     4 48044 8.325701e-05
## 3725     4 48044 8.325701e-05
## 3726     4 48044 8.325701e-05
## 3727     4 48044 8.325701e-05
## 3728     4 48044 8.325701e-05
## 3729     4 48044 8.325701e-05
## 3730     4 48044 8.325701e-05
## 3731     4 48044 8.325701e-05
## 3732     4 48044 8.325701e-05
## 3733     4 48044 8.325701e-05
## 3734     4 48044 8.325701e-05
## 3735     4 48044 8.325701e-05
## 3736     4 48044 8.325701e-05
## 3737     4 48044 8.325701e-05
## 3738     4 48044 8.325701e-05
## 3739     4 48044 8.325701e-05
## 3740     4 48044 8.325701e-05
## 3741     4 48044 8.325701e-05
## 3742     4 48044 8.325701e-05
## 3743     4 48044 8.325701e-05
## 3744     4 48044 8.325701e-05
## 3745     4 48044 8.325701e-05
## 3746     4 48044 8.325701e-05
## 3747     4 48044 8.325701e-05
## 3748     4 48044 8.325701e-05
## 3749     4 48044 8.325701e-05
## 3750     4 48044 8.325701e-05
## 3751     4 48044 8.325701e-05
## 3752     4 48044 8.325701e-05
## 3753     4 48044 8.325701e-05
## 3754     4 48044 8.325701e-05
## 3755     4 48044 8.325701e-05
## 3756     4 31391 1.274251e-04
## 3757     4 31391 1.274251e-04
## 3758     4 31391 1.274251e-04
## 3759     4 31391 1.274251e-04
## 3760     4 31391 1.274251e-04
## 3761     4 31391 1.274251e-04
## 3762     4 31391 1.274251e-04
## 3763     4 31391 1.274251e-04
## 3764     4 31391 1.274251e-04
## 3765     4 31391 1.274251e-04
## 3766     4 31391 1.274251e-04
## 3767     4 31391 1.274251e-04
## 3768     4 31391 1.274251e-04
## 3769     4 31391 1.274251e-04
## 3770     4 31391 1.274251e-04
## 3771     4 31391 1.274251e-04
## 3772     4 31391 1.274251e-04
## 3773     4 31391 1.274251e-04
## 3774     4 31391 1.274251e-04
## 3775     4 31391 1.274251e-04
## 3776     4 31391 1.274251e-04
## 3777     4 31391 1.274251e-04
## 3778     4 31391 1.274251e-04
## 3779     4 31391 1.274251e-04
## 3780     4 31391 1.274251e-04
## 3781     4 31391 1.274251e-04
## 3782     4 31391 1.274251e-04
## 3783     4 31391 1.274251e-04
## 3784     4 31391 1.274251e-04
## 3785     4 31391 1.274251e-04
## 3786     4 31391 1.274251e-04
## 3787     4 31391 1.274251e-04
## 3788     4 31391 1.274251e-04
## 3789     4 31391 1.274251e-04
## 3790     4 31391 1.274251e-04
## 3791     4 31391 1.274251e-04
## 3792     4 31391 1.274251e-04
## 3793     4 31391 1.274251e-04
## 3794     4 31391 1.274251e-04
## 3795     4 31391 1.274251e-04
## 3796     4 31391 1.274251e-04
## 3797     4 31391 1.274251e-04
## 3798     4 31391 1.274251e-04
## 3799     4 31391 1.274251e-04
## 3800     4 31391 1.274251e-04
## 3801     4 31391 1.274251e-04
## 3802     4 31391 1.274251e-04
## 3803     4 31391 1.274251e-04
## 3804     4 31391 1.274251e-04
## 3805     4 31391 1.274251e-04
## 3806     4 31391 1.274251e-04
## 3807     4 31391 1.274251e-04
## 3808     4 31391 1.274251e-04
## 3809     4 31391 1.274251e-04
## 3810     4 31391 1.274251e-04
## 3811     4 31391 1.274251e-04
## 3812     4 31391 1.274251e-04
## 3813     4 31391 1.274251e-04
## 3814     4 31391 1.274251e-04
## 3815     4 31391 1.274251e-04
## 3816     4 31391 1.274251e-04
## 3817     4 31391 1.274251e-04
## 3818     4 31391 1.274251e-04
## 3819     4 31391 1.274251e-04
## 3820     4 31391 1.274251e-04
## 3821     4 31391 1.274251e-04
## 3822     4 31391 1.274251e-04
## 3823     4 31391 1.274251e-04
## 3824     4 31391 1.274251e-04
## 3825     4 31391 1.274251e-04
## 3826     4 31391 1.274251e-04
## 3827     4 31391 1.274251e-04
## 3828     4 31391 1.274251e-04
## 3829     4 31391 1.274251e-04
## 3830     4 31391 1.274251e-04
## 3831     4 31391 1.274251e-04
## 3832     4 31391 1.274251e-04
## 3833     4 31391 1.274251e-04
## 3834     4 31391 1.274251e-04
## 3835     4 31391 1.274251e-04
## 3836     4 31391 1.274251e-04
## 3837     4 31391 1.274251e-04
## 3838     4 31391 1.274251e-04
## 3839     4 31391 1.274251e-04
## 3840     4 31391 1.274251e-04
## 3841     4 31391 1.274251e-04
## 3842     4 31391 1.274251e-04
## 3843     4 31391 1.274251e-04
## 3844     4 31391 1.274251e-04
## 3845     4 31391 1.274251e-04
## 3846     4 31391 1.274251e-04
## 3847     4 31391 1.274251e-04
## 3848     4 31391 1.274251e-04
## 3849     4 31391 1.274251e-04
## 3850     4 31391 1.274251e-04
## 3851     4 31391 1.274251e-04
## 3852     4 31391 1.274251e-04
## 3853     4 31391 1.274251e-04
## 3854     4 31391 1.274251e-04
## 3855     4 31391 1.274251e-04
## 3856     4 31391 1.274251e-04
## 3857     4 31391 1.274251e-04
## 3858     4 31391 1.274251e-04
## 3859     4 31391 1.274251e-04
## 3860     4 31391 1.274251e-04
## 3861     4 31391 1.274251e-04
## 3862     4 31391 1.274251e-04
## 3863     4 31391 1.274251e-04
## 3864     4 31391 1.274251e-04
## 3865     4 31391 1.274251e-04
## 3866     4 31391 1.274251e-04
## 3867     4 31391 1.274251e-04
## 3868     4 31391 1.274251e-04
## 3869     4 31391 1.274251e-04
## 3870     4 31391 1.274251e-04
## 3871     4 31391 1.274251e-04
## 3872     4 31391 1.274251e-04
## 3873     4 31391 1.274251e-04
## 3874     4 31391 1.274251e-04
## 3875     4 31391 1.274251e-04
## 3876     4 31391 1.274251e-04
## 3877     4 31391 1.274251e-04
## 3878     4 31391 1.274251e-04
## 3879     4 31391 1.274251e-04
## 3880     4 31391 1.274251e-04
## 3881     4 31391 1.274251e-04
## 3882     4 31391 1.274251e-04
## 3883     4 31391 1.274251e-04
## 3884     4 31391 1.274251e-04
## 3885     4 31391 1.274251e-04
## 3886     4 31391 1.274251e-04
## 3887     4 31391 1.274251e-04
## 3888     4 31391 1.274251e-04
## 3889     4 31391 1.274251e-04
## 3890     4 31391 1.274251e-04
## 3891     4 31391 1.274251e-04
## 3892     4 31391 1.274251e-04
## 3893     4 31391 1.274251e-04
## 3894     4 31391 1.274251e-04
## 3895     4 31391 1.274251e-04
## 3896     4 31391 1.274251e-04
## 3897     4 31391 1.274251e-04
## 3898     4 31391 1.274251e-04
## 3899     4 31391 1.274251e-04
## 3900     4 31391 1.274251e-04
## 3901     4 31391 1.274251e-04
## 3902     4 31391 1.274251e-04
## 3903     4 31391 1.274251e-04
## 3904     4 31391 1.274251e-04
## 3905     4 31391 1.274251e-04
## 3906     4 31391 1.274251e-04
## 3907     4 31391 1.274251e-04
## 3908     4 31391 1.274251e-04
## 3909     4 31391 1.274251e-04
## 3910     4 31391 1.274251e-04
## 3911     4 31391 1.274251e-04
## 3912     4 31391 1.274251e-04
## 3913     4 31391 1.274251e-04
## 3914     4 31391 1.274251e-04
## 3915     4 31391 1.274251e-04
## 3916     4 31391 1.274251e-04
## 3917     4 31391 1.274251e-04
## 3918     4 31391 1.274251e-04
## 3919     4 31391 1.274251e-04
## 3920     4 31391 1.274251e-04
## 3921     4 31391 1.274251e-04
## 3922     4 31391 1.274251e-04
## 3923     4 31391 1.274251e-04
## 3924     4 31391 1.274251e-04
## 3925     4 31391 1.274251e-04
## 3926     4 31391 1.274251e-04
## 3927     4 31391 1.274251e-04
## 3928     4 31391 1.274251e-04
## 3929     4 31391 1.274251e-04
## 3930     4 31391 1.274251e-04
## 3931     4 31391 1.274251e-04
## 3932     4 31391 1.274251e-04
## 3933     4 31391 1.274251e-04
## 3934     4 31391 1.274251e-04
## 3935     4 31391 1.274251e-04
## 3936     4 31391 1.274251e-04
## 3937     4 31391 1.274251e-04
## 3938     4 31391 1.274251e-04
## 3939     4 31391 1.274251e-04
## 3940     4 31391 1.274251e-04
## 3941     4 31391 1.274251e-04
## 3942     4 31391 1.274251e-04
## 3943     4 31391 1.274251e-04
## 3944     4 31391 1.274251e-04
## 3945     4 31391 1.274251e-04
## 3946     4 31391 1.274251e-04
## 3947     4 31391 1.274251e-04
## 3948     4 31391 1.274251e-04
## 3949     4 31391 1.274251e-04
## 3950     4 31391 1.274251e-04
## 3951     4 31391 1.274251e-04
## 3952     4 31391 1.274251e-04
## 3953     4 31391 1.274251e-04
## 3954     4 31391 1.274251e-04
## 3955     4 31391 1.274251e-04
## 3956     4 31391 1.274251e-04
## 3957     4 31391 1.274251e-04
## 3958     4 31391 1.274251e-04
## 3959     4 31391 1.274251e-04
## 3960     4 31391 1.274251e-04
## 3961     4 31391 1.274251e-04
## 3962     4 31391 1.274251e-04
## 3963     4 31391 1.274251e-04
## 3964     4 31391 1.274251e-04
## 3965     4 31391 1.274251e-04
## 3966     4 31391 1.274251e-04
## 3967     4 31391 1.274251e-04
## 3968     4 31391 1.274251e-04
## 3969     4 31391 1.274251e-04
## 3970     4 31391 1.274251e-04
## 3971     4 31391 1.274251e-04
## 3972     4 31391 1.274251e-04
## 3973     4 31391 1.274251e-04
## 3974     4 31391 1.274251e-04
## 3975     4 31391 1.274251e-04
## 3976     4 31391 1.274251e-04
## 3977     4 31391 1.274251e-04
## 3978     4 31391 1.274251e-04
## 3979     4 31391 1.274251e-04
## 3980     4 31391 1.274251e-04
## 3981     4 31391 1.274251e-04
## 3982     4 31391 1.274251e-04
## 3983     4 31391 1.274251e-04
## 3984     4 31391 1.274251e-04
## 3985     4 31391 1.274251e-04
## 3986     4 31391 1.274251e-04
## 3987     4 31391 1.274251e-04
## 3988     4 31391 1.274251e-04
## 3989     4 31391 1.274251e-04
## 3990     4 31391 1.274251e-04
## 3991     4 31391 1.274251e-04
## 3992     4 31391 1.274251e-04
## 3993     4 31391 1.274251e-04
## 3994     4 31391 1.274251e-04
## 3995     4 31391 1.274251e-04
## 3996     4 31391 1.274251e-04
## 3997     4 31391 1.274251e-04
## 3998     4 31391 1.274251e-04
## 3999     4 31391 1.274251e-04
## 4000     4 31391 1.274251e-04
## 4001     4 31391 1.274251e-04
## 4002     4 31391 1.274251e-04
## 4003     4 31391 1.274251e-04
## 4004     4 31391 1.274251e-04
## 4005     4 31391 1.274251e-04
## 4006     4 31391 1.274251e-04
## 4007     4 31391 1.274251e-04
## 4008     4 31391 1.274251e-04
## 4009     4 31391 1.274251e-04
## 4010     4 31391 1.274251e-04
## 4011     4 31391 1.274251e-04
## 4012     4 31391 1.274251e-04
## 4013     4 31391 1.274251e-04
## 4014     4 31391 1.274251e-04
## 4015     4 31391 1.274251e-04
## 4016     4 31391 1.274251e-04
## 4017     4 31391 1.274251e-04
## 4018     4 31391 1.274251e-04
## 4019     4 31391 1.274251e-04
## 4020     4 31391 1.274251e-04
## 4021     4 31391 1.274251e-04
## 4022     4 31391 1.274251e-04
## 4023     4 31391 1.274251e-04
## 4024     4 31391 1.274251e-04
## 4025     4 31391 1.274251e-04
## 4026     4 31391 1.274251e-04
## 4027     4 31391 1.274251e-04
## 4028     4 31391 1.274251e-04
## 4029     4 31391 1.274251e-04
## 4030     4 31391 1.274251e-04
## 4031     4 31391 1.274251e-04
## 4032     4 31391 1.274251e-04
## 4033     4 31391 1.274251e-04
## 4034     4 31391 1.274251e-04
## 4035     4 31391 1.274251e-04
## 4036     4 31391 1.274251e-04
## 4037     4 31391 1.274251e-04
## 4038     4 31391 1.274251e-04
## 4039     4 31391 1.274251e-04
## 4040     4 31391 1.274251e-04
## 4041     4 31391 1.274251e-04
## 4042     4 31391 1.274251e-04
## 4043     4 31391 1.274251e-04
## 4044     4 31391 1.274251e-04
## 4045     4 31391 1.274251e-04
## 4046     4 31391 1.274251e-04
## 4047     4 31391 1.274251e-04
## 4048     4 31391 1.274251e-04
## 4049     4 31391 1.274251e-04
## 4050     4 31391 1.274251e-04
## 4051     4 31391 1.274251e-04
## 4052     4 31391 1.274251e-04
## 4053     4 31391 1.274251e-04
## 4054     4 31391 1.274251e-04
## 4055     4 31391 1.274251e-04
## 4056     4 31391 1.274251e-04
## 4057     4 31391 1.274251e-04
## 4058     4 31391 1.274251e-04
## 4059     4 31391 1.274251e-04
## 4060     4 31391 1.274251e-04
## 4061     4 31391 1.274251e-04
## 4062     4 31391 1.274251e-04
## 4063     4 31391 1.274251e-04
## 4064     4 31391 1.274251e-04
## 4065     4 31391 1.274251e-04
## 4066     4 31391 1.274251e-04
## 4067     4 31391 1.274251e-04
## 4068     4 31391 1.274251e-04
## 4069     4 31391 1.274251e-04
## 4070     4 31391 1.274251e-04
## 4071     4 31391 1.274251e-04
## 4072     4 31391 1.274251e-04
## 4073     4 31391 1.274251e-04
## 4074     4 31391 1.274251e-04
## 4075     4 31391 1.274251e-04
## 4076     4 31391 1.274251e-04
## 4077     4 31391 1.274251e-04
## 4078     4 31391 1.274251e-04
## 4079     4 31391 1.274251e-04
## 4080     4 31391 1.274251e-04
## 4081     4 31391 1.274251e-04
## 4082     4 31391 1.274251e-04
## 4083     4 31391 1.274251e-04
## 4084     4 31391 1.274251e-04
## 4085     4 31391 1.274251e-04
## 4086     4 31391 1.274251e-04
## 4087     4 31391 1.274251e-04
## 4088     4 31391 1.274251e-04
## 4089     4 31391 1.274251e-04
## 4090     4 16761 2.386492e-04
## 4091     4 16761 2.386492e-04
## 4092     4 16761 2.386492e-04
## 4093     4 16761 2.386492e-04
## 4094     4 16761 2.386492e-04
## 4095     4 16761 2.386492e-04
## 4096     4 16761 2.386492e-04
## 4097     4 16761 2.386492e-04
## 4098     4 16761 2.386492e-04
## 4099     4 16761 2.386492e-04
## 4100     4 16761 2.386492e-04
## 4101     4 16761 2.386492e-04
## 4102     4 16761 2.386492e-04
## 4103     4 16761 2.386492e-04
## 4104     4 16761 2.386492e-04
## 4105     4 16761 2.386492e-04
## 4106     4 16761 2.386492e-04
## 4107     4 16761 2.386492e-04
## 4108     4 16761 2.386492e-04
## 4109     4 16761 2.386492e-04
## 4110     4 16761 2.386492e-04
## 4111     4 16761 2.386492e-04
## 4112     4 16761 2.386492e-04
## 4113     4 16761 2.386492e-04
## 4114     4 16761 2.386492e-04
## 4115     4 16761 2.386492e-04
## 4116     4 16761 2.386492e-04
## 4117     4 16761 2.386492e-04
## 4118     4 16761 2.386492e-04
## 4119     4 16761 2.386492e-04
## 4120     4 16761 2.386492e-04
## 4121     4 16761 2.386492e-04
## 4122     4 16761 2.386492e-04
## 4123     4 16761 2.386492e-04
## 4124     4 16761 2.386492e-04
## 4125     4 16761 2.386492e-04
## 4126     4 16761 2.386492e-04
## 4127     4 16761 2.386492e-04
## 4128     4 16761 2.386492e-04
## 4129     4 16761 2.386492e-04
## 4130     4 16761 2.386492e-04
## 4131     4 16761 2.386492e-04
## 4132     4 16761 2.386492e-04
## 4133     4 16761 2.386492e-04
## 4134     4 16761 2.386492e-04
## 4135     4 16761 2.386492e-04
## 4136     4 16761 2.386492e-04
## 4137     4 16761 2.386492e-04
## 4138     4 16761 2.386492e-04
## 4139     4 16761 2.386492e-04
## 4140     4 16761 2.386492e-04
## 4141     4 16761 2.386492e-04
## 4142     4 16761 2.386492e-04
## 4143     4 16761 2.386492e-04
## 4144     4 16761 2.386492e-04
## 4145     4 16761 2.386492e-04
## 4146     4 16761 2.386492e-04
## 4147     4 16761 2.386492e-04
## 4148     4 16761 2.386492e-04
## 4149     4 16761 2.386492e-04
## 4150     4 16761 2.386492e-04
## 4151     4 16761 2.386492e-04
## 4152     4 16761 2.386492e-04
## 4153     4 16761 2.386492e-04
## 4154     4 16761 2.386492e-04
## 4155     4 16761 2.386492e-04
## 4156     4 16761 2.386492e-04
## 4157     4 16761 2.386492e-04
## 4158     4 16761 2.386492e-04
## 4159     4 16761 2.386492e-04
## 4160     4 16761 2.386492e-04
## 4161     4 16761 2.386492e-04
## 4162     4 16761 2.386492e-04
## 4163     4 16761 2.386492e-04
## 4164     4 16761 2.386492e-04
## 4165     4 16761 2.386492e-04
## 4166     4 16761 2.386492e-04
## 4167     4 16761 2.386492e-04
## 4168     4 16761 2.386492e-04
## 4169     4 16761 2.386492e-04
## 4170     4 16761 2.386492e-04
## 4171     4 16761 2.386492e-04
## 4172     4 16761 2.386492e-04
## 4173     4 16761 2.386492e-04
## 4174     4 16761 2.386492e-04
## 4175     4 16761 2.386492e-04
## 4176     4 16761 2.386492e-04
## 4177     4 16761 2.386492e-04
## 4178     4 16761 2.386492e-04
## 4179     4 16761 2.386492e-04
## 4180     4 16761 2.386492e-04
## 4181     4 16761 2.386492e-04
## 4182     4 16761 2.386492e-04
## 4183     4 16761 2.386492e-04
## 4184     4 16761 2.386492e-04
## 4185     4 16761 2.386492e-04
## 4186     4 16761 2.386492e-04
## 4187     4 16761 2.386492e-04
## 4188     4 16761 2.386492e-04
## 4189     4 16761 2.386492e-04
## 4190     4 16761 2.386492e-04
## 4191     4 16761 2.386492e-04
## 4192     4 16761 2.386492e-04
## 4193     4 16761 2.386492e-04
## 4194     4 16761 2.386492e-04
## 4195     4 16761 2.386492e-04
## 4196     4 16761 2.386492e-04
## 4197     4 16761 2.386492e-04
## 4198     4 16761 2.386492e-04
## 4199     4 16761 2.386492e-04
## 4200     4 16761 2.386492e-04
## 4201     4 16761 2.386492e-04
## 4202     4 16761 2.386492e-04
## 4203     4 16761 2.386492e-04
## 4204     4 16761 2.386492e-04
## 4205     4 16761 2.386492e-04
## 4206     4 16761 2.386492e-04
## 4207     4 16761 2.386492e-04
## 4208     4 16761 2.386492e-04
## 4209     4 16761 2.386492e-04
## 4210     4 16761 2.386492e-04
## 4211     4 16761 2.386492e-04
## 4212     4 16761 2.386492e-04
## 4213     4 16761 2.386492e-04
## 4214     4 16761 2.386492e-04
## 4215     4 16761 2.386492e-04
## 4216     4 16761 2.386492e-04
## 4217     4 16761 2.386492e-04
## 4218     4 16761 2.386492e-04
## 4219     4 16761 2.386492e-04
## 4220     4 16761 2.386492e-04
## 4221     4 16761 2.386492e-04
## 4222     4 16761 2.386492e-04
## 4223     4 16761 2.386492e-04
## 4224     4 16761 2.386492e-04
## 4225     4 16761 2.386492e-04
## 4226     4 16761 2.386492e-04
## 4227     4 16761 2.386492e-04
## 4228     4 16761 2.386492e-04
## 4229     4 16761 2.386492e-04
## 4230     4 16761 2.386492e-04
## 4231     4 16761 2.386492e-04
## 4232     4 16761 2.386492e-04
## 4233     4 16761 2.386492e-04
## 4234     4 16761 2.386492e-04
## 4235     4 16761 2.386492e-04
## 4236     4 16761 2.386492e-04
## 4237     4 16761 2.386492e-04
## 4238     4 16761 2.386492e-04
## 4239     4 16761 2.386492e-04
## 4240     4 16761 2.386492e-04
## 4241     4 16761 2.386492e-04
## 4242     4 16761 2.386492e-04
## 4243     4 16761 2.386492e-04
## 4244     4 16761 2.386492e-04
## 4245     4 16761 2.386492e-04
## 4246     4 16761 2.386492e-04
## 4247     4 16761 2.386492e-04
## 4248     4 16761 2.386492e-04
## 4249     4 16761 2.386492e-04
## 4250     4 16761 2.386492e-04
## 4251     4 16761 2.386492e-04
## 4252     4 16761 2.386492e-04
## 4253     4 16761 2.386492e-04
## 4254     4 16761 2.386492e-04
## 4255     4 16761 2.386492e-04
## 4256     4 16761 2.386492e-04
## 4257     4 16761 2.386492e-04
## 4258     4 16761 2.386492e-04
## 4259     4 16761 2.386492e-04
## 4260     4 16761 2.386492e-04
## 4261     4 16761 2.386492e-04
## 4262     4 16761 2.386492e-04
## 4263     4 16761 2.386492e-04
## 4264     4 16761 2.386492e-04
## 4265     4 16761 2.386492e-04
## 4266     4 16761 2.386492e-04
## 4267     4 16761 2.386492e-04
## 4268     4 16761 2.386492e-04
## 4269     4 16761 2.386492e-04
## 4270     4 16761 2.386492e-04
## 4271     4 16761 2.386492e-04
## 4272     4 16761 2.386492e-04
## 4273     3 48044 6.244276e-05
## 4274     3 48044 6.244276e-05
## 4275     3 48044 6.244276e-05
## 4276     3 48044 6.244276e-05
## 4277     3 48044 6.244276e-05
## 4278     3 48044 6.244276e-05
## 4279     3 48044 6.244276e-05
## 4280     3 48044 6.244276e-05
## 4281     3 48044 6.244276e-05
## 4282     3 48044 6.244276e-05
## 4283     3 48044 6.244276e-05
## 4284     3 48044 6.244276e-05
## 4285     3 48044 6.244276e-05
## 4286     3 48044 6.244276e-05
## 4287     3 48044 6.244276e-05
## 4288     3 48044 6.244276e-05
## 4289     3 48044 6.244276e-05
## 4290     3 48044 6.244276e-05
## 4291     3 48044 6.244276e-05
## 4292     3 48044 6.244276e-05
## 4293     3 48044 6.244276e-05
## 4294     3 48044 6.244276e-05
## 4295     3 48044 6.244276e-05
## 4296     3 48044 6.244276e-05
## 4297     3 48044 6.244276e-05
## 4298     3 48044 6.244276e-05
## 4299     3 48044 6.244276e-05
## 4300     3 48044 6.244276e-05
## 4301     3 48044 6.244276e-05
## 4302     3 48044 6.244276e-05
## 4303     3 48044 6.244276e-05
## 4304     3 48044 6.244276e-05
## 4305     3 48044 6.244276e-05
## 4306     3 48044 6.244276e-05
## 4307     3 48044 6.244276e-05
## 4308     3 48044 6.244276e-05
## 4309     3 48044 6.244276e-05
## 4310     3 48044 6.244276e-05
## 4311     3 48044 6.244276e-05
## 4312     3 48044 6.244276e-05
## 4313     3 48044 6.244276e-05
## 4314     3 48044 6.244276e-05
## 4315     3 48044 6.244276e-05
## 4316     3 48044 6.244276e-05
## 4317     3 48044 6.244276e-05
## 4318     3 48044 6.244276e-05
## 4319     3 48044 6.244276e-05
## 4320     3 48044 6.244276e-05
## 4321     3 48044 6.244276e-05
## 4322     3 48044 6.244276e-05
## 4323     3 48044 6.244276e-05
## 4324     3 48044 6.244276e-05
## 4325     3 48044 6.244276e-05
## 4326     3 48044 6.244276e-05
## 4327     3 48044 6.244276e-05
## 4328     3 48044 6.244276e-05
## 4329     3 48044 6.244276e-05
## 4330     3 48044 6.244276e-05
## 4331     3 48044 6.244276e-05
## 4332     3 48044 6.244276e-05
## 4333     3 48044 6.244276e-05
## 4334     3 48044 6.244276e-05
## 4335     3 48044 6.244276e-05
## 4336     3 48044 6.244276e-05
## 4337     3 48044 6.244276e-05
## 4338     3 48044 6.244276e-05
## 4339     3 48044 6.244276e-05
## 4340     3 48044 6.244276e-05
## 4341     3 48044 6.244276e-05
## 4342     3 48044 6.244276e-05
## 4343     3 48044 6.244276e-05
## 4344     3 48044 6.244276e-05
## 4345     3 48044 6.244276e-05
## 4346     3 48044 6.244276e-05
## 4347     3 48044 6.244276e-05
## 4348     3 48044 6.244276e-05
## 4349     3 48044 6.244276e-05
## 4350     3 48044 6.244276e-05
## 4351     3 48044 6.244276e-05
## 4352     3 48044 6.244276e-05
## 4353     3 48044 6.244276e-05
## 4354     3 48044 6.244276e-05
## 4355     3 48044 6.244276e-05
## 4356     3 48044 6.244276e-05
## 4357     3 48044 6.244276e-05
## 4358     3 48044 6.244276e-05
## 4359     3 48044 6.244276e-05
## 4360     3 48044 6.244276e-05
## 4361     3 48044 6.244276e-05
## 4362     3 48044 6.244276e-05
## 4363     3 48044 6.244276e-05
## 4364     3 48044 6.244276e-05
## 4365     3 48044 6.244276e-05
## 4366     3 48044 6.244276e-05
## 4367     3 48044 6.244276e-05
## 4368     3 48044 6.244276e-05
## 4369     3 48044 6.244276e-05
## 4370     3 48044 6.244276e-05
## 4371     3 48044 6.244276e-05
## 4372     3 48044 6.244276e-05
## 4373     3 48044 6.244276e-05
## 4374     3 48044 6.244276e-05
## 4375     3 48044 6.244276e-05
## 4376     3 48044 6.244276e-05
## 4377     3 48044 6.244276e-05
## 4378     3 48044 6.244276e-05
## 4379     3 48044 6.244276e-05
## 4380     3 48044 6.244276e-05
## 4381     3 48044 6.244276e-05
## 4382     3 48044 6.244276e-05
## 4383     3 48044 6.244276e-05
## 4384     3 48044 6.244276e-05
## 4385     3 48044 6.244276e-05
## 4386     3 48044 6.244276e-05
## 4387     3 48044 6.244276e-05
## 4388     3 48044 6.244276e-05
## 4389     3 48044 6.244276e-05
## 4390     3 48044 6.244276e-05
## 4391     3 48044 6.244276e-05
## 4392     3 48044 6.244276e-05
## 4393     3 48044 6.244276e-05
## 4394     3 48044 6.244276e-05
## 4395     3 48044 6.244276e-05
## 4396     3 48044 6.244276e-05
## 4397     3 48044 6.244276e-05
## 4398     3 48044 6.244276e-05
## 4399     3 48044 6.244276e-05
## 4400     3 48044 6.244276e-05
## 4401     3 48044 6.244276e-05
## 4402     3 48044 6.244276e-05
## 4403     3 48044 6.244276e-05
## 4404     3 48044 6.244276e-05
## 4405     3 48044 6.244276e-05
## 4406     3 48044 6.244276e-05
## 4407     3 48044 6.244276e-05
## 4408     3 48044 6.244276e-05
## 4409     3 48044 6.244276e-05
## 4410     3 48044 6.244276e-05
## 4411     3 48044 6.244276e-05
## 4412     3 48044 6.244276e-05
## 4413     3 48044 6.244276e-05
## 4414     3 48044 6.244276e-05
## 4415     3 48044 6.244276e-05
## 4416     3 48044 6.244276e-05
## 4417     3 48044 6.244276e-05
## 4418     3 48044 6.244276e-05
## 4419     3 48044 6.244276e-05
## 4420     3 48044 6.244276e-05
## 4421     3 48044 6.244276e-05
## 4422     3 48044 6.244276e-05
## 4423     3 48044 6.244276e-05
## 4424     3 48044 6.244276e-05
## 4425     3 48044 6.244276e-05
## 4426     3 48044 6.244276e-05
## 4427     3 48044 6.244276e-05
## 4428     3 48044 6.244276e-05
## 4429     3 48044 6.244276e-05
## 4430     3 48044 6.244276e-05
## 4431     3 48044 6.244276e-05
## 4432     3 48044 6.244276e-05
## 4433     3 48044 6.244276e-05
## 4434     3 48044 6.244276e-05
## 4435     3 48044 6.244276e-05
## 4436     3 48044 6.244276e-05
## 4437     3 48044 6.244276e-05
## 4438     3 48044 6.244276e-05
## 4439     3 48044 6.244276e-05
## 4440     3 48044 6.244276e-05
## 4441     3 48044 6.244276e-05
## 4442     3 48044 6.244276e-05
## 4443     3 48044 6.244276e-05
## 4444     3 48044 6.244276e-05
## 4445     3 48044 6.244276e-05
## 4446     3 48044 6.244276e-05
## 4447     3 48044 6.244276e-05
## 4448     3 48044 6.244276e-05
## 4449     3 48044 6.244276e-05
## 4450     3 48044 6.244276e-05
## 4451     3 48044 6.244276e-05
## 4452     3 48044 6.244276e-05
## 4453     3 48044 6.244276e-05
## 4454     3 48044 6.244276e-05
## 4455     3 48044 6.244276e-05
## 4456     3 48044 6.244276e-05
## 4457     3 48044 6.244276e-05
## 4458     3 48044 6.244276e-05
## 4459     3 48044 6.244276e-05
## 4460     3 48044 6.244276e-05
## 4461     3 48044 6.244276e-05
## 4462     3 48044 6.244276e-05
## 4463     3 48044 6.244276e-05
## 4464     3 48044 6.244276e-05
## 4465     3 48044 6.244276e-05
## 4466     3 48044 6.244276e-05
## 4467     3 48044 6.244276e-05
## 4468     3 48044 6.244276e-05
## 4469     3 48044 6.244276e-05
## 4470     3 48044 6.244276e-05
## 4471     3 48044 6.244276e-05
## 4472     3 48044 6.244276e-05
## 4473     3 48044 6.244276e-05
## 4474     3 48044 6.244276e-05
## 4475     3 48044 6.244276e-05
## 4476     3 48044 6.244276e-05
## 4477     3 48044 6.244276e-05
## 4478     3 48044 6.244276e-05
## 4479     3 48044 6.244276e-05
## 4480     3 48044 6.244276e-05
## 4481     3 48044 6.244276e-05
## 4482     3 48044 6.244276e-05
## 4483     3 48044 6.244276e-05
## 4484     3 48044 6.244276e-05
## 4485     3 48044 6.244276e-05
## 4486     3 48044 6.244276e-05
## 4487     3 48044 6.244276e-05
## 4488     3 48044 6.244276e-05
## 4489     3 48044 6.244276e-05
## 4490     3 48044 6.244276e-05
## 4491     3 48044 6.244276e-05
## 4492     3 48044 6.244276e-05
## 4493     3 48044 6.244276e-05
## 4494     3 48044 6.244276e-05
## 4495     3 48044 6.244276e-05
## 4496     3 48044 6.244276e-05
## 4497     3 48044 6.244276e-05
## 4498     3 48044 6.244276e-05
## 4499     3 48044 6.244276e-05
## 4500     3 48044 6.244276e-05
## 4501     3 48044 6.244276e-05
## 4502     3 48044 6.244276e-05
## 4503     3 48044 6.244276e-05
## 4504     3 48044 6.244276e-05
## 4505     3 48044 6.244276e-05
## 4506     3 48044 6.244276e-05
## 4507     3 48044 6.244276e-05
## 4508     3 48044 6.244276e-05
## 4509     3 48044 6.244276e-05
## 4510     3 48044 6.244276e-05
## 4511     3 48044 6.244276e-05
## 4512     3 48044 6.244276e-05
## 4513     3 48044 6.244276e-05
## 4514     3 48044 6.244276e-05
## 4515     3 48044 6.244276e-05
## 4516     3 48044 6.244276e-05
## 4517     3 48044 6.244276e-05
## 4518     3 48044 6.244276e-05
## 4519     3 48044 6.244276e-05
## 4520     3 48044 6.244276e-05
## 4521     3 48044 6.244276e-05
## 4522     3 48044 6.244276e-05
## 4523     3 48044 6.244276e-05
## 4524     3 48044 6.244276e-05
## 4525     3 48044 6.244276e-05
## 4526     3 48044 6.244276e-05
## 4527     3 48044 6.244276e-05
## 4528     3 48044 6.244276e-05
## 4529     3 48044 6.244276e-05
## 4530     3 48044 6.244276e-05
## 4531     3 48044 6.244276e-05
## 4532     3 48044 6.244276e-05
## 4533     3 48044 6.244276e-05
## 4534     3 48044 6.244276e-05
## 4535     3 48044 6.244276e-05
## 4536     3 48044 6.244276e-05
## 4537     3 48044 6.244276e-05
## 4538     3 48044 6.244276e-05
## 4539     3 48044 6.244276e-05
## 4540     3 48044 6.244276e-05
## 4541     3 48044 6.244276e-05
## 4542     3 48044 6.244276e-05
## 4543     3 48044 6.244276e-05
## 4544     3 48044 6.244276e-05
## 4545     3 48044 6.244276e-05
## 4546     3 48044 6.244276e-05
## 4547     3 48044 6.244276e-05
## 4548     3 48044 6.244276e-05
## 4549     3 48044 6.244276e-05
## 4550     3 48044 6.244276e-05
## 4551     3 48044 6.244276e-05
## 4552     3 48044 6.244276e-05
## 4553     3 48044 6.244276e-05
## 4554     3 48044 6.244276e-05
## 4555     3 48044 6.244276e-05
## 4556     3 48044 6.244276e-05
## 4557     3 48044 6.244276e-05
## 4558     3 48044 6.244276e-05
## 4559     3 48044 6.244276e-05
## 4560     3 48044 6.244276e-05
## 4561     3 48044 6.244276e-05
## 4562     3 48044 6.244276e-05
## 4563     3 48044 6.244276e-05
## 4564     3 48044 6.244276e-05
## 4565     3 48044 6.244276e-05
## 4566     3 48044 6.244276e-05
## 4567     3 48044 6.244276e-05
## 4568     3 48044 6.244276e-05
## 4569     3 48044 6.244276e-05
## 4570     3 48044 6.244276e-05
## 4571     3 48044 6.244276e-05
## 4572     3 48044 6.244276e-05
## 4573     3 48044 6.244276e-05
## 4574     3 48044 6.244276e-05
## 4575     3 48044 6.244276e-05
## 4576     3 48044 6.244276e-05
## 4577     3 48044 6.244276e-05
## 4578     3 48044 6.244276e-05
## 4579     3 48044 6.244276e-05
## 4580     3 48044 6.244276e-05
## 4581     3 48044 6.244276e-05
## 4582     3 48044 6.244276e-05
## 4583     3 48044 6.244276e-05
## 4584     3 48044 6.244276e-05
## 4585     3 48044 6.244276e-05
## 4586     3 48044 6.244276e-05
## 4587     3 48044 6.244276e-05
## 4588     3 48044 6.244276e-05
## 4589     3 48044 6.244276e-05
## 4590     3 48044 6.244276e-05
## 4591     3 48044 6.244276e-05
## 4592     3 48044 6.244276e-05
## 4593     3 48044 6.244276e-05
## 4594     3 48044 6.244276e-05
## 4595     3 48044 6.244276e-05
## 4596     3 48044 6.244276e-05
## 4597     3 48044 6.244276e-05
## 4598     3 48044 6.244276e-05
## 4599     3 48044 6.244276e-05
## 4600     3 48044 6.244276e-05
## 4601     3 48044 6.244276e-05
## 4602     3 48044 6.244276e-05
## 4603     3 48044 6.244276e-05
## 4604     3 48044 6.244276e-05
## 4605     3 48044 6.244276e-05
## 4606     3 48044 6.244276e-05
## 4607     3 48044 6.244276e-05
## 4608     3 48044 6.244276e-05
## 4609     3 48044 6.244276e-05
## 4610     3 48044 6.244276e-05
## 4611     3 48044 6.244276e-05
## 4612     3 48044 6.244276e-05
## 4613     3 48044 6.244276e-05
## 4614     3 48044 6.244276e-05
## 4615     3 48044 6.244276e-05
## 4616     3 48044 6.244276e-05
## 4617     3 48044 6.244276e-05
## 4618     3 48044 6.244276e-05
## 4619     3 48044 6.244276e-05
## 4620     3 48044 6.244276e-05
## 4621     3 48044 6.244276e-05
## 4622     3 48044 6.244276e-05
## 4623     3 48044 6.244276e-05
## 4624     3 48044 6.244276e-05
## 4625     3 48044 6.244276e-05
## 4626     3 48044 6.244276e-05
## 4627     3 48044 6.244276e-05
## 4628     3 48044 6.244276e-05
## 4629     3 48044 6.244276e-05
## 4630     3 48044 6.244276e-05
## 4631     3 48044 6.244276e-05
## 4632     3 48044 6.244276e-05
## 4633     3 48044 6.244276e-05
## 4634     3 48044 6.244276e-05
## 4635     3 48044 6.244276e-05
## 4636     3 48044 6.244276e-05
## 4637     3 48044 6.244276e-05
## 4638     3 48044 6.244276e-05
## 4639     3 48044 6.244276e-05
## 4640     3 48044 6.244276e-05
## 4641     3 48044 6.244276e-05
## 4642     3 48044 6.244276e-05
## 4643     3 48044 6.244276e-05
## 4644     3 48044 6.244276e-05
## 4645     3 48044 6.244276e-05
## 4646     3 48044 6.244276e-05
## 4647     3 48044 6.244276e-05
## 4648     3 48044 6.244276e-05
## 4649     3 48044 6.244276e-05
## 4650     3 48044 6.244276e-05
## 4651     3 48044 6.244276e-05
## 4652     3 48044 6.244276e-05
## 4653     3 48044 6.244276e-05
## 4654     3 48044 6.244276e-05
## 4655     3 48044 6.244276e-05
## 4656     3 48044 6.244276e-05
## 4657     3 48044 6.244276e-05
## 4658     3 48044 6.244276e-05
## 4659     3 48044 6.244276e-05
## 4660     3 48044 6.244276e-05
## 4661     3 48044 6.244276e-05
## 4662     3 48044 6.244276e-05
## 4663     3 48044 6.244276e-05
## 4664     3 48044 6.244276e-05
## 4665     3 48044 6.244276e-05
## 4666     3 48044 6.244276e-05
## 4667     3 48044 6.244276e-05
## 4668     3 48044 6.244276e-05
## 4669     3 48044 6.244276e-05
## 4670     3 48044 6.244276e-05
## 4671     3 48044 6.244276e-05
## 4672     3 48044 6.244276e-05
## 4673     3 48044 6.244276e-05
## 4674     3 48044 6.244276e-05
## 4675     3 48044 6.244276e-05
## 4676     3 48044 6.244276e-05
## 4677     3 48044 6.244276e-05
## 4678     3 48044 6.244276e-05
## 4679     3 48044 6.244276e-05
## 4680     3 48044 6.244276e-05
## 4681     3 48044 6.244276e-05
## 4682     3 48044 6.244276e-05
## 4683     3 48044 6.244276e-05
## 4684     3 48044 6.244276e-05
## 4685     3 48044 6.244276e-05
## 4686     3 48044 6.244276e-05
## 4687     3 48044 6.244276e-05
## 4688     3 48044 6.244276e-05
## 4689     3 48044 6.244276e-05
## 4690     3 48044 6.244276e-05
## 4691     3 48044 6.244276e-05
## 4692     3 48044 6.244276e-05
## 4693     3 48044 6.244276e-05
## 4694     3 48044 6.244276e-05
## 4695     3 48044 6.244276e-05
## 4696     3 48044 6.244276e-05
## 4697     3 48044 6.244276e-05
## 4698     3 48044 6.244276e-05
## 4699     3 48044 6.244276e-05
## 4700     3 48044 6.244276e-05
## 4701     3 48044 6.244276e-05
## 4702     3 48044 6.244276e-05
## 4703     3 48044 6.244276e-05
## 4704     3 48044 6.244276e-05
## 4705     3 48044 6.244276e-05
## 4706     3 48044 6.244276e-05
## 4707     3 48044 6.244276e-05
## 4708     3 48044 6.244276e-05
## 4709     3 48044 6.244276e-05
## 4710     3 48044 6.244276e-05
## 4711     3 48044 6.244276e-05
## 4712     3 48044 6.244276e-05
## 4713     3 48044 6.244276e-05
## 4714     3 48044 6.244276e-05
## 4715     3 48044 6.244276e-05
## 4716     3 48044 6.244276e-05
## 4717     3 48044 6.244276e-05
## 4718     3 48044 6.244276e-05
## 4719     3 48044 6.244276e-05
## 4720     3 48044 6.244276e-05
## 4721     3 48044 6.244276e-05
## 4722     3 48044 6.244276e-05
## 4723     3 48044 6.244276e-05
## 4724     3 48044 6.244276e-05
## 4725     3 48044 6.244276e-05
## 4726     3 48044 6.244276e-05
## 4727     3 48044 6.244276e-05
## 4728     3 48044 6.244276e-05
## 4729     3 48044 6.244276e-05
## 4730     3 48044 6.244276e-05
## 4731     3 48044 6.244276e-05
## 4732     3 48044 6.244276e-05
## 4733     3 48044 6.244276e-05
## 4734     3 48044 6.244276e-05
## 4735     3 48044 6.244276e-05
## 4736     3 48044 6.244276e-05
## 4737     3 48044 6.244276e-05
## 4738     3 48044 6.244276e-05
## 4739     3 48044 6.244276e-05
## 4740     3 48044 6.244276e-05
## 4741     3 48044 6.244276e-05
## 4742     3 48044 6.244276e-05
## 4743     3 48044 6.244276e-05
## 4744     3 48044 6.244276e-05
## 4745     3 48044 6.244276e-05
## 4746     3 48044 6.244276e-05
## 4747     3 48044 6.244276e-05
## 4748     3 48044 6.244276e-05
## 4749     3 48044 6.244276e-05
## 4750     3 48044 6.244276e-05
## 4751     3 48044 6.244276e-05
## 4752     3 48044 6.244276e-05
## 4753     3 48044 6.244276e-05
## 4754     3 48044 6.244276e-05
## 4755     3 48044 6.244276e-05
## 4756     3 48044 6.244276e-05
## 4757     3 48044 6.244276e-05
## 4758     3 48044 6.244276e-05
## 4759     3 48044 6.244276e-05
## 4760     3 48044 6.244276e-05
## 4761     3 48044 6.244276e-05
## 4762     3 48044 6.244276e-05
## 4763     3 48044 6.244276e-05
## 4764     3 48044 6.244276e-05
## 4765     3 48044 6.244276e-05
## 4766     3 48044 6.244276e-05
## 4767     3 48044 6.244276e-05
## 4768     3 48044 6.244276e-05
## 4769     3 48044 6.244276e-05
## 4770     3 48044 6.244276e-05
## 4771     3 48044 6.244276e-05
## 4772     3 48044 6.244276e-05
## 4773     3 48044 6.244276e-05
## 4774     3 48044 6.244276e-05
## 4775     3 48044 6.244276e-05
## 4776     3 48044 6.244276e-05
## 4777     3 48044 6.244276e-05
## 4778     3 48044 6.244276e-05
## 4779     3 48044 6.244276e-05
## 4780     3 48044 6.244276e-05
## 4781     3 48044 6.244276e-05
## 4782     3 48044 6.244276e-05
## 4783     3 48044 6.244276e-05
## 4784     3 48044 6.244276e-05
## 4785     3 48044 6.244276e-05
## 4786     3 48044 6.244276e-05
## 4787     3 48044 6.244276e-05
## 4788     3 48044 6.244276e-05
## 4789     3 48044 6.244276e-05
## 4790     3 48044 6.244276e-05
## 4791     3 48044 6.244276e-05
## 4792     3 48044 6.244276e-05
## 4793     3 48044 6.244276e-05
## 4794     3 48044 6.244276e-05
## 4795     3 48044 6.244276e-05
## 4796     3 48044 6.244276e-05
## 4797     3 48044 6.244276e-05
## 4798     3 48044 6.244276e-05
## 4799     3 48044 6.244276e-05
## 4800     3 48044 6.244276e-05
## 4801     3 48044 6.244276e-05
## 4802     3 48044 6.244276e-05
## 4803     3 48044 6.244276e-05
## 4804     3 48044 6.244276e-05
## 4805     3 48044 6.244276e-05
## 4806     3 48044 6.244276e-05
## 4807     3 48044 6.244276e-05
## 4808     3 48044 6.244276e-05
## 4809     3 48044 6.244276e-05
## 4810     3 48044 6.244276e-05
## 4811     3 48044 6.244276e-05
## 4812     3 48044 6.244276e-05
## 4813     3 48044 6.244276e-05
## 4814     3 48044 6.244276e-05
## 4815     3 48044 6.244276e-05
## 4816     3 48044 6.244276e-05
## 4817     3 48044 6.244276e-05
## 4818     3 48044 6.244276e-05
## 4819     3 48044 6.244276e-05
## 4820     3 48044 6.244276e-05
## 4821     3 48044 6.244276e-05
## 4822     3 48044 6.244276e-05
## 4823     3 48044 6.244276e-05
## 4824     3 48044 6.244276e-05
## 4825     3 48044 6.244276e-05
## 4826     3 48044 6.244276e-05
## 4827     3 48044 6.244276e-05
## 4828     3 48044 6.244276e-05
## 4829     3 48044 6.244276e-05
## 4830     3 48044 6.244276e-05
## 4831     3 48044 6.244276e-05
## 4832     3 48044 6.244276e-05
## 4833     3 48044 6.244276e-05
## 4834     3 48044 6.244276e-05
## 4835     3 48044 6.244276e-05
## 4836     3 48044 6.244276e-05
## 4837     3 48044 6.244276e-05
## 4838     3 48044 6.244276e-05
## 4839     3 48044 6.244276e-05
## 4840     3 48044 6.244276e-05
## 4841     3 48044 6.244276e-05
## 4842     3 48044 6.244276e-05
## 4843     3 48044 6.244276e-05
## 4844     3 48044 6.244276e-05
## 4845     3 48044 6.244276e-05
## 4846     3 48044 6.244276e-05
## 4847     3 48044 6.244276e-05
## 4848     3 48044 6.244276e-05
## 4849     3 48044 6.244276e-05
## 4850     3 48044 6.244276e-05
## 4851     3 48044 6.244276e-05
## 4852     3 48044 6.244276e-05
## 4853     3 48044 6.244276e-05
## 4854     3 48044 6.244276e-05
## 4855     3 48044 6.244276e-05
## 4856     3 48044 6.244276e-05
## 4857     3 48044 6.244276e-05
## 4858     3 48044 6.244276e-05
## 4859     3 48044 6.244276e-05
## 4860     3 48044 6.244276e-05
## 4861     3 48044 6.244276e-05
## 4862     3 48044 6.244276e-05
## 4863     3 48044 6.244276e-05
## 4864     3 48044 6.244276e-05
## 4865     3 48044 6.244276e-05
## 4866     3 48044 6.244276e-05
## 4867     3 48044 6.244276e-05
## 4868     3 48044 6.244276e-05
## 4869     3 48044 6.244276e-05
## 4870     3 48044 6.244276e-05
## 4871     3 48044 6.244276e-05
## 4872     3 48044 6.244276e-05
## 4873     3 48044 6.244276e-05
## 4874     3 48044 6.244276e-05
## 4875     3 48044 6.244276e-05
## 4876     3 48044 6.244276e-05
## 4877     3 48044 6.244276e-05
## 4878     3 48044 6.244276e-05
## 4879     3 48044 6.244276e-05
## 4880     3 48044 6.244276e-05
## 4881     3 48044 6.244276e-05
## 4882     3 48044 6.244276e-05
## 4883     3 48044 6.244276e-05
## 4884     3 48044 6.244276e-05
## 4885     3 48044 6.244276e-05
## 4886     3 48044 6.244276e-05
## 4887     3 48044 6.244276e-05
## 4888     3 48044 6.244276e-05
## 4889     3 48044 6.244276e-05
## 4890     3 48044 6.244276e-05
## 4891     3 48044 6.244276e-05
## 4892     3 48044 6.244276e-05
## 4893     3 48044 6.244276e-05
## 4894     3 48044 6.244276e-05
## 4895     3 48044 6.244276e-05
## 4896     3 48044 6.244276e-05
## 4897     3 48044 6.244276e-05
## 4898     3 48044 6.244276e-05
## 4899     3 48044 6.244276e-05
## 4900     3 48044 6.244276e-05
## 4901     3 48044 6.244276e-05
## 4902     3 48044 6.244276e-05
## 4903     3 48044 6.244276e-05
## 4904     3 48044 6.244276e-05
## 4905     3 48044 6.244276e-05
## 4906     3 48044 6.244276e-05
## 4907     3 48044 6.244276e-05
## 4908     3 48044 6.244276e-05
## 4909     3 48044 6.244276e-05
## 4910     3 48044 6.244276e-05
## 4911     3 48044 6.244276e-05
## 4912     3 48044 6.244276e-05
## 4913     3 48044 6.244276e-05
## 4914     3 48044 6.244276e-05
## 4915     3 48044 6.244276e-05
## 4916     3 48044 6.244276e-05
## 4917     3 48044 6.244276e-05
## 4918     3 48044 6.244276e-05
## 4919     3 48044 6.244276e-05
## 4920     3 48044 6.244276e-05
## 4921     3 48044 6.244276e-05
## 4922     3 48044 6.244276e-05
## 4923     3 48044 6.244276e-05
## 4924     3 48044 6.244276e-05
## 4925     3 48044 6.244276e-05
## 4926     3 48044 6.244276e-05
## 4927     3 48044 6.244276e-05
## 4928     3 48044 6.244276e-05
## 4929     3 48044 6.244276e-05
## 4930     3 48044 6.244276e-05
## 4931     3 48044 6.244276e-05
## 4932     3 48044 6.244276e-05
## 4933     3 48044 6.244276e-05
## 4934     3 48044 6.244276e-05
## 4935     3 48044 6.244276e-05
## 4936     3 48044 6.244276e-05
## 4937     3 48044 6.244276e-05
## 4938     3 48044 6.244276e-05
## 4939     3 48044 6.244276e-05
## 4940     3 48044 6.244276e-05
## 4941     3 48044 6.244276e-05
## 4942     3 48044 6.244276e-05
## 4943     3 48044 6.244276e-05
## 4944     3 48044 6.244276e-05
## 4945     3 48044 6.244276e-05
## 4946     3 48044 6.244276e-05
## 4947     3 48044 6.244276e-05
## 4948     3 48044 6.244276e-05
## 4949     3 48044 6.244276e-05
## 4950     3 48044 6.244276e-05
## 4951     3 48044 6.244276e-05
## 4952     3 48044 6.244276e-05
## 4953     3 48044 6.244276e-05
## 4954     3 48044 6.244276e-05
## 4955     3 48044 6.244276e-05
## 4956     3 48044 6.244276e-05
## 4957     3 48044 6.244276e-05
## 4958     3 48044 6.244276e-05
## 4959     3 48044 6.244276e-05
## 4960     3 48044 6.244276e-05
## 4961     3 48044 6.244276e-05
## 4962     3 48044 6.244276e-05
## 4963     3 48044 6.244276e-05
## 4964     3 48044 6.244276e-05
## 4965     3 48044 6.244276e-05
## 4966     3 48044 6.244276e-05
## 4967     3 48044 6.244276e-05
## 4968     3 48044 6.244276e-05
## 4969     3 48044 6.244276e-05
## 4970     3 48044 6.244276e-05
## 4971     3 48044 6.244276e-05
## 4972     3 48044 6.244276e-05
## 4973     3 48044 6.244276e-05
## 4974     3 48044 6.244276e-05
## 4975     3 48044 6.244276e-05
## 4976     3 48044 6.244276e-05
## 4977     3 48044 6.244276e-05
## 4978     3 48044 6.244276e-05
## 4979     3 48044 6.244276e-05
## 4980     3 48044 6.244276e-05
## 4981     3 48044 6.244276e-05
## 4982     3 48044 6.244276e-05
## 4983     3 48044 6.244276e-05
## 4984     3 48044 6.244276e-05
## 4985     3 48044 6.244276e-05
## 4986     3 48044 6.244276e-05
## 4987     3 48044 6.244276e-05
## 4988     3 48044 6.244276e-05
## 4989     3 48044 6.244276e-05
## 4990     3 48044 6.244276e-05
## 4991     3 48044 6.244276e-05
## 4992     3 48044 6.244276e-05
## 4993     3 48044 6.244276e-05
## 4994     3 48044 6.244276e-05
## 4995     3 48044 6.244276e-05
## 4996     3 48044 6.244276e-05
## 4997     3 48044 6.244276e-05
## 4998     3 48044 6.244276e-05
## 4999     3 48044 6.244276e-05
## 5000     3 48044 6.244276e-05
## 5001     3 48044 6.244276e-05
## 5002     3 48044 6.244276e-05
## 5003     3 48044 6.244276e-05
## 5004     3 48044 6.244276e-05
## 5005     3 48044 6.244276e-05
## 5006     3 48044 6.244276e-05
## 5007     3 48044 6.244276e-05
## 5008     3 48044 6.244276e-05
## 5009     3 48044 6.244276e-05
## 5010     3 48044 6.244276e-05
## 5011     3 48044 6.244276e-05
## 5012     3 48044 6.244276e-05
## 5013     3 48044 6.244276e-05
## 5014     3 48044 6.244276e-05
## 5015     3 48044 6.244276e-05
## 5016     3 48044 6.244276e-05
## 5017     3 48044 6.244276e-05
## 5018     3 48044 6.244276e-05
## 5019     3 48044 6.244276e-05
## 5020     3 48044 6.244276e-05
## 5021     3 48044 6.244276e-05
## 5022     3 48044 6.244276e-05
## 5023     3 48044 6.244276e-05
## 5024     3 48044 6.244276e-05
## 5025     3 48044 6.244276e-05
## 5026     3 48044 6.244276e-05
## 5027     3 48044 6.244276e-05
## 5028     3 48044 6.244276e-05
## 5029     3 48044 6.244276e-05
## 5030     3 48044 6.244276e-05
## 5031     3 48044 6.244276e-05
## 5032     3 48044 6.244276e-05
## 5033     3 48044 6.244276e-05
## 5034     3 31391 9.556879e-05
## 5035     3 31391 9.556879e-05
## 5036     3 31391 9.556879e-05
## 5037     3 31391 9.556879e-05
## 5038     3 31391 9.556879e-05
## 5039     3 31391 9.556879e-05
## 5040     3 31391 9.556879e-05
## 5041     3 31391 9.556879e-05
## 5042     3 31391 9.556879e-05
## 5043     3 31391 9.556879e-05
## 5044     3 31391 9.556879e-05
## 5045     3 31391 9.556879e-05
## 5046     3 31391 9.556879e-05
## 5047     3 31391 9.556879e-05
## 5048     3 31391 9.556879e-05
## 5049     3 31391 9.556879e-05
## 5050     3 31391 9.556879e-05
## 5051     3 31391 9.556879e-05
## 5052     3 31391 9.556879e-05
## 5053     3 31391 9.556879e-05
## 5054     3 31391 9.556879e-05
## 5055     3 31391 9.556879e-05
## 5056     3 31391 9.556879e-05
## 5057     3 31391 9.556879e-05
## 5058     3 31391 9.556879e-05
## 5059     3 31391 9.556879e-05
## 5060     3 31391 9.556879e-05
## 5061     3 31391 9.556879e-05
## 5062     3 31391 9.556879e-05
## 5063     3 31391 9.556879e-05
## 5064     3 31391 9.556879e-05
## 5065     3 31391 9.556879e-05
## 5066     3 31391 9.556879e-05
## 5067     3 31391 9.556879e-05
## 5068     3 31391 9.556879e-05
## 5069     3 31391 9.556879e-05
## 5070     3 31391 9.556879e-05
## 5071     3 31391 9.556879e-05
## 5072     3 31391 9.556879e-05
## 5073     3 31391 9.556879e-05
## 5074     3 31391 9.556879e-05
## 5075     3 31391 9.556879e-05
## 5076     3 31391 9.556879e-05
## 5077     3 31391 9.556879e-05
## 5078     3 31391 9.556879e-05
## 5079     3 31391 9.556879e-05
## 5080     3 31391 9.556879e-05
## 5081     3 31391 9.556879e-05
## 5082     3 31391 9.556879e-05
## 5083     3 31391 9.556879e-05
## 5084     3 31391 9.556879e-05
## 5085     3 31391 9.556879e-05
## 5086     3 31391 9.556879e-05
## 5087     3 31391 9.556879e-05
## 5088     3 31391 9.556879e-05
## 5089     3 31391 9.556879e-05
## 5090     3 31391 9.556879e-05
## 5091     3 31391 9.556879e-05
## 5092     3 31391 9.556879e-05
## 5093     3 31391 9.556879e-05
## 5094     3 31391 9.556879e-05
## 5095     3 31391 9.556879e-05
## 5096     3 31391 9.556879e-05
## 5097     3 31391 9.556879e-05
## 5098     3 31391 9.556879e-05
## 5099     3 31391 9.556879e-05
## 5100     3 31391 9.556879e-05
## 5101     3 31391 9.556879e-05
## 5102     3 31391 9.556879e-05
## 5103     3 31391 9.556879e-05
## 5104     3 31391 9.556879e-05
## 5105     3 31391 9.556879e-05
## 5106     3 31391 9.556879e-05
## 5107     3 31391 9.556879e-05
## 5108     3 31391 9.556879e-05
## 5109     3 31391 9.556879e-05
## 5110     3 31391 9.556879e-05
## 5111     3 31391 9.556879e-05
## 5112     3 31391 9.556879e-05
## 5113     3 31391 9.556879e-05
## 5114     3 31391 9.556879e-05
## 5115     3 31391 9.556879e-05
## 5116     3 31391 9.556879e-05
## 5117     3 31391 9.556879e-05
## 5118     3 31391 9.556879e-05
## 5119     3 31391 9.556879e-05
## 5120     3 31391 9.556879e-05
## 5121     3 31391 9.556879e-05
## 5122     3 31391 9.556879e-05
## 5123     3 31391 9.556879e-05
## 5124     3 31391 9.556879e-05
## 5125     3 31391 9.556879e-05
## 5126     3 31391 9.556879e-05
## 5127     3 31391 9.556879e-05
## 5128     3 31391 9.556879e-05
## 5129     3 31391 9.556879e-05
## 5130     3 31391 9.556879e-05
## 5131     3 31391 9.556879e-05
## 5132     3 31391 9.556879e-05
## 5133     3 31391 9.556879e-05
## 5134     3 31391 9.556879e-05
## 5135     3 31391 9.556879e-05
## 5136     3 31391 9.556879e-05
## 5137     3 31391 9.556879e-05
## 5138     3 31391 9.556879e-05
## 5139     3 31391 9.556879e-05
## 5140     3 31391 9.556879e-05
## 5141     3 31391 9.556879e-05
## 5142     3 31391 9.556879e-05
## 5143     3 31391 9.556879e-05
## 5144     3 31391 9.556879e-05
## 5145     3 31391 9.556879e-05
## 5146     3 31391 9.556879e-05
## 5147     3 31391 9.556879e-05
## 5148     3 31391 9.556879e-05
## 5149     3 31391 9.556879e-05
## 5150     3 31391 9.556879e-05
## 5151     3 31391 9.556879e-05
## 5152     3 31391 9.556879e-05
## 5153     3 31391 9.556879e-05
## 5154     3 31391 9.556879e-05
## 5155     3 31391 9.556879e-05
## 5156     3 31391 9.556879e-05
## 5157     3 31391 9.556879e-05
## 5158     3 31391 9.556879e-05
## 5159     3 31391 9.556879e-05
## 5160     3 31391 9.556879e-05
## 5161     3 31391 9.556879e-05
## 5162     3 31391 9.556879e-05
## 5163     3 31391 9.556879e-05
## 5164     3 31391 9.556879e-05
## 5165     3 31391 9.556879e-05
## 5166     3 31391 9.556879e-05
## 5167     3 31391 9.556879e-05
## 5168     3 31391 9.556879e-05
## 5169     3 31391 9.556879e-05
## 5170     3 31391 9.556879e-05
## 5171     3 31391 9.556879e-05
## 5172     3 31391 9.556879e-05
## 5173     3 31391 9.556879e-05
## 5174     3 31391 9.556879e-05
## 5175     3 31391 9.556879e-05
## 5176     3 31391 9.556879e-05
## 5177     3 31391 9.556879e-05
## 5178     3 31391 9.556879e-05
## 5179     3 31391 9.556879e-05
## 5180     3 31391 9.556879e-05
## 5181     3 31391 9.556879e-05
## 5182     3 31391 9.556879e-05
## 5183     3 31391 9.556879e-05
## 5184     3 31391 9.556879e-05
## 5185     3 31391 9.556879e-05
## 5186     3 31391 9.556879e-05
## 5187     3 31391 9.556879e-05
## 5188     3 31391 9.556879e-05
## 5189     3 31391 9.556879e-05
## 5190     3 31391 9.556879e-05
## 5191     3 31391 9.556879e-05
## 5192     3 31391 9.556879e-05
## 5193     3 31391 9.556879e-05
## 5194     3 31391 9.556879e-05
## 5195     3 31391 9.556879e-05
## 5196     3 31391 9.556879e-05
## 5197     3 31391 9.556879e-05
## 5198     3 31391 9.556879e-05
## 5199     3 31391 9.556879e-05
## 5200     3 31391 9.556879e-05
## 5201     3 31391 9.556879e-05
## 5202     3 31391 9.556879e-05
## 5203     3 31391 9.556879e-05
## 5204     3 31391 9.556879e-05
## 5205     3 31391 9.556879e-05
## 5206     3 31391 9.556879e-05
## 5207     3 31391 9.556879e-05
## 5208     3 31391 9.556879e-05
## 5209     3 31391 9.556879e-05
## 5210     3 31391 9.556879e-05
## 5211     3 31391 9.556879e-05
## 5212     3 31391 9.556879e-05
## 5213     3 31391 9.556879e-05
## 5214     3 31391 9.556879e-05
## 5215     3 31391 9.556879e-05
## 5216     3 31391 9.556879e-05
## 5217     3 31391 9.556879e-05
## 5218     3 31391 9.556879e-05
## 5219     3 31391 9.556879e-05
## 5220     3 31391 9.556879e-05
## 5221     3 31391 9.556879e-05
## 5222     3 31391 9.556879e-05
## 5223     3 31391 9.556879e-05
## 5224     3 31391 9.556879e-05
## 5225     3 31391 9.556879e-05
## 5226     3 31391 9.556879e-05
## 5227     3 31391 9.556879e-05
## 5228     3 31391 9.556879e-05
## 5229     3 31391 9.556879e-05
## 5230     3 31391 9.556879e-05
## 5231     3 31391 9.556879e-05
## 5232     3 31391 9.556879e-05
## 5233     3 31391 9.556879e-05
## 5234     3 31391 9.556879e-05
## 5235     3 31391 9.556879e-05
## 5236     3 31391 9.556879e-05
## 5237     3 31391 9.556879e-05
## 5238     3 31391 9.556879e-05
## 5239     3 31391 9.556879e-05
## 5240     3 31391 9.556879e-05
## 5241     3 31391 9.556879e-05
## 5242     3 31391 9.556879e-05
## 5243     3 31391 9.556879e-05
## 5244     3 31391 9.556879e-05
## 5245     3 31391 9.556879e-05
## 5246     3 31391 9.556879e-05
## 5247     3 31391 9.556879e-05
## 5248     3 31391 9.556879e-05
## 5249     3 31391 9.556879e-05
## 5250     3 31391 9.556879e-05
## 5251     3 31391 9.556879e-05
## 5252     3 31391 9.556879e-05
## 5253     3 31391 9.556879e-05
## 5254     3 31391 9.556879e-05
## 5255     3 31391 9.556879e-05
## 5256     3 31391 9.556879e-05
## 5257     3 31391 9.556879e-05
## 5258     3 31391 9.556879e-05
## 5259     3 31391 9.556879e-05
## 5260     3 31391 9.556879e-05
## 5261     3 31391 9.556879e-05
## 5262     3 31391 9.556879e-05
## 5263     3 31391 9.556879e-05
## 5264     3 31391 9.556879e-05
## 5265     3 31391 9.556879e-05
## 5266     3 31391 9.556879e-05
## 5267     3 31391 9.556879e-05
## 5268     3 31391 9.556879e-05
## 5269     3 31391 9.556879e-05
## 5270     3 31391 9.556879e-05
## 5271     3 31391 9.556879e-05
## 5272     3 31391 9.556879e-05
## 5273     3 31391 9.556879e-05
## 5274     3 31391 9.556879e-05
## 5275     3 31391 9.556879e-05
## 5276     3 31391 9.556879e-05
## 5277     3 31391 9.556879e-05
## 5278     3 31391 9.556879e-05
## 5279     3 31391 9.556879e-05
## 5280     3 31391 9.556879e-05
## 5281     3 31391 9.556879e-05
## 5282     3 31391 9.556879e-05
## 5283     3 31391 9.556879e-05
## 5284     3 31391 9.556879e-05
## 5285     3 31391 9.556879e-05
## 5286     3 31391 9.556879e-05
## 5287     3 31391 9.556879e-05
## 5288     3 31391 9.556879e-05
## 5289     3 31391 9.556879e-05
## 5290     3 31391 9.556879e-05
## 5291     3 31391 9.556879e-05
## 5292     3 31391 9.556879e-05
## 5293     3 31391 9.556879e-05
## 5294     3 31391 9.556879e-05
## 5295     3 31391 9.556879e-05
## 5296     3 31391 9.556879e-05
## 5297     3 31391 9.556879e-05
## 5298     3 31391 9.556879e-05
## 5299     3 31391 9.556879e-05
## 5300     3 31391 9.556879e-05
## 5301     3 31391 9.556879e-05
## 5302     3 31391 9.556879e-05
## 5303     3 31391 9.556879e-05
## 5304     3 31391 9.556879e-05
## 5305     3 31391 9.556879e-05
## 5306     3 31391 9.556879e-05
## 5307     3 31391 9.556879e-05
## 5308     3 31391 9.556879e-05
## 5309     3 31391 9.556879e-05
## 5310     3 31391 9.556879e-05
## 5311     3 31391 9.556879e-05
## 5312     3 31391 9.556879e-05
## 5313     3 31391 9.556879e-05
## 5314     3 31391 9.556879e-05
## 5315     3 31391 9.556879e-05
## 5316     3 31391 9.556879e-05
## 5317     3 31391 9.556879e-05
## 5318     3 31391 9.556879e-05
## 5319     3 31391 9.556879e-05
## 5320     3 31391 9.556879e-05
## 5321     3 31391 9.556879e-05
## 5322     3 31391 9.556879e-05
## 5323     3 31391 9.556879e-05
## 5324     3 31391 9.556879e-05
## 5325     3 31391 9.556879e-05
## 5326     3 31391 9.556879e-05
## 5327     3 31391 9.556879e-05
## 5328     3 31391 9.556879e-05
## 5329     3 31391 9.556879e-05
## 5330     3 31391 9.556879e-05
## 5331     3 31391 9.556879e-05
## 5332     3 31391 9.556879e-05
## 5333     3 31391 9.556879e-05
## 5334     3 31391 9.556879e-05
## 5335     3 31391 9.556879e-05
## 5336     3 31391 9.556879e-05
## 5337     3 31391 9.556879e-05
## 5338     3 31391 9.556879e-05
## 5339     3 31391 9.556879e-05
## 5340     3 31391 9.556879e-05
## 5341     3 31391 9.556879e-05
## 5342     3 31391 9.556879e-05
## 5343     3 31391 9.556879e-05
## 5344     3 31391 9.556879e-05
## 5345     3 31391 9.556879e-05
## 5346     3 31391 9.556879e-05
## 5347     3 31391 9.556879e-05
## 5348     3 31391 9.556879e-05
## 5349     3 31391 9.556879e-05
## 5350     3 31391 9.556879e-05
## 5351     3 31391 9.556879e-05
## 5352     3 31391 9.556879e-05
## 5353     3 31391 9.556879e-05
## 5354     3 31391 9.556879e-05
## 5355     3 31391 9.556879e-05
## 5356     3 31391 9.556879e-05
## 5357     3 31391 9.556879e-05
## 5358     3 31391 9.556879e-05
## 5359     3 31391 9.556879e-05
## 5360     3 31391 9.556879e-05
## 5361     3 31391 9.556879e-05
## 5362     3 31391 9.556879e-05
## 5363     3 31391 9.556879e-05
## 5364     3 31391 9.556879e-05
## 5365     3 31391 9.556879e-05
## 5366     3 31391 9.556879e-05
## 5367     3 31391 9.556879e-05
## 5368     3 31391 9.556879e-05
## 5369     3 31391 9.556879e-05
## 5370     3 31391 9.556879e-05
## 5371     3 31391 9.556879e-05
## 5372     3 31391 9.556879e-05
## 5373     3 31391 9.556879e-05
## 5374     3 31391 9.556879e-05
## 5375     3 31391 9.556879e-05
## 5376     3 31391 9.556879e-05
## 5377     3 31391 9.556879e-05
## 5378     3 31391 9.556879e-05
## 5379     3 31391 9.556879e-05
## 5380     3 31391 9.556879e-05
## 5381     3 31391 9.556879e-05
## 5382     3 31391 9.556879e-05
## 5383     3 31391 9.556879e-05
## 5384     3 31391 9.556879e-05
## 5385     3 31391 9.556879e-05
## 5386     3 31391 9.556879e-05
## 5387     3 31391 9.556879e-05
## 5388     3 31391 9.556879e-05
## 5389     3 31391 9.556879e-05
## 5390     3 31391 9.556879e-05
## 5391     3 31391 9.556879e-05
## 5392     3 31391 9.556879e-05
## 5393     3 31391 9.556879e-05
## 5394     3 31391 9.556879e-05
## 5395     3 31391 9.556879e-05
## 5396     3 31391 9.556879e-05
## 5397     3 31391 9.556879e-05
## 5398     3 31391 9.556879e-05
## 5399     3 31391 9.556879e-05
## 5400     3 31391 9.556879e-05
## 5401     3 31391 9.556879e-05
## 5402     3 31391 9.556879e-05
## 5403     3 31391 9.556879e-05
## 5404     3 31391 9.556879e-05
## 5405     3 31391 9.556879e-05
## 5406     3 31391 9.556879e-05
## 5407     3 31391 9.556879e-05
## 5408     3 31391 9.556879e-05
## 5409     3 31391 9.556879e-05
## 5410     3 31391 9.556879e-05
## 5411     3 31391 9.556879e-05
## 5412     3 31391 9.556879e-05
## 5413     3 31391 9.556879e-05
## 5414     3 31391 9.556879e-05
## 5415     3 31391 9.556879e-05
## 5416     3 31391 9.556879e-05
## 5417     3 31391 9.556879e-05
## 5418     3 31391 9.556879e-05
## 5419     3 31391 9.556879e-05
## 5420     3 31391 9.556879e-05
## 5421     3 31391 9.556879e-05
## 5422     3 31391 9.556879e-05
## 5423     3 31391 9.556879e-05
## 5424     3 31391 9.556879e-05
## 5425     3 31391 9.556879e-05
## 5426     3 31391 9.556879e-05
## 5427     3 31391 9.556879e-05
## 5428     3 31391 9.556879e-05
## 5429     3 31391 9.556879e-05
## 5430     3 31391 9.556879e-05
## 5431     3 31391 9.556879e-05
## 5432     3 31391 9.556879e-05
## 5433     3 31391 9.556879e-05
## 5434     3 31391 9.556879e-05
## 5435     3 31391 9.556879e-05
## 5436     3 31391 9.556879e-05
## 5437     3 31391 9.556879e-05
## 5438     3 31391 9.556879e-05
## 5439     3 31391 9.556879e-05
## 5440     3 31391 9.556879e-05
## 5441     3 31391 9.556879e-05
## 5442     3 31391 9.556879e-05
## 5443     3 31391 9.556879e-05
## 5444     3 31391 9.556879e-05
## 5445     3 31391 9.556879e-05
## 5446     3 31391 9.556879e-05
## 5447     3 31391 9.556879e-05
## 5448     3 31391 9.556879e-05
## 5449     3 31391 9.556879e-05
## 5450     3 31391 9.556879e-05
## 5451     3 31391 9.556879e-05
## 5452     3 31391 9.556879e-05
## 5453     3 31391 9.556879e-05
## 5454     3 31391 9.556879e-05
## 5455     3 31391 9.556879e-05
## 5456     3 31391 9.556879e-05
## 5457     3 31391 9.556879e-05
## 5458     3 31391 9.556879e-05
## 5459     3 31391 9.556879e-05
## 5460     3 31391 9.556879e-05
## 5461     3 31391 9.556879e-05
## 5462     3 31391 9.556879e-05
## 5463     3 31391 9.556879e-05
## 5464     3 31391 9.556879e-05
## 5465     3 31391 9.556879e-05
## 5466     3 31391 9.556879e-05
## 5467     3 31391 9.556879e-05
## 5468     3 31391 9.556879e-05
## 5469     3 31391 9.556879e-05
## 5470     3 31391 9.556879e-05
## 5471     3 31391 9.556879e-05
## 5472     3 31391 9.556879e-05
## 5473     3 31391 9.556879e-05
## 5474     3 31391 9.556879e-05
## 5475     3 31391 9.556879e-05
## 5476     3 31391 9.556879e-05
## 5477     3 31391 9.556879e-05
## 5478     3 31391 9.556879e-05
## 5479     3 31391 9.556879e-05
## 5480     3 31391 9.556879e-05
## 5481     3 31391 9.556879e-05
## 5482     3 31391 9.556879e-05
## 5483     3 31391 9.556879e-05
## 5484     3 31391 9.556879e-05
## 5485     3 31391 9.556879e-05
## 5486     3 31391 9.556879e-05
## 5487     3 31391 9.556879e-05
## 5488     3 31391 9.556879e-05
## 5489     3 31391 9.556879e-05
## 5490     3 31391 9.556879e-05
## 5491     3 31391 9.556879e-05
## 5492     3 31391 9.556879e-05
## 5493     3 31391 9.556879e-05
## 5494     3 31391 9.556879e-05
## 5495     3 31391 9.556879e-05
## 5496     3 31391 9.556879e-05
## 5497     3 31391 9.556879e-05
## 5498     3 31391 9.556879e-05
## 5499     3 31391 9.556879e-05
## 5500     3 31391 9.556879e-05
## 5501     3 31391 9.556879e-05
## 5502     3 31391 9.556879e-05
## 5503     3 31391 9.556879e-05
## 5504     3 31391 9.556879e-05
## 5505     3 31391 9.556879e-05
## 5506     3 31391 9.556879e-05
## 5507     3 31391 9.556879e-05
## 5508     3 31391 9.556879e-05
## 5509     3 31391 9.556879e-05
## 5510     3 31391 9.556879e-05
## 5511     3 31391 9.556879e-05
## 5512     3 31391 9.556879e-05
## 5513     3 31391 9.556879e-05
## 5514     3 31391 9.556879e-05
## 5515     3 31391 9.556879e-05
## 5516     3 31391 9.556879e-05
## 5517     3 31391 9.556879e-05
## 5518     3 31391 9.556879e-05
## 5519     3 31391 9.556879e-05
## 5520     3 31391 9.556879e-05
## 5521     3 31391 9.556879e-05
## 5522     3 31391 9.556879e-05
## 5523     3 31391 9.556879e-05
## 5524     3 31391 9.556879e-05
## 5525     3 31391 9.556879e-05
## 5526     3 31391 9.556879e-05
## 5527     3 31391 9.556879e-05
## 5528     3 31391 9.556879e-05
## 5529     3 31391 9.556879e-05
## 5530     3 31391 9.556879e-05
## 5531     3 31391 9.556879e-05
## 5532     3 31391 9.556879e-05
## 5533     3 31391 9.556879e-05
## 5534     3 31391 9.556879e-05
## 5535     3 31391 9.556879e-05
## 5536     3 31391 9.556879e-05
## 5537     3 31391 9.556879e-05
## 5538     3 31391 9.556879e-05
## 5539     3 31391 9.556879e-05
## 5540     3 31391 9.556879e-05
## 5541     3 31391 9.556879e-05
## 5542     3 31391 9.556879e-05
## 5543     3 31391 9.556879e-05
## 5544     3 31391 9.556879e-05
## 5545     3 31391 9.556879e-05
## 5546     3 31391 9.556879e-05
## 5547     3 31391 9.556879e-05
## 5548     3 31391 9.556879e-05
## 5549     3 31391 9.556879e-05
## 5550     3 31391 9.556879e-05
## 5551     3 31391 9.556879e-05
## 5552     3 31391 9.556879e-05
## 5553     3 31391 9.556879e-05
## 5554     3 31391 9.556879e-05
## 5555     3 31391 9.556879e-05
## 5556     3 31391 9.556879e-05
## 5557     3 31391 9.556879e-05
## 5558     3 31391 9.556879e-05
## 5559     3 31391 9.556879e-05
## 5560     3 31391 9.556879e-05
## 5561     3 31391 9.556879e-05
## 5562     3 31391 9.556879e-05
## 5563     3 31391 9.556879e-05
## 5564     3 31391 9.556879e-05
## 5565     3 31391 9.556879e-05
## 5566     3 31391 9.556879e-05
## 5567     3 31391 9.556879e-05
## 5568     3 31391 9.556879e-05
## 5569     3 31391 9.556879e-05
## 5570     3 31391 9.556879e-05
## 5571     3 31391 9.556879e-05
## 5572     3 31391 9.556879e-05
## 5573     3 31391 9.556879e-05
## 5574     3 31391 9.556879e-05
## 5575     3 31391 9.556879e-05
## 5576     3 31391 9.556879e-05
## 5577     3 31391 9.556879e-05
## 5578     3 31391 9.556879e-05
## 5579     3 31391 9.556879e-05
## 5580     3 31391 9.556879e-05
## 5581     3 31391 9.556879e-05
## 5582     3 31391 9.556879e-05
## 5583     3 31391 9.556879e-05
## 5584     3 31391 9.556879e-05
## 5585     3 31391 9.556879e-05
## 5586     3 31391 9.556879e-05
## 5587     3 31391 9.556879e-05
## 5588     3 31391 9.556879e-05
## 5589     3 31391 9.556879e-05
## 5590     3 31391 9.556879e-05
## 5591     3 31391 9.556879e-05
## 5592     3 31391 9.556879e-05
## 5593     3 31391 9.556879e-05
## 5594     3 31391 9.556879e-05
## 5595     3 31391 9.556879e-05
## 5596     3 31391 9.556879e-05
## 5597     3 31391 9.556879e-05
## 5598     3 31391 9.556879e-05
## 5599     3 31391 9.556879e-05
## 5600     3 31391 9.556879e-05
## 5601     3 31391 9.556879e-05
## 5602     3 31391 9.556879e-05
## 5603     3 31391 9.556879e-05
## 5604     3 31391 9.556879e-05
## 5605     3 31391 9.556879e-05
## 5606     3 31391 9.556879e-05
## 5607     3 31391 9.556879e-05
## 5608     3 31391 9.556879e-05
## 5609     3 31391 9.556879e-05
## 5610     3 31391 9.556879e-05
## 5611     3 31391 9.556879e-05
## 5612     3 31391 9.556879e-05
## 5613     3 31391 9.556879e-05
## 5614     3 31391 9.556879e-05
## 5615     3 31391 9.556879e-05
## 5616     3 31391 9.556879e-05
## 5617     3 31391 9.556879e-05
## 5618     3 31391 9.556879e-05
## 5619     3 31391 9.556879e-05
## 5620     3 31391 9.556879e-05
## 5621     3 31391 9.556879e-05
## 5622     3 31391 9.556879e-05
## 5623     3 31391 9.556879e-05
## 5624     3 31391 9.556879e-05
## 5625     3 31391 9.556879e-05
## 5626     3 16761 1.789869e-04
## 5627     3 16761 1.789869e-04
## 5628     3 16761 1.789869e-04
## 5629     3 16761 1.789869e-04
## 5630     3 16761 1.789869e-04
## 5631     3 16761 1.789869e-04
## 5632     3 16761 1.789869e-04
## 5633     3 16761 1.789869e-04
## 5634     3 16761 1.789869e-04
## 5635     3 16761 1.789869e-04
## 5636     3 16761 1.789869e-04
## 5637     3 16761 1.789869e-04
## 5638     3 16761 1.789869e-04
## 5639     3 16761 1.789869e-04
## 5640     3 16761 1.789869e-04
## 5641     3 16761 1.789869e-04
## 5642     3 16761 1.789869e-04
## 5643     3 16761 1.789869e-04
## 5644     3 16761 1.789869e-04
## 5645     3 16761 1.789869e-04
## 5646     3 16761 1.789869e-04
## 5647     3 16761 1.789869e-04
## 5648     3 16761 1.789869e-04
## 5649     3 16761 1.789869e-04
## 5650     3 16761 1.789869e-04
## 5651     3 16761 1.789869e-04
## 5652     3 16761 1.789869e-04
## 5653     3 16761 1.789869e-04
## 5654     3 16761 1.789869e-04
## 5655     3 16761 1.789869e-04
## 5656     3 16761 1.789869e-04
## 5657     3 16761 1.789869e-04
## 5658     3 16761 1.789869e-04
## 5659     3 16761 1.789869e-04
## 5660     3 16761 1.789869e-04
## 5661     3 16761 1.789869e-04
## 5662     3 16761 1.789869e-04
## 5663     3 16761 1.789869e-04
## 5664     3 16761 1.789869e-04
## 5665     3 16761 1.789869e-04
## 5666     3 16761 1.789869e-04
## 5667     3 16761 1.789869e-04
## 5668     3 16761 1.789869e-04
## 5669     3 16761 1.789869e-04
## 5670     3 16761 1.789869e-04
## 5671     3 16761 1.789869e-04
## 5672     3 16761 1.789869e-04
## 5673     3 16761 1.789869e-04
## 5674     3 16761 1.789869e-04
## 5675     3 16761 1.789869e-04
## 5676     3 16761 1.789869e-04
## 5677     3 16761 1.789869e-04
## 5678     3 16761 1.789869e-04
## 5679     3 16761 1.789869e-04
## 5680     3 16761 1.789869e-04
## 5681     3 16761 1.789869e-04
## 5682     3 16761 1.789869e-04
## 5683     3 16761 1.789869e-04
## 5684     3 16761 1.789869e-04
## 5685     3 16761 1.789869e-04
## 5686     3 16761 1.789869e-04
## 5687     3 16761 1.789869e-04
## 5688     3 16761 1.789869e-04
## 5689     3 16761 1.789869e-04
## 5690     3 16761 1.789869e-04
## 5691     3 16761 1.789869e-04
## 5692     3 16761 1.789869e-04
## 5693     3 16761 1.789869e-04
## 5694     3 16761 1.789869e-04
## 5695     3 16761 1.789869e-04
## 5696     3 16761 1.789869e-04
## 5697     3 16761 1.789869e-04
## 5698     3 16761 1.789869e-04
## 5699     3 16761 1.789869e-04
## 5700     3 16761 1.789869e-04
## 5701     3 16761 1.789869e-04
## 5702     3 16761 1.789869e-04
## 5703     3 16761 1.789869e-04
## 5704     3 16761 1.789869e-04
## 5705     3 16761 1.789869e-04
## 5706     3 16761 1.789869e-04
## 5707     3 16761 1.789869e-04
## 5708     3 16761 1.789869e-04
## 5709     3 16761 1.789869e-04
## 5710     3 16761 1.789869e-04
## 5711     3 16761 1.789869e-04
## 5712     3 16761 1.789869e-04
## 5713     3 16761 1.789869e-04
## 5714     3 16761 1.789869e-04
## 5715     3 16761 1.789869e-04
## 5716     3 16761 1.789869e-04
## 5717     3 16761 1.789869e-04
## 5718     3 16761 1.789869e-04
## 5719     3 16761 1.789869e-04
## 5720     3 16761 1.789869e-04
## 5721     3 16761 1.789869e-04
## 5722     3 16761 1.789869e-04
## 5723     3 16761 1.789869e-04
## 5724     3 16761 1.789869e-04
## 5725     3 16761 1.789869e-04
## 5726     3 16761 1.789869e-04
## 5727     3 16761 1.789869e-04
## 5728     3 16761 1.789869e-04
## 5729     3 16761 1.789869e-04
## 5730     3 16761 1.789869e-04
## 5731     3 16761 1.789869e-04
## 5732     3 16761 1.789869e-04
## 5733     3 16761 1.789869e-04
## 5734     3 16761 1.789869e-04
## 5735     3 16761 1.789869e-04
## 5736     3 16761 1.789869e-04
## 5737     3 16761 1.789869e-04
## 5738     3 16761 1.789869e-04
## 5739     3 16761 1.789869e-04
## 5740     3 16761 1.789869e-04
## 5741     3 16761 1.789869e-04
## 5742     3 16761 1.789869e-04
## 5743     3 16761 1.789869e-04
## 5744     3 16761 1.789869e-04
## 5745     3 16761 1.789869e-04
## 5746     3 16761 1.789869e-04
## 5747     3 16761 1.789869e-04
## 5748     3 16761 1.789869e-04
## 5749     3 16761 1.789869e-04
## 5750     3 16761 1.789869e-04
## 5751     3 16761 1.789869e-04
## 5752     3 16761 1.789869e-04
## 5753     3 16761 1.789869e-04
## 5754     3 16761 1.789869e-04
## 5755     3 16761 1.789869e-04
## 5756     3 16761 1.789869e-04
## 5757     3 16761 1.789869e-04
## 5758     3 16761 1.789869e-04
## 5759     3 16761 1.789869e-04
## 5760     3 16761 1.789869e-04
## 5761     3 16761 1.789869e-04
## 5762     3 16761 1.789869e-04
## 5763     3 16761 1.789869e-04
## 5764     3 16761 1.789869e-04
## 5765     3 16761 1.789869e-04
## 5766     3 16761 1.789869e-04
## 5767     3 16761 1.789869e-04
## 5768     3 16761 1.789869e-04
## 5769     3 16761 1.789869e-04
## 5770     3 16761 1.789869e-04
## 5771     3 16761 1.789869e-04
## 5772     3 16761 1.789869e-04
## 5773     3 16761 1.789869e-04
## 5774     3 16761 1.789869e-04
## 5775     3 16761 1.789869e-04
## 5776     3 16761 1.789869e-04
## 5777     3 16761 1.789869e-04
## 5778     3 16761 1.789869e-04
## 5779     3 16761 1.789869e-04
## 5780     3 16761 1.789869e-04
## 5781     3 16761 1.789869e-04
## 5782     3 16761 1.789869e-04
## 5783     3 16761 1.789869e-04
## 5784     3 16761 1.789869e-04
## 5785     3 16761 1.789869e-04
## 5786     3 16761 1.789869e-04
## 5787     3 16761 1.789869e-04
## 5788     3 16761 1.789869e-04
## 5789     3 16761 1.789869e-04
## 5790     3 16761 1.789869e-04
## 5791     3 16761 1.789869e-04
## 5792     3 16761 1.789869e-04
## 5793     3 16761 1.789869e-04
## 5794     3 16761 1.789869e-04
## 5795     3 16761 1.789869e-04
## 5796     3 16761 1.789869e-04
## 5797     3 16761 1.789869e-04
## 5798     3 16761 1.789869e-04
## 5799     3 16761 1.789869e-04
## 5800     3 16761 1.789869e-04
## 5801     3 16761 1.789869e-04
## 5802     3 16761 1.789869e-04
## 5803     3 16761 1.789869e-04
## 5804     3 16761 1.789869e-04
## 5805     3 16761 1.789869e-04
## 5806     3 16761 1.789869e-04
## 5807     3 16761 1.789869e-04
## 5808     3 16761 1.789869e-04
## 5809     3 16761 1.789869e-04
## 5810     3 16761 1.789869e-04
## 5811     3 16761 1.789869e-04
## 5812     3 16761 1.789869e-04
## 5813     3 16761 1.789869e-04
## 5814     3 16761 1.789869e-04
## 5815     3 16761 1.789869e-04
## 5816     3 16761 1.789869e-04
## 5817     3 16761 1.789869e-04
## 5818     3 16761 1.789869e-04
## 5819     3 16761 1.789869e-04
## 5820     3 16761 1.789869e-04
## 5821     3 16761 1.789869e-04
## 5822     3 16761 1.789869e-04
## 5823     3 16761 1.789869e-04
## 5824     3 16761 1.789869e-04
## 5825     3 16761 1.789869e-04
## 5826     3 16761 1.789869e-04
## 5827     3 16761 1.789869e-04
## 5828     3 16761 1.789869e-04
## 5829     3 16761 1.789869e-04
## 5830     3 16761 1.789869e-04
## 5831     3 16761 1.789869e-04
## 5832     3 16761 1.789869e-04
## 5833     3 16761 1.789869e-04
## 5834     3 16761 1.789869e-04
## 5835     3 16761 1.789869e-04
## 5836     3 16761 1.789869e-04
## 5837     3 16761 1.789869e-04
## 5838     3 16761 1.789869e-04
## 5839     3 16761 1.789869e-04
## 5840     3 16761 1.789869e-04
## 5841     3 16761 1.789869e-04
## 5842     3 16761 1.789869e-04
## 5843     3 16761 1.789869e-04
## 5844     3 16761 1.789869e-04
## 5845     3 16761 1.789869e-04
## 5846     3 16761 1.789869e-04
## 5847     3 16761 1.789869e-04
## 5848     3 16761 1.789869e-04
## 5849     3 16761 1.789869e-04
## 5850     3 16761 1.789869e-04
## 5851     3 16761 1.789869e-04
## 5852     3 16761 1.789869e-04
## 5853     3 16761 1.789869e-04
## 5854     3 16761 1.789869e-04
## 5855     3 16761 1.789869e-04
## 5856     3 16761 1.789869e-04
## 5857     3 16761 1.789869e-04
## 5858     3 16761 1.789869e-04
## 5859     3 16761 1.789869e-04
## 5860     3 16761 1.789869e-04
## 5861     3 16761 1.789869e-04
## 5862     3 16761 1.789869e-04
## 5863     3 16761 1.789869e-04
## 5864     3 16761 1.789869e-04
## 5865     3 16761 1.789869e-04
## 5866     3 16761 1.789869e-04
## 5867     3 16761 1.789869e-04
## 5868     3 16761 1.789869e-04
## 5869     3 16761 1.789869e-04
## 5870     3 16761 1.789869e-04
## 5871     3 16761 1.789869e-04
## 5872     3 16761 1.789869e-04
## 5873     3 16761 1.789869e-04
## 5874     3 16761 1.789869e-04
## 5875     3 16761 1.789869e-04
## 5876     3 16761 1.789869e-04
## 5877     3 16761 1.789869e-04
## 5878     3 16761 1.789869e-04
## 5879     3 16761 1.789869e-04
## 5880     3 16761 1.789869e-04
## 5881     3 16761 1.789869e-04
## 5882     3 16761 1.789869e-04
## 5883     3 16761 1.789869e-04
## 5884     3 16761 1.789869e-04
## 5885     3 16761 1.789869e-04
## 5886     3 16761 1.789869e-04
## 5887     3 16761 1.789869e-04
## 5888     3 16761 1.789869e-04
## 5889     3 16761 1.789869e-04
## 5890     3 16761 1.789869e-04
## 5891     3 16761 1.789869e-04
## 5892     3 16761 1.789869e-04
## 5893     3 16761 1.789869e-04
## 5894     3 16761 1.789869e-04
## 5895     3 16761 1.789869e-04
## 5896     3 16761 1.789869e-04
## 5897     3 16761 1.789869e-04
## 5898     3 16761 1.789869e-04
## 5899     3 16761 1.789869e-04
## 5900     3 16761 1.789869e-04
## 5901     3 16761 1.789869e-04
## 5902     3 16761 1.789869e-04
## 5903     3 16761 1.789869e-04
## 5904     3 16761 1.789869e-04
## 5905     3 16761 1.789869e-04
## 5906     3 16761 1.789869e-04
## 5907     3 16761 1.789869e-04
## 5908     3 16761 1.789869e-04
## 5909     3 16761 1.789869e-04
## 5910     3 16761 1.789869e-04
## 5911     3 16761 1.789869e-04
## 5912     3 16761 1.789869e-04
## 5913     3 16761 1.789869e-04
## 5914     3 16761 1.789869e-04
## 5915     3 16761 1.789869e-04
## 5916     3 16761 1.789869e-04
## 5917     3 16761 1.789869e-04
## 5918     3 16761 1.789869e-04
## 5919     3 16761 1.789869e-04
## 5920     3 16761 1.789869e-04
## 5921     3 16761 1.789869e-04
## 5922     3 16761 1.789869e-04
## 5923     3 16761 1.789869e-04
## 5924     3 16761 1.789869e-04
## 5925     3 16761 1.789869e-04
## 5926     3 16761 1.789869e-04
## 5927     3 16761 1.789869e-04
## 5928     3 16761 1.789869e-04
## 5929     3 16761 1.789869e-04
## 5930     3 16761 1.789869e-04
## 5931     3 16761 1.789869e-04
## 5932     3 16761 1.789869e-04
## 5933     3 16761 1.789869e-04
## 5934     3 16761 1.789869e-04
## 5935     3 16761 1.789869e-04
## 5936     3 16761 1.789869e-04
## 5937     3 16761 1.789869e-04
## 5938     3 16761 1.789869e-04
## 5939     3 16761 1.789869e-04
## 5940     3 16761 1.789869e-04
## 5941     3 16761 1.789869e-04
## 5942     3 16761 1.789869e-04
## 5943     3 16761 1.789869e-04
## 5944     3 16761 1.789869e-04
## 5945     3 16761 1.789869e-04
## 5946     3 16761 1.789869e-04
## 5947     3 16761 1.789869e-04
## 5948     3 16761 1.789869e-04
## 5949     3 16761 1.789869e-04
## 5950     3 16761 1.789869e-04
## 5951     3 16761 1.789869e-04
## 5952     3 16761 1.789869e-04
## 5953     3 16761 1.789869e-04
## 5954     3 16761 1.789869e-04
## 5955     3 16761 1.789869e-04
## 5956     3 16761 1.789869e-04
## 5957     3 16761 1.789869e-04
## 5958     3 16761 1.789869e-04
## 5959     3 16761 1.789869e-04
## 5960     3 16761 1.789869e-04
## 5961     3 16761 1.789869e-04
## 5962     3 16761 1.789869e-04
## 5963     3 16761 1.789869e-04
## 5964     3 16761 1.789869e-04
## 5965     3 16761 1.789869e-04
## 5966     3 16761 1.789869e-04
## 5967     3 16761 1.789869e-04
## 5968     2 48044 4.162851e-05
## 5969     2 48044 4.162851e-05
## 5970     2 48044 4.162851e-05
## 5971     2 48044 4.162851e-05
## 5972     2 48044 4.162851e-05
## 5973     2 48044 4.162851e-05
## 5974     2 48044 4.162851e-05
## 5975     2 48044 4.162851e-05
## 5976     2 48044 4.162851e-05
## 5977     2 48044 4.162851e-05
## 5978     2 48044 4.162851e-05
## 5979     2 48044 4.162851e-05
## 5980     2 48044 4.162851e-05
## 5981     2 48044 4.162851e-05
## 5982     2 48044 4.162851e-05
## 5983     2 48044 4.162851e-05
## 5984     2 48044 4.162851e-05
## 5985     2 48044 4.162851e-05
## 5986     2 48044 4.162851e-05
## 5987     2 48044 4.162851e-05
## 5988     2 48044 4.162851e-05
## 5989     2 48044 4.162851e-05
## 5990     2 48044 4.162851e-05
## 5991     2 48044 4.162851e-05
## 5992     2 48044 4.162851e-05
## 5993     2 48044 4.162851e-05
## 5994     2 48044 4.162851e-05
## 5995     2 48044 4.162851e-05
## 5996     2 48044 4.162851e-05
## 5997     2 48044 4.162851e-05
## 5998     2 48044 4.162851e-05
## 5999     2 48044 4.162851e-05
## 6000     2 48044 4.162851e-05
## 6001     2 48044 4.162851e-05
## 6002     2 48044 4.162851e-05
## 6003     2 48044 4.162851e-05
## 6004     2 48044 4.162851e-05
## 6005     2 48044 4.162851e-05
## 6006     2 48044 4.162851e-05
## 6007     2 48044 4.162851e-05
## 6008     2 48044 4.162851e-05
## 6009     2 48044 4.162851e-05
## 6010     2 48044 4.162851e-05
## 6011     2 48044 4.162851e-05
## 6012     2 48044 4.162851e-05
## 6013     2 48044 4.162851e-05
## 6014     2 48044 4.162851e-05
## 6015     2 48044 4.162851e-05
## 6016     2 48044 4.162851e-05
## 6017     2 48044 4.162851e-05
## 6018     2 48044 4.162851e-05
## 6019     2 48044 4.162851e-05
## 6020     2 48044 4.162851e-05
## 6021     2 48044 4.162851e-05
## 6022     2 48044 4.162851e-05
## 6023     2 48044 4.162851e-05
## 6024     2 48044 4.162851e-05
## 6025     2 48044 4.162851e-05
## 6026     2 48044 4.162851e-05
## 6027     2 48044 4.162851e-05
## 6028     2 48044 4.162851e-05
## 6029     2 48044 4.162851e-05
## 6030     2 48044 4.162851e-05
## 6031     2 48044 4.162851e-05
## 6032     2 48044 4.162851e-05
## 6033     2 48044 4.162851e-05
## 6034     2 48044 4.162851e-05
## 6035     2 48044 4.162851e-05
## 6036     2 48044 4.162851e-05
## 6037     2 48044 4.162851e-05
## 6038     2 48044 4.162851e-05
## 6039     2 48044 4.162851e-05
## 6040     2 48044 4.162851e-05
## 6041     2 48044 4.162851e-05
## 6042     2 48044 4.162851e-05
## 6043     2 48044 4.162851e-05
## 6044     2 48044 4.162851e-05
## 6045     2 48044 4.162851e-05
## 6046     2 48044 4.162851e-05
## 6047     2 48044 4.162851e-05
## 6048     2 48044 4.162851e-05
## 6049     2 48044 4.162851e-05
## 6050     2 48044 4.162851e-05
## 6051     2 48044 4.162851e-05
## 6052     2 48044 4.162851e-05
## 6053     2 48044 4.162851e-05
## 6054     2 48044 4.162851e-05
## 6055     2 48044 4.162851e-05
## 6056     2 48044 4.162851e-05
## 6057     2 48044 4.162851e-05
## 6058     2 48044 4.162851e-05
## 6059     2 48044 4.162851e-05
## 6060     2 48044 4.162851e-05
## 6061     2 48044 4.162851e-05
## 6062     2 48044 4.162851e-05
## 6063     2 48044 4.162851e-05
## 6064     2 48044 4.162851e-05
## 6065     2 48044 4.162851e-05
## 6066     2 48044 4.162851e-05
## 6067     2 48044 4.162851e-05
## 6068     2 48044 4.162851e-05
## 6069     2 48044 4.162851e-05
## 6070     2 48044 4.162851e-05
## 6071     2 48044 4.162851e-05
## 6072     2 48044 4.162851e-05
## 6073     2 48044 4.162851e-05
## 6074     2 48044 4.162851e-05
## 6075     2 48044 4.162851e-05
## 6076     2 48044 4.162851e-05
## 6077     2 48044 4.162851e-05
## 6078     2 48044 4.162851e-05
## 6079     2 48044 4.162851e-05
## 6080     2 48044 4.162851e-05
## 6081     2 48044 4.162851e-05
## 6082     2 48044 4.162851e-05
## 6083     2 48044 4.162851e-05
## 6084     2 48044 4.162851e-05
## 6085     2 48044 4.162851e-05
## 6086     2 48044 4.162851e-05
## 6087     2 48044 4.162851e-05
## 6088     2 48044 4.162851e-05
## 6089     2 48044 4.162851e-05
## 6090     2 48044 4.162851e-05
## 6091     2 48044 4.162851e-05
## 6092     2 48044 4.162851e-05
## 6093     2 48044 4.162851e-05
## 6094     2 48044 4.162851e-05
## 6095     2 48044 4.162851e-05
## 6096     2 48044 4.162851e-05
## 6097     2 48044 4.162851e-05
## 6098     2 48044 4.162851e-05
## 6099     2 48044 4.162851e-05
## 6100     2 48044 4.162851e-05
## 6101     2 48044 4.162851e-05
## 6102     2 48044 4.162851e-05
## 6103     2 48044 4.162851e-05
## 6104     2 48044 4.162851e-05
## 6105     2 48044 4.162851e-05
## 6106     2 48044 4.162851e-05
## 6107     2 48044 4.162851e-05
## 6108     2 48044 4.162851e-05
## 6109     2 48044 4.162851e-05
## 6110     2 48044 4.162851e-05
## 6111     2 48044 4.162851e-05
## 6112     2 48044 4.162851e-05
## 6113     2 48044 4.162851e-05
## 6114     2 48044 4.162851e-05
## 6115     2 48044 4.162851e-05
## 6116     2 48044 4.162851e-05
## 6117     2 48044 4.162851e-05
## 6118     2 48044 4.162851e-05
## 6119     2 48044 4.162851e-05
## 6120     2 48044 4.162851e-05
## 6121     2 48044 4.162851e-05
## 6122     2 48044 4.162851e-05
## 6123     2 48044 4.162851e-05
## 6124     2 48044 4.162851e-05
## 6125     2 48044 4.162851e-05
## 6126     2 48044 4.162851e-05
## 6127     2 48044 4.162851e-05
## 6128     2 48044 4.162851e-05
## 6129     2 48044 4.162851e-05
## 6130     2 48044 4.162851e-05
## 6131     2 48044 4.162851e-05
## 6132     2 48044 4.162851e-05
## 6133     2 48044 4.162851e-05
## 6134     2 48044 4.162851e-05
## 6135     2 48044 4.162851e-05
## 6136     2 48044 4.162851e-05
## 6137     2 48044 4.162851e-05
## 6138     2 48044 4.162851e-05
## 6139     2 48044 4.162851e-05
## 6140     2 48044 4.162851e-05
## 6141     2 48044 4.162851e-05
## 6142     2 48044 4.162851e-05
## 6143     2 48044 4.162851e-05
## 6144     2 48044 4.162851e-05
## 6145     2 48044 4.162851e-05
## 6146     2 48044 4.162851e-05
## 6147     2 48044 4.162851e-05
## 6148     2 48044 4.162851e-05
## 6149     2 48044 4.162851e-05
## 6150     2 48044 4.162851e-05
## 6151     2 48044 4.162851e-05
## 6152     2 48044 4.162851e-05
## 6153     2 48044 4.162851e-05
## 6154     2 48044 4.162851e-05
## 6155     2 48044 4.162851e-05
## 6156     2 48044 4.162851e-05
## 6157     2 48044 4.162851e-05
## 6158     2 48044 4.162851e-05
## 6159     2 48044 4.162851e-05
## 6160     2 48044 4.162851e-05
## 6161     2 48044 4.162851e-05
## 6162     2 48044 4.162851e-05
## 6163     2 48044 4.162851e-05
## 6164     2 48044 4.162851e-05
## 6165     2 48044 4.162851e-05
## 6166     2 48044 4.162851e-05
## 6167     2 48044 4.162851e-05
## 6168     2 48044 4.162851e-05
## 6169     2 48044 4.162851e-05
## 6170     2 48044 4.162851e-05
## 6171     2 48044 4.162851e-05
## 6172     2 48044 4.162851e-05
## 6173     2 48044 4.162851e-05
## 6174     2 48044 4.162851e-05
## 6175     2 48044 4.162851e-05
## 6176     2 48044 4.162851e-05
## 6177     2 48044 4.162851e-05
## 6178     2 48044 4.162851e-05
## 6179     2 48044 4.162851e-05
## 6180     2 48044 4.162851e-05
## 6181     2 48044 4.162851e-05
## 6182     2 48044 4.162851e-05
## 6183     2 48044 4.162851e-05
## 6184     2 48044 4.162851e-05
## 6185     2 48044 4.162851e-05
## 6186     2 48044 4.162851e-05
## 6187     2 48044 4.162851e-05
## 6188     2 48044 4.162851e-05
## 6189     2 48044 4.162851e-05
## 6190     2 48044 4.162851e-05
## 6191     2 48044 4.162851e-05
## 6192     2 48044 4.162851e-05
## 6193     2 48044 4.162851e-05
## 6194     2 48044 4.162851e-05
## 6195     2 48044 4.162851e-05
## 6196     2 48044 4.162851e-05
## 6197     2 48044 4.162851e-05
## 6198     2 48044 4.162851e-05
## 6199     2 48044 4.162851e-05
## 6200     2 48044 4.162851e-05
## 6201     2 48044 4.162851e-05
## 6202     2 48044 4.162851e-05
## 6203     2 48044 4.162851e-05
## 6204     2 48044 4.162851e-05
## 6205     2 48044 4.162851e-05
## 6206     2 48044 4.162851e-05
## 6207     2 48044 4.162851e-05
## 6208     2 48044 4.162851e-05
## 6209     2 48044 4.162851e-05
## 6210     2 48044 4.162851e-05
## 6211     2 48044 4.162851e-05
## 6212     2 48044 4.162851e-05
## 6213     2 48044 4.162851e-05
## 6214     2 48044 4.162851e-05
## 6215     2 48044 4.162851e-05
## 6216     2 48044 4.162851e-05
## 6217     2 48044 4.162851e-05
## 6218     2 48044 4.162851e-05
## 6219     2 48044 4.162851e-05
## 6220     2 48044 4.162851e-05
## 6221     2 48044 4.162851e-05
## 6222     2 48044 4.162851e-05
## 6223     2 48044 4.162851e-05
## 6224     2 48044 4.162851e-05
## 6225     2 48044 4.162851e-05
## 6226     2 48044 4.162851e-05
## 6227     2 48044 4.162851e-05
## 6228     2 48044 4.162851e-05
## 6229     2 48044 4.162851e-05
## 6230     2 48044 4.162851e-05
## 6231     2 48044 4.162851e-05
## 6232     2 48044 4.162851e-05
## 6233     2 48044 4.162851e-05
## 6234     2 48044 4.162851e-05
## 6235     2 48044 4.162851e-05
## 6236     2 48044 4.162851e-05
## 6237     2 48044 4.162851e-05
## 6238     2 48044 4.162851e-05
## 6239     2 48044 4.162851e-05
## 6240     2 48044 4.162851e-05
## 6241     2 48044 4.162851e-05
## 6242     2 48044 4.162851e-05
## 6243     2 48044 4.162851e-05
## 6244     2 48044 4.162851e-05
## 6245     2 48044 4.162851e-05
## 6246     2 48044 4.162851e-05
## 6247     2 48044 4.162851e-05
## 6248     2 48044 4.162851e-05
## 6249     2 48044 4.162851e-05
## 6250     2 48044 4.162851e-05
## 6251     2 48044 4.162851e-05
## 6252     2 48044 4.162851e-05
## 6253     2 48044 4.162851e-05
## 6254     2 48044 4.162851e-05
## 6255     2 48044 4.162851e-05
## 6256     2 48044 4.162851e-05
## 6257     2 48044 4.162851e-05
## 6258     2 48044 4.162851e-05
## 6259     2 48044 4.162851e-05
## 6260     2 48044 4.162851e-05
## 6261     2 48044 4.162851e-05
## 6262     2 48044 4.162851e-05
## 6263     2 48044 4.162851e-05
## 6264     2 48044 4.162851e-05
## 6265     2 48044 4.162851e-05
## 6266     2 48044 4.162851e-05
## 6267     2 48044 4.162851e-05
## 6268     2 48044 4.162851e-05
## 6269     2 48044 4.162851e-05
## 6270     2 48044 4.162851e-05
## 6271     2 48044 4.162851e-05
## 6272     2 48044 4.162851e-05
## 6273     2 48044 4.162851e-05
## 6274     2 48044 4.162851e-05
## 6275     2 48044 4.162851e-05
## 6276     2 48044 4.162851e-05
## 6277     2 48044 4.162851e-05
## 6278     2 48044 4.162851e-05
## 6279     2 48044 4.162851e-05
## 6280     2 48044 4.162851e-05
## 6281     2 48044 4.162851e-05
## 6282     2 48044 4.162851e-05
## 6283     2 48044 4.162851e-05
## 6284     2 48044 4.162851e-05
## 6285     2 48044 4.162851e-05
## 6286     2 48044 4.162851e-05
## 6287     2 48044 4.162851e-05
## 6288     2 48044 4.162851e-05
## 6289     2 48044 4.162851e-05
## 6290     2 48044 4.162851e-05
## 6291     2 48044 4.162851e-05
## 6292     2 48044 4.162851e-05
## 6293     2 48044 4.162851e-05
## 6294     2 48044 4.162851e-05
## 6295     2 48044 4.162851e-05
## 6296     2 48044 4.162851e-05
## 6297     2 48044 4.162851e-05
## 6298     2 48044 4.162851e-05
## 6299     2 48044 4.162851e-05
## 6300     2 48044 4.162851e-05
## 6301     2 48044 4.162851e-05
## 6302     2 48044 4.162851e-05
## 6303     2 48044 4.162851e-05
## 6304     2 48044 4.162851e-05
## 6305     2 48044 4.162851e-05
## 6306     2 48044 4.162851e-05
## 6307     2 48044 4.162851e-05
## 6308     2 48044 4.162851e-05
## 6309     2 48044 4.162851e-05
## 6310     2 48044 4.162851e-05
## 6311     2 48044 4.162851e-05
## 6312     2 48044 4.162851e-05
## 6313     2 48044 4.162851e-05
## 6314     2 48044 4.162851e-05
## 6315     2 48044 4.162851e-05
## 6316     2 48044 4.162851e-05
## 6317     2 48044 4.162851e-05
## 6318     2 48044 4.162851e-05
## 6319     2 48044 4.162851e-05
## 6320     2 48044 4.162851e-05
## 6321     2 48044 4.162851e-05
## 6322     2 48044 4.162851e-05
## 6323     2 48044 4.162851e-05
## 6324     2 48044 4.162851e-05
## 6325     2 48044 4.162851e-05
## 6326     2 48044 4.162851e-05
## 6327     2 48044 4.162851e-05
## 6328     2 48044 4.162851e-05
## 6329     2 48044 4.162851e-05
## 6330     2 48044 4.162851e-05
## 6331     2 48044 4.162851e-05
## 6332     2 48044 4.162851e-05
## 6333     2 48044 4.162851e-05
## 6334     2 48044 4.162851e-05
## 6335     2 48044 4.162851e-05
## 6336     2 48044 4.162851e-05
## 6337     2 48044 4.162851e-05
## 6338     2 48044 4.162851e-05
## 6339     2 48044 4.162851e-05
## 6340     2 48044 4.162851e-05
## 6341     2 48044 4.162851e-05
## 6342     2 48044 4.162851e-05
## 6343     2 48044 4.162851e-05
## 6344     2 48044 4.162851e-05
## 6345     2 48044 4.162851e-05
## 6346     2 48044 4.162851e-05
## 6347     2 48044 4.162851e-05
## 6348     2 48044 4.162851e-05
## 6349     2 48044 4.162851e-05
## 6350     2 48044 4.162851e-05
## 6351     2 48044 4.162851e-05
## 6352     2 48044 4.162851e-05
## 6353     2 48044 4.162851e-05
## 6354     2 48044 4.162851e-05
## 6355     2 48044 4.162851e-05
## 6356     2 48044 4.162851e-05
## 6357     2 48044 4.162851e-05
## 6358     2 48044 4.162851e-05
## 6359     2 48044 4.162851e-05
## 6360     2 48044 4.162851e-05
## 6361     2 48044 4.162851e-05
## 6362     2 48044 4.162851e-05
## 6363     2 48044 4.162851e-05
## 6364     2 48044 4.162851e-05
## 6365     2 48044 4.162851e-05
## 6366     2 48044 4.162851e-05
## 6367     2 48044 4.162851e-05
## 6368     2 48044 4.162851e-05
## 6369     2 48044 4.162851e-05
## 6370     2 48044 4.162851e-05
## 6371     2 48044 4.162851e-05
## 6372     2 48044 4.162851e-05
## 6373     2 48044 4.162851e-05
## 6374     2 48044 4.162851e-05
## 6375     2 48044 4.162851e-05
## 6376     2 48044 4.162851e-05
## 6377     2 48044 4.162851e-05
## 6378     2 48044 4.162851e-05
## 6379     2 48044 4.162851e-05
## 6380     2 48044 4.162851e-05
## 6381     2 48044 4.162851e-05
## 6382     2 48044 4.162851e-05
## 6383     2 48044 4.162851e-05
## 6384     2 48044 4.162851e-05
## 6385     2 48044 4.162851e-05
## 6386     2 48044 4.162851e-05
## 6387     2 48044 4.162851e-05
## 6388     2 48044 4.162851e-05
## 6389     2 48044 4.162851e-05
## 6390     2 48044 4.162851e-05
## 6391     2 48044 4.162851e-05
## 6392     2 48044 4.162851e-05
## 6393     2 48044 4.162851e-05
## 6394     2 48044 4.162851e-05
## 6395     2 48044 4.162851e-05
## 6396     2 48044 4.162851e-05
## 6397     2 48044 4.162851e-05
## 6398     2 48044 4.162851e-05
## 6399     2 48044 4.162851e-05
## 6400     2 48044 4.162851e-05
## 6401     2 48044 4.162851e-05
## 6402     2 48044 4.162851e-05
## 6403     2 48044 4.162851e-05
## 6404     2 48044 4.162851e-05
## 6405     2 48044 4.162851e-05
## 6406     2 48044 4.162851e-05
## 6407     2 48044 4.162851e-05
## 6408     2 48044 4.162851e-05
## 6409     2 48044 4.162851e-05
## 6410     2 48044 4.162851e-05
## 6411     2 48044 4.162851e-05
## 6412     2 48044 4.162851e-05
## 6413     2 48044 4.162851e-05
## 6414     2 48044 4.162851e-05
## 6415     2 48044 4.162851e-05
## 6416     2 48044 4.162851e-05
## 6417     2 48044 4.162851e-05
## 6418     2 48044 4.162851e-05
## 6419     2 48044 4.162851e-05
## 6420     2 48044 4.162851e-05
## 6421     2 48044 4.162851e-05
## 6422     2 48044 4.162851e-05
## 6423     2 48044 4.162851e-05
## 6424     2 48044 4.162851e-05
## 6425     2 48044 4.162851e-05
## 6426     2 48044 4.162851e-05
## 6427     2 48044 4.162851e-05
## 6428     2 48044 4.162851e-05
## 6429     2 48044 4.162851e-05
## 6430     2 48044 4.162851e-05
## 6431     2 48044 4.162851e-05
## 6432     2 48044 4.162851e-05
## 6433     2 48044 4.162851e-05
## 6434     2 48044 4.162851e-05
## 6435     2 48044 4.162851e-05
## 6436     2 48044 4.162851e-05
## 6437     2 48044 4.162851e-05
## 6438     2 48044 4.162851e-05
## 6439     2 48044 4.162851e-05
## 6440     2 48044 4.162851e-05
## 6441     2 48044 4.162851e-05
## 6442     2 48044 4.162851e-05
## 6443     2 48044 4.162851e-05
## 6444     2 48044 4.162851e-05
## 6445     2 48044 4.162851e-05
## 6446     2 48044 4.162851e-05
## 6447     2 48044 4.162851e-05
## 6448     2 48044 4.162851e-05
## 6449     2 48044 4.162851e-05
## 6450     2 48044 4.162851e-05
## 6451     2 48044 4.162851e-05
## 6452     2 48044 4.162851e-05
## 6453     2 48044 4.162851e-05
## 6454     2 48044 4.162851e-05
## 6455     2 48044 4.162851e-05
## 6456     2 48044 4.162851e-05
## 6457     2 48044 4.162851e-05
## 6458     2 48044 4.162851e-05
## 6459     2 48044 4.162851e-05
## 6460     2 48044 4.162851e-05
## 6461     2 48044 4.162851e-05
## 6462     2 48044 4.162851e-05
## 6463     2 48044 4.162851e-05
## 6464     2 48044 4.162851e-05
## 6465     2 48044 4.162851e-05
## 6466     2 48044 4.162851e-05
## 6467     2 48044 4.162851e-05
## 6468     2 48044 4.162851e-05
## 6469     2 48044 4.162851e-05
## 6470     2 48044 4.162851e-05
## 6471     2 48044 4.162851e-05
## 6472     2 48044 4.162851e-05
## 6473     2 48044 4.162851e-05
## 6474     2 48044 4.162851e-05
## 6475     2 48044 4.162851e-05
## 6476     2 48044 4.162851e-05
## 6477     2 48044 4.162851e-05
## 6478     2 48044 4.162851e-05
## 6479     2 48044 4.162851e-05
## 6480     2 48044 4.162851e-05
## 6481     2 48044 4.162851e-05
## 6482     2 48044 4.162851e-05
## 6483     2 48044 4.162851e-05
## 6484     2 48044 4.162851e-05
## 6485     2 48044 4.162851e-05
## 6486     2 48044 4.162851e-05
## 6487     2 48044 4.162851e-05
## 6488     2 48044 4.162851e-05
## 6489     2 48044 4.162851e-05
## 6490     2 48044 4.162851e-05
## 6491     2 48044 4.162851e-05
## 6492     2 48044 4.162851e-05
## 6493     2 48044 4.162851e-05
## 6494     2 48044 4.162851e-05
## 6495     2 48044 4.162851e-05
## 6496     2 48044 4.162851e-05
## 6497     2 48044 4.162851e-05
## 6498     2 48044 4.162851e-05
## 6499     2 48044 4.162851e-05
## 6500     2 48044 4.162851e-05
## 6501     2 48044 4.162851e-05
## 6502     2 48044 4.162851e-05
## 6503     2 48044 4.162851e-05
## 6504     2 48044 4.162851e-05
## 6505     2 48044 4.162851e-05
## 6506     2 48044 4.162851e-05
## 6507     2 48044 4.162851e-05
## 6508     2 48044 4.162851e-05
## 6509     2 48044 4.162851e-05
## 6510     2 48044 4.162851e-05
## 6511     2 48044 4.162851e-05
## 6512     2 48044 4.162851e-05
## 6513     2 48044 4.162851e-05
## 6514     2 48044 4.162851e-05
## 6515     2 48044 4.162851e-05
## 6516     2 48044 4.162851e-05
## 6517     2 48044 4.162851e-05
## 6518     2 48044 4.162851e-05
## 6519     2 48044 4.162851e-05
## 6520     2 48044 4.162851e-05
## 6521     2 48044 4.162851e-05
## 6522     2 48044 4.162851e-05
## 6523     2 48044 4.162851e-05
## 6524     2 48044 4.162851e-05
## 6525     2 48044 4.162851e-05
## 6526     2 48044 4.162851e-05
## 6527     2 48044 4.162851e-05
## 6528     2 48044 4.162851e-05
## 6529     2 48044 4.162851e-05
## 6530     2 48044 4.162851e-05
## 6531     2 48044 4.162851e-05
## 6532     2 48044 4.162851e-05
## 6533     2 48044 4.162851e-05
## 6534     2 48044 4.162851e-05
## 6535     2 48044 4.162851e-05
## 6536     2 48044 4.162851e-05
## 6537     2 48044 4.162851e-05
## 6538     2 48044 4.162851e-05
## 6539     2 48044 4.162851e-05
## 6540     2 48044 4.162851e-05
## 6541     2 48044 4.162851e-05
## 6542     2 48044 4.162851e-05
## 6543     2 48044 4.162851e-05
## 6544     2 48044 4.162851e-05
## 6545     2 48044 4.162851e-05
## 6546     2 48044 4.162851e-05
## 6547     2 48044 4.162851e-05
## 6548     2 48044 4.162851e-05
## 6549     2 48044 4.162851e-05
## 6550     2 48044 4.162851e-05
## 6551     2 48044 4.162851e-05
## 6552     2 48044 4.162851e-05
## 6553     2 48044 4.162851e-05
## 6554     2 48044 4.162851e-05
## 6555     2 48044 4.162851e-05
## 6556     2 48044 4.162851e-05
## 6557     2 48044 4.162851e-05
## 6558     2 48044 4.162851e-05
## 6559     2 48044 4.162851e-05
## 6560     2 48044 4.162851e-05
## 6561     2 48044 4.162851e-05
## 6562     2 48044 4.162851e-05
## 6563     2 48044 4.162851e-05
## 6564     2 48044 4.162851e-05
## 6565     2 48044 4.162851e-05
## 6566     2 48044 4.162851e-05
## 6567     2 48044 4.162851e-05
## 6568     2 48044 4.162851e-05
## 6569     2 48044 4.162851e-05
## 6570     2 48044 4.162851e-05
## 6571     2 48044 4.162851e-05
## 6572     2 48044 4.162851e-05
## 6573     2 48044 4.162851e-05
## 6574     2 48044 4.162851e-05
## 6575     2 48044 4.162851e-05
## 6576     2 48044 4.162851e-05
## 6577     2 48044 4.162851e-05
## 6578     2 48044 4.162851e-05
## 6579     2 48044 4.162851e-05
## 6580     2 48044 4.162851e-05
## 6581     2 48044 4.162851e-05
## 6582     2 48044 4.162851e-05
## 6583     2 48044 4.162851e-05
## 6584     2 48044 4.162851e-05
## 6585     2 48044 4.162851e-05
## 6586     2 48044 4.162851e-05
## 6587     2 48044 4.162851e-05
## 6588     2 48044 4.162851e-05
## 6589     2 48044 4.162851e-05
## 6590     2 48044 4.162851e-05
## 6591     2 48044 4.162851e-05
## 6592     2 48044 4.162851e-05
## 6593     2 48044 4.162851e-05
## 6594     2 48044 4.162851e-05
## 6595     2 48044 4.162851e-05
## 6596     2 48044 4.162851e-05
## 6597     2 48044 4.162851e-05
## 6598     2 48044 4.162851e-05
## 6599     2 48044 4.162851e-05
## 6600     2 48044 4.162851e-05
## 6601     2 48044 4.162851e-05
## 6602     2 48044 4.162851e-05
## 6603     2 48044 4.162851e-05
## 6604     2 48044 4.162851e-05
## 6605     2 48044 4.162851e-05
## 6606     2 48044 4.162851e-05
## 6607     2 48044 4.162851e-05
## 6608     2 48044 4.162851e-05
## 6609     2 48044 4.162851e-05
## 6610     2 48044 4.162851e-05
## 6611     2 48044 4.162851e-05
## 6612     2 48044 4.162851e-05
## 6613     2 48044 4.162851e-05
## 6614     2 48044 4.162851e-05
## 6615     2 48044 4.162851e-05
## 6616     2 48044 4.162851e-05
## 6617     2 48044 4.162851e-05
## 6618     2 48044 4.162851e-05
## 6619     2 48044 4.162851e-05
## 6620     2 48044 4.162851e-05
## 6621     2 48044 4.162851e-05
## 6622     2 48044 4.162851e-05
## 6623     2 48044 4.162851e-05
## 6624     2 48044 4.162851e-05
## 6625     2 48044 4.162851e-05
## 6626     2 48044 4.162851e-05
## 6627     2 48044 4.162851e-05
## 6628     2 48044 4.162851e-05
## 6629     2 48044 4.162851e-05
## 6630     2 48044 4.162851e-05
## 6631     2 48044 4.162851e-05
## 6632     2 48044 4.162851e-05
## 6633     2 48044 4.162851e-05
## 6634     2 48044 4.162851e-05
## 6635     2 48044 4.162851e-05
## 6636     2 48044 4.162851e-05
## 6637     2 48044 4.162851e-05
## 6638     2 48044 4.162851e-05
## 6639     2 48044 4.162851e-05
## 6640     2 48044 4.162851e-05
## 6641     2 48044 4.162851e-05
## 6642     2 48044 4.162851e-05
## 6643     2 48044 4.162851e-05
## 6644     2 48044 4.162851e-05
## 6645     2 48044 4.162851e-05
## 6646     2 48044 4.162851e-05
## 6647     2 48044 4.162851e-05
## 6648     2 48044 4.162851e-05
## 6649     2 48044 4.162851e-05
## 6650     2 48044 4.162851e-05
## 6651     2 48044 4.162851e-05
## 6652     2 48044 4.162851e-05
## 6653     2 48044 4.162851e-05
## 6654     2 48044 4.162851e-05
## 6655     2 48044 4.162851e-05
## 6656     2 48044 4.162851e-05
## 6657     2 48044 4.162851e-05
## 6658     2 48044 4.162851e-05
## 6659     2 48044 4.162851e-05
## 6660     2 48044 4.162851e-05
## 6661     2 48044 4.162851e-05
## 6662     2 48044 4.162851e-05
## 6663     2 48044 4.162851e-05
## 6664     2 48044 4.162851e-05
## 6665     2 48044 4.162851e-05
## 6666     2 48044 4.162851e-05
## 6667     2 48044 4.162851e-05
## 6668     2 48044 4.162851e-05
## 6669     2 48044 4.162851e-05
## 6670     2 48044 4.162851e-05
## 6671     2 48044 4.162851e-05
## 6672     2 48044 4.162851e-05
## 6673     2 48044 4.162851e-05
## 6674     2 48044 4.162851e-05
## 6675     2 48044 4.162851e-05
## 6676     2 48044 4.162851e-05
## 6677     2 48044 4.162851e-05
## 6678     2 48044 4.162851e-05
## 6679     2 48044 4.162851e-05
## 6680     2 48044 4.162851e-05
## 6681     2 48044 4.162851e-05
## 6682     2 48044 4.162851e-05
## 6683     2 48044 4.162851e-05
## 6684     2 48044 4.162851e-05
## 6685     2 48044 4.162851e-05
## 6686     2 48044 4.162851e-05
## 6687     2 48044 4.162851e-05
## 6688     2 48044 4.162851e-05
## 6689     2 48044 4.162851e-05
## 6690     2 48044 4.162851e-05
## 6691     2 48044 4.162851e-05
## 6692     2 48044 4.162851e-05
## 6693     2 48044 4.162851e-05
## 6694     2 48044 4.162851e-05
## 6695     2 48044 4.162851e-05
## 6696     2 48044 4.162851e-05
## 6697     2 48044 4.162851e-05
## 6698     2 48044 4.162851e-05
## 6699     2 48044 4.162851e-05
## 6700     2 48044 4.162851e-05
## 6701     2 48044 4.162851e-05
## 6702     2 48044 4.162851e-05
## 6703     2 48044 4.162851e-05
## 6704     2 48044 4.162851e-05
## 6705     2 48044 4.162851e-05
## 6706     2 48044 4.162851e-05
## 6707     2 48044 4.162851e-05
## 6708     2 48044 4.162851e-05
## 6709     2 48044 4.162851e-05
## 6710     2 48044 4.162851e-05
## 6711     2 48044 4.162851e-05
## 6712     2 48044 4.162851e-05
## 6713     2 48044 4.162851e-05
## 6714     2 48044 4.162851e-05
## 6715     2 48044 4.162851e-05
## 6716     2 48044 4.162851e-05
## 6717     2 48044 4.162851e-05
## 6718     2 48044 4.162851e-05
## 6719     2 48044 4.162851e-05
## 6720     2 48044 4.162851e-05
## 6721     2 48044 4.162851e-05
## 6722     2 48044 4.162851e-05
## 6723     2 48044 4.162851e-05
## 6724     2 48044 4.162851e-05
## 6725     2 48044 4.162851e-05
## 6726     2 48044 4.162851e-05
## 6727     2 48044 4.162851e-05
## 6728     2 48044 4.162851e-05
## 6729     2 48044 4.162851e-05
## 6730     2 48044 4.162851e-05
## 6731     2 48044 4.162851e-05
## 6732     2 48044 4.162851e-05
## 6733     2 48044 4.162851e-05
## 6734     2 48044 4.162851e-05
## 6735     2 48044 4.162851e-05
## 6736     2 48044 4.162851e-05
## 6737     2 48044 4.162851e-05
## 6738     2 48044 4.162851e-05
## 6739     2 48044 4.162851e-05
## 6740     2 48044 4.162851e-05
## 6741     2 48044 4.162851e-05
## 6742     2 48044 4.162851e-05
## 6743     2 48044 4.162851e-05
## 6744     2 48044 4.162851e-05
## 6745     2 48044 4.162851e-05
## 6746     2 48044 4.162851e-05
## 6747     2 48044 4.162851e-05
## 6748     2 48044 4.162851e-05
## 6749     2 48044 4.162851e-05
## 6750     2 48044 4.162851e-05
## 6751     2 48044 4.162851e-05
## 6752     2 48044 4.162851e-05
## 6753     2 48044 4.162851e-05
## 6754     2 48044 4.162851e-05
## 6755     2 48044 4.162851e-05
## 6756     2 48044 4.162851e-05
## 6757     2 48044 4.162851e-05
## 6758     2 48044 4.162851e-05
## 6759     2 48044 4.162851e-05
## 6760     2 48044 4.162851e-05
## 6761     2 48044 4.162851e-05
## 6762     2 48044 4.162851e-05
## 6763     2 48044 4.162851e-05
## 6764     2 48044 4.162851e-05
## 6765     2 48044 4.162851e-05
## 6766     2 48044 4.162851e-05
## 6767     2 48044 4.162851e-05
## 6768     2 48044 4.162851e-05
## 6769     2 48044 4.162851e-05
## 6770     2 48044 4.162851e-05
## 6771     2 48044 4.162851e-05
## 6772     2 48044 4.162851e-05
## 6773     2 48044 4.162851e-05
## 6774     2 48044 4.162851e-05
## 6775     2 48044 4.162851e-05
## 6776     2 48044 4.162851e-05
## 6777     2 48044 4.162851e-05
## 6778     2 48044 4.162851e-05
## 6779     2 48044 4.162851e-05
## 6780     2 48044 4.162851e-05
## 6781     2 48044 4.162851e-05
## 6782     2 48044 4.162851e-05
## 6783     2 48044 4.162851e-05
## 6784     2 48044 4.162851e-05
## 6785     2 48044 4.162851e-05
## 6786     2 48044 4.162851e-05
## 6787     2 48044 4.162851e-05
## 6788     2 48044 4.162851e-05
## 6789     2 48044 4.162851e-05
## 6790     2 48044 4.162851e-05
## 6791     2 48044 4.162851e-05
## 6792     2 48044 4.162851e-05
## 6793     2 48044 4.162851e-05
## 6794     2 48044 4.162851e-05
## 6795     2 48044 4.162851e-05
## 6796     2 48044 4.162851e-05
## 6797     2 48044 4.162851e-05
## 6798     2 48044 4.162851e-05
## 6799     2 48044 4.162851e-05
## 6800     2 48044 4.162851e-05
## 6801     2 48044 4.162851e-05
## 6802     2 48044 4.162851e-05
## 6803     2 48044 4.162851e-05
## 6804     2 48044 4.162851e-05
## 6805     2 48044 4.162851e-05
## 6806     2 48044 4.162851e-05
## 6807     2 48044 4.162851e-05
## 6808     2 48044 4.162851e-05
## 6809     2 48044 4.162851e-05
## 6810     2 48044 4.162851e-05
## 6811     2 48044 4.162851e-05
## 6812     2 48044 4.162851e-05
## 6813     2 48044 4.162851e-05
## 6814     2 48044 4.162851e-05
## 6815     2 48044 4.162851e-05
## 6816     2 48044 4.162851e-05
## 6817     2 48044 4.162851e-05
## 6818     2 48044 4.162851e-05
## 6819     2 48044 4.162851e-05
## 6820     2 48044 4.162851e-05
## 6821     2 48044 4.162851e-05
## 6822     2 48044 4.162851e-05
## 6823     2 48044 4.162851e-05
## 6824     2 48044 4.162851e-05
## 6825     2 48044 4.162851e-05
## 6826     2 48044 4.162851e-05
## 6827     2 48044 4.162851e-05
## 6828     2 48044 4.162851e-05
## 6829     2 48044 4.162851e-05
## 6830     2 48044 4.162851e-05
## 6831     2 48044 4.162851e-05
## 6832     2 48044 4.162851e-05
## 6833     2 48044 4.162851e-05
## 6834     2 48044 4.162851e-05
## 6835     2 48044 4.162851e-05
## 6836     2 48044 4.162851e-05
## 6837     2 48044 4.162851e-05
## 6838     2 48044 4.162851e-05
## 6839     2 48044 4.162851e-05
## 6840     2 48044 4.162851e-05
## 6841     2 48044 4.162851e-05
## 6842     2 48044 4.162851e-05
## 6843     2 48044 4.162851e-05
## 6844     2 48044 4.162851e-05
## 6845     2 48044 4.162851e-05
## 6846     2 48044 4.162851e-05
## 6847     2 48044 4.162851e-05
## 6848     2 48044 4.162851e-05
## 6849     2 48044 4.162851e-05
## 6850     2 48044 4.162851e-05
## 6851     2 48044 4.162851e-05
## 6852     2 48044 4.162851e-05
## 6853     2 48044 4.162851e-05
## 6854     2 48044 4.162851e-05
## 6855     2 48044 4.162851e-05
## 6856     2 48044 4.162851e-05
## 6857     2 48044 4.162851e-05
## 6858     2 48044 4.162851e-05
## 6859     2 48044 4.162851e-05
## 6860     2 48044 4.162851e-05
## 6861     2 48044 4.162851e-05
## 6862     2 48044 4.162851e-05
## 6863     2 48044 4.162851e-05
## 6864     2 48044 4.162851e-05
## 6865     2 48044 4.162851e-05
## 6866     2 48044 4.162851e-05
## 6867     2 48044 4.162851e-05
## 6868     2 48044 4.162851e-05
## 6869     2 48044 4.162851e-05
## 6870     2 48044 4.162851e-05
## 6871     2 48044 4.162851e-05
## 6872     2 48044 4.162851e-05
## 6873     2 48044 4.162851e-05
## 6874     2 48044 4.162851e-05
## 6875     2 48044 4.162851e-05
## 6876     2 48044 4.162851e-05
## 6877     2 48044 4.162851e-05
## 6878     2 48044 4.162851e-05
## 6879     2 48044 4.162851e-05
## 6880     2 48044 4.162851e-05
## 6881     2 48044 4.162851e-05
## 6882     2 48044 4.162851e-05
## 6883     2 48044 4.162851e-05
## 6884     2 48044 4.162851e-05
## 6885     2 48044 4.162851e-05
## 6886     2 48044 4.162851e-05
## 6887     2 48044 4.162851e-05
## 6888     2 48044 4.162851e-05
## 6889     2 48044 4.162851e-05
## 6890     2 48044 4.162851e-05
## 6891     2 48044 4.162851e-05
## 6892     2 48044 4.162851e-05
## 6893     2 48044 4.162851e-05
## 6894     2 48044 4.162851e-05
## 6895     2 48044 4.162851e-05
## 6896     2 48044 4.162851e-05
## 6897     2 48044 4.162851e-05
## 6898     2 48044 4.162851e-05
## 6899     2 48044 4.162851e-05
## 6900     2 48044 4.162851e-05
## 6901     2 48044 4.162851e-05
## 6902     2 48044 4.162851e-05
## 6903     2 48044 4.162851e-05
## 6904     2 48044 4.162851e-05
## 6905     2 48044 4.162851e-05
## 6906     2 48044 4.162851e-05
## 6907     2 48044 4.162851e-05
## 6908     2 48044 4.162851e-05
## 6909     2 48044 4.162851e-05
## 6910     2 48044 4.162851e-05
## 6911     2 48044 4.162851e-05
## 6912     2 48044 4.162851e-05
## 6913     2 48044 4.162851e-05
## 6914     2 48044 4.162851e-05
## 6915     2 48044 4.162851e-05
## 6916     2 48044 4.162851e-05
## 6917     2 48044 4.162851e-05
## 6918     2 48044 4.162851e-05
## 6919     2 48044 4.162851e-05
## 6920     2 48044 4.162851e-05
## 6921     2 48044 4.162851e-05
## 6922     2 48044 4.162851e-05
## 6923     2 48044 4.162851e-05
## 6924     2 48044 4.162851e-05
## 6925     2 48044 4.162851e-05
## 6926     2 48044 4.162851e-05
## 6927     2 48044 4.162851e-05
## 6928     2 48044 4.162851e-05
## 6929     2 48044 4.162851e-05
## 6930     2 48044 4.162851e-05
## 6931     2 48044 4.162851e-05
## 6932     2 48044 4.162851e-05
## 6933     2 48044 4.162851e-05
## 6934     2 48044 4.162851e-05
## 6935     2 48044 4.162851e-05
## 6936     2 48044 4.162851e-05
## 6937     2 48044 4.162851e-05
## 6938     2 48044 4.162851e-05
## 6939     2 48044 4.162851e-05
## 6940     2 48044 4.162851e-05
## 6941     2 48044 4.162851e-05
## 6942     2 48044 4.162851e-05
## 6943     2 48044 4.162851e-05
## 6944     2 48044 4.162851e-05
## 6945     2 48044 4.162851e-05
## 6946     2 48044 4.162851e-05
## 6947     2 48044 4.162851e-05
## 6948     2 48044 4.162851e-05
## 6949     2 48044 4.162851e-05
## 6950     2 48044 4.162851e-05
## 6951     2 48044 4.162851e-05
## 6952     2 48044 4.162851e-05
## 6953     2 48044 4.162851e-05
## 6954     2 48044 4.162851e-05
## 6955     2 48044 4.162851e-05
## 6956     2 48044 4.162851e-05
## 6957     2 48044 4.162851e-05
## 6958     2 48044 4.162851e-05
## 6959     2 48044 4.162851e-05
## 6960     2 48044 4.162851e-05
## 6961     2 48044 4.162851e-05
## 6962     2 48044 4.162851e-05
## 6963     2 48044 4.162851e-05
## 6964     2 48044 4.162851e-05
## 6965     2 48044 4.162851e-05
## 6966     2 48044 4.162851e-05
## 6967     2 48044 4.162851e-05
## 6968     2 48044 4.162851e-05
## 6969     2 48044 4.162851e-05
## 6970     2 48044 4.162851e-05
## 6971     2 48044 4.162851e-05
## 6972     2 48044 4.162851e-05
## 6973     2 48044 4.162851e-05
## 6974     2 48044 4.162851e-05
## 6975     2 48044 4.162851e-05
## 6976     2 48044 4.162851e-05
## 6977     2 48044 4.162851e-05
## 6978     2 48044 4.162851e-05
## 6979     2 48044 4.162851e-05
## 6980     2 48044 4.162851e-05
## 6981     2 48044 4.162851e-05
## 6982     2 48044 4.162851e-05
## 6983     2 48044 4.162851e-05
## 6984     2 48044 4.162851e-05
## 6985     2 48044 4.162851e-05
## 6986     2 48044 4.162851e-05
## 6987     2 48044 4.162851e-05
## 6988     2 48044 4.162851e-05
## 6989     2 48044 4.162851e-05
## 6990     2 48044 4.162851e-05
## 6991     2 48044 4.162851e-05
## 6992     2 48044 4.162851e-05
## 6993     2 48044 4.162851e-05
## 6994     2 48044 4.162851e-05
## 6995     2 48044 4.162851e-05
## 6996     2 48044 4.162851e-05
## 6997     2 48044 4.162851e-05
## 6998     2 48044 4.162851e-05
## 6999     2 48044 4.162851e-05
## 7000     2 48044 4.162851e-05
## 7001     2 48044 4.162851e-05
## 7002     2 48044 4.162851e-05
## 7003     2 48044 4.162851e-05
## 7004     2 48044 4.162851e-05
## 7005     2 48044 4.162851e-05
## 7006     2 48044 4.162851e-05
## 7007     2 48044 4.162851e-05
## 7008     2 48044 4.162851e-05
## 7009     2 48044 4.162851e-05
## 7010     2 48044 4.162851e-05
## 7011     2 48044 4.162851e-05
## 7012     2 48044 4.162851e-05
## 7013     2 48044 4.162851e-05
## 7014     2 48044 4.162851e-05
## 7015     2 48044 4.162851e-05
## 7016     2 48044 4.162851e-05
## 7017     2 48044 4.162851e-05
## 7018     2 48044 4.162851e-05
## 7019     2 48044 4.162851e-05
## 7020     2 48044 4.162851e-05
## 7021     2 48044 4.162851e-05
## 7022     2 48044 4.162851e-05
## 7023     2 48044 4.162851e-05
## 7024     2 48044 4.162851e-05
## 7025     2 48044 4.162851e-05
## 7026     2 48044 4.162851e-05
## 7027     2 48044 4.162851e-05
## 7028     2 48044 4.162851e-05
## 7029     2 48044 4.162851e-05
## 7030     2 48044 4.162851e-05
## 7031     2 48044 4.162851e-05
## 7032     2 48044 4.162851e-05
## 7033     2 48044 4.162851e-05
## 7034     2 48044 4.162851e-05
## 7035     2 48044 4.162851e-05
## 7036     2 48044 4.162851e-05
## 7037     2 48044 4.162851e-05
## 7038     2 48044 4.162851e-05
## 7039     2 48044 4.162851e-05
## 7040     2 48044 4.162851e-05
## 7041     2 48044 4.162851e-05
## 7042     2 48044 4.162851e-05
## 7043     2 48044 4.162851e-05
## 7044     2 48044 4.162851e-05
## 7045     2 48044 4.162851e-05
## 7046     2 48044 4.162851e-05
## 7047     2 48044 4.162851e-05
## 7048     2 48044 4.162851e-05
## 7049     2 48044 4.162851e-05
## 7050     2 48044 4.162851e-05
## 7051     2 48044 4.162851e-05
## 7052     2 48044 4.162851e-05
## 7053     2 48044 4.162851e-05
## 7054     2 48044 4.162851e-05
## 7055     2 48044 4.162851e-05
## 7056     2 48044 4.162851e-05
## 7057     2 48044 4.162851e-05
## 7058     2 48044 4.162851e-05
## 7059     2 48044 4.162851e-05
## 7060     2 48044 4.162851e-05
## 7061     2 48044 4.162851e-05
## 7062     2 48044 4.162851e-05
## 7063     2 48044 4.162851e-05
## 7064     2 48044 4.162851e-05
## 7065     2 48044 4.162851e-05
## 7066     2 48044 4.162851e-05
## 7067     2 48044 4.162851e-05
## 7068     2 48044 4.162851e-05
## 7069     2 48044 4.162851e-05
## 7070     2 48044 4.162851e-05
## 7071     2 48044 4.162851e-05
## 7072     2 48044 4.162851e-05
## 7073     2 48044 4.162851e-05
## 7074     2 48044 4.162851e-05
## 7075     2 48044 4.162851e-05
## 7076     2 48044 4.162851e-05
## 7077     2 48044 4.162851e-05
## 7078     2 48044 4.162851e-05
## 7079     2 48044 4.162851e-05
## 7080     2 48044 4.162851e-05
## 7081     2 48044 4.162851e-05
## 7082     2 48044 4.162851e-05
## 7083     2 48044 4.162851e-05
## 7084     2 48044 4.162851e-05
## 7085     2 48044 4.162851e-05
## 7086     2 48044 4.162851e-05
## 7087     2 48044 4.162851e-05
## 7088     2 48044 4.162851e-05
## 7089     2 48044 4.162851e-05
## 7090     2 48044 4.162851e-05
## 7091     2 48044 4.162851e-05
## 7092     2 48044 4.162851e-05
## 7093     2 48044 4.162851e-05
## 7094     2 48044 4.162851e-05
## 7095     2 48044 4.162851e-05
## 7096     2 48044 4.162851e-05
## 7097     2 48044 4.162851e-05
## 7098     2 48044 4.162851e-05
## 7099     2 48044 4.162851e-05
## 7100     2 48044 4.162851e-05
## 7101     2 48044 4.162851e-05
## 7102     2 48044 4.162851e-05
## 7103     2 48044 4.162851e-05
## 7104     2 48044 4.162851e-05
## 7105     2 48044 4.162851e-05
## 7106     2 48044 4.162851e-05
## 7107     2 48044 4.162851e-05
## 7108     2 48044 4.162851e-05
## 7109     2 48044 4.162851e-05
## 7110     2 48044 4.162851e-05
## 7111     2 48044 4.162851e-05
## 7112     2 48044 4.162851e-05
## 7113     2 48044 4.162851e-05
## 7114     2 48044 4.162851e-05
## 7115     2 48044 4.162851e-05
## 7116     2 48044 4.162851e-05
## 7117     2 48044 4.162851e-05
## 7118     2 48044 4.162851e-05
## 7119     2 48044 4.162851e-05
## 7120     2 48044 4.162851e-05
## 7121     2 48044 4.162851e-05
## 7122     2 48044 4.162851e-05
## 7123     2 48044 4.162851e-05
## 7124     2 48044 4.162851e-05
## 7125     2 48044 4.162851e-05
## 7126     2 48044 4.162851e-05
## 7127     2 48044 4.162851e-05
## 7128     2 48044 4.162851e-05
## 7129     2 48044 4.162851e-05
## 7130     2 48044 4.162851e-05
## 7131     2 48044 4.162851e-05
## 7132     2 48044 4.162851e-05
## 7133     2 48044 4.162851e-05
## 7134     2 48044 4.162851e-05
## 7135     2 48044 4.162851e-05
## 7136     2 48044 4.162851e-05
## 7137     2 48044 4.162851e-05
## 7138     2 48044 4.162851e-05
## 7139     2 48044 4.162851e-05
## 7140     2 48044 4.162851e-05
## 7141     2 48044 4.162851e-05
## 7142     2 48044 4.162851e-05
## 7143     2 48044 4.162851e-05
## 7144     2 48044 4.162851e-05
## 7145     2 48044 4.162851e-05
## 7146     2 48044 4.162851e-05
## 7147     2 48044 4.162851e-05
## 7148     2 48044 4.162851e-05
## 7149     2 48044 4.162851e-05
## 7150     2 48044 4.162851e-05
## 7151     2 48044 4.162851e-05
## 7152     2 48044 4.162851e-05
## 7153     2 48044 4.162851e-05
## 7154     2 48044 4.162851e-05
## 7155     2 48044 4.162851e-05
## 7156     2 48044 4.162851e-05
## 7157     2 48044 4.162851e-05
## 7158     2 48044 4.162851e-05
## 7159     2 48044 4.162851e-05
## 7160     2 48044 4.162851e-05
## 7161     2 48044 4.162851e-05
## 7162     2 48044 4.162851e-05
## 7163     2 48044 4.162851e-05
## 7164     2 48044 4.162851e-05
## 7165     2 48044 4.162851e-05
## 7166     2 48044 4.162851e-05
## 7167     2 48044 4.162851e-05
## 7168     2 48044 4.162851e-05
## 7169     2 48044 4.162851e-05
## 7170     2 48044 4.162851e-05
## 7171     2 48044 4.162851e-05
## 7172     2 48044 4.162851e-05
## 7173     2 48044 4.162851e-05
## 7174     2 48044 4.162851e-05
## 7175     2 48044 4.162851e-05
## 7176     2 48044 4.162851e-05
## 7177     2 48044 4.162851e-05
## 7178     2 48044 4.162851e-05
## 7179     2 48044 4.162851e-05
## 7180     2 48044 4.162851e-05
## 7181     2 48044 4.162851e-05
## 7182     2 48044 4.162851e-05
## 7183     2 48044 4.162851e-05
## 7184     2 48044 4.162851e-05
## 7185     2 48044 4.162851e-05
## 7186     2 48044 4.162851e-05
## 7187     2 48044 4.162851e-05
## 7188     2 48044 4.162851e-05
## 7189     2 48044 4.162851e-05
## 7190     2 48044 4.162851e-05
## 7191     2 48044 4.162851e-05
## 7192     2 48044 4.162851e-05
## 7193     2 48044 4.162851e-05
## 7194     2 48044 4.162851e-05
## 7195     2 48044 4.162851e-05
## 7196     2 48044 4.162851e-05
## 7197     2 48044 4.162851e-05
## 7198     2 48044 4.162851e-05
## 7199     2 48044 4.162851e-05
## 7200     2 48044 4.162851e-05
## 7201     2 48044 4.162851e-05
## 7202     2 48044 4.162851e-05
## 7203     2 48044 4.162851e-05
## 7204     2 48044 4.162851e-05
## 7205     2 48044 4.162851e-05
## 7206     2 48044 4.162851e-05
## 7207     2 48044 4.162851e-05
## 7208     2 48044 4.162851e-05
## 7209     2 48044 4.162851e-05
## 7210     2 48044 4.162851e-05
## 7211     2 48044 4.162851e-05
## 7212     2 48044 4.162851e-05
## 7213     2 48044 4.162851e-05
## 7214     2 48044 4.162851e-05
## 7215     2 48044 4.162851e-05
## 7216     2 48044 4.162851e-05
## 7217     2 48044 4.162851e-05
## 7218     2 48044 4.162851e-05
## 7219     2 48044 4.162851e-05
## 7220     2 48044 4.162851e-05
## 7221     2 48044 4.162851e-05
## 7222     2 48044 4.162851e-05
## 7223     2 48044 4.162851e-05
## 7224     2 48044 4.162851e-05
## 7225     2 48044 4.162851e-05
## 7226     2 48044 4.162851e-05
## 7227     2 48044 4.162851e-05
## 7228     2 48044 4.162851e-05
## 7229     2 48044 4.162851e-05
## 7230     2 48044 4.162851e-05
## 7231     2 48044 4.162851e-05
## 7232     2 48044 4.162851e-05
## 7233     2 48044 4.162851e-05
## 7234     2 48044 4.162851e-05
## 7235     2 48044 4.162851e-05
## 7236     2 48044 4.162851e-05
## 7237     2 48044 4.162851e-05
## 7238     2 48044 4.162851e-05
## 7239     2 48044 4.162851e-05
## 7240     2 48044 4.162851e-05
## 7241     2 48044 4.162851e-05
## 7242     2 48044 4.162851e-05
## 7243     2 48044 4.162851e-05
## 7244     2 48044 4.162851e-05
## 7245     2 48044 4.162851e-05
## 7246     2 48044 4.162851e-05
## 7247     2 48044 4.162851e-05
## 7248     2 48044 4.162851e-05
## 7249     2 48044 4.162851e-05
## 7250     2 48044 4.162851e-05
## 7251     2 48044 4.162851e-05
## 7252     2 48044 4.162851e-05
## 7253     2 48044 4.162851e-05
## 7254     2 48044 4.162851e-05
## 7255     2 48044 4.162851e-05
## 7256     2 48044 4.162851e-05
## 7257     2 48044 4.162851e-05
## 7258     2 48044 4.162851e-05
## 7259     2 48044 4.162851e-05
## 7260     2 48044 4.162851e-05
## 7261     2 48044 4.162851e-05
## 7262     2 48044 4.162851e-05
## 7263     2 48044 4.162851e-05
## 7264     2 48044 4.162851e-05
## 7265     2 48044 4.162851e-05
## 7266     2 48044 4.162851e-05
## 7267     2 48044 4.162851e-05
## 7268     2 48044 4.162851e-05
## 7269     2 48044 4.162851e-05
## 7270     2 48044 4.162851e-05
## 7271     2 48044 4.162851e-05
## 7272     2 48044 4.162851e-05
## 7273     2 48044 4.162851e-05
## 7274     2 48044 4.162851e-05
## 7275     2 48044 4.162851e-05
## 7276     2 48044 4.162851e-05
## 7277     2 48044 4.162851e-05
## 7278     2 48044 4.162851e-05
## 7279     2 48044 4.162851e-05
## 7280     2 48044 4.162851e-05
## 7281     2 48044 4.162851e-05
## 7282     2 48044 4.162851e-05
## 7283     2 48044 4.162851e-05
## 7284     2 48044 4.162851e-05
## 7285     2 48044 4.162851e-05
## 7286     2 48044 4.162851e-05
## 7287     2 48044 4.162851e-05
## 7288     2 48044 4.162851e-05
## 7289     2 48044 4.162851e-05
## 7290     2 48044 4.162851e-05
## 7291     2 48044 4.162851e-05
## 7292     2 48044 4.162851e-05
## 7293     2 48044 4.162851e-05
## 7294     2 48044 4.162851e-05
## 7295     2 48044 4.162851e-05
## 7296     2 48044 4.162851e-05
## 7297     2 48044 4.162851e-05
## 7298     2 48044 4.162851e-05
## 7299     2 48044 4.162851e-05
## 7300     2 48044 4.162851e-05
## 7301     2 48044 4.162851e-05
## 7302     2 48044 4.162851e-05
## 7303     2 48044 4.162851e-05
## 7304     2 48044 4.162851e-05
## 7305     2 48044 4.162851e-05
## 7306     2 48044 4.162851e-05
## 7307     2 48044 4.162851e-05
## 7308     2 48044 4.162851e-05
## 7309     2 48044 4.162851e-05
## 7310     2 48044 4.162851e-05
## 7311     2 48044 4.162851e-05
## 7312     2 48044 4.162851e-05
## 7313     2 48044 4.162851e-05
## 7314     2 48044 4.162851e-05
## 7315     2 48044 4.162851e-05
## 7316     2 48044 4.162851e-05
## 7317     2 48044 4.162851e-05
## 7318     2 48044 4.162851e-05
## 7319     2 48044 4.162851e-05
## 7320     2 48044 4.162851e-05
## 7321     2 48044 4.162851e-05
## 7322     2 48044 4.162851e-05
## 7323     2 48044 4.162851e-05
## 7324     2 48044 4.162851e-05
## 7325     2 48044 4.162851e-05
## 7326     2 48044 4.162851e-05
## 7327     2 48044 4.162851e-05
## 7328     2 48044 4.162851e-05
## 7329     2 48044 4.162851e-05
## 7330     2 48044 4.162851e-05
## 7331     2 48044 4.162851e-05
## 7332     2 48044 4.162851e-05
## 7333     2 48044 4.162851e-05
## 7334     2 48044 4.162851e-05
## 7335     2 48044 4.162851e-05
## 7336     2 48044 4.162851e-05
## 7337     2 48044 4.162851e-05
## 7338     2 48044 4.162851e-05
## 7339     2 48044 4.162851e-05
## 7340     2 48044 4.162851e-05
## 7341     2 48044 4.162851e-05
## 7342     2 48044 4.162851e-05
## 7343     2 48044 4.162851e-05
## 7344     2 48044 4.162851e-05
## 7345     2 48044 4.162851e-05
## 7346     2 48044 4.162851e-05
## 7347     2 48044 4.162851e-05
## 7348     2 48044 4.162851e-05
## 7349     2 48044 4.162851e-05
## 7350     2 48044 4.162851e-05
## 7351     2 48044 4.162851e-05
## 7352     2 48044 4.162851e-05
## 7353     2 48044 4.162851e-05
## 7354     2 48044 4.162851e-05
## 7355     2 48044 4.162851e-05
## 7356     2 48044 4.162851e-05
## 7357     2 48044 4.162851e-05
## 7358     2 48044 4.162851e-05
## 7359     2 48044 4.162851e-05
## 7360     2 48044 4.162851e-05
## 7361     2 48044 4.162851e-05
## 7362     2 48044 4.162851e-05
## 7363     2 48044 4.162851e-05
## 7364     2 48044 4.162851e-05
## 7365     2 48044 4.162851e-05
## 7366     2 48044 4.162851e-05
## 7367     2 48044 4.162851e-05
## 7368     2 48044 4.162851e-05
## 7369     2 48044 4.162851e-05
## 7370     2 48044 4.162851e-05
## 7371     2 48044 4.162851e-05
## 7372     2 48044 4.162851e-05
## 7373     2 48044 4.162851e-05
## 7374     2 48044 4.162851e-05
## 7375     2 48044 4.162851e-05
## 7376     2 48044 4.162851e-05
## 7377     2 48044 4.162851e-05
## 7378     2 48044 4.162851e-05
## 7379     2 48044 4.162851e-05
## 7380     2 48044 4.162851e-05
## 7381     2 48044 4.162851e-05
## 7382     2 48044 4.162851e-05
## 7383     2 48044 4.162851e-05
## 7384     2 48044 4.162851e-05
## 7385     2 48044 4.162851e-05
## 7386     2 48044 4.162851e-05
## 7387     2 48044 4.162851e-05
## 7388     2 48044 4.162851e-05
## 7389     2 48044 4.162851e-05
## 7390     2 48044 4.162851e-05
## 7391     2 48044 4.162851e-05
## 7392     2 48044 4.162851e-05
## 7393     2 48044 4.162851e-05
## 7394     2 48044 4.162851e-05
## 7395     2 48044 4.162851e-05
## 7396     2 48044 4.162851e-05
## 7397     2 48044 4.162851e-05
## 7398     2 48044 4.162851e-05
## 7399     2 48044 4.162851e-05
## 7400     2 48044 4.162851e-05
## 7401     2 48044 4.162851e-05
## 7402     2 48044 4.162851e-05
## 7403     2 48044 4.162851e-05
## 7404     2 48044 4.162851e-05
## 7405     2 48044 4.162851e-05
## 7406     2 48044 4.162851e-05
## 7407     2 48044 4.162851e-05
## 7408     2 48044 4.162851e-05
## 7409     2 48044 4.162851e-05
## 7410     2 48044 4.162851e-05
## 7411     2 48044 4.162851e-05
## 7412     2 48044 4.162851e-05
## 7413     2 48044 4.162851e-05
## 7414     2 48044 4.162851e-05
## 7415     2 48044 4.162851e-05
## 7416     2 48044 4.162851e-05
## 7417     2 48044 4.162851e-05
## 7418     2 48044 4.162851e-05
## 7419     2 48044 4.162851e-05
## 7420     2 48044 4.162851e-05
## 7421     2 48044 4.162851e-05
## 7422     2 48044 4.162851e-05
## 7423     2 48044 4.162851e-05
## 7424     2 48044 4.162851e-05
## 7425     2 48044 4.162851e-05
## 7426     2 48044 4.162851e-05
## 7427     2 48044 4.162851e-05
## 7428     2 48044 4.162851e-05
## 7429     2 48044 4.162851e-05
## 7430     2 48044 4.162851e-05
## 7431     2 48044 4.162851e-05
## 7432     2 48044 4.162851e-05
## 7433     2 48044 4.162851e-05
## 7434     2 48044 4.162851e-05
## 7435     2 48044 4.162851e-05
## 7436     2 48044 4.162851e-05
## 7437     2 48044 4.162851e-05
## 7438     2 48044 4.162851e-05
## 7439     2 48044 4.162851e-05
## 7440     2 48044 4.162851e-05
## 7441     2 48044 4.162851e-05
## 7442     2 48044 4.162851e-05
## 7443     2 48044 4.162851e-05
## 7444     2 48044 4.162851e-05
## 7445     2 48044 4.162851e-05
## 7446     2 48044 4.162851e-05
## 7447     2 48044 4.162851e-05
## 7448     2 48044 4.162851e-05
## 7449     2 48044 4.162851e-05
## 7450     2 48044 4.162851e-05
## 7451     2 48044 4.162851e-05
## 7452     2 48044 4.162851e-05
## 7453     2 48044 4.162851e-05
## 7454     2 48044 4.162851e-05
## 7455     2 48044 4.162851e-05
## 7456     2 48044 4.162851e-05
## 7457     2 48044 4.162851e-05
## 7458     2 48044 4.162851e-05
## 7459     2 48044 4.162851e-05
## 7460     2 48044 4.162851e-05
## 7461     2 48044 4.162851e-05
## 7462     2 48044 4.162851e-05
## 7463     2 48044 4.162851e-05
## 7464     2 48044 4.162851e-05
## 7465     2 48044 4.162851e-05
## 7466     2 48044 4.162851e-05
## 7467     2 48044 4.162851e-05
## 7468     2 48044 4.162851e-05
## 7469     2 48044 4.162851e-05
## 7470     2 48044 4.162851e-05
## 7471     2 48044 4.162851e-05
## 7472     2 48044 4.162851e-05
## 7473     2 48044 4.162851e-05
## 7474     2 48044 4.162851e-05
## 7475     2 48044 4.162851e-05
## 7476     2 48044 4.162851e-05
## 7477     2 48044 4.162851e-05
## 7478     2 48044 4.162851e-05
## 7479     2 48044 4.162851e-05
## 7480     2 48044 4.162851e-05
## 7481     2 48044 4.162851e-05
## 7482     2 48044 4.162851e-05
## 7483     2 48044 4.162851e-05
## 7484     2 48044 4.162851e-05
## 7485     2 48044 4.162851e-05
## 7486     2 48044 4.162851e-05
## 7487     2 48044 4.162851e-05
## 7488     2 48044 4.162851e-05
## 7489     2 48044 4.162851e-05
## 7490     2 48044 4.162851e-05
## 7491     2 48044 4.162851e-05
## 7492     2 48044 4.162851e-05
## 7493     2 48044 4.162851e-05
## 7494     2 48044 4.162851e-05
## 7495     2 48044 4.162851e-05
## 7496     2 48044 4.162851e-05
## 7497     2 48044 4.162851e-05
## 7498     2 48044 4.162851e-05
## 7499     2 48044 4.162851e-05
## 7500     2 48044 4.162851e-05
## 7501     2 48044 4.162851e-05
## 7502     2 48044 4.162851e-05
## 7503     2 48044 4.162851e-05
## 7504     2 48044 4.162851e-05
## 7505     2 48044 4.162851e-05
## 7506     2 48044 4.162851e-05
## 7507     2 48044 4.162851e-05
## 7508     2 48044 4.162851e-05
## 7509     2 48044 4.162851e-05
## 7510     2 48044 4.162851e-05
## 7511     2 48044 4.162851e-05
## 7512     2 48044 4.162851e-05
## 7513     2 48044 4.162851e-05
## 7514     2 48044 4.162851e-05
## 7515     2 48044 4.162851e-05
## 7516     2 48044 4.162851e-05
## 7517     2 48044 4.162851e-05
## 7518     2 48044 4.162851e-05
## 7519     2 48044 4.162851e-05
## 7520     2 48044 4.162851e-05
## 7521     2 48044 4.162851e-05
## 7522     2 48044 4.162851e-05
## 7523     2 48044 4.162851e-05
## 7524     2 48044 4.162851e-05
## 7525     2 48044 4.162851e-05
## 7526     2 48044 4.162851e-05
## 7527     2 48044 4.162851e-05
## 7528     2 48044 4.162851e-05
## 7529     2 48044 4.162851e-05
## 7530     2 48044 4.162851e-05
## 7531     2 48044 4.162851e-05
## 7532     2 48044 4.162851e-05
## 7533     2 48044 4.162851e-05
## 7534     2 48044 4.162851e-05
## 7535     2 48044 4.162851e-05
## 7536     2 48044 4.162851e-05
## 7537     2 48044 4.162851e-05
## 7538     2 48044 4.162851e-05
## 7539     2 48044 4.162851e-05
## 7540     2 48044 4.162851e-05
## 7541     2 48044 4.162851e-05
## 7542     2 48044 4.162851e-05
## 7543     2 48044 4.162851e-05
## 7544     2 48044 4.162851e-05
## 7545     2 48044 4.162851e-05
## 7546     2 48044 4.162851e-05
## 7547     2 48044 4.162851e-05
## 7548     2 48044 4.162851e-05
## 7549     2 48044 4.162851e-05
## 7550     2 48044 4.162851e-05
## 7551     2 48044 4.162851e-05
## 7552     2 48044 4.162851e-05
## 7553     2 48044 4.162851e-05
## 7554     2 48044 4.162851e-05
## 7555     2 48044 4.162851e-05
## 7556     2 48044 4.162851e-05
## 7557     2 48044 4.162851e-05
## 7558     2 48044 4.162851e-05
## 7559     2 48044 4.162851e-05
## 7560     2 48044 4.162851e-05
## 7561     2 48044 4.162851e-05
## 7562     2 48044 4.162851e-05
## 7563     2 48044 4.162851e-05
## 7564     2 48044 4.162851e-05
## 7565     2 48044 4.162851e-05
## 7566     2 48044 4.162851e-05
## 7567     2 48044 4.162851e-05
## 7568     2 48044 4.162851e-05
## 7569     2 48044 4.162851e-05
## 7570     2 48044 4.162851e-05
## 7571     2 48044 4.162851e-05
## 7572     2 48044 4.162851e-05
## 7573     2 48044 4.162851e-05
## 7574     2 48044 4.162851e-05
## 7575     2 48044 4.162851e-05
## 7576     2 48044 4.162851e-05
## 7577     2 48044 4.162851e-05
## 7578     2 48044 4.162851e-05
## 7579     2 48044 4.162851e-05
## 7580     2 48044 4.162851e-05
## 7581     2 48044 4.162851e-05
## 7582     2 48044 4.162851e-05
## 7583     2 48044 4.162851e-05
## 7584     2 48044 4.162851e-05
## 7585     2 48044 4.162851e-05
## 7586     2 48044 4.162851e-05
## 7587     2 48044 4.162851e-05
## 7588     2 48044 4.162851e-05
## 7589     2 48044 4.162851e-05
## 7590     2 48044 4.162851e-05
## 7591     2 48044 4.162851e-05
## 7592     2 48044 4.162851e-05
## 7593     2 48044 4.162851e-05
## 7594     2 48044 4.162851e-05
## 7595     2 48044 4.162851e-05
## 7596     2 48044 4.162851e-05
## 7597     2 48044 4.162851e-05
## 7598     2 48044 4.162851e-05
## 7599     2 48044 4.162851e-05
## 7600     2 48044 4.162851e-05
## 7601     2 48044 4.162851e-05
## 7602     2 48044 4.162851e-05
## 7603     2 48044 4.162851e-05
## 7604     2 48044 4.162851e-05
## 7605     2 48044 4.162851e-05
## 7606     2 48044 4.162851e-05
## 7607     2 48044 4.162851e-05
## 7608     2 48044 4.162851e-05
## 7609     2 48044 4.162851e-05
## 7610     2 48044 4.162851e-05
## 7611     2 48044 4.162851e-05
## 7612     2 48044 4.162851e-05
## 7613     2 48044 4.162851e-05
## 7614     2 48044 4.162851e-05
## 7615     2 48044 4.162851e-05
## 7616     2 48044 4.162851e-05
## 7617     2 48044 4.162851e-05
## 7618     2 48044 4.162851e-05
## 7619     2 48044 4.162851e-05
## 7620     2 48044 4.162851e-05
## 7621     2 48044 4.162851e-05
## 7622     2 48044 4.162851e-05
## 7623     2 48044 4.162851e-05
## 7624     2 48044 4.162851e-05
## 7625     2 48044 4.162851e-05
## 7626     2 48044 4.162851e-05
## 7627     2 48044 4.162851e-05
## 7628     2 48044 4.162851e-05
## 7629     2 48044 4.162851e-05
## 7630     2 48044 4.162851e-05
## 7631     2 48044 4.162851e-05
## 7632     2 48044 4.162851e-05
## 7633     2 48044 4.162851e-05
## 7634     2 48044 4.162851e-05
## 7635     2 48044 4.162851e-05
## 7636     2 48044 4.162851e-05
## 7637     2 48044 4.162851e-05
## 7638     2 48044 4.162851e-05
## 7639     2 48044 4.162851e-05
## 7640     2 48044 4.162851e-05
## 7641     2 48044 4.162851e-05
## 7642     2 48044 4.162851e-05
## 7643     2 48044 4.162851e-05
## 7644     2 48044 4.162851e-05
## 7645     2 48044 4.162851e-05
## 7646     2 48044 4.162851e-05
## 7647     2 48044 4.162851e-05
## 7648     2 48044 4.162851e-05
## 7649     2 48044 4.162851e-05
## 7650     2 48044 4.162851e-05
## 7651     2 48044 4.162851e-05
## 7652     2 48044 4.162851e-05
## 7653     2 48044 4.162851e-05
## 7654     2 48044 4.162851e-05
## 7655     2 48044 4.162851e-05
## 7656     2 48044 4.162851e-05
## 7657     2 48044 4.162851e-05
## 7658     2 48044 4.162851e-05
## 7659     2 48044 4.162851e-05
## 7660     2 48044 4.162851e-05
## 7661     2 48044 4.162851e-05
## 7662     2 48044 4.162851e-05
## 7663     2 48044 4.162851e-05
## 7664     2 48044 4.162851e-05
## 7665     2 48044 4.162851e-05
## 7666     2 48044 4.162851e-05
## 7667     2 48044 4.162851e-05
## 7668     2 48044 4.162851e-05
## 7669     2 48044 4.162851e-05
## 7670     2 48044 4.162851e-05
## 7671     2 48044 4.162851e-05
## 7672     2 48044 4.162851e-05
## 7673     2 48044 4.162851e-05
## 7674     2 48044 4.162851e-05
## 7675     2 48044 4.162851e-05
## 7676     2 48044 4.162851e-05
## 7677     2 48044 4.162851e-05
## 7678     2 48044 4.162851e-05
## 7679     2 48044 4.162851e-05
## 7680     2 48044 4.162851e-05
## 7681     2 48044 4.162851e-05
## 7682     2 48044 4.162851e-05
## 7683     2 48044 4.162851e-05
## 7684     2 48044 4.162851e-05
## 7685     2 48044 4.162851e-05
## 7686     2 48044 4.162851e-05
## 7687     2 48044 4.162851e-05
## 7688     2 48044 4.162851e-05
## 7689     2 48044 4.162851e-05
## 7690     2 48044 4.162851e-05
## 7691     2 48044 4.162851e-05
## 7692     2 48044 4.162851e-05
## 7693     2 48044 4.162851e-05
## 7694     2 48044 4.162851e-05
## 7695     2 48044 4.162851e-05
## 7696     2 48044 4.162851e-05
## 7697     2 48044 4.162851e-05
## 7698     2 48044 4.162851e-05
## 7699     2 48044 4.162851e-05
## 7700     2 48044 4.162851e-05
## 7701     2 48044 4.162851e-05
## 7702     2 48044 4.162851e-05
## 7703     2 48044 4.162851e-05
## 7704     2 48044 4.162851e-05
## 7705     2 48044 4.162851e-05
## 7706     2 48044 4.162851e-05
## 7707     2 48044 4.162851e-05
## 7708     2 48044 4.162851e-05
## 7709     2 48044 4.162851e-05
## 7710     2 48044 4.162851e-05
## 7711     2 48044 4.162851e-05
## 7712     2 48044 4.162851e-05
## 7713     2 48044 4.162851e-05
## 7714     2 48044 4.162851e-05
## 7715     2 48044 4.162851e-05
## 7716     2 48044 4.162851e-05
## 7717     2 48044 4.162851e-05
## 7718     2 48044 4.162851e-05
## 7719     2 48044 4.162851e-05
## 7720     2 48044 4.162851e-05
## 7721     2 48044 4.162851e-05
## 7722     2 48044 4.162851e-05
## 7723     2 48044 4.162851e-05
## 7724     2 48044 4.162851e-05
## 7725     2 48044 4.162851e-05
## 7726     2 48044 4.162851e-05
## 7727     2 48044 4.162851e-05
## 7728     2 48044 4.162851e-05
## 7729     2 48044 4.162851e-05
## 7730     2 48044 4.162851e-05
## 7731     2 48044 4.162851e-05
## 7732     2 48044 4.162851e-05
## 7733     2 48044 4.162851e-05
## 7734     2 48044 4.162851e-05
## 7735     2 48044 4.162851e-05
## 7736     2 48044 4.162851e-05
## 7737     2 48044 4.162851e-05
## 7738     2 48044 4.162851e-05
## 7739     2 48044 4.162851e-05
## 7740     2 48044 4.162851e-05
## 7741     2 48044 4.162851e-05
## 7742     2 48044 4.162851e-05
## 7743     2 48044 4.162851e-05
## 7744     2 48044 4.162851e-05
## 7745     2 48044 4.162851e-05
## 7746     2 48044 4.162851e-05
## 7747     2 48044 4.162851e-05
## 7748     2 48044 4.162851e-05
## 7749     2 48044 4.162851e-05
## 7750     2 48044 4.162851e-05
## 7751     2 48044 4.162851e-05
## 7752     2 48044 4.162851e-05
## 7753     2 48044 4.162851e-05
## 7754     2 48044 4.162851e-05
## 7755     2 48044 4.162851e-05
## 7756     2 48044 4.162851e-05
## 7757     2 48044 4.162851e-05
## 7758     2 48044 4.162851e-05
## 7759     2 48044 4.162851e-05
## 7760     2 48044 4.162851e-05
## 7761     2 48044 4.162851e-05
## 7762     2 48044 4.162851e-05
## 7763     2 48044 4.162851e-05
## 7764     2 48044 4.162851e-05
## 7765     2 48044 4.162851e-05
## 7766     2 48044 4.162851e-05
## 7767     2 48044 4.162851e-05
## 7768     2 48044 4.162851e-05
## 7769     2 48044 4.162851e-05
## 7770     2 48044 4.162851e-05
## 7771     2 48044 4.162851e-05
## 7772     2 48044 4.162851e-05
## 7773     2 48044 4.162851e-05
## 7774     2 48044 4.162851e-05
## 7775     2 48044 4.162851e-05
## 7776     2 48044 4.162851e-05
## 7777     2 48044 4.162851e-05
## 7778     2 48044 4.162851e-05
## 7779     2 48044 4.162851e-05
## 7780     2 48044 4.162851e-05
## 7781     2 48044 4.162851e-05
## 7782     2 48044 4.162851e-05
## 7783     2 48044 4.162851e-05
## 7784     2 48044 4.162851e-05
## 7785     2 48044 4.162851e-05
## 7786     2 48044 4.162851e-05
## 7787     2 48044 4.162851e-05
## 7788     2 48044 4.162851e-05
## 7789     2 48044 4.162851e-05
## 7790     2 48044 4.162851e-05
## 7791     2 48044 4.162851e-05
## 7792     2 48044 4.162851e-05
## 7793     2 48044 4.162851e-05
## 7794     2 48044 4.162851e-05
## 7795     2 48044 4.162851e-05
## 7796     2 48044 4.162851e-05
## 7797     2 48044 4.162851e-05
## 7798     2 48044 4.162851e-05
## 7799     2 48044 4.162851e-05
## 7800     2 48044 4.162851e-05
## 7801     2 48044 4.162851e-05
## 7802     2 48044 4.162851e-05
## 7803     2 48044 4.162851e-05
## 7804     2 48044 4.162851e-05
## 7805     2 48044 4.162851e-05
## 7806     2 48044 4.162851e-05
## 7807     2 48044 4.162851e-05
## 7808     2 48044 4.162851e-05
## 7809     2 48044 4.162851e-05
## 7810     2 48044 4.162851e-05
## 7811     2 48044 4.162851e-05
## 7812     2 48044 4.162851e-05
## 7813     2 48044 4.162851e-05
## 7814     2 48044 4.162851e-05
## 7815     2 48044 4.162851e-05
## 7816     2 48044 4.162851e-05
## 7817     2 48044 4.162851e-05
## 7818     2 48044 4.162851e-05
## 7819     2 48044 4.162851e-05
## 7820     2 48044 4.162851e-05
## 7821     2 48044 4.162851e-05
## 7822     2 48044 4.162851e-05
## 7823     2 31391 6.371253e-05
## 7824     2 31391 6.371253e-05
## 7825     2 31391 6.371253e-05
## 7826     2 31391 6.371253e-05
## 7827     2 31391 6.371253e-05
## 7828     2 31391 6.371253e-05
## 7829     2 31391 6.371253e-05
## 7830     2 31391 6.371253e-05
## 7831     2 31391 6.371253e-05
## 7832     2 31391 6.371253e-05
## 7833     2 31391 6.371253e-05
## 7834     2 31391 6.371253e-05
## 7835     2 31391 6.371253e-05
## 7836     2 31391 6.371253e-05
## 7837     2 31391 6.371253e-05
## 7838     2 31391 6.371253e-05
## 7839     2 31391 6.371253e-05
## 7840     2 31391 6.371253e-05
## 7841     2 31391 6.371253e-05
## 7842     2 31391 6.371253e-05
## 7843     2 31391 6.371253e-05
## 7844     2 31391 6.371253e-05
## 7845     2 31391 6.371253e-05
## 7846     2 31391 6.371253e-05
## 7847     2 31391 6.371253e-05
## 7848     2 31391 6.371253e-05
## 7849     2 31391 6.371253e-05
## 7850     2 31391 6.371253e-05
## 7851     2 31391 6.371253e-05
## 7852     2 31391 6.371253e-05
## 7853     2 31391 6.371253e-05
## 7854     2 31391 6.371253e-05
## 7855     2 31391 6.371253e-05
## 7856     2 31391 6.371253e-05
## 7857     2 31391 6.371253e-05
## 7858     2 31391 6.371253e-05
## 7859     2 31391 6.371253e-05
## 7860     2 31391 6.371253e-05
## 7861     2 31391 6.371253e-05
## 7862     2 31391 6.371253e-05
## 7863     2 31391 6.371253e-05
## 7864     2 31391 6.371253e-05
## 7865     2 31391 6.371253e-05
## 7866     2 31391 6.371253e-05
## 7867     2 31391 6.371253e-05
## 7868     2 31391 6.371253e-05
## 7869     2 31391 6.371253e-05
## 7870     2 31391 6.371253e-05
## 7871     2 31391 6.371253e-05
## 7872     2 31391 6.371253e-05
## 7873     2 31391 6.371253e-05
## 7874     2 31391 6.371253e-05
## 7875     2 31391 6.371253e-05
## 7876     2 31391 6.371253e-05
## 7877     2 31391 6.371253e-05
## 7878     2 31391 6.371253e-05
## 7879     2 31391 6.371253e-05
## 7880     2 31391 6.371253e-05
## 7881     2 31391 6.371253e-05
## 7882     2 31391 6.371253e-05
## 7883     2 31391 6.371253e-05
## 7884     2 31391 6.371253e-05
## 7885     2 31391 6.371253e-05
## 7886     2 31391 6.371253e-05
## 7887     2 31391 6.371253e-05
## 7888     2 31391 6.371253e-05
## 7889     2 31391 6.371253e-05
## 7890     2 31391 6.371253e-05
## 7891     2 31391 6.371253e-05
## 7892     2 31391 6.371253e-05
## 7893     2 31391 6.371253e-05
## 7894     2 31391 6.371253e-05
## 7895     2 31391 6.371253e-05
## 7896     2 31391 6.371253e-05
## 7897     2 31391 6.371253e-05
## 7898     2 31391 6.371253e-05
## 7899     2 31391 6.371253e-05
## 7900     2 31391 6.371253e-05
## 7901     2 31391 6.371253e-05
## 7902     2 31391 6.371253e-05
## 7903     2 31391 6.371253e-05
## 7904     2 31391 6.371253e-05
## 7905     2 31391 6.371253e-05
## 7906     2 31391 6.371253e-05
## 7907     2 31391 6.371253e-05
## 7908     2 31391 6.371253e-05
## 7909     2 31391 6.371253e-05
## 7910     2 31391 6.371253e-05
## 7911     2 31391 6.371253e-05
## 7912     2 31391 6.371253e-05
## 7913     2 31391 6.371253e-05
## 7914     2 31391 6.371253e-05
## 7915     2 31391 6.371253e-05
## 7916     2 31391 6.371253e-05
## 7917     2 31391 6.371253e-05
## 7918     2 31391 6.371253e-05
## 7919     2 31391 6.371253e-05
## 7920     2 31391 6.371253e-05
## 7921     2 31391 6.371253e-05
## 7922     2 31391 6.371253e-05
## 7923     2 31391 6.371253e-05
## 7924     2 31391 6.371253e-05
## 7925     2 31391 6.371253e-05
## 7926     2 31391 6.371253e-05
## 7927     2 31391 6.371253e-05
## 7928     2 31391 6.371253e-05
## 7929     2 31391 6.371253e-05
## 7930     2 31391 6.371253e-05
## 7931     2 31391 6.371253e-05
## 7932     2 31391 6.371253e-05
## 7933     2 31391 6.371253e-05
## 7934     2 31391 6.371253e-05
## 7935     2 31391 6.371253e-05
## 7936     2 31391 6.371253e-05
## 7937     2 31391 6.371253e-05
## 7938     2 31391 6.371253e-05
## 7939     2 31391 6.371253e-05
## 7940     2 31391 6.371253e-05
## 7941     2 31391 6.371253e-05
## 7942     2 31391 6.371253e-05
## 7943     2 31391 6.371253e-05
## 7944     2 31391 6.371253e-05
## 7945     2 31391 6.371253e-05
## 7946     2 31391 6.371253e-05
## 7947     2 31391 6.371253e-05
## 7948     2 31391 6.371253e-05
## 7949     2 31391 6.371253e-05
## 7950     2 31391 6.371253e-05
## 7951     2 31391 6.371253e-05
## 7952     2 31391 6.371253e-05
## 7953     2 31391 6.371253e-05
## 7954     2 31391 6.371253e-05
## 7955     2 31391 6.371253e-05
## 7956     2 31391 6.371253e-05
## 7957     2 31391 6.371253e-05
## 7958     2 31391 6.371253e-05
## 7959     2 31391 6.371253e-05
## 7960     2 31391 6.371253e-05
## 7961     2 31391 6.371253e-05
## 7962     2 31391 6.371253e-05
## 7963     2 31391 6.371253e-05
## 7964     2 31391 6.371253e-05
## 7965     2 31391 6.371253e-05
## 7966     2 31391 6.371253e-05
## 7967     2 31391 6.371253e-05
## 7968     2 31391 6.371253e-05
## 7969     2 31391 6.371253e-05
## 7970     2 31391 6.371253e-05
## 7971     2 31391 6.371253e-05
## 7972     2 31391 6.371253e-05
## 7973     2 31391 6.371253e-05
## 7974     2 31391 6.371253e-05
## 7975     2 31391 6.371253e-05
## 7976     2 31391 6.371253e-05
## 7977     2 31391 6.371253e-05
## 7978     2 31391 6.371253e-05
## 7979     2 31391 6.371253e-05
## 7980     2 31391 6.371253e-05
## 7981     2 31391 6.371253e-05
## 7982     2 31391 6.371253e-05
## 7983     2 31391 6.371253e-05
## 7984     2 31391 6.371253e-05
## 7985     2 31391 6.371253e-05
## 7986     2 31391 6.371253e-05
## 7987     2 31391 6.371253e-05
## 7988     2 31391 6.371253e-05
## 7989     2 31391 6.371253e-05
## 7990     2 31391 6.371253e-05
## 7991     2 31391 6.371253e-05
## 7992     2 31391 6.371253e-05
## 7993     2 31391 6.371253e-05
## 7994     2 31391 6.371253e-05
## 7995     2 31391 6.371253e-05
## 7996     2 31391 6.371253e-05
## 7997     2 31391 6.371253e-05
## 7998     2 31391 6.371253e-05
## 7999     2 31391 6.371253e-05
## 8000     2 31391 6.371253e-05
## 8001     2 31391 6.371253e-05
## 8002     2 31391 6.371253e-05
## 8003     2 31391 6.371253e-05
## 8004     2 31391 6.371253e-05
## 8005     2 31391 6.371253e-05
## 8006     2 31391 6.371253e-05
## 8007     2 31391 6.371253e-05
## 8008     2 31391 6.371253e-05
## 8009     2 31391 6.371253e-05
## 8010     2 31391 6.371253e-05
## 8011     2 31391 6.371253e-05
## 8012     2 31391 6.371253e-05
## 8013     2 31391 6.371253e-05
## 8014     2 31391 6.371253e-05
## 8015     2 31391 6.371253e-05
## 8016     2 31391 6.371253e-05
## 8017     2 31391 6.371253e-05
## 8018     2 31391 6.371253e-05
## 8019     2 31391 6.371253e-05
## 8020     2 31391 6.371253e-05
## 8021     2 31391 6.371253e-05
## 8022     2 31391 6.371253e-05
## 8023     2 31391 6.371253e-05
## 8024     2 31391 6.371253e-05
## 8025     2 31391 6.371253e-05
## 8026     2 31391 6.371253e-05
## 8027     2 31391 6.371253e-05
## 8028     2 31391 6.371253e-05
## 8029     2 31391 6.371253e-05
## 8030     2 31391 6.371253e-05
## 8031     2 31391 6.371253e-05
## 8032     2 31391 6.371253e-05
## 8033     2 31391 6.371253e-05
## 8034     2 31391 6.371253e-05
## 8035     2 31391 6.371253e-05
## 8036     2 31391 6.371253e-05
## 8037     2 31391 6.371253e-05
## 8038     2 31391 6.371253e-05
## 8039     2 31391 6.371253e-05
## 8040     2 31391 6.371253e-05
## 8041     2 31391 6.371253e-05
## 8042     2 31391 6.371253e-05
## 8043     2 31391 6.371253e-05
## 8044     2 31391 6.371253e-05
## 8045     2 31391 6.371253e-05
## 8046     2 31391 6.371253e-05
## 8047     2 31391 6.371253e-05
## 8048     2 31391 6.371253e-05
## 8049     2 31391 6.371253e-05
## 8050     2 31391 6.371253e-05
## 8051     2 31391 6.371253e-05
## 8052     2 31391 6.371253e-05
## 8053     2 31391 6.371253e-05
## 8054     2 31391 6.371253e-05
## 8055     2 31391 6.371253e-05
## 8056     2 31391 6.371253e-05
## 8057     2 31391 6.371253e-05
## 8058     2 31391 6.371253e-05
## 8059     2 31391 6.371253e-05
## 8060     2 31391 6.371253e-05
## 8061     2 31391 6.371253e-05
## 8062     2 31391 6.371253e-05
## 8063     2 31391 6.371253e-05
## 8064     2 31391 6.371253e-05
## 8065     2 31391 6.371253e-05
## 8066     2 31391 6.371253e-05
## 8067     2 31391 6.371253e-05
## 8068     2 31391 6.371253e-05
## 8069     2 31391 6.371253e-05
## 8070     2 31391 6.371253e-05
## 8071     2 31391 6.371253e-05
## 8072     2 31391 6.371253e-05
## 8073     2 31391 6.371253e-05
## 8074     2 31391 6.371253e-05
## 8075     2 31391 6.371253e-05
## 8076     2 31391 6.371253e-05
## 8077     2 31391 6.371253e-05
## 8078     2 31391 6.371253e-05
## 8079     2 31391 6.371253e-05
## 8080     2 31391 6.371253e-05
## 8081     2 31391 6.371253e-05
## 8082     2 31391 6.371253e-05
## 8083     2 31391 6.371253e-05
## 8084     2 31391 6.371253e-05
## 8085     2 31391 6.371253e-05
## 8086     2 31391 6.371253e-05
## 8087     2 31391 6.371253e-05
## 8088     2 31391 6.371253e-05
## 8089     2 31391 6.371253e-05
## 8090     2 31391 6.371253e-05
## 8091     2 31391 6.371253e-05
## 8092     2 31391 6.371253e-05
## 8093     2 31391 6.371253e-05
## 8094     2 31391 6.371253e-05
## 8095     2 31391 6.371253e-05
## 8096     2 31391 6.371253e-05
## 8097     2 31391 6.371253e-05
## 8098     2 31391 6.371253e-05
## 8099     2 31391 6.371253e-05
## 8100     2 31391 6.371253e-05
## 8101     2 31391 6.371253e-05
## 8102     2 31391 6.371253e-05
## 8103     2 31391 6.371253e-05
## 8104     2 31391 6.371253e-05
## 8105     2 31391 6.371253e-05
## 8106     2 31391 6.371253e-05
## 8107     2 31391 6.371253e-05
## 8108     2 31391 6.371253e-05
## 8109     2 31391 6.371253e-05
## 8110     2 31391 6.371253e-05
## 8111     2 31391 6.371253e-05
## 8112     2 31391 6.371253e-05
## 8113     2 31391 6.371253e-05
## 8114     2 31391 6.371253e-05
## 8115     2 31391 6.371253e-05
## 8116     2 31391 6.371253e-05
## 8117     2 31391 6.371253e-05
## 8118     2 31391 6.371253e-05
## 8119     2 31391 6.371253e-05
## 8120     2 31391 6.371253e-05
## 8121     2 31391 6.371253e-05
## 8122     2 31391 6.371253e-05
## 8123     2 31391 6.371253e-05
## 8124     2 31391 6.371253e-05
## 8125     2 31391 6.371253e-05
## 8126     2 31391 6.371253e-05
## 8127     2 31391 6.371253e-05
## 8128     2 31391 6.371253e-05
## 8129     2 31391 6.371253e-05
## 8130     2 31391 6.371253e-05
## 8131     2 31391 6.371253e-05
## 8132     2 31391 6.371253e-05
## 8133     2 31391 6.371253e-05
## 8134     2 31391 6.371253e-05
## 8135     2 31391 6.371253e-05
## 8136     2 31391 6.371253e-05
## 8137     2 31391 6.371253e-05
## 8138     2 31391 6.371253e-05
## 8139     2 31391 6.371253e-05
## 8140     2 31391 6.371253e-05
## 8141     2 31391 6.371253e-05
## 8142     2 31391 6.371253e-05
## 8143     2 31391 6.371253e-05
## 8144     2 31391 6.371253e-05
## 8145     2 31391 6.371253e-05
## 8146     2 31391 6.371253e-05
## 8147     2 31391 6.371253e-05
## 8148     2 31391 6.371253e-05
## 8149     2 31391 6.371253e-05
## 8150     2 31391 6.371253e-05
## 8151     2 31391 6.371253e-05
## 8152     2 31391 6.371253e-05
## 8153     2 31391 6.371253e-05
## 8154     2 31391 6.371253e-05
## 8155     2 31391 6.371253e-05
## 8156     2 31391 6.371253e-05
## 8157     2 31391 6.371253e-05
## 8158     2 31391 6.371253e-05
## 8159     2 31391 6.371253e-05
## 8160     2 31391 6.371253e-05
## 8161     2 31391 6.371253e-05
## 8162     2 31391 6.371253e-05
## 8163     2 31391 6.371253e-05
## 8164     2 31391 6.371253e-05
## 8165     2 31391 6.371253e-05
## 8166     2 31391 6.371253e-05
## 8167     2 31391 6.371253e-05
## 8168     2 31391 6.371253e-05
## 8169     2 31391 6.371253e-05
## 8170     2 31391 6.371253e-05
## 8171     2 31391 6.371253e-05
## 8172     2 31391 6.371253e-05
## 8173     2 31391 6.371253e-05
## 8174     2 31391 6.371253e-05
## 8175     2 31391 6.371253e-05
## 8176     2 31391 6.371253e-05
## 8177     2 31391 6.371253e-05
## 8178     2 31391 6.371253e-05
## 8179     2 31391 6.371253e-05
## 8180     2 31391 6.371253e-05
## 8181     2 31391 6.371253e-05
## 8182     2 31391 6.371253e-05
## 8183     2 31391 6.371253e-05
## 8184     2 31391 6.371253e-05
## 8185     2 31391 6.371253e-05
## 8186     2 31391 6.371253e-05
## 8187     2 31391 6.371253e-05
## 8188     2 31391 6.371253e-05
## 8189     2 31391 6.371253e-05
## 8190     2 31391 6.371253e-05
## 8191     2 31391 6.371253e-05
## 8192     2 31391 6.371253e-05
## 8193     2 31391 6.371253e-05
## 8194     2 31391 6.371253e-05
## 8195     2 31391 6.371253e-05
## 8196     2 31391 6.371253e-05
## 8197     2 31391 6.371253e-05
## 8198     2 31391 6.371253e-05
## 8199     2 31391 6.371253e-05
## 8200     2 31391 6.371253e-05
## 8201     2 31391 6.371253e-05
## 8202     2 31391 6.371253e-05
## 8203     2 31391 6.371253e-05
## 8204     2 31391 6.371253e-05
## 8205     2 31391 6.371253e-05
## 8206     2 31391 6.371253e-05
## 8207     2 31391 6.371253e-05
## 8208     2 31391 6.371253e-05
## 8209     2 31391 6.371253e-05
## 8210     2 31391 6.371253e-05
## 8211     2 31391 6.371253e-05
## 8212     2 31391 6.371253e-05
## 8213     2 31391 6.371253e-05
## 8214     2 31391 6.371253e-05
## 8215     2 31391 6.371253e-05
## 8216     2 31391 6.371253e-05
## 8217     2 31391 6.371253e-05
## 8218     2 31391 6.371253e-05
## 8219     2 31391 6.371253e-05
## 8220     2 31391 6.371253e-05
## 8221     2 31391 6.371253e-05
## 8222     2 31391 6.371253e-05
## 8223     2 31391 6.371253e-05
## 8224     2 31391 6.371253e-05
## 8225     2 31391 6.371253e-05
## 8226     2 31391 6.371253e-05
## 8227     2 31391 6.371253e-05
## 8228     2 31391 6.371253e-05
## 8229     2 31391 6.371253e-05
## 8230     2 31391 6.371253e-05
## 8231     2 31391 6.371253e-05
## 8232     2 31391 6.371253e-05
## 8233     2 31391 6.371253e-05
## 8234     2 31391 6.371253e-05
## 8235     2 31391 6.371253e-05
## 8236     2 31391 6.371253e-05
## 8237     2 31391 6.371253e-05
## 8238     2 31391 6.371253e-05
## 8239     2 31391 6.371253e-05
## 8240     2 31391 6.371253e-05
## 8241     2 31391 6.371253e-05
## 8242     2 31391 6.371253e-05
## 8243     2 31391 6.371253e-05
## 8244     2 31391 6.371253e-05
## 8245     2 31391 6.371253e-05
## 8246     2 31391 6.371253e-05
## 8247     2 31391 6.371253e-05
## 8248     2 31391 6.371253e-05
## 8249     2 31391 6.371253e-05
## 8250     2 31391 6.371253e-05
## 8251     2 31391 6.371253e-05
## 8252     2 31391 6.371253e-05
## 8253     2 31391 6.371253e-05
## 8254     2 31391 6.371253e-05
## 8255     2 31391 6.371253e-05
## 8256     2 31391 6.371253e-05
## 8257     2 31391 6.371253e-05
## 8258     2 31391 6.371253e-05
## 8259     2 31391 6.371253e-05
## 8260     2 31391 6.371253e-05
## 8261     2 31391 6.371253e-05
## 8262     2 31391 6.371253e-05
## 8263     2 31391 6.371253e-05
## 8264     2 31391 6.371253e-05
## 8265     2 31391 6.371253e-05
## 8266     2 31391 6.371253e-05
## 8267     2 31391 6.371253e-05
## 8268     2 31391 6.371253e-05
## 8269     2 31391 6.371253e-05
## 8270     2 31391 6.371253e-05
## 8271     2 31391 6.371253e-05
## 8272     2 31391 6.371253e-05
## 8273     2 31391 6.371253e-05
## 8274     2 31391 6.371253e-05
## 8275     2 31391 6.371253e-05
## 8276     2 31391 6.371253e-05
## 8277     2 31391 6.371253e-05
## 8278     2 31391 6.371253e-05
## 8279     2 31391 6.371253e-05
## 8280     2 31391 6.371253e-05
## 8281     2 31391 6.371253e-05
## 8282     2 31391 6.371253e-05
## 8283     2 31391 6.371253e-05
## 8284     2 31391 6.371253e-05
## 8285     2 31391 6.371253e-05
## 8286     2 31391 6.371253e-05
## 8287     2 31391 6.371253e-05
## 8288     2 31391 6.371253e-05
## 8289     2 31391 6.371253e-05
## 8290     2 31391 6.371253e-05
## 8291     2 31391 6.371253e-05
## 8292     2 31391 6.371253e-05
## 8293     2 31391 6.371253e-05
## 8294     2 31391 6.371253e-05
## 8295     2 31391 6.371253e-05
## 8296     2 31391 6.371253e-05
## 8297     2 31391 6.371253e-05
## 8298     2 31391 6.371253e-05
## 8299     2 31391 6.371253e-05
## 8300     2 31391 6.371253e-05
## 8301     2 31391 6.371253e-05
## 8302     2 31391 6.371253e-05
## 8303     2 31391 6.371253e-05
## 8304     2 31391 6.371253e-05
## 8305     2 31391 6.371253e-05
## 8306     2 31391 6.371253e-05
## 8307     2 31391 6.371253e-05
## 8308     2 31391 6.371253e-05
## 8309     2 31391 6.371253e-05
## 8310     2 31391 6.371253e-05
## 8311     2 31391 6.371253e-05
## 8312     2 31391 6.371253e-05
## 8313     2 31391 6.371253e-05
## 8314     2 31391 6.371253e-05
## 8315     2 31391 6.371253e-05
## 8316     2 31391 6.371253e-05
## 8317     2 31391 6.371253e-05
## 8318     2 31391 6.371253e-05
## 8319     2 31391 6.371253e-05
## 8320     2 31391 6.371253e-05
## 8321     2 31391 6.371253e-05
## 8322     2 31391 6.371253e-05
## 8323     2 31391 6.371253e-05
## 8324     2 31391 6.371253e-05
## 8325     2 31391 6.371253e-05
## 8326     2 31391 6.371253e-05
## 8327     2 31391 6.371253e-05
## 8328     2 31391 6.371253e-05
## 8329     2 31391 6.371253e-05
## 8330     2 31391 6.371253e-05
## 8331     2 31391 6.371253e-05
## 8332     2 31391 6.371253e-05
## 8333     2 31391 6.371253e-05
## 8334     2 31391 6.371253e-05
## 8335     2 31391 6.371253e-05
## 8336     2 31391 6.371253e-05
## 8337     2 31391 6.371253e-05
## 8338     2 31391 6.371253e-05
## 8339     2 31391 6.371253e-05
## 8340     2 31391 6.371253e-05
## 8341     2 31391 6.371253e-05
## 8342     2 31391 6.371253e-05
## 8343     2 31391 6.371253e-05
## 8344     2 31391 6.371253e-05
## 8345     2 31391 6.371253e-05
## 8346     2 31391 6.371253e-05
## 8347     2 31391 6.371253e-05
## 8348     2 31391 6.371253e-05
## 8349     2 31391 6.371253e-05
## 8350     2 31391 6.371253e-05
## 8351     2 31391 6.371253e-05
## 8352     2 31391 6.371253e-05
## 8353     2 31391 6.371253e-05
## 8354     2 31391 6.371253e-05
## 8355     2 31391 6.371253e-05
## 8356     2 31391 6.371253e-05
## 8357     2 31391 6.371253e-05
## 8358     2 31391 6.371253e-05
## 8359     2 31391 6.371253e-05
## 8360     2 31391 6.371253e-05
## 8361     2 31391 6.371253e-05
## 8362     2 31391 6.371253e-05
## 8363     2 31391 6.371253e-05
## 8364     2 31391 6.371253e-05
## 8365     2 31391 6.371253e-05
## 8366     2 31391 6.371253e-05
## 8367     2 31391 6.371253e-05
## 8368     2 31391 6.371253e-05
## 8369     2 31391 6.371253e-05
## 8370     2 31391 6.371253e-05
## 8371     2 31391 6.371253e-05
## 8372     2 31391 6.371253e-05
## 8373     2 31391 6.371253e-05
## 8374     2 31391 6.371253e-05
## 8375     2 31391 6.371253e-05
## 8376     2 31391 6.371253e-05
## 8377     2 31391 6.371253e-05
## 8378     2 31391 6.371253e-05
## 8379     2 31391 6.371253e-05
## 8380     2 31391 6.371253e-05
## 8381     2 31391 6.371253e-05
## 8382     2 31391 6.371253e-05
## 8383     2 31391 6.371253e-05
## 8384     2 31391 6.371253e-05
## 8385     2 31391 6.371253e-05
## 8386     2 31391 6.371253e-05
## 8387     2 31391 6.371253e-05
## 8388     2 31391 6.371253e-05
## 8389     2 31391 6.371253e-05
## 8390     2 31391 6.371253e-05
## 8391     2 31391 6.371253e-05
## 8392     2 31391 6.371253e-05
## 8393     2 31391 6.371253e-05
## 8394     2 31391 6.371253e-05
## 8395     2 31391 6.371253e-05
## 8396     2 31391 6.371253e-05
## 8397     2 31391 6.371253e-05
## 8398     2 31391 6.371253e-05
## 8399     2 31391 6.371253e-05
## 8400     2 31391 6.371253e-05
## 8401     2 31391 6.371253e-05
## 8402     2 31391 6.371253e-05
## 8403     2 31391 6.371253e-05
## 8404     2 31391 6.371253e-05
## 8405     2 31391 6.371253e-05
## 8406     2 31391 6.371253e-05
## 8407     2 31391 6.371253e-05
## 8408     2 31391 6.371253e-05
## 8409     2 31391 6.371253e-05
## 8410     2 31391 6.371253e-05
## 8411     2 31391 6.371253e-05
## 8412     2 31391 6.371253e-05
## 8413     2 31391 6.371253e-05
## 8414     2 31391 6.371253e-05
## 8415     2 31391 6.371253e-05
## 8416     2 31391 6.371253e-05
## 8417     2 31391 6.371253e-05
## 8418     2 31391 6.371253e-05
## 8419     2 31391 6.371253e-05
## 8420     2 31391 6.371253e-05
## 8421     2 31391 6.371253e-05
## 8422     2 31391 6.371253e-05
## 8423     2 31391 6.371253e-05
## 8424     2 31391 6.371253e-05
## 8425     2 31391 6.371253e-05
## 8426     2 31391 6.371253e-05
## 8427     2 31391 6.371253e-05
## 8428     2 31391 6.371253e-05
## 8429     2 31391 6.371253e-05
## 8430     2 31391 6.371253e-05
## 8431     2 31391 6.371253e-05
## 8432     2 31391 6.371253e-05
## 8433     2 31391 6.371253e-05
## 8434     2 31391 6.371253e-05
## 8435     2 31391 6.371253e-05
## 8436     2 31391 6.371253e-05
## 8437     2 31391 6.371253e-05
## 8438     2 31391 6.371253e-05
## 8439     2 31391 6.371253e-05
## 8440     2 31391 6.371253e-05
## 8441     2 31391 6.371253e-05
## 8442     2 31391 6.371253e-05
## 8443     2 31391 6.371253e-05
## 8444     2 31391 6.371253e-05
## 8445     2 31391 6.371253e-05
## 8446     2 31391 6.371253e-05
## 8447     2 31391 6.371253e-05
## 8448     2 31391 6.371253e-05
## 8449     2 31391 6.371253e-05
## 8450     2 31391 6.371253e-05
## 8451     2 31391 6.371253e-05
## 8452     2 31391 6.371253e-05
## 8453     2 31391 6.371253e-05
## 8454     2 31391 6.371253e-05
## 8455     2 31391 6.371253e-05
## 8456     2 31391 6.371253e-05
## 8457     2 31391 6.371253e-05
## 8458     2 31391 6.371253e-05
## 8459     2 31391 6.371253e-05
## 8460     2 31391 6.371253e-05
## 8461     2 31391 6.371253e-05
## 8462     2 31391 6.371253e-05
## 8463     2 31391 6.371253e-05
## 8464     2 31391 6.371253e-05
## 8465     2 31391 6.371253e-05
## 8466     2 31391 6.371253e-05
## 8467     2 31391 6.371253e-05
## 8468     2 31391 6.371253e-05
## 8469     2 31391 6.371253e-05
## 8470     2 31391 6.371253e-05
## 8471     2 31391 6.371253e-05
## 8472     2 31391 6.371253e-05
## 8473     2 31391 6.371253e-05
## 8474     2 31391 6.371253e-05
## 8475     2 31391 6.371253e-05
## 8476     2 31391 6.371253e-05
## 8477     2 31391 6.371253e-05
## 8478     2 31391 6.371253e-05
## 8479     2 31391 6.371253e-05
## 8480     2 31391 6.371253e-05
## 8481     2 31391 6.371253e-05
## 8482     2 31391 6.371253e-05
## 8483     2 31391 6.371253e-05
## 8484     2 31391 6.371253e-05
## 8485     2 31391 6.371253e-05
## 8486     2 31391 6.371253e-05
## 8487     2 31391 6.371253e-05
## 8488     2 31391 6.371253e-05
## 8489     2 31391 6.371253e-05
## 8490     2 31391 6.371253e-05
## 8491     2 31391 6.371253e-05
## 8492     2 31391 6.371253e-05
## 8493     2 31391 6.371253e-05
## 8494     2 31391 6.371253e-05
## 8495     2 31391 6.371253e-05
## 8496     2 31391 6.371253e-05
## 8497     2 31391 6.371253e-05
## 8498     2 31391 6.371253e-05
## 8499     2 31391 6.371253e-05
## 8500     2 31391 6.371253e-05
## 8501     2 31391 6.371253e-05
## 8502     2 31391 6.371253e-05
## 8503     2 31391 6.371253e-05
## 8504     2 31391 6.371253e-05
## 8505     2 31391 6.371253e-05
## 8506     2 31391 6.371253e-05
## 8507     2 31391 6.371253e-05
## 8508     2 31391 6.371253e-05
## 8509     2 31391 6.371253e-05
## 8510     2 31391 6.371253e-05
## 8511     2 31391 6.371253e-05
## 8512     2 31391 6.371253e-05
## 8513     2 31391 6.371253e-05
## 8514     2 31391 6.371253e-05
## 8515     2 31391 6.371253e-05
## 8516     2 31391 6.371253e-05
## 8517     2 31391 6.371253e-05
## 8518     2 31391 6.371253e-05
## 8519     2 31391 6.371253e-05
## 8520     2 31391 6.371253e-05
## 8521     2 31391 6.371253e-05
## 8522     2 31391 6.371253e-05
## 8523     2 31391 6.371253e-05
## 8524     2 31391 6.371253e-05
## 8525     2 31391 6.371253e-05
## 8526     2 31391 6.371253e-05
## 8527     2 31391 6.371253e-05
## 8528     2 31391 6.371253e-05
## 8529     2 31391 6.371253e-05
## 8530     2 31391 6.371253e-05
## 8531     2 31391 6.371253e-05
## 8532     2 31391 6.371253e-05
## 8533     2 31391 6.371253e-05
## 8534     2 31391 6.371253e-05
## 8535     2 31391 6.371253e-05
## 8536     2 31391 6.371253e-05
## 8537     2 31391 6.371253e-05
## 8538     2 31391 6.371253e-05
## 8539     2 31391 6.371253e-05
## 8540     2 31391 6.371253e-05
## 8541     2 31391 6.371253e-05
## 8542     2 31391 6.371253e-05
## 8543     2 31391 6.371253e-05
## 8544     2 31391 6.371253e-05
## 8545     2 31391 6.371253e-05
## 8546     2 31391 6.371253e-05
## 8547     2 31391 6.371253e-05
## 8548     2 31391 6.371253e-05
## 8549     2 31391 6.371253e-05
## 8550     2 31391 6.371253e-05
## 8551     2 31391 6.371253e-05
## 8552     2 31391 6.371253e-05
## 8553     2 31391 6.371253e-05
## 8554     2 31391 6.371253e-05
## 8555     2 31391 6.371253e-05
## 8556     2 31391 6.371253e-05
## 8557     2 31391 6.371253e-05
## 8558     2 31391 6.371253e-05
## 8559     2 31391 6.371253e-05
## 8560     2 31391 6.371253e-05
## 8561     2 31391 6.371253e-05
## 8562     2 31391 6.371253e-05
## 8563     2 31391 6.371253e-05
## 8564     2 31391 6.371253e-05
## 8565     2 31391 6.371253e-05
## 8566     2 31391 6.371253e-05
## 8567     2 31391 6.371253e-05
## 8568     2 31391 6.371253e-05
## 8569     2 31391 6.371253e-05
## 8570     2 31391 6.371253e-05
## 8571     2 31391 6.371253e-05
## 8572     2 31391 6.371253e-05
## 8573     2 31391 6.371253e-05
## 8574     2 31391 6.371253e-05
## 8575     2 31391 6.371253e-05
## 8576     2 31391 6.371253e-05
## 8577     2 31391 6.371253e-05
## 8578     2 31391 6.371253e-05
## 8579     2 31391 6.371253e-05
## 8580     2 31391 6.371253e-05
## 8581     2 31391 6.371253e-05
## 8582     2 31391 6.371253e-05
## 8583     2 31391 6.371253e-05
## 8584     2 31391 6.371253e-05
## 8585     2 31391 6.371253e-05
## 8586     2 31391 6.371253e-05
## 8587     2 31391 6.371253e-05
## 8588     2 31391 6.371253e-05
## 8589     2 31391 6.371253e-05
## 8590     2 31391 6.371253e-05
## 8591     2 31391 6.371253e-05
## 8592     2 31391 6.371253e-05
## 8593     2 31391 6.371253e-05
## 8594     2 31391 6.371253e-05
## 8595     2 31391 6.371253e-05
## 8596     2 31391 6.371253e-05
## 8597     2 31391 6.371253e-05
## 8598     2 31391 6.371253e-05
## 8599     2 31391 6.371253e-05
## 8600     2 31391 6.371253e-05
## 8601     2 31391 6.371253e-05
## 8602     2 31391 6.371253e-05
## 8603     2 31391 6.371253e-05
## 8604     2 31391 6.371253e-05
## 8605     2 31391 6.371253e-05
## 8606     2 31391 6.371253e-05
## 8607     2 31391 6.371253e-05
## 8608     2 31391 6.371253e-05
## 8609     2 31391 6.371253e-05
## 8610     2 31391 6.371253e-05
## 8611     2 31391 6.371253e-05
## 8612     2 31391 6.371253e-05
## 8613     2 31391 6.371253e-05
## 8614     2 31391 6.371253e-05
## 8615     2 31391 6.371253e-05
## 8616     2 31391 6.371253e-05
## 8617     2 31391 6.371253e-05
## 8618     2 31391 6.371253e-05
## 8619     2 31391 6.371253e-05
## 8620     2 31391 6.371253e-05
## 8621     2 31391 6.371253e-05
## 8622     2 31391 6.371253e-05
## 8623     2 31391 6.371253e-05
## 8624     2 31391 6.371253e-05
## 8625     2 31391 6.371253e-05
## 8626     2 31391 6.371253e-05
## 8627     2 31391 6.371253e-05
## 8628     2 31391 6.371253e-05
## 8629     2 31391 6.371253e-05
## 8630     2 31391 6.371253e-05
## 8631     2 31391 6.371253e-05
## 8632     2 31391 6.371253e-05
## 8633     2 31391 6.371253e-05
## 8634     2 31391 6.371253e-05
## 8635     2 31391 6.371253e-05
## 8636     2 31391 6.371253e-05
## 8637     2 31391 6.371253e-05
## 8638     2 31391 6.371253e-05
## 8639     2 31391 6.371253e-05
## 8640     2 31391 6.371253e-05
## 8641     2 31391 6.371253e-05
## 8642     2 31391 6.371253e-05
## 8643     2 31391 6.371253e-05
## 8644     2 31391 6.371253e-05
## 8645     2 31391 6.371253e-05
## 8646     2 31391 6.371253e-05
## 8647     2 31391 6.371253e-05
## 8648     2 31391 6.371253e-05
## 8649     2 31391 6.371253e-05
## 8650     2 31391 6.371253e-05
## 8651     2 31391 6.371253e-05
## 8652     2 31391 6.371253e-05
## 8653     2 31391 6.371253e-05
## 8654     2 31391 6.371253e-05
## 8655     2 31391 6.371253e-05
## 8656     2 31391 6.371253e-05
## 8657     2 31391 6.371253e-05
## 8658     2 31391 6.371253e-05
## 8659     2 31391 6.371253e-05
## 8660     2 31391 6.371253e-05
## 8661     2 31391 6.371253e-05
## 8662     2 31391 6.371253e-05
## 8663     2 31391 6.371253e-05
## 8664     2 31391 6.371253e-05
## 8665     2 31391 6.371253e-05
## 8666     2 31391 6.371253e-05
## 8667     2 31391 6.371253e-05
## 8668     2 31391 6.371253e-05
## 8669     2 31391 6.371253e-05
## 8670     2 31391 6.371253e-05
## 8671     2 31391 6.371253e-05
## 8672     2 31391 6.371253e-05
## 8673     2 31391 6.371253e-05
## 8674     2 31391 6.371253e-05
## 8675     2 31391 6.371253e-05
## 8676     2 31391 6.371253e-05
## 8677     2 31391 6.371253e-05
## 8678     2 31391 6.371253e-05
## 8679     2 31391 6.371253e-05
## 8680     2 31391 6.371253e-05
## 8681     2 31391 6.371253e-05
## 8682     2 31391 6.371253e-05
## 8683     2 31391 6.371253e-05
## 8684     2 31391 6.371253e-05
## 8685     2 31391 6.371253e-05
## 8686     2 31391 6.371253e-05
## 8687     2 31391 6.371253e-05
## 8688     2 31391 6.371253e-05
## 8689     2 31391 6.371253e-05
## 8690     2 31391 6.371253e-05
## 8691     2 31391 6.371253e-05
## 8692     2 31391 6.371253e-05
## 8693     2 31391 6.371253e-05
## 8694     2 31391 6.371253e-05
## 8695     2 31391 6.371253e-05
## 8696     2 31391 6.371253e-05
## 8697     2 31391 6.371253e-05
## 8698     2 31391 6.371253e-05
## 8699     2 31391 6.371253e-05
## 8700     2 31391 6.371253e-05
## 8701     2 31391 6.371253e-05
## 8702     2 31391 6.371253e-05
## 8703     2 31391 6.371253e-05
## 8704     2 31391 6.371253e-05
## 8705     2 31391 6.371253e-05
## 8706     2 31391 6.371253e-05
## 8707     2 31391 6.371253e-05
## 8708     2 31391 6.371253e-05
## 8709     2 31391 6.371253e-05
## 8710     2 31391 6.371253e-05
## 8711     2 31391 6.371253e-05
## 8712     2 31391 6.371253e-05
## 8713     2 31391 6.371253e-05
## 8714     2 31391 6.371253e-05
## 8715     2 31391 6.371253e-05
## 8716     2 31391 6.371253e-05
## 8717     2 31391 6.371253e-05
## 8718     2 31391 6.371253e-05
## 8719     2 31391 6.371253e-05
## 8720     2 31391 6.371253e-05
## 8721     2 31391 6.371253e-05
## 8722     2 31391 6.371253e-05
## 8723     2 31391 6.371253e-05
## 8724     2 31391 6.371253e-05
## 8725     2 31391 6.371253e-05
## 8726     2 31391 6.371253e-05
## 8727     2 31391 6.371253e-05
## 8728     2 31391 6.371253e-05
## 8729     2 31391 6.371253e-05
## 8730     2 31391 6.371253e-05
## 8731     2 31391 6.371253e-05
## 8732     2 31391 6.371253e-05
## 8733     2 31391 6.371253e-05
## 8734     2 31391 6.371253e-05
## 8735     2 31391 6.371253e-05
## 8736     2 31391 6.371253e-05
## 8737     2 31391 6.371253e-05
## 8738     2 31391 6.371253e-05
## 8739     2 31391 6.371253e-05
## 8740     2 31391 6.371253e-05
## 8741     2 31391 6.371253e-05
## 8742     2 31391 6.371253e-05
## 8743     2 31391 6.371253e-05
## 8744     2 31391 6.371253e-05
## 8745     2 31391 6.371253e-05
## 8746     2 31391 6.371253e-05
## 8747     2 31391 6.371253e-05
## 8748     2 31391 6.371253e-05
## 8749     2 31391 6.371253e-05
## 8750     2 31391 6.371253e-05
## 8751     2 31391 6.371253e-05
## 8752     2 31391 6.371253e-05
## 8753     2 31391 6.371253e-05
## 8754     2 31391 6.371253e-05
## 8755     2 31391 6.371253e-05
## 8756     2 31391 6.371253e-05
## 8757     2 31391 6.371253e-05
## 8758     2 31391 6.371253e-05
## 8759     2 31391 6.371253e-05
## 8760     2 31391 6.371253e-05
## 8761     2 31391 6.371253e-05
## 8762     2 31391 6.371253e-05
## 8763     2 31391 6.371253e-05
## 8764     2 31391 6.371253e-05
## 8765     2 31391 6.371253e-05
## 8766     2 31391 6.371253e-05
## 8767     2 31391 6.371253e-05
## 8768     2 31391 6.371253e-05
## 8769     2 31391 6.371253e-05
## 8770     2 31391 6.371253e-05
## 8771     2 31391 6.371253e-05
## 8772     2 31391 6.371253e-05
## 8773     2 31391 6.371253e-05
## 8774     2 31391 6.371253e-05
## 8775     2 31391 6.371253e-05
## 8776     2 31391 6.371253e-05
## 8777     2 31391 6.371253e-05
## 8778     2 31391 6.371253e-05
## 8779     2 31391 6.371253e-05
## 8780     2 31391 6.371253e-05
## 8781     2 31391 6.371253e-05
## 8782     2 31391 6.371253e-05
## 8783     2 31391 6.371253e-05
## 8784     2 31391 6.371253e-05
## 8785     2 31391 6.371253e-05
## 8786     2 31391 6.371253e-05
## 8787     2 31391 6.371253e-05
## 8788     2 31391 6.371253e-05
## 8789     2 31391 6.371253e-05
## 8790     2 31391 6.371253e-05
## 8791     2 31391 6.371253e-05
## 8792     2 31391 6.371253e-05
## 8793     2 31391 6.371253e-05
## 8794     2 31391 6.371253e-05
## 8795     2 31391 6.371253e-05
## 8796     2 31391 6.371253e-05
## 8797     2 31391 6.371253e-05
## 8798     2 31391 6.371253e-05
## 8799     2 31391 6.371253e-05
## 8800     2 31391 6.371253e-05
## 8801     2 31391 6.371253e-05
## 8802     2 31391 6.371253e-05
## 8803     2 31391 6.371253e-05
## 8804     2 31391 6.371253e-05
## 8805     2 31391 6.371253e-05
## 8806     2 31391 6.371253e-05
## 8807     2 31391 6.371253e-05
## 8808     2 31391 6.371253e-05
## 8809     2 31391 6.371253e-05
## 8810     2 31391 6.371253e-05
## 8811     2 31391 6.371253e-05
## 8812     2 31391 6.371253e-05
## 8813     2 31391 6.371253e-05
## 8814     2 31391 6.371253e-05
## 8815     2 31391 6.371253e-05
## 8816     2 31391 6.371253e-05
## 8817     2 31391 6.371253e-05
## 8818     2 31391 6.371253e-05
## 8819     2 31391 6.371253e-05
## 8820     2 31391 6.371253e-05
## 8821     2 31391 6.371253e-05
## 8822     2 31391 6.371253e-05
## 8823     2 31391 6.371253e-05
## 8824     2 31391 6.371253e-05
## 8825     2 31391 6.371253e-05
## 8826     2 31391 6.371253e-05
## 8827     2 31391 6.371253e-05
## 8828     2 31391 6.371253e-05
## 8829     2 31391 6.371253e-05
## 8830     2 31391 6.371253e-05
## 8831     2 31391 6.371253e-05
## 8832     2 31391 6.371253e-05
## 8833     2 31391 6.371253e-05
## 8834     2 31391 6.371253e-05
## 8835     2 31391 6.371253e-05
## 8836     2 31391 6.371253e-05
## 8837     2 31391 6.371253e-05
## 8838     2 31391 6.371253e-05
## 8839     2 31391 6.371253e-05
## 8840     2 31391 6.371253e-05
## 8841     2 31391 6.371253e-05
## 8842     2 31391 6.371253e-05
## 8843     2 31391 6.371253e-05
## 8844     2 31391 6.371253e-05
## 8845     2 31391 6.371253e-05
## 8846     2 31391 6.371253e-05
## 8847     2 31391 6.371253e-05
## 8848     2 31391 6.371253e-05
## 8849     2 31391 6.371253e-05
## 8850     2 31391 6.371253e-05
## 8851     2 31391 6.371253e-05
## 8852     2 31391 6.371253e-05
## 8853     2 31391 6.371253e-05
## 8854     2 31391 6.371253e-05
## 8855     2 31391 6.371253e-05
## 8856     2 31391 6.371253e-05
## 8857     2 31391 6.371253e-05
## 8858     2 31391 6.371253e-05
## 8859     2 31391 6.371253e-05
## 8860     2 31391 6.371253e-05
## 8861     2 31391 6.371253e-05
## 8862     2 31391 6.371253e-05
## 8863     2 31391 6.371253e-05
## 8864     2 31391 6.371253e-05
## 8865     2 31391 6.371253e-05
## 8866     2 31391 6.371253e-05
## 8867     2 31391 6.371253e-05
## 8868     2 31391 6.371253e-05
## 8869     2 31391 6.371253e-05
## 8870     2 31391 6.371253e-05
## 8871     2 31391 6.371253e-05
## 8872     2 31391 6.371253e-05
## 8873     2 31391 6.371253e-05
## 8874     2 31391 6.371253e-05
## 8875     2 31391 6.371253e-05
## 8876     2 31391 6.371253e-05
## 8877     2 31391 6.371253e-05
## 8878     2 31391 6.371253e-05
## 8879     2 31391 6.371253e-05
## 8880     2 31391 6.371253e-05
## 8881     2 31391 6.371253e-05
## 8882     2 31391 6.371253e-05
## 8883     2 31391 6.371253e-05
## 8884     2 31391 6.371253e-05
## 8885     2 31391 6.371253e-05
## 8886     2 31391 6.371253e-05
## 8887     2 31391 6.371253e-05
## 8888     2 31391 6.371253e-05
## 8889     2 31391 6.371253e-05
## 8890     2 31391 6.371253e-05
## 8891     2 31391 6.371253e-05
## 8892     2 31391 6.371253e-05
## 8893     2 31391 6.371253e-05
## 8894     2 31391 6.371253e-05
## 8895     2 31391 6.371253e-05
## 8896     2 31391 6.371253e-05
## 8897     2 31391 6.371253e-05
## 8898     2 31391 6.371253e-05
## 8899     2 31391 6.371253e-05
## 8900     2 31391 6.371253e-05
## 8901     2 31391 6.371253e-05
## 8902     2 31391 6.371253e-05
## 8903     2 31391 6.371253e-05
## 8904     2 31391 6.371253e-05
## 8905     2 31391 6.371253e-05
## 8906     2 31391 6.371253e-05
## 8907     2 31391 6.371253e-05
## 8908     2 31391 6.371253e-05
## 8909     2 31391 6.371253e-05
## 8910     2 31391 6.371253e-05
## 8911     2 31391 6.371253e-05
## 8912     2 31391 6.371253e-05
## 8913     2 31391 6.371253e-05
## 8914     2 31391 6.371253e-05
## 8915     2 31391 6.371253e-05
## 8916     2 31391 6.371253e-05
## 8917     2 31391 6.371253e-05
## 8918     2 31391 6.371253e-05
## 8919     2 31391 6.371253e-05
## 8920     2 31391 6.371253e-05
## 8921     2 31391 6.371253e-05
## 8922     2 31391 6.371253e-05
## 8923     2 31391 6.371253e-05
## 8924     2 31391 6.371253e-05
## 8925     2 31391 6.371253e-05
## 8926     2 31391 6.371253e-05
## 8927     2 31391 6.371253e-05
## 8928     2 31391 6.371253e-05
## 8929     2 31391 6.371253e-05
## 8930     2 31391 6.371253e-05
## 8931     2 31391 6.371253e-05
## 8932     2 31391 6.371253e-05
## 8933     2 31391 6.371253e-05
## 8934     2 31391 6.371253e-05
## 8935     2 31391 6.371253e-05
## 8936     2 31391 6.371253e-05
## 8937     2 31391 6.371253e-05
## 8938     2 31391 6.371253e-05
## 8939     2 31391 6.371253e-05
## 8940     2 31391 6.371253e-05
## 8941     2 31391 6.371253e-05
## 8942     2 31391 6.371253e-05
## 8943     2 31391 6.371253e-05
## 8944     2 31391 6.371253e-05
## 8945     2 31391 6.371253e-05
## 8946     2 31391 6.371253e-05
## 8947     2 31391 6.371253e-05
## 8948     2 31391 6.371253e-05
## 8949     2 31391 6.371253e-05
## 8950     2 31391 6.371253e-05
## 8951     2 31391 6.371253e-05
## 8952     2 31391 6.371253e-05
## 8953     2 31391 6.371253e-05
## 8954     2 31391 6.371253e-05
## 8955     2 31391 6.371253e-05
## 8956     2 31391 6.371253e-05
## 8957     2 31391 6.371253e-05
## 8958     2 31391 6.371253e-05
## 8959     2 31391 6.371253e-05
## 8960     2 31391 6.371253e-05
## 8961     2 31391 6.371253e-05
## 8962     2 31391 6.371253e-05
## 8963     2 31391 6.371253e-05
## 8964     2 31391 6.371253e-05
## 8965     2 31391 6.371253e-05
## 8966     2 31391 6.371253e-05
## 8967     2 31391 6.371253e-05
## 8968     2 31391 6.371253e-05
## 8969     2 31391 6.371253e-05
## 8970     2 31391 6.371253e-05
## 8971     2 31391 6.371253e-05
## 8972     2 31391 6.371253e-05
## 8973     2 31391 6.371253e-05
## 8974     2 31391 6.371253e-05
## 8975     2 31391 6.371253e-05
## 8976     2 31391 6.371253e-05
## 8977     2 31391 6.371253e-05
## 8978     2 31391 6.371253e-05
## 8979     2 31391 6.371253e-05
## 8980     2 31391 6.371253e-05
## 8981     2 31391 6.371253e-05
## 8982     2 31391 6.371253e-05
## 8983     2 31391 6.371253e-05
## 8984     2 31391 6.371253e-05
## 8985     2 31391 6.371253e-05
## 8986     2 31391 6.371253e-05
## 8987     2 31391 6.371253e-05
## 8988     2 31391 6.371253e-05
## 8989     2 31391 6.371253e-05
## 8990     2 31391 6.371253e-05
## 8991     2 31391 6.371253e-05
## 8992     2 31391 6.371253e-05
## 8993     2 31391 6.371253e-05
## 8994     2 31391 6.371253e-05
## 8995     2 31391 6.371253e-05
## 8996     2 31391 6.371253e-05
## 8997     2 31391 6.371253e-05
## 8998     2 31391 6.371253e-05
## 8999     2 31391 6.371253e-05
## 9000     2 31391 6.371253e-05
## 9001     2 31391 6.371253e-05
## 9002     2 31391 6.371253e-05
## 9003     2 31391 6.371253e-05
## 9004     2 31391 6.371253e-05
## 9005     2 31391 6.371253e-05
## 9006     2 31391 6.371253e-05
## 9007     2 31391 6.371253e-05
## 9008     2 31391 6.371253e-05
## 9009     2 31391 6.371253e-05
## 9010     2 31391 6.371253e-05
## 9011     2 31391 6.371253e-05
## 9012     2 31391 6.371253e-05
## 9013     2 31391 6.371253e-05
## 9014     2 31391 6.371253e-05
## 9015     2 31391 6.371253e-05
## 9016     2 31391 6.371253e-05
## 9017     2 31391 6.371253e-05
## 9018     2 31391 6.371253e-05
## 9019     2 31391 6.371253e-05
## 9020     2 31391 6.371253e-05
## 9021     2 31391 6.371253e-05
## 9022     2 31391 6.371253e-05
## 9023     2 31391 6.371253e-05
## 9024     2 31391 6.371253e-05
## 9025     2 31391 6.371253e-05
## 9026     2 31391 6.371253e-05
## 9027     2 31391 6.371253e-05
## 9028     2 31391 6.371253e-05
## 9029     2 31391 6.371253e-05
## 9030     2 31391 6.371253e-05
## 9031     2 31391 6.371253e-05
## 9032     2 31391 6.371253e-05
## 9033     2 31391 6.371253e-05
## 9034     2 31391 6.371253e-05
## 9035     2 31391 6.371253e-05
## 9036     2 31391 6.371253e-05
## 9037     2 31391 6.371253e-05
## 9038     2 31391 6.371253e-05
## 9039     2 31391 6.371253e-05
## 9040     2 31391 6.371253e-05
## 9041     2 31391 6.371253e-05
## 9042     2 31391 6.371253e-05
## 9043     2 31391 6.371253e-05
## 9044     2 31391 6.371253e-05
## 9045     2 31391 6.371253e-05
## 9046     2 31391 6.371253e-05
## 9047     2 31391 6.371253e-05
## 9048     2 31391 6.371253e-05
## 9049     2 31391 6.371253e-05
## 9050     2 31391 6.371253e-05
## 9051     2 31391 6.371253e-05
## 9052     2 31391 6.371253e-05
## 9053     2 31391 6.371253e-05
## 9054     2 31391 6.371253e-05
## 9055     2 31391 6.371253e-05
## 9056     2 31391 6.371253e-05
## 9057     2 31391 6.371253e-05
## 9058     2 31391 6.371253e-05
## 9059     2 31391 6.371253e-05
## 9060     2 31391 6.371253e-05
## 9061     2 31391 6.371253e-05
## 9062     2 31391 6.371253e-05
## 9063     2 31391 6.371253e-05
## 9064     2 31391 6.371253e-05
## 9065     2 31391 6.371253e-05
## 9066     2 31391 6.371253e-05
## 9067     2 31391 6.371253e-05
## 9068     2 31391 6.371253e-05
## 9069     2 31391 6.371253e-05
## 9070     2 31391 6.371253e-05
## 9071     2 31391 6.371253e-05
## 9072     2 31391 6.371253e-05
## 9073     2 31391 6.371253e-05
## 9074     2 31391 6.371253e-05
## 9075     2 31391 6.371253e-05
## 9076     2 31391 6.371253e-05
## 9077     2 31391 6.371253e-05
## 9078     2 31391 6.371253e-05
## 9079     2 31391 6.371253e-05
## 9080     2 31391 6.371253e-05
## 9081     2 31391 6.371253e-05
## 9082     2 31391 6.371253e-05
## 9083     2 31391 6.371253e-05
## 9084     2 31391 6.371253e-05
## 9085     2 31391 6.371253e-05
## 9086     2 31391 6.371253e-05
## 9087     2 31391 6.371253e-05
## 9088     2 31391 6.371253e-05
## 9089     2 31391 6.371253e-05
## 9090     2 31391 6.371253e-05
## 9091     2 31391 6.371253e-05
## 9092     2 31391 6.371253e-05
## 9093     2 31391 6.371253e-05
## 9094     2 31391 6.371253e-05
## 9095     2 31391 6.371253e-05
## 9096     2 31391 6.371253e-05
## 9097     2 31391 6.371253e-05
## 9098     2 31391 6.371253e-05
## 9099     2 31391 6.371253e-05
## 9100     2 31391 6.371253e-05
## 9101     2 31391 6.371253e-05
## 9102     2 31391 6.371253e-05
## 9103     2 31391 6.371253e-05
## 9104     2 31391 6.371253e-05
## 9105     2 31391 6.371253e-05
## 9106     2 31391 6.371253e-05
## 9107     2 31391 6.371253e-05
## 9108     2 31391 6.371253e-05
## 9109     2 31391 6.371253e-05
## 9110     2 31391 6.371253e-05
## 9111     2 31391 6.371253e-05
## 9112     2 31391 6.371253e-05
## 9113     2 31391 6.371253e-05
## 9114     2 31391 6.371253e-05
## 9115     2 31391 6.371253e-05
## 9116     2 31391 6.371253e-05
## 9117     2 31391 6.371253e-05
## 9118     2 31391 6.371253e-05
## 9119     2 31391 6.371253e-05
## 9120     2 31391 6.371253e-05
## 9121     2 31391 6.371253e-05
## 9122     2 31391 6.371253e-05
## 9123     2 31391 6.371253e-05
## 9124     2 31391 6.371253e-05
## 9125     2 31391 6.371253e-05
## 9126     2 31391 6.371253e-05
## 9127     2 31391 6.371253e-05
## 9128     2 31391 6.371253e-05
## 9129     2 31391 6.371253e-05
## 9130     2 31391 6.371253e-05
## 9131     2 31391 6.371253e-05
## 9132     2 31391 6.371253e-05
## 9133     2 31391 6.371253e-05
## 9134     2 31391 6.371253e-05
## 9135     2 31391 6.371253e-05
## 9136     2 31391 6.371253e-05
## 9137     2 31391 6.371253e-05
## 9138     2 31391 6.371253e-05
## 9139     2 31391 6.371253e-05
## 9140     2 31391 6.371253e-05
## 9141     2 31391 6.371253e-05
## 9142     2 31391 6.371253e-05
## 9143     2 31391 6.371253e-05
## 9144     2 31391 6.371253e-05
## 9145     2 31391 6.371253e-05
## 9146     2 31391 6.371253e-05
## 9147     2 31391 6.371253e-05
## 9148     2 31391 6.371253e-05
## 9149     2 31391 6.371253e-05
## 9150     2 31391 6.371253e-05
## 9151     2 31391 6.371253e-05
## 9152     2 31391 6.371253e-05
## 9153     2 31391 6.371253e-05
## 9154     2 31391 6.371253e-05
## 9155     2 31391 6.371253e-05
## 9156     2 31391 6.371253e-05
## 9157     2 31391 6.371253e-05
## 9158     2 31391 6.371253e-05
## 9159     2 31391 6.371253e-05
## 9160     2 31391 6.371253e-05
## 9161     2 31391 6.371253e-05
## 9162     2 31391 6.371253e-05
## 9163     2 31391 6.371253e-05
## 9164     2 31391 6.371253e-05
## 9165     2 31391 6.371253e-05
## 9166     2 31391 6.371253e-05
## 9167     2 31391 6.371253e-05
## 9168     2 31391 6.371253e-05
## 9169     2 31391 6.371253e-05
## 9170     2 31391 6.371253e-05
## 9171     2 31391 6.371253e-05
## 9172     2 31391 6.371253e-05
## 9173     2 31391 6.371253e-05
## 9174     2 31391 6.371253e-05
## 9175     2 31391 6.371253e-05
## 9176     2 31391 6.371253e-05
## 9177     2 31391 6.371253e-05
## 9178     2 31391 6.371253e-05
## 9179     2 31391 6.371253e-05
## 9180     2 31391 6.371253e-05
## 9181     2 31391 6.371253e-05
## 9182     2 31391 6.371253e-05
## 9183     2 31391 6.371253e-05
## 9184     2 31391 6.371253e-05
## 9185     2 31391 6.371253e-05
## 9186     2 31391 6.371253e-05
## 9187     2 31391 6.371253e-05
## 9188     2 31391 6.371253e-05
## 9189     2 31391 6.371253e-05
## 9190     2 31391 6.371253e-05
## 9191     2 31391 6.371253e-05
## 9192     2 31391 6.371253e-05
## 9193     2 31391 6.371253e-05
## 9194     2 31391 6.371253e-05
## 9195     2 31391 6.371253e-05
## 9196     2 31391 6.371253e-05
## 9197     2 31391 6.371253e-05
## 9198     2 31391 6.371253e-05
## 9199     2 31391 6.371253e-05
## 9200     2 31391 6.371253e-05
## 9201     2 31391 6.371253e-05
## 9202     2 31391 6.371253e-05
## 9203     2 31391 6.371253e-05
## 9204     2 31391 6.371253e-05
## 9205     2 31391 6.371253e-05
## 9206     2 31391 6.371253e-05
## 9207     2 31391 6.371253e-05
## 9208     2 31391 6.371253e-05
## 9209     2 31391 6.371253e-05
## 9210     2 31391 6.371253e-05
## 9211     2 31391 6.371253e-05
## 9212     2 31391 6.371253e-05
## 9213     2 31391 6.371253e-05
## 9214     2 31391 6.371253e-05
## 9215     2 31391 6.371253e-05
## 9216     2 31391 6.371253e-05
## 9217     2 31391 6.371253e-05
## 9218     2 31391 6.371253e-05
## 9219     2 31391 6.371253e-05
## 9220     2 31391 6.371253e-05
## 9221     2 31391 6.371253e-05
## 9222     2 31391 6.371253e-05
## 9223     2 31391 6.371253e-05
## 9224     2 31391 6.371253e-05
## 9225     2 31391 6.371253e-05
## 9226     2 31391 6.371253e-05
## 9227     2 31391 6.371253e-05
## 9228     2 31391 6.371253e-05
## 9229     2 31391 6.371253e-05
## 9230     2 31391 6.371253e-05
## 9231     2 31391 6.371253e-05
## 9232     2 31391 6.371253e-05
## 9233     2 31391 6.371253e-05
## 9234     2 31391 6.371253e-05
## 9235     2 31391 6.371253e-05
## 9236     2 31391 6.371253e-05
## 9237     2 31391 6.371253e-05
## 9238     2 31391 6.371253e-05
## 9239     2 31391 6.371253e-05
## 9240     2 31391 6.371253e-05
## 9241     2 31391 6.371253e-05
## 9242     2 31391 6.371253e-05
## 9243     2 31391 6.371253e-05
## 9244     2 31391 6.371253e-05
## 9245     2 31391 6.371253e-05
## 9246     2 31391 6.371253e-05
## 9247     2 31391 6.371253e-05
## 9248     2 31391 6.371253e-05
## 9249     2 31391 6.371253e-05
## 9250     2 31391 6.371253e-05
## 9251     2 31391 6.371253e-05
## 9252     2 31391 6.371253e-05
## 9253     2 31391 6.371253e-05
## 9254     2 31391 6.371253e-05
## 9255     2 31391 6.371253e-05
## 9256     2 31391 6.371253e-05
## 9257     2 31391 6.371253e-05
## 9258     2 31391 6.371253e-05
## 9259     2 31391 6.371253e-05
## 9260     2 31391 6.371253e-05
## 9261     2 31391 6.371253e-05
## 9262     2 31391 6.371253e-05
## 9263     2 31391 6.371253e-05
## 9264     2 31391 6.371253e-05
## 9265     2 31391 6.371253e-05
## 9266     2 31391 6.371253e-05
## 9267     2 31391 6.371253e-05
## 9268     2 31391 6.371253e-05
## 9269     2 31391 6.371253e-05
## 9270     2 31391 6.371253e-05
## 9271     2 31391 6.371253e-05
## 9272     2 31391 6.371253e-05
## 9273     2 31391 6.371253e-05
## 9274     2 31391 6.371253e-05
## 9275     2 31391 6.371253e-05
## 9276     2 31391 6.371253e-05
## 9277     2 31391 6.371253e-05
## 9278     2 31391 6.371253e-05
## 9279     2 31391 6.371253e-05
## 9280     2 31391 6.371253e-05
## 9281     2 31391 6.371253e-05
## 9282     2 31391 6.371253e-05
## 9283     2 31391 6.371253e-05
## 9284     2 31391 6.371253e-05
## 9285     2 31391 6.371253e-05
## 9286     2 31391 6.371253e-05
## 9287     2 31391 6.371253e-05
## 9288     2 31391 6.371253e-05
## 9289     2 31391 6.371253e-05
## 9290     2 31391 6.371253e-05
## 9291     2 31391 6.371253e-05
## 9292     2 16761 1.193246e-04
## 9293     2 16761 1.193246e-04
## 9294     2 16761 1.193246e-04
## 9295     2 16761 1.193246e-04
## 9296     2 16761 1.193246e-04
## 9297     2 16761 1.193246e-04
## 9298     2 16761 1.193246e-04
## 9299     2 16761 1.193246e-04
## 9300     2 16761 1.193246e-04
## 9301     2 16761 1.193246e-04
## 9302     2 16761 1.193246e-04
## 9303     2 16761 1.193246e-04
## 9304     2 16761 1.193246e-04
## 9305     2 16761 1.193246e-04
## 9306     2 16761 1.193246e-04
## 9307     2 16761 1.193246e-04
## 9308     2 16761 1.193246e-04
## 9309     2 16761 1.193246e-04
## 9310     2 16761 1.193246e-04
## 9311     2 16761 1.193246e-04
## 9312     2 16761 1.193246e-04
## 9313     2 16761 1.193246e-04
## 9314     2 16761 1.193246e-04
## 9315     2 16761 1.193246e-04
## 9316     2 16761 1.193246e-04
## 9317     2 16761 1.193246e-04
## 9318     2 16761 1.193246e-04
## 9319     2 16761 1.193246e-04
## 9320     2 16761 1.193246e-04
## 9321     2 16761 1.193246e-04
## 9322     2 16761 1.193246e-04
## 9323     2 16761 1.193246e-04
## 9324     2 16761 1.193246e-04
## 9325     2 16761 1.193246e-04
## 9326     2 16761 1.193246e-04
## 9327     2 16761 1.193246e-04
## 9328     2 16761 1.193246e-04
## 9329     2 16761 1.193246e-04
## 9330     2 16761 1.193246e-04
## 9331     2 16761 1.193246e-04
## 9332     2 16761 1.193246e-04
## 9333     2 16761 1.193246e-04
## 9334     2 16761 1.193246e-04
## 9335     2 16761 1.193246e-04
## 9336     2 16761 1.193246e-04
## 9337     2 16761 1.193246e-04
## 9338     2 16761 1.193246e-04
## 9339     2 16761 1.193246e-04
## 9340     2 16761 1.193246e-04
## 9341     2 16761 1.193246e-04
## 9342     2 16761 1.193246e-04
## 9343     2 16761 1.193246e-04
## 9344     2 16761 1.193246e-04
## 9345     2 16761 1.193246e-04
## 9346     2 16761 1.193246e-04
## 9347     2 16761 1.193246e-04
## 9348     2 16761 1.193246e-04
## 9349     2 16761 1.193246e-04
## 9350     2 16761 1.193246e-04
## 9351     2 16761 1.193246e-04
## 9352     2 16761 1.193246e-04
## 9353     2 16761 1.193246e-04
## 9354     2 16761 1.193246e-04
## 9355     2 16761 1.193246e-04
## 9356     2 16761 1.193246e-04
## 9357     2 16761 1.193246e-04
## 9358     2 16761 1.193246e-04
## 9359     2 16761 1.193246e-04
## 9360     2 16761 1.193246e-04
## 9361     2 16761 1.193246e-04
## 9362     2 16761 1.193246e-04
## 9363     2 16761 1.193246e-04
## 9364     2 16761 1.193246e-04
## 9365     2 16761 1.193246e-04
## 9366     2 16761 1.193246e-04
## 9367     2 16761 1.193246e-04
## 9368     2 16761 1.193246e-04
## 9369     2 16761 1.193246e-04
## 9370     2 16761 1.193246e-04
## 9371     2 16761 1.193246e-04
## 9372     2 16761 1.193246e-04
## 9373     2 16761 1.193246e-04
## 9374     2 16761 1.193246e-04
## 9375     2 16761 1.193246e-04
## 9376     2 16761 1.193246e-04
## 9377     2 16761 1.193246e-04
## 9378     2 16761 1.193246e-04
## 9379     2 16761 1.193246e-04
## 9380     2 16761 1.193246e-04
## 9381     2 16761 1.193246e-04
## 9382     2 16761 1.193246e-04
## 9383     2 16761 1.193246e-04
## 9384     2 16761 1.193246e-04
## 9385     2 16761 1.193246e-04
## 9386     2 16761 1.193246e-04
## 9387     2 16761 1.193246e-04
## 9388     2 16761 1.193246e-04
## 9389     2 16761 1.193246e-04
## 9390     2 16761 1.193246e-04
## 9391     2 16761 1.193246e-04
## 9392     2 16761 1.193246e-04
## 9393     2 16761 1.193246e-04
## 9394     2 16761 1.193246e-04
## 9395     2 16761 1.193246e-04
## 9396     2 16761 1.193246e-04
## 9397     2 16761 1.193246e-04
## 9398     2 16761 1.193246e-04
## 9399     2 16761 1.193246e-04
## 9400     2 16761 1.193246e-04
## 9401     2 16761 1.193246e-04
## 9402     2 16761 1.193246e-04
## 9403     2 16761 1.193246e-04
## 9404     2 16761 1.193246e-04
## 9405     2 16761 1.193246e-04
## 9406     2 16761 1.193246e-04
## 9407     2 16761 1.193246e-04
## 9408     2 16761 1.193246e-04
## 9409     2 16761 1.193246e-04
## 9410     2 16761 1.193246e-04
## 9411     2 16761 1.193246e-04
## 9412     2 16761 1.193246e-04
## 9413     2 16761 1.193246e-04
## 9414     2 16761 1.193246e-04
## 9415     2 16761 1.193246e-04
## 9416     2 16761 1.193246e-04
## 9417     2 16761 1.193246e-04
## 9418     2 16761 1.193246e-04
## 9419     2 16761 1.193246e-04
## 9420     2 16761 1.193246e-04
## 9421     2 16761 1.193246e-04
## 9422     2 16761 1.193246e-04
## 9423     2 16761 1.193246e-04
## 9424     2 16761 1.193246e-04
## 9425     2 16761 1.193246e-04
## 9426     2 16761 1.193246e-04
## 9427     2 16761 1.193246e-04
## 9428     2 16761 1.193246e-04
## 9429     2 16761 1.193246e-04
## 9430     2 16761 1.193246e-04
## 9431     2 16761 1.193246e-04
## 9432     2 16761 1.193246e-04
## 9433     2 16761 1.193246e-04
## 9434     2 16761 1.193246e-04
## 9435     2 16761 1.193246e-04
## 9436     2 16761 1.193246e-04
## 9437     2 16761 1.193246e-04
## 9438     2 16761 1.193246e-04
## 9439     2 16761 1.193246e-04
## 9440     2 16761 1.193246e-04
## 9441     2 16761 1.193246e-04
## 9442     2 16761 1.193246e-04
## 9443     2 16761 1.193246e-04
## 9444     2 16761 1.193246e-04
## 9445     2 16761 1.193246e-04
## 9446     2 16761 1.193246e-04
## 9447     2 16761 1.193246e-04
## 9448     2 16761 1.193246e-04
## 9449     2 16761 1.193246e-04
## 9450     2 16761 1.193246e-04
## 9451     2 16761 1.193246e-04
## 9452     2 16761 1.193246e-04
## 9453     2 16761 1.193246e-04
## 9454     2 16761 1.193246e-04
## 9455     2 16761 1.193246e-04
## 9456     2 16761 1.193246e-04
## 9457     2 16761 1.193246e-04
## 9458     2 16761 1.193246e-04
## 9459     2 16761 1.193246e-04
## 9460     2 16761 1.193246e-04
## 9461     2 16761 1.193246e-04
## 9462     2 16761 1.193246e-04
## 9463     2 16761 1.193246e-04
## 9464     2 16761 1.193246e-04
## 9465     2 16761 1.193246e-04
## 9466     2 16761 1.193246e-04
## 9467     2 16761 1.193246e-04
## 9468     2 16761 1.193246e-04
## 9469     2 16761 1.193246e-04
## 9470     2 16761 1.193246e-04
## 9471     2 16761 1.193246e-04
## 9472     2 16761 1.193246e-04
## 9473     2 16761 1.193246e-04
## 9474     2 16761 1.193246e-04
## 9475     2 16761 1.193246e-04
## 9476     2 16761 1.193246e-04
## 9477     2 16761 1.193246e-04
## 9478     2 16761 1.193246e-04
## 9479     2 16761 1.193246e-04
## 9480     2 16761 1.193246e-04
## 9481     2 16761 1.193246e-04
## 9482     2 16761 1.193246e-04
## 9483     2 16761 1.193246e-04
## 9484     2 16761 1.193246e-04
## 9485     2 16761 1.193246e-04
## 9486     2 16761 1.193246e-04
## 9487     2 16761 1.193246e-04
## 9488     2 16761 1.193246e-04
## 9489     2 16761 1.193246e-04
## 9490     2 16761 1.193246e-04
## 9491     2 16761 1.193246e-04
## 9492     2 16761 1.193246e-04
## 9493     2 16761 1.193246e-04
## 9494     2 16761 1.193246e-04
## 9495     2 16761 1.193246e-04
## 9496     2 16761 1.193246e-04
## 9497     2 16761 1.193246e-04
## 9498     2 16761 1.193246e-04
## 9499     2 16761 1.193246e-04
## 9500     2 16761 1.193246e-04
## 9501     2 16761 1.193246e-04
## 9502     2 16761 1.193246e-04
## 9503     2 16761 1.193246e-04
## 9504     2 16761 1.193246e-04
## 9505     2 16761 1.193246e-04
## 9506     2 16761 1.193246e-04
## 9507     2 16761 1.193246e-04
## 9508     2 16761 1.193246e-04
## 9509     2 16761 1.193246e-04
## 9510     2 16761 1.193246e-04
## 9511     2 16761 1.193246e-04
## 9512     2 16761 1.193246e-04
## 9513     2 16761 1.193246e-04
## 9514     2 16761 1.193246e-04
## 9515     2 16761 1.193246e-04
## 9516     2 16761 1.193246e-04
## 9517     2 16761 1.193246e-04
## 9518     2 16761 1.193246e-04
## 9519     2 16761 1.193246e-04
## 9520     2 16761 1.193246e-04
## 9521     2 16761 1.193246e-04
## 9522     2 16761 1.193246e-04
## 9523     2 16761 1.193246e-04
## 9524     2 16761 1.193246e-04
## 9525     2 16761 1.193246e-04
## 9526     2 16761 1.193246e-04
## 9527     2 16761 1.193246e-04
## 9528     2 16761 1.193246e-04
## 9529     2 16761 1.193246e-04
## 9530     2 16761 1.193246e-04
## 9531     2 16761 1.193246e-04
## 9532     2 16761 1.193246e-04
## 9533     2 16761 1.193246e-04
## 9534     2 16761 1.193246e-04
## 9535     2 16761 1.193246e-04
## 9536     2 16761 1.193246e-04
## 9537     2 16761 1.193246e-04
## 9538     2 16761 1.193246e-04
## 9539     2 16761 1.193246e-04
## 9540     2 16761 1.193246e-04
## 9541     2 16761 1.193246e-04
## 9542     2 16761 1.193246e-04
## 9543     2 16761 1.193246e-04
## 9544     2 16761 1.193246e-04
## 9545     2 16761 1.193246e-04
## 9546     2 16761 1.193246e-04
## 9547     2 16761 1.193246e-04
## 9548     2 16761 1.193246e-04
## 9549     2 16761 1.193246e-04
## 9550     2 16761 1.193246e-04
## 9551     2 16761 1.193246e-04
## 9552     2 16761 1.193246e-04
## 9553     2 16761 1.193246e-04
## 9554     2 16761 1.193246e-04
## 9555     2 16761 1.193246e-04
## 9556     2 16761 1.193246e-04
## 9557     2 16761 1.193246e-04
## 9558     2 16761 1.193246e-04
## 9559     2 16761 1.193246e-04
## 9560     2 16761 1.193246e-04
## 9561     2 16761 1.193246e-04
## 9562     2 16761 1.193246e-04
## 9563     2 16761 1.193246e-04
## 9564     2 16761 1.193246e-04
## 9565     2 16761 1.193246e-04
## 9566     2 16761 1.193246e-04
## 9567     2 16761 1.193246e-04
## 9568     2 16761 1.193246e-04
## 9569     2 16761 1.193246e-04
## 9570     2 16761 1.193246e-04
## 9571     2 16761 1.193246e-04
## 9572     2 16761 1.193246e-04
## 9573     2 16761 1.193246e-04
## 9574     2 16761 1.193246e-04
## 9575     2 16761 1.193246e-04
## 9576     2 16761 1.193246e-04
## 9577     2 16761 1.193246e-04
## 9578     2 16761 1.193246e-04
## 9579     2 16761 1.193246e-04
## 9580     2 16761 1.193246e-04
## 9581     2 16761 1.193246e-04
## 9582     2 16761 1.193246e-04
## 9583     2 16761 1.193246e-04
## 9584     2 16761 1.193246e-04
## 9585     2 16761 1.193246e-04
## 9586     2 16761 1.193246e-04
## 9587     2 16761 1.193246e-04
## 9588     2 16761 1.193246e-04
## 9589     2 16761 1.193246e-04
## 9590     2 16761 1.193246e-04
## 9591     2 16761 1.193246e-04
## 9592     2 16761 1.193246e-04
## 9593     2 16761 1.193246e-04
## 9594     2 16761 1.193246e-04
## 9595     2 16761 1.193246e-04
## 9596     2 16761 1.193246e-04
## 9597     2 16761 1.193246e-04
## 9598     2 16761 1.193246e-04
## 9599     2 16761 1.193246e-04
## 9600     2 16761 1.193246e-04
## 9601     2 16761 1.193246e-04
## 9602     2 16761 1.193246e-04
## 9603     2 16761 1.193246e-04
## 9604     2 16761 1.193246e-04
## 9605     2 16761 1.193246e-04
## 9606     2 16761 1.193246e-04
## 9607     2 16761 1.193246e-04
## 9608     2 16761 1.193246e-04
## 9609     2 16761 1.193246e-04
## 9610     2 16761 1.193246e-04
## 9611     2 16761 1.193246e-04
## 9612     2 16761 1.193246e-04
## 9613     2 16761 1.193246e-04
## 9614     2 16761 1.193246e-04
## 9615     2 16761 1.193246e-04
## 9616     2 16761 1.193246e-04
## 9617     2 16761 1.193246e-04
## 9618     2 16761 1.193246e-04
## 9619     2 16761 1.193246e-04
## 9620     2 16761 1.193246e-04
## 9621     2 16761 1.193246e-04
## 9622     2 16761 1.193246e-04
## 9623     2 16761 1.193246e-04
## 9624     2 16761 1.193246e-04
## 9625     2 16761 1.193246e-04
## 9626     2 16761 1.193246e-04
## 9627     2 16761 1.193246e-04
## 9628     2 16761 1.193246e-04
## 9629     2 16761 1.193246e-04
## 9630     2 16761 1.193246e-04
## 9631     2 16761 1.193246e-04
## 9632     2 16761 1.193246e-04
## 9633     2 16761 1.193246e-04
## 9634     2 16761 1.193246e-04
## 9635     2 16761 1.193246e-04
## 9636     2 16761 1.193246e-04
## 9637     2 16761 1.193246e-04
## 9638     2 16761 1.193246e-04
## 9639     2 16761 1.193246e-04
## 9640     2 16761 1.193246e-04
## 9641     2 16761 1.193246e-04
## 9642     2 16761 1.193246e-04
## 9643     2 16761 1.193246e-04
## 9644     2 16761 1.193246e-04
## 9645     2 16761 1.193246e-04
## 9646     2 16761 1.193246e-04
## 9647     2 16761 1.193246e-04
## 9648     2 16761 1.193246e-04
## 9649     2 16761 1.193246e-04
## 9650     2 16761 1.193246e-04
## 9651     2 16761 1.193246e-04
## 9652     2 16761 1.193246e-04
## 9653     2 16761 1.193246e-04
## 9654     2 16761 1.193246e-04
## 9655     2 16761 1.193246e-04
## 9656     2 16761 1.193246e-04
## 9657     2 16761 1.193246e-04
## 9658     2 16761 1.193246e-04
## 9659     2 16761 1.193246e-04
## 9660     2 16761 1.193246e-04
## 9661     2 16761 1.193246e-04
## 9662     2 16761 1.193246e-04
## 9663     2 16761 1.193246e-04
## 9664     2 16761 1.193246e-04
## 9665     2 16761 1.193246e-04
## 9666     2 16761 1.193246e-04
## 9667     2 16761 1.193246e-04
## 9668     2 16761 1.193246e-04
## 9669     2 16761 1.193246e-04
## 9670     2 16761 1.193246e-04
## 9671     2 16761 1.193246e-04
## 9672     2 16761 1.193246e-04
## 9673     2 16761 1.193246e-04
## 9674     2 16761 1.193246e-04
## 9675     2 16761 1.193246e-04
## 9676     2 16761 1.193246e-04
## 9677     2 16761 1.193246e-04
## 9678     2 16761 1.193246e-04
## 9679     2 16761 1.193246e-04
## 9680     2 16761 1.193246e-04
## 9681     2 16761 1.193246e-04
## 9682     2 16761 1.193246e-04
## 9683     2 16761 1.193246e-04
## 9684     2 16761 1.193246e-04
## 9685     2 16761 1.193246e-04
## 9686     2 16761 1.193246e-04
## 9687     2 16761 1.193246e-04
## 9688     2 16761 1.193246e-04
## 9689     2 16761 1.193246e-04
## 9690     2 16761 1.193246e-04
## 9691     2 16761 1.193246e-04
## 9692     2 16761 1.193246e-04
## 9693     2 16761 1.193246e-04
## 9694     2 16761 1.193246e-04
## 9695     2 16761 1.193246e-04
## 9696     2 16761 1.193246e-04
## 9697     2 16761 1.193246e-04
## 9698     2 16761 1.193246e-04
## 9699     2 16761 1.193246e-04
## 9700     2 16761 1.193246e-04
## 9701     2 16761 1.193246e-04
## 9702     2 16761 1.193246e-04
## 9703     2 16761 1.193246e-04
## 9704     2 16761 1.193246e-04
## 9705     2 16761 1.193246e-04
## 9706     2 16761 1.193246e-04
## 9707     2 16761 1.193246e-04
## 9708     2 16761 1.193246e-04
## 9709     2 16761 1.193246e-04
## 9710     2 16761 1.193246e-04
## 9711     2 16761 1.193246e-04
## 9712     2 16761 1.193246e-04
## 9713     2 16761 1.193246e-04
## 9714     2 16761 1.193246e-04
## 9715     2 16761 1.193246e-04
## 9716     2 16761 1.193246e-04
## 9717     2 16761 1.193246e-04
## 9718     2 16761 1.193246e-04
## 9719     2 16761 1.193246e-04
## 9720     2 16761 1.193246e-04
## 9721     2 16761 1.193246e-04
## 9722     2 16761 1.193246e-04
## 9723     2 16761 1.193246e-04
## 9724     2 16761 1.193246e-04
## 9725     2 16761 1.193246e-04
## 9726     2 16761 1.193246e-04
## 9727     2 16761 1.193246e-04
## 9728     2 16761 1.193246e-04
## 9729     2 16761 1.193246e-04
## 9730     2 16761 1.193246e-04
## 9731     2 16761 1.193246e-04
## 9732     2 16761 1.193246e-04
## 9733     2 16761 1.193246e-04
## 9734     2 16761 1.193246e-04
## 9735     2 16761 1.193246e-04
## 9736     2 16761 1.193246e-04
## 9737     2 16761 1.193246e-04
## 9738     2 16761 1.193246e-04
## 9739     2 16761 1.193246e-04
## 9740     2 16761 1.193246e-04
## 9741     2 16761 1.193246e-04
## 9742     2 16761 1.193246e-04
## 9743     2 16761 1.193246e-04
## 9744     2 16761 1.193246e-04
## 9745     2 16761 1.193246e-04
## 9746     2 16761 1.193246e-04
## 9747     2 16761 1.193246e-04
## 9748     2 16761 1.193246e-04
## 9749     2 16761 1.193246e-04
## 9750     2 16761 1.193246e-04
## 9751     2 16761 1.193246e-04
## 9752     2 16761 1.193246e-04
## 9753     2 16761 1.193246e-04
## 9754     2 16761 1.193246e-04
## 9755     2 16761 1.193246e-04
## 9756     2 16761 1.193246e-04
## 9757     2 16761 1.193246e-04
## 9758     2 16761 1.193246e-04
## 9759     2 16761 1.193246e-04
## 9760     2 16761 1.193246e-04
## 9761     2 16761 1.193246e-04
## 9762     2 16761 1.193246e-04
## 9763     2 16761 1.193246e-04
## 9764     2 16761 1.193246e-04
## 9765     2 16761 1.193246e-04
## 9766     2 16761 1.193246e-04
## 9767     2 16761 1.193246e-04
## 9768     2 16761 1.193246e-04
## 9769     2 16761 1.193246e-04
## 9770     2 16761 1.193246e-04
## 9771     2 16761 1.193246e-04
## 9772     2 16761 1.193246e-04
## 9773     2 16761 1.193246e-04
## 9774     2 16761 1.193246e-04
## 9775     2 16761 1.193246e-04
## 9776     2 16761 1.193246e-04
## 9777     2 16761 1.193246e-04
## 9778     2 16761 1.193246e-04
## 9779     2 16761 1.193246e-04
## 9780     2 16761 1.193246e-04
## 9781     2 16761 1.193246e-04
## 9782     2 16761 1.193246e-04
## 9783     2 16761 1.193246e-04
## 9784     2 16761 1.193246e-04
## 9785     2 16761 1.193246e-04
## 9786     2 16761 1.193246e-04
## 9787     2 16761 1.193246e-04
## 9788     2 16761 1.193246e-04
## 9789     2 16761 1.193246e-04
## 9790     2 16761 1.193246e-04
## 9791     2 16761 1.193246e-04
## 9792     2 16761 1.193246e-04
## 9793     2 16761 1.193246e-04
## 9794     2 16761 1.193246e-04
## 9795     2 16761 1.193246e-04
## 9796     2 16761 1.193246e-04
## 9797     2 16761 1.193246e-04
## 9798     2 16761 1.193246e-04
## 9799     2 16761 1.193246e-04
## 9800     2 16761 1.193246e-04
## 9801     2 16761 1.193246e-04
## 9802     2 16761 1.193246e-04
## 9803     2 16761 1.193246e-04
## 9804     2 16761 1.193246e-04
## 9805     2 16761 1.193246e-04
## 9806     2 16761 1.193246e-04
## 9807     2 16761 1.193246e-04
## 9808     2 16761 1.193246e-04
## 9809     2 16761 1.193246e-04
## 9810     2 16761 1.193246e-04
## 9811     2 16761 1.193246e-04
## 9812     2 16761 1.193246e-04
## 9813     2 16761 1.193246e-04
## 9814     2 16761 1.193246e-04
## 9815     2 16761 1.193246e-04
## 9816     2 16761 1.193246e-04
## 9817     2 16761 1.193246e-04
## 9818     2 16761 1.193246e-04
## 9819     2 16761 1.193246e-04
## 9820     2 16761 1.193246e-04
## 9821     2 16761 1.193246e-04
## 9822     2 16761 1.193246e-04
## 9823     2 16761 1.193246e-04
## 9824     2 16761 1.193246e-04
## 9825     2 16761 1.193246e-04
## 9826     2 16761 1.193246e-04
## 9827     2 16761 1.193246e-04
## 9828     2 16761 1.193246e-04
## 9829     2 16761 1.193246e-04
## 9830     2 16761 1.193246e-04
## 9831     2 16761 1.193246e-04
## 9832     2 16761 1.193246e-04
## 9833     2 16761 1.193246e-04
## 9834     2 16761 1.193246e-04
## 9835     2 16761 1.193246e-04
## 9836     2 16761 1.193246e-04
## 9837     2 16761 1.193246e-04
## 9838     2 16761 1.193246e-04
## 9839     2 16761 1.193246e-04
## 9840     2 16761 1.193246e-04
## 9841     2 16761 1.193246e-04
## 9842     2 16761 1.193246e-04
## 9843     2 16761 1.193246e-04
## 9844     2 16761 1.193246e-04
## 9845     2 16761 1.193246e-04
## 9846     2 16761 1.193246e-04
## 9847     2 16761 1.193246e-04
## 9848     2 16761 1.193246e-04
## 9849     2 16761 1.193246e-04
## 9850     2 16761 1.193246e-04
## 9851     2 16761 1.193246e-04
## 9852     2 16761 1.193246e-04
## 9853     2 16761 1.193246e-04
## 9854     2 16761 1.193246e-04
## 9855     2 16761 1.193246e-04
## 9856     2 16761 1.193246e-04
## 9857     2 16761 1.193246e-04
## 9858     2 16761 1.193246e-04
## 9859     2 16761 1.193246e-04
## 9860     2 16761 1.193246e-04
## 9861     2 16761 1.193246e-04
## 9862     2 16761 1.193246e-04
## 9863     2 16761 1.193246e-04
## 9864     2 16761 1.193246e-04
## 9865     2 16761 1.193246e-04
## 9866     2 16761 1.193246e-04
## 9867     2 16761 1.193246e-04
## 9868     2 16761 1.193246e-04
## 9869     2 16761 1.193246e-04
## 9870     2 16761 1.193246e-04
## 9871     2 16761 1.193246e-04
## 9872     2 16761 1.193246e-04
## 9873     2 16761 1.193246e-04
## 9874     2 16761 1.193246e-04
## 9875     2 16761 1.193246e-04
## 9876     2 16761 1.193246e-04
## 9877     2 16761 1.193246e-04
## 9878     2 16761 1.193246e-04
## 9879     2 16761 1.193246e-04
## 9880     2 16761 1.193246e-04
## 9881     2 16761 1.193246e-04
## 9882     2 16761 1.193246e-04
## 9883     2 16761 1.193246e-04
## 9884     2 16761 1.193246e-04
## 9885     2 16761 1.193246e-04
## 9886     2 16761 1.193246e-04
## 9887     2 16761 1.193246e-04
## 9888     2 16761 1.193246e-04
## 9889     2 16761 1.193246e-04
## 9890     2 16761 1.193246e-04
## 9891     2 16761 1.193246e-04
## 9892     2 16761 1.193246e-04
## 9893     2 16761 1.193246e-04
## 9894     2 16761 1.193246e-04
## 9895     2 16761 1.193246e-04
## 9896     2 16761 1.193246e-04
## 9897     2 16761 1.193246e-04
## 9898     2 16761 1.193246e-04
## 9899     2 16761 1.193246e-04
## 9900     2 16761 1.193246e-04
## 9901     2 16761 1.193246e-04
## 9902     2 16761 1.193246e-04
## 9903     2 16761 1.193246e-04
## 9904     2 16761 1.193246e-04
## 9905     2 16761 1.193246e-04
## 9906     2 16761 1.193246e-04
## 9907     2 16761 1.193246e-04
## 9908     2 16761 1.193246e-04
## 9909     2 16761 1.193246e-04
## 9910     2 16761 1.193246e-04
## 9911     2 16761 1.193246e-04
## 9912     2 16761 1.193246e-04
## 9913     2 16761 1.193246e-04
## 9914     2 16761 1.193246e-04
## 9915     2 16761 1.193246e-04
## 9916     2 16761 1.193246e-04
## 9917     2 16761 1.193246e-04
## 9918     2 16761 1.193246e-04
## 9919     2 16761 1.193246e-04
## 9920     2 16761 1.193246e-04
## 9921     2 16761 1.193246e-04
## 9922     2 16761 1.193246e-04
## 9923     2 16761 1.193246e-04
## 9924     2 16761 1.193246e-04
## 9925     2 16761 1.193246e-04
## 9926     2 16761 1.193246e-04
## 9927     2 16761 1.193246e-04
## 9928     2 16761 1.193246e-04
## 9929     2 16761 1.193246e-04
## 9930     2 16761 1.193246e-04
## 9931     2 16761 1.193246e-04
## 9932     2 16761 1.193246e-04
## 9933     2 16761 1.193246e-04
## 9934     2 16761 1.193246e-04
## 9935     2 16761 1.193246e-04
## 9936     2 16761 1.193246e-04
## 9937     2 16761 1.193246e-04
## 9938     2 16761 1.193246e-04
## 9939     2 16761 1.193246e-04
## 9940     2 16761 1.193246e-04
## 9941     2 16761 1.193246e-04
## 9942     2 16761 1.193246e-04
## 9943     2 16761 1.193246e-04
## 9944     2 16761 1.193246e-04
## 9945     2 16761 1.193246e-04
## 9946     2 16761 1.193246e-04
## 9947     2 16761 1.193246e-04
## 9948     2 16761 1.193246e-04
## 9949     2 16761 1.193246e-04
## 9950     2 16761 1.193246e-04
## 9951     2 16761 1.193246e-04
## 9952     2 16761 1.193246e-04
## 9953     2 16761 1.193246e-04
## 9954     2 16761 1.193246e-04
## 9955     2 16761 1.193246e-04
## 9956     2 16761 1.193246e-04
## 9957     2 16761 1.193246e-04
## 9958     2 16761 1.193246e-04
## 9959     2 16761 1.193246e-04
## 9960     2 16761 1.193246e-04
## 9961     2 16761 1.193246e-04
## 9962     2 16761 1.193246e-04
## 9963     2 16761 1.193246e-04
## 9964     2 16761 1.193246e-04
## 9965     2 16761 1.193246e-04
## 9966     2 16761 1.193246e-04
## 9967     2 16761 1.193246e-04
## 9968     2 16761 1.193246e-04
## 9969     2 16761 1.193246e-04
## 9970     2 16761 1.193246e-04
## 9971     2 16761 1.193246e-04
## 9972     2 16761 1.193246e-04
## 9973     2 16761 1.193246e-04
## 9974     2 16761 1.193246e-04
## 9975     2 16761 1.193246e-04
## 9976     2 16761 1.193246e-04
## 9977     2 16761 1.193246e-04
## 9978     2 16761 1.193246e-04
## 9979     2 16761 1.193246e-04
## 9980     2 16761 1.193246e-04
## 9981     2 16761 1.193246e-04
## 9982     2 16761 1.193246e-04
## 9983     2 16761 1.193246e-04
## 9984     2 16761 1.193246e-04
## 9985     2 16761 1.193246e-04
## 9986     2 16761 1.193246e-04
## 9987     2 16761 1.193246e-04
## 9988     2 16761 1.193246e-04
## 9989     2 16761 1.193246e-04
## 9990     2 16761 1.193246e-04
## 9991     2 16761 1.193246e-04
## 9992     2 16761 1.193246e-04
## 9993     2 16761 1.193246e-04
## 9994     2 16761 1.193246e-04
## 9995     2 16761 1.193246e-04
## 9996     2 16761 1.193246e-04
## 9997     2 16761 1.193246e-04
## 9998     2 16761 1.193246e-04
## 9999     2 16761 1.193246e-04
## 10000    2 16761 1.193246e-04
## 10001    2 16761 1.193246e-04
## 10002    2 16761 1.193246e-04
## 10003    2 16761 1.193246e-04
## 10004    2 16761 1.193246e-04
## 10005    2 16761 1.193246e-04
## 10006    2 16761 1.193246e-04
## 10007    2 16761 1.193246e-04
## 10008    2 16761 1.193246e-04
## 10009    2 16761 1.193246e-04
## 10010    2 16761 1.193246e-04
## 10011    2 16761 1.193246e-04
## 10012    2 16761 1.193246e-04
## 10013    2 16761 1.193246e-04
## 10014    2 16761 1.193246e-04
## 10015    2 16761 1.193246e-04
## 10016    2 16761 1.193246e-04
## 10017    2 16761 1.193246e-04
## 10018    2 16761 1.193246e-04
## 10019    2 16761 1.193246e-04
## 10020    2 16761 1.193246e-04
## 10021    2 16761 1.193246e-04
## 10022    2 16761 1.193246e-04
## 10023    2 16761 1.193246e-04
## 10024    2 16761 1.193246e-04
## 10025    2 16761 1.193246e-04
## 10026    2 16761 1.193246e-04
## 10027    2 16761 1.193246e-04
## 10028    2 16761 1.193246e-04
## 10029    2 16761 1.193246e-04
## 10030    2 16761 1.193246e-04
## 10031    2 16761 1.193246e-04
## 10032    2 16761 1.193246e-04
## 10033    2 16761 1.193246e-04
## 10034    2 16761 1.193246e-04
## 10035    2 16761 1.193246e-04
## 10036    2 16761 1.193246e-04
## 10037    2 16761 1.193246e-04
## 10038    2 16761 1.193246e-04
## 10039    2 16761 1.193246e-04
## 10040    2 16761 1.193246e-04
## 10041    2 16761 1.193246e-04
## 10042    2 16761 1.193246e-04
## 10043    2 16761 1.193246e-04
## 10044    2 16761 1.193246e-04
## 10045    2 16761 1.193246e-04
## 10046    2 16761 1.193246e-04
## 10047    2 16761 1.193246e-04
## 10048    2 16761 1.193246e-04
## 10049    2 16761 1.193246e-04
## 10050    2 16761 1.193246e-04
## 10051    2 16761 1.193246e-04
## 10052    2 16761 1.193246e-04
## 10053    2 16761 1.193246e-04
## 10054    2 16761 1.193246e-04
## 10055    2 16761 1.193246e-04
## 10056    2 16761 1.193246e-04
## 10057    2 16761 1.193246e-04
## 10058    2 16761 1.193246e-04
## 10059    2 16761 1.193246e-04
## 10060    2 16761 1.193246e-04
## 10061    2 16761 1.193246e-04
## 10062    2 16761 1.193246e-04
## 10063    2 16761 1.193246e-04
## 10064    2 16761 1.193246e-04
## 10065    2 16761 1.193246e-04
## 10066    2 16761 1.193246e-04
## 10067    2 16761 1.193246e-04
## 10068    2 16761 1.193246e-04
## 10069    2 16761 1.193246e-04
## 10070    2 16761 1.193246e-04
## 10071    2 16761 1.193246e-04
## 10072    2 16761 1.193246e-04
## 10073    2 16761 1.193246e-04
## 10074    2 16761 1.193246e-04
## 10075    2 16761 1.193246e-04
## 10076    2 16761 1.193246e-04
## 10077    2 16761 1.193246e-04
## 10078    2 16761 1.193246e-04
## 10079    2 16761 1.193246e-04
## 10080    2 16761 1.193246e-04
## 10081    2 16761 1.193246e-04
## 10082    2 16761 1.193246e-04
## 10083    2 16761 1.193246e-04
## 10084    2 16761 1.193246e-04
## 10085    2 16761 1.193246e-04
## 10086    2 16761 1.193246e-04
## 10087    2 16761 1.193246e-04
## 10088    2 16761 1.193246e-04
## 10089    2 16761 1.193246e-04
## 10090    2 16761 1.193246e-04
## 10091    2 16761 1.193246e-04
## 10092    2 16761 1.193246e-04
## 10093    2 16761 1.193246e-04
## 10094    2 16761 1.193246e-04
## 10095    2 16761 1.193246e-04
## 10096    2 16761 1.193246e-04
## 10097    2 16761 1.193246e-04
## 10098    2 16761 1.193246e-04
## 10099    2 16761 1.193246e-04
## 10100    2 16761 1.193246e-04
## 10101    2 16761 1.193246e-04
## 10102    2 16761 1.193246e-04
## 10103    2 16761 1.193246e-04
## 10104    2 16761 1.193246e-04
## 10105    2 16761 1.193246e-04
## 10106    2 16761 1.193246e-04
## 10107    2 16761 1.193246e-04
## 10108    2 16761 1.193246e-04
## 10109    2 16761 1.193246e-04
## 10110    2 16761 1.193246e-04
## 10111    2 16761 1.193246e-04
## 10112    2 16761 1.193246e-04
## 10113    2 16761 1.193246e-04
## 10114    2 16761 1.193246e-04
## 10115    2 16761 1.193246e-04
## 10116    2 16761 1.193246e-04
## 10117    2 16761 1.193246e-04
## 10118    2 16761 1.193246e-04
## 10119    2 16761 1.193246e-04
## 10120    2 16761 1.193246e-04
## 10121    2 16761 1.193246e-04
## 10122    2 16761 1.193246e-04
## 10123    2 16761 1.193246e-04
## 10124    2 16761 1.193246e-04
## 10125    2 16761 1.193246e-04
## 10126    2 16761 1.193246e-04
## 10127    2 16761 1.193246e-04
## 10128    2 16761 1.193246e-04
## 10129    2 16761 1.193246e-04
## 10130    2 16761 1.193246e-04
## 10131    2 16761 1.193246e-04
## 10132    2 16761 1.193246e-04
## 10133    2 16761 1.193246e-04
## 10134    2 16761 1.193246e-04
## 10135    2 16761 1.193246e-04
## 10136    2 16761 1.193246e-04
## 10137    2 16761 1.193246e-04
## 10138    2 16761 1.193246e-04
## 10139    2 16761 1.193246e-04
## 10140    2 16761 1.193246e-04
## 10141    2 16761 1.193246e-04
## 10142    2 16761 1.193246e-04
## 10143    2 16761 1.193246e-04
## 10144    2 16761 1.193246e-04
## 10145    2 16761 1.193246e-04
## 10146    2 16761 1.193246e-04
## 10147    2 16761 1.193246e-04
## 10148    2 16761 1.193246e-04
## 10149    2 16761 1.193246e-04
## 10150    2 16761 1.193246e-04
## 10151    2 16761 1.193246e-04
## 10152    2 16761 1.193246e-04
## 10153    2 16761 1.193246e-04
## 10154    2 16761 1.193246e-04
## 10155    2 16761 1.193246e-04
## 10156    2 16761 1.193246e-04
## 10157    2 16761 1.193246e-04
## 10158    2 16761 1.193246e-04
## 10159    2 16761 1.193246e-04
## 10160    2 16761 1.193246e-04
## 10161    2 16761 1.193246e-04
## 10162    2 16761 1.193246e-04
## 10163    2 16761 1.193246e-04
## 10164    2 16761 1.193246e-04
## 10165    2 16761 1.193246e-04
## 10166    2 16761 1.193246e-04
## 10167    2 16761 1.193246e-04
## 10168    2 16761 1.193246e-04
## 10169    2 16761 1.193246e-04
## 10170    2 16761 1.193246e-04
## 10171    2 16761 1.193246e-04
## 10172    2 16761 1.193246e-04
## 10173    2 16761 1.193246e-04
## 10174    2 16761 1.193246e-04
## 10175    2 16761 1.193246e-04
## 10176    2 16761 1.193246e-04
## 10177    2 16761 1.193246e-04
## 10178    2 16761 1.193246e-04
## 10179    2 16761 1.193246e-04
## 10180    2 16761 1.193246e-04
## 10181    2 16761 1.193246e-04
## 10182    2 16761 1.193246e-04
## 10183    2 16761 1.193246e-04
## 10184    2 16761 1.193246e-04
## 10185    2 16761 1.193246e-04
## 10186    2 16761 1.193246e-04
## 10187    2 16761 1.193246e-04
## 10188    2 16761 1.193246e-04
## 10189    2 16761 1.193246e-04
## 10190    2 16761 1.193246e-04
## 10191    2 16761 1.193246e-04
## 10192    2 16761 1.193246e-04
## 10193    2 16761 1.193246e-04
## 10194    2 16761 1.193246e-04
## 10195    2 16761 1.193246e-04
## 10196    2 16761 1.193246e-04
## 10197    2 16761 1.193246e-04
## 10198    2 16761 1.193246e-04
## 10199    2 16761 1.193246e-04
## 10200    2 16761 1.193246e-04
## 10201    2 16761 1.193246e-04
## 10202    2 16761 1.193246e-04
## 10203    2 16761 1.193246e-04
## 10204    2 16761 1.193246e-04
## 10205    2 16761 1.193246e-04
## 10206    2 16761 1.193246e-04
## 10207    2 16761 1.193246e-04
## 10208    2 16761 1.193246e-04
## 10209    2 16761 1.193246e-04
## 10210    2 16761 1.193246e-04
## 10211    2 16761 1.193246e-04
## 10212    2 16761 1.193246e-04
## 10213    2 16761 1.193246e-04
## 10214    2 16761 1.193246e-04
## 10215    2 16761 1.193246e-04
## 10216    2 16761 1.193246e-04
## 10217    2 16761 1.193246e-04
## 10218    2 16761 1.193246e-04
## 10219    2 16761 1.193246e-04
## 10220    2 16761 1.193246e-04
## 10221    2 16761 1.193246e-04
## 10222    2 16761 1.193246e-04
## 10223    2 16761 1.193246e-04
## 10224    2 16761 1.193246e-04
## 10225    2 16761 1.193246e-04
## 10226    2 16761 1.193246e-04
## 10227    2 16761 1.193246e-04
## 10228    2 16761 1.193246e-04
## 10229    2 16761 1.193246e-04
## 10230    2 16761 1.193246e-04
## 10231    1 48044 2.081425e-05
## 10232    1 48044 2.081425e-05
## 10233    1 48044 2.081425e-05
## 10234    1 48044 2.081425e-05
## 10235    1 48044 2.081425e-05
## 10236    1 48044 2.081425e-05
## 10237    1 48044 2.081425e-05
## 10238    1 48044 2.081425e-05
## 10239    1 48044 2.081425e-05
## 10240    1 48044 2.081425e-05
## 10241    1 48044 2.081425e-05
## 10242    1 48044 2.081425e-05
## 10243    1 48044 2.081425e-05
## 10244    1 48044 2.081425e-05
## 10245    1 48044 2.081425e-05
## 10246    1 48044 2.081425e-05
## 10247    1 48044 2.081425e-05
## 10248    1 48044 2.081425e-05
## 10249    1 48044 2.081425e-05
## 10250    1 48044 2.081425e-05
## 10251    1 48044 2.081425e-05
## 10252    1 48044 2.081425e-05
## 10253    1 48044 2.081425e-05
## 10254    1 48044 2.081425e-05
## 10255    1 48044 2.081425e-05
## 10256    1 48044 2.081425e-05
## 10257    1 48044 2.081425e-05
## 10258    1 48044 2.081425e-05
## 10259    1 48044 2.081425e-05
## 10260    1 48044 2.081425e-05
## 10261    1 48044 2.081425e-05
## 10262    1 48044 2.081425e-05
## 10263    1 48044 2.081425e-05
## 10264    1 48044 2.081425e-05
## 10265    1 48044 2.081425e-05
## 10266    1 48044 2.081425e-05
## 10267    1 48044 2.081425e-05
## 10268    1 48044 2.081425e-05
## 10269    1 48044 2.081425e-05
## 10270    1 48044 2.081425e-05
## 10271    1 48044 2.081425e-05
## 10272    1 48044 2.081425e-05
## 10273    1 48044 2.081425e-05
## 10274    1 48044 2.081425e-05
## 10275    1 48044 2.081425e-05
## 10276    1 48044 2.081425e-05
## 10277    1 48044 2.081425e-05
## 10278    1 48044 2.081425e-05
## 10279    1 48044 2.081425e-05
## 10280    1 48044 2.081425e-05
## 10281    1 48044 2.081425e-05
## 10282    1 48044 2.081425e-05
## 10283    1 48044 2.081425e-05
## 10284    1 48044 2.081425e-05
## 10285    1 48044 2.081425e-05
## 10286    1 48044 2.081425e-05
## 10287    1 48044 2.081425e-05
## 10288    1 48044 2.081425e-05
## 10289    1 48044 2.081425e-05
## 10290    1 48044 2.081425e-05
## 10291    1 48044 2.081425e-05
## 10292    1 48044 2.081425e-05
## 10293    1 48044 2.081425e-05
## 10294    1 48044 2.081425e-05
## 10295    1 48044 2.081425e-05
## 10296    1 48044 2.081425e-05
## 10297    1 48044 2.081425e-05
## 10298    1 48044 2.081425e-05
## 10299    1 48044 2.081425e-05
## 10300    1 48044 2.081425e-05
## 10301    1 48044 2.081425e-05
## 10302    1 48044 2.081425e-05
## 10303    1 48044 2.081425e-05
## 10304    1 48044 2.081425e-05
## 10305    1 48044 2.081425e-05
## 10306    1 48044 2.081425e-05
## 10307    1 48044 2.081425e-05
## 10308    1 48044 2.081425e-05
## 10309    1 48044 2.081425e-05
## 10310    1 48044 2.081425e-05
## 10311    1 48044 2.081425e-05
## 10312    1 48044 2.081425e-05
## 10313    1 48044 2.081425e-05
## 10314    1 48044 2.081425e-05
## 10315    1 48044 2.081425e-05
## 10316    1 48044 2.081425e-05
## 10317    1 48044 2.081425e-05
## 10318    1 48044 2.081425e-05
## 10319    1 48044 2.081425e-05
## 10320    1 48044 2.081425e-05
## 10321    1 48044 2.081425e-05
## 10322    1 48044 2.081425e-05
## 10323    1 48044 2.081425e-05
## 10324    1 48044 2.081425e-05
## 10325    1 48044 2.081425e-05
## 10326    1 48044 2.081425e-05
## 10327    1 48044 2.081425e-05
## 10328    1 48044 2.081425e-05
## 10329    1 48044 2.081425e-05
## 10330    1 48044 2.081425e-05
## 10331    1 48044 2.081425e-05
## 10332    1 48044 2.081425e-05
## 10333    1 48044 2.081425e-05
## 10334    1 48044 2.081425e-05
## 10335    1 48044 2.081425e-05
## 10336    1 48044 2.081425e-05
## 10337    1 48044 2.081425e-05
## 10338    1 48044 2.081425e-05
## 10339    1 48044 2.081425e-05
## 10340    1 48044 2.081425e-05
## 10341    1 48044 2.081425e-05
## 10342    1 48044 2.081425e-05
## 10343    1 48044 2.081425e-05
## 10344    1 48044 2.081425e-05
## 10345    1 48044 2.081425e-05
## 10346    1 48044 2.081425e-05
## 10347    1 48044 2.081425e-05
## 10348    1 48044 2.081425e-05
## 10349    1 48044 2.081425e-05
## 10350    1 48044 2.081425e-05
## 10351    1 48044 2.081425e-05
## 10352    1 48044 2.081425e-05
## 10353    1 48044 2.081425e-05
## 10354    1 48044 2.081425e-05
## 10355    1 48044 2.081425e-05
## 10356    1 48044 2.081425e-05
## 10357    1 48044 2.081425e-05
## 10358    1 48044 2.081425e-05
## 10359    1 48044 2.081425e-05
## 10360    1 48044 2.081425e-05
## 10361    1 48044 2.081425e-05
## 10362    1 48044 2.081425e-05
## 10363    1 48044 2.081425e-05
## 10364    1 48044 2.081425e-05
## 10365    1 48044 2.081425e-05
## 10366    1 48044 2.081425e-05
## 10367    1 48044 2.081425e-05
## 10368    1 48044 2.081425e-05
## 10369    1 48044 2.081425e-05
## 10370    1 48044 2.081425e-05
## 10371    1 48044 2.081425e-05
## 10372    1 48044 2.081425e-05
## 10373    1 48044 2.081425e-05
## 10374    1 48044 2.081425e-05
## 10375    1 48044 2.081425e-05
## 10376    1 48044 2.081425e-05
## 10377    1 48044 2.081425e-05
## 10378    1 48044 2.081425e-05
## 10379    1 48044 2.081425e-05
## 10380    1 48044 2.081425e-05
## 10381    1 48044 2.081425e-05
## 10382    1 48044 2.081425e-05
## 10383    1 48044 2.081425e-05
## 10384    1 48044 2.081425e-05
## 10385    1 48044 2.081425e-05
## 10386    1 48044 2.081425e-05
## 10387    1 48044 2.081425e-05
## 10388    1 48044 2.081425e-05
## 10389    1 48044 2.081425e-05
## 10390    1 48044 2.081425e-05
## 10391    1 48044 2.081425e-05
## 10392    1 48044 2.081425e-05
## 10393    1 48044 2.081425e-05
## 10394    1 48044 2.081425e-05
## 10395    1 48044 2.081425e-05
## 10396    1 48044 2.081425e-05
## 10397    1 48044 2.081425e-05
## 10398    1 48044 2.081425e-05
## 10399    1 48044 2.081425e-05
## 10400    1 48044 2.081425e-05
## 10401    1 48044 2.081425e-05
## 10402    1 48044 2.081425e-05
## 10403    1 48044 2.081425e-05
## 10404    1 48044 2.081425e-05
## 10405    1 48044 2.081425e-05
## 10406    1 48044 2.081425e-05
## 10407    1 48044 2.081425e-05
## 10408    1 48044 2.081425e-05
## 10409    1 48044 2.081425e-05
## 10410    1 48044 2.081425e-05
## 10411    1 48044 2.081425e-05
## 10412    1 48044 2.081425e-05
## 10413    1 48044 2.081425e-05
## 10414    1 48044 2.081425e-05
## 10415    1 48044 2.081425e-05
## 10416    1 48044 2.081425e-05
## 10417    1 48044 2.081425e-05
## 10418    1 48044 2.081425e-05
## 10419    1 48044 2.081425e-05
## 10420    1 48044 2.081425e-05
## 10421    1 48044 2.081425e-05
## 10422    1 48044 2.081425e-05
## 10423    1 48044 2.081425e-05
## 10424    1 48044 2.081425e-05
## 10425    1 48044 2.081425e-05
## 10426    1 48044 2.081425e-05
## 10427    1 48044 2.081425e-05
## 10428    1 48044 2.081425e-05
## 10429    1 48044 2.081425e-05
## 10430    1 48044 2.081425e-05
## 10431    1 48044 2.081425e-05
## 10432    1 48044 2.081425e-05
## 10433    1 48044 2.081425e-05
## 10434    1 48044 2.081425e-05
## 10435    1 48044 2.081425e-05
## 10436    1 48044 2.081425e-05
## 10437    1 48044 2.081425e-05
## 10438    1 48044 2.081425e-05
## 10439    1 48044 2.081425e-05
## 10440    1 48044 2.081425e-05
## 10441    1 48044 2.081425e-05
## 10442    1 48044 2.081425e-05
## 10443    1 48044 2.081425e-05
## 10444    1 48044 2.081425e-05
## 10445    1 48044 2.081425e-05
## 10446    1 48044 2.081425e-05
## 10447    1 48044 2.081425e-05
## 10448    1 48044 2.081425e-05
## 10449    1 48044 2.081425e-05
## 10450    1 48044 2.081425e-05
## 10451    1 48044 2.081425e-05
## 10452    1 48044 2.081425e-05
## 10453    1 48044 2.081425e-05
## 10454    1 48044 2.081425e-05
## 10455    1 48044 2.081425e-05
## 10456    1 48044 2.081425e-05
## 10457    1 48044 2.081425e-05
## 10458    1 48044 2.081425e-05
## 10459    1 48044 2.081425e-05
## 10460    1 48044 2.081425e-05
## 10461    1 48044 2.081425e-05
## 10462    1 48044 2.081425e-05
## 10463    1 48044 2.081425e-05
## 10464    1 48044 2.081425e-05
## 10465    1 48044 2.081425e-05
## 10466    1 48044 2.081425e-05
## 10467    1 48044 2.081425e-05
## 10468    1 48044 2.081425e-05
## 10469    1 48044 2.081425e-05
## 10470    1 48044 2.081425e-05
## 10471    1 48044 2.081425e-05
## 10472    1 48044 2.081425e-05
## 10473    1 48044 2.081425e-05
## 10474    1 48044 2.081425e-05
## 10475    1 48044 2.081425e-05
## 10476    1 48044 2.081425e-05
## 10477    1 48044 2.081425e-05
## 10478    1 48044 2.081425e-05
## 10479    1 48044 2.081425e-05
## 10480    1 48044 2.081425e-05
## 10481    1 48044 2.081425e-05
## 10482    1 48044 2.081425e-05
## 10483    1 48044 2.081425e-05
## 10484    1 48044 2.081425e-05
## 10485    1 48044 2.081425e-05
## 10486    1 48044 2.081425e-05
## 10487    1 48044 2.081425e-05
## 10488    1 48044 2.081425e-05
## 10489    1 48044 2.081425e-05
## 10490    1 48044 2.081425e-05
## 10491    1 48044 2.081425e-05
## 10492    1 48044 2.081425e-05
## 10493    1 48044 2.081425e-05
## 10494    1 48044 2.081425e-05
## 10495    1 48044 2.081425e-05
## 10496    1 48044 2.081425e-05
## 10497    1 48044 2.081425e-05
## 10498    1 48044 2.081425e-05
## 10499    1 48044 2.081425e-05
## 10500    1 48044 2.081425e-05
## 10501    1 48044 2.081425e-05
## 10502    1 48044 2.081425e-05
## 10503    1 48044 2.081425e-05
## 10504    1 48044 2.081425e-05
## 10505    1 48044 2.081425e-05
## 10506    1 48044 2.081425e-05
## 10507    1 48044 2.081425e-05
## 10508    1 48044 2.081425e-05
## 10509    1 48044 2.081425e-05
## 10510    1 48044 2.081425e-05
## 10511    1 48044 2.081425e-05
## 10512    1 48044 2.081425e-05
## 10513    1 48044 2.081425e-05
## 10514    1 48044 2.081425e-05
## 10515    1 48044 2.081425e-05
## 10516    1 48044 2.081425e-05
## 10517    1 48044 2.081425e-05
## 10518    1 48044 2.081425e-05
## 10519    1 48044 2.081425e-05
## 10520    1 48044 2.081425e-05
## 10521    1 48044 2.081425e-05
## 10522    1 48044 2.081425e-05
## 10523    1 48044 2.081425e-05
## 10524    1 48044 2.081425e-05
## 10525    1 48044 2.081425e-05
## 10526    1 48044 2.081425e-05
## 10527    1 48044 2.081425e-05
## 10528    1 48044 2.081425e-05
## 10529    1 48044 2.081425e-05
## 10530    1 48044 2.081425e-05
## 10531    1 48044 2.081425e-05
## 10532    1 48044 2.081425e-05
## 10533    1 48044 2.081425e-05
## 10534    1 48044 2.081425e-05
## 10535    1 48044 2.081425e-05
## 10536    1 48044 2.081425e-05
## 10537    1 48044 2.081425e-05
## 10538    1 48044 2.081425e-05
## 10539    1 48044 2.081425e-05
## 10540    1 48044 2.081425e-05
## 10541    1 48044 2.081425e-05
## 10542    1 48044 2.081425e-05
## 10543    1 48044 2.081425e-05
## 10544    1 48044 2.081425e-05
## 10545    1 48044 2.081425e-05
## 10546    1 48044 2.081425e-05
## 10547    1 48044 2.081425e-05
## 10548    1 48044 2.081425e-05
## 10549    1 48044 2.081425e-05
## 10550    1 48044 2.081425e-05
## 10551    1 48044 2.081425e-05
## 10552    1 48044 2.081425e-05
## 10553    1 48044 2.081425e-05
## 10554    1 48044 2.081425e-05
## 10555    1 48044 2.081425e-05
## 10556    1 48044 2.081425e-05
## 10557    1 48044 2.081425e-05
## 10558    1 48044 2.081425e-05
## 10559    1 48044 2.081425e-05
## 10560    1 48044 2.081425e-05
## 10561    1 48044 2.081425e-05
## 10562    1 48044 2.081425e-05
## 10563    1 48044 2.081425e-05
## 10564    1 48044 2.081425e-05
## 10565    1 48044 2.081425e-05
## 10566    1 48044 2.081425e-05
## 10567    1 48044 2.081425e-05
## 10568    1 48044 2.081425e-05
## 10569    1 48044 2.081425e-05
## 10570    1 48044 2.081425e-05
## 10571    1 48044 2.081425e-05
## 10572    1 48044 2.081425e-05
## 10573    1 48044 2.081425e-05
## 10574    1 48044 2.081425e-05
## 10575    1 48044 2.081425e-05
## 10576    1 48044 2.081425e-05
## 10577    1 48044 2.081425e-05
## 10578    1 48044 2.081425e-05
## 10579    1 48044 2.081425e-05
## 10580    1 48044 2.081425e-05
## 10581    1 48044 2.081425e-05
## 10582    1 48044 2.081425e-05
## 10583    1 48044 2.081425e-05
## 10584    1 48044 2.081425e-05
## 10585    1 48044 2.081425e-05
## 10586    1 48044 2.081425e-05
## 10587    1 48044 2.081425e-05
## 10588    1 48044 2.081425e-05
## 10589    1 48044 2.081425e-05
## 10590    1 48044 2.081425e-05
## 10591    1 48044 2.081425e-05
## 10592    1 48044 2.081425e-05
## 10593    1 48044 2.081425e-05
## 10594    1 48044 2.081425e-05
## 10595    1 48044 2.081425e-05
## 10596    1 48044 2.081425e-05
## 10597    1 48044 2.081425e-05
## 10598    1 48044 2.081425e-05
## 10599    1 48044 2.081425e-05
## 10600    1 48044 2.081425e-05
## 10601    1 48044 2.081425e-05
## 10602    1 48044 2.081425e-05
## 10603    1 48044 2.081425e-05
## 10604    1 48044 2.081425e-05
## 10605    1 48044 2.081425e-05
## 10606    1 48044 2.081425e-05
## 10607    1 48044 2.081425e-05
## 10608    1 48044 2.081425e-05
## 10609    1 48044 2.081425e-05
## 10610    1 48044 2.081425e-05
## 10611    1 48044 2.081425e-05
## 10612    1 48044 2.081425e-05
## 10613    1 48044 2.081425e-05
## 10614    1 48044 2.081425e-05
## 10615    1 48044 2.081425e-05
## 10616    1 48044 2.081425e-05
## 10617    1 48044 2.081425e-05
## 10618    1 48044 2.081425e-05
## 10619    1 48044 2.081425e-05
## 10620    1 48044 2.081425e-05
## 10621    1 48044 2.081425e-05
## 10622    1 48044 2.081425e-05
## 10623    1 48044 2.081425e-05
## 10624    1 48044 2.081425e-05
## 10625    1 48044 2.081425e-05
## 10626    1 48044 2.081425e-05
## 10627    1 48044 2.081425e-05
## 10628    1 48044 2.081425e-05
## 10629    1 48044 2.081425e-05
## 10630    1 48044 2.081425e-05
## 10631    1 48044 2.081425e-05
## 10632    1 48044 2.081425e-05
## 10633    1 48044 2.081425e-05
## 10634    1 48044 2.081425e-05
## 10635    1 48044 2.081425e-05
## 10636    1 48044 2.081425e-05
## 10637    1 48044 2.081425e-05
## 10638    1 48044 2.081425e-05
## 10639    1 48044 2.081425e-05
## 10640    1 48044 2.081425e-05
## 10641    1 48044 2.081425e-05
## 10642    1 48044 2.081425e-05
## 10643    1 48044 2.081425e-05
## 10644    1 48044 2.081425e-05
## 10645    1 48044 2.081425e-05
## 10646    1 48044 2.081425e-05
## 10647    1 48044 2.081425e-05
## 10648    1 48044 2.081425e-05
## 10649    1 48044 2.081425e-05
## 10650    1 48044 2.081425e-05
## 10651    1 48044 2.081425e-05
## 10652    1 48044 2.081425e-05
## 10653    1 48044 2.081425e-05
## 10654    1 48044 2.081425e-05
## 10655    1 48044 2.081425e-05
## 10656    1 48044 2.081425e-05
## 10657    1 48044 2.081425e-05
## 10658    1 48044 2.081425e-05
## 10659    1 48044 2.081425e-05
## 10660    1 48044 2.081425e-05
## 10661    1 48044 2.081425e-05
## 10662    1 48044 2.081425e-05
## 10663    1 48044 2.081425e-05
## 10664    1 48044 2.081425e-05
## 10665    1 48044 2.081425e-05
## 10666    1 48044 2.081425e-05
## 10667    1 48044 2.081425e-05
## 10668    1 48044 2.081425e-05
## 10669    1 48044 2.081425e-05
## 10670    1 48044 2.081425e-05
## 10671    1 48044 2.081425e-05
## 10672    1 48044 2.081425e-05
## 10673    1 48044 2.081425e-05
## 10674    1 48044 2.081425e-05
## 10675    1 48044 2.081425e-05
## 10676    1 48044 2.081425e-05
## 10677    1 48044 2.081425e-05
## 10678    1 48044 2.081425e-05
## 10679    1 48044 2.081425e-05
## 10680    1 48044 2.081425e-05
## 10681    1 48044 2.081425e-05
## 10682    1 48044 2.081425e-05
## 10683    1 48044 2.081425e-05
## 10684    1 48044 2.081425e-05
## 10685    1 48044 2.081425e-05
## 10686    1 48044 2.081425e-05
## 10687    1 48044 2.081425e-05
## 10688    1 48044 2.081425e-05
## 10689    1 48044 2.081425e-05
## 10690    1 48044 2.081425e-05
## 10691    1 48044 2.081425e-05
## 10692    1 48044 2.081425e-05
## 10693    1 48044 2.081425e-05
## 10694    1 48044 2.081425e-05
## 10695    1 48044 2.081425e-05
## 10696    1 48044 2.081425e-05
## 10697    1 48044 2.081425e-05
## 10698    1 48044 2.081425e-05
## 10699    1 48044 2.081425e-05
## 10700    1 48044 2.081425e-05
## 10701    1 48044 2.081425e-05
## 10702    1 48044 2.081425e-05
## 10703    1 48044 2.081425e-05
## 10704    1 48044 2.081425e-05
## 10705    1 48044 2.081425e-05
## 10706    1 48044 2.081425e-05
## 10707    1 48044 2.081425e-05
## 10708    1 48044 2.081425e-05
## 10709    1 48044 2.081425e-05
## 10710    1 48044 2.081425e-05
## 10711    1 48044 2.081425e-05
## 10712    1 48044 2.081425e-05
## 10713    1 48044 2.081425e-05
## 10714    1 48044 2.081425e-05
## 10715    1 48044 2.081425e-05
## 10716    1 48044 2.081425e-05
## 10717    1 48044 2.081425e-05
## 10718    1 48044 2.081425e-05
## 10719    1 48044 2.081425e-05
## 10720    1 48044 2.081425e-05
## 10721    1 48044 2.081425e-05
## 10722    1 48044 2.081425e-05
## 10723    1 48044 2.081425e-05
## 10724    1 48044 2.081425e-05
## 10725    1 48044 2.081425e-05
## 10726    1 48044 2.081425e-05
## 10727    1 48044 2.081425e-05
## 10728    1 48044 2.081425e-05
## 10729    1 48044 2.081425e-05
## 10730    1 48044 2.081425e-05
## 10731    1 48044 2.081425e-05
## 10732    1 48044 2.081425e-05
## 10733    1 48044 2.081425e-05
## 10734    1 48044 2.081425e-05
## 10735    1 48044 2.081425e-05
## 10736    1 48044 2.081425e-05
## 10737    1 48044 2.081425e-05
## 10738    1 48044 2.081425e-05
## 10739    1 48044 2.081425e-05
## 10740    1 48044 2.081425e-05
## 10741    1 48044 2.081425e-05
## 10742    1 48044 2.081425e-05
## 10743    1 48044 2.081425e-05
## 10744    1 48044 2.081425e-05
## 10745    1 48044 2.081425e-05
## 10746    1 48044 2.081425e-05
## 10747    1 48044 2.081425e-05
## 10748    1 48044 2.081425e-05
## 10749    1 48044 2.081425e-05
## 10750    1 48044 2.081425e-05
## 10751    1 48044 2.081425e-05
## 10752    1 48044 2.081425e-05
## 10753    1 48044 2.081425e-05
## 10754    1 48044 2.081425e-05
## 10755    1 48044 2.081425e-05
## 10756    1 48044 2.081425e-05
## 10757    1 48044 2.081425e-05
## 10758    1 48044 2.081425e-05
## 10759    1 48044 2.081425e-05
## 10760    1 48044 2.081425e-05
## 10761    1 48044 2.081425e-05
## 10762    1 48044 2.081425e-05
## 10763    1 48044 2.081425e-05
## 10764    1 48044 2.081425e-05
## 10765    1 48044 2.081425e-05
## 10766    1 48044 2.081425e-05
## 10767    1 48044 2.081425e-05
## 10768    1 48044 2.081425e-05
## 10769    1 48044 2.081425e-05
## 10770    1 48044 2.081425e-05
## 10771    1 48044 2.081425e-05
## 10772    1 48044 2.081425e-05
## 10773    1 48044 2.081425e-05
## 10774    1 48044 2.081425e-05
## 10775    1 48044 2.081425e-05
## 10776    1 48044 2.081425e-05
## 10777    1 48044 2.081425e-05
## 10778    1 48044 2.081425e-05
## 10779    1 48044 2.081425e-05
## 10780    1 48044 2.081425e-05
## 10781    1 48044 2.081425e-05
## 10782    1 48044 2.081425e-05
## 10783    1 48044 2.081425e-05
## 10784    1 48044 2.081425e-05
## 10785    1 48044 2.081425e-05
## 10786    1 48044 2.081425e-05
## 10787    1 48044 2.081425e-05
## 10788    1 48044 2.081425e-05
## 10789    1 48044 2.081425e-05
## 10790    1 48044 2.081425e-05
## 10791    1 48044 2.081425e-05
## 10792    1 48044 2.081425e-05
## 10793    1 48044 2.081425e-05
## 10794    1 48044 2.081425e-05
## 10795    1 48044 2.081425e-05
## 10796    1 48044 2.081425e-05
## 10797    1 48044 2.081425e-05
## 10798    1 48044 2.081425e-05
## 10799    1 48044 2.081425e-05
## 10800    1 48044 2.081425e-05
## 10801    1 48044 2.081425e-05
## 10802    1 48044 2.081425e-05
## 10803    1 48044 2.081425e-05
## 10804    1 48044 2.081425e-05
## 10805    1 48044 2.081425e-05
## 10806    1 48044 2.081425e-05
## 10807    1 48044 2.081425e-05
## 10808    1 48044 2.081425e-05
## 10809    1 48044 2.081425e-05
## 10810    1 48044 2.081425e-05
## 10811    1 48044 2.081425e-05
## 10812    1 48044 2.081425e-05
## 10813    1 48044 2.081425e-05
## 10814    1 48044 2.081425e-05
## 10815    1 48044 2.081425e-05
## 10816    1 48044 2.081425e-05
## 10817    1 48044 2.081425e-05
## 10818    1 48044 2.081425e-05
## 10819    1 48044 2.081425e-05
## 10820    1 48044 2.081425e-05
## 10821    1 48044 2.081425e-05
## 10822    1 48044 2.081425e-05
## 10823    1 48044 2.081425e-05
## 10824    1 48044 2.081425e-05
## 10825    1 48044 2.081425e-05
## 10826    1 48044 2.081425e-05
## 10827    1 48044 2.081425e-05
## 10828    1 48044 2.081425e-05
## 10829    1 48044 2.081425e-05
## 10830    1 48044 2.081425e-05
## 10831    1 48044 2.081425e-05
## 10832    1 48044 2.081425e-05
## 10833    1 48044 2.081425e-05
## 10834    1 48044 2.081425e-05
## 10835    1 48044 2.081425e-05
## 10836    1 48044 2.081425e-05
## 10837    1 48044 2.081425e-05
## 10838    1 48044 2.081425e-05
## 10839    1 48044 2.081425e-05
## 10840    1 48044 2.081425e-05
## 10841    1 48044 2.081425e-05
## 10842    1 48044 2.081425e-05
## 10843    1 48044 2.081425e-05
## 10844    1 48044 2.081425e-05
## 10845    1 48044 2.081425e-05
## 10846    1 48044 2.081425e-05
## 10847    1 48044 2.081425e-05
## 10848    1 48044 2.081425e-05
## 10849    1 48044 2.081425e-05
## 10850    1 48044 2.081425e-05
## 10851    1 48044 2.081425e-05
## 10852    1 48044 2.081425e-05
## 10853    1 48044 2.081425e-05
## 10854    1 48044 2.081425e-05
## 10855    1 48044 2.081425e-05
## 10856    1 48044 2.081425e-05
## 10857    1 48044 2.081425e-05
## 10858    1 48044 2.081425e-05
## 10859    1 48044 2.081425e-05
## 10860    1 48044 2.081425e-05
## 10861    1 48044 2.081425e-05
## 10862    1 48044 2.081425e-05
## 10863    1 48044 2.081425e-05
## 10864    1 48044 2.081425e-05
## 10865    1 48044 2.081425e-05
## 10866    1 48044 2.081425e-05
## 10867    1 48044 2.081425e-05
## 10868    1 48044 2.081425e-05
## 10869    1 48044 2.081425e-05
## 10870    1 48044 2.081425e-05
## 10871    1 48044 2.081425e-05
## 10872    1 48044 2.081425e-05
## 10873    1 48044 2.081425e-05
## 10874    1 48044 2.081425e-05
## 10875    1 48044 2.081425e-05
## 10876    1 48044 2.081425e-05
## 10877    1 48044 2.081425e-05
## 10878    1 48044 2.081425e-05
## 10879    1 48044 2.081425e-05
## 10880    1 48044 2.081425e-05
## 10881    1 48044 2.081425e-05
## 10882    1 48044 2.081425e-05
## 10883    1 48044 2.081425e-05
## 10884    1 48044 2.081425e-05
## 10885    1 48044 2.081425e-05
## 10886    1 48044 2.081425e-05
## 10887    1 48044 2.081425e-05
## 10888    1 48044 2.081425e-05
## 10889    1 48044 2.081425e-05
## 10890    1 48044 2.081425e-05
## 10891    1 48044 2.081425e-05
## 10892    1 48044 2.081425e-05
## 10893    1 48044 2.081425e-05
## 10894    1 48044 2.081425e-05
## 10895    1 48044 2.081425e-05
## 10896    1 48044 2.081425e-05
## 10897    1 48044 2.081425e-05
## 10898    1 48044 2.081425e-05
## 10899    1 48044 2.081425e-05
## 10900    1 48044 2.081425e-05
## 10901    1 48044 2.081425e-05
## 10902    1 48044 2.081425e-05
## 10903    1 48044 2.081425e-05
## 10904    1 48044 2.081425e-05
## 10905    1 48044 2.081425e-05
## 10906    1 48044 2.081425e-05
## 10907    1 48044 2.081425e-05
## 10908    1 48044 2.081425e-05
## 10909    1 48044 2.081425e-05
## 10910    1 48044 2.081425e-05
## 10911    1 48044 2.081425e-05
## 10912    1 48044 2.081425e-05
## 10913    1 48044 2.081425e-05
## 10914    1 48044 2.081425e-05
## 10915    1 48044 2.081425e-05
## 10916    1 48044 2.081425e-05
## 10917    1 48044 2.081425e-05
## 10918    1 48044 2.081425e-05
## 10919    1 48044 2.081425e-05
## 10920    1 48044 2.081425e-05
## 10921    1 48044 2.081425e-05
## 10922    1 48044 2.081425e-05
## 10923    1 48044 2.081425e-05
## 10924    1 48044 2.081425e-05
## 10925    1 48044 2.081425e-05
## 10926    1 48044 2.081425e-05
## 10927    1 48044 2.081425e-05
## 10928    1 48044 2.081425e-05
## 10929    1 48044 2.081425e-05
## 10930    1 48044 2.081425e-05
## 10931    1 48044 2.081425e-05
## 10932    1 48044 2.081425e-05
## 10933    1 48044 2.081425e-05
## 10934    1 48044 2.081425e-05
## 10935    1 48044 2.081425e-05
## 10936    1 48044 2.081425e-05
## 10937    1 48044 2.081425e-05
## 10938    1 48044 2.081425e-05
## 10939    1 48044 2.081425e-05
## 10940    1 48044 2.081425e-05
## 10941    1 48044 2.081425e-05
## 10942    1 48044 2.081425e-05
## 10943    1 48044 2.081425e-05
## 10944    1 48044 2.081425e-05
## 10945    1 48044 2.081425e-05
## 10946    1 48044 2.081425e-05
## 10947    1 48044 2.081425e-05
## 10948    1 48044 2.081425e-05
## 10949    1 48044 2.081425e-05
## 10950    1 48044 2.081425e-05
## 10951    1 48044 2.081425e-05
## 10952    1 48044 2.081425e-05
## 10953    1 48044 2.081425e-05
## 10954    1 48044 2.081425e-05
## 10955    1 48044 2.081425e-05
## 10956    1 48044 2.081425e-05
## 10957    1 48044 2.081425e-05
## 10958    1 48044 2.081425e-05
## 10959    1 48044 2.081425e-05
## 10960    1 48044 2.081425e-05
## 10961    1 48044 2.081425e-05
## 10962    1 48044 2.081425e-05
## 10963    1 48044 2.081425e-05
## 10964    1 48044 2.081425e-05
## 10965    1 48044 2.081425e-05
## 10966    1 48044 2.081425e-05
## 10967    1 48044 2.081425e-05
## 10968    1 48044 2.081425e-05
## 10969    1 48044 2.081425e-05
## 10970    1 48044 2.081425e-05
## 10971    1 48044 2.081425e-05
## 10972    1 48044 2.081425e-05
## 10973    1 48044 2.081425e-05
## 10974    1 48044 2.081425e-05
## 10975    1 48044 2.081425e-05
## 10976    1 48044 2.081425e-05
## 10977    1 48044 2.081425e-05
## 10978    1 48044 2.081425e-05
## 10979    1 48044 2.081425e-05
## 10980    1 48044 2.081425e-05
## 10981    1 48044 2.081425e-05
## 10982    1 48044 2.081425e-05
## 10983    1 48044 2.081425e-05
## 10984    1 48044 2.081425e-05
## 10985    1 48044 2.081425e-05
## 10986    1 48044 2.081425e-05
## 10987    1 48044 2.081425e-05
## 10988    1 48044 2.081425e-05
## 10989    1 48044 2.081425e-05
## 10990    1 48044 2.081425e-05
## 10991    1 48044 2.081425e-05
## 10992    1 48044 2.081425e-05
## 10993    1 48044 2.081425e-05
## 10994    1 48044 2.081425e-05
## 10995    1 48044 2.081425e-05
## 10996    1 48044 2.081425e-05
## 10997    1 48044 2.081425e-05
## 10998    1 48044 2.081425e-05
## 10999    1 48044 2.081425e-05
## 11000    1 48044 2.081425e-05
## 11001    1 48044 2.081425e-05
## 11002    1 48044 2.081425e-05
## 11003    1 48044 2.081425e-05
## 11004    1 48044 2.081425e-05
## 11005    1 48044 2.081425e-05
## 11006    1 48044 2.081425e-05
## 11007    1 48044 2.081425e-05
## 11008    1 48044 2.081425e-05
## 11009    1 48044 2.081425e-05
## 11010    1 48044 2.081425e-05
## 11011    1 48044 2.081425e-05
## 11012    1 48044 2.081425e-05
## 11013    1 48044 2.081425e-05
## 11014    1 48044 2.081425e-05
## 11015    1 48044 2.081425e-05
## 11016    1 48044 2.081425e-05
## 11017    1 48044 2.081425e-05
## 11018    1 48044 2.081425e-05
## 11019    1 48044 2.081425e-05
## 11020    1 48044 2.081425e-05
## 11021    1 48044 2.081425e-05
## 11022    1 48044 2.081425e-05
## 11023    1 48044 2.081425e-05
## 11024    1 48044 2.081425e-05
## 11025    1 48044 2.081425e-05
## 11026    1 48044 2.081425e-05
## 11027    1 48044 2.081425e-05
## 11028    1 48044 2.081425e-05
## 11029    1 48044 2.081425e-05
## 11030    1 48044 2.081425e-05
## 11031    1 48044 2.081425e-05
## 11032    1 48044 2.081425e-05
## 11033    1 48044 2.081425e-05
## 11034    1 48044 2.081425e-05
## 11035    1 48044 2.081425e-05
## 11036    1 48044 2.081425e-05
## 11037    1 48044 2.081425e-05
## 11038    1 48044 2.081425e-05
## 11039    1 48044 2.081425e-05
## 11040    1 48044 2.081425e-05
## 11041    1 48044 2.081425e-05
## 11042    1 48044 2.081425e-05
## 11043    1 48044 2.081425e-05
## 11044    1 48044 2.081425e-05
## 11045    1 48044 2.081425e-05
## 11046    1 48044 2.081425e-05
## 11047    1 48044 2.081425e-05
## 11048    1 48044 2.081425e-05
## 11049    1 48044 2.081425e-05
## 11050    1 48044 2.081425e-05
## 11051    1 48044 2.081425e-05
## 11052    1 48044 2.081425e-05
## 11053    1 48044 2.081425e-05
## 11054    1 48044 2.081425e-05
## 11055    1 48044 2.081425e-05
## 11056    1 48044 2.081425e-05
## 11057    1 48044 2.081425e-05
## 11058    1 48044 2.081425e-05
## 11059    1 48044 2.081425e-05
## 11060    1 48044 2.081425e-05
## 11061    1 48044 2.081425e-05
## 11062    1 48044 2.081425e-05
## 11063    1 48044 2.081425e-05
## 11064    1 48044 2.081425e-05
## 11065    1 48044 2.081425e-05
## 11066    1 48044 2.081425e-05
## 11067    1 48044 2.081425e-05
## 11068    1 48044 2.081425e-05
## 11069    1 48044 2.081425e-05
## 11070    1 48044 2.081425e-05
## 11071    1 48044 2.081425e-05
## 11072    1 48044 2.081425e-05
## 11073    1 48044 2.081425e-05
## 11074    1 48044 2.081425e-05
## 11075    1 48044 2.081425e-05
## 11076    1 48044 2.081425e-05
## 11077    1 48044 2.081425e-05
## 11078    1 48044 2.081425e-05
## 11079    1 48044 2.081425e-05
## 11080    1 48044 2.081425e-05
## 11081    1 48044 2.081425e-05
## 11082    1 48044 2.081425e-05
## 11083    1 48044 2.081425e-05
## 11084    1 48044 2.081425e-05
## 11085    1 48044 2.081425e-05
## 11086    1 48044 2.081425e-05
## 11087    1 48044 2.081425e-05
## 11088    1 48044 2.081425e-05
## 11089    1 48044 2.081425e-05
## 11090    1 48044 2.081425e-05
## 11091    1 48044 2.081425e-05
## 11092    1 48044 2.081425e-05
## 11093    1 48044 2.081425e-05
## 11094    1 48044 2.081425e-05
## 11095    1 48044 2.081425e-05
## 11096    1 48044 2.081425e-05
## 11097    1 48044 2.081425e-05
## 11098    1 48044 2.081425e-05
## 11099    1 48044 2.081425e-05
## 11100    1 48044 2.081425e-05
## 11101    1 48044 2.081425e-05
## 11102    1 48044 2.081425e-05
## 11103    1 48044 2.081425e-05
## 11104    1 48044 2.081425e-05
## 11105    1 48044 2.081425e-05
## 11106    1 48044 2.081425e-05
## 11107    1 48044 2.081425e-05
## 11108    1 48044 2.081425e-05
## 11109    1 48044 2.081425e-05
## 11110    1 48044 2.081425e-05
## 11111    1 48044 2.081425e-05
## 11112    1 48044 2.081425e-05
## 11113    1 48044 2.081425e-05
## 11114    1 48044 2.081425e-05
## 11115    1 48044 2.081425e-05
## 11116    1 48044 2.081425e-05
## 11117    1 48044 2.081425e-05
## 11118    1 48044 2.081425e-05
## 11119    1 48044 2.081425e-05
## 11120    1 48044 2.081425e-05
## 11121    1 48044 2.081425e-05
## 11122    1 48044 2.081425e-05
## 11123    1 48044 2.081425e-05
## 11124    1 48044 2.081425e-05
## 11125    1 48044 2.081425e-05
## 11126    1 48044 2.081425e-05
## 11127    1 48044 2.081425e-05
## 11128    1 48044 2.081425e-05
## 11129    1 48044 2.081425e-05
## 11130    1 48044 2.081425e-05
## 11131    1 48044 2.081425e-05
## 11132    1 48044 2.081425e-05
## 11133    1 48044 2.081425e-05
## 11134    1 48044 2.081425e-05
## 11135    1 48044 2.081425e-05
## 11136    1 48044 2.081425e-05
## 11137    1 48044 2.081425e-05
## 11138    1 48044 2.081425e-05
## 11139    1 48044 2.081425e-05
## 11140    1 48044 2.081425e-05
## 11141    1 48044 2.081425e-05
## 11142    1 48044 2.081425e-05
## 11143    1 48044 2.081425e-05
## 11144    1 48044 2.081425e-05
## 11145    1 48044 2.081425e-05
## 11146    1 48044 2.081425e-05
## 11147    1 48044 2.081425e-05
## 11148    1 48044 2.081425e-05
## 11149    1 48044 2.081425e-05
## 11150    1 48044 2.081425e-05
## 11151    1 48044 2.081425e-05
## 11152    1 48044 2.081425e-05
## 11153    1 48044 2.081425e-05
## 11154    1 48044 2.081425e-05
## 11155    1 48044 2.081425e-05
## 11156    1 48044 2.081425e-05
## 11157    1 48044 2.081425e-05
## 11158    1 48044 2.081425e-05
## 11159    1 48044 2.081425e-05
## 11160    1 48044 2.081425e-05
## 11161    1 48044 2.081425e-05
## 11162    1 48044 2.081425e-05
## 11163    1 48044 2.081425e-05
## 11164    1 48044 2.081425e-05
## 11165    1 48044 2.081425e-05
## 11166    1 48044 2.081425e-05
## 11167    1 48044 2.081425e-05
## 11168    1 48044 2.081425e-05
## 11169    1 48044 2.081425e-05
## 11170    1 48044 2.081425e-05
## 11171    1 48044 2.081425e-05
## 11172    1 48044 2.081425e-05
## 11173    1 48044 2.081425e-05
## 11174    1 48044 2.081425e-05
## 11175    1 48044 2.081425e-05
## 11176    1 48044 2.081425e-05
## 11177    1 48044 2.081425e-05
## 11178    1 48044 2.081425e-05
## 11179    1 48044 2.081425e-05
## 11180    1 48044 2.081425e-05
## 11181    1 48044 2.081425e-05
## 11182    1 48044 2.081425e-05
## 11183    1 48044 2.081425e-05
## 11184    1 48044 2.081425e-05
## 11185    1 48044 2.081425e-05
## 11186    1 48044 2.081425e-05
## 11187    1 48044 2.081425e-05
## 11188    1 48044 2.081425e-05
## 11189    1 48044 2.081425e-05
## 11190    1 48044 2.081425e-05
## 11191    1 48044 2.081425e-05
## 11192    1 48044 2.081425e-05
## 11193    1 48044 2.081425e-05
## 11194    1 48044 2.081425e-05
## 11195    1 48044 2.081425e-05
## 11196    1 48044 2.081425e-05
## 11197    1 48044 2.081425e-05
## 11198    1 48044 2.081425e-05
## 11199    1 48044 2.081425e-05
## 11200    1 48044 2.081425e-05
## 11201    1 48044 2.081425e-05
## 11202    1 48044 2.081425e-05
## 11203    1 48044 2.081425e-05
## 11204    1 48044 2.081425e-05
## 11205    1 48044 2.081425e-05
## 11206    1 48044 2.081425e-05
## 11207    1 48044 2.081425e-05
## 11208    1 48044 2.081425e-05
## 11209    1 48044 2.081425e-05
## 11210    1 48044 2.081425e-05
## 11211    1 48044 2.081425e-05
## 11212    1 48044 2.081425e-05
## 11213    1 48044 2.081425e-05
## 11214    1 48044 2.081425e-05
## 11215    1 48044 2.081425e-05
## 11216    1 48044 2.081425e-05
## 11217    1 48044 2.081425e-05
## 11218    1 48044 2.081425e-05
## 11219    1 48044 2.081425e-05
## 11220    1 48044 2.081425e-05
## 11221    1 48044 2.081425e-05
## 11222    1 48044 2.081425e-05
## 11223    1 48044 2.081425e-05
## 11224    1 48044 2.081425e-05
## 11225    1 48044 2.081425e-05
## 11226    1 48044 2.081425e-05
## 11227    1 48044 2.081425e-05
## 11228    1 48044 2.081425e-05
## 11229    1 48044 2.081425e-05
## 11230    1 48044 2.081425e-05
## 11231    1 48044 2.081425e-05
## 11232    1 48044 2.081425e-05
## 11233    1 48044 2.081425e-05
## 11234    1 48044 2.081425e-05
## 11235    1 48044 2.081425e-05
## 11236    1 48044 2.081425e-05
## 11237    1 48044 2.081425e-05
## 11238    1 48044 2.081425e-05
## 11239    1 48044 2.081425e-05
## 11240    1 48044 2.081425e-05
## 11241    1 48044 2.081425e-05
## 11242    1 48044 2.081425e-05
## 11243    1 48044 2.081425e-05
## 11244    1 48044 2.081425e-05
## 11245    1 48044 2.081425e-05
## 11246    1 48044 2.081425e-05
## 11247    1 48044 2.081425e-05
## 11248    1 48044 2.081425e-05
## 11249    1 48044 2.081425e-05
## 11250    1 48044 2.081425e-05
## 11251    1 48044 2.081425e-05
## 11252    1 48044 2.081425e-05
## 11253    1 48044 2.081425e-05
## 11254    1 48044 2.081425e-05
## 11255    1 48044 2.081425e-05
## 11256    1 48044 2.081425e-05
## 11257    1 48044 2.081425e-05
## 11258    1 48044 2.081425e-05
## 11259    1 48044 2.081425e-05
## 11260    1 48044 2.081425e-05
## 11261    1 48044 2.081425e-05
## 11262    1 48044 2.081425e-05
## 11263    1 48044 2.081425e-05
## 11264    1 48044 2.081425e-05
## 11265    1 48044 2.081425e-05
## 11266    1 48044 2.081425e-05
## 11267    1 48044 2.081425e-05
## 11268    1 48044 2.081425e-05
## 11269    1 48044 2.081425e-05
## 11270    1 48044 2.081425e-05
## 11271    1 48044 2.081425e-05
## 11272    1 48044 2.081425e-05
## 11273    1 48044 2.081425e-05
## 11274    1 48044 2.081425e-05
## 11275    1 48044 2.081425e-05
## 11276    1 48044 2.081425e-05
## 11277    1 48044 2.081425e-05
## 11278    1 48044 2.081425e-05
## 11279    1 48044 2.081425e-05
## 11280    1 48044 2.081425e-05
## 11281    1 48044 2.081425e-05
## 11282    1 48044 2.081425e-05
## 11283    1 48044 2.081425e-05
## 11284    1 48044 2.081425e-05
## 11285    1 48044 2.081425e-05
## 11286    1 48044 2.081425e-05
## 11287    1 48044 2.081425e-05
## 11288    1 48044 2.081425e-05
## 11289    1 48044 2.081425e-05
## 11290    1 48044 2.081425e-05
## 11291    1 48044 2.081425e-05
## 11292    1 48044 2.081425e-05
## 11293    1 48044 2.081425e-05
## 11294    1 48044 2.081425e-05
## 11295    1 48044 2.081425e-05
## 11296    1 48044 2.081425e-05
## 11297    1 48044 2.081425e-05
## 11298    1 48044 2.081425e-05
## 11299    1 48044 2.081425e-05
## 11300    1 48044 2.081425e-05
## 11301    1 48044 2.081425e-05
## 11302    1 48044 2.081425e-05
## 11303    1 48044 2.081425e-05
## 11304    1 48044 2.081425e-05
## 11305    1 48044 2.081425e-05
## 11306    1 48044 2.081425e-05
## 11307    1 48044 2.081425e-05
## 11308    1 48044 2.081425e-05
## 11309    1 48044 2.081425e-05
## 11310    1 48044 2.081425e-05
## 11311    1 48044 2.081425e-05
## 11312    1 48044 2.081425e-05
## 11313    1 48044 2.081425e-05
## 11314    1 48044 2.081425e-05
## 11315    1 48044 2.081425e-05
## 11316    1 48044 2.081425e-05
## 11317    1 48044 2.081425e-05
## 11318    1 48044 2.081425e-05
## 11319    1 48044 2.081425e-05
## 11320    1 48044 2.081425e-05
## 11321    1 48044 2.081425e-05
## 11322    1 48044 2.081425e-05
## 11323    1 48044 2.081425e-05
## 11324    1 48044 2.081425e-05
## 11325    1 48044 2.081425e-05
## 11326    1 48044 2.081425e-05
## 11327    1 48044 2.081425e-05
## 11328    1 48044 2.081425e-05
## 11329    1 48044 2.081425e-05
## 11330    1 48044 2.081425e-05
## 11331    1 48044 2.081425e-05
## 11332    1 48044 2.081425e-05
## 11333    1 48044 2.081425e-05
## 11334    1 48044 2.081425e-05
## 11335    1 48044 2.081425e-05
## 11336    1 48044 2.081425e-05
## 11337    1 48044 2.081425e-05
## 11338    1 48044 2.081425e-05
## 11339    1 48044 2.081425e-05
## 11340    1 48044 2.081425e-05
## 11341    1 48044 2.081425e-05
## 11342    1 48044 2.081425e-05
## 11343    1 48044 2.081425e-05
## 11344    1 48044 2.081425e-05
## 11345    1 48044 2.081425e-05
## 11346    1 48044 2.081425e-05
## 11347    1 48044 2.081425e-05
## 11348    1 48044 2.081425e-05
## 11349    1 48044 2.081425e-05
## 11350    1 48044 2.081425e-05
## 11351    1 48044 2.081425e-05
## 11352    1 48044 2.081425e-05
## 11353    1 48044 2.081425e-05
## 11354    1 48044 2.081425e-05
## 11355    1 48044 2.081425e-05
## 11356    1 48044 2.081425e-05
## 11357    1 48044 2.081425e-05
## 11358    1 48044 2.081425e-05
## 11359    1 48044 2.081425e-05
## 11360    1 48044 2.081425e-05
## 11361    1 48044 2.081425e-05
## 11362    1 48044 2.081425e-05
## 11363    1 48044 2.081425e-05
## 11364    1 48044 2.081425e-05
## 11365    1 48044 2.081425e-05
## 11366    1 48044 2.081425e-05
## 11367    1 48044 2.081425e-05
## 11368    1 48044 2.081425e-05
## 11369    1 48044 2.081425e-05
## 11370    1 48044 2.081425e-05
## 11371    1 48044 2.081425e-05
## 11372    1 48044 2.081425e-05
## 11373    1 48044 2.081425e-05
## 11374    1 48044 2.081425e-05
## 11375    1 48044 2.081425e-05
## 11376    1 48044 2.081425e-05
## 11377    1 48044 2.081425e-05
## 11378    1 48044 2.081425e-05
## 11379    1 48044 2.081425e-05
## 11380    1 48044 2.081425e-05
## 11381    1 48044 2.081425e-05
## 11382    1 48044 2.081425e-05
## 11383    1 48044 2.081425e-05
## 11384    1 48044 2.081425e-05
## 11385    1 48044 2.081425e-05
## 11386    1 48044 2.081425e-05
## 11387    1 48044 2.081425e-05
## 11388    1 48044 2.081425e-05
## 11389    1 48044 2.081425e-05
## 11390    1 48044 2.081425e-05
## 11391    1 48044 2.081425e-05
## 11392    1 48044 2.081425e-05
## 11393    1 48044 2.081425e-05
## 11394    1 48044 2.081425e-05
## 11395    1 48044 2.081425e-05
## 11396    1 48044 2.081425e-05
## 11397    1 48044 2.081425e-05
## 11398    1 48044 2.081425e-05
## 11399    1 48044 2.081425e-05
## 11400    1 48044 2.081425e-05
## 11401    1 48044 2.081425e-05
## 11402    1 48044 2.081425e-05
## 11403    1 48044 2.081425e-05
## 11404    1 48044 2.081425e-05
## 11405    1 48044 2.081425e-05
## 11406    1 48044 2.081425e-05
## 11407    1 48044 2.081425e-05
## 11408    1 48044 2.081425e-05
## 11409    1 48044 2.081425e-05
## 11410    1 48044 2.081425e-05
## 11411    1 48044 2.081425e-05
## 11412    1 48044 2.081425e-05
## 11413    1 48044 2.081425e-05
## 11414    1 48044 2.081425e-05
## 11415    1 48044 2.081425e-05
## 11416    1 48044 2.081425e-05
## 11417    1 48044 2.081425e-05
## 11418    1 48044 2.081425e-05
## 11419    1 48044 2.081425e-05
## 11420    1 48044 2.081425e-05
## 11421    1 48044 2.081425e-05
## 11422    1 48044 2.081425e-05
## 11423    1 48044 2.081425e-05
## 11424    1 48044 2.081425e-05
## 11425    1 48044 2.081425e-05
## 11426    1 48044 2.081425e-05
## 11427    1 48044 2.081425e-05
## 11428    1 48044 2.081425e-05
## 11429    1 48044 2.081425e-05
## 11430    1 48044 2.081425e-05
## 11431    1 48044 2.081425e-05
## 11432    1 48044 2.081425e-05
## 11433    1 48044 2.081425e-05
## 11434    1 48044 2.081425e-05
## 11435    1 48044 2.081425e-05
## 11436    1 48044 2.081425e-05
## 11437    1 48044 2.081425e-05
## 11438    1 48044 2.081425e-05
## 11439    1 48044 2.081425e-05
## 11440    1 48044 2.081425e-05
## 11441    1 48044 2.081425e-05
## 11442    1 48044 2.081425e-05
## 11443    1 48044 2.081425e-05
## 11444    1 48044 2.081425e-05
## 11445    1 48044 2.081425e-05
## 11446    1 48044 2.081425e-05
## 11447    1 48044 2.081425e-05
## 11448    1 48044 2.081425e-05
## 11449    1 48044 2.081425e-05
## 11450    1 48044 2.081425e-05
## 11451    1 48044 2.081425e-05
## 11452    1 48044 2.081425e-05
## 11453    1 48044 2.081425e-05
## 11454    1 48044 2.081425e-05
## 11455    1 48044 2.081425e-05
## 11456    1 48044 2.081425e-05
## 11457    1 48044 2.081425e-05
## 11458    1 48044 2.081425e-05
## 11459    1 48044 2.081425e-05
## 11460    1 48044 2.081425e-05
## 11461    1 48044 2.081425e-05
## 11462    1 48044 2.081425e-05
## 11463    1 48044 2.081425e-05
## 11464    1 48044 2.081425e-05
## 11465    1 48044 2.081425e-05
## 11466    1 48044 2.081425e-05
## 11467    1 48044 2.081425e-05
## 11468    1 48044 2.081425e-05
## 11469    1 48044 2.081425e-05
## 11470    1 48044 2.081425e-05
## 11471    1 48044 2.081425e-05
## 11472    1 48044 2.081425e-05
## 11473    1 48044 2.081425e-05
## 11474    1 48044 2.081425e-05
## 11475    1 48044 2.081425e-05
## 11476    1 48044 2.081425e-05
## 11477    1 48044 2.081425e-05
## 11478    1 48044 2.081425e-05
## 11479    1 48044 2.081425e-05
## 11480    1 48044 2.081425e-05
## 11481    1 48044 2.081425e-05
## 11482    1 48044 2.081425e-05
## 11483    1 48044 2.081425e-05
## 11484    1 48044 2.081425e-05
## 11485    1 48044 2.081425e-05
## 11486    1 48044 2.081425e-05
## 11487    1 48044 2.081425e-05
## 11488    1 48044 2.081425e-05
## 11489    1 48044 2.081425e-05
## 11490    1 48044 2.081425e-05
## 11491    1 48044 2.081425e-05
## 11492    1 48044 2.081425e-05
## 11493    1 48044 2.081425e-05
## 11494    1 48044 2.081425e-05
## 11495    1 48044 2.081425e-05
## 11496    1 48044 2.081425e-05
## 11497    1 48044 2.081425e-05
## 11498    1 48044 2.081425e-05
## 11499    1 48044 2.081425e-05
## 11500    1 48044 2.081425e-05
## 11501    1 48044 2.081425e-05
## 11502    1 48044 2.081425e-05
## 11503    1 48044 2.081425e-05
## 11504    1 48044 2.081425e-05
## 11505    1 48044 2.081425e-05
## 11506    1 48044 2.081425e-05
## 11507    1 48044 2.081425e-05
## 11508    1 48044 2.081425e-05
## 11509    1 48044 2.081425e-05
## 11510    1 48044 2.081425e-05
## 11511    1 48044 2.081425e-05
## 11512    1 48044 2.081425e-05
## 11513    1 48044 2.081425e-05
## 11514    1 48044 2.081425e-05
## 11515    1 48044 2.081425e-05
## 11516    1 48044 2.081425e-05
## 11517    1 48044 2.081425e-05
## 11518    1 48044 2.081425e-05
## 11519    1 48044 2.081425e-05
## 11520    1 48044 2.081425e-05
## 11521    1 48044 2.081425e-05
## 11522    1 48044 2.081425e-05
## 11523    1 48044 2.081425e-05
## 11524    1 48044 2.081425e-05
## 11525    1 48044 2.081425e-05
## 11526    1 48044 2.081425e-05
## 11527    1 48044 2.081425e-05
## 11528    1 48044 2.081425e-05
## 11529    1 48044 2.081425e-05
## 11530    1 48044 2.081425e-05
## 11531    1 48044 2.081425e-05
## 11532    1 48044 2.081425e-05
## 11533    1 48044 2.081425e-05
## 11534    1 48044 2.081425e-05
## 11535    1 48044 2.081425e-05
## 11536    1 48044 2.081425e-05
## 11537    1 48044 2.081425e-05
## 11538    1 48044 2.081425e-05
## 11539    1 48044 2.081425e-05
## 11540    1 48044 2.081425e-05
## 11541    1 48044 2.081425e-05
## 11542    1 48044 2.081425e-05
## 11543    1 48044 2.081425e-05
## 11544    1 48044 2.081425e-05
## 11545    1 48044 2.081425e-05
## 11546    1 48044 2.081425e-05
## 11547    1 48044 2.081425e-05
## 11548    1 48044 2.081425e-05
## 11549    1 48044 2.081425e-05
## 11550    1 48044 2.081425e-05
## 11551    1 48044 2.081425e-05
## 11552    1 48044 2.081425e-05
## 11553    1 48044 2.081425e-05
## 11554    1 48044 2.081425e-05
## 11555    1 48044 2.081425e-05
## 11556    1 48044 2.081425e-05
## 11557    1 48044 2.081425e-05
## 11558    1 48044 2.081425e-05
## 11559    1 48044 2.081425e-05
## 11560    1 48044 2.081425e-05
## 11561    1 48044 2.081425e-05
## 11562    1 48044 2.081425e-05
## 11563    1 48044 2.081425e-05
## 11564    1 48044 2.081425e-05
## 11565    1 48044 2.081425e-05
## 11566    1 48044 2.081425e-05
## 11567    1 48044 2.081425e-05
## 11568    1 48044 2.081425e-05
## 11569    1 48044 2.081425e-05
## 11570    1 48044 2.081425e-05
## 11571    1 48044 2.081425e-05
## 11572    1 48044 2.081425e-05
## 11573    1 48044 2.081425e-05
## 11574    1 48044 2.081425e-05
## 11575    1 48044 2.081425e-05
## 11576    1 48044 2.081425e-05
## 11577    1 48044 2.081425e-05
## 11578    1 48044 2.081425e-05
## 11579    1 48044 2.081425e-05
## 11580    1 48044 2.081425e-05
## 11581    1 48044 2.081425e-05
## 11582    1 48044 2.081425e-05
## 11583    1 48044 2.081425e-05
## 11584    1 48044 2.081425e-05
## 11585    1 48044 2.081425e-05
## 11586    1 48044 2.081425e-05
## 11587    1 48044 2.081425e-05
## 11588    1 48044 2.081425e-05
## 11589    1 48044 2.081425e-05
## 11590    1 48044 2.081425e-05
## 11591    1 48044 2.081425e-05
## 11592    1 48044 2.081425e-05
## 11593    1 48044 2.081425e-05
## 11594    1 48044 2.081425e-05
## 11595    1 48044 2.081425e-05
## 11596    1 48044 2.081425e-05
## 11597    1 48044 2.081425e-05
## 11598    1 48044 2.081425e-05
## 11599    1 48044 2.081425e-05
## 11600    1 48044 2.081425e-05
## 11601    1 48044 2.081425e-05
## 11602    1 48044 2.081425e-05
## 11603    1 48044 2.081425e-05
## 11604    1 48044 2.081425e-05
## 11605    1 48044 2.081425e-05
## 11606    1 48044 2.081425e-05
## 11607    1 48044 2.081425e-05
## 11608    1 48044 2.081425e-05
## 11609    1 48044 2.081425e-05
## 11610    1 48044 2.081425e-05
## 11611    1 48044 2.081425e-05
## 11612    1 48044 2.081425e-05
## 11613    1 48044 2.081425e-05
## 11614    1 48044 2.081425e-05
## 11615    1 48044 2.081425e-05
## 11616    1 48044 2.081425e-05
## 11617    1 48044 2.081425e-05
## 11618    1 48044 2.081425e-05
## 11619    1 48044 2.081425e-05
## 11620    1 48044 2.081425e-05
## 11621    1 48044 2.081425e-05
## 11622    1 48044 2.081425e-05
## 11623    1 48044 2.081425e-05
## 11624    1 48044 2.081425e-05
## 11625    1 48044 2.081425e-05
## 11626    1 48044 2.081425e-05
## 11627    1 48044 2.081425e-05
## 11628    1 48044 2.081425e-05
## 11629    1 48044 2.081425e-05
## 11630    1 48044 2.081425e-05
## 11631    1 48044 2.081425e-05
## 11632    1 48044 2.081425e-05
## 11633    1 48044 2.081425e-05
## 11634    1 48044 2.081425e-05
## 11635    1 48044 2.081425e-05
## 11636    1 48044 2.081425e-05
## 11637    1 48044 2.081425e-05
## 11638    1 48044 2.081425e-05
## 11639    1 48044 2.081425e-05
## 11640    1 48044 2.081425e-05
## 11641    1 48044 2.081425e-05
## 11642    1 48044 2.081425e-05
## 11643    1 48044 2.081425e-05
## 11644    1 48044 2.081425e-05
## 11645    1 48044 2.081425e-05
## 11646    1 48044 2.081425e-05
## 11647    1 48044 2.081425e-05
## 11648    1 48044 2.081425e-05
## 11649    1 48044 2.081425e-05
## 11650    1 48044 2.081425e-05
## 11651    1 48044 2.081425e-05
## 11652    1 48044 2.081425e-05
## 11653    1 48044 2.081425e-05
## 11654    1 48044 2.081425e-05
## 11655    1 48044 2.081425e-05
## 11656    1 48044 2.081425e-05
## 11657    1 48044 2.081425e-05
## 11658    1 48044 2.081425e-05
## 11659    1 48044 2.081425e-05
## 11660    1 48044 2.081425e-05
## 11661    1 48044 2.081425e-05
## 11662    1 48044 2.081425e-05
## 11663    1 48044 2.081425e-05
## 11664    1 48044 2.081425e-05
## 11665    1 48044 2.081425e-05
## 11666    1 48044 2.081425e-05
## 11667    1 48044 2.081425e-05
## 11668    1 48044 2.081425e-05
## 11669    1 48044 2.081425e-05
## 11670    1 48044 2.081425e-05
## 11671    1 48044 2.081425e-05
## 11672    1 48044 2.081425e-05
## 11673    1 48044 2.081425e-05
## 11674    1 48044 2.081425e-05
## 11675    1 48044 2.081425e-05
## 11676    1 48044 2.081425e-05
## 11677    1 48044 2.081425e-05
## 11678    1 48044 2.081425e-05
## 11679    1 48044 2.081425e-05
## 11680    1 48044 2.081425e-05
## 11681    1 48044 2.081425e-05
## 11682    1 48044 2.081425e-05
## 11683    1 48044 2.081425e-05
## 11684    1 48044 2.081425e-05
## 11685    1 48044 2.081425e-05
## 11686    1 48044 2.081425e-05
## 11687    1 48044 2.081425e-05
## 11688    1 48044 2.081425e-05
## 11689    1 48044 2.081425e-05
## 11690    1 48044 2.081425e-05
## 11691    1 48044 2.081425e-05
## 11692    1 48044 2.081425e-05
## 11693    1 48044 2.081425e-05
## 11694    1 48044 2.081425e-05
## 11695    1 48044 2.081425e-05
## 11696    1 48044 2.081425e-05
## 11697    1 48044 2.081425e-05
## 11698    1 48044 2.081425e-05
## 11699    1 48044 2.081425e-05
## 11700    1 48044 2.081425e-05
## 11701    1 48044 2.081425e-05
## 11702    1 48044 2.081425e-05
## 11703    1 48044 2.081425e-05
## 11704    1 48044 2.081425e-05
## 11705    1 48044 2.081425e-05
## 11706    1 48044 2.081425e-05
## 11707    1 48044 2.081425e-05
## 11708    1 48044 2.081425e-05
## 11709    1 48044 2.081425e-05
## 11710    1 48044 2.081425e-05
## 11711    1 48044 2.081425e-05
## 11712    1 48044 2.081425e-05
## 11713    1 48044 2.081425e-05
## 11714    1 48044 2.081425e-05
## 11715    1 48044 2.081425e-05
## 11716    1 48044 2.081425e-05
## 11717    1 48044 2.081425e-05
## 11718    1 48044 2.081425e-05
## 11719    1 48044 2.081425e-05
## 11720    1 48044 2.081425e-05
## 11721    1 48044 2.081425e-05
## 11722    1 48044 2.081425e-05
## 11723    1 48044 2.081425e-05
## 11724    1 48044 2.081425e-05
## 11725    1 48044 2.081425e-05
## 11726    1 48044 2.081425e-05
## 11727    1 48044 2.081425e-05
## 11728    1 48044 2.081425e-05
## 11729    1 48044 2.081425e-05
## 11730    1 48044 2.081425e-05
## 11731    1 48044 2.081425e-05
## 11732    1 48044 2.081425e-05
## 11733    1 48044 2.081425e-05
## 11734    1 48044 2.081425e-05
## 11735    1 48044 2.081425e-05
## 11736    1 48044 2.081425e-05
## 11737    1 48044 2.081425e-05
## 11738    1 48044 2.081425e-05
## 11739    1 48044 2.081425e-05
## 11740    1 48044 2.081425e-05
## 11741    1 48044 2.081425e-05
## 11742    1 48044 2.081425e-05
## 11743    1 48044 2.081425e-05
## 11744    1 48044 2.081425e-05
## 11745    1 48044 2.081425e-05
## 11746    1 48044 2.081425e-05
## 11747    1 48044 2.081425e-05
## 11748    1 48044 2.081425e-05
## 11749    1 48044 2.081425e-05
## 11750    1 48044 2.081425e-05
## 11751    1 48044 2.081425e-05
## 11752    1 48044 2.081425e-05
## 11753    1 48044 2.081425e-05
## 11754    1 48044 2.081425e-05
## 11755    1 48044 2.081425e-05
## 11756    1 48044 2.081425e-05
## 11757    1 48044 2.081425e-05
## 11758    1 48044 2.081425e-05
## 11759    1 48044 2.081425e-05
## 11760    1 48044 2.081425e-05
## 11761    1 48044 2.081425e-05
## 11762    1 48044 2.081425e-05
## 11763    1 48044 2.081425e-05
## 11764    1 48044 2.081425e-05
## 11765    1 48044 2.081425e-05
## 11766    1 48044 2.081425e-05
## 11767    1 48044 2.081425e-05
## 11768    1 48044 2.081425e-05
## 11769    1 48044 2.081425e-05
## 11770    1 48044 2.081425e-05
## 11771    1 48044 2.081425e-05
## 11772    1 48044 2.081425e-05
## 11773    1 48044 2.081425e-05
## 11774    1 48044 2.081425e-05
## 11775    1 48044 2.081425e-05
## 11776    1 48044 2.081425e-05
## 11777    1 48044 2.081425e-05
## 11778    1 48044 2.081425e-05
## 11779    1 48044 2.081425e-05
## 11780    1 48044 2.081425e-05
## 11781    1 48044 2.081425e-05
## 11782    1 48044 2.081425e-05
## 11783    1 48044 2.081425e-05
## 11784    1 48044 2.081425e-05
## 11785    1 48044 2.081425e-05
## 11786    1 48044 2.081425e-05
## 11787    1 48044 2.081425e-05
## 11788    1 48044 2.081425e-05
## 11789    1 48044 2.081425e-05
## 11790    1 48044 2.081425e-05
## 11791    1 48044 2.081425e-05
## 11792    1 48044 2.081425e-05
## 11793    1 48044 2.081425e-05
## 11794    1 48044 2.081425e-05
## 11795    1 48044 2.081425e-05
## 11796    1 48044 2.081425e-05
## 11797    1 48044 2.081425e-05
## 11798    1 48044 2.081425e-05
## 11799    1 48044 2.081425e-05
## 11800    1 48044 2.081425e-05
## 11801    1 48044 2.081425e-05
## 11802    1 48044 2.081425e-05
## 11803    1 48044 2.081425e-05
## 11804    1 48044 2.081425e-05
## 11805    1 48044 2.081425e-05
## 11806    1 48044 2.081425e-05
## 11807    1 48044 2.081425e-05
## 11808    1 48044 2.081425e-05
## 11809    1 48044 2.081425e-05
## 11810    1 48044 2.081425e-05
## 11811    1 48044 2.081425e-05
## 11812    1 48044 2.081425e-05
## 11813    1 48044 2.081425e-05
## 11814    1 48044 2.081425e-05
## 11815    1 48044 2.081425e-05
## 11816    1 48044 2.081425e-05
## 11817    1 48044 2.081425e-05
## 11818    1 48044 2.081425e-05
## 11819    1 48044 2.081425e-05
## 11820    1 48044 2.081425e-05
## 11821    1 48044 2.081425e-05
## 11822    1 48044 2.081425e-05
## 11823    1 48044 2.081425e-05
## 11824    1 48044 2.081425e-05
## 11825    1 48044 2.081425e-05
## 11826    1 48044 2.081425e-05
## 11827    1 48044 2.081425e-05
## 11828    1 48044 2.081425e-05
## 11829    1 48044 2.081425e-05
## 11830    1 48044 2.081425e-05
## 11831    1 48044 2.081425e-05
## 11832    1 48044 2.081425e-05
## 11833    1 48044 2.081425e-05
## 11834    1 48044 2.081425e-05
## 11835    1 48044 2.081425e-05
## 11836    1 48044 2.081425e-05
## 11837    1 48044 2.081425e-05
## 11838    1 48044 2.081425e-05
## 11839    1 48044 2.081425e-05
## 11840    1 48044 2.081425e-05
## 11841    1 48044 2.081425e-05
## 11842    1 48044 2.081425e-05
## 11843    1 48044 2.081425e-05
## 11844    1 48044 2.081425e-05
## 11845    1 48044 2.081425e-05
## 11846    1 48044 2.081425e-05
## 11847    1 48044 2.081425e-05
## 11848    1 48044 2.081425e-05
## 11849    1 48044 2.081425e-05
## 11850    1 48044 2.081425e-05
## 11851    1 48044 2.081425e-05
## 11852    1 48044 2.081425e-05
## 11853    1 48044 2.081425e-05
## 11854    1 48044 2.081425e-05
## 11855    1 48044 2.081425e-05
## 11856    1 48044 2.081425e-05
## 11857    1 48044 2.081425e-05
## 11858    1 48044 2.081425e-05
## 11859    1 48044 2.081425e-05
## 11860    1 48044 2.081425e-05
## 11861    1 48044 2.081425e-05
## 11862    1 48044 2.081425e-05
## 11863    1 48044 2.081425e-05
## 11864    1 48044 2.081425e-05
## 11865    1 48044 2.081425e-05
## 11866    1 48044 2.081425e-05
## 11867    1 48044 2.081425e-05
## 11868    1 48044 2.081425e-05
## 11869    1 48044 2.081425e-05
## 11870    1 48044 2.081425e-05
## 11871    1 48044 2.081425e-05
## 11872    1 48044 2.081425e-05
## 11873    1 48044 2.081425e-05
## 11874    1 48044 2.081425e-05
## 11875    1 48044 2.081425e-05
## 11876    1 48044 2.081425e-05
## 11877    1 48044 2.081425e-05
## 11878    1 48044 2.081425e-05
## 11879    1 48044 2.081425e-05
## 11880    1 48044 2.081425e-05
## 11881    1 48044 2.081425e-05
## 11882    1 48044 2.081425e-05
## 11883    1 48044 2.081425e-05
## 11884    1 48044 2.081425e-05
## 11885    1 48044 2.081425e-05
## 11886    1 48044 2.081425e-05
## 11887    1 48044 2.081425e-05
## 11888    1 48044 2.081425e-05
## 11889    1 48044 2.081425e-05
## 11890    1 48044 2.081425e-05
## 11891    1 48044 2.081425e-05
## 11892    1 48044 2.081425e-05
## 11893    1 48044 2.081425e-05
## 11894    1 48044 2.081425e-05
## 11895    1 48044 2.081425e-05
## 11896    1 48044 2.081425e-05
## 11897    1 48044 2.081425e-05
## 11898    1 48044 2.081425e-05
## 11899    1 48044 2.081425e-05
## 11900    1 48044 2.081425e-05
## 11901    1 48044 2.081425e-05
## 11902    1 48044 2.081425e-05
## 11903    1 48044 2.081425e-05
## 11904    1 48044 2.081425e-05
## 11905    1 48044 2.081425e-05
## 11906    1 48044 2.081425e-05
## 11907    1 48044 2.081425e-05
## 11908    1 48044 2.081425e-05
## 11909    1 48044 2.081425e-05
## 11910    1 48044 2.081425e-05
## 11911    1 48044 2.081425e-05
## 11912    1 48044 2.081425e-05
## 11913    1 48044 2.081425e-05
## 11914    1 48044 2.081425e-05
## 11915    1 48044 2.081425e-05
## 11916    1 48044 2.081425e-05
## 11917    1 48044 2.081425e-05
## 11918    1 48044 2.081425e-05
## 11919    1 48044 2.081425e-05
## 11920    1 48044 2.081425e-05
## 11921    1 48044 2.081425e-05
## 11922    1 48044 2.081425e-05
## 11923    1 48044 2.081425e-05
## 11924    1 48044 2.081425e-05
## 11925    1 48044 2.081425e-05
## 11926    1 48044 2.081425e-05
## 11927    1 48044 2.081425e-05
## 11928    1 48044 2.081425e-05
## 11929    1 48044 2.081425e-05
## 11930    1 48044 2.081425e-05
## 11931    1 48044 2.081425e-05
## 11932    1 48044 2.081425e-05
## 11933    1 48044 2.081425e-05
## 11934    1 48044 2.081425e-05
## 11935    1 48044 2.081425e-05
## 11936    1 48044 2.081425e-05
## 11937    1 48044 2.081425e-05
## 11938    1 48044 2.081425e-05
## 11939    1 48044 2.081425e-05
## 11940    1 48044 2.081425e-05
## 11941    1 48044 2.081425e-05
## 11942    1 48044 2.081425e-05
## 11943    1 48044 2.081425e-05
## 11944    1 48044 2.081425e-05
## 11945    1 48044 2.081425e-05
## 11946    1 48044 2.081425e-05
## 11947    1 48044 2.081425e-05
## 11948    1 48044 2.081425e-05
## 11949    1 48044 2.081425e-05
## 11950    1 48044 2.081425e-05
## 11951    1 48044 2.081425e-05
## 11952    1 48044 2.081425e-05
## 11953    1 48044 2.081425e-05
## 11954    1 48044 2.081425e-05
## 11955    1 48044 2.081425e-05
## 11956    1 48044 2.081425e-05
## 11957    1 48044 2.081425e-05
## 11958    1 48044 2.081425e-05
## 11959    1 48044 2.081425e-05
## 11960    1 48044 2.081425e-05
## 11961    1 48044 2.081425e-05
## 11962    1 48044 2.081425e-05
## 11963    1 48044 2.081425e-05
## 11964    1 48044 2.081425e-05
## 11965    1 48044 2.081425e-05
## 11966    1 48044 2.081425e-05
## 11967    1 48044 2.081425e-05
## 11968    1 48044 2.081425e-05
## 11969    1 48044 2.081425e-05
## 11970    1 48044 2.081425e-05
## 11971    1 48044 2.081425e-05
## 11972    1 48044 2.081425e-05
## 11973    1 48044 2.081425e-05
## 11974    1 48044 2.081425e-05
## 11975    1 48044 2.081425e-05
## 11976    1 48044 2.081425e-05
## 11977    1 48044 2.081425e-05
## 11978    1 48044 2.081425e-05
## 11979    1 48044 2.081425e-05
## 11980    1 48044 2.081425e-05
## 11981    1 48044 2.081425e-05
## 11982    1 48044 2.081425e-05
## 11983    1 48044 2.081425e-05
## 11984    1 48044 2.081425e-05
## 11985    1 48044 2.081425e-05
## 11986    1 48044 2.081425e-05
## 11987    1 48044 2.081425e-05
## 11988    1 48044 2.081425e-05
## 11989    1 48044 2.081425e-05
## 11990    1 48044 2.081425e-05
## 11991    1 48044 2.081425e-05
## 11992    1 48044 2.081425e-05
## 11993    1 48044 2.081425e-05
## 11994    1 48044 2.081425e-05
## 11995    1 48044 2.081425e-05
## 11996    1 48044 2.081425e-05
## 11997    1 48044 2.081425e-05
## 11998    1 48044 2.081425e-05
## 11999    1 48044 2.081425e-05
## 12000    1 48044 2.081425e-05
## 12001    1 48044 2.081425e-05
## 12002    1 48044 2.081425e-05
## 12003    1 48044 2.081425e-05
## 12004    1 48044 2.081425e-05
## 12005    1 48044 2.081425e-05
## 12006    1 48044 2.081425e-05
## 12007    1 48044 2.081425e-05
## 12008    1 48044 2.081425e-05
## 12009    1 48044 2.081425e-05
## 12010    1 48044 2.081425e-05
## 12011    1 48044 2.081425e-05
## 12012    1 48044 2.081425e-05
## 12013    1 48044 2.081425e-05
## 12014    1 48044 2.081425e-05
## 12015    1 48044 2.081425e-05
## 12016    1 48044 2.081425e-05
## 12017    1 48044 2.081425e-05
## 12018    1 48044 2.081425e-05
## 12019    1 48044 2.081425e-05
## 12020    1 48044 2.081425e-05
## 12021    1 48044 2.081425e-05
## 12022    1 48044 2.081425e-05
## 12023    1 48044 2.081425e-05
## 12024    1 48044 2.081425e-05
## 12025    1 48044 2.081425e-05
## 12026    1 48044 2.081425e-05
## 12027    1 48044 2.081425e-05
## 12028    1 48044 2.081425e-05
## 12029    1 48044 2.081425e-05
## 12030    1 48044 2.081425e-05
## 12031    1 48044 2.081425e-05
## 12032    1 48044 2.081425e-05
## 12033    1 48044 2.081425e-05
## 12034    1 48044 2.081425e-05
## 12035    1 48044 2.081425e-05
## 12036    1 48044 2.081425e-05
## 12037    1 48044 2.081425e-05
## 12038    1 48044 2.081425e-05
## 12039    1 48044 2.081425e-05
## 12040    1 48044 2.081425e-05
## 12041    1 48044 2.081425e-05
## 12042    1 48044 2.081425e-05
## 12043    1 48044 2.081425e-05
## 12044    1 48044 2.081425e-05
## 12045    1 48044 2.081425e-05
## 12046    1 48044 2.081425e-05
## 12047    1 48044 2.081425e-05
## 12048    1 48044 2.081425e-05
## 12049    1 48044 2.081425e-05
## 12050    1 48044 2.081425e-05
## 12051    1 48044 2.081425e-05
## 12052    1 48044 2.081425e-05
## 12053    1 48044 2.081425e-05
## 12054    1 48044 2.081425e-05
## 12055    1 48044 2.081425e-05
## 12056    1 48044 2.081425e-05
## 12057    1 48044 2.081425e-05
## 12058    1 48044 2.081425e-05
## 12059    1 48044 2.081425e-05
## 12060    1 48044 2.081425e-05
## 12061    1 48044 2.081425e-05
## 12062    1 48044 2.081425e-05
## 12063    1 48044 2.081425e-05
## 12064    1 48044 2.081425e-05
## 12065    1 48044 2.081425e-05
## 12066    1 48044 2.081425e-05
## 12067    1 48044 2.081425e-05
## 12068    1 48044 2.081425e-05
## 12069    1 48044 2.081425e-05
## 12070    1 48044 2.081425e-05
## 12071    1 48044 2.081425e-05
## 12072    1 48044 2.081425e-05
## 12073    1 48044 2.081425e-05
## 12074    1 48044 2.081425e-05
## 12075    1 48044 2.081425e-05
## 12076    1 48044 2.081425e-05
## 12077    1 48044 2.081425e-05
## 12078    1 48044 2.081425e-05
## 12079    1 48044 2.081425e-05
## 12080    1 48044 2.081425e-05
## 12081    1 48044 2.081425e-05
## 12082    1 48044 2.081425e-05
## 12083    1 48044 2.081425e-05
## 12084    1 48044 2.081425e-05
## 12085    1 48044 2.081425e-05
## 12086    1 48044 2.081425e-05
## 12087    1 48044 2.081425e-05
## 12088    1 48044 2.081425e-05
## 12089    1 48044 2.081425e-05
## 12090    1 48044 2.081425e-05
## 12091    1 48044 2.081425e-05
## 12092    1 48044 2.081425e-05
## 12093    1 48044 2.081425e-05
## 12094    1 48044 2.081425e-05
## 12095    1 48044 2.081425e-05
## 12096    1 48044 2.081425e-05
## 12097    1 48044 2.081425e-05
## 12098    1 48044 2.081425e-05
## 12099    1 48044 2.081425e-05
## 12100    1 48044 2.081425e-05
## 12101    1 48044 2.081425e-05
## 12102    1 48044 2.081425e-05
## 12103    1 48044 2.081425e-05
## 12104    1 48044 2.081425e-05
## 12105    1 48044 2.081425e-05
## 12106    1 48044 2.081425e-05
## 12107    1 48044 2.081425e-05
## 12108    1 48044 2.081425e-05
## 12109    1 48044 2.081425e-05
## 12110    1 48044 2.081425e-05
## 12111    1 48044 2.081425e-05
## 12112    1 48044 2.081425e-05
## 12113    1 48044 2.081425e-05
## 12114    1 48044 2.081425e-05
## 12115    1 48044 2.081425e-05
## 12116    1 48044 2.081425e-05
## 12117    1 48044 2.081425e-05
## 12118    1 48044 2.081425e-05
## 12119    1 48044 2.081425e-05
## 12120    1 48044 2.081425e-05
## 12121    1 48044 2.081425e-05
## 12122    1 48044 2.081425e-05
## 12123    1 48044 2.081425e-05
## 12124    1 48044 2.081425e-05
## 12125    1 48044 2.081425e-05
## 12126    1 48044 2.081425e-05
## 12127    1 48044 2.081425e-05
## 12128    1 48044 2.081425e-05
## 12129    1 48044 2.081425e-05
## 12130    1 48044 2.081425e-05
## 12131    1 48044 2.081425e-05
## 12132    1 48044 2.081425e-05
## 12133    1 48044 2.081425e-05
## 12134    1 48044 2.081425e-05
## 12135    1 48044 2.081425e-05
## 12136    1 48044 2.081425e-05
## 12137    1 48044 2.081425e-05
## 12138    1 48044 2.081425e-05
## 12139    1 48044 2.081425e-05
## 12140    1 48044 2.081425e-05
## 12141    1 48044 2.081425e-05
## 12142    1 48044 2.081425e-05
## 12143    1 48044 2.081425e-05
## 12144    1 48044 2.081425e-05
## 12145    1 48044 2.081425e-05
## 12146    1 48044 2.081425e-05
## 12147    1 48044 2.081425e-05
## 12148    1 48044 2.081425e-05
## 12149    1 48044 2.081425e-05
## 12150    1 48044 2.081425e-05
## 12151    1 48044 2.081425e-05
## 12152    1 48044 2.081425e-05
## 12153    1 48044 2.081425e-05
## 12154    1 48044 2.081425e-05
## 12155    1 48044 2.081425e-05
## 12156    1 48044 2.081425e-05
## 12157    1 48044 2.081425e-05
## 12158    1 48044 2.081425e-05
## 12159    1 48044 2.081425e-05
## 12160    1 48044 2.081425e-05
## 12161    1 48044 2.081425e-05
## 12162    1 48044 2.081425e-05
## 12163    1 48044 2.081425e-05
## 12164    1 48044 2.081425e-05
## 12165    1 48044 2.081425e-05
## 12166    1 48044 2.081425e-05
## 12167    1 48044 2.081425e-05
## 12168    1 48044 2.081425e-05
## 12169    1 48044 2.081425e-05
## 12170    1 48044 2.081425e-05
## 12171    1 48044 2.081425e-05
## 12172    1 48044 2.081425e-05
## 12173    1 48044 2.081425e-05
## 12174    1 48044 2.081425e-05
## 12175    1 48044 2.081425e-05
## 12176    1 48044 2.081425e-05
## 12177    1 48044 2.081425e-05
## 12178    1 48044 2.081425e-05
## 12179    1 48044 2.081425e-05
## 12180    1 48044 2.081425e-05
## 12181    1 48044 2.081425e-05
## 12182    1 48044 2.081425e-05
## 12183    1 48044 2.081425e-05
## 12184    1 48044 2.081425e-05
## 12185    1 48044 2.081425e-05
## 12186    1 48044 2.081425e-05
## 12187    1 48044 2.081425e-05
## 12188    1 48044 2.081425e-05
## 12189    1 48044 2.081425e-05
## 12190    1 48044 2.081425e-05
## 12191    1 48044 2.081425e-05
## 12192    1 48044 2.081425e-05
## 12193    1 48044 2.081425e-05
## 12194    1 48044 2.081425e-05
## 12195    1 48044 2.081425e-05
## 12196    1 48044 2.081425e-05
## 12197    1 48044 2.081425e-05
## 12198    1 48044 2.081425e-05
## 12199    1 48044 2.081425e-05
## 12200    1 48044 2.081425e-05
## 12201    1 48044 2.081425e-05
## 12202    1 48044 2.081425e-05
## 12203    1 48044 2.081425e-05
## 12204    1 48044 2.081425e-05
## 12205    1 48044 2.081425e-05
## 12206    1 48044 2.081425e-05
## 12207    1 48044 2.081425e-05
## 12208    1 48044 2.081425e-05
## 12209    1 48044 2.081425e-05
## 12210    1 48044 2.081425e-05
## 12211    1 48044 2.081425e-05
## 12212    1 48044 2.081425e-05
## 12213    1 48044 2.081425e-05
## 12214    1 48044 2.081425e-05
## 12215    1 48044 2.081425e-05
## 12216    1 48044 2.081425e-05
## 12217    1 48044 2.081425e-05
## 12218    1 48044 2.081425e-05
## 12219    1 48044 2.081425e-05
## 12220    1 48044 2.081425e-05
## 12221    1 48044 2.081425e-05
## 12222    1 48044 2.081425e-05
## 12223    1 48044 2.081425e-05
## 12224    1 48044 2.081425e-05
## 12225    1 48044 2.081425e-05
## 12226    1 48044 2.081425e-05
## 12227    1 48044 2.081425e-05
## 12228    1 48044 2.081425e-05
## 12229    1 48044 2.081425e-05
## 12230    1 48044 2.081425e-05
## 12231    1 48044 2.081425e-05
## 12232    1 48044 2.081425e-05
## 12233    1 48044 2.081425e-05
## 12234    1 48044 2.081425e-05
## 12235    1 48044 2.081425e-05
## 12236    1 48044 2.081425e-05
## 12237    1 48044 2.081425e-05
## 12238    1 48044 2.081425e-05
## 12239    1 48044 2.081425e-05
## 12240    1 48044 2.081425e-05
## 12241    1 48044 2.081425e-05
## 12242    1 48044 2.081425e-05
## 12243    1 48044 2.081425e-05
## 12244    1 48044 2.081425e-05
## 12245    1 48044 2.081425e-05
## 12246    1 48044 2.081425e-05
## 12247    1 48044 2.081425e-05
## 12248    1 48044 2.081425e-05
## 12249    1 48044 2.081425e-05
## 12250    1 48044 2.081425e-05
## 12251    1 48044 2.081425e-05
## 12252    1 48044 2.081425e-05
## 12253    1 48044 2.081425e-05
## 12254    1 48044 2.081425e-05
## 12255    1 48044 2.081425e-05
## 12256    1 48044 2.081425e-05
## 12257    1 48044 2.081425e-05
## 12258    1 48044 2.081425e-05
## 12259    1 48044 2.081425e-05
## 12260    1 48044 2.081425e-05
## 12261    1 48044 2.081425e-05
## 12262    1 48044 2.081425e-05
## 12263    1 48044 2.081425e-05
## 12264    1 48044 2.081425e-05
## 12265    1 48044 2.081425e-05
## 12266    1 48044 2.081425e-05
## 12267    1 48044 2.081425e-05
## 12268    1 48044 2.081425e-05
## 12269    1 48044 2.081425e-05
## 12270    1 48044 2.081425e-05
## 12271    1 48044 2.081425e-05
## 12272    1 48044 2.081425e-05
## 12273    1 48044 2.081425e-05
## 12274    1 48044 2.081425e-05
## 12275    1 48044 2.081425e-05
## 12276    1 48044 2.081425e-05
## 12277    1 48044 2.081425e-05
## 12278    1 48044 2.081425e-05
## 12279    1 48044 2.081425e-05
## 12280    1 48044 2.081425e-05
## 12281    1 48044 2.081425e-05
## 12282    1 48044 2.081425e-05
## 12283    1 48044 2.081425e-05
## 12284    1 48044 2.081425e-05
## 12285    1 48044 2.081425e-05
## 12286    1 48044 2.081425e-05
## 12287    1 48044 2.081425e-05
## 12288    1 48044 2.081425e-05
## 12289    1 48044 2.081425e-05
## 12290    1 48044 2.081425e-05
## 12291    1 48044 2.081425e-05
## 12292    1 48044 2.081425e-05
## 12293    1 48044 2.081425e-05
## 12294    1 48044 2.081425e-05
## 12295    1 48044 2.081425e-05
## 12296    1 48044 2.081425e-05
## 12297    1 48044 2.081425e-05
## 12298    1 48044 2.081425e-05
## 12299    1 48044 2.081425e-05
## 12300    1 48044 2.081425e-05
## 12301    1 48044 2.081425e-05
## 12302    1 48044 2.081425e-05
## 12303    1 48044 2.081425e-05
## 12304    1 48044 2.081425e-05
## 12305    1 48044 2.081425e-05
## 12306    1 48044 2.081425e-05
## 12307    1 48044 2.081425e-05
## 12308    1 48044 2.081425e-05
## 12309    1 48044 2.081425e-05
## 12310    1 48044 2.081425e-05
## 12311    1 48044 2.081425e-05
## 12312    1 48044 2.081425e-05
## 12313    1 48044 2.081425e-05
## 12314    1 48044 2.081425e-05
## 12315    1 48044 2.081425e-05
## 12316    1 48044 2.081425e-05
## 12317    1 48044 2.081425e-05
## 12318    1 48044 2.081425e-05
## 12319    1 48044 2.081425e-05
## 12320    1 48044 2.081425e-05
## 12321    1 48044 2.081425e-05
## 12322    1 48044 2.081425e-05
## 12323    1 48044 2.081425e-05
## 12324    1 48044 2.081425e-05
## 12325    1 48044 2.081425e-05
## 12326    1 48044 2.081425e-05
## 12327    1 48044 2.081425e-05
## 12328    1 48044 2.081425e-05
## 12329    1 48044 2.081425e-05
## 12330    1 48044 2.081425e-05
## 12331    1 48044 2.081425e-05
## 12332    1 48044 2.081425e-05
## 12333    1 48044 2.081425e-05
## 12334    1 48044 2.081425e-05
## 12335    1 48044 2.081425e-05
## 12336    1 48044 2.081425e-05
## 12337    1 48044 2.081425e-05
## 12338    1 48044 2.081425e-05
## 12339    1 48044 2.081425e-05
## 12340    1 48044 2.081425e-05
## 12341    1 48044 2.081425e-05
## 12342    1 48044 2.081425e-05
## 12343    1 48044 2.081425e-05
## 12344    1 48044 2.081425e-05
## 12345    1 48044 2.081425e-05
## 12346    1 48044 2.081425e-05
## 12347    1 48044 2.081425e-05
## 12348    1 48044 2.081425e-05
## 12349    1 48044 2.081425e-05
## 12350    1 48044 2.081425e-05
## 12351    1 48044 2.081425e-05
## 12352    1 48044 2.081425e-05
## 12353    1 48044 2.081425e-05
## 12354    1 48044 2.081425e-05
## 12355    1 48044 2.081425e-05
## 12356    1 48044 2.081425e-05
## 12357    1 48044 2.081425e-05
## 12358    1 48044 2.081425e-05
## 12359    1 48044 2.081425e-05
## 12360    1 48044 2.081425e-05
## 12361    1 48044 2.081425e-05
## 12362    1 48044 2.081425e-05
## 12363    1 48044 2.081425e-05
## 12364    1 48044 2.081425e-05
## 12365    1 48044 2.081425e-05
## 12366    1 48044 2.081425e-05
## 12367    1 48044 2.081425e-05
## 12368    1 48044 2.081425e-05
## 12369    1 48044 2.081425e-05
## 12370    1 48044 2.081425e-05
## 12371    1 48044 2.081425e-05
## 12372    1 48044 2.081425e-05
## 12373    1 48044 2.081425e-05
## 12374    1 48044 2.081425e-05
## 12375    1 48044 2.081425e-05
## 12376    1 48044 2.081425e-05
## 12377    1 48044 2.081425e-05
## 12378    1 48044 2.081425e-05
## 12379    1 48044 2.081425e-05
## 12380    1 48044 2.081425e-05
## 12381    1 48044 2.081425e-05
## 12382    1 48044 2.081425e-05
## 12383    1 48044 2.081425e-05
## 12384    1 48044 2.081425e-05
## 12385    1 48044 2.081425e-05
## 12386    1 48044 2.081425e-05
## 12387    1 48044 2.081425e-05
## 12388    1 48044 2.081425e-05
## 12389    1 48044 2.081425e-05
## 12390    1 48044 2.081425e-05
## 12391    1 48044 2.081425e-05
## 12392    1 48044 2.081425e-05
## 12393    1 48044 2.081425e-05
## 12394    1 48044 2.081425e-05
## 12395    1 48044 2.081425e-05
## 12396    1 48044 2.081425e-05
## 12397    1 48044 2.081425e-05
## 12398    1 48044 2.081425e-05
## 12399    1 48044 2.081425e-05
## 12400    1 48044 2.081425e-05
## 12401    1 48044 2.081425e-05
## 12402    1 48044 2.081425e-05
## 12403    1 48044 2.081425e-05
## 12404    1 48044 2.081425e-05
## 12405    1 48044 2.081425e-05
## 12406    1 48044 2.081425e-05
## 12407    1 48044 2.081425e-05
## 12408    1 48044 2.081425e-05
## 12409    1 48044 2.081425e-05
## 12410    1 48044 2.081425e-05
## 12411    1 48044 2.081425e-05
## 12412    1 48044 2.081425e-05
## 12413    1 48044 2.081425e-05
## 12414    1 48044 2.081425e-05
## 12415    1 48044 2.081425e-05
## 12416    1 48044 2.081425e-05
## 12417    1 48044 2.081425e-05
## 12418    1 48044 2.081425e-05
## 12419    1 48044 2.081425e-05
## 12420    1 48044 2.081425e-05
## 12421    1 48044 2.081425e-05
## 12422    1 48044 2.081425e-05
## 12423    1 48044 2.081425e-05
## 12424    1 48044 2.081425e-05
## 12425    1 48044 2.081425e-05
## 12426    1 48044 2.081425e-05
## 12427    1 48044 2.081425e-05
## 12428    1 48044 2.081425e-05
## 12429    1 48044 2.081425e-05
## 12430    1 48044 2.081425e-05
## 12431    1 48044 2.081425e-05
## 12432    1 48044 2.081425e-05
## 12433    1 48044 2.081425e-05
## 12434    1 48044 2.081425e-05
## 12435    1 48044 2.081425e-05
## 12436    1 48044 2.081425e-05
## 12437    1 48044 2.081425e-05
## 12438    1 48044 2.081425e-05
## 12439    1 48044 2.081425e-05
## 12440    1 48044 2.081425e-05
## 12441    1 48044 2.081425e-05
## 12442    1 48044 2.081425e-05
## 12443    1 48044 2.081425e-05
## 12444    1 48044 2.081425e-05
## 12445    1 48044 2.081425e-05
## 12446    1 48044 2.081425e-05
## 12447    1 48044 2.081425e-05
## 12448    1 48044 2.081425e-05
## 12449    1 48044 2.081425e-05
## 12450    1 48044 2.081425e-05
## 12451    1 48044 2.081425e-05
## 12452    1 48044 2.081425e-05
## 12453    1 48044 2.081425e-05
## 12454    1 48044 2.081425e-05
## 12455    1 48044 2.081425e-05
## 12456    1 48044 2.081425e-05
## 12457    1 48044 2.081425e-05
## 12458    1 48044 2.081425e-05
## 12459    1 48044 2.081425e-05
## 12460    1 48044 2.081425e-05
## 12461    1 48044 2.081425e-05
## 12462    1 48044 2.081425e-05
## 12463    1 48044 2.081425e-05
## 12464    1 48044 2.081425e-05
## 12465    1 48044 2.081425e-05
## 12466    1 48044 2.081425e-05
## 12467    1 48044 2.081425e-05
## 12468    1 48044 2.081425e-05
## 12469    1 48044 2.081425e-05
## 12470    1 48044 2.081425e-05
## 12471    1 48044 2.081425e-05
## 12472    1 48044 2.081425e-05
## 12473    1 48044 2.081425e-05
## 12474    1 48044 2.081425e-05
## 12475    1 48044 2.081425e-05
## 12476    1 48044 2.081425e-05
## 12477    1 48044 2.081425e-05
## 12478    1 48044 2.081425e-05
## 12479    1 48044 2.081425e-05
## 12480    1 48044 2.081425e-05
## 12481    1 48044 2.081425e-05
## 12482    1 48044 2.081425e-05
## 12483    1 48044 2.081425e-05
## 12484    1 48044 2.081425e-05
## 12485    1 48044 2.081425e-05
## 12486    1 48044 2.081425e-05
## 12487    1 48044 2.081425e-05
## 12488    1 48044 2.081425e-05
## 12489    1 48044 2.081425e-05
## 12490    1 48044 2.081425e-05
## 12491    1 48044 2.081425e-05
## 12492    1 48044 2.081425e-05
## 12493    1 48044 2.081425e-05
## 12494    1 48044 2.081425e-05
## 12495    1 48044 2.081425e-05
## 12496    1 48044 2.081425e-05
## 12497    1 48044 2.081425e-05
## 12498    1 48044 2.081425e-05
## 12499    1 48044 2.081425e-05
## 12500    1 48044 2.081425e-05
## 12501    1 48044 2.081425e-05
## 12502    1 48044 2.081425e-05
## 12503    1 48044 2.081425e-05
## 12504    1 48044 2.081425e-05
## 12505    1 48044 2.081425e-05
## 12506    1 48044 2.081425e-05
## 12507    1 48044 2.081425e-05
## 12508    1 48044 2.081425e-05
## 12509    1 48044 2.081425e-05
## 12510    1 48044 2.081425e-05
## 12511    1 48044 2.081425e-05
## 12512    1 48044 2.081425e-05
## 12513    1 48044 2.081425e-05
## 12514    1 48044 2.081425e-05
## 12515    1 48044 2.081425e-05
## 12516    1 48044 2.081425e-05
## 12517    1 48044 2.081425e-05
## 12518    1 48044 2.081425e-05
## 12519    1 48044 2.081425e-05
## 12520    1 48044 2.081425e-05
## 12521    1 48044 2.081425e-05
## 12522    1 48044 2.081425e-05
## 12523    1 48044 2.081425e-05
## 12524    1 48044 2.081425e-05
## 12525    1 48044 2.081425e-05
## 12526    1 48044 2.081425e-05
## 12527    1 48044 2.081425e-05
## 12528    1 48044 2.081425e-05
## 12529    1 48044 2.081425e-05
## 12530    1 48044 2.081425e-05
## 12531    1 48044 2.081425e-05
## 12532    1 48044 2.081425e-05
## 12533    1 48044 2.081425e-05
## 12534    1 48044 2.081425e-05
## 12535    1 48044 2.081425e-05
## 12536    1 48044 2.081425e-05
## 12537    1 48044 2.081425e-05
## 12538    1 48044 2.081425e-05
## 12539    1 48044 2.081425e-05
## 12540    1 48044 2.081425e-05
## 12541    1 48044 2.081425e-05
## 12542    1 48044 2.081425e-05
## 12543    1 48044 2.081425e-05
## 12544    1 48044 2.081425e-05
## 12545    1 48044 2.081425e-05
## 12546    1 48044 2.081425e-05
## 12547    1 48044 2.081425e-05
## 12548    1 48044 2.081425e-05
## 12549    1 48044 2.081425e-05
## 12550    1 48044 2.081425e-05
## 12551    1 48044 2.081425e-05
## 12552    1 48044 2.081425e-05
## 12553    1 48044 2.081425e-05
## 12554    1 48044 2.081425e-05
## 12555    1 48044 2.081425e-05
## 12556    1 48044 2.081425e-05
## 12557    1 48044 2.081425e-05
## 12558    1 48044 2.081425e-05
## 12559    1 48044 2.081425e-05
## 12560    1 48044 2.081425e-05
## 12561    1 48044 2.081425e-05
## 12562    1 48044 2.081425e-05
## 12563    1 48044 2.081425e-05
## 12564    1 48044 2.081425e-05
## 12565    1 48044 2.081425e-05
## 12566    1 48044 2.081425e-05
## 12567    1 48044 2.081425e-05
## 12568    1 48044 2.081425e-05
## 12569    1 48044 2.081425e-05
## 12570    1 48044 2.081425e-05
## 12571    1 48044 2.081425e-05
## 12572    1 48044 2.081425e-05
## 12573    1 48044 2.081425e-05
## 12574    1 48044 2.081425e-05
## 12575    1 48044 2.081425e-05
## 12576    1 48044 2.081425e-05
## 12577    1 48044 2.081425e-05
## 12578    1 48044 2.081425e-05
## 12579    1 48044 2.081425e-05
## 12580    1 48044 2.081425e-05
## 12581    1 48044 2.081425e-05
## 12582    1 48044 2.081425e-05
## 12583    1 48044 2.081425e-05
## 12584    1 48044 2.081425e-05
## 12585    1 48044 2.081425e-05
## 12586    1 48044 2.081425e-05
## 12587    1 48044 2.081425e-05
## 12588    1 48044 2.081425e-05
## 12589    1 48044 2.081425e-05
## 12590    1 48044 2.081425e-05
## 12591    1 48044 2.081425e-05
## 12592    1 48044 2.081425e-05
## 12593    1 48044 2.081425e-05
## 12594    1 48044 2.081425e-05
## 12595    1 48044 2.081425e-05
## 12596    1 48044 2.081425e-05
## 12597    1 48044 2.081425e-05
## 12598    1 48044 2.081425e-05
## 12599    1 48044 2.081425e-05
## 12600    1 48044 2.081425e-05
## 12601    1 48044 2.081425e-05
## 12602    1 48044 2.081425e-05
## 12603    1 48044 2.081425e-05
## 12604    1 48044 2.081425e-05
## 12605    1 48044 2.081425e-05
## 12606    1 48044 2.081425e-05
## 12607    1 48044 2.081425e-05
## 12608    1 48044 2.081425e-05
## 12609    1 48044 2.081425e-05
## 12610    1 48044 2.081425e-05
## 12611    1 48044 2.081425e-05
## 12612    1 48044 2.081425e-05
## 12613    1 48044 2.081425e-05
## 12614    1 48044 2.081425e-05
## 12615    1 48044 2.081425e-05
## 12616    1 48044 2.081425e-05
## 12617    1 48044 2.081425e-05
## 12618    1 48044 2.081425e-05
## 12619    1 48044 2.081425e-05
## 12620    1 48044 2.081425e-05
## 12621    1 48044 2.081425e-05
## 12622    1 48044 2.081425e-05
## 12623    1 48044 2.081425e-05
## 12624    1 48044 2.081425e-05
## 12625    1 48044 2.081425e-05
## 12626    1 48044 2.081425e-05
## 12627    1 48044 2.081425e-05
## 12628    1 48044 2.081425e-05
## 12629    1 48044 2.081425e-05
## 12630    1 48044 2.081425e-05
## 12631    1 48044 2.081425e-05
## 12632    1 48044 2.081425e-05
## 12633    1 48044 2.081425e-05
## 12634    1 48044 2.081425e-05
## 12635    1 48044 2.081425e-05
## 12636    1 48044 2.081425e-05
## 12637    1 48044 2.081425e-05
## 12638    1 48044 2.081425e-05
## 12639    1 48044 2.081425e-05
## 12640    1 48044 2.081425e-05
## 12641    1 48044 2.081425e-05
## 12642    1 48044 2.081425e-05
## 12643    1 48044 2.081425e-05
## 12644    1 48044 2.081425e-05
## 12645    1 48044 2.081425e-05
## 12646    1 48044 2.081425e-05
## 12647    1 48044 2.081425e-05
## 12648    1 48044 2.081425e-05
## 12649    1 48044 2.081425e-05
## 12650    1 48044 2.081425e-05
## 12651    1 48044 2.081425e-05
## 12652    1 48044 2.081425e-05
## 12653    1 48044 2.081425e-05
## 12654    1 48044 2.081425e-05
## 12655    1 48044 2.081425e-05
## 12656    1 48044 2.081425e-05
## 12657    1 48044 2.081425e-05
## 12658    1 48044 2.081425e-05
## 12659    1 48044 2.081425e-05
## 12660    1 48044 2.081425e-05
## 12661    1 48044 2.081425e-05
## 12662    1 48044 2.081425e-05
## 12663    1 48044 2.081425e-05
## 12664    1 48044 2.081425e-05
## 12665    1 48044 2.081425e-05
## 12666    1 48044 2.081425e-05
## 12667    1 48044 2.081425e-05
## 12668    1 48044 2.081425e-05
## 12669    1 48044 2.081425e-05
## 12670    1 48044 2.081425e-05
## 12671    1 48044 2.081425e-05
## 12672    1 48044 2.081425e-05
## 12673    1 48044 2.081425e-05
## 12674    1 48044 2.081425e-05
## 12675    1 48044 2.081425e-05
## 12676    1 48044 2.081425e-05
## 12677    1 48044 2.081425e-05
## 12678    1 48044 2.081425e-05
## 12679    1 48044 2.081425e-05
## 12680    1 48044 2.081425e-05
## 12681    1 48044 2.081425e-05
## 12682    1 48044 2.081425e-05
## 12683    1 48044 2.081425e-05
## 12684    1 48044 2.081425e-05
## 12685    1 48044 2.081425e-05
## 12686    1 48044 2.081425e-05
## 12687    1 48044 2.081425e-05
## 12688    1 48044 2.081425e-05
## 12689    1 48044 2.081425e-05
## 12690    1 48044 2.081425e-05
## 12691    1 48044 2.081425e-05
## 12692    1 48044 2.081425e-05
## 12693    1 48044 2.081425e-05
## 12694    1 48044 2.081425e-05
## 12695    1 48044 2.081425e-05
## 12696    1 48044 2.081425e-05
## 12697    1 48044 2.081425e-05
## 12698    1 48044 2.081425e-05
## 12699    1 48044 2.081425e-05
## 12700    1 48044 2.081425e-05
## 12701    1 48044 2.081425e-05
## 12702    1 48044 2.081425e-05
## 12703    1 48044 2.081425e-05
## 12704    1 48044 2.081425e-05
## 12705    1 48044 2.081425e-05
## 12706    1 48044 2.081425e-05
## 12707    1 48044 2.081425e-05
## 12708    1 48044 2.081425e-05
## 12709    1 48044 2.081425e-05
## 12710    1 48044 2.081425e-05
## 12711    1 48044 2.081425e-05
## 12712    1 48044 2.081425e-05
## 12713    1 48044 2.081425e-05
## 12714    1 48044 2.081425e-05
## 12715    1 48044 2.081425e-05
## 12716    1 48044 2.081425e-05
## 12717    1 48044 2.081425e-05
## 12718    1 48044 2.081425e-05
## 12719    1 48044 2.081425e-05
## 12720    1 48044 2.081425e-05
## 12721    1 48044 2.081425e-05
## 12722    1 48044 2.081425e-05
## 12723    1 48044 2.081425e-05
## 12724    1 48044 2.081425e-05
## 12725    1 48044 2.081425e-05
## 12726    1 48044 2.081425e-05
## 12727    1 48044 2.081425e-05
## 12728    1 48044 2.081425e-05
## 12729    1 48044 2.081425e-05
## 12730    1 48044 2.081425e-05
## 12731    1 48044 2.081425e-05
## 12732    1 48044 2.081425e-05
## 12733    1 48044 2.081425e-05
## 12734    1 48044 2.081425e-05
## 12735    1 48044 2.081425e-05
## 12736    1 48044 2.081425e-05
## 12737    1 48044 2.081425e-05
## 12738    1 48044 2.081425e-05
## 12739    1 48044 2.081425e-05
## 12740    1 48044 2.081425e-05
## 12741    1 48044 2.081425e-05
## 12742    1 48044 2.081425e-05
## 12743    1 48044 2.081425e-05
## 12744    1 48044 2.081425e-05
## 12745    1 48044 2.081425e-05
## 12746    1 48044 2.081425e-05
## 12747    1 48044 2.081425e-05
## 12748    1 48044 2.081425e-05
## 12749    1 48044 2.081425e-05
## 12750    1 48044 2.081425e-05
## 12751    1 48044 2.081425e-05
## 12752    1 48044 2.081425e-05
## 12753    1 48044 2.081425e-05
## 12754    1 48044 2.081425e-05
## 12755    1 48044 2.081425e-05
## 12756    1 48044 2.081425e-05
## 12757    1 48044 2.081425e-05
## 12758    1 48044 2.081425e-05
## 12759    1 48044 2.081425e-05
## 12760    1 48044 2.081425e-05
## 12761    1 48044 2.081425e-05
## 12762    1 48044 2.081425e-05
## 12763    1 48044 2.081425e-05
## 12764    1 48044 2.081425e-05
## 12765    1 48044 2.081425e-05
## 12766    1 48044 2.081425e-05
## 12767    1 48044 2.081425e-05
## 12768    1 48044 2.081425e-05
## 12769    1 48044 2.081425e-05
## 12770    1 48044 2.081425e-05
## 12771    1 48044 2.081425e-05
## 12772    1 48044 2.081425e-05
## 12773    1 48044 2.081425e-05
## 12774    1 48044 2.081425e-05
## 12775    1 48044 2.081425e-05
## 12776    1 48044 2.081425e-05
## 12777    1 48044 2.081425e-05
## 12778    1 48044 2.081425e-05
## 12779    1 48044 2.081425e-05
## 12780    1 48044 2.081425e-05
## 12781    1 48044 2.081425e-05
## 12782    1 48044 2.081425e-05
## 12783    1 48044 2.081425e-05
## 12784    1 48044 2.081425e-05
## 12785    1 48044 2.081425e-05
## 12786    1 48044 2.081425e-05
## 12787    1 48044 2.081425e-05
## 12788    1 48044 2.081425e-05
## 12789    1 48044 2.081425e-05
## 12790    1 48044 2.081425e-05
## 12791    1 48044 2.081425e-05
## 12792    1 48044 2.081425e-05
## 12793    1 48044 2.081425e-05
## 12794    1 48044 2.081425e-05
## 12795    1 48044 2.081425e-05
## 12796    1 48044 2.081425e-05
## 12797    1 48044 2.081425e-05
## 12798    1 48044 2.081425e-05
## 12799    1 48044 2.081425e-05
## 12800    1 48044 2.081425e-05
## 12801    1 48044 2.081425e-05
## 12802    1 48044 2.081425e-05
## 12803    1 48044 2.081425e-05
## 12804    1 48044 2.081425e-05
## 12805    1 48044 2.081425e-05
## 12806    1 48044 2.081425e-05
## 12807    1 48044 2.081425e-05
## 12808    1 48044 2.081425e-05
## 12809    1 48044 2.081425e-05
## 12810    1 48044 2.081425e-05
## 12811    1 48044 2.081425e-05
## 12812    1 48044 2.081425e-05
## 12813    1 48044 2.081425e-05
## 12814    1 48044 2.081425e-05
## 12815    1 48044 2.081425e-05
## 12816    1 48044 2.081425e-05
## 12817    1 48044 2.081425e-05
## 12818    1 48044 2.081425e-05
## 12819    1 48044 2.081425e-05
## 12820    1 48044 2.081425e-05
## 12821    1 48044 2.081425e-05
## 12822    1 48044 2.081425e-05
## 12823    1 48044 2.081425e-05
## 12824    1 48044 2.081425e-05
## 12825    1 48044 2.081425e-05
## 12826    1 48044 2.081425e-05
## 12827    1 48044 2.081425e-05
## 12828    1 48044 2.081425e-05
## 12829    1 48044 2.081425e-05
## 12830    1 48044 2.081425e-05
## 12831    1 48044 2.081425e-05
## 12832    1 48044 2.081425e-05
## 12833    1 48044 2.081425e-05
## 12834    1 48044 2.081425e-05
## 12835    1 48044 2.081425e-05
## 12836    1 48044 2.081425e-05
## 12837    1 48044 2.081425e-05
## 12838    1 48044 2.081425e-05
## 12839    1 48044 2.081425e-05
## 12840    1 48044 2.081425e-05
## 12841    1 48044 2.081425e-05
## 12842    1 48044 2.081425e-05
## 12843    1 48044 2.081425e-05
## 12844    1 48044 2.081425e-05
## 12845    1 48044 2.081425e-05
## 12846    1 48044 2.081425e-05
## 12847    1 48044 2.081425e-05
## 12848    1 48044 2.081425e-05
## 12849    1 48044 2.081425e-05
## 12850    1 48044 2.081425e-05
## 12851    1 48044 2.081425e-05
## 12852    1 48044 2.081425e-05
## 12853    1 48044 2.081425e-05
## 12854    1 48044 2.081425e-05
## 12855    1 48044 2.081425e-05
## 12856    1 48044 2.081425e-05
## 12857    1 48044 2.081425e-05
## 12858    1 48044 2.081425e-05
## 12859    1 48044 2.081425e-05
## 12860    1 48044 2.081425e-05
## 12861    1 48044 2.081425e-05
## 12862    1 48044 2.081425e-05
## 12863    1 48044 2.081425e-05
## 12864    1 48044 2.081425e-05
## 12865    1 48044 2.081425e-05
## 12866    1 48044 2.081425e-05
## 12867    1 48044 2.081425e-05
## 12868    1 48044 2.081425e-05
## 12869    1 48044 2.081425e-05
## 12870    1 48044 2.081425e-05
## 12871    1 48044 2.081425e-05
## 12872    1 48044 2.081425e-05
## 12873    1 48044 2.081425e-05
## 12874    1 48044 2.081425e-05
## 12875    1 48044 2.081425e-05
## 12876    1 48044 2.081425e-05
## 12877    1 48044 2.081425e-05
## 12878    1 48044 2.081425e-05
## 12879    1 48044 2.081425e-05
## 12880    1 48044 2.081425e-05
## 12881    1 48044 2.081425e-05
## 12882    1 48044 2.081425e-05
## 12883    1 48044 2.081425e-05
## 12884    1 48044 2.081425e-05
## 12885    1 48044 2.081425e-05
## 12886    1 48044 2.081425e-05
## 12887    1 48044 2.081425e-05
## 12888    1 48044 2.081425e-05
## 12889    1 48044 2.081425e-05
## 12890    1 48044 2.081425e-05
## 12891    1 48044 2.081425e-05
## 12892    1 48044 2.081425e-05
## 12893    1 48044 2.081425e-05
## 12894    1 48044 2.081425e-05
## 12895    1 48044 2.081425e-05
## 12896    1 48044 2.081425e-05
## 12897    1 48044 2.081425e-05
## 12898    1 48044 2.081425e-05
## 12899    1 48044 2.081425e-05
## 12900    1 48044 2.081425e-05
## 12901    1 48044 2.081425e-05
## 12902    1 48044 2.081425e-05
## 12903    1 48044 2.081425e-05
## 12904    1 48044 2.081425e-05
## 12905    1 48044 2.081425e-05
## 12906    1 48044 2.081425e-05
## 12907    1 48044 2.081425e-05
## 12908    1 48044 2.081425e-05
## 12909    1 48044 2.081425e-05
## 12910    1 48044 2.081425e-05
## 12911    1 48044 2.081425e-05
## 12912    1 48044 2.081425e-05
## 12913    1 48044 2.081425e-05
## 12914    1 48044 2.081425e-05
## 12915    1 48044 2.081425e-05
## 12916    1 48044 2.081425e-05
## 12917    1 48044 2.081425e-05
## 12918    1 48044 2.081425e-05
## 12919    1 48044 2.081425e-05
## 12920    1 48044 2.081425e-05
## 12921    1 48044 2.081425e-05
## 12922    1 48044 2.081425e-05
## 12923    1 48044 2.081425e-05
## 12924    1 48044 2.081425e-05
## 12925    1 48044 2.081425e-05
## 12926    1 48044 2.081425e-05
## 12927    1 48044 2.081425e-05
## 12928    1 48044 2.081425e-05
## 12929    1 48044 2.081425e-05
## 12930    1 48044 2.081425e-05
## 12931    1 48044 2.081425e-05
## 12932    1 48044 2.081425e-05
## 12933    1 48044 2.081425e-05
## 12934    1 48044 2.081425e-05
## 12935    1 48044 2.081425e-05
## 12936    1 48044 2.081425e-05
## 12937    1 48044 2.081425e-05
## 12938    1 48044 2.081425e-05
## 12939    1 48044 2.081425e-05
## 12940    1 48044 2.081425e-05
## 12941    1 48044 2.081425e-05
## 12942    1 48044 2.081425e-05
## 12943    1 48044 2.081425e-05
## 12944    1 48044 2.081425e-05
## 12945    1 48044 2.081425e-05
## 12946    1 48044 2.081425e-05
## 12947    1 48044 2.081425e-05
## 12948    1 48044 2.081425e-05
## 12949    1 48044 2.081425e-05
## 12950    1 48044 2.081425e-05
## 12951    1 48044 2.081425e-05
## 12952    1 48044 2.081425e-05
## 12953    1 48044 2.081425e-05
## 12954    1 48044 2.081425e-05
## 12955    1 48044 2.081425e-05
## 12956    1 48044 2.081425e-05
## 12957    1 48044 2.081425e-05
## 12958    1 48044 2.081425e-05
## 12959    1 48044 2.081425e-05
## 12960    1 48044 2.081425e-05
## 12961    1 48044 2.081425e-05
## 12962    1 48044 2.081425e-05
## 12963    1 48044 2.081425e-05
## 12964    1 48044 2.081425e-05
## 12965    1 48044 2.081425e-05
## 12966    1 48044 2.081425e-05
## 12967    1 48044 2.081425e-05
## 12968    1 48044 2.081425e-05
## 12969    1 48044 2.081425e-05
## 12970    1 48044 2.081425e-05
## 12971    1 48044 2.081425e-05
## 12972    1 48044 2.081425e-05
## 12973    1 48044 2.081425e-05
## 12974    1 48044 2.081425e-05
## 12975    1 48044 2.081425e-05
## 12976    1 48044 2.081425e-05
## 12977    1 48044 2.081425e-05
## 12978    1 48044 2.081425e-05
## 12979    1 48044 2.081425e-05
## 12980    1 48044 2.081425e-05
## 12981    1 48044 2.081425e-05
## 12982    1 48044 2.081425e-05
## 12983    1 48044 2.081425e-05
## 12984    1 48044 2.081425e-05
## 12985    1 48044 2.081425e-05
## 12986    1 48044 2.081425e-05
## 12987    1 48044 2.081425e-05
## 12988    1 48044 2.081425e-05
## 12989    1 48044 2.081425e-05
## 12990    1 48044 2.081425e-05
## 12991    1 48044 2.081425e-05
## 12992    1 48044 2.081425e-05
## 12993    1 48044 2.081425e-05
## 12994    1 48044 2.081425e-05
## 12995    1 48044 2.081425e-05
## 12996    1 48044 2.081425e-05
## 12997    1 48044 2.081425e-05
## 12998    1 48044 2.081425e-05
## 12999    1 48044 2.081425e-05
## 13000    1 48044 2.081425e-05
## 13001    1 48044 2.081425e-05
## 13002    1 48044 2.081425e-05
## 13003    1 48044 2.081425e-05
## 13004    1 48044 2.081425e-05
## 13005    1 48044 2.081425e-05
## 13006    1 48044 2.081425e-05
## 13007    1 48044 2.081425e-05
## 13008    1 48044 2.081425e-05
## 13009    1 48044 2.081425e-05
## 13010    1 48044 2.081425e-05
## 13011    1 48044 2.081425e-05
## 13012    1 48044 2.081425e-05
## 13013    1 48044 2.081425e-05
## 13014    1 48044 2.081425e-05
## 13015    1 48044 2.081425e-05
## 13016    1 48044 2.081425e-05
## 13017    1 48044 2.081425e-05
## 13018    1 48044 2.081425e-05
## 13019    1 48044 2.081425e-05
## 13020    1 48044 2.081425e-05
## 13021    1 48044 2.081425e-05
## 13022    1 48044 2.081425e-05
## 13023    1 48044 2.081425e-05
## 13024    1 48044 2.081425e-05
## 13025    1 48044 2.081425e-05
## 13026    1 48044 2.081425e-05
## 13027    1 48044 2.081425e-05
## 13028    1 48044 2.081425e-05
## 13029    1 48044 2.081425e-05
## 13030    1 48044 2.081425e-05
## 13031    1 48044 2.081425e-05
## 13032    1 48044 2.081425e-05
## 13033    1 48044 2.081425e-05
## 13034    1 48044 2.081425e-05
## 13035    1 48044 2.081425e-05
## 13036    1 48044 2.081425e-05
## 13037    1 48044 2.081425e-05
## 13038    1 48044 2.081425e-05
## 13039    1 48044 2.081425e-05
## 13040    1 48044 2.081425e-05
## 13041    1 48044 2.081425e-05
## 13042    1 48044 2.081425e-05
## 13043    1 48044 2.081425e-05
## 13044    1 48044 2.081425e-05
## 13045    1 48044 2.081425e-05
## 13046    1 48044 2.081425e-05
## 13047    1 48044 2.081425e-05
## 13048    1 48044 2.081425e-05
## 13049    1 48044 2.081425e-05
## 13050    1 48044 2.081425e-05
## 13051    1 48044 2.081425e-05
## 13052    1 48044 2.081425e-05
## 13053    1 48044 2.081425e-05
## 13054    1 48044 2.081425e-05
## 13055    1 48044 2.081425e-05
## 13056    1 48044 2.081425e-05
## 13057    1 48044 2.081425e-05
## 13058    1 48044 2.081425e-05
## 13059    1 48044 2.081425e-05
## 13060    1 48044 2.081425e-05
## 13061    1 48044 2.081425e-05
## 13062    1 48044 2.081425e-05
## 13063    1 48044 2.081425e-05
## 13064    1 48044 2.081425e-05
## 13065    1 48044 2.081425e-05
## 13066    1 48044 2.081425e-05
## 13067    1 48044 2.081425e-05
## 13068    1 48044 2.081425e-05
## 13069    1 48044 2.081425e-05
## 13070    1 48044 2.081425e-05
## 13071    1 48044 2.081425e-05
## 13072    1 48044 2.081425e-05
## 13073    1 48044 2.081425e-05
## 13074    1 48044 2.081425e-05
## 13075    1 48044 2.081425e-05
## 13076    1 48044 2.081425e-05
## 13077    1 48044 2.081425e-05
## 13078    1 48044 2.081425e-05
## 13079    1 48044 2.081425e-05
## 13080    1 48044 2.081425e-05
## 13081    1 48044 2.081425e-05
## 13082    1 48044 2.081425e-05
## 13083    1 48044 2.081425e-05
## 13084    1 48044 2.081425e-05
## 13085    1 48044 2.081425e-05
## 13086    1 48044 2.081425e-05
## 13087    1 48044 2.081425e-05
## 13088    1 48044 2.081425e-05
## 13089    1 48044 2.081425e-05
## 13090    1 48044 2.081425e-05
## 13091    1 48044 2.081425e-05
## 13092    1 48044 2.081425e-05
## 13093    1 48044 2.081425e-05
## 13094    1 48044 2.081425e-05
## 13095    1 48044 2.081425e-05
## 13096    1 48044 2.081425e-05
## 13097    1 48044 2.081425e-05
## 13098    1 48044 2.081425e-05
## 13099    1 48044 2.081425e-05
## 13100    1 48044 2.081425e-05
## 13101    1 48044 2.081425e-05
## 13102    1 48044 2.081425e-05
## 13103    1 48044 2.081425e-05
## 13104    1 48044 2.081425e-05
## 13105    1 48044 2.081425e-05
## 13106    1 48044 2.081425e-05
## 13107    1 48044 2.081425e-05
## 13108    1 48044 2.081425e-05
## 13109    1 48044 2.081425e-05
## 13110    1 48044 2.081425e-05
## 13111    1 48044 2.081425e-05
## 13112    1 48044 2.081425e-05
## 13113    1 48044 2.081425e-05
## 13114    1 48044 2.081425e-05
## 13115    1 48044 2.081425e-05
## 13116    1 48044 2.081425e-05
## 13117    1 48044 2.081425e-05
## 13118    1 48044 2.081425e-05
## 13119    1 48044 2.081425e-05
## 13120    1 48044 2.081425e-05
## 13121    1 48044 2.081425e-05
## 13122    1 48044 2.081425e-05
## 13123    1 48044 2.081425e-05
## 13124    1 48044 2.081425e-05
## 13125    1 48044 2.081425e-05
## 13126    1 48044 2.081425e-05
## 13127    1 48044 2.081425e-05
## 13128    1 48044 2.081425e-05
## 13129    1 48044 2.081425e-05
## 13130    1 48044 2.081425e-05
## 13131    1 48044 2.081425e-05
## 13132    1 48044 2.081425e-05
## 13133    1 48044 2.081425e-05
## 13134    1 48044 2.081425e-05
## 13135    1 48044 2.081425e-05
## 13136    1 48044 2.081425e-05
## 13137    1 48044 2.081425e-05
## 13138    1 48044 2.081425e-05
## 13139    1 48044 2.081425e-05
## 13140    1 48044 2.081425e-05
## 13141    1 48044 2.081425e-05
## 13142    1 48044 2.081425e-05
## 13143    1 48044 2.081425e-05
## 13144    1 48044 2.081425e-05
## 13145    1 48044 2.081425e-05
## 13146    1 48044 2.081425e-05
## 13147    1 48044 2.081425e-05
## 13148    1 48044 2.081425e-05
## 13149    1 48044 2.081425e-05
## 13150    1 48044 2.081425e-05
## 13151    1 48044 2.081425e-05
## 13152    1 48044 2.081425e-05
## 13153    1 48044 2.081425e-05
## 13154    1 48044 2.081425e-05
## 13155    1 48044 2.081425e-05
## 13156    1 48044 2.081425e-05
## 13157    1 48044 2.081425e-05
## 13158    1 48044 2.081425e-05
## 13159    1 48044 2.081425e-05
## 13160    1 48044 2.081425e-05
## 13161    1 48044 2.081425e-05
## 13162    1 48044 2.081425e-05
## 13163    1 48044 2.081425e-05
## 13164    1 48044 2.081425e-05
## 13165    1 48044 2.081425e-05
## 13166    1 48044 2.081425e-05
## 13167    1 48044 2.081425e-05
## 13168    1 48044 2.081425e-05
## 13169    1 48044 2.081425e-05
## 13170    1 48044 2.081425e-05
## 13171    1 48044 2.081425e-05
## 13172    1 48044 2.081425e-05
## 13173    1 48044 2.081425e-05
## 13174    1 48044 2.081425e-05
## 13175    1 48044 2.081425e-05
## 13176    1 48044 2.081425e-05
## 13177    1 48044 2.081425e-05
## 13178    1 48044 2.081425e-05
## 13179    1 48044 2.081425e-05
## 13180    1 48044 2.081425e-05
## 13181    1 48044 2.081425e-05
## 13182    1 48044 2.081425e-05
## 13183    1 48044 2.081425e-05
## 13184    1 48044 2.081425e-05
## 13185    1 48044 2.081425e-05
## 13186    1 48044 2.081425e-05
## 13187    1 48044 2.081425e-05
## 13188    1 48044 2.081425e-05
## 13189    1 48044 2.081425e-05
## 13190    1 48044 2.081425e-05
## 13191    1 48044 2.081425e-05
## 13192    1 48044 2.081425e-05
## 13193    1 48044 2.081425e-05
## 13194    1 48044 2.081425e-05
## 13195    1 48044 2.081425e-05
## 13196    1 48044 2.081425e-05
## 13197    1 48044 2.081425e-05
## 13198    1 48044 2.081425e-05
## 13199    1 48044 2.081425e-05
## 13200    1 48044 2.081425e-05
## 13201    1 48044 2.081425e-05
## 13202    1 48044 2.081425e-05
## 13203    1 48044 2.081425e-05
## 13204    1 48044 2.081425e-05
## 13205    1 48044 2.081425e-05
## 13206    1 48044 2.081425e-05
## 13207    1 48044 2.081425e-05
## 13208    1 48044 2.081425e-05
## 13209    1 48044 2.081425e-05
## 13210    1 48044 2.081425e-05
## 13211    1 48044 2.081425e-05
## 13212    1 48044 2.081425e-05
## 13213    1 48044 2.081425e-05
## 13214    1 48044 2.081425e-05
## 13215    1 48044 2.081425e-05
## 13216    1 48044 2.081425e-05
## 13217    1 48044 2.081425e-05
## 13218    1 48044 2.081425e-05
## 13219    1 48044 2.081425e-05
## 13220    1 48044 2.081425e-05
## 13221    1 48044 2.081425e-05
## 13222    1 48044 2.081425e-05
## 13223    1 48044 2.081425e-05
## 13224    1 48044 2.081425e-05
## 13225    1 48044 2.081425e-05
## 13226    1 48044 2.081425e-05
## 13227    1 48044 2.081425e-05
## 13228    1 48044 2.081425e-05
## 13229    1 48044 2.081425e-05
## 13230    1 48044 2.081425e-05
## 13231    1 48044 2.081425e-05
## 13232    1 48044 2.081425e-05
## 13233    1 48044 2.081425e-05
## 13234    1 48044 2.081425e-05
## 13235    1 48044 2.081425e-05
## 13236    1 48044 2.081425e-05
## 13237    1 48044 2.081425e-05
## 13238    1 48044 2.081425e-05
## 13239    1 48044 2.081425e-05
## 13240    1 48044 2.081425e-05
## 13241    1 48044 2.081425e-05
## 13242    1 48044 2.081425e-05
## 13243    1 48044 2.081425e-05
## 13244    1 48044 2.081425e-05
## 13245    1 48044 2.081425e-05
## 13246    1 48044 2.081425e-05
## 13247    1 48044 2.081425e-05
## 13248    1 48044 2.081425e-05
## 13249    1 48044 2.081425e-05
## 13250    1 48044 2.081425e-05
## 13251    1 48044 2.081425e-05
## 13252    1 48044 2.081425e-05
## 13253    1 48044 2.081425e-05
## 13254    1 48044 2.081425e-05
## 13255    1 48044 2.081425e-05
## 13256    1 48044 2.081425e-05
## 13257    1 48044 2.081425e-05
## 13258    1 48044 2.081425e-05
## 13259    1 48044 2.081425e-05
## 13260    1 48044 2.081425e-05
## 13261    1 48044 2.081425e-05
## 13262    1 48044 2.081425e-05
## 13263    1 48044 2.081425e-05
## 13264    1 48044 2.081425e-05
## 13265    1 48044 2.081425e-05
## 13266    1 48044 2.081425e-05
## 13267    1 48044 2.081425e-05
## 13268    1 48044 2.081425e-05
## 13269    1 48044 2.081425e-05
## 13270    1 48044 2.081425e-05
## 13271    1 48044 2.081425e-05
## 13272    1 48044 2.081425e-05
## 13273    1 48044 2.081425e-05
## 13274    1 48044 2.081425e-05
## 13275    1 48044 2.081425e-05
## 13276    1 48044 2.081425e-05
## 13277    1 48044 2.081425e-05
## 13278    1 48044 2.081425e-05
## 13279    1 48044 2.081425e-05
## 13280    1 48044 2.081425e-05
## 13281    1 48044 2.081425e-05
## 13282    1 48044 2.081425e-05
## 13283    1 48044 2.081425e-05
## 13284    1 48044 2.081425e-05
## 13285    1 48044 2.081425e-05
## 13286    1 48044 2.081425e-05
## 13287    1 48044 2.081425e-05
## 13288    1 48044 2.081425e-05
## 13289    1 48044 2.081425e-05
## 13290    1 48044 2.081425e-05
## 13291    1 48044 2.081425e-05
## 13292    1 48044 2.081425e-05
## 13293    1 48044 2.081425e-05
## 13294    1 48044 2.081425e-05
## 13295    1 48044 2.081425e-05
## 13296    1 48044 2.081425e-05
## 13297    1 48044 2.081425e-05
## 13298    1 48044 2.081425e-05
## 13299    1 48044 2.081425e-05
## 13300    1 48044 2.081425e-05
## 13301    1 48044 2.081425e-05
## 13302    1 48044 2.081425e-05
## 13303    1 48044 2.081425e-05
## 13304    1 48044 2.081425e-05
## 13305    1 48044 2.081425e-05
## 13306    1 48044 2.081425e-05
## 13307    1 48044 2.081425e-05
## 13308    1 48044 2.081425e-05
## 13309    1 48044 2.081425e-05
## 13310    1 48044 2.081425e-05
## 13311    1 48044 2.081425e-05
## 13312    1 48044 2.081425e-05
## 13313    1 48044 2.081425e-05
## 13314    1 48044 2.081425e-05
## 13315    1 48044 2.081425e-05
## 13316    1 48044 2.081425e-05
## 13317    1 48044 2.081425e-05
## 13318    1 48044 2.081425e-05
## 13319    1 48044 2.081425e-05
## 13320    1 48044 2.081425e-05
## 13321    1 48044 2.081425e-05
## 13322    1 48044 2.081425e-05
## 13323    1 48044 2.081425e-05
## 13324    1 48044 2.081425e-05
## 13325    1 48044 2.081425e-05
## 13326    1 48044 2.081425e-05
## 13327    1 48044 2.081425e-05
## 13328    1 48044 2.081425e-05
## 13329    1 48044 2.081425e-05
## 13330    1 48044 2.081425e-05
## 13331    1 48044 2.081425e-05
## 13332    1 48044 2.081425e-05
## 13333    1 48044 2.081425e-05
## 13334    1 48044 2.081425e-05
## 13335    1 48044 2.081425e-05
## 13336    1 48044 2.081425e-05
## 13337    1 48044 2.081425e-05
## 13338    1 48044 2.081425e-05
## 13339    1 48044 2.081425e-05
## 13340    1 48044 2.081425e-05
## 13341    1 48044 2.081425e-05
## 13342    1 48044 2.081425e-05
## 13343    1 48044 2.081425e-05
## 13344    1 48044 2.081425e-05
## 13345    1 48044 2.081425e-05
## 13346    1 48044 2.081425e-05
## 13347    1 48044 2.081425e-05
## 13348    1 48044 2.081425e-05
## 13349    1 48044 2.081425e-05
## 13350    1 48044 2.081425e-05
## 13351    1 48044 2.081425e-05
## 13352    1 48044 2.081425e-05
## 13353    1 48044 2.081425e-05
## 13354    1 48044 2.081425e-05
## 13355    1 48044 2.081425e-05
## 13356    1 48044 2.081425e-05
## 13357    1 48044 2.081425e-05
## 13358    1 48044 2.081425e-05
## 13359    1 48044 2.081425e-05
## 13360    1 48044 2.081425e-05
## 13361    1 48044 2.081425e-05
## 13362    1 48044 2.081425e-05
## 13363    1 48044 2.081425e-05
## 13364    1 48044 2.081425e-05
## 13365    1 48044 2.081425e-05
## 13366    1 48044 2.081425e-05
## 13367    1 48044 2.081425e-05
## 13368    1 48044 2.081425e-05
## 13369    1 48044 2.081425e-05
## 13370    1 48044 2.081425e-05
## 13371    1 48044 2.081425e-05
## 13372    1 48044 2.081425e-05
## 13373    1 48044 2.081425e-05
## 13374    1 48044 2.081425e-05
## 13375    1 48044 2.081425e-05
## 13376    1 48044 2.081425e-05
## 13377    1 48044 2.081425e-05
## 13378    1 48044 2.081425e-05
## 13379    1 48044 2.081425e-05
## 13380    1 48044 2.081425e-05
## 13381    1 48044 2.081425e-05
## 13382    1 48044 2.081425e-05
## 13383    1 48044 2.081425e-05
## 13384    1 48044 2.081425e-05
## 13385    1 48044 2.081425e-05
## 13386    1 48044 2.081425e-05
## 13387    1 48044 2.081425e-05
## 13388    1 48044 2.081425e-05
## 13389    1 48044 2.081425e-05
## 13390    1 48044 2.081425e-05
## 13391    1 48044 2.081425e-05
## 13392    1 48044 2.081425e-05
## 13393    1 48044 2.081425e-05
## 13394    1 48044 2.081425e-05
## 13395    1 48044 2.081425e-05
## 13396    1 48044 2.081425e-05
## 13397    1 48044 2.081425e-05
## 13398    1 48044 2.081425e-05
## 13399    1 48044 2.081425e-05
## 13400    1 48044 2.081425e-05
## 13401    1 48044 2.081425e-05
## 13402    1 48044 2.081425e-05
## 13403    1 48044 2.081425e-05
## 13404    1 48044 2.081425e-05
## 13405    1 48044 2.081425e-05
## 13406    1 48044 2.081425e-05
## 13407    1 48044 2.081425e-05
## 13408    1 48044 2.081425e-05
## 13409    1 48044 2.081425e-05
## 13410    1 48044 2.081425e-05
## 13411    1 48044 2.081425e-05
## 13412    1 48044 2.081425e-05
## 13413    1 48044 2.081425e-05
## 13414    1 48044 2.081425e-05
## 13415    1 48044 2.081425e-05
## 13416    1 48044 2.081425e-05
## 13417    1 48044 2.081425e-05
## 13418    1 48044 2.081425e-05
## 13419    1 48044 2.081425e-05
## 13420    1 48044 2.081425e-05
## 13421    1 48044 2.081425e-05
## 13422    1 48044 2.081425e-05
## 13423    1 48044 2.081425e-05
## 13424    1 48044 2.081425e-05
## 13425    1 48044 2.081425e-05
## 13426    1 48044 2.081425e-05
## 13427    1 48044 2.081425e-05
## 13428    1 48044 2.081425e-05
## 13429    1 48044 2.081425e-05
## 13430    1 48044 2.081425e-05
## 13431    1 48044 2.081425e-05
## 13432    1 48044 2.081425e-05
## 13433    1 48044 2.081425e-05
## 13434    1 48044 2.081425e-05
## 13435    1 48044 2.081425e-05
## 13436    1 48044 2.081425e-05
## 13437    1 48044 2.081425e-05
## 13438    1 48044 2.081425e-05
## 13439    1 48044 2.081425e-05
## 13440    1 48044 2.081425e-05
## 13441    1 48044 2.081425e-05
## 13442    1 48044 2.081425e-05
## 13443    1 48044 2.081425e-05
## 13444    1 48044 2.081425e-05
## 13445    1 48044 2.081425e-05
## 13446    1 48044 2.081425e-05
## 13447    1 48044 2.081425e-05
## 13448    1 48044 2.081425e-05
## 13449    1 48044 2.081425e-05
## 13450    1 48044 2.081425e-05
## 13451    1 48044 2.081425e-05
## 13452    1 48044 2.081425e-05
## 13453    1 48044 2.081425e-05
## 13454    1 48044 2.081425e-05
## 13455    1 48044 2.081425e-05
## 13456    1 48044 2.081425e-05
## 13457    1 48044 2.081425e-05
## 13458    1 48044 2.081425e-05
## 13459    1 48044 2.081425e-05
## 13460    1 48044 2.081425e-05
## 13461    1 48044 2.081425e-05
## 13462    1 48044 2.081425e-05
## 13463    1 48044 2.081425e-05
## 13464    1 48044 2.081425e-05
## 13465    1 48044 2.081425e-05
## 13466    1 48044 2.081425e-05
## 13467    1 48044 2.081425e-05
## 13468    1 48044 2.081425e-05
## 13469    1 48044 2.081425e-05
## 13470    1 48044 2.081425e-05
## 13471    1 48044 2.081425e-05
## 13472    1 48044 2.081425e-05
## 13473    1 48044 2.081425e-05
## 13474    1 48044 2.081425e-05
## 13475    1 48044 2.081425e-05
## 13476    1 48044 2.081425e-05
## 13477    1 48044 2.081425e-05
## 13478    1 48044 2.081425e-05
## 13479    1 48044 2.081425e-05
## 13480    1 48044 2.081425e-05
## 13481    1 48044 2.081425e-05
## 13482    1 48044 2.081425e-05
## 13483    1 48044 2.081425e-05
## 13484    1 48044 2.081425e-05
## 13485    1 48044 2.081425e-05
## 13486    1 48044 2.081425e-05
## 13487    1 48044 2.081425e-05
## 13488    1 48044 2.081425e-05
## 13489    1 48044 2.081425e-05
## 13490    1 48044 2.081425e-05
## 13491    1 48044 2.081425e-05
## 13492    1 48044 2.081425e-05
## 13493    1 48044 2.081425e-05
## 13494    1 48044 2.081425e-05
## 13495    1 48044 2.081425e-05
## 13496    1 48044 2.081425e-05
## 13497    1 48044 2.081425e-05
## 13498    1 48044 2.081425e-05
## 13499    1 48044 2.081425e-05
## 13500    1 48044 2.081425e-05
## 13501    1 48044 2.081425e-05
## 13502    1 48044 2.081425e-05
## 13503    1 48044 2.081425e-05
## 13504    1 48044 2.081425e-05
## 13505    1 48044 2.081425e-05
## 13506    1 48044 2.081425e-05
## 13507    1 48044 2.081425e-05
## 13508    1 48044 2.081425e-05
## 13509    1 48044 2.081425e-05
## 13510    1 48044 2.081425e-05
## 13511    1 48044 2.081425e-05
## 13512    1 48044 2.081425e-05
## 13513    1 48044 2.081425e-05
## 13514    1 48044 2.081425e-05
## 13515    1 48044 2.081425e-05
## 13516    1 48044 2.081425e-05
## 13517    1 48044 2.081425e-05
## 13518    1 48044 2.081425e-05
## 13519    1 48044 2.081425e-05
## 13520    1 48044 2.081425e-05
## 13521    1 48044 2.081425e-05
## 13522    1 48044 2.081425e-05
## 13523    1 48044 2.081425e-05
## 13524    1 48044 2.081425e-05
## 13525    1 48044 2.081425e-05
## 13526    1 48044 2.081425e-05
## 13527    1 48044 2.081425e-05
## 13528    1 48044 2.081425e-05
## 13529    1 48044 2.081425e-05
## 13530    1 48044 2.081425e-05
## 13531    1 48044 2.081425e-05
## 13532    1 48044 2.081425e-05
## 13533    1 48044 2.081425e-05
## 13534    1 48044 2.081425e-05
## 13535    1 48044 2.081425e-05
## 13536    1 48044 2.081425e-05
## 13537    1 48044 2.081425e-05
## 13538    1 48044 2.081425e-05
## 13539    1 48044 2.081425e-05
## 13540    1 48044 2.081425e-05
## 13541    1 48044 2.081425e-05
## 13542    1 48044 2.081425e-05
## 13543    1 48044 2.081425e-05
## 13544    1 48044 2.081425e-05
## 13545    1 48044 2.081425e-05
## 13546    1 48044 2.081425e-05
## 13547    1 48044 2.081425e-05
## 13548    1 48044 2.081425e-05
## 13549    1 48044 2.081425e-05
## 13550    1 48044 2.081425e-05
## 13551    1 48044 2.081425e-05
## 13552    1 48044 2.081425e-05
## 13553    1 48044 2.081425e-05
## 13554    1 48044 2.081425e-05
## 13555    1 48044 2.081425e-05
## 13556    1 48044 2.081425e-05
## 13557    1 48044 2.081425e-05
## 13558    1 48044 2.081425e-05
## 13559    1 48044 2.081425e-05
## 13560    1 48044 2.081425e-05
## 13561    1 48044 2.081425e-05
## 13562    1 48044 2.081425e-05
## 13563    1 48044 2.081425e-05
## 13564    1 48044 2.081425e-05
## 13565    1 48044 2.081425e-05
## 13566    1 48044 2.081425e-05
## 13567    1 48044 2.081425e-05
## 13568    1 48044 2.081425e-05
## 13569    1 48044 2.081425e-05
## 13570    1 48044 2.081425e-05
## 13571    1 48044 2.081425e-05
## 13572    1 48044 2.081425e-05
## 13573    1 48044 2.081425e-05
## 13574    1 48044 2.081425e-05
## 13575    1 48044 2.081425e-05
## 13576    1 48044 2.081425e-05
## 13577    1 48044 2.081425e-05
## 13578    1 48044 2.081425e-05
## 13579    1 48044 2.081425e-05
## 13580    1 48044 2.081425e-05
## 13581    1 48044 2.081425e-05
## 13582    1 48044 2.081425e-05
## 13583    1 48044 2.081425e-05
## 13584    1 48044 2.081425e-05
## 13585    1 48044 2.081425e-05
## 13586    1 48044 2.081425e-05
## 13587    1 48044 2.081425e-05
## 13588    1 48044 2.081425e-05
## 13589    1 48044 2.081425e-05
## 13590    1 48044 2.081425e-05
## 13591    1 48044 2.081425e-05
## 13592    1 48044 2.081425e-05
## 13593    1 48044 2.081425e-05
## 13594    1 48044 2.081425e-05
## 13595    1 48044 2.081425e-05
## 13596    1 48044 2.081425e-05
## 13597    1 48044 2.081425e-05
## 13598    1 48044 2.081425e-05
## 13599    1 48044 2.081425e-05
## 13600    1 48044 2.081425e-05
## 13601    1 48044 2.081425e-05
## 13602    1 48044 2.081425e-05
## 13603    1 48044 2.081425e-05
## 13604    1 48044 2.081425e-05
## 13605    1 48044 2.081425e-05
## 13606    1 48044 2.081425e-05
## 13607    1 48044 2.081425e-05
## 13608    1 48044 2.081425e-05
## 13609    1 48044 2.081425e-05
## 13610    1 48044 2.081425e-05
## 13611    1 48044 2.081425e-05
## 13612    1 48044 2.081425e-05
## 13613    1 48044 2.081425e-05
## 13614    1 48044 2.081425e-05
## 13615    1 48044 2.081425e-05
## 13616    1 48044 2.081425e-05
## 13617    1 48044 2.081425e-05
## 13618    1 48044 2.081425e-05
## 13619    1 48044 2.081425e-05
## 13620    1 48044 2.081425e-05
## 13621    1 48044 2.081425e-05
## 13622    1 48044 2.081425e-05
## 13623    1 48044 2.081425e-05
## 13624    1 48044 2.081425e-05
## 13625    1 48044 2.081425e-05
## 13626    1 48044 2.081425e-05
## 13627    1 48044 2.081425e-05
## 13628    1 48044 2.081425e-05
## 13629    1 48044 2.081425e-05
## 13630    1 48044 2.081425e-05
## 13631    1 48044 2.081425e-05
## 13632    1 48044 2.081425e-05
## 13633    1 48044 2.081425e-05
## 13634    1 48044 2.081425e-05
## 13635    1 48044 2.081425e-05
## 13636    1 48044 2.081425e-05
## 13637    1 48044 2.081425e-05
## 13638    1 48044 2.081425e-05
## 13639    1 48044 2.081425e-05
## 13640    1 48044 2.081425e-05
## 13641    1 48044 2.081425e-05
## 13642    1 48044 2.081425e-05
## 13643    1 48044 2.081425e-05
## 13644    1 48044 2.081425e-05
## 13645    1 48044 2.081425e-05
## 13646    1 48044 2.081425e-05
## 13647    1 48044 2.081425e-05
## 13648    1 48044 2.081425e-05
## 13649    1 48044 2.081425e-05
## 13650    1 48044 2.081425e-05
## 13651    1 48044 2.081425e-05
## 13652    1 48044 2.081425e-05
## 13653    1 48044 2.081425e-05
## 13654    1 48044 2.081425e-05
## 13655    1 48044 2.081425e-05
## 13656    1 48044 2.081425e-05
## 13657    1 48044 2.081425e-05
## 13658    1 48044 2.081425e-05
## 13659    1 48044 2.081425e-05
## 13660    1 48044 2.081425e-05
## 13661    1 48044 2.081425e-05
## 13662    1 48044 2.081425e-05
## 13663    1 48044 2.081425e-05
## 13664    1 48044 2.081425e-05
## 13665    1 48044 2.081425e-05
## 13666    1 48044 2.081425e-05
## 13667    1 48044 2.081425e-05
## 13668    1 48044 2.081425e-05
## 13669    1 48044 2.081425e-05
## 13670    1 48044 2.081425e-05
## 13671    1 48044 2.081425e-05
## 13672    1 48044 2.081425e-05
## 13673    1 48044 2.081425e-05
## 13674    1 48044 2.081425e-05
## 13675    1 48044 2.081425e-05
## 13676    1 48044 2.081425e-05
## 13677    1 48044 2.081425e-05
## 13678    1 48044 2.081425e-05
## 13679    1 48044 2.081425e-05
## 13680    1 48044 2.081425e-05
## 13681    1 48044 2.081425e-05
## 13682    1 48044 2.081425e-05
## 13683    1 48044 2.081425e-05
## 13684    1 48044 2.081425e-05
## 13685    1 48044 2.081425e-05
## 13686    1 48044 2.081425e-05
## 13687    1 48044 2.081425e-05
## 13688    1 48044 2.081425e-05
## 13689    1 48044 2.081425e-05
## 13690    1 48044 2.081425e-05
## 13691    1 48044 2.081425e-05
## 13692    1 48044 2.081425e-05
## 13693    1 48044 2.081425e-05
## 13694    1 48044 2.081425e-05
## 13695    1 48044 2.081425e-05
## 13696    1 48044 2.081425e-05
## 13697    1 48044 2.081425e-05
## 13698    1 48044 2.081425e-05
## 13699    1 48044 2.081425e-05
## 13700    1 48044 2.081425e-05
## 13701    1 48044 2.081425e-05
## 13702    1 48044 2.081425e-05
## 13703    1 48044 2.081425e-05
## 13704    1 48044 2.081425e-05
## 13705    1 48044 2.081425e-05
## 13706    1 48044 2.081425e-05
## 13707    1 48044 2.081425e-05
## 13708    1 48044 2.081425e-05
## 13709    1 48044 2.081425e-05
## 13710    1 48044 2.081425e-05
## 13711    1 48044 2.081425e-05
## 13712    1 48044 2.081425e-05
## 13713    1 48044 2.081425e-05
## 13714    1 48044 2.081425e-05
## 13715    1 48044 2.081425e-05
## 13716    1 48044 2.081425e-05
## 13717    1 48044 2.081425e-05
## 13718    1 48044 2.081425e-05
## 13719    1 48044 2.081425e-05
## 13720    1 48044 2.081425e-05
## 13721    1 48044 2.081425e-05
## 13722    1 48044 2.081425e-05
## 13723    1 48044 2.081425e-05
## 13724    1 48044 2.081425e-05
## 13725    1 48044 2.081425e-05
## 13726    1 48044 2.081425e-05
## 13727    1 48044 2.081425e-05
## 13728    1 48044 2.081425e-05
## 13729    1 48044 2.081425e-05
## 13730    1 48044 2.081425e-05
## 13731    1 48044 2.081425e-05
## 13732    1 48044 2.081425e-05
## 13733    1 48044 2.081425e-05
## 13734    1 48044 2.081425e-05
## 13735    1 48044 2.081425e-05
## 13736    1 48044 2.081425e-05
## 13737    1 48044 2.081425e-05
## 13738    1 48044 2.081425e-05
## 13739    1 48044 2.081425e-05
## 13740    1 48044 2.081425e-05
## 13741    1 48044 2.081425e-05
## 13742    1 48044 2.081425e-05
## 13743    1 48044 2.081425e-05
## 13744    1 48044 2.081425e-05
## 13745    1 48044 2.081425e-05
## 13746    1 48044 2.081425e-05
## 13747    1 48044 2.081425e-05
## 13748    1 48044 2.081425e-05
## 13749    1 48044 2.081425e-05
## 13750    1 48044 2.081425e-05
## 13751    1 48044 2.081425e-05
## 13752    1 48044 2.081425e-05
## 13753    1 48044 2.081425e-05
## 13754    1 48044 2.081425e-05
## 13755    1 48044 2.081425e-05
## 13756    1 48044 2.081425e-05
## 13757    1 48044 2.081425e-05
## 13758    1 48044 2.081425e-05
## 13759    1 48044 2.081425e-05
## 13760    1 48044 2.081425e-05
## 13761    1 48044 2.081425e-05
## 13762    1 48044 2.081425e-05
## 13763    1 48044 2.081425e-05
## 13764    1 48044 2.081425e-05
## 13765    1 48044 2.081425e-05
## 13766    1 48044 2.081425e-05
## 13767    1 48044 2.081425e-05
## 13768    1 48044 2.081425e-05
## 13769    1 48044 2.081425e-05
## 13770    1 48044 2.081425e-05
## 13771    1 48044 2.081425e-05
## 13772    1 48044 2.081425e-05
## 13773    1 48044 2.081425e-05
## 13774    1 48044 2.081425e-05
## 13775    1 48044 2.081425e-05
## 13776    1 48044 2.081425e-05
## 13777    1 48044 2.081425e-05
## 13778    1 48044 2.081425e-05
## 13779    1 48044 2.081425e-05
## 13780    1 48044 2.081425e-05
## 13781    1 48044 2.081425e-05
## 13782    1 48044 2.081425e-05
## 13783    1 48044 2.081425e-05
## 13784    1 48044 2.081425e-05
## 13785    1 48044 2.081425e-05
## 13786    1 48044 2.081425e-05
## 13787    1 48044 2.081425e-05
## 13788    1 48044 2.081425e-05
## 13789    1 48044 2.081425e-05
## 13790    1 48044 2.081425e-05
## 13791    1 48044 2.081425e-05
## 13792    1 48044 2.081425e-05
## 13793    1 48044 2.081425e-05
## 13794    1 48044 2.081425e-05
## 13795    1 48044 2.081425e-05
## 13796    1 48044 2.081425e-05
## 13797    1 48044 2.081425e-05
## 13798    1 48044 2.081425e-05
## 13799    1 48044 2.081425e-05
## 13800    1 48044 2.081425e-05
## 13801    1 48044 2.081425e-05
## 13802    1 48044 2.081425e-05
## 13803    1 48044 2.081425e-05
## 13804    1 48044 2.081425e-05
## 13805    1 48044 2.081425e-05
## 13806    1 48044 2.081425e-05
## 13807    1 48044 2.081425e-05
## 13808    1 48044 2.081425e-05
## 13809    1 48044 2.081425e-05
## 13810    1 48044 2.081425e-05
## 13811    1 48044 2.081425e-05
## 13812    1 48044 2.081425e-05
## 13813    1 48044 2.081425e-05
## 13814    1 48044 2.081425e-05
## 13815    1 48044 2.081425e-05
## 13816    1 48044 2.081425e-05
## 13817    1 48044 2.081425e-05
## 13818    1 48044 2.081425e-05
## 13819    1 48044 2.081425e-05
## 13820    1 48044 2.081425e-05
## 13821    1 48044 2.081425e-05
## 13822    1 48044 2.081425e-05
## 13823    1 48044 2.081425e-05
## 13824    1 48044 2.081425e-05
## 13825    1 48044 2.081425e-05
## 13826    1 48044 2.081425e-05
## 13827    1 48044 2.081425e-05
## 13828    1 48044 2.081425e-05
## 13829    1 48044 2.081425e-05
## 13830    1 48044 2.081425e-05
## 13831    1 48044 2.081425e-05
## 13832    1 48044 2.081425e-05
## 13833    1 48044 2.081425e-05
## 13834    1 48044 2.081425e-05
## 13835    1 48044 2.081425e-05
## 13836    1 48044 2.081425e-05
## 13837    1 48044 2.081425e-05
## 13838    1 48044 2.081425e-05
## 13839    1 48044 2.081425e-05
## 13840    1 48044 2.081425e-05
## 13841    1 48044 2.081425e-05
## 13842    1 48044 2.081425e-05
## 13843    1 48044 2.081425e-05
## 13844    1 48044 2.081425e-05
## 13845    1 48044 2.081425e-05
## 13846    1 48044 2.081425e-05
## 13847    1 48044 2.081425e-05
## 13848    1 48044 2.081425e-05
## 13849    1 48044 2.081425e-05
## 13850    1 48044 2.081425e-05
## 13851    1 48044 2.081425e-05
## 13852    1 48044 2.081425e-05
## 13853    1 48044 2.081425e-05
## 13854    1 48044 2.081425e-05
## 13855    1 48044 2.081425e-05
## 13856    1 48044 2.081425e-05
## 13857    1 48044 2.081425e-05
## 13858    1 48044 2.081425e-05
## 13859    1 48044 2.081425e-05
## 13860    1 48044 2.081425e-05
## 13861    1 48044 2.081425e-05
## 13862    1 48044 2.081425e-05
## 13863    1 48044 2.081425e-05
## 13864    1 48044 2.081425e-05
## 13865    1 48044 2.081425e-05
## 13866    1 48044 2.081425e-05
## 13867    1 48044 2.081425e-05
## 13868    1 48044 2.081425e-05
## 13869    1 48044 2.081425e-05
## 13870    1 48044 2.081425e-05
## 13871    1 48044 2.081425e-05
## 13872    1 48044 2.081425e-05
## 13873    1 48044 2.081425e-05
## 13874    1 48044 2.081425e-05
## 13875    1 48044 2.081425e-05
## 13876    1 48044 2.081425e-05
## 13877    1 48044 2.081425e-05
## 13878    1 48044 2.081425e-05
## 13879    1 48044 2.081425e-05
## 13880    1 48044 2.081425e-05
## 13881    1 48044 2.081425e-05
## 13882    1 48044 2.081425e-05
## 13883    1 48044 2.081425e-05
## 13884    1 48044 2.081425e-05
## 13885    1 48044 2.081425e-05
## 13886    1 48044 2.081425e-05
## 13887    1 48044 2.081425e-05
## 13888    1 48044 2.081425e-05
## 13889    1 48044 2.081425e-05
## 13890    1 48044 2.081425e-05
## 13891    1 48044 2.081425e-05
## 13892    1 48044 2.081425e-05
## 13893    1 48044 2.081425e-05
## 13894    1 48044 2.081425e-05
## 13895    1 48044 2.081425e-05
## 13896    1 48044 2.081425e-05
## 13897    1 48044 2.081425e-05
## 13898    1 48044 2.081425e-05
## 13899    1 48044 2.081425e-05
## 13900    1 48044 2.081425e-05
## 13901    1 48044 2.081425e-05
## 13902    1 48044 2.081425e-05
## 13903    1 48044 2.081425e-05
## 13904    1 48044 2.081425e-05
## 13905    1 48044 2.081425e-05
## 13906    1 48044 2.081425e-05
## 13907    1 48044 2.081425e-05
## 13908    1 48044 2.081425e-05
## 13909    1 48044 2.081425e-05
## 13910    1 48044 2.081425e-05
## 13911    1 48044 2.081425e-05
## 13912    1 48044 2.081425e-05
## 13913    1 48044 2.081425e-05
## 13914    1 48044 2.081425e-05
## 13915    1 48044 2.081425e-05
## 13916    1 48044 2.081425e-05
## 13917    1 48044 2.081425e-05
## 13918    1 48044 2.081425e-05
## 13919    1 48044 2.081425e-05
## 13920    1 48044 2.081425e-05
## 13921    1 48044 2.081425e-05
## 13922    1 48044 2.081425e-05
## 13923    1 48044 2.081425e-05
## 13924    1 48044 2.081425e-05
## 13925    1 48044 2.081425e-05
## 13926    1 48044 2.081425e-05
## 13927    1 48044 2.081425e-05
## 13928    1 48044 2.081425e-05
## 13929    1 48044 2.081425e-05
## 13930    1 48044 2.081425e-05
## 13931    1 48044 2.081425e-05
## 13932    1 48044 2.081425e-05
## 13933    1 48044 2.081425e-05
## 13934    1 48044 2.081425e-05
## 13935    1 48044 2.081425e-05
## 13936    1 48044 2.081425e-05
## 13937    1 48044 2.081425e-05
## 13938    1 48044 2.081425e-05
## 13939    1 48044 2.081425e-05
## 13940    1 48044 2.081425e-05
## 13941    1 48044 2.081425e-05
## 13942    1 48044 2.081425e-05
## 13943    1 48044 2.081425e-05
## 13944    1 48044 2.081425e-05
## 13945    1 48044 2.081425e-05
## 13946    1 48044 2.081425e-05
## 13947    1 48044 2.081425e-05
## 13948    1 48044 2.081425e-05
## 13949    1 48044 2.081425e-05
## 13950    1 48044 2.081425e-05
## 13951    1 48044 2.081425e-05
## 13952    1 48044 2.081425e-05
## 13953    1 48044 2.081425e-05
## 13954    1 48044 2.081425e-05
## 13955    1 48044 2.081425e-05
## 13956    1 48044 2.081425e-05
## 13957    1 48044 2.081425e-05
## 13958    1 48044 2.081425e-05
## 13959    1 48044 2.081425e-05
## 13960    1 48044 2.081425e-05
## 13961    1 48044 2.081425e-05
## 13962    1 48044 2.081425e-05
## 13963    1 48044 2.081425e-05
## 13964    1 48044 2.081425e-05
## 13965    1 48044 2.081425e-05
## 13966    1 48044 2.081425e-05
## 13967    1 48044 2.081425e-05
## 13968    1 48044 2.081425e-05
## 13969    1 48044 2.081425e-05
## 13970    1 48044 2.081425e-05
## 13971    1 48044 2.081425e-05
## 13972    1 48044 2.081425e-05
## 13973    1 48044 2.081425e-05
## 13974    1 48044 2.081425e-05
## 13975    1 48044 2.081425e-05
## 13976    1 48044 2.081425e-05
## 13977    1 48044 2.081425e-05
## 13978    1 48044 2.081425e-05
## 13979    1 48044 2.081425e-05
## 13980    1 48044 2.081425e-05
## 13981    1 48044 2.081425e-05
## 13982    1 48044 2.081425e-05
## 13983    1 48044 2.081425e-05
## 13984    1 48044 2.081425e-05
## 13985    1 48044 2.081425e-05
## 13986    1 48044 2.081425e-05
## 13987    1 48044 2.081425e-05
## 13988    1 48044 2.081425e-05
## 13989    1 48044 2.081425e-05
## 13990    1 48044 2.081425e-05
## 13991    1 48044 2.081425e-05
## 13992    1 48044 2.081425e-05
## 13993    1 48044 2.081425e-05
## 13994    1 48044 2.081425e-05
## 13995    1 48044 2.081425e-05
## 13996    1 48044 2.081425e-05
## 13997    1 48044 2.081425e-05
## 13998    1 48044 2.081425e-05
## 13999    1 48044 2.081425e-05
## 14000    1 48044 2.081425e-05
## 14001    1 48044 2.081425e-05
## 14002    1 48044 2.081425e-05
## 14003    1 48044 2.081425e-05
## 14004    1 48044 2.081425e-05
## 14005    1 48044 2.081425e-05
## 14006    1 48044 2.081425e-05
## 14007    1 48044 2.081425e-05
## 14008    1 48044 2.081425e-05
## 14009    1 48044 2.081425e-05
## 14010    1 48044 2.081425e-05
## 14011    1 48044 2.081425e-05
## 14012    1 48044 2.081425e-05
## 14013    1 48044 2.081425e-05
## 14014    1 48044 2.081425e-05
## 14015    1 48044 2.081425e-05
## 14016    1 48044 2.081425e-05
## 14017    1 48044 2.081425e-05
## 14018    1 48044 2.081425e-05
## 14019    1 48044 2.081425e-05
## 14020    1 48044 2.081425e-05
## 14021    1 48044 2.081425e-05
## 14022    1 48044 2.081425e-05
## 14023    1 48044 2.081425e-05
## 14024    1 48044 2.081425e-05
## 14025    1 48044 2.081425e-05
## 14026    1 48044 2.081425e-05
## 14027    1 48044 2.081425e-05
## 14028    1 48044 2.081425e-05
## 14029    1 48044 2.081425e-05
## 14030    1 48044 2.081425e-05
## 14031    1 48044 2.081425e-05
## 14032    1 48044 2.081425e-05
## 14033    1 48044 2.081425e-05
## 14034    1 48044 2.081425e-05
## 14035    1 48044 2.081425e-05
## 14036    1 48044 2.081425e-05
## 14037    1 48044 2.081425e-05
## 14038    1 48044 2.081425e-05
## 14039    1 48044 2.081425e-05
## 14040    1 48044 2.081425e-05
## 14041    1 48044 2.081425e-05
## 14042    1 48044 2.081425e-05
## 14043    1 48044 2.081425e-05
## 14044    1 48044 2.081425e-05
## 14045    1 48044 2.081425e-05
## 14046    1 48044 2.081425e-05
## 14047    1 48044 2.081425e-05
## 14048    1 48044 2.081425e-05
## 14049    1 48044 2.081425e-05
## 14050    1 48044 2.081425e-05
## 14051    1 48044 2.081425e-05
## 14052    1 48044 2.081425e-05
## 14053    1 48044 2.081425e-05
## 14054    1 48044 2.081425e-05
## 14055    1 48044 2.081425e-05
## 14056    1 48044 2.081425e-05
## 14057    1 48044 2.081425e-05
## 14058    1 48044 2.081425e-05
## 14059    1 48044 2.081425e-05
## 14060    1 48044 2.081425e-05
## 14061    1 48044 2.081425e-05
## 14062    1 48044 2.081425e-05
## 14063    1 48044 2.081425e-05
## 14064    1 48044 2.081425e-05
## 14065    1 48044 2.081425e-05
## 14066    1 48044 2.081425e-05
## 14067    1 48044 2.081425e-05
## 14068    1 48044 2.081425e-05
## 14069    1 48044 2.081425e-05
## 14070    1 48044 2.081425e-05
## 14071    1 48044 2.081425e-05
## 14072    1 48044 2.081425e-05
## 14073    1 48044 2.081425e-05
## 14074    1 48044 2.081425e-05
## 14075    1 48044 2.081425e-05
## 14076    1 48044 2.081425e-05
## 14077    1 48044 2.081425e-05
## 14078    1 48044 2.081425e-05
## 14079    1 48044 2.081425e-05
## 14080    1 48044 2.081425e-05
## 14081    1 48044 2.081425e-05
## 14082    1 48044 2.081425e-05
## 14083    1 48044 2.081425e-05
## 14084    1 48044 2.081425e-05
## 14085    1 48044 2.081425e-05
## 14086    1 48044 2.081425e-05
## 14087    1 48044 2.081425e-05
## 14088    1 48044 2.081425e-05
## 14089    1 48044 2.081425e-05
## 14090    1 48044 2.081425e-05
## 14091    1 48044 2.081425e-05
## 14092    1 48044 2.081425e-05
## 14093    1 48044 2.081425e-05
## 14094    1 48044 2.081425e-05
## 14095    1 48044 2.081425e-05
## 14096    1 48044 2.081425e-05
## 14097    1 48044 2.081425e-05
## 14098    1 48044 2.081425e-05
## 14099    1 48044 2.081425e-05
## 14100    1 48044 2.081425e-05
## 14101    1 48044 2.081425e-05
## 14102    1 48044 2.081425e-05
## 14103    1 48044 2.081425e-05
## 14104    1 48044 2.081425e-05
## 14105    1 48044 2.081425e-05
## 14106    1 48044 2.081425e-05
## 14107    1 48044 2.081425e-05
## 14108    1 48044 2.081425e-05
## 14109    1 48044 2.081425e-05
## 14110    1 48044 2.081425e-05
## 14111    1 48044 2.081425e-05
## 14112    1 48044 2.081425e-05
## 14113    1 48044 2.081425e-05
## 14114    1 48044 2.081425e-05
## 14115    1 48044 2.081425e-05
## 14116    1 48044 2.081425e-05
## 14117    1 48044 2.081425e-05
## 14118    1 48044 2.081425e-05
## 14119    1 48044 2.081425e-05
## 14120    1 48044 2.081425e-05
## 14121    1 48044 2.081425e-05
## 14122    1 48044 2.081425e-05
## 14123    1 48044 2.081425e-05
## 14124    1 48044 2.081425e-05
## 14125    1 48044 2.081425e-05
## 14126    1 48044 2.081425e-05
## 14127    1 48044 2.081425e-05
## 14128    1 48044 2.081425e-05
## 14129    1 48044 2.081425e-05
## 14130    1 48044 2.081425e-05
## 14131    1 48044 2.081425e-05
## 14132    1 48044 2.081425e-05
## 14133    1 48044 2.081425e-05
## 14134    1 48044 2.081425e-05
## 14135    1 48044 2.081425e-05
## 14136    1 48044 2.081425e-05
## 14137    1 48044 2.081425e-05
## 14138    1 48044 2.081425e-05
## 14139    1 48044 2.081425e-05
## 14140    1 48044 2.081425e-05
## 14141    1 48044 2.081425e-05
## 14142    1 48044 2.081425e-05
## 14143    1 48044 2.081425e-05
## 14144    1 48044 2.081425e-05
## 14145    1 48044 2.081425e-05
## 14146    1 48044 2.081425e-05
## 14147    1 48044 2.081425e-05
## 14148    1 48044 2.081425e-05
## 14149    1 48044 2.081425e-05
## 14150    1 48044 2.081425e-05
## 14151    1 48044 2.081425e-05
## 14152    1 48044 2.081425e-05
## 14153    1 48044 2.081425e-05
## 14154    1 48044 2.081425e-05
## 14155    1 48044 2.081425e-05
## 14156    1 48044 2.081425e-05
## 14157    1 48044 2.081425e-05
## 14158    1 48044 2.081425e-05
## 14159    1 48044 2.081425e-05
## 14160    1 48044 2.081425e-05
## 14161    1 48044 2.081425e-05
## 14162    1 48044 2.081425e-05
## 14163    1 48044 2.081425e-05
## 14164    1 48044 2.081425e-05
## 14165    1 48044 2.081425e-05
## 14166    1 48044 2.081425e-05
## 14167    1 48044 2.081425e-05
## 14168    1 48044 2.081425e-05
## 14169    1 48044 2.081425e-05
## 14170    1 48044 2.081425e-05
## 14171    1 48044 2.081425e-05
## 14172    1 48044 2.081425e-05
## 14173    1 48044 2.081425e-05
## 14174    1 48044 2.081425e-05
## 14175    1 48044 2.081425e-05
## 14176    1 48044 2.081425e-05
## 14177    1 48044 2.081425e-05
## 14178    1 48044 2.081425e-05
## 14179    1 48044 2.081425e-05
## 14180    1 48044 2.081425e-05
## 14181    1 48044 2.081425e-05
## 14182    1 48044 2.081425e-05
## 14183    1 48044 2.081425e-05
## 14184    1 48044 2.081425e-05
## 14185    1 48044 2.081425e-05
## 14186    1 48044 2.081425e-05
## 14187    1 48044 2.081425e-05
## 14188    1 48044 2.081425e-05
## 14189    1 48044 2.081425e-05
## 14190    1 48044 2.081425e-05
## 14191    1 48044 2.081425e-05
## 14192    1 48044 2.081425e-05
## 14193    1 48044 2.081425e-05
## 14194    1 48044 2.081425e-05
## 14195    1 48044 2.081425e-05
## 14196    1 48044 2.081425e-05
## 14197    1 48044 2.081425e-05
## 14198    1 48044 2.081425e-05
## 14199    1 48044 2.081425e-05
## 14200    1 48044 2.081425e-05
## 14201    1 48044 2.081425e-05
## 14202    1 48044 2.081425e-05
## 14203    1 48044 2.081425e-05
## 14204    1 48044 2.081425e-05
## 14205    1 48044 2.081425e-05
## 14206    1 48044 2.081425e-05
## 14207    1 48044 2.081425e-05
## 14208    1 48044 2.081425e-05
## 14209    1 48044 2.081425e-05
## 14210    1 48044 2.081425e-05
## 14211    1 48044 2.081425e-05
## 14212    1 48044 2.081425e-05
## 14213    1 48044 2.081425e-05
## 14214    1 48044 2.081425e-05
## 14215    1 48044 2.081425e-05
## 14216    1 48044 2.081425e-05
## 14217    1 48044 2.081425e-05
## 14218    1 48044 2.081425e-05
## 14219    1 48044 2.081425e-05
## 14220    1 48044 2.081425e-05
## 14221    1 48044 2.081425e-05
## 14222    1 48044 2.081425e-05
## 14223    1 48044 2.081425e-05
## 14224    1 48044 2.081425e-05
## 14225    1 48044 2.081425e-05
## 14226    1 48044 2.081425e-05
## 14227    1 48044 2.081425e-05
## 14228    1 48044 2.081425e-05
## 14229    1 48044 2.081425e-05
## 14230    1 48044 2.081425e-05
## 14231    1 48044 2.081425e-05
## 14232    1 48044 2.081425e-05
## 14233    1 48044 2.081425e-05
## 14234    1 48044 2.081425e-05
## 14235    1 48044 2.081425e-05
## 14236    1 48044 2.081425e-05
## 14237    1 48044 2.081425e-05
## 14238    1 48044 2.081425e-05
## 14239    1 48044 2.081425e-05
## 14240    1 48044 2.081425e-05
## 14241    1 48044 2.081425e-05
## 14242    1 48044 2.081425e-05
## 14243    1 48044 2.081425e-05
## 14244    1 48044 2.081425e-05
## 14245    1 48044 2.081425e-05
## 14246    1 48044 2.081425e-05
## 14247    1 48044 2.081425e-05
## 14248    1 48044 2.081425e-05
## 14249    1 48044 2.081425e-05
## 14250    1 48044 2.081425e-05
## 14251    1 48044 2.081425e-05
## 14252    1 48044 2.081425e-05
## 14253    1 48044 2.081425e-05
## 14254    1 48044 2.081425e-05
## 14255    1 48044 2.081425e-05
## 14256    1 48044 2.081425e-05
## 14257    1 48044 2.081425e-05
## 14258    1 48044 2.081425e-05
## 14259    1 48044 2.081425e-05
## 14260    1 48044 2.081425e-05
## 14261    1 48044 2.081425e-05
## 14262    1 48044 2.081425e-05
## 14263    1 48044 2.081425e-05
## 14264    1 48044 2.081425e-05
## 14265    1 48044 2.081425e-05
## 14266    1 48044 2.081425e-05
## 14267    1 48044 2.081425e-05
## 14268    1 48044 2.081425e-05
## 14269    1 48044 2.081425e-05
## 14270    1 48044 2.081425e-05
## 14271    1 48044 2.081425e-05
## 14272    1 48044 2.081425e-05
## 14273    1 48044 2.081425e-05
## 14274    1 48044 2.081425e-05
## 14275    1 48044 2.081425e-05
## 14276    1 48044 2.081425e-05
## 14277    1 48044 2.081425e-05
## 14278    1 48044 2.081425e-05
## 14279    1 48044 2.081425e-05
## 14280    1 48044 2.081425e-05
## 14281    1 48044 2.081425e-05
## 14282    1 48044 2.081425e-05
## 14283    1 48044 2.081425e-05
## 14284    1 48044 2.081425e-05
## 14285    1 48044 2.081425e-05
## 14286    1 48044 2.081425e-05
## 14287    1 48044 2.081425e-05
## 14288    1 48044 2.081425e-05
## 14289    1 48044 2.081425e-05
## 14290    1 48044 2.081425e-05
## 14291    1 48044 2.081425e-05
## 14292    1 48044 2.081425e-05
## 14293    1 48044 2.081425e-05
## 14294    1 48044 2.081425e-05
## 14295    1 48044 2.081425e-05
## 14296    1 48044 2.081425e-05
## 14297    1 48044 2.081425e-05
## 14298    1 48044 2.081425e-05
## 14299    1 48044 2.081425e-05
## 14300    1 48044 2.081425e-05
## 14301    1 48044 2.081425e-05
## 14302    1 48044 2.081425e-05
## 14303    1 48044 2.081425e-05
## 14304    1 48044 2.081425e-05
## 14305    1 48044 2.081425e-05
## 14306    1 48044 2.081425e-05
## 14307    1 48044 2.081425e-05
## 14308    1 48044 2.081425e-05
## 14309    1 48044 2.081425e-05
## 14310    1 48044 2.081425e-05
## 14311    1 48044 2.081425e-05
## 14312    1 48044 2.081425e-05
## 14313    1 48044 2.081425e-05
## 14314    1 48044 2.081425e-05
## 14315    1 48044 2.081425e-05
## 14316    1 48044 2.081425e-05
## 14317    1 48044 2.081425e-05
## 14318    1 48044 2.081425e-05
## 14319    1 48044 2.081425e-05
## 14320    1 48044 2.081425e-05
## 14321    1 48044 2.081425e-05
## 14322    1 48044 2.081425e-05
## 14323    1 48044 2.081425e-05
## 14324    1 48044 2.081425e-05
## 14325    1 48044 2.081425e-05
## 14326    1 48044 2.081425e-05
## 14327    1 48044 2.081425e-05
## 14328    1 48044 2.081425e-05
## 14329    1 48044 2.081425e-05
## 14330    1 48044 2.081425e-05
## 14331    1 48044 2.081425e-05
## 14332    1 48044 2.081425e-05
## 14333    1 48044 2.081425e-05
## 14334    1 48044 2.081425e-05
## 14335    1 48044 2.081425e-05
## 14336    1 48044 2.081425e-05
## 14337    1 48044 2.081425e-05
## 14338    1 48044 2.081425e-05
## 14339    1 48044 2.081425e-05
## 14340    1 48044 2.081425e-05
## 14341    1 48044 2.081425e-05
## 14342    1 48044 2.081425e-05
## 14343    1 48044 2.081425e-05
## 14344    1 48044 2.081425e-05
## 14345    1 48044 2.081425e-05
## 14346    1 48044 2.081425e-05
## 14347    1 48044 2.081425e-05
## 14348    1 48044 2.081425e-05
## 14349    1 48044 2.081425e-05
## 14350    1 48044 2.081425e-05
## 14351    1 48044 2.081425e-05
## 14352    1 48044 2.081425e-05
## 14353    1 48044 2.081425e-05
## 14354    1 48044 2.081425e-05
## 14355    1 48044 2.081425e-05
## 14356    1 48044 2.081425e-05
## 14357    1 48044 2.081425e-05
## 14358    1 48044 2.081425e-05
## 14359    1 48044 2.081425e-05
## 14360    1 48044 2.081425e-05
## 14361    1 48044 2.081425e-05
## 14362    1 48044 2.081425e-05
## 14363    1 48044 2.081425e-05
## 14364    1 48044 2.081425e-05
## 14365    1 48044 2.081425e-05
## 14366    1 48044 2.081425e-05
## 14367    1 48044 2.081425e-05
## 14368    1 48044 2.081425e-05
## 14369    1 48044 2.081425e-05
## 14370    1 48044 2.081425e-05
## 14371    1 48044 2.081425e-05
## 14372    1 48044 2.081425e-05
## 14373    1 48044 2.081425e-05
## 14374    1 48044 2.081425e-05
## 14375    1 48044 2.081425e-05
## 14376    1 48044 2.081425e-05
## 14377    1 48044 2.081425e-05
## 14378    1 48044 2.081425e-05
## 14379    1 48044 2.081425e-05
## 14380    1 48044 2.081425e-05
## 14381    1 48044 2.081425e-05
## 14382    1 48044 2.081425e-05
## 14383    1 48044 2.081425e-05
## 14384    1 48044 2.081425e-05
## 14385    1 48044 2.081425e-05
## 14386    1 48044 2.081425e-05
## 14387    1 48044 2.081425e-05
## 14388    1 48044 2.081425e-05
## 14389    1 48044 2.081425e-05
## 14390    1 48044 2.081425e-05
## 14391    1 48044 2.081425e-05
## 14392    1 48044 2.081425e-05
## 14393    1 48044 2.081425e-05
## 14394    1 48044 2.081425e-05
## 14395    1 48044 2.081425e-05
## 14396    1 48044 2.081425e-05
## 14397    1 48044 2.081425e-05
## 14398    1 48044 2.081425e-05
## 14399    1 48044 2.081425e-05
## 14400    1 48044 2.081425e-05
## 14401    1 48044 2.081425e-05
## 14402    1 48044 2.081425e-05
## 14403    1 48044 2.081425e-05
## 14404    1 48044 2.081425e-05
## 14405    1 48044 2.081425e-05
## 14406    1 48044 2.081425e-05
## 14407    1 48044 2.081425e-05
## 14408    1 48044 2.081425e-05
## 14409    1 48044 2.081425e-05
## 14410    1 48044 2.081425e-05
## 14411    1 48044 2.081425e-05
## 14412    1 48044 2.081425e-05
## 14413    1 48044 2.081425e-05
## 14414    1 48044 2.081425e-05
## 14415    1 48044 2.081425e-05
## 14416    1 48044 2.081425e-05
## 14417    1 48044 2.081425e-05
## 14418    1 48044 2.081425e-05
## 14419    1 48044 2.081425e-05
## 14420    1 48044 2.081425e-05
## 14421    1 48044 2.081425e-05
## 14422    1 48044 2.081425e-05
## 14423    1 48044 2.081425e-05
## 14424    1 48044 2.081425e-05
## 14425    1 48044 2.081425e-05
## 14426    1 48044 2.081425e-05
## 14427    1 48044 2.081425e-05
## 14428    1 48044 2.081425e-05
## 14429    1 48044 2.081425e-05
## 14430    1 48044 2.081425e-05
## 14431    1 48044 2.081425e-05
## 14432    1 48044 2.081425e-05
## 14433    1 48044 2.081425e-05
## 14434    1 48044 2.081425e-05
## 14435    1 48044 2.081425e-05
## 14436    1 48044 2.081425e-05
## 14437    1 48044 2.081425e-05
## 14438    1 48044 2.081425e-05
## 14439    1 48044 2.081425e-05
## 14440    1 48044 2.081425e-05
## 14441    1 48044 2.081425e-05
## 14442    1 48044 2.081425e-05
## 14443    1 48044 2.081425e-05
## 14444    1 48044 2.081425e-05
## 14445    1 48044 2.081425e-05
## 14446    1 48044 2.081425e-05
## 14447    1 48044 2.081425e-05
## 14448    1 48044 2.081425e-05
## 14449    1 48044 2.081425e-05
## 14450    1 48044 2.081425e-05
## 14451    1 48044 2.081425e-05
## 14452    1 48044 2.081425e-05
## 14453    1 48044 2.081425e-05
## 14454    1 48044 2.081425e-05
## 14455    1 48044 2.081425e-05
## 14456    1 48044 2.081425e-05
## 14457    1 48044 2.081425e-05
## 14458    1 48044 2.081425e-05
## 14459    1 48044 2.081425e-05
## 14460    1 48044 2.081425e-05
## 14461    1 48044 2.081425e-05
## 14462    1 48044 2.081425e-05
## 14463    1 48044 2.081425e-05
## 14464    1 48044 2.081425e-05
## 14465    1 48044 2.081425e-05
## 14466    1 48044 2.081425e-05
## 14467    1 48044 2.081425e-05
## 14468    1 48044 2.081425e-05
## 14469    1 48044 2.081425e-05
## 14470    1 48044 2.081425e-05
## 14471    1 48044 2.081425e-05
## 14472    1 48044 2.081425e-05
## 14473    1 48044 2.081425e-05
## 14474    1 48044 2.081425e-05
## 14475    1 48044 2.081425e-05
## 14476    1 48044 2.081425e-05
## 14477    1 48044 2.081425e-05
## 14478    1 48044 2.081425e-05
## 14479    1 48044 2.081425e-05
## 14480    1 48044 2.081425e-05
## 14481    1 48044 2.081425e-05
## 14482    1 48044 2.081425e-05
## 14483    1 48044 2.081425e-05
## 14484    1 48044 2.081425e-05
## 14485    1 48044 2.081425e-05
## 14486    1 48044 2.081425e-05
## 14487    1 48044 2.081425e-05
## 14488    1 48044 2.081425e-05
## 14489    1 48044 2.081425e-05
## 14490    1 48044 2.081425e-05
## 14491    1 48044 2.081425e-05
## 14492    1 48044 2.081425e-05
## 14493    1 48044 2.081425e-05
## 14494    1 48044 2.081425e-05
## 14495    1 48044 2.081425e-05
## 14496    1 48044 2.081425e-05
## 14497    1 48044 2.081425e-05
## 14498    1 48044 2.081425e-05
## 14499    1 48044 2.081425e-05
## 14500    1 48044 2.081425e-05
## 14501    1 48044 2.081425e-05
## 14502    1 48044 2.081425e-05
## 14503    1 48044 2.081425e-05
## 14504    1 48044 2.081425e-05
## 14505    1 48044 2.081425e-05
## 14506    1 48044 2.081425e-05
## 14507    1 48044 2.081425e-05
## 14508    1 48044 2.081425e-05
## 14509    1 48044 2.081425e-05
## 14510    1 48044 2.081425e-05
## 14511    1 48044 2.081425e-05
## 14512    1 48044 2.081425e-05
## 14513    1 48044 2.081425e-05
## 14514    1 48044 2.081425e-05
## 14515    1 48044 2.081425e-05
## 14516    1 48044 2.081425e-05
## 14517    1 48044 2.081425e-05
## 14518    1 48044 2.081425e-05
## 14519    1 48044 2.081425e-05
## 14520    1 48044 2.081425e-05
## 14521    1 48044 2.081425e-05
## 14522    1 48044 2.081425e-05
## 14523    1 48044 2.081425e-05
## 14524    1 48044 2.081425e-05
## 14525    1 48044 2.081425e-05
## 14526    1 48044 2.081425e-05
## 14527    1 48044 2.081425e-05
## 14528    1 48044 2.081425e-05
## 14529    1 48044 2.081425e-05
## 14530    1 48044 2.081425e-05
## 14531    1 48044 2.081425e-05
## 14532    1 48044 2.081425e-05
## 14533    1 48044 2.081425e-05
## 14534    1 48044 2.081425e-05
## 14535    1 48044 2.081425e-05
## 14536    1 48044 2.081425e-05
## 14537    1 48044 2.081425e-05
## 14538    1 48044 2.081425e-05
## 14539    1 48044 2.081425e-05
## 14540    1 48044 2.081425e-05
## 14541    1 48044 2.081425e-05
## 14542    1 48044 2.081425e-05
## 14543    1 48044 2.081425e-05
## 14544    1 48044 2.081425e-05
## 14545    1 48044 2.081425e-05
## 14546    1 48044 2.081425e-05
## 14547    1 48044 2.081425e-05
## 14548    1 48044 2.081425e-05
## 14549    1 48044 2.081425e-05
## 14550    1 48044 2.081425e-05
## 14551    1 48044 2.081425e-05
## 14552    1 48044 2.081425e-05
## 14553    1 48044 2.081425e-05
## 14554    1 48044 2.081425e-05
## 14555    1 48044 2.081425e-05
## 14556    1 48044 2.081425e-05
## 14557    1 48044 2.081425e-05
## 14558    1 48044 2.081425e-05
## 14559    1 48044 2.081425e-05
## 14560    1 48044 2.081425e-05
## 14561    1 48044 2.081425e-05
## 14562    1 48044 2.081425e-05
## 14563    1 48044 2.081425e-05
## 14564    1 48044 2.081425e-05
## 14565    1 48044 2.081425e-05
## 14566    1 48044 2.081425e-05
## 14567    1 48044 2.081425e-05
## 14568    1 48044 2.081425e-05
## 14569    1 48044 2.081425e-05
## 14570    1 48044 2.081425e-05
## 14571    1 48044 2.081425e-05
## 14572    1 48044 2.081425e-05
## 14573    1 48044 2.081425e-05
## 14574    1 48044 2.081425e-05
## 14575    1 48044 2.081425e-05
## 14576    1 48044 2.081425e-05
## 14577    1 48044 2.081425e-05
## 14578    1 48044 2.081425e-05
## 14579    1 48044 2.081425e-05
## 14580    1 48044 2.081425e-05
## 14581    1 48044 2.081425e-05
## 14582    1 48044 2.081425e-05
## 14583    1 48044 2.081425e-05
## 14584    1 48044 2.081425e-05
## 14585    1 48044 2.081425e-05
## 14586    1 48044 2.081425e-05
## 14587    1 48044 2.081425e-05
## 14588    1 48044 2.081425e-05
## 14589    1 48044 2.081425e-05
## 14590    1 48044 2.081425e-05
## 14591    1 48044 2.081425e-05
## 14592    1 48044 2.081425e-05
## 14593    1 48044 2.081425e-05
## 14594    1 48044 2.081425e-05
## 14595    1 48044 2.081425e-05
## 14596    1 48044 2.081425e-05
## 14597    1 48044 2.081425e-05
## 14598    1 48044 2.081425e-05
## 14599    1 48044 2.081425e-05
## 14600    1 48044 2.081425e-05
## 14601    1 48044 2.081425e-05
## 14602    1 48044 2.081425e-05
## 14603    1 48044 2.081425e-05
## 14604    1 48044 2.081425e-05
## 14605    1 48044 2.081425e-05
## 14606    1 48044 2.081425e-05
## 14607    1 48044 2.081425e-05
## 14608    1 48044 2.081425e-05
## 14609    1 48044 2.081425e-05
## 14610    1 48044 2.081425e-05
## 14611    1 48044 2.081425e-05
## 14612    1 48044 2.081425e-05
## 14613    1 48044 2.081425e-05
## 14614    1 48044 2.081425e-05
## 14615    1 48044 2.081425e-05
## 14616    1 48044 2.081425e-05
## 14617    1 48044 2.081425e-05
## 14618    1 48044 2.081425e-05
## 14619    1 48044 2.081425e-05
## 14620    1 48044 2.081425e-05
## 14621    1 48044 2.081425e-05
## 14622    1 48044 2.081425e-05
## 14623    1 48044 2.081425e-05
## 14624    1 48044 2.081425e-05
## 14625    1 48044 2.081425e-05
## 14626    1 48044 2.081425e-05
## 14627    1 48044 2.081425e-05
## 14628    1 48044 2.081425e-05
## 14629    1 48044 2.081425e-05
## 14630    1 48044 2.081425e-05
## 14631    1 48044 2.081425e-05
## 14632    1 48044 2.081425e-05
## 14633    1 48044 2.081425e-05
## 14634    1 48044 2.081425e-05
## 14635    1 48044 2.081425e-05
## 14636    1 48044 2.081425e-05
## 14637    1 48044 2.081425e-05
## 14638    1 48044 2.081425e-05
## 14639    1 48044 2.081425e-05
## 14640    1 48044 2.081425e-05
## 14641    1 48044 2.081425e-05
## 14642    1 48044 2.081425e-05
## 14643    1 48044 2.081425e-05
## 14644    1 48044 2.081425e-05
## 14645    1 48044 2.081425e-05
## 14646    1 48044 2.081425e-05
## 14647    1 48044 2.081425e-05
## 14648    1 48044 2.081425e-05
## 14649    1 48044 2.081425e-05
## 14650    1 48044 2.081425e-05
## 14651    1 48044 2.081425e-05
## 14652    1 48044 2.081425e-05
## 14653    1 48044 2.081425e-05
## 14654    1 48044 2.081425e-05
## 14655    1 48044 2.081425e-05
## 14656    1 48044 2.081425e-05
## 14657    1 48044 2.081425e-05
## 14658    1 48044 2.081425e-05
## 14659    1 48044 2.081425e-05
## 14660    1 48044 2.081425e-05
## 14661    1 48044 2.081425e-05
## 14662    1 48044 2.081425e-05
## 14663    1 48044 2.081425e-05
## 14664    1 48044 2.081425e-05
## 14665    1 48044 2.081425e-05
## 14666    1 48044 2.081425e-05
## 14667    1 48044 2.081425e-05
## 14668    1 48044 2.081425e-05
## 14669    1 48044 2.081425e-05
## 14670    1 48044 2.081425e-05
## 14671    1 48044 2.081425e-05
## 14672    1 48044 2.081425e-05
## 14673    1 48044 2.081425e-05
## 14674    1 48044 2.081425e-05
## 14675    1 48044 2.081425e-05
## 14676    1 48044 2.081425e-05
## 14677    1 48044 2.081425e-05
## 14678    1 48044 2.081425e-05
## 14679    1 48044 2.081425e-05
## 14680    1 48044 2.081425e-05
## 14681    1 48044 2.081425e-05
## 14682    1 48044 2.081425e-05
## 14683    1 48044 2.081425e-05
## 14684    1 48044 2.081425e-05
## 14685    1 48044 2.081425e-05
## 14686    1 48044 2.081425e-05
## 14687    1 48044 2.081425e-05
## 14688    1 48044 2.081425e-05
## 14689    1 48044 2.081425e-05
## 14690    1 48044 2.081425e-05
## 14691    1 48044 2.081425e-05
## 14692    1 48044 2.081425e-05
## 14693    1 48044 2.081425e-05
## 14694    1 48044 2.081425e-05
## 14695    1 48044 2.081425e-05
## 14696    1 48044 2.081425e-05
## 14697    1 48044 2.081425e-05
## 14698    1 48044 2.081425e-05
## 14699    1 48044 2.081425e-05
## 14700    1 48044 2.081425e-05
## 14701    1 48044 2.081425e-05
## 14702    1 48044 2.081425e-05
## 14703    1 48044 2.081425e-05
## 14704    1 48044 2.081425e-05
## 14705    1 48044 2.081425e-05
## 14706    1 48044 2.081425e-05
## 14707    1 48044 2.081425e-05
## 14708    1 48044 2.081425e-05
## 14709    1 48044 2.081425e-05
## 14710    1 48044 2.081425e-05
## 14711    1 48044 2.081425e-05
## 14712    1 48044 2.081425e-05
## 14713    1 48044 2.081425e-05
## 14714    1 48044 2.081425e-05
## 14715    1 48044 2.081425e-05
## 14716    1 48044 2.081425e-05
## 14717    1 48044 2.081425e-05
## 14718    1 48044 2.081425e-05
## 14719    1 48044 2.081425e-05
## 14720    1 48044 2.081425e-05
## 14721    1 48044 2.081425e-05
## 14722    1 48044 2.081425e-05
## 14723    1 48044 2.081425e-05
## 14724    1 48044 2.081425e-05
## 14725    1 48044 2.081425e-05
## 14726    1 48044 2.081425e-05
## 14727    1 48044 2.081425e-05
## 14728    1 48044 2.081425e-05
## 14729    1 48044 2.081425e-05
## 14730    1 48044 2.081425e-05
## 14731    1 48044 2.081425e-05
## 14732    1 48044 2.081425e-05
## 14733    1 48044 2.081425e-05
## 14734    1 48044 2.081425e-05
## 14735    1 48044 2.081425e-05
## 14736    1 48044 2.081425e-05
## 14737    1 48044 2.081425e-05
## 14738    1 48044 2.081425e-05
## 14739    1 48044 2.081425e-05
## 14740    1 48044 2.081425e-05
## 14741    1 48044 2.081425e-05
## 14742    1 48044 2.081425e-05
## 14743    1 48044 2.081425e-05
## 14744    1 48044 2.081425e-05
## 14745    1 48044 2.081425e-05
## 14746    1 48044 2.081425e-05
## 14747    1 48044 2.081425e-05
## 14748    1 48044 2.081425e-05
## 14749    1 48044 2.081425e-05
## 14750    1 48044 2.081425e-05
## 14751    1 48044 2.081425e-05
## 14752    1 48044 2.081425e-05
## 14753    1 48044 2.081425e-05
## 14754    1 48044 2.081425e-05
## 14755    1 48044 2.081425e-05
## 14756    1 48044 2.081425e-05
## 14757    1 48044 2.081425e-05
## 14758    1 48044 2.081425e-05
## 14759    1 48044 2.081425e-05
## 14760    1 48044 2.081425e-05
## 14761    1 48044 2.081425e-05
## 14762    1 48044 2.081425e-05
## 14763    1 48044 2.081425e-05
## 14764    1 48044 2.081425e-05
## 14765    1 48044 2.081425e-05
## 14766    1 48044 2.081425e-05
## 14767    1 48044 2.081425e-05
## 14768    1 48044 2.081425e-05
## 14769    1 48044 2.081425e-05
## 14770    1 48044 2.081425e-05
## 14771    1 48044 2.081425e-05
## 14772    1 48044 2.081425e-05
## 14773    1 48044 2.081425e-05
## 14774    1 48044 2.081425e-05
## 14775    1 48044 2.081425e-05
## 14776    1 48044 2.081425e-05
## 14777    1 48044 2.081425e-05
## 14778    1 48044 2.081425e-05
## 14779    1 48044 2.081425e-05
## 14780    1 48044 2.081425e-05
## 14781    1 48044 2.081425e-05
## 14782    1 48044 2.081425e-05
## 14783    1 48044 2.081425e-05
## 14784    1 48044 2.081425e-05
## 14785    1 48044 2.081425e-05
## 14786    1 48044 2.081425e-05
## 14787    1 48044 2.081425e-05
## 14788    1 48044 2.081425e-05
## 14789    1 48044 2.081425e-05
## 14790    1 48044 2.081425e-05
## 14791    1 48044 2.081425e-05
## 14792    1 48044 2.081425e-05
## 14793    1 48044 2.081425e-05
## 14794    1 48044 2.081425e-05
## 14795    1 48044 2.081425e-05
## 14796    1 48044 2.081425e-05
## 14797    1 48044 2.081425e-05
## 14798    1 48044 2.081425e-05
## 14799    1 48044 2.081425e-05
## 14800    1 48044 2.081425e-05
## 14801    1 48044 2.081425e-05
## 14802    1 48044 2.081425e-05
## 14803    1 48044 2.081425e-05
## 14804    1 48044 2.081425e-05
## 14805    1 48044 2.081425e-05
## 14806    1 48044 2.081425e-05
## 14807    1 48044 2.081425e-05
## 14808    1 48044 2.081425e-05
## 14809    1 48044 2.081425e-05
## 14810    1 48044 2.081425e-05
## 14811    1 48044 2.081425e-05
## 14812    1 48044 2.081425e-05
## 14813    1 48044 2.081425e-05
## 14814    1 48044 2.081425e-05
## 14815    1 48044 2.081425e-05
## 14816    1 48044 2.081425e-05
## 14817    1 48044 2.081425e-05
## 14818    1 48044 2.081425e-05
## 14819    1 48044 2.081425e-05
## 14820    1 48044 2.081425e-05
## 14821    1 48044 2.081425e-05
## 14822    1 48044 2.081425e-05
## 14823    1 48044 2.081425e-05
## 14824    1 48044 2.081425e-05
## 14825    1 48044 2.081425e-05
## 14826    1 48044 2.081425e-05
## 14827    1 48044 2.081425e-05
## 14828    1 48044 2.081425e-05
## 14829    1 48044 2.081425e-05
## 14830    1 48044 2.081425e-05
## 14831    1 48044 2.081425e-05
## 14832    1 48044 2.081425e-05
## 14833    1 48044 2.081425e-05
## 14834    1 48044 2.081425e-05
## 14835    1 48044 2.081425e-05
## 14836    1 48044 2.081425e-05
## 14837    1 48044 2.081425e-05
## 14838    1 48044 2.081425e-05
## 14839    1 48044 2.081425e-05
## 14840    1 48044 2.081425e-05
## 14841    1 48044 2.081425e-05
## 14842    1 48044 2.081425e-05
## 14843    1 48044 2.081425e-05
## 14844    1 48044 2.081425e-05
## 14845    1 48044 2.081425e-05
## 14846    1 48044 2.081425e-05
## 14847    1 48044 2.081425e-05
## 14848    1 48044 2.081425e-05
## 14849    1 48044 2.081425e-05
## 14850    1 48044 2.081425e-05
## 14851    1 48044 2.081425e-05
## 14852    1 48044 2.081425e-05
## 14853    1 48044 2.081425e-05
## 14854    1 48044 2.081425e-05
## 14855    1 48044 2.081425e-05
## 14856    1 48044 2.081425e-05
## 14857    1 48044 2.081425e-05
## 14858    1 48044 2.081425e-05
## 14859    1 48044 2.081425e-05
## 14860    1 48044 2.081425e-05
## 14861    1 48044 2.081425e-05
## 14862    1 48044 2.081425e-05
## 14863    1 48044 2.081425e-05
## 14864    1 48044 2.081425e-05
## 14865    1 48044 2.081425e-05
## 14866    1 48044 2.081425e-05
## 14867    1 48044 2.081425e-05
## 14868    1 48044 2.081425e-05
## 14869    1 48044 2.081425e-05
## 14870    1 48044 2.081425e-05
## 14871    1 48044 2.081425e-05
## 14872    1 48044 2.081425e-05
## 14873    1 48044 2.081425e-05
## 14874    1 48044 2.081425e-05
## 14875    1 48044 2.081425e-05
## 14876    1 48044 2.081425e-05
## 14877    1 48044 2.081425e-05
## 14878    1 48044 2.081425e-05
## 14879    1 48044 2.081425e-05
## 14880    1 48044 2.081425e-05
## 14881    1 48044 2.081425e-05
## 14882    1 48044 2.081425e-05
## 14883    1 48044 2.081425e-05
## 14884    1 48044 2.081425e-05
## 14885    1 48044 2.081425e-05
## 14886    1 48044 2.081425e-05
## 14887    1 48044 2.081425e-05
## 14888    1 48044 2.081425e-05
## 14889    1 48044 2.081425e-05
## 14890    1 48044 2.081425e-05
## 14891    1 48044 2.081425e-05
## 14892    1 48044 2.081425e-05
## 14893    1 48044 2.081425e-05
## 14894    1 48044 2.081425e-05
## 14895    1 48044 2.081425e-05
## 14896    1 48044 2.081425e-05
## 14897    1 48044 2.081425e-05
## 14898    1 48044 2.081425e-05
## 14899    1 48044 2.081425e-05
## 14900    1 48044 2.081425e-05
## 14901    1 48044 2.081425e-05
## 14902    1 48044 2.081425e-05
## 14903    1 48044 2.081425e-05
## 14904    1 48044 2.081425e-05
## 14905    1 48044 2.081425e-05
## 14906    1 48044 2.081425e-05
## 14907    1 48044 2.081425e-05
## 14908    1 48044 2.081425e-05
## 14909    1 48044 2.081425e-05
## 14910    1 48044 2.081425e-05
## 14911    1 48044 2.081425e-05
## 14912    1 48044 2.081425e-05
## 14913    1 48044 2.081425e-05
## 14914    1 48044 2.081425e-05
## 14915    1 48044 2.081425e-05
## 14916    1 48044 2.081425e-05
## 14917    1 48044 2.081425e-05
## 14918    1 48044 2.081425e-05
## 14919    1 48044 2.081425e-05
## 14920    1 48044 2.081425e-05
## 14921    1 48044 2.081425e-05
## 14922    1 48044 2.081425e-05
## 14923    1 48044 2.081425e-05
## 14924    1 48044 2.081425e-05
## 14925    1 48044 2.081425e-05
## 14926    1 48044 2.081425e-05
## 14927    1 48044 2.081425e-05
## 14928    1 48044 2.081425e-05
## 14929    1 48044 2.081425e-05
## 14930    1 48044 2.081425e-05
## 14931    1 48044 2.081425e-05
## 14932    1 48044 2.081425e-05
## 14933    1 48044 2.081425e-05
## 14934    1 48044 2.081425e-05
## 14935    1 48044 2.081425e-05
## 14936    1 48044 2.081425e-05
## 14937    1 48044 2.081425e-05
## 14938    1 48044 2.081425e-05
## 14939    1 48044 2.081425e-05
## 14940    1 48044 2.081425e-05
## 14941    1 48044 2.081425e-05
## 14942    1 48044 2.081425e-05
## 14943    1 48044 2.081425e-05
## 14944    1 48044 2.081425e-05
## 14945    1 48044 2.081425e-05
## 14946    1 48044 2.081425e-05
## 14947    1 48044 2.081425e-05
## 14948    1 48044 2.081425e-05
## 14949    1 48044 2.081425e-05
## 14950    1 48044 2.081425e-05
## 14951    1 48044 2.081425e-05
## 14952    1 48044 2.081425e-05
## 14953    1 48044 2.081425e-05
## 14954    1 48044 2.081425e-05
## 14955    1 48044 2.081425e-05
## 14956    1 48044 2.081425e-05
## 14957    1 48044 2.081425e-05
## 14958    1 48044 2.081425e-05
## 14959    1 48044 2.081425e-05
## 14960    1 48044 2.081425e-05
## 14961    1 48044 2.081425e-05
## 14962    1 48044 2.081425e-05
## 14963    1 48044 2.081425e-05
## 14964    1 48044 2.081425e-05
## 14965    1 48044 2.081425e-05
## 14966    1 48044 2.081425e-05
## 14967    1 48044 2.081425e-05
## 14968    1 48044 2.081425e-05
## 14969    1 48044 2.081425e-05
## 14970    1 48044 2.081425e-05
## 14971    1 48044 2.081425e-05
## 14972    1 48044 2.081425e-05
## 14973    1 48044 2.081425e-05
## 14974    1 48044 2.081425e-05
## 14975    1 48044 2.081425e-05
## 14976    1 48044 2.081425e-05
## 14977    1 48044 2.081425e-05
## 14978    1 48044 2.081425e-05
## 14979    1 48044 2.081425e-05
## 14980    1 48044 2.081425e-05
## 14981    1 48044 2.081425e-05
## 14982    1 48044 2.081425e-05
## 14983    1 48044 2.081425e-05
## 14984    1 48044 2.081425e-05
## 14985    1 48044 2.081425e-05
## 14986    1 48044 2.081425e-05
## 14987    1 48044 2.081425e-05
## 14988    1 48044 2.081425e-05
## 14989    1 48044 2.081425e-05
## 14990    1 48044 2.081425e-05
## 14991    1 48044 2.081425e-05
## 14992    1 48044 2.081425e-05
## 14993    1 48044 2.081425e-05
## 14994    1 48044 2.081425e-05
## 14995    1 48044 2.081425e-05
## 14996    1 48044 2.081425e-05
## 14997    1 48044 2.081425e-05
## 14998    1 48044 2.081425e-05
## 14999    1 48044 2.081425e-05
## 15000    1 48044 2.081425e-05
## 15001    1 48044 2.081425e-05
## 15002    1 48044 2.081425e-05
## 15003    1 48044 2.081425e-05
## 15004    1 48044 2.081425e-05
## 15005    1 48044 2.081425e-05
## 15006    1 48044 2.081425e-05
## 15007    1 48044 2.081425e-05
## 15008    1 48044 2.081425e-05
## 15009    1 48044 2.081425e-05
## 15010    1 48044 2.081425e-05
## 15011    1 48044 2.081425e-05
## 15012    1 48044 2.081425e-05
## 15013    1 48044 2.081425e-05
## 15014    1 48044 2.081425e-05
## 15015    1 48044 2.081425e-05
## 15016    1 48044 2.081425e-05
## 15017    1 48044 2.081425e-05
## 15018    1 48044 2.081425e-05
## 15019    1 48044 2.081425e-05
## 15020    1 48044 2.081425e-05
## 15021    1 48044 2.081425e-05
## 15022    1 48044 2.081425e-05
## 15023    1 48044 2.081425e-05
## 15024    1 48044 2.081425e-05
## 15025    1 48044 2.081425e-05
## 15026    1 48044 2.081425e-05
## 15027    1 48044 2.081425e-05
## 15028    1 48044 2.081425e-05
## 15029    1 48044 2.081425e-05
## 15030    1 48044 2.081425e-05
## 15031    1 48044 2.081425e-05
## 15032    1 48044 2.081425e-05
## 15033    1 48044 2.081425e-05
## 15034    1 48044 2.081425e-05
## 15035    1 48044 2.081425e-05
## 15036    1 48044 2.081425e-05
## 15037    1 48044 2.081425e-05
## 15038    1 48044 2.081425e-05
## 15039    1 48044 2.081425e-05
## 15040    1 48044 2.081425e-05
## 15041    1 48044 2.081425e-05
## 15042    1 48044 2.081425e-05
## 15043    1 48044 2.081425e-05
## 15044    1 48044 2.081425e-05
## 15045    1 48044 2.081425e-05
## 15046    1 48044 2.081425e-05
## 15047    1 48044 2.081425e-05
## 15048    1 48044 2.081425e-05
## 15049    1 48044 2.081425e-05
## 15050    1 48044 2.081425e-05
## 15051    1 48044 2.081425e-05
## 15052    1 48044 2.081425e-05
## 15053    1 48044 2.081425e-05
## 15054    1 48044 2.081425e-05
## 15055    1 48044 2.081425e-05
## 15056    1 48044 2.081425e-05
## 15057    1 48044 2.081425e-05
## 15058    1 48044 2.081425e-05
## 15059    1 48044 2.081425e-05
## 15060    1 48044 2.081425e-05
## 15061    1 48044 2.081425e-05
## 15062    1 48044 2.081425e-05
## 15063    1 48044 2.081425e-05
## 15064    1 48044 2.081425e-05
## 15065    1 48044 2.081425e-05
## 15066    1 48044 2.081425e-05
## 15067    1 48044 2.081425e-05
## 15068    1 48044 2.081425e-05
## 15069    1 48044 2.081425e-05
## 15070    1 48044 2.081425e-05
## 15071    1 48044 2.081425e-05
## 15072    1 48044 2.081425e-05
## 15073    1 48044 2.081425e-05
## 15074    1 48044 2.081425e-05
## 15075    1 48044 2.081425e-05
## 15076    1 48044 2.081425e-05
## 15077    1 48044 2.081425e-05
## 15078    1 48044 2.081425e-05
## 15079    1 48044 2.081425e-05
## 15080    1 48044 2.081425e-05
## 15081    1 48044 2.081425e-05
## 15082    1 48044 2.081425e-05
## 15083    1 48044 2.081425e-05
## 15084    1 48044 2.081425e-05
## 15085    1 48044 2.081425e-05
## 15086    1 48044 2.081425e-05
## 15087    1 48044 2.081425e-05
## 15088    1 48044 2.081425e-05
## 15089    1 48044 2.081425e-05
## 15090    1 48044 2.081425e-05
## 15091    1 48044 2.081425e-05
## 15092    1 48044 2.081425e-05
## 15093    1 48044 2.081425e-05
## 15094    1 48044 2.081425e-05
## 15095    1 48044 2.081425e-05
## 15096    1 48044 2.081425e-05
## 15097    1 48044 2.081425e-05
## 15098    1 48044 2.081425e-05
## 15099    1 48044 2.081425e-05
## 15100    1 48044 2.081425e-05
## 15101    1 48044 2.081425e-05
## 15102    1 48044 2.081425e-05
## 15103    1 48044 2.081425e-05
## 15104    1 48044 2.081425e-05
## 15105    1 48044 2.081425e-05
## 15106    1 48044 2.081425e-05
## 15107    1 48044 2.081425e-05
## 15108    1 48044 2.081425e-05
## 15109    1 48044 2.081425e-05
## 15110    1 48044 2.081425e-05
## 15111    1 48044 2.081425e-05
## 15112    1 48044 2.081425e-05
## 15113    1 48044 2.081425e-05
## 15114    1 48044 2.081425e-05
## 15115    1 48044 2.081425e-05
## 15116    1 48044 2.081425e-05
## 15117    1 48044 2.081425e-05
## 15118    1 48044 2.081425e-05
## 15119    1 48044 2.081425e-05
## 15120    1 48044 2.081425e-05
## 15121    1 48044 2.081425e-05
## 15122    1 48044 2.081425e-05
## 15123    1 48044 2.081425e-05
## 15124    1 48044 2.081425e-05
## 15125    1 48044 2.081425e-05
## 15126    1 48044 2.081425e-05
## 15127    1 48044 2.081425e-05
## 15128    1 48044 2.081425e-05
## 15129    1 48044 2.081425e-05
## 15130    1 48044 2.081425e-05
## 15131    1 48044 2.081425e-05
## 15132    1 48044 2.081425e-05
## 15133    1 48044 2.081425e-05
## 15134    1 48044 2.081425e-05
## 15135    1 48044 2.081425e-05
## 15136    1 48044 2.081425e-05
## 15137    1 48044 2.081425e-05
## 15138    1 48044 2.081425e-05
## 15139    1 48044 2.081425e-05
## 15140    1 48044 2.081425e-05
## 15141    1 48044 2.081425e-05
## 15142    1 48044 2.081425e-05
## 15143    1 48044 2.081425e-05
## 15144    1 48044 2.081425e-05
## 15145    1 48044 2.081425e-05
## 15146    1 48044 2.081425e-05
## 15147    1 48044 2.081425e-05
## 15148    1 48044 2.081425e-05
## 15149    1 48044 2.081425e-05
## 15150    1 48044 2.081425e-05
## 15151    1 48044 2.081425e-05
## 15152    1 48044 2.081425e-05
## 15153    1 48044 2.081425e-05
## 15154    1 48044 2.081425e-05
## 15155    1 48044 2.081425e-05
## 15156    1 48044 2.081425e-05
## 15157    1 48044 2.081425e-05
## 15158    1 48044 2.081425e-05
## 15159    1 48044 2.081425e-05
## 15160    1 48044 2.081425e-05
## 15161    1 48044 2.081425e-05
## 15162    1 48044 2.081425e-05
## 15163    1 48044 2.081425e-05
## 15164    1 48044 2.081425e-05
## 15165    1 48044 2.081425e-05
## 15166    1 48044 2.081425e-05
## 15167    1 48044 2.081425e-05
## 15168    1 48044 2.081425e-05
## 15169    1 48044 2.081425e-05
## 15170    1 48044 2.081425e-05
## 15171    1 48044 2.081425e-05
## 15172    1 48044 2.081425e-05
## 15173    1 48044 2.081425e-05
## 15174    1 48044 2.081425e-05
## 15175    1 48044 2.081425e-05
## 15176    1 48044 2.081425e-05
## 15177    1 48044 2.081425e-05
## 15178    1 48044 2.081425e-05
## 15179    1 48044 2.081425e-05
## 15180    1 48044 2.081425e-05
## 15181    1 48044 2.081425e-05
## 15182    1 48044 2.081425e-05
## 15183    1 48044 2.081425e-05
## 15184    1 48044 2.081425e-05
## 15185    1 48044 2.081425e-05
## 15186    1 48044 2.081425e-05
## 15187    1 48044 2.081425e-05
## 15188    1 48044 2.081425e-05
## 15189    1 48044 2.081425e-05
## 15190    1 48044 2.081425e-05
## 15191    1 48044 2.081425e-05
## 15192    1 48044 2.081425e-05
## 15193    1 48044 2.081425e-05
## 15194    1 48044 2.081425e-05
## 15195    1 48044 2.081425e-05
## 15196    1 48044 2.081425e-05
## 15197    1 48044 2.081425e-05
## 15198    1 48044 2.081425e-05
## 15199    1 48044 2.081425e-05
## 15200    1 48044 2.081425e-05
## 15201    1 48044 2.081425e-05
## 15202    1 48044 2.081425e-05
## 15203    1 48044 2.081425e-05
## 15204    1 48044 2.081425e-05
## 15205    1 48044 2.081425e-05
## 15206    1 48044 2.081425e-05
## 15207    1 48044 2.081425e-05
## 15208    1 48044 2.081425e-05
## 15209    1 48044 2.081425e-05
## 15210    1 48044 2.081425e-05
## 15211    1 48044 2.081425e-05
## 15212    1 48044 2.081425e-05
## 15213    1 48044 2.081425e-05
## 15214    1 48044 2.081425e-05
## 15215    1 48044 2.081425e-05
## 15216    1 48044 2.081425e-05
## 15217    1 48044 2.081425e-05
## 15218    1 48044 2.081425e-05
## 15219    1 48044 2.081425e-05
## 15220    1 48044 2.081425e-05
## 15221    1 48044 2.081425e-05
## 15222    1 48044 2.081425e-05
## 15223    1 48044 2.081425e-05
## 15224    1 48044 2.081425e-05
## 15225    1 48044 2.081425e-05
## 15226    1 48044 2.081425e-05
## 15227    1 48044 2.081425e-05
## 15228    1 48044 2.081425e-05
## 15229    1 48044 2.081425e-05
## 15230    1 48044 2.081425e-05
## 15231    1 48044 2.081425e-05
## 15232    1 48044 2.081425e-05
## 15233    1 48044 2.081425e-05
## 15234    1 48044 2.081425e-05
## 15235    1 48044 2.081425e-05
## 15236    1 48044 2.081425e-05
## 15237    1 48044 2.081425e-05
## 15238    1 48044 2.081425e-05
## 15239    1 48044 2.081425e-05
## 15240    1 48044 2.081425e-05
## 15241    1 48044 2.081425e-05
## 15242    1 48044 2.081425e-05
## 15243    1 48044 2.081425e-05
## 15244    1 48044 2.081425e-05
## 15245    1 48044 2.081425e-05
## 15246    1 48044 2.081425e-05
## 15247    1 48044 2.081425e-05
## 15248    1 48044 2.081425e-05
## 15249    1 48044 2.081425e-05
## 15250    1 48044 2.081425e-05
## 15251    1 48044 2.081425e-05
## 15252    1 48044 2.081425e-05
## 15253    1 48044 2.081425e-05
## 15254    1 48044 2.081425e-05
## 15255    1 48044 2.081425e-05
## 15256    1 48044 2.081425e-05
## 15257    1 48044 2.081425e-05
## 15258    1 48044 2.081425e-05
## 15259    1 48044 2.081425e-05
## 15260    1 48044 2.081425e-05
## 15261    1 48044 2.081425e-05
## 15262    1 48044 2.081425e-05
## 15263    1 48044 2.081425e-05
## 15264    1 48044 2.081425e-05
## 15265    1 48044 2.081425e-05
## 15266    1 48044 2.081425e-05
## 15267    1 48044 2.081425e-05
## 15268    1 48044 2.081425e-05
## 15269    1 48044 2.081425e-05
## 15270    1 48044 2.081425e-05
## 15271    1 48044 2.081425e-05
## 15272    1 48044 2.081425e-05
## 15273    1 48044 2.081425e-05
## 15274    1 48044 2.081425e-05
## 15275    1 48044 2.081425e-05
## 15276    1 48044 2.081425e-05
## 15277    1 48044 2.081425e-05
## 15278    1 48044 2.081425e-05
## 15279    1 48044 2.081425e-05
## 15280    1 48044 2.081425e-05
## 15281    1 48044 2.081425e-05
## 15282    1 48044 2.081425e-05
## 15283    1 48044 2.081425e-05
## 15284    1 48044 2.081425e-05
## 15285    1 48044 2.081425e-05
## 15286    1 48044 2.081425e-05
## 15287    1 48044 2.081425e-05
## 15288    1 48044 2.081425e-05
## 15289    1 48044 2.081425e-05
## 15290    1 48044 2.081425e-05
## 15291    1 48044 2.081425e-05
## 15292    1 48044 2.081425e-05
## 15293    1 48044 2.081425e-05
## 15294    1 48044 2.081425e-05
## 15295    1 48044 2.081425e-05
## 15296    1 48044 2.081425e-05
## 15297    1 48044 2.081425e-05
## 15298    1 48044 2.081425e-05
## 15299    1 48044 2.081425e-05
## 15300    1 48044 2.081425e-05
## 15301    1 48044 2.081425e-05
## 15302    1 48044 2.081425e-05
## 15303    1 48044 2.081425e-05
## 15304    1 48044 2.081425e-05
## 15305    1 48044 2.081425e-05
## 15306    1 48044 2.081425e-05
## 15307    1 48044 2.081425e-05
## 15308    1 48044 2.081425e-05
## 15309    1 48044 2.081425e-05
## 15310    1 48044 2.081425e-05
## 15311    1 48044 2.081425e-05
## 15312    1 48044 2.081425e-05
## 15313    1 48044 2.081425e-05
## 15314    1 48044 2.081425e-05
## 15315    1 48044 2.081425e-05
## 15316    1 48044 2.081425e-05
## 15317    1 48044 2.081425e-05
## 15318    1 48044 2.081425e-05
## 15319    1 48044 2.081425e-05
## 15320    1 48044 2.081425e-05
## 15321    1 48044 2.081425e-05
## 15322    1 48044 2.081425e-05
## 15323    1 48044 2.081425e-05
## 15324    1 48044 2.081425e-05
## 15325    1 48044 2.081425e-05
## 15326    1 48044 2.081425e-05
## 15327    1 48044 2.081425e-05
## 15328    1 48044 2.081425e-05
## 15329    1 48044 2.081425e-05
## 15330    1 48044 2.081425e-05
## 15331    1 48044 2.081425e-05
## 15332    1 48044 2.081425e-05
## 15333    1 48044 2.081425e-05
## 15334    1 48044 2.081425e-05
## 15335    1 48044 2.081425e-05
## 15336    1 48044 2.081425e-05
## 15337    1 48044 2.081425e-05
## 15338    1 48044 2.081425e-05
## 15339    1 48044 2.081425e-05
## 15340    1 48044 2.081425e-05
## 15341    1 48044 2.081425e-05
## 15342    1 48044 2.081425e-05
## 15343    1 48044 2.081425e-05
## 15344    1 48044 2.081425e-05
## 15345    1 48044 2.081425e-05
## 15346    1 48044 2.081425e-05
## 15347    1 48044 2.081425e-05
## 15348    1 48044 2.081425e-05
## 15349    1 48044 2.081425e-05
## 15350    1 48044 2.081425e-05
## 15351    1 48044 2.081425e-05
## 15352    1 48044 2.081425e-05
## 15353    1 48044 2.081425e-05
## 15354    1 48044 2.081425e-05
## 15355    1 48044 2.081425e-05
## 15356    1 48044 2.081425e-05
## 15357    1 48044 2.081425e-05
## 15358    1 48044 2.081425e-05
## 15359    1 48044 2.081425e-05
## 15360    1 48044 2.081425e-05
## 15361    1 48044 2.081425e-05
## 15362    1 48044 2.081425e-05
## 15363    1 48044 2.081425e-05
## 15364    1 48044 2.081425e-05
## 15365    1 48044 2.081425e-05
## 15366    1 48044 2.081425e-05
## 15367    1 48044 2.081425e-05
## 15368    1 48044 2.081425e-05
## 15369    1 48044 2.081425e-05
## 15370    1 48044 2.081425e-05
## 15371    1 48044 2.081425e-05
## 15372    1 48044 2.081425e-05
## 15373    1 48044 2.081425e-05
## 15374    1 48044 2.081425e-05
## 15375    1 48044 2.081425e-05
## 15376    1 48044 2.081425e-05
## 15377    1 48044 2.081425e-05
## 15378    1 48044 2.081425e-05
## 15379    1 48044 2.081425e-05
## 15380    1 48044 2.081425e-05
## 15381    1 48044 2.081425e-05
## 15382    1 48044 2.081425e-05
## 15383    1 48044 2.081425e-05
## 15384    1 48044 2.081425e-05
## 15385    1 48044 2.081425e-05
## 15386    1 48044 2.081425e-05
## 15387    1 48044 2.081425e-05
## 15388    1 48044 2.081425e-05
## 15389    1 48044 2.081425e-05
## 15390    1 48044 2.081425e-05
## 15391    1 48044 2.081425e-05
## 15392    1 48044 2.081425e-05
## 15393    1 48044 2.081425e-05
## 15394    1 48044 2.081425e-05
## 15395    1 48044 2.081425e-05
## 15396    1 48044 2.081425e-05
## 15397    1 48044 2.081425e-05
## 15398    1 48044 2.081425e-05
## 15399    1 48044 2.081425e-05
## 15400    1 48044 2.081425e-05
## 15401    1 48044 2.081425e-05
## 15402    1 48044 2.081425e-05
## 15403    1 48044 2.081425e-05
## 15404    1 48044 2.081425e-05
## 15405    1 48044 2.081425e-05
## 15406    1 48044 2.081425e-05
## 15407    1 48044 2.081425e-05
## 15408    1 48044 2.081425e-05
## 15409    1 48044 2.081425e-05
## 15410    1 48044 2.081425e-05
## 15411    1 48044 2.081425e-05
## 15412    1 48044 2.081425e-05
## 15413    1 48044 2.081425e-05
## 15414    1 48044 2.081425e-05
## 15415    1 48044 2.081425e-05
## 15416    1 48044 2.081425e-05
## 15417    1 48044 2.081425e-05
## 15418    1 48044 2.081425e-05
## 15419    1 48044 2.081425e-05
## 15420    1 48044 2.081425e-05
## 15421    1 48044 2.081425e-05
## 15422    1 48044 2.081425e-05
## 15423    1 48044 2.081425e-05
## 15424    1 48044 2.081425e-05
## 15425    1 48044 2.081425e-05
## 15426    1 48044 2.081425e-05
## 15427    1 48044 2.081425e-05
## 15428    1 48044 2.081425e-05
## 15429    1 48044 2.081425e-05
## 15430    1 48044 2.081425e-05
## 15431    1 48044 2.081425e-05
## 15432    1 48044 2.081425e-05
## 15433    1 48044 2.081425e-05
## 15434    1 48044 2.081425e-05
## 15435    1 48044 2.081425e-05
## 15436    1 48044 2.081425e-05
## 15437    1 48044 2.081425e-05
## 15438    1 48044 2.081425e-05
## 15439    1 48044 2.081425e-05
## 15440    1 48044 2.081425e-05
## 15441    1 48044 2.081425e-05
## 15442    1 48044 2.081425e-05
## 15443    1 48044 2.081425e-05
## 15444    1 48044 2.081425e-05
## 15445    1 48044 2.081425e-05
## 15446    1 48044 2.081425e-05
## 15447    1 48044 2.081425e-05
## 15448    1 48044 2.081425e-05
## 15449    1 48044 2.081425e-05
## 15450    1 48044 2.081425e-05
## 15451    1 48044 2.081425e-05
## 15452    1 48044 2.081425e-05
## 15453    1 48044 2.081425e-05
## 15454    1 48044 2.081425e-05
## 15455    1 48044 2.081425e-05
## 15456    1 48044 2.081425e-05
## 15457    1 48044 2.081425e-05
## 15458    1 48044 2.081425e-05
## 15459    1 48044 2.081425e-05
## 15460    1 48044 2.081425e-05
## 15461    1 48044 2.081425e-05
## 15462    1 48044 2.081425e-05
## 15463    1 48044 2.081425e-05
## 15464    1 48044 2.081425e-05
## 15465    1 48044 2.081425e-05
## 15466    1 48044 2.081425e-05
## 15467    1 48044 2.081425e-05
## 15468    1 48044 2.081425e-05
## 15469    1 48044 2.081425e-05
## 15470    1 48044 2.081425e-05
## 15471    1 48044 2.081425e-05
## 15472    1 48044 2.081425e-05
## 15473    1 48044 2.081425e-05
## 15474    1 48044 2.081425e-05
## 15475    1 48044 2.081425e-05
## 15476    1 48044 2.081425e-05
## 15477    1 48044 2.081425e-05
## 15478    1 48044 2.081425e-05
## 15479    1 48044 2.081425e-05
## 15480    1 48044 2.081425e-05
## 15481    1 48044 2.081425e-05
## 15482    1 48044 2.081425e-05
## 15483    1 48044 2.081425e-05
## 15484    1 48044 2.081425e-05
## 15485    1 48044 2.081425e-05
## 15486    1 48044 2.081425e-05
## 15487    1 48044 2.081425e-05
## 15488    1 48044 2.081425e-05
## 15489    1 48044 2.081425e-05
## 15490    1 48044 2.081425e-05
## 15491    1 48044 2.081425e-05
## 15492    1 48044 2.081425e-05
## 15493    1 48044 2.081425e-05
## 15494    1 48044 2.081425e-05
## 15495    1 48044 2.081425e-05
## 15496    1 48044 2.081425e-05
## 15497    1 48044 2.081425e-05
## 15498    1 48044 2.081425e-05
## 15499    1 48044 2.081425e-05
## 15500    1 48044 2.081425e-05
## 15501    1 48044 2.081425e-05
## 15502    1 48044 2.081425e-05
## 15503    1 48044 2.081425e-05
## 15504    1 48044 2.081425e-05
## 15505    1 48044 2.081425e-05
## 15506    1 48044 2.081425e-05
## 15507    1 48044 2.081425e-05
## 15508    1 48044 2.081425e-05
## 15509    1 48044 2.081425e-05
## 15510    1 48044 2.081425e-05
## 15511    1 48044 2.081425e-05
## 15512    1 48044 2.081425e-05
## 15513    1 48044 2.081425e-05
## 15514    1 48044 2.081425e-05
## 15515    1 48044 2.081425e-05
## 15516    1 48044 2.081425e-05
## 15517    1 48044 2.081425e-05
## 15518    1 48044 2.081425e-05
## 15519    1 48044 2.081425e-05
## 15520    1 48044 2.081425e-05
## 15521    1 48044 2.081425e-05
## 15522    1 48044 2.081425e-05
## 15523    1 48044 2.081425e-05
## 15524    1 48044 2.081425e-05
## 15525    1 48044 2.081425e-05
## 15526    1 48044 2.081425e-05
## 15527    1 48044 2.081425e-05
## 15528    1 48044 2.081425e-05
## 15529    1 48044 2.081425e-05
## 15530    1 48044 2.081425e-05
## 15531    1 48044 2.081425e-05
## 15532    1 48044 2.081425e-05
## 15533    1 48044 2.081425e-05
## 15534    1 48044 2.081425e-05
## 15535    1 48044 2.081425e-05
## 15536    1 48044 2.081425e-05
## 15537    1 48044 2.081425e-05
## 15538    1 48044 2.081425e-05
## 15539    1 48044 2.081425e-05
## 15540    1 48044 2.081425e-05
## 15541    1 48044 2.081425e-05
## 15542    1 48044 2.081425e-05
## 15543    1 48044 2.081425e-05
## 15544    1 48044 2.081425e-05
## 15545    1 48044 2.081425e-05
## 15546    1 48044 2.081425e-05
## 15547    1 48044 2.081425e-05
## 15548    1 48044 2.081425e-05
## 15549    1 48044 2.081425e-05
## 15550    1 48044 2.081425e-05
## 15551    1 48044 2.081425e-05
## 15552    1 48044 2.081425e-05
## 15553    1 48044 2.081425e-05
## 15554    1 48044 2.081425e-05
## 15555    1 48044 2.081425e-05
## 15556    1 48044 2.081425e-05
## 15557    1 48044 2.081425e-05
## 15558    1 48044 2.081425e-05
## 15559    1 48044 2.081425e-05
## 15560    1 48044 2.081425e-05
## 15561    1 48044 2.081425e-05
## 15562    1 48044 2.081425e-05
## 15563    1 48044 2.081425e-05
## 15564    1 48044 2.081425e-05
## 15565    1 48044 2.081425e-05
## 15566    1 48044 2.081425e-05
## 15567    1 48044 2.081425e-05
## 15568    1 48044 2.081425e-05
## 15569    1 48044 2.081425e-05
## 15570    1 48044 2.081425e-05
## 15571    1 48044 2.081425e-05
## 15572    1 48044 2.081425e-05
## 15573    1 48044 2.081425e-05
## 15574    1 48044 2.081425e-05
## 15575    1 48044 2.081425e-05
## 15576    1 48044 2.081425e-05
## 15577    1 48044 2.081425e-05
## 15578    1 48044 2.081425e-05
## 15579    1 48044 2.081425e-05
## 15580    1 48044 2.081425e-05
## 15581    1 48044 2.081425e-05
## 15582    1 48044 2.081425e-05
## 15583    1 48044 2.081425e-05
## 15584    1 48044 2.081425e-05
## 15585    1 48044 2.081425e-05
## 15586    1 48044 2.081425e-05
## 15587    1 48044 2.081425e-05
## 15588    1 48044 2.081425e-05
## 15589    1 48044 2.081425e-05
## 15590    1 48044 2.081425e-05
## 15591    1 48044 2.081425e-05
## 15592    1 48044 2.081425e-05
## 15593    1 48044 2.081425e-05
## 15594    1 48044 2.081425e-05
## 15595    1 48044 2.081425e-05
## 15596    1 48044 2.081425e-05
## 15597    1 48044 2.081425e-05
## 15598    1 48044 2.081425e-05
## 15599    1 48044 2.081425e-05
## 15600    1 48044 2.081425e-05
## 15601    1 48044 2.081425e-05
## 15602    1 48044 2.081425e-05
## 15603    1 48044 2.081425e-05
## 15604    1 48044 2.081425e-05
## 15605    1 48044 2.081425e-05
## 15606    1 48044 2.081425e-05
## 15607    1 48044 2.081425e-05
## 15608    1 48044 2.081425e-05
## 15609    1 48044 2.081425e-05
## 15610    1 48044 2.081425e-05
## 15611    1 48044 2.081425e-05
## 15612    1 48044 2.081425e-05
## 15613    1 48044 2.081425e-05
## 15614    1 48044 2.081425e-05
## 15615    1 48044 2.081425e-05
## 15616    1 48044 2.081425e-05
## 15617    1 48044 2.081425e-05
## 15618    1 48044 2.081425e-05
## 15619    1 48044 2.081425e-05
## 15620    1 48044 2.081425e-05
## 15621    1 48044 2.081425e-05
## 15622    1 48044 2.081425e-05
## 15623    1 48044 2.081425e-05
## 15624    1 48044 2.081425e-05
## 15625    1 48044 2.081425e-05
## 15626    1 48044 2.081425e-05
## 15627    1 48044 2.081425e-05
## 15628    1 48044 2.081425e-05
## 15629    1 48044 2.081425e-05
## 15630    1 48044 2.081425e-05
## 15631    1 48044 2.081425e-05
## 15632    1 48044 2.081425e-05
## 15633    1 48044 2.081425e-05
## 15634    1 48044 2.081425e-05
## 15635    1 48044 2.081425e-05
## 15636    1 48044 2.081425e-05
## 15637    1 48044 2.081425e-05
## 15638    1 48044 2.081425e-05
## 15639    1 48044 2.081425e-05
## 15640    1 48044 2.081425e-05
## 15641    1 48044 2.081425e-05
## 15642    1 48044 2.081425e-05
## 15643    1 48044 2.081425e-05
## 15644    1 48044 2.081425e-05
## 15645    1 48044 2.081425e-05
## 15646    1 48044 2.081425e-05
## 15647    1 48044 2.081425e-05
## 15648    1 48044 2.081425e-05
## 15649    1 48044 2.081425e-05
## 15650    1 48044 2.081425e-05
## 15651    1 48044 2.081425e-05
## 15652    1 48044 2.081425e-05
## 15653    1 48044 2.081425e-05
## 15654    1 48044 2.081425e-05
## 15655    1 48044 2.081425e-05
## 15656    1 48044 2.081425e-05
## 15657    1 48044 2.081425e-05
## 15658    1 48044 2.081425e-05
## 15659    1 48044 2.081425e-05
## 15660    1 48044 2.081425e-05
## 15661    1 48044 2.081425e-05
## 15662    1 48044 2.081425e-05
## 15663    1 48044 2.081425e-05
## 15664    1 48044 2.081425e-05
## 15665    1 48044 2.081425e-05
## 15666    1 48044 2.081425e-05
## 15667    1 48044 2.081425e-05
## 15668    1 48044 2.081425e-05
## 15669    1 48044 2.081425e-05
## 15670    1 48044 2.081425e-05
## 15671    1 48044 2.081425e-05
## 15672    1 48044 2.081425e-05
## 15673    1 48044 2.081425e-05
## 15674    1 48044 2.081425e-05
## 15675    1 48044 2.081425e-05
## 15676    1 48044 2.081425e-05
## 15677    1 48044 2.081425e-05
## 15678    1 48044 2.081425e-05
## 15679    1 48044 2.081425e-05
## 15680    1 48044 2.081425e-05
## 15681    1 48044 2.081425e-05
## 15682    1 48044 2.081425e-05
## 15683    1 48044 2.081425e-05
## 15684    1 48044 2.081425e-05
## 15685    1 48044 2.081425e-05
## 15686    1 48044 2.081425e-05
## 15687    1 48044 2.081425e-05
## 15688    1 48044 2.081425e-05
## 15689    1 48044 2.081425e-05
## 15690    1 48044 2.081425e-05
## 15691    1 48044 2.081425e-05
## 15692    1 48044 2.081425e-05
## 15693    1 48044 2.081425e-05
## 15694    1 48044 2.081425e-05
## 15695    1 48044 2.081425e-05
## 15696    1 48044 2.081425e-05
## 15697    1 48044 2.081425e-05
## 15698    1 48044 2.081425e-05
## 15699    1 48044 2.081425e-05
## 15700    1 48044 2.081425e-05
## 15701    1 48044 2.081425e-05
## 15702    1 48044 2.081425e-05
## 15703    1 48044 2.081425e-05
## 15704    1 48044 2.081425e-05
## 15705    1 48044 2.081425e-05
## 15706    1 48044 2.081425e-05
## 15707    1 48044 2.081425e-05
## 15708    1 48044 2.081425e-05
## 15709    1 48044 2.081425e-05
## 15710    1 48044 2.081425e-05
## 15711    1 48044 2.081425e-05
## 15712    1 48044 2.081425e-05
## 15713    1 48044 2.081425e-05
## 15714    1 48044 2.081425e-05
## 15715    1 48044 2.081425e-05
## 15716    1 48044 2.081425e-05
## 15717    1 48044 2.081425e-05
## 15718    1 48044 2.081425e-05
## 15719    1 48044 2.081425e-05
## 15720    1 48044 2.081425e-05
## 15721    1 48044 2.081425e-05
## 15722    1 48044 2.081425e-05
## 15723    1 48044 2.081425e-05
## 15724    1 48044 2.081425e-05
## 15725    1 48044 2.081425e-05
## 15726    1 48044 2.081425e-05
## 15727    1 48044 2.081425e-05
## 15728    1 48044 2.081425e-05
## 15729    1 48044 2.081425e-05
## 15730    1 48044 2.081425e-05
## 15731    1 48044 2.081425e-05
## 15732    1 48044 2.081425e-05
## 15733    1 48044 2.081425e-05
## 15734    1 48044 2.081425e-05
## 15735    1 48044 2.081425e-05
## 15736    1 48044 2.081425e-05
## 15737    1 48044 2.081425e-05
## 15738    1 48044 2.081425e-05
## 15739    1 48044 2.081425e-05
## 15740    1 48044 2.081425e-05
## 15741    1 48044 2.081425e-05
## 15742    1 48044 2.081425e-05
## 15743    1 48044 2.081425e-05
## 15744    1 48044 2.081425e-05
## 15745    1 48044 2.081425e-05
## 15746    1 48044 2.081425e-05
## 15747    1 48044 2.081425e-05
## 15748    1 48044 2.081425e-05
## 15749    1 48044 2.081425e-05
## 15750    1 48044 2.081425e-05
## 15751    1 48044 2.081425e-05
## 15752    1 48044 2.081425e-05
## 15753    1 48044 2.081425e-05
## 15754    1 48044 2.081425e-05
## 15755    1 48044 2.081425e-05
## 15756    1 48044 2.081425e-05
## 15757    1 48044 2.081425e-05
## 15758    1 48044 2.081425e-05
## 15759    1 48044 2.081425e-05
## 15760    1 48044 2.081425e-05
## 15761    1 48044 2.081425e-05
## 15762    1 48044 2.081425e-05
## 15763    1 48044 2.081425e-05
## 15764    1 48044 2.081425e-05
## 15765    1 48044 2.081425e-05
## 15766    1 48044 2.081425e-05
## 15767    1 48044 2.081425e-05
## 15768    1 48044 2.081425e-05
## 15769    1 48044 2.081425e-05
## 15770    1 48044 2.081425e-05
## 15771    1 48044 2.081425e-05
## 15772    1 48044 2.081425e-05
## 15773    1 48044 2.081425e-05
## 15774    1 48044 2.081425e-05
## 15775    1 48044 2.081425e-05
## 15776    1 48044 2.081425e-05
## 15777    1 48044 2.081425e-05
## 15778    1 48044 2.081425e-05
## 15779    1 48044 2.081425e-05
## 15780    1 48044 2.081425e-05
## 15781    1 48044 2.081425e-05
## 15782    1 48044 2.081425e-05
## 15783    1 48044 2.081425e-05
## 15784    1 48044 2.081425e-05
## 15785    1 48044 2.081425e-05
## 15786    1 48044 2.081425e-05
## 15787    1 48044 2.081425e-05
## 15788    1 48044 2.081425e-05
## 15789    1 48044 2.081425e-05
## 15790    1 48044 2.081425e-05
## 15791    1 48044 2.081425e-05
## 15792    1 48044 2.081425e-05
## 15793    1 48044 2.081425e-05
## 15794    1 48044 2.081425e-05
## 15795    1 48044 2.081425e-05
## 15796    1 48044 2.081425e-05
## 15797    1 48044 2.081425e-05
## 15798    1 48044 2.081425e-05
## 15799    1 48044 2.081425e-05
## 15800    1 48044 2.081425e-05
## 15801    1 48044 2.081425e-05
## 15802    1 48044 2.081425e-05
## 15803    1 48044 2.081425e-05
## 15804    1 48044 2.081425e-05
## 15805    1 48044 2.081425e-05
## 15806    1 48044 2.081425e-05
## 15807    1 48044 2.081425e-05
## 15808    1 48044 2.081425e-05
## 15809    1 48044 2.081425e-05
## 15810    1 48044 2.081425e-05
## 15811    1 48044 2.081425e-05
## 15812    1 48044 2.081425e-05
## 15813    1 48044 2.081425e-05
## 15814    1 48044 2.081425e-05
## 15815    1 48044 2.081425e-05
## 15816    1 48044 2.081425e-05
## 15817    1 48044 2.081425e-05
## 15818    1 48044 2.081425e-05
## 15819    1 48044 2.081425e-05
## 15820    1 48044 2.081425e-05
## 15821    1 48044 2.081425e-05
## 15822    1 48044 2.081425e-05
## 15823    1 48044 2.081425e-05
## 15824    1 48044 2.081425e-05
## 15825    1 48044 2.081425e-05
## 15826    1 48044 2.081425e-05
## 15827    1 48044 2.081425e-05
## 15828    1 48044 2.081425e-05
## 15829    1 48044 2.081425e-05
## 15830    1 48044 2.081425e-05
## 15831    1 48044 2.081425e-05
## 15832    1 48044 2.081425e-05
## 15833    1 48044 2.081425e-05
## 15834    1 48044 2.081425e-05
## 15835    1 48044 2.081425e-05
## 15836    1 48044 2.081425e-05
## 15837    1 48044 2.081425e-05
## 15838    1 48044 2.081425e-05
## 15839    1 48044 2.081425e-05
## 15840    1 48044 2.081425e-05
## 15841    1 48044 2.081425e-05
## 15842    1 48044 2.081425e-05
## 15843    1 48044 2.081425e-05
## 15844    1 48044 2.081425e-05
## 15845    1 48044 2.081425e-05
## 15846    1 48044 2.081425e-05
## 15847    1 48044 2.081425e-05
## 15848    1 48044 2.081425e-05
## 15849    1 48044 2.081425e-05
## 15850    1 48044 2.081425e-05
## 15851    1 48044 2.081425e-05
## 15852    1 48044 2.081425e-05
## 15853    1 48044 2.081425e-05
## 15854    1 48044 2.081425e-05
## 15855    1 48044 2.081425e-05
## 15856    1 48044 2.081425e-05
## 15857    1 48044 2.081425e-05
## 15858    1 48044 2.081425e-05
## 15859    1 48044 2.081425e-05
## 15860    1 48044 2.081425e-05
## 15861    1 48044 2.081425e-05
## 15862    1 48044 2.081425e-05
## 15863    1 48044 2.081425e-05
## 15864    1 48044 2.081425e-05
## 15865    1 48044 2.081425e-05
## 15866    1 48044 2.081425e-05
## 15867    1 48044 2.081425e-05
## 15868    1 48044 2.081425e-05
## 15869    1 48044 2.081425e-05
## 15870    1 48044 2.081425e-05
## 15871    1 48044 2.081425e-05
## 15872    1 48044 2.081425e-05
## 15873    1 48044 2.081425e-05
## 15874    1 48044 2.081425e-05
## 15875    1 48044 2.081425e-05
## 15876    1 48044 2.081425e-05
## 15877    1 48044 2.081425e-05
## 15878    1 48044 2.081425e-05
## 15879    1 48044 2.081425e-05
## 15880    1 48044 2.081425e-05
## 15881    1 48044 2.081425e-05
## 15882    1 48044 2.081425e-05
## 15883    1 48044 2.081425e-05
## 15884    1 48044 2.081425e-05
## 15885    1 48044 2.081425e-05
## 15886    1 48044 2.081425e-05
## 15887    1 48044 2.081425e-05
## 15888    1 48044 2.081425e-05
## 15889    1 48044 2.081425e-05
## 15890    1 48044 2.081425e-05
## 15891    1 48044 2.081425e-05
## 15892    1 48044 2.081425e-05
## 15893    1 48044 2.081425e-05
## 15894    1 48044 2.081425e-05
## 15895    1 48044 2.081425e-05
## 15896    1 48044 2.081425e-05
## 15897    1 48044 2.081425e-05
## 15898    1 48044 2.081425e-05
## 15899    1 48044 2.081425e-05
## 15900    1 48044 2.081425e-05
## 15901    1 48044 2.081425e-05
## 15902    1 48044 2.081425e-05
## 15903    1 48044 2.081425e-05
## 15904    1 48044 2.081425e-05
## 15905    1 48044 2.081425e-05
## 15906    1 48044 2.081425e-05
## 15907    1 48044 2.081425e-05
## 15908    1 48044 2.081425e-05
## 15909    1 48044 2.081425e-05
## 15910    1 48044 2.081425e-05
## 15911    1 48044 2.081425e-05
## 15912    1 48044 2.081425e-05
## 15913    1 48044 2.081425e-05
## 15914    1 48044 2.081425e-05
## 15915    1 48044 2.081425e-05
## 15916    1 48044 2.081425e-05
## 15917    1 48044 2.081425e-05
## 15918    1 48044 2.081425e-05
## 15919    1 48044 2.081425e-05
## 15920    1 48044 2.081425e-05
## 15921    1 48044 2.081425e-05
## 15922    1 48044 2.081425e-05
## 15923    1 48044 2.081425e-05
## 15924    1 48044 2.081425e-05
## 15925    1 48044 2.081425e-05
## 15926    1 48044 2.081425e-05
## 15927    1 48044 2.081425e-05
## 15928    1 48044 2.081425e-05
## 15929    1 48044 2.081425e-05
## 15930    1 48044 2.081425e-05
## 15931    1 48044 2.081425e-05
## 15932    1 48044 2.081425e-05
## 15933    1 48044 2.081425e-05
## 15934    1 48044 2.081425e-05
## 15935    1 48044 2.081425e-05
## 15936    1 48044 2.081425e-05
## 15937    1 48044 2.081425e-05
## 15938    1 48044 2.081425e-05
## 15939    1 48044 2.081425e-05
## 15940    1 48044 2.081425e-05
## 15941    1 48044 2.081425e-05
## 15942    1 48044 2.081425e-05
## 15943    1 48044 2.081425e-05
## 15944    1 48044 2.081425e-05
## 15945    1 48044 2.081425e-05
## 15946    1 48044 2.081425e-05
## 15947    1 48044 2.081425e-05
## 15948    1 48044 2.081425e-05
## 15949    1 48044 2.081425e-05
## 15950    1 48044 2.081425e-05
## 15951    1 48044 2.081425e-05
## 15952    1 48044 2.081425e-05
## 15953    1 48044 2.081425e-05
## 15954    1 48044 2.081425e-05
## 15955    1 48044 2.081425e-05
## 15956    1 48044 2.081425e-05
## 15957    1 48044 2.081425e-05
## 15958    1 48044 2.081425e-05
## 15959    1 48044 2.081425e-05
## 15960    1 48044 2.081425e-05
## 15961    1 48044 2.081425e-05
## 15962    1 48044 2.081425e-05
## 15963    1 48044 2.081425e-05
## 15964    1 48044 2.081425e-05
## 15965    1 48044 2.081425e-05
## 15966    1 48044 2.081425e-05
## 15967    1 48044 2.081425e-05
## 15968    1 48044 2.081425e-05
## 15969    1 48044 2.081425e-05
## 15970    1 48044 2.081425e-05
## 15971    1 48044 2.081425e-05
## 15972    1 48044 2.081425e-05
## 15973    1 48044 2.081425e-05
## 15974    1 48044 2.081425e-05
## 15975    1 48044 2.081425e-05
## 15976    1 48044 2.081425e-05
## 15977    1 48044 2.081425e-05
## 15978    1 48044 2.081425e-05
## 15979    1 48044 2.081425e-05
## 15980    1 48044 2.081425e-05
## 15981    1 48044 2.081425e-05
## 15982    1 48044 2.081425e-05
## 15983    1 48044 2.081425e-05
## 15984    1 48044 2.081425e-05
## 15985    1 48044 2.081425e-05
## 15986    1 48044 2.081425e-05
## 15987    1 48044 2.081425e-05
## 15988    1 48044 2.081425e-05
## 15989    1 48044 2.081425e-05
## 15990    1 48044 2.081425e-05
## 15991    1 48044 2.081425e-05
## 15992    1 48044 2.081425e-05
## 15993    1 48044 2.081425e-05
## 15994    1 48044 2.081425e-05
## 15995    1 48044 2.081425e-05
## 15996    1 48044 2.081425e-05
## 15997    1 48044 2.081425e-05
## 15998    1 48044 2.081425e-05
## 15999    1 48044 2.081425e-05
## 16000    1 48044 2.081425e-05
## 16001    1 48044 2.081425e-05
## 16002    1 48044 2.081425e-05
## 16003    1 48044 2.081425e-05
## 16004    1 48044 2.081425e-05
## 16005    1 48044 2.081425e-05
## 16006    1 48044 2.081425e-05
## 16007    1 48044 2.081425e-05
## 16008    1 48044 2.081425e-05
## 16009    1 48044 2.081425e-05
## 16010    1 48044 2.081425e-05
## 16011    1 48044 2.081425e-05
## 16012    1 48044 2.081425e-05
## 16013    1 48044 2.081425e-05
## 16014    1 48044 2.081425e-05
## 16015    1 48044 2.081425e-05
## 16016    1 48044 2.081425e-05
## 16017    1 48044 2.081425e-05
## 16018    1 48044 2.081425e-05
## 16019    1 48044 2.081425e-05
## 16020    1 48044 2.081425e-05
## 16021    1 48044 2.081425e-05
## 16022    1 48044 2.081425e-05
## 16023    1 48044 2.081425e-05
## 16024    1 48044 2.081425e-05
## 16025    1 48044 2.081425e-05
## 16026    1 48044 2.081425e-05
## 16027    1 48044 2.081425e-05
## 16028    1 48044 2.081425e-05
## 16029    1 48044 2.081425e-05
## 16030    1 48044 2.081425e-05
## 16031    1 48044 2.081425e-05
## 16032    1 48044 2.081425e-05
## 16033    1 48044 2.081425e-05
## 16034    1 48044 2.081425e-05
## 16035    1 48044 2.081425e-05
## 16036    1 48044 2.081425e-05
## 16037    1 48044 2.081425e-05
## 16038    1 48044 2.081425e-05
## 16039    1 48044 2.081425e-05
## 16040    1 48044 2.081425e-05
## 16041    1 48044 2.081425e-05
## 16042    1 48044 2.081425e-05
## 16043    1 48044 2.081425e-05
## 16044    1 48044 2.081425e-05
## 16045    1 48044 2.081425e-05
## 16046    1 48044 2.081425e-05
## 16047    1 48044 2.081425e-05
## 16048    1 48044 2.081425e-05
## 16049    1 48044 2.081425e-05
## 16050    1 48044 2.081425e-05
## 16051    1 48044 2.081425e-05
## 16052    1 48044 2.081425e-05
## 16053    1 48044 2.081425e-05
## 16054    1 48044 2.081425e-05
## 16055    1 48044 2.081425e-05
## 16056    1 48044 2.081425e-05
## 16057    1 48044 2.081425e-05
## 16058    1 48044 2.081425e-05
## 16059    1 48044 2.081425e-05
## 16060    1 48044 2.081425e-05
## 16061    1 48044 2.081425e-05
## 16062    1 48044 2.081425e-05
## 16063    1 48044 2.081425e-05
## 16064    1 48044 2.081425e-05
## 16065    1 48044 2.081425e-05
## 16066    1 48044 2.081425e-05
## 16067    1 48044 2.081425e-05
## 16068    1 48044 2.081425e-05
## 16069    1 48044 2.081425e-05
## 16070    1 48044 2.081425e-05
## 16071    1 48044 2.081425e-05
## 16072    1 48044 2.081425e-05
## 16073    1 48044 2.081425e-05
## 16074    1 48044 2.081425e-05
## 16075    1 48044 2.081425e-05
## 16076    1 48044 2.081425e-05
## 16077    1 48044 2.081425e-05
## 16078    1 48044 2.081425e-05
## 16079    1 48044 2.081425e-05
## 16080    1 48044 2.081425e-05
## 16081    1 48044 2.081425e-05
## 16082    1 48044 2.081425e-05
## 16083    1 48044 2.081425e-05
## 16084    1 48044 2.081425e-05
## 16085    1 48044 2.081425e-05
## 16086    1 48044 2.081425e-05
## 16087    1 48044 2.081425e-05
## 16088    1 48044 2.081425e-05
## 16089    1 48044 2.081425e-05
## 16090    1 48044 2.081425e-05
## 16091    1 48044 2.081425e-05
## 16092    1 48044 2.081425e-05
## 16093    1 48044 2.081425e-05
## 16094    1 48044 2.081425e-05
## 16095    1 48044 2.081425e-05
## 16096    1 48044 2.081425e-05
## 16097    1 48044 2.081425e-05
## 16098    1 48044 2.081425e-05
## 16099    1 48044 2.081425e-05
## 16100    1 48044 2.081425e-05
## 16101    1 48044 2.081425e-05
## 16102    1 48044 2.081425e-05
## 16103    1 48044 2.081425e-05
## 16104    1 48044 2.081425e-05
## 16105    1 48044 2.081425e-05
## 16106    1 48044 2.081425e-05
## 16107    1 48044 2.081425e-05
## 16108    1 48044 2.081425e-05
## 16109    1 48044 2.081425e-05
## 16110    1 48044 2.081425e-05
## 16111    1 48044 2.081425e-05
## 16112    1 48044 2.081425e-05
## 16113    1 48044 2.081425e-05
## 16114    1 48044 2.081425e-05
## 16115    1 48044 2.081425e-05
## 16116    1 48044 2.081425e-05
## 16117    1 48044 2.081425e-05
## 16118    1 48044 2.081425e-05
## 16119    1 48044 2.081425e-05
## 16120    1 48044 2.081425e-05
## 16121    1 48044 2.081425e-05
## 16122    1 48044 2.081425e-05
## 16123    1 48044 2.081425e-05
## 16124    1 48044 2.081425e-05
## 16125    1 48044 2.081425e-05
## 16126    1 48044 2.081425e-05
## 16127    1 48044 2.081425e-05
## 16128    1 48044 2.081425e-05
## 16129    1 48044 2.081425e-05
## 16130    1 48044 2.081425e-05
## 16131    1 48044 2.081425e-05
## 16132    1 48044 2.081425e-05
## 16133    1 48044 2.081425e-05
## 16134    1 48044 2.081425e-05
## 16135    1 48044 2.081425e-05
## 16136    1 48044 2.081425e-05
## 16137    1 48044 2.081425e-05
## 16138    1 48044 2.081425e-05
## 16139    1 48044 2.081425e-05
## 16140    1 48044 2.081425e-05
## 16141    1 48044 2.081425e-05
## 16142    1 48044 2.081425e-05
## 16143    1 48044 2.081425e-05
## 16144    1 48044 2.081425e-05
## 16145    1 48044 2.081425e-05
## 16146    1 48044 2.081425e-05
## 16147    1 48044 2.081425e-05
## 16148    1 48044 2.081425e-05
## 16149    1 48044 2.081425e-05
## 16150    1 48044 2.081425e-05
## 16151    1 48044 2.081425e-05
## 16152    1 48044 2.081425e-05
## 16153    1 48044 2.081425e-05
## 16154    1 48044 2.081425e-05
## 16155    1 48044 2.081425e-05
## 16156    1 48044 2.081425e-05
## 16157    1 48044 2.081425e-05
## 16158    1 48044 2.081425e-05
## 16159    1 48044 2.081425e-05
## 16160    1 48044 2.081425e-05
## 16161    1 48044 2.081425e-05
## 16162    1 48044 2.081425e-05
## 16163    1 48044 2.081425e-05
## 16164    1 48044 2.081425e-05
## 16165    1 48044 2.081425e-05
## 16166    1 48044 2.081425e-05
## 16167    1 48044 2.081425e-05
## 16168    1 48044 2.081425e-05
## 16169    1 48044 2.081425e-05
## 16170    1 48044 2.081425e-05
## 16171    1 48044 2.081425e-05
## 16172    1 48044 2.081425e-05
## 16173    1 48044 2.081425e-05
## 16174    1 48044 2.081425e-05
## 16175    1 48044 2.081425e-05
## 16176    1 48044 2.081425e-05
## 16177    1 48044 2.081425e-05
## 16178    1 48044 2.081425e-05
## 16179    1 48044 2.081425e-05
## 16180    1 48044 2.081425e-05
## 16181    1 48044 2.081425e-05
## 16182    1 48044 2.081425e-05
## 16183    1 48044 2.081425e-05
## 16184    1 48044 2.081425e-05
## 16185    1 48044 2.081425e-05
## 16186    1 48044 2.081425e-05
## 16187    1 48044 2.081425e-05
## 16188    1 48044 2.081425e-05
## 16189    1 48044 2.081425e-05
## 16190    1 48044 2.081425e-05
## 16191    1 48044 2.081425e-05
## 16192    1 48044 2.081425e-05
## 16193    1 48044 2.081425e-05
## 16194    1 48044 2.081425e-05
## 16195    1 48044 2.081425e-05
## 16196    1 48044 2.081425e-05
## 16197    1 48044 2.081425e-05
## 16198    1 48044 2.081425e-05
## 16199    1 48044 2.081425e-05
## 16200    1 48044 2.081425e-05
## 16201    1 48044 2.081425e-05
## 16202    1 48044 2.081425e-05
## 16203    1 48044 2.081425e-05
## 16204    1 48044 2.081425e-05
## 16205    1 48044 2.081425e-05
## 16206    1 48044 2.081425e-05
## 16207    1 48044 2.081425e-05
## 16208    1 48044 2.081425e-05
## 16209    1 48044 2.081425e-05
## 16210    1 48044 2.081425e-05
## 16211    1 48044 2.081425e-05
## 16212    1 48044 2.081425e-05
## 16213    1 48044 2.081425e-05
## 16214    1 48044 2.081425e-05
## 16215    1 48044 2.081425e-05
## 16216    1 48044 2.081425e-05
## 16217    1 48044 2.081425e-05
## 16218    1 48044 2.081425e-05
## 16219    1 48044 2.081425e-05
## 16220    1 48044 2.081425e-05
## 16221    1 48044 2.081425e-05
## 16222    1 48044 2.081425e-05
## 16223    1 48044 2.081425e-05
## 16224    1 48044 2.081425e-05
## 16225    1 48044 2.081425e-05
## 16226    1 48044 2.081425e-05
## 16227    1 48044 2.081425e-05
## 16228    1 48044 2.081425e-05
## 16229    1 48044 2.081425e-05
## 16230    1 48044 2.081425e-05
## 16231    1 48044 2.081425e-05
## 16232    1 48044 2.081425e-05
## 16233    1 48044 2.081425e-05
## 16234    1 48044 2.081425e-05
## 16235    1 48044 2.081425e-05
## 16236    1 48044 2.081425e-05
## 16237    1 48044 2.081425e-05
## 16238    1 48044 2.081425e-05
## 16239    1 48044 2.081425e-05
## 16240    1 48044 2.081425e-05
## 16241    1 48044 2.081425e-05
## 16242    1 48044 2.081425e-05
## 16243    1 48044 2.081425e-05
## 16244    1 48044 2.081425e-05
## 16245    1 48044 2.081425e-05
## 16246    1 48044 2.081425e-05
## 16247    1 48044 2.081425e-05
## 16248    1 48044 2.081425e-05
## 16249    1 48044 2.081425e-05
## 16250    1 48044 2.081425e-05
## 16251    1 48044 2.081425e-05
## 16252    1 48044 2.081425e-05
## 16253    1 48044 2.081425e-05
## 16254    1 48044 2.081425e-05
## 16255    1 48044 2.081425e-05
## 16256    1 48044 2.081425e-05
## 16257    1 48044 2.081425e-05
## 16258    1 48044 2.081425e-05
## 16259    1 48044 2.081425e-05
## 16260    1 48044 2.081425e-05
## 16261    1 48044 2.081425e-05
## 16262    1 48044 2.081425e-05
## 16263    1 48044 2.081425e-05
## 16264    1 48044 2.081425e-05
## 16265    1 48044 2.081425e-05
## 16266    1 48044 2.081425e-05
## 16267    1 48044 2.081425e-05
## 16268    1 48044 2.081425e-05
## 16269    1 48044 2.081425e-05
## 16270    1 48044 2.081425e-05
## 16271    1 48044 2.081425e-05
## 16272    1 48044 2.081425e-05
## 16273    1 48044 2.081425e-05
## 16274    1 48044 2.081425e-05
## 16275    1 48044 2.081425e-05
## 16276    1 48044 2.081425e-05
## 16277    1 48044 2.081425e-05
## 16278    1 48044 2.081425e-05
## 16279    1 48044 2.081425e-05
## 16280    1 48044 2.081425e-05
## 16281    1 48044 2.081425e-05
## 16282    1 48044 2.081425e-05
## 16283    1 48044 2.081425e-05
## 16284    1 48044 2.081425e-05
## 16285    1 48044 2.081425e-05
## 16286    1 48044 2.081425e-05
## 16287    1 48044 2.081425e-05
## 16288    1 48044 2.081425e-05
## 16289    1 48044 2.081425e-05
## 16290    1 48044 2.081425e-05
## 16291    1 48044 2.081425e-05
## 16292    1 48044 2.081425e-05
## 16293    1 48044 2.081425e-05
## 16294    1 48044 2.081425e-05
## 16295    1 48044 2.081425e-05
## 16296    1 48044 2.081425e-05
## 16297    1 48044 2.081425e-05
## 16298    1 48044 2.081425e-05
## 16299    1 48044 2.081425e-05
## 16300    1 48044 2.081425e-05
## 16301    1 48044 2.081425e-05
## 16302    1 48044 2.081425e-05
## 16303    1 48044 2.081425e-05
## 16304    1 48044 2.081425e-05
## 16305    1 48044 2.081425e-05
## 16306    1 48044 2.081425e-05
## 16307    1 48044 2.081425e-05
## 16308    1 48044 2.081425e-05
## 16309    1 48044 2.081425e-05
## 16310    1 48044 2.081425e-05
## 16311    1 48044 2.081425e-05
## 16312    1 48044 2.081425e-05
## 16313    1 48044 2.081425e-05
## 16314    1 48044 2.081425e-05
## 16315    1 48044 2.081425e-05
## 16316    1 48044 2.081425e-05
## 16317    1 48044 2.081425e-05
## 16318    1 48044 2.081425e-05
## 16319    1 48044 2.081425e-05
## 16320    1 48044 2.081425e-05
## 16321    1 48044 2.081425e-05
## 16322    1 48044 2.081425e-05
## 16323    1 48044 2.081425e-05
## 16324    1 48044 2.081425e-05
## 16325    1 48044 2.081425e-05
## 16326    1 48044 2.081425e-05
## 16327    1 48044 2.081425e-05
## 16328    1 48044 2.081425e-05
## 16329    1 48044 2.081425e-05
## 16330    1 48044 2.081425e-05
## 16331    1 48044 2.081425e-05
## 16332    1 48044 2.081425e-05
## 16333    1 48044 2.081425e-05
## 16334    1 48044 2.081425e-05
## 16335    1 48044 2.081425e-05
## 16336    1 48044 2.081425e-05
## 16337    1 48044 2.081425e-05
## 16338    1 48044 2.081425e-05
## 16339    1 48044 2.081425e-05
## 16340    1 48044 2.081425e-05
## 16341    1 48044 2.081425e-05
## 16342    1 48044 2.081425e-05
## 16343    1 48044 2.081425e-05
## 16344    1 48044 2.081425e-05
## 16345    1 48044 2.081425e-05
## 16346    1 48044 2.081425e-05
## 16347    1 48044 2.081425e-05
## 16348    1 48044 2.081425e-05
## 16349    1 48044 2.081425e-05
## 16350    1 48044 2.081425e-05
## 16351    1 48044 2.081425e-05
## 16352    1 48044 2.081425e-05
## 16353    1 48044 2.081425e-05
## 16354    1 48044 2.081425e-05
## 16355    1 48044 2.081425e-05
## 16356    1 48044 2.081425e-05
## 16357    1 48044 2.081425e-05
## 16358    1 48044 2.081425e-05
## 16359    1 48044 2.081425e-05
## 16360    1 48044 2.081425e-05
## 16361    1 48044 2.081425e-05
## 16362    1 48044 2.081425e-05
## 16363    1 48044 2.081425e-05
## 16364    1 48044 2.081425e-05
## 16365    1 48044 2.081425e-05
## 16366    1 48044 2.081425e-05
## 16367    1 48044 2.081425e-05
## 16368    1 48044 2.081425e-05
## 16369    1 48044 2.081425e-05
## 16370    1 48044 2.081425e-05
## 16371    1 48044 2.081425e-05
## 16372    1 48044 2.081425e-05
## 16373    1 48044 2.081425e-05
## 16374    1 48044 2.081425e-05
## 16375    1 48044 2.081425e-05
## 16376    1 48044 2.081425e-05
## 16377    1 48044 2.081425e-05
## 16378    1 48044 2.081425e-05
## 16379    1 48044 2.081425e-05
## 16380    1 48044 2.081425e-05
## 16381    1 48044 2.081425e-05
## 16382    1 48044 2.081425e-05
## 16383    1 48044 2.081425e-05
## 16384    1 48044 2.081425e-05
## 16385    1 48044 2.081425e-05
## 16386    1 48044 2.081425e-05
## 16387    1 48044 2.081425e-05
## 16388    1 48044 2.081425e-05
## 16389    1 48044 2.081425e-05
## 16390    1 48044 2.081425e-05
## 16391    1 48044 2.081425e-05
## 16392    1 48044 2.081425e-05
## 16393    1 48044 2.081425e-05
## 16394    1 48044 2.081425e-05
## 16395    1 48044 2.081425e-05
## 16396    1 48044 2.081425e-05
## 16397    1 48044 2.081425e-05
## 16398    1 48044 2.081425e-05
## 16399    1 48044 2.081425e-05
## 16400    1 48044 2.081425e-05
## 16401    1 48044 2.081425e-05
## 16402    1 48044 2.081425e-05
## 16403    1 48044 2.081425e-05
## 16404    1 48044 2.081425e-05
## 16405    1 48044 2.081425e-05
## 16406    1 48044 2.081425e-05
## 16407    1 48044 2.081425e-05
## 16408    1 48044 2.081425e-05
## 16409    1 48044 2.081425e-05
## 16410    1 48044 2.081425e-05
## 16411    1 48044 2.081425e-05
## 16412    1 48044 2.081425e-05
## 16413    1 48044 2.081425e-05
## 16414    1 48044 2.081425e-05
## 16415    1 48044 2.081425e-05
## 16416    1 48044 2.081425e-05
## 16417    1 48044 2.081425e-05
## 16418    1 48044 2.081425e-05
## 16419    1 48044 2.081425e-05
## 16420    1 48044 2.081425e-05
## 16421    1 48044 2.081425e-05
## 16422    1 48044 2.081425e-05
## 16423    1 48044 2.081425e-05
## 16424    1 48044 2.081425e-05
## 16425    1 48044 2.081425e-05
## 16426    1 48044 2.081425e-05
## 16427    1 48044 2.081425e-05
## 16428    1 48044 2.081425e-05
## 16429    1 48044 2.081425e-05
## 16430    1 48044 2.081425e-05
## 16431    1 48044 2.081425e-05
## 16432    1 48044 2.081425e-05
## 16433    1 48044 2.081425e-05
## 16434    1 48044 2.081425e-05
## 16435    1 48044 2.081425e-05
## 16436    1 48044 2.081425e-05
## 16437    1 48044 2.081425e-05
## 16438    1 48044 2.081425e-05
## 16439    1 48044 2.081425e-05
## 16440    1 48044 2.081425e-05
## 16441    1 48044 2.081425e-05
## 16442    1 48044 2.081425e-05
## 16443    1 48044 2.081425e-05
## 16444    1 48044 2.081425e-05
## 16445    1 48044 2.081425e-05
## 16446    1 48044 2.081425e-05
## 16447    1 48044 2.081425e-05
## 16448    1 48044 2.081425e-05
## 16449    1 48044 2.081425e-05
## 16450    1 48044 2.081425e-05
## 16451    1 48044 2.081425e-05
## 16452    1 48044 2.081425e-05
## 16453    1 48044 2.081425e-05
## 16454    1 48044 2.081425e-05
## 16455    1 48044 2.081425e-05
## 16456    1 48044 2.081425e-05
## 16457    1 48044 2.081425e-05
## 16458    1 48044 2.081425e-05
## 16459    1 48044 2.081425e-05
## 16460    1 48044 2.081425e-05
## 16461    1 48044 2.081425e-05
## 16462    1 48044 2.081425e-05
## 16463    1 48044 2.081425e-05
## 16464    1 48044 2.081425e-05
## 16465    1 48044 2.081425e-05
## 16466    1 48044 2.081425e-05
## 16467    1 48044 2.081425e-05
## 16468    1 48044 2.081425e-05
## 16469    1 48044 2.081425e-05
## 16470    1 48044 2.081425e-05
## 16471    1 48044 2.081425e-05
## 16472    1 48044 2.081425e-05
## 16473    1 48044 2.081425e-05
## 16474    1 48044 2.081425e-05
## 16475    1 48044 2.081425e-05
## 16476    1 48044 2.081425e-05
## 16477    1 48044 2.081425e-05
## 16478    1 48044 2.081425e-05
## 16479    1 48044 2.081425e-05
## 16480    1 48044 2.081425e-05
## 16481    1 48044 2.081425e-05
## 16482    1 48044 2.081425e-05
## 16483    1 48044 2.081425e-05
## 16484    1 48044 2.081425e-05
## 16485    1 48044 2.081425e-05
## 16486    1 48044 2.081425e-05
## 16487    1 48044 2.081425e-05
## 16488    1 48044 2.081425e-05
## 16489    1 48044 2.081425e-05
## 16490    1 48044 2.081425e-05
## 16491    1 48044 2.081425e-05
## 16492    1 48044 2.081425e-05
## 16493    1 48044 2.081425e-05
## 16494    1 48044 2.081425e-05
## 16495    1 48044 2.081425e-05
## 16496    1 48044 2.081425e-05
## 16497    1 48044 2.081425e-05
## 16498    1 48044 2.081425e-05
## 16499    1 48044 2.081425e-05
## 16500    1 48044 2.081425e-05
## 16501    1 48044 2.081425e-05
## 16502    1 48044 2.081425e-05
## 16503    1 48044 2.081425e-05
## 16504    1 48044 2.081425e-05
## 16505    1 48044 2.081425e-05
## 16506    1 48044 2.081425e-05
## 16507    1 48044 2.081425e-05
## 16508    1 48044 2.081425e-05
## 16509    1 48044 2.081425e-05
## 16510    1 48044 2.081425e-05
## 16511    1 48044 2.081425e-05
## 16512    1 48044 2.081425e-05
## 16513    1 48044 2.081425e-05
## 16514    1 48044 2.081425e-05
## 16515    1 48044 2.081425e-05
## 16516    1 48044 2.081425e-05
## 16517    1 48044 2.081425e-05
## 16518    1 48044 2.081425e-05
## 16519    1 48044 2.081425e-05
## 16520    1 48044 2.081425e-05
## 16521    1 48044 2.081425e-05
## 16522    1 48044 2.081425e-05
## 16523    1 48044 2.081425e-05
## 16524    1 48044 2.081425e-05
## 16525    1 48044 2.081425e-05
## 16526    1 48044 2.081425e-05
## 16527    1 48044 2.081425e-05
## 16528    1 48044 2.081425e-05
## 16529    1 48044 2.081425e-05
## 16530    1 48044 2.081425e-05
## 16531    1 48044 2.081425e-05
## 16532    1 48044 2.081425e-05
## 16533    1 48044 2.081425e-05
## 16534    1 48044 2.081425e-05
## 16535    1 48044 2.081425e-05
## 16536    1 48044 2.081425e-05
## 16537    1 48044 2.081425e-05
## 16538    1 48044 2.081425e-05
## 16539    1 48044 2.081425e-05
## 16540    1 48044 2.081425e-05
## 16541    1 48044 2.081425e-05
## 16542    1 48044 2.081425e-05
## 16543    1 48044 2.081425e-05
## 16544    1 48044 2.081425e-05
## 16545    1 48044 2.081425e-05
## 16546    1 48044 2.081425e-05
## 16547    1 48044 2.081425e-05
## 16548    1 48044 2.081425e-05
## 16549    1 48044 2.081425e-05
## 16550    1 48044 2.081425e-05
## 16551    1 48044 2.081425e-05
## 16552    1 48044 2.081425e-05
## 16553    1 48044 2.081425e-05
## 16554    1 48044 2.081425e-05
## 16555    1 48044 2.081425e-05
## 16556    1 48044 2.081425e-05
## 16557    1 48044 2.081425e-05
## 16558    1 48044 2.081425e-05
## 16559    1 48044 2.081425e-05
## 16560    1 48044 2.081425e-05
## 16561    1 48044 2.081425e-05
## 16562    1 48044 2.081425e-05
## 16563    1 48044 2.081425e-05
## 16564    1 48044 2.081425e-05
## 16565    1 48044 2.081425e-05
## 16566    1 48044 2.081425e-05
## 16567    1 48044 2.081425e-05
## 16568    1 48044 2.081425e-05
## 16569    1 48044 2.081425e-05
## 16570    1 48044 2.081425e-05
## 16571    1 48044 2.081425e-05
## 16572    1 48044 2.081425e-05
## 16573    1 48044 2.081425e-05
## 16574    1 48044 2.081425e-05
## 16575    1 48044 2.081425e-05
## 16576    1 48044 2.081425e-05
## 16577    1 48044 2.081425e-05
## 16578    1 48044 2.081425e-05
## 16579    1 48044 2.081425e-05
## 16580    1 48044 2.081425e-05
## 16581    1 48044 2.081425e-05
## 16582    1 48044 2.081425e-05
## 16583    1 48044 2.081425e-05
## 16584    1 48044 2.081425e-05
## 16585    1 48044 2.081425e-05
## 16586    1 48044 2.081425e-05
## 16587    1 48044 2.081425e-05
## 16588    1 48044 2.081425e-05
## 16589    1 48044 2.081425e-05
## 16590    1 48044 2.081425e-05
## 16591    1 48044 2.081425e-05
## 16592    1 48044 2.081425e-05
## 16593    1 48044 2.081425e-05
## 16594    1 48044 2.081425e-05
## 16595    1 48044 2.081425e-05
## 16596    1 48044 2.081425e-05
## 16597    1 48044 2.081425e-05
## 16598    1 48044 2.081425e-05
## 16599    1 48044 2.081425e-05
## 16600    1 48044 2.081425e-05
## 16601    1 48044 2.081425e-05
## 16602    1 48044 2.081425e-05
## 16603    1 48044 2.081425e-05
## 16604    1 48044 2.081425e-05
## 16605    1 48044 2.081425e-05
## 16606    1 48044 2.081425e-05
## 16607    1 48044 2.081425e-05
## 16608    1 48044 2.081425e-05
## 16609    1 48044 2.081425e-05
## 16610    1 48044 2.081425e-05
## 16611    1 48044 2.081425e-05
## 16612    1 48044 2.081425e-05
## 16613    1 48044 2.081425e-05
## 16614    1 48044 2.081425e-05
## 16615    1 48044 2.081425e-05
## 16616    1 48044 2.081425e-05
## 16617    1 48044 2.081425e-05
## 16618    1 48044 2.081425e-05
## 16619    1 48044 2.081425e-05
## 16620    1 48044 2.081425e-05
## 16621    1 48044 2.081425e-05
## 16622    1 48044 2.081425e-05
## 16623    1 48044 2.081425e-05
## 16624    1 48044 2.081425e-05
## 16625    1 48044 2.081425e-05
## 16626    1 48044 2.081425e-05
## 16627    1 48044 2.081425e-05
## 16628    1 48044 2.081425e-05
## 16629    1 48044 2.081425e-05
## 16630    1 48044 2.081425e-05
## 16631    1 48044 2.081425e-05
## 16632    1 48044 2.081425e-05
## 16633    1 48044 2.081425e-05
## 16634    1 48044 2.081425e-05
## 16635    1 48044 2.081425e-05
## 16636    1 48044 2.081425e-05
## 16637    1 48044 2.081425e-05
## 16638    1 48044 2.081425e-05
## 16639    1 48044 2.081425e-05
## 16640    1 48044 2.081425e-05
## 16641    1 48044 2.081425e-05
## 16642    1 48044 2.081425e-05
## 16643    1 48044 2.081425e-05
## 16644    1 48044 2.081425e-05
## 16645    1 48044 2.081425e-05
## 16646    1 48044 2.081425e-05
## 16647    1 48044 2.081425e-05
## 16648    1 48044 2.081425e-05
## 16649    1 48044 2.081425e-05
## 16650    1 48044 2.081425e-05
## 16651    1 48044 2.081425e-05
## 16652    1 48044 2.081425e-05
## 16653    1 48044 2.081425e-05
## 16654    1 48044 2.081425e-05
## 16655    1 48044 2.081425e-05
## 16656    1 48044 2.081425e-05
## 16657    1 48044 2.081425e-05
## 16658    1 48044 2.081425e-05
## 16659    1 48044 2.081425e-05
## 16660    1 48044 2.081425e-05
## 16661    1 48044 2.081425e-05
## 16662    1 48044 2.081425e-05
## 16663    1 48044 2.081425e-05
## 16664    1 48044 2.081425e-05
## 16665    1 48044 2.081425e-05
## 16666    1 48044 2.081425e-05
## 16667    1 48044 2.081425e-05
## 16668    1 48044 2.081425e-05
## 16669    1 48044 2.081425e-05
## 16670    1 48044 2.081425e-05
## 16671    1 48044 2.081425e-05
## 16672    1 48044 2.081425e-05
## 16673    1 48044 2.081425e-05
## 16674    1 48044 2.081425e-05
## 16675    1 48044 2.081425e-05
## 16676    1 48044 2.081425e-05
## 16677    1 48044 2.081425e-05
## 16678    1 48044 2.081425e-05
## 16679    1 48044 2.081425e-05
## 16680    1 48044 2.081425e-05
## 16681    1 48044 2.081425e-05
## 16682    1 48044 2.081425e-05
## 16683    1 48044 2.081425e-05
## 16684    1 48044 2.081425e-05
## 16685    1 48044 2.081425e-05
## 16686    1 48044 2.081425e-05
## 16687    1 48044 2.081425e-05
## 16688    1 48044 2.081425e-05
## 16689    1 48044 2.081425e-05
## 16690    1 48044 2.081425e-05
## 16691    1 48044 2.081425e-05
## 16692    1 48044 2.081425e-05
## 16693    1 48044 2.081425e-05
## 16694    1 48044 2.081425e-05
## 16695    1 48044 2.081425e-05
## 16696    1 48044 2.081425e-05
## 16697    1 48044 2.081425e-05
## 16698    1 48044 2.081425e-05
## 16699    1 48044 2.081425e-05
## 16700    1 48044 2.081425e-05
## 16701    1 48044 2.081425e-05
## 16702    1 48044 2.081425e-05
## 16703    1 48044 2.081425e-05
## 16704    1 48044 2.081425e-05
## 16705    1 48044 2.081425e-05
## 16706    1 48044 2.081425e-05
## 16707    1 48044 2.081425e-05
## 16708    1 48044 2.081425e-05
## 16709    1 48044 2.081425e-05
## 16710    1 48044 2.081425e-05
## 16711    1 48044 2.081425e-05
## 16712    1 48044 2.081425e-05
## 16713    1 48044 2.081425e-05
## 16714    1 48044 2.081425e-05
## 16715    1 48044 2.081425e-05
## 16716    1 48044 2.081425e-05
## 16717    1 48044 2.081425e-05
## 16718    1 48044 2.081425e-05
## 16719    1 48044 2.081425e-05
## 16720    1 48044 2.081425e-05
## 16721    1 48044 2.081425e-05
## 16722    1 48044 2.081425e-05
## 16723    1 48044 2.081425e-05
## 16724    1 48044 2.081425e-05
## 16725    1 48044 2.081425e-05
## 16726    1 48044 2.081425e-05
## 16727    1 48044 2.081425e-05
## 16728    1 48044 2.081425e-05
## 16729    1 48044 2.081425e-05
## 16730    1 48044 2.081425e-05
## 16731    1 48044 2.081425e-05
## 16732    1 48044 2.081425e-05
## 16733    1 48044 2.081425e-05
## 16734    1 48044 2.081425e-05
## 16735    1 48044 2.081425e-05
## 16736    1 48044 2.081425e-05
## 16737    1 48044 2.081425e-05
## 16738    1 48044 2.081425e-05
## 16739    1 48044 2.081425e-05
## 16740    1 48044 2.081425e-05
## 16741    1 48044 2.081425e-05
## 16742    1 48044 2.081425e-05
## 16743    1 48044 2.081425e-05
## 16744    1 48044 2.081425e-05
## 16745    1 48044 2.081425e-05
## 16746    1 48044 2.081425e-05
## 16747    1 48044 2.081425e-05
## 16748    1 48044 2.081425e-05
## 16749    1 48044 2.081425e-05
## 16750    1 48044 2.081425e-05
## 16751    1 48044 2.081425e-05
## 16752    1 48044 2.081425e-05
## 16753    1 48044 2.081425e-05
## 16754    1 48044 2.081425e-05
## 16755    1 48044 2.081425e-05
## 16756    1 48044 2.081425e-05
## 16757    1 48044 2.081425e-05
## 16758    1 48044 2.081425e-05
## 16759    1 48044 2.081425e-05
## 16760    1 48044 2.081425e-05
## 16761    1 48044 2.081425e-05
## 16762    1 48044 2.081425e-05
## 16763    1 48044 2.081425e-05
## 16764    1 48044 2.081425e-05
## 16765    1 48044 2.081425e-05
## 16766    1 48044 2.081425e-05
## 16767    1 48044 2.081425e-05
## 16768    1 48044 2.081425e-05
## 16769    1 48044 2.081425e-05
## 16770    1 48044 2.081425e-05
## 16771    1 48044 2.081425e-05
## 16772    1 48044 2.081425e-05
## 16773    1 48044 2.081425e-05
## 16774    1 48044 2.081425e-05
## 16775    1 48044 2.081425e-05
## 16776    1 48044 2.081425e-05
## 16777    1 48044 2.081425e-05
## 16778    1 48044 2.081425e-05
## 16779    1 48044 2.081425e-05
## 16780    1 48044 2.081425e-05
## 16781    1 48044 2.081425e-05
## 16782    1 48044 2.081425e-05
## 16783    1 48044 2.081425e-05
## 16784    1 48044 2.081425e-05
## 16785    1 48044 2.081425e-05
## 16786    1 48044 2.081425e-05
## 16787    1 48044 2.081425e-05
## 16788    1 48044 2.081425e-05
## 16789    1 48044 2.081425e-05
## 16790    1 48044 2.081425e-05
## 16791    1 48044 2.081425e-05
## 16792    1 48044 2.081425e-05
## 16793    1 48044 2.081425e-05
## 16794    1 48044 2.081425e-05
## 16795    1 48044 2.081425e-05
## 16796    1 48044 2.081425e-05
## 16797    1 48044 2.081425e-05
## 16798    1 48044 2.081425e-05
## 16799    1 48044 2.081425e-05
## 16800    1 48044 2.081425e-05
## 16801    1 48044 2.081425e-05
## 16802    1 48044 2.081425e-05
## 16803    1 48044 2.081425e-05
## 16804    1 48044 2.081425e-05
## 16805    1 48044 2.081425e-05
## 16806    1 48044 2.081425e-05
## 16807    1 48044 2.081425e-05
## 16808    1 48044 2.081425e-05
## 16809    1 48044 2.081425e-05
## 16810    1 48044 2.081425e-05
## 16811    1 48044 2.081425e-05
## 16812    1 48044 2.081425e-05
## 16813    1 48044 2.081425e-05
## 16814    1 48044 2.081425e-05
## 16815    1 48044 2.081425e-05
## 16816    1 48044 2.081425e-05
## 16817    1 48044 2.081425e-05
## 16818    1 48044 2.081425e-05
## 16819    1 48044 2.081425e-05
## 16820    1 48044 2.081425e-05
## 16821    1 48044 2.081425e-05
## 16822    1 48044 2.081425e-05
## 16823    1 48044 2.081425e-05
## 16824    1 48044 2.081425e-05
## 16825    1 48044 2.081425e-05
## 16826    1 48044 2.081425e-05
## 16827    1 48044 2.081425e-05
## 16828    1 48044 2.081425e-05
## 16829    1 48044 2.081425e-05
## 16830    1 48044 2.081425e-05
## 16831    1 48044 2.081425e-05
## 16832    1 48044 2.081425e-05
## 16833    1 48044 2.081425e-05
## 16834    1 48044 2.081425e-05
## 16835    1 48044 2.081425e-05
## 16836    1 48044 2.081425e-05
## 16837    1 48044 2.081425e-05
## 16838    1 48044 2.081425e-05
## 16839    1 48044 2.081425e-05
## 16840    1 48044 2.081425e-05
## 16841    1 48044 2.081425e-05
## 16842    1 48044 2.081425e-05
## 16843    1 48044 2.081425e-05
## 16844    1 48044 2.081425e-05
## 16845    1 48044 2.081425e-05
## 16846    1 48044 2.081425e-05
## 16847    1 48044 2.081425e-05
## 16848    1 48044 2.081425e-05
## 16849    1 48044 2.081425e-05
## 16850    1 48044 2.081425e-05
## 16851    1 48044 2.081425e-05
## 16852    1 48044 2.081425e-05
## 16853    1 48044 2.081425e-05
## 16854    1 48044 2.081425e-05
## 16855    1 48044 2.081425e-05
## 16856    1 48044 2.081425e-05
## 16857    1 48044 2.081425e-05
## 16858    1 48044 2.081425e-05
## 16859    1 48044 2.081425e-05
## 16860    1 48044 2.081425e-05
## 16861    1 48044 2.081425e-05
## 16862    1 48044 2.081425e-05
## 16863    1 48044 2.081425e-05
## 16864    1 48044 2.081425e-05
## 16865    1 48044 2.081425e-05
## 16866    1 48044 2.081425e-05
## 16867    1 48044 2.081425e-05
## 16868    1 48044 2.081425e-05
## 16869    1 48044 2.081425e-05
## 16870    1 48044 2.081425e-05
## 16871    1 48044 2.081425e-05
## 16872    1 48044 2.081425e-05
## 16873    1 48044 2.081425e-05
## 16874    1 48044 2.081425e-05
## 16875    1 48044 2.081425e-05
## 16876    1 48044 2.081425e-05
## 16877    1 48044 2.081425e-05
## 16878    1 48044 2.081425e-05
## 16879    1 48044 2.081425e-05
## 16880    1 48044 2.081425e-05
## 16881    1 48044 2.081425e-05
## 16882    1 48044 2.081425e-05
## 16883    1 48044 2.081425e-05
## 16884    1 48044 2.081425e-05
## 16885    1 48044 2.081425e-05
## 16886    1 48044 2.081425e-05
## 16887    1 48044 2.081425e-05
## 16888    1 48044 2.081425e-05
## 16889    1 48044 2.081425e-05
## 16890    1 48044 2.081425e-05
## 16891    1 48044 2.081425e-05
## 16892    1 48044 2.081425e-05
## 16893    1 48044 2.081425e-05
## 16894    1 48044 2.081425e-05
## 16895    1 48044 2.081425e-05
## 16896    1 48044 2.081425e-05
## 16897    1 48044 2.081425e-05
## 16898    1 48044 2.081425e-05
## 16899    1 48044 2.081425e-05
## 16900    1 48044 2.081425e-05
## 16901    1 48044 2.081425e-05
## 16902    1 48044 2.081425e-05
## 16903    1 48044 2.081425e-05
## 16904    1 48044 2.081425e-05
## 16905    1 48044 2.081425e-05
## 16906    1 48044 2.081425e-05
## 16907    1 48044 2.081425e-05
## 16908    1 48044 2.081425e-05
## 16909    1 48044 2.081425e-05
## 16910    1 48044 2.081425e-05
## 16911    1 48044 2.081425e-05
## 16912    1 48044 2.081425e-05
## 16913    1 48044 2.081425e-05
## 16914    1 48044 2.081425e-05
## 16915    1 48044 2.081425e-05
## 16916    1 48044 2.081425e-05
## 16917    1 48044 2.081425e-05
## 16918    1 48044 2.081425e-05
## 16919    1 48044 2.081425e-05
## 16920    1 48044 2.081425e-05
## 16921    1 48044 2.081425e-05
## 16922    1 48044 2.081425e-05
## 16923    1 48044 2.081425e-05
## 16924    1 48044 2.081425e-05
## 16925    1 48044 2.081425e-05
## 16926    1 48044 2.081425e-05
## 16927    1 48044 2.081425e-05
## 16928    1 48044 2.081425e-05
## 16929    1 48044 2.081425e-05
## 16930    1 48044 2.081425e-05
## 16931    1 48044 2.081425e-05
## 16932    1 48044 2.081425e-05
## 16933    1 48044 2.081425e-05
## 16934    1 48044 2.081425e-05
## 16935    1 48044 2.081425e-05
## 16936    1 48044 2.081425e-05
## 16937    1 48044 2.081425e-05
## 16938    1 48044 2.081425e-05
## 16939    1 48044 2.081425e-05
## 16940    1 48044 2.081425e-05
## 16941    1 48044 2.081425e-05
## 16942    1 48044 2.081425e-05
## 16943    1 48044 2.081425e-05
## 16944    1 48044 2.081425e-05
## 16945    1 48044 2.081425e-05
## 16946    1 48044 2.081425e-05
## 16947    1 48044 2.081425e-05
## 16948    1 48044 2.081425e-05
## 16949    1 48044 2.081425e-05
## 16950    1 48044 2.081425e-05
## 16951    1 48044 2.081425e-05
## 16952    1 48044 2.081425e-05
## 16953    1 48044 2.081425e-05
## 16954    1 48044 2.081425e-05
## 16955    1 48044 2.081425e-05
## 16956    1 48044 2.081425e-05
## 16957    1 48044 2.081425e-05
## 16958    1 48044 2.081425e-05
## 16959    1 48044 2.081425e-05
## 16960    1 48044 2.081425e-05
## 16961    1 48044 2.081425e-05
## 16962    1 48044 2.081425e-05
## 16963    1 48044 2.081425e-05
## 16964    1 48044 2.081425e-05
## 16965    1 48044 2.081425e-05
## 16966    1 48044 2.081425e-05
## 16967    1 48044 2.081425e-05
## 16968    1 48044 2.081425e-05
## 16969    1 48044 2.081425e-05
## 16970    1 48044 2.081425e-05
## 16971    1 48044 2.081425e-05
## 16972    1 48044 2.081425e-05
## 16973    1 48044 2.081425e-05
## 16974    1 48044 2.081425e-05
## 16975    1 48044 2.081425e-05
## 16976    1 48044 2.081425e-05
## 16977    1 48044 2.081425e-05
## 16978    1 48044 2.081425e-05
## 16979    1 48044 2.081425e-05
## 16980    1 48044 2.081425e-05
## 16981    1 48044 2.081425e-05
## 16982    1 48044 2.081425e-05
## 16983    1 48044 2.081425e-05
## 16984    1 48044 2.081425e-05
## 16985    1 48044 2.081425e-05
## 16986    1 48044 2.081425e-05
## 16987    1 48044 2.081425e-05
## 16988    1 48044 2.081425e-05
## 16989    1 48044 2.081425e-05
## 16990    1 48044 2.081425e-05
## 16991    1 48044 2.081425e-05
## 16992    1 48044 2.081425e-05
## 16993    1 48044 2.081425e-05
## 16994    1 48044 2.081425e-05
## 16995    1 48044 2.081425e-05
## 16996    1 48044 2.081425e-05
## 16997    1 48044 2.081425e-05
## 16998    1 48044 2.081425e-05
## 16999    1 48044 2.081425e-05
## 17000    1 48044 2.081425e-05
## 17001    1 48044 2.081425e-05
## 17002    1 48044 2.081425e-05
## 17003    1 48044 2.081425e-05
## 17004    1 48044 2.081425e-05
## 17005    1 48044 2.081425e-05
## 17006    1 48044 2.081425e-05
## 17007    1 48044 2.081425e-05
## 17008    1 48044 2.081425e-05
## 17009    1 48044 2.081425e-05
## 17010    1 48044 2.081425e-05
## 17011    1 48044 2.081425e-05
## 17012    1 48044 2.081425e-05
## 17013    1 48044 2.081425e-05
## 17014    1 48044 2.081425e-05
## 17015    1 48044 2.081425e-05
## 17016    1 48044 2.081425e-05
## 17017    1 48044 2.081425e-05
## 17018    1 48044 2.081425e-05
## 17019    1 48044 2.081425e-05
## 17020    1 48044 2.081425e-05
## 17021    1 48044 2.081425e-05
## 17022    1 48044 2.081425e-05
## 17023    1 48044 2.081425e-05
## 17024    1 48044 2.081425e-05
## 17025    1 48044 2.081425e-05
## 17026    1 48044 2.081425e-05
## 17027    1 48044 2.081425e-05
## 17028    1 48044 2.081425e-05
## 17029    1 48044 2.081425e-05
## 17030    1 48044 2.081425e-05
## 17031    1 48044 2.081425e-05
## 17032    1 48044 2.081425e-05
## 17033    1 48044 2.081425e-05
## 17034    1 48044 2.081425e-05
## 17035    1 48044 2.081425e-05
## 17036    1 48044 2.081425e-05
## 17037    1 48044 2.081425e-05
## 17038    1 48044 2.081425e-05
## 17039    1 48044 2.081425e-05
## 17040    1 48044 2.081425e-05
## 17041    1 48044 2.081425e-05
## 17042    1 48044 2.081425e-05
## 17043    1 48044 2.081425e-05
## 17044    1 48044 2.081425e-05
## 17045    1 48044 2.081425e-05
## 17046    1 48044 2.081425e-05
## 17047    1 48044 2.081425e-05
## 17048    1 48044 2.081425e-05
## 17049    1 48044 2.081425e-05
## 17050    1 48044 2.081425e-05
## 17051    1 48044 2.081425e-05
## 17052    1 48044 2.081425e-05
## 17053    1 48044 2.081425e-05
## 17054    1 48044 2.081425e-05
## 17055    1 48044 2.081425e-05
## 17056    1 48044 2.081425e-05
## 17057    1 48044 2.081425e-05
## 17058    1 48044 2.081425e-05
## 17059    1 48044 2.081425e-05
## 17060    1 48044 2.081425e-05
## 17061    1 48044 2.081425e-05
## 17062    1 48044 2.081425e-05
## 17063    1 48044 2.081425e-05
## 17064    1 48044 2.081425e-05
## 17065    1 48044 2.081425e-05
## 17066    1 48044 2.081425e-05
## 17067    1 48044 2.081425e-05
## 17068    1 48044 2.081425e-05
## 17069    1 48044 2.081425e-05
## 17070    1 48044 2.081425e-05
## 17071    1 48044 2.081425e-05
## 17072    1 48044 2.081425e-05
## 17073    1 48044 2.081425e-05
## 17074    1 48044 2.081425e-05
## 17075    1 48044 2.081425e-05
## 17076    1 48044 2.081425e-05
## 17077    1 48044 2.081425e-05
## 17078    1 48044 2.081425e-05
## 17079    1 48044 2.081425e-05
## 17080    1 48044 2.081425e-05
## 17081    1 48044 2.081425e-05
## 17082    1 48044 2.081425e-05
## 17083    1 48044 2.081425e-05
## 17084    1 48044 2.081425e-05
## 17085    1 48044 2.081425e-05
## 17086    1 48044 2.081425e-05
## 17087    1 48044 2.081425e-05
## 17088    1 48044 2.081425e-05
## 17089    1 48044 2.081425e-05
## 17090    1 48044 2.081425e-05
## 17091    1 48044 2.081425e-05
## 17092    1 48044 2.081425e-05
## 17093    1 48044 2.081425e-05
## 17094    1 48044 2.081425e-05
## 17095    1 48044 2.081425e-05
## 17096    1 48044 2.081425e-05
## 17097    1 48044 2.081425e-05
## 17098    1 48044 2.081425e-05
## 17099    1 48044 2.081425e-05
## 17100    1 48044 2.081425e-05
## 17101    1 48044 2.081425e-05
## 17102    1 48044 2.081425e-05
## 17103    1 48044 2.081425e-05
## 17104    1 48044 2.081425e-05
## 17105    1 48044 2.081425e-05
## 17106    1 48044 2.081425e-05
## 17107    1 48044 2.081425e-05
## 17108    1 48044 2.081425e-05
## 17109    1 48044 2.081425e-05
## 17110    1 48044 2.081425e-05
## 17111    1 48044 2.081425e-05
## 17112    1 48044 2.081425e-05
## 17113    1 48044 2.081425e-05
## 17114    1 48044 2.081425e-05
## 17115    1 48044 2.081425e-05
## 17116    1 48044 2.081425e-05
## 17117    1 48044 2.081425e-05
## 17118    1 48044 2.081425e-05
## 17119    1 48044 2.081425e-05
## 17120    1 48044 2.081425e-05
## 17121    1 48044 2.081425e-05
## 17122    1 48044 2.081425e-05
## 17123    1 48044 2.081425e-05
## 17124    1 48044 2.081425e-05
## 17125    1 48044 2.081425e-05
## 17126    1 48044 2.081425e-05
## 17127    1 48044 2.081425e-05
## 17128    1 48044 2.081425e-05
## 17129    1 48044 2.081425e-05
## 17130    1 48044 2.081425e-05
## 17131    1 48044 2.081425e-05
## 17132    1 48044 2.081425e-05
## 17133    1 48044 2.081425e-05
## 17134    1 48044 2.081425e-05
## 17135    1 48044 2.081425e-05
## 17136    1 48044 2.081425e-05
## 17137    1 48044 2.081425e-05
## 17138    1 48044 2.081425e-05
## 17139    1 48044 2.081425e-05
## 17140    1 48044 2.081425e-05
## 17141    1 48044 2.081425e-05
## 17142    1 48044 2.081425e-05
## 17143    1 48044 2.081425e-05
## 17144    1 48044 2.081425e-05
## 17145    1 48044 2.081425e-05
## 17146    1 48044 2.081425e-05
## 17147    1 48044 2.081425e-05
## 17148    1 48044 2.081425e-05
## 17149    1 48044 2.081425e-05
## 17150    1 48044 2.081425e-05
## 17151    1 48044 2.081425e-05
## 17152    1 48044 2.081425e-05
## 17153    1 48044 2.081425e-05
## 17154    1 48044 2.081425e-05
## 17155    1 48044 2.081425e-05
## 17156    1 48044 2.081425e-05
## 17157    1 48044 2.081425e-05
## 17158    1 48044 2.081425e-05
## 17159    1 48044 2.081425e-05
## 17160    1 48044 2.081425e-05
## 17161    1 48044 2.081425e-05
## 17162    1 48044 2.081425e-05
## 17163    1 48044 2.081425e-05
## 17164    1 48044 2.081425e-05
## 17165    1 48044 2.081425e-05
## 17166    1 48044 2.081425e-05
## 17167    1 48044 2.081425e-05
## 17168    1 48044 2.081425e-05
## 17169    1 48044 2.081425e-05
## 17170    1 48044 2.081425e-05
## 17171    1 48044 2.081425e-05
## 17172    1 48044 2.081425e-05
## 17173    1 48044 2.081425e-05
## 17174    1 48044 2.081425e-05
## 17175    1 48044 2.081425e-05
## 17176    1 48044 2.081425e-05
## 17177    1 48044 2.081425e-05
## 17178    1 48044 2.081425e-05
## 17179    1 48044 2.081425e-05
## 17180    1 48044 2.081425e-05
## 17181    1 48044 2.081425e-05
## 17182    1 48044 2.081425e-05
## 17183    1 48044 2.081425e-05
## 17184    1 48044 2.081425e-05
## 17185    1 48044 2.081425e-05
## 17186    1 48044 2.081425e-05
## 17187    1 48044 2.081425e-05
## 17188    1 48044 2.081425e-05
## 17189    1 48044 2.081425e-05
## 17190    1 48044 2.081425e-05
## 17191    1 48044 2.081425e-05
## 17192    1 48044 2.081425e-05
## 17193    1 48044 2.081425e-05
## 17194    1 48044 2.081425e-05
## 17195    1 48044 2.081425e-05
## 17196    1 48044 2.081425e-05
## 17197    1 48044 2.081425e-05
## 17198    1 48044 2.081425e-05
## 17199    1 48044 2.081425e-05
## 17200    1 48044 2.081425e-05
## 17201    1 48044 2.081425e-05
## 17202    1 48044 2.081425e-05
## 17203    1 48044 2.081425e-05
## 17204    1 48044 2.081425e-05
## 17205    1 48044 2.081425e-05
## 17206    1 48044 2.081425e-05
## 17207    1 48044 2.081425e-05
## 17208    1 48044 2.081425e-05
## 17209    1 48044 2.081425e-05
## 17210    1 48044 2.081425e-05
## 17211    1 48044 2.081425e-05
## 17212    1 48044 2.081425e-05
## 17213    1 48044 2.081425e-05
## 17214    1 48044 2.081425e-05
## 17215    1 48044 2.081425e-05
## 17216    1 48044 2.081425e-05
## 17217    1 48044 2.081425e-05
## 17218    1 48044 2.081425e-05
## 17219    1 48044 2.081425e-05
## 17220    1 48044 2.081425e-05
## 17221    1 48044 2.081425e-05
## 17222    1 48044 2.081425e-05
## 17223    1 48044 2.081425e-05
## 17224    1 48044 2.081425e-05
## 17225    1 48044 2.081425e-05
## 17226    1 48044 2.081425e-05
## 17227    1 48044 2.081425e-05
## 17228    1 48044 2.081425e-05
## 17229    1 48044 2.081425e-05
## 17230    1 48044 2.081425e-05
## 17231    1 48044 2.081425e-05
## 17232    1 48044 2.081425e-05
## 17233    1 48044 2.081425e-05
## 17234    1 48044 2.081425e-05
## 17235    1 48044 2.081425e-05
## 17236    1 48044 2.081425e-05
## 17237    1 48044 2.081425e-05
## 17238    1 48044 2.081425e-05
## 17239    1 48044 2.081425e-05
## 17240    1 48044 2.081425e-05
## 17241    1 48044 2.081425e-05
## 17242    1 48044 2.081425e-05
## 17243    1 48044 2.081425e-05
## 17244    1 48044 2.081425e-05
## 17245    1 48044 2.081425e-05
## 17246    1 48044 2.081425e-05
## 17247    1 48044 2.081425e-05
## 17248    1 48044 2.081425e-05
## 17249    1 48044 2.081425e-05
## 17250    1 48044 2.081425e-05
## 17251    1 48044 2.081425e-05
## 17252    1 48044 2.081425e-05
## 17253    1 48044 2.081425e-05
## 17254    1 48044 2.081425e-05
## 17255    1 48044 2.081425e-05
## 17256    1 48044 2.081425e-05
## 17257    1 48044 2.081425e-05
## 17258    1 48044 2.081425e-05
## 17259    1 48044 2.081425e-05
## 17260    1 48044 2.081425e-05
## 17261    1 48044 2.081425e-05
## 17262    1 48044 2.081425e-05
## 17263    1 48044 2.081425e-05
## 17264    1 48044 2.081425e-05
## 17265    1 48044 2.081425e-05
## 17266    1 48044 2.081425e-05
## 17267    1 48044 2.081425e-05
## 17268    1 48044 2.081425e-05
## 17269    1 48044 2.081425e-05
## 17270    1 48044 2.081425e-05
## 17271    1 48044 2.081425e-05
## 17272    1 48044 2.081425e-05
## 17273    1 48044 2.081425e-05
## 17274    1 48044 2.081425e-05
## 17275    1 48044 2.081425e-05
## 17276    1 48044 2.081425e-05
## 17277    1 48044 2.081425e-05
## 17278    1 48044 2.081425e-05
## 17279    1 48044 2.081425e-05
## 17280    1 48044 2.081425e-05
## 17281    1 48044 2.081425e-05
## 17282    1 48044 2.081425e-05
## 17283    1 48044 2.081425e-05
## 17284    1 48044 2.081425e-05
## 17285    1 48044 2.081425e-05
## 17286    1 48044 2.081425e-05
## 17287    1 48044 2.081425e-05
## 17288    1 48044 2.081425e-05
## 17289    1 48044 2.081425e-05
## 17290    1 48044 2.081425e-05
## 17291    1 48044 2.081425e-05
## 17292    1 48044 2.081425e-05
## 17293    1 48044 2.081425e-05
## 17294    1 48044 2.081425e-05
## 17295    1 48044 2.081425e-05
## 17296    1 48044 2.081425e-05
## 17297    1 48044 2.081425e-05
## 17298    1 48044 2.081425e-05
## 17299    1 48044 2.081425e-05
## 17300    1 48044 2.081425e-05
## 17301    1 48044 2.081425e-05
## 17302    1 48044 2.081425e-05
## 17303    1 48044 2.081425e-05
## 17304    1 48044 2.081425e-05
## 17305    1 48044 2.081425e-05
## 17306    1 48044 2.081425e-05
## 17307    1 48044 2.081425e-05
## 17308    1 48044 2.081425e-05
## 17309    1 48044 2.081425e-05
## 17310    1 48044 2.081425e-05
## 17311    1 48044 2.081425e-05
## 17312    1 48044 2.081425e-05
## 17313    1 48044 2.081425e-05
## 17314    1 48044 2.081425e-05
## 17315    1 48044 2.081425e-05
## 17316    1 48044 2.081425e-05
## 17317    1 48044 2.081425e-05
## 17318    1 48044 2.081425e-05
## 17319    1 48044 2.081425e-05
## 17320    1 48044 2.081425e-05
## 17321    1 48044 2.081425e-05
## 17322    1 48044 2.081425e-05
## 17323    1 48044 2.081425e-05
## 17324    1 48044 2.081425e-05
## 17325    1 48044 2.081425e-05
## 17326    1 48044 2.081425e-05
## 17327    1 48044 2.081425e-05
## 17328    1 48044 2.081425e-05
## 17329    1 48044 2.081425e-05
## 17330    1 48044 2.081425e-05
## 17331    1 48044 2.081425e-05
## 17332    1 48044 2.081425e-05
## 17333    1 48044 2.081425e-05
## 17334    1 48044 2.081425e-05
## 17335    1 48044 2.081425e-05
## 17336    1 48044 2.081425e-05
## 17337    1 48044 2.081425e-05
## 17338    1 48044 2.081425e-05
## 17339    1 48044 2.081425e-05
## 17340    1 48044 2.081425e-05
## 17341    1 48044 2.081425e-05
## 17342    1 48044 2.081425e-05
## 17343    1 48044 2.081425e-05
## 17344    1 48044 2.081425e-05
## 17345    1 48044 2.081425e-05
## 17346    1 48044 2.081425e-05
## 17347    1 48044 2.081425e-05
## 17348    1 48044 2.081425e-05
## 17349    1 48044 2.081425e-05
## 17350    1 48044 2.081425e-05
## 17351    1 48044 2.081425e-05
## 17352    1 48044 2.081425e-05
## 17353    1 48044 2.081425e-05
## 17354    1 48044 2.081425e-05
## 17355    1 48044 2.081425e-05
## 17356    1 48044 2.081425e-05
## 17357    1 48044 2.081425e-05
## 17358    1 48044 2.081425e-05
## 17359    1 48044 2.081425e-05
## 17360    1 48044 2.081425e-05
## 17361    1 48044 2.081425e-05
## 17362    1 48044 2.081425e-05
## 17363    1 48044 2.081425e-05
## 17364    1 48044 2.081425e-05
## 17365    1 48044 2.081425e-05
## 17366    1 48044 2.081425e-05
## 17367    1 48044 2.081425e-05
## 17368    1 48044 2.081425e-05
## 17369    1 48044 2.081425e-05
## 17370    1 48044 2.081425e-05
## 17371    1 48044 2.081425e-05
## 17372    1 48044 2.081425e-05
## 17373    1 48044 2.081425e-05
## 17374    1 48044 2.081425e-05
## 17375    1 48044 2.081425e-05
## 17376    1 48044 2.081425e-05
## 17377    1 48044 2.081425e-05
## 17378    1 48044 2.081425e-05
## 17379    1 48044 2.081425e-05
## 17380    1 48044 2.081425e-05
## 17381    1 48044 2.081425e-05
## 17382    1 48044 2.081425e-05
## 17383    1 48044 2.081425e-05
## 17384    1 48044 2.081425e-05
## 17385    1 48044 2.081425e-05
## 17386    1 48044 2.081425e-05
## 17387    1 48044 2.081425e-05
## 17388    1 48044 2.081425e-05
## 17389    1 48044 2.081425e-05
## 17390    1 48044 2.081425e-05
## 17391    1 48044 2.081425e-05
## 17392    1 48044 2.081425e-05
## 17393    1 48044 2.081425e-05
## 17394    1 48044 2.081425e-05
## 17395    1 48044 2.081425e-05
## 17396    1 48044 2.081425e-05
## 17397    1 48044 2.081425e-05
## 17398    1 48044 2.081425e-05
## 17399    1 48044 2.081425e-05
## 17400    1 48044 2.081425e-05
## 17401    1 48044 2.081425e-05
## 17402    1 48044 2.081425e-05
## 17403    1 48044 2.081425e-05
## 17404    1 48044 2.081425e-05
## 17405    1 48044 2.081425e-05
## 17406    1 48044 2.081425e-05
## 17407    1 48044 2.081425e-05
## 17408    1 48044 2.081425e-05
## 17409    1 48044 2.081425e-05
## 17410    1 48044 2.081425e-05
## 17411    1 48044 2.081425e-05
## 17412    1 48044 2.081425e-05
## 17413    1 48044 2.081425e-05
## 17414    1 48044 2.081425e-05
## 17415    1 48044 2.081425e-05
## 17416    1 48044 2.081425e-05
## 17417    1 48044 2.081425e-05
## 17418    1 48044 2.081425e-05
## 17419    1 48044 2.081425e-05
## 17420    1 48044 2.081425e-05
## 17421    1 48044 2.081425e-05
## 17422    1 48044 2.081425e-05
## 17423    1 48044 2.081425e-05
## 17424    1 48044 2.081425e-05
## 17425    1 48044 2.081425e-05
## 17426    1 48044 2.081425e-05
## 17427    1 48044 2.081425e-05
## 17428    1 48044 2.081425e-05
## 17429    1 48044 2.081425e-05
## 17430    1 48044 2.081425e-05
## 17431    1 48044 2.081425e-05
## 17432    1 48044 2.081425e-05
## 17433    1 48044 2.081425e-05
## 17434    1 48044 2.081425e-05
## 17435    1 48044 2.081425e-05
## 17436    1 48044 2.081425e-05
## 17437    1 48044 2.081425e-05
## 17438    1 48044 2.081425e-05
## 17439    1 48044 2.081425e-05
## 17440    1 48044 2.081425e-05
## 17441    1 48044 2.081425e-05
## 17442    1 48044 2.081425e-05
## 17443    1 48044 2.081425e-05
## 17444    1 48044 2.081425e-05
## 17445    1 48044 2.081425e-05
## 17446    1 48044 2.081425e-05
## 17447    1 48044 2.081425e-05
## 17448    1 48044 2.081425e-05
## 17449    1 48044 2.081425e-05
## 17450    1 48044 2.081425e-05
## 17451    1 48044 2.081425e-05
## 17452    1 48044 2.081425e-05
## 17453    1 48044 2.081425e-05
## 17454    1 48044 2.081425e-05
## 17455    1 48044 2.081425e-05
## 17456    1 48044 2.081425e-05
## 17457    1 48044 2.081425e-05
## 17458    1 48044 2.081425e-05
## 17459    1 48044 2.081425e-05
## 17460    1 48044 2.081425e-05
## 17461    1 48044 2.081425e-05
## 17462    1 48044 2.081425e-05
## 17463    1 48044 2.081425e-05
## 17464    1 48044 2.081425e-05
## 17465    1 48044 2.081425e-05
## 17466    1 48044 2.081425e-05
## 17467    1 48044 2.081425e-05
## 17468    1 48044 2.081425e-05
## 17469    1 48044 2.081425e-05
## 17470    1 48044 2.081425e-05
## 17471    1 48044 2.081425e-05
## 17472    1 48044 2.081425e-05
## 17473    1 48044 2.081425e-05
## 17474    1 48044 2.081425e-05
## 17475    1 48044 2.081425e-05
## 17476    1 48044 2.081425e-05
## 17477    1 48044 2.081425e-05
## 17478    1 48044 2.081425e-05
## 17479    1 48044 2.081425e-05
## 17480    1 48044 2.081425e-05
## 17481    1 48044 2.081425e-05
## 17482    1 48044 2.081425e-05
## 17483    1 48044 2.081425e-05
## 17484    1 48044 2.081425e-05
## 17485    1 48044 2.081425e-05
## 17486    1 48044 2.081425e-05
## 17487    1 48044 2.081425e-05
## 17488    1 48044 2.081425e-05
## 17489    1 48044 2.081425e-05
## 17490    1 48044 2.081425e-05
## 17491    1 48044 2.081425e-05
## 17492    1 48044 2.081425e-05
## 17493    1 48044 2.081425e-05
## 17494    1 48044 2.081425e-05
## 17495    1 48044 2.081425e-05
## 17496    1 48044 2.081425e-05
## 17497    1 48044 2.081425e-05
## 17498    1 48044 2.081425e-05
## 17499    1 48044 2.081425e-05
## 17500    1 48044 2.081425e-05
## 17501    1 48044 2.081425e-05
## 17502    1 48044 2.081425e-05
## 17503    1 48044 2.081425e-05
## 17504    1 48044 2.081425e-05
## 17505    1 48044 2.081425e-05
## 17506    1 48044 2.081425e-05
## 17507    1 48044 2.081425e-05
## 17508    1 48044 2.081425e-05
## 17509    1 48044 2.081425e-05
## 17510    1 48044 2.081425e-05
## 17511    1 48044 2.081425e-05
## 17512    1 48044 2.081425e-05
## 17513    1 48044 2.081425e-05
## 17514    1 48044 2.081425e-05
## 17515    1 48044 2.081425e-05
## 17516    1 48044 2.081425e-05
## 17517    1 48044 2.081425e-05
## 17518    1 48044 2.081425e-05
## 17519    1 48044 2.081425e-05
## 17520    1 48044 2.081425e-05
## 17521    1 48044 2.081425e-05
## 17522    1 48044 2.081425e-05
## 17523    1 48044 2.081425e-05
## 17524    1 48044 2.081425e-05
## 17525    1 48044 2.081425e-05
## 17526    1 48044 2.081425e-05
## 17527    1 48044 2.081425e-05
## 17528    1 48044 2.081425e-05
## 17529    1 48044 2.081425e-05
## 17530    1 48044 2.081425e-05
## 17531    1 48044 2.081425e-05
## 17532    1 48044 2.081425e-05
## 17533    1 48044 2.081425e-05
## 17534    1 48044 2.081425e-05
## 17535    1 48044 2.081425e-05
## 17536    1 48044 2.081425e-05
## 17537    1 48044 2.081425e-05
## 17538    1 48044 2.081425e-05
## 17539    1 48044 2.081425e-05
## 17540    1 48044 2.081425e-05
## 17541    1 48044 2.081425e-05
## 17542    1 48044 2.081425e-05
## 17543    1 48044 2.081425e-05
## 17544    1 48044 2.081425e-05
## 17545    1 48044 2.081425e-05
## 17546    1 48044 2.081425e-05
## 17547    1 48044 2.081425e-05
## 17548    1 48044 2.081425e-05
## 17549    1 48044 2.081425e-05
## 17550    1 48044 2.081425e-05
## 17551    1 48044 2.081425e-05
## 17552    1 48044 2.081425e-05
## 17553    1 48044 2.081425e-05
## 17554    1 48044 2.081425e-05
## 17555    1 48044 2.081425e-05
## 17556    1 48044 2.081425e-05
## 17557    1 48044 2.081425e-05
## 17558    1 48044 2.081425e-05
## 17559    1 48044 2.081425e-05
## 17560    1 48044 2.081425e-05
## 17561    1 48044 2.081425e-05
## 17562    1 48044 2.081425e-05
## 17563    1 48044 2.081425e-05
## 17564    1 48044 2.081425e-05
## 17565    1 48044 2.081425e-05
## 17566    1 48044 2.081425e-05
## 17567    1 48044 2.081425e-05
## 17568    1 48044 2.081425e-05
## 17569    1 48044 2.081425e-05
## 17570    1 48044 2.081425e-05
## 17571    1 48044 2.081425e-05
## 17572    1 48044 2.081425e-05
## 17573    1 48044 2.081425e-05
## 17574    1 48044 2.081425e-05
## 17575    1 48044 2.081425e-05
## 17576    1 48044 2.081425e-05
## 17577    1 48044 2.081425e-05
## 17578    1 48044 2.081425e-05
## 17579    1 48044 2.081425e-05
## 17580    1 48044 2.081425e-05
## 17581    1 48044 2.081425e-05
## 17582    1 48044 2.081425e-05
## 17583    1 48044 2.081425e-05
## 17584    1 48044 2.081425e-05
## 17585    1 48044 2.081425e-05
## 17586    1 48044 2.081425e-05
## 17587    1 48044 2.081425e-05
## 17588    1 48044 2.081425e-05
## 17589    1 48044 2.081425e-05
## 17590    1 48044 2.081425e-05
## 17591    1 48044 2.081425e-05
## 17592    1 48044 2.081425e-05
## 17593    1 48044 2.081425e-05
## 17594    1 48044 2.081425e-05
## 17595    1 48044 2.081425e-05
## 17596    1 48044 2.081425e-05
## 17597    1 48044 2.081425e-05
## 17598    1 48044 2.081425e-05
## 17599    1 48044 2.081425e-05
## 17600    1 48044 2.081425e-05
## 17601    1 48044 2.081425e-05
## 17602    1 48044 2.081425e-05
## 17603    1 48044 2.081425e-05
## 17604    1 48044 2.081425e-05
## 17605    1 48044 2.081425e-05
## 17606    1 48044 2.081425e-05
## 17607    1 48044 2.081425e-05
## 17608    1 48044 2.081425e-05
## 17609    1 48044 2.081425e-05
## 17610    1 48044 2.081425e-05
## 17611    1 48044 2.081425e-05
## 17612    1 48044 2.081425e-05
## 17613    1 48044 2.081425e-05
## 17614    1 48044 2.081425e-05
## 17615    1 48044 2.081425e-05
## 17616    1 48044 2.081425e-05
## 17617    1 48044 2.081425e-05
## 17618    1 48044 2.081425e-05
## 17619    1 48044 2.081425e-05
## 17620    1 48044 2.081425e-05
## 17621    1 48044 2.081425e-05
## 17622    1 48044 2.081425e-05
## 17623    1 48044 2.081425e-05
## 17624    1 48044 2.081425e-05
## 17625    1 48044 2.081425e-05
## 17626    1 48044 2.081425e-05
## 17627    1 48044 2.081425e-05
## 17628    1 48044 2.081425e-05
## 17629    1 48044 2.081425e-05
## 17630    1 48044 2.081425e-05
## 17631    1 48044 2.081425e-05
## 17632    1 48044 2.081425e-05
## 17633    1 48044 2.081425e-05
## 17634    1 48044 2.081425e-05
## 17635    1 48044 2.081425e-05
## 17636    1 48044 2.081425e-05
## 17637    1 48044 2.081425e-05
## 17638    1 48044 2.081425e-05
## 17639    1 48044 2.081425e-05
## 17640    1 48044 2.081425e-05
## 17641    1 48044 2.081425e-05
## 17642    1 48044 2.081425e-05
## 17643    1 48044 2.081425e-05
## 17644    1 48044 2.081425e-05
## 17645    1 48044 2.081425e-05
## 17646    1 48044 2.081425e-05
## 17647    1 48044 2.081425e-05
## 17648    1 48044 2.081425e-05
## 17649    1 48044 2.081425e-05
## 17650    1 48044 2.081425e-05
## 17651    1 48044 2.081425e-05
## 17652    1 48044 2.081425e-05
## 17653    1 48044 2.081425e-05
## 17654    1 48044 2.081425e-05
## 17655    1 48044 2.081425e-05
## 17656    1 48044 2.081425e-05
## 17657    1 48044 2.081425e-05
## 17658    1 48044 2.081425e-05
## 17659    1 48044 2.081425e-05
## 17660    1 48044 2.081425e-05
## 17661    1 48044 2.081425e-05
## 17662    1 48044 2.081425e-05
## 17663    1 48044 2.081425e-05
## 17664    1 48044 2.081425e-05
## 17665    1 48044 2.081425e-05
## 17666    1 48044 2.081425e-05
## 17667    1 48044 2.081425e-05
## 17668    1 48044 2.081425e-05
## 17669    1 48044 2.081425e-05
## 17670    1 48044 2.081425e-05
## 17671    1 48044 2.081425e-05
## 17672    1 48044 2.081425e-05
## 17673    1 48044 2.081425e-05
## 17674    1 48044 2.081425e-05
## 17675    1 48044 2.081425e-05
## 17676    1 48044 2.081425e-05
## 17677    1 48044 2.081425e-05
## 17678    1 48044 2.081425e-05
## 17679    1 48044 2.081425e-05
## 17680    1 48044 2.081425e-05
## 17681    1 48044 2.081425e-05
## 17682    1 48044 2.081425e-05
## 17683    1 48044 2.081425e-05
## 17684    1 48044 2.081425e-05
## 17685    1 48044 2.081425e-05
## 17686    1 48044 2.081425e-05
## 17687    1 48044 2.081425e-05
## 17688    1 48044 2.081425e-05
## 17689    1 48044 2.081425e-05
## 17690    1 48044 2.081425e-05
## 17691    1 48044 2.081425e-05
## 17692    1 48044 2.081425e-05
## 17693    1 48044 2.081425e-05
## 17694    1 48044 2.081425e-05
## 17695    1 48044 2.081425e-05
## 17696    1 48044 2.081425e-05
## 17697    1 48044 2.081425e-05
## 17698    1 48044 2.081425e-05
## 17699    1 48044 2.081425e-05
## 17700    1 48044 2.081425e-05
## 17701    1 48044 2.081425e-05
## 17702    1 48044 2.081425e-05
## 17703    1 48044 2.081425e-05
## 17704    1 48044 2.081425e-05
## 17705    1 48044 2.081425e-05
## 17706    1 48044 2.081425e-05
## 17707    1 48044 2.081425e-05
## 17708    1 48044 2.081425e-05
## 17709    1 48044 2.081425e-05
## 17710    1 48044 2.081425e-05
## 17711    1 48044 2.081425e-05
## 17712    1 48044 2.081425e-05
## 17713    1 48044 2.081425e-05
## 17714    1 48044 2.081425e-05
## 17715    1 48044 2.081425e-05
## 17716    1 48044 2.081425e-05
## 17717    1 48044 2.081425e-05
## 17718    1 48044 2.081425e-05
## 17719    1 48044 2.081425e-05
## 17720    1 48044 2.081425e-05
## 17721    1 48044 2.081425e-05
## 17722    1 48044 2.081425e-05
## 17723    1 48044 2.081425e-05
## 17724    1 48044 2.081425e-05
## 17725    1 48044 2.081425e-05
## 17726    1 48044 2.081425e-05
## 17727    1 48044 2.081425e-05
## 17728    1 48044 2.081425e-05
## 17729    1 48044 2.081425e-05
## 17730    1 48044 2.081425e-05
## 17731    1 48044 2.081425e-05
## 17732    1 48044 2.081425e-05
## 17733    1 48044 2.081425e-05
## 17734    1 48044 2.081425e-05
## 17735    1 48044 2.081425e-05
## 17736    1 48044 2.081425e-05
## 17737    1 48044 2.081425e-05
## 17738    1 48044 2.081425e-05
## 17739    1 48044 2.081425e-05
## 17740    1 48044 2.081425e-05
## 17741    1 48044 2.081425e-05
## 17742    1 48044 2.081425e-05
## 17743    1 48044 2.081425e-05
## 17744    1 48044 2.081425e-05
## 17745    1 48044 2.081425e-05
## 17746    1 48044 2.081425e-05
## 17747    1 48044 2.081425e-05
## 17748    1 48044 2.081425e-05
## 17749    1 48044 2.081425e-05
## 17750    1 48044 2.081425e-05
## 17751    1 48044 2.081425e-05
## 17752    1 48044 2.081425e-05
## 17753    1 48044 2.081425e-05
## 17754    1 48044 2.081425e-05
## 17755    1 48044 2.081425e-05
## 17756    1 48044 2.081425e-05
## 17757    1 48044 2.081425e-05
## 17758    1 48044 2.081425e-05
## 17759    1 48044 2.081425e-05
## 17760    1 48044 2.081425e-05
## 17761    1 48044 2.081425e-05
## 17762    1 48044 2.081425e-05
## 17763    1 48044 2.081425e-05
## 17764    1 48044 2.081425e-05
## 17765    1 48044 2.081425e-05
## 17766    1 48044 2.081425e-05
## 17767    1 48044 2.081425e-05
## 17768    1 48044 2.081425e-05
## 17769    1 48044 2.081425e-05
## 17770    1 48044 2.081425e-05
## 17771    1 48044 2.081425e-05
## 17772    1 48044 2.081425e-05
## 17773    1 48044 2.081425e-05
## 17774    1 48044 2.081425e-05
## 17775    1 48044 2.081425e-05
## 17776    1 48044 2.081425e-05
## 17777    1 48044 2.081425e-05
## 17778    1 48044 2.081425e-05
## 17779    1 48044 2.081425e-05
## 17780    1 48044 2.081425e-05
## 17781    1 48044 2.081425e-05
## 17782    1 48044 2.081425e-05
## 17783    1 48044 2.081425e-05
## 17784    1 48044 2.081425e-05
## 17785    1 48044 2.081425e-05
## 17786    1 48044 2.081425e-05
## 17787    1 48044 2.081425e-05
## 17788    1 48044 2.081425e-05
## 17789    1 48044 2.081425e-05
## 17790    1 48044 2.081425e-05
## 17791    1 48044 2.081425e-05
## 17792    1 48044 2.081425e-05
## 17793    1 48044 2.081425e-05
## 17794    1 48044 2.081425e-05
## 17795    1 48044 2.081425e-05
## 17796    1 48044 2.081425e-05
## 17797    1 48044 2.081425e-05
## 17798    1 48044 2.081425e-05
## 17799    1 48044 2.081425e-05
## 17800    1 48044 2.081425e-05
## 17801    1 48044 2.081425e-05
## 17802    1 48044 2.081425e-05
## 17803    1 48044 2.081425e-05
## 17804    1 48044 2.081425e-05
## 17805    1 48044 2.081425e-05
## 17806    1 48044 2.081425e-05
## 17807    1 48044 2.081425e-05
## 17808    1 48044 2.081425e-05
## 17809    1 48044 2.081425e-05
## 17810    1 48044 2.081425e-05
## 17811    1 48044 2.081425e-05
## 17812    1 48044 2.081425e-05
## 17813    1 48044 2.081425e-05
## 17814    1 48044 2.081425e-05
## 17815    1 48044 2.081425e-05
## 17816    1 48044 2.081425e-05
## 17817    1 48044 2.081425e-05
## 17818    1 48044 2.081425e-05
## 17819    1 48044 2.081425e-05
## 17820    1 48044 2.081425e-05
## 17821    1 48044 2.081425e-05
## 17822    1 48044 2.081425e-05
## 17823    1 48044 2.081425e-05
## 17824    1 48044 2.081425e-05
## 17825    1 48044 2.081425e-05
## 17826    1 48044 2.081425e-05
## 17827    1 48044 2.081425e-05
## 17828    1 48044 2.081425e-05
## 17829    1 48044 2.081425e-05
## 17830    1 48044 2.081425e-05
## 17831    1 48044 2.081425e-05
## 17832    1 48044 2.081425e-05
## 17833    1 48044 2.081425e-05
## 17834    1 48044 2.081425e-05
## 17835    1 48044 2.081425e-05
## 17836    1 48044 2.081425e-05
## 17837    1 48044 2.081425e-05
## 17838    1 48044 2.081425e-05
## 17839    1 48044 2.081425e-05
## 17840    1 48044 2.081425e-05
## 17841    1 48044 2.081425e-05
## 17842    1 48044 2.081425e-05
## 17843    1 48044 2.081425e-05
## 17844    1 48044 2.081425e-05
## 17845    1 48044 2.081425e-05
## 17846    1 48044 2.081425e-05
## 17847    1 48044 2.081425e-05
## 17848    1 48044 2.081425e-05
## 17849    1 48044 2.081425e-05
## 17850    1 48044 2.081425e-05
## 17851    1 48044 2.081425e-05
## 17852    1 48044 2.081425e-05
## 17853    1 48044 2.081425e-05
## 17854    1 48044 2.081425e-05
## 17855    1 48044 2.081425e-05
## 17856    1 48044 2.081425e-05
## 17857    1 48044 2.081425e-05
## 17858    1 48044 2.081425e-05
## 17859    1 48044 2.081425e-05
## 17860    1 48044 2.081425e-05
## 17861    1 48044 2.081425e-05
## 17862    1 48044 2.081425e-05
## 17863    1 48044 2.081425e-05
## 17864    1 48044 2.081425e-05
## 17865    1 48044 2.081425e-05
## 17866    1 48044 2.081425e-05
## 17867    1 48044 2.081425e-05
## 17868    1 48044 2.081425e-05
## 17869    1 48044 2.081425e-05
## 17870    1 48044 2.081425e-05
## 17871    1 48044 2.081425e-05
## 17872    1 48044 2.081425e-05
## 17873    1 48044 2.081425e-05
## 17874    1 48044 2.081425e-05
## 17875    1 48044 2.081425e-05
## 17876    1 48044 2.081425e-05
## 17877    1 48044 2.081425e-05
## 17878    1 48044 2.081425e-05
## 17879    1 48044 2.081425e-05
## 17880    1 48044 2.081425e-05
## 17881    1 48044 2.081425e-05
## 17882    1 48044 2.081425e-05
## 17883    1 48044 2.081425e-05
## 17884    1 48044 2.081425e-05
## 17885    1 48044 2.081425e-05
## 17886    1 48044 2.081425e-05
## 17887    1 48044 2.081425e-05
## 17888    1 48044 2.081425e-05
## 17889    1 48044 2.081425e-05
## 17890    1 48044 2.081425e-05
## 17891    1 48044 2.081425e-05
## 17892    1 48044 2.081425e-05
## 17893    1 48044 2.081425e-05
## 17894    1 48044 2.081425e-05
## 17895    1 48044 2.081425e-05
## 17896    1 48044 2.081425e-05
## 17897    1 48044 2.081425e-05
## 17898    1 48044 2.081425e-05
## 17899    1 48044 2.081425e-05
## 17900    1 48044 2.081425e-05
## 17901    1 48044 2.081425e-05
## 17902    1 48044 2.081425e-05
## 17903    1 48044 2.081425e-05
## 17904    1 48044 2.081425e-05
## 17905    1 48044 2.081425e-05
## 17906    1 48044 2.081425e-05
## 17907    1 48044 2.081425e-05
## 17908    1 48044 2.081425e-05
## 17909    1 48044 2.081425e-05
## 17910    1 48044 2.081425e-05
## 17911    1 48044 2.081425e-05
## 17912    1 48044 2.081425e-05
## 17913    1 48044 2.081425e-05
## 17914    1 48044 2.081425e-05
## 17915    1 48044 2.081425e-05
## 17916    1 48044 2.081425e-05
## 17917    1 48044 2.081425e-05
## 17918    1 48044 2.081425e-05
## 17919    1 48044 2.081425e-05
## 17920    1 48044 2.081425e-05
## 17921    1 48044 2.081425e-05
## 17922    1 48044 2.081425e-05
## 17923    1 48044 2.081425e-05
## 17924    1 48044 2.081425e-05
## 17925    1 48044 2.081425e-05
## 17926    1 48044 2.081425e-05
## 17927    1 48044 2.081425e-05
## 17928    1 48044 2.081425e-05
## 17929    1 48044 2.081425e-05
## 17930    1 48044 2.081425e-05
## 17931    1 48044 2.081425e-05
## 17932    1 48044 2.081425e-05
## 17933    1 48044 2.081425e-05
## 17934    1 48044 2.081425e-05
## 17935    1 48044 2.081425e-05
## 17936    1 48044 2.081425e-05
## 17937    1 48044 2.081425e-05
## 17938    1 48044 2.081425e-05
## 17939    1 48044 2.081425e-05
## 17940    1 48044 2.081425e-05
## 17941    1 48044 2.081425e-05
## 17942    1 48044 2.081425e-05
## 17943    1 48044 2.081425e-05
## 17944    1 48044 2.081425e-05
## 17945    1 48044 2.081425e-05
## 17946    1 48044 2.081425e-05
## 17947    1 48044 2.081425e-05
## 17948    1 48044 2.081425e-05
## 17949    1 48044 2.081425e-05
## 17950    1 48044 2.081425e-05
## 17951    1 48044 2.081425e-05
## 17952    1 48044 2.081425e-05
## 17953    1 48044 2.081425e-05
## 17954    1 48044 2.081425e-05
## 17955    1 48044 2.081425e-05
## 17956    1 48044 2.081425e-05
## 17957    1 48044 2.081425e-05
## 17958    1 48044 2.081425e-05
## 17959    1 48044 2.081425e-05
## 17960    1 48044 2.081425e-05
## 17961    1 48044 2.081425e-05
## 17962    1 48044 2.081425e-05
## 17963    1 48044 2.081425e-05
## 17964    1 48044 2.081425e-05
## 17965    1 48044 2.081425e-05
## 17966    1 48044 2.081425e-05
## 17967    1 48044 2.081425e-05
## 17968    1 48044 2.081425e-05
## 17969    1 48044 2.081425e-05
## 17970    1 48044 2.081425e-05
## 17971    1 48044 2.081425e-05
## 17972    1 48044 2.081425e-05
## 17973    1 48044 2.081425e-05
## 17974    1 48044 2.081425e-05
## 17975    1 48044 2.081425e-05
## 17976    1 48044 2.081425e-05
## 17977    1 48044 2.081425e-05
## 17978    1 48044 2.081425e-05
## 17979    1 48044 2.081425e-05
## 17980    1 48044 2.081425e-05
## 17981    1 48044 2.081425e-05
## 17982    1 48044 2.081425e-05
## 17983    1 48044 2.081425e-05
## 17984    1 48044 2.081425e-05
## 17985    1 48044 2.081425e-05
## 17986    1 48044 2.081425e-05
## 17987    1 48044 2.081425e-05
## 17988    1 48044 2.081425e-05
## 17989    1 48044 2.081425e-05
## 17990    1 48044 2.081425e-05
## 17991    1 48044 2.081425e-05
## 17992    1 48044 2.081425e-05
## 17993    1 48044 2.081425e-05
## 17994    1 48044 2.081425e-05
## 17995    1 48044 2.081425e-05
## 17996    1 48044 2.081425e-05
## 17997    1 48044 2.081425e-05
## 17998    1 48044 2.081425e-05
## 17999    1 48044 2.081425e-05
## 18000    1 48044 2.081425e-05
## 18001    1 48044 2.081425e-05
## 18002    1 48044 2.081425e-05
## 18003    1 48044 2.081425e-05
## 18004    1 48044 2.081425e-05
## 18005    1 48044 2.081425e-05
## 18006    1 48044 2.081425e-05
## 18007    1 48044 2.081425e-05
## 18008    1 48044 2.081425e-05
## 18009    1 48044 2.081425e-05
## 18010    1 48044 2.081425e-05
## 18011    1 48044 2.081425e-05
## 18012    1 48044 2.081425e-05
## 18013    1 48044 2.081425e-05
## 18014    1 48044 2.081425e-05
## 18015    1 48044 2.081425e-05
## 18016    1 48044 2.081425e-05
## 18017    1 48044 2.081425e-05
## 18018    1 48044 2.081425e-05
## 18019    1 48044 2.081425e-05
## 18020    1 48044 2.081425e-05
## 18021    1 48044 2.081425e-05
## 18022    1 48044 2.081425e-05
## 18023    1 48044 2.081425e-05
## 18024    1 48044 2.081425e-05
## 18025    1 48044 2.081425e-05
## 18026    1 48044 2.081425e-05
## 18027    1 48044 2.081425e-05
## 18028    1 48044 2.081425e-05
## 18029    1 48044 2.081425e-05
## 18030    1 48044 2.081425e-05
## 18031    1 48044 2.081425e-05
## 18032    1 48044 2.081425e-05
## 18033    1 48044 2.081425e-05
## 18034    1 48044 2.081425e-05
## 18035    1 48044 2.081425e-05
## 18036    1 48044 2.081425e-05
## 18037    1 48044 2.081425e-05
## 18038    1 48044 2.081425e-05
## 18039    1 48044 2.081425e-05
## 18040    1 48044 2.081425e-05
## 18041    1 48044 2.081425e-05
## 18042    1 48044 2.081425e-05
## 18043    1 48044 2.081425e-05
## 18044    1 48044 2.081425e-05
## 18045    1 48044 2.081425e-05
## 18046    1 48044 2.081425e-05
## 18047    1 48044 2.081425e-05
## 18048    1 48044 2.081425e-05
## 18049    1 48044 2.081425e-05
## 18050    1 48044 2.081425e-05
## 18051    1 48044 2.081425e-05
## 18052    1 48044 2.081425e-05
## 18053    1 48044 2.081425e-05
## 18054    1 48044 2.081425e-05
## 18055    1 48044 2.081425e-05
## 18056    1 48044 2.081425e-05
## 18057    1 48044 2.081425e-05
## 18058    1 48044 2.081425e-05
## 18059    1 48044 2.081425e-05
## 18060    1 48044 2.081425e-05
## 18061    1 48044 2.081425e-05
## 18062    1 48044 2.081425e-05
## 18063    1 48044 2.081425e-05
## 18064    1 48044 2.081425e-05
## 18065    1 48044 2.081425e-05
## 18066    1 48044 2.081425e-05
## 18067    1 48044 2.081425e-05
## 18068    1 48044 2.081425e-05
## 18069    1 48044 2.081425e-05
## 18070    1 48044 2.081425e-05
## 18071    1 48044 2.081425e-05
## 18072    1 48044 2.081425e-05
## 18073    1 48044 2.081425e-05
## 18074    1 48044 2.081425e-05
## 18075    1 48044 2.081425e-05
## 18076    1 48044 2.081425e-05
## 18077    1 48044 2.081425e-05
## 18078    1 48044 2.081425e-05
## 18079    1 48044 2.081425e-05
## 18080    1 48044 2.081425e-05
## 18081    1 48044 2.081425e-05
## 18082    1 48044 2.081425e-05
## 18083    1 48044 2.081425e-05
## 18084    1 48044 2.081425e-05
## 18085    1 48044 2.081425e-05
## 18086    1 48044 2.081425e-05
## 18087    1 48044 2.081425e-05
## 18088    1 48044 2.081425e-05
## 18089    1 48044 2.081425e-05
## 18090    1 48044 2.081425e-05
## 18091    1 48044 2.081425e-05
## 18092    1 48044 2.081425e-05
## 18093    1 48044 2.081425e-05
## 18094    1 48044 2.081425e-05
## 18095    1 48044 2.081425e-05
## 18096    1 48044 2.081425e-05
## 18097    1 48044 2.081425e-05
## 18098    1 48044 2.081425e-05
## 18099    1 48044 2.081425e-05
## 18100    1 48044 2.081425e-05
## 18101    1 48044 2.081425e-05
## 18102    1 48044 2.081425e-05
## 18103    1 48044 2.081425e-05
## 18104    1 48044 2.081425e-05
## 18105    1 48044 2.081425e-05
## 18106    1 48044 2.081425e-05
## 18107    1 48044 2.081425e-05
## 18108    1 48044 2.081425e-05
## 18109    1 48044 2.081425e-05
## 18110    1 48044 2.081425e-05
## 18111    1 48044 2.081425e-05
## 18112    1 48044 2.081425e-05
## 18113    1 48044 2.081425e-05
## 18114    1 48044 2.081425e-05
## 18115    1 48044 2.081425e-05
## 18116    1 48044 2.081425e-05
## 18117    1 48044 2.081425e-05
## 18118    1 48044 2.081425e-05
## 18119    1 48044 2.081425e-05
## 18120    1 48044 2.081425e-05
## 18121    1 48044 2.081425e-05
## 18122    1 48044 2.081425e-05
## 18123    1 48044 2.081425e-05
## 18124    1 48044 2.081425e-05
## 18125    1 48044 2.081425e-05
## 18126    1 48044 2.081425e-05
## 18127    1 48044 2.081425e-05
## 18128    1 48044 2.081425e-05
## 18129    1 48044 2.081425e-05
## 18130    1 48044 2.081425e-05
## 18131    1 48044 2.081425e-05
## 18132    1 48044 2.081425e-05
## 18133    1 48044 2.081425e-05
## 18134    1 48044 2.081425e-05
## 18135    1 48044 2.081425e-05
## 18136    1 48044 2.081425e-05
## 18137    1 48044 2.081425e-05
## 18138    1 48044 2.081425e-05
## 18139    1 48044 2.081425e-05
## 18140    1 48044 2.081425e-05
## 18141    1 48044 2.081425e-05
## 18142    1 48044 2.081425e-05
## 18143    1 48044 2.081425e-05
## 18144    1 48044 2.081425e-05
## 18145    1 48044 2.081425e-05
## 18146    1 48044 2.081425e-05
## 18147    1 48044 2.081425e-05
## 18148    1 48044 2.081425e-05
## 18149    1 48044 2.081425e-05
## 18150    1 48044 2.081425e-05
## 18151    1 48044 2.081425e-05
## 18152    1 48044 2.081425e-05
## 18153    1 48044 2.081425e-05
## 18154    1 48044 2.081425e-05
## 18155    1 48044 2.081425e-05
## 18156    1 48044 2.081425e-05
## 18157    1 48044 2.081425e-05
## 18158    1 48044 2.081425e-05
## 18159    1 48044 2.081425e-05
## 18160    1 48044 2.081425e-05
## 18161    1 48044 2.081425e-05
## 18162    1 48044 2.081425e-05
## 18163    1 48044 2.081425e-05
## 18164    1 48044 2.081425e-05
## 18165    1 48044 2.081425e-05
## 18166    1 48044 2.081425e-05
## 18167    1 48044 2.081425e-05
## 18168    1 48044 2.081425e-05
## 18169    1 48044 2.081425e-05
## 18170    1 48044 2.081425e-05
## 18171    1 48044 2.081425e-05
## 18172    1 48044 2.081425e-05
## 18173    1 48044 2.081425e-05
## 18174    1 48044 2.081425e-05
## 18175    1 48044 2.081425e-05
## 18176    1 48044 2.081425e-05
## 18177    1 48044 2.081425e-05
## 18178    1 48044 2.081425e-05
## 18179    1 48044 2.081425e-05
## 18180    1 48044 2.081425e-05
## 18181    1 48044 2.081425e-05
## 18182    1 48044 2.081425e-05
## 18183    1 48044 2.081425e-05
## 18184    1 48044 2.081425e-05
## 18185    1 48044 2.081425e-05
## 18186    1 48044 2.081425e-05
## 18187    1 48044 2.081425e-05
## 18188    1 48044 2.081425e-05
## 18189    1 48044 2.081425e-05
## 18190    1 48044 2.081425e-05
## 18191    1 48044 2.081425e-05
## 18192    1 48044 2.081425e-05
## 18193    1 48044 2.081425e-05
## 18194    1 48044 2.081425e-05
## 18195    1 48044 2.081425e-05
## 18196    1 48044 2.081425e-05
## 18197    1 48044 2.081425e-05
## 18198    1 48044 2.081425e-05
## 18199    1 48044 2.081425e-05
## 18200    1 48044 2.081425e-05
## 18201    1 48044 2.081425e-05
## 18202    1 48044 2.081425e-05
## 18203    1 48044 2.081425e-05
## 18204    1 48044 2.081425e-05
## 18205    1 48044 2.081425e-05
## 18206    1 48044 2.081425e-05
## 18207    1 48044 2.081425e-05
## 18208    1 48044 2.081425e-05
## 18209    1 48044 2.081425e-05
## 18210    1 48044 2.081425e-05
## 18211    1 48044 2.081425e-05
## 18212    1 48044 2.081425e-05
## 18213    1 48044 2.081425e-05
## 18214    1 48044 2.081425e-05
## 18215    1 48044 2.081425e-05
## 18216    1 48044 2.081425e-05
## 18217    1 48044 2.081425e-05
## 18218    1 48044 2.081425e-05
## 18219    1 48044 2.081425e-05
## 18220    1 48044 2.081425e-05
## 18221    1 48044 2.081425e-05
## 18222    1 48044 2.081425e-05
## 18223    1 48044 2.081425e-05
## 18224    1 48044 2.081425e-05
## 18225    1 48044 2.081425e-05
## 18226    1 48044 2.081425e-05
## 18227    1 48044 2.081425e-05
## 18228    1 48044 2.081425e-05
## 18229    1 48044 2.081425e-05
## 18230    1 48044 2.081425e-05
## 18231    1 48044 2.081425e-05
## 18232    1 48044 2.081425e-05
## 18233    1 48044 2.081425e-05
## 18234    1 48044 2.081425e-05
## 18235    1 48044 2.081425e-05
## 18236    1 48044 2.081425e-05
## 18237    1 48044 2.081425e-05
## 18238    1 48044 2.081425e-05
## 18239    1 48044 2.081425e-05
## 18240    1 48044 2.081425e-05
## 18241    1 48044 2.081425e-05
## 18242    1 48044 2.081425e-05
## 18243    1 48044 2.081425e-05
## 18244    1 48044 2.081425e-05
## 18245    1 48044 2.081425e-05
## 18246    1 48044 2.081425e-05
## 18247    1 48044 2.081425e-05
## 18248    1 48044 2.081425e-05
## 18249    1 48044 2.081425e-05
## 18250    1 48044 2.081425e-05
## 18251    1 48044 2.081425e-05
## 18252    1 48044 2.081425e-05
## 18253    1 48044 2.081425e-05
## 18254    1 48044 2.081425e-05
## 18255    1 48044 2.081425e-05
## 18256    1 48044 2.081425e-05
## 18257    1 48044 2.081425e-05
## 18258    1 48044 2.081425e-05
## 18259    1 48044 2.081425e-05
## 18260    1 48044 2.081425e-05
## 18261    1 48044 2.081425e-05
## 18262    1 48044 2.081425e-05
## 18263    1 48044 2.081425e-05
## 18264    1 48044 2.081425e-05
## 18265    1 48044 2.081425e-05
## 18266    1 48044 2.081425e-05
## 18267    1 48044 2.081425e-05
## 18268    1 48044 2.081425e-05
## 18269    1 48044 2.081425e-05
## 18270    1 48044 2.081425e-05
## 18271    1 48044 2.081425e-05
## 18272    1 48044 2.081425e-05
## 18273    1 48044 2.081425e-05
## 18274    1 48044 2.081425e-05
## 18275    1 48044 2.081425e-05
## 18276    1 48044 2.081425e-05
## 18277    1 48044 2.081425e-05
## 18278    1 48044 2.081425e-05
## 18279    1 48044 2.081425e-05
## 18280    1 48044 2.081425e-05
## 18281    1 48044 2.081425e-05
## 18282    1 48044 2.081425e-05
## 18283    1 48044 2.081425e-05
## 18284    1 48044 2.081425e-05
## 18285    1 48044 2.081425e-05
## 18286    1 48044 2.081425e-05
## 18287    1 48044 2.081425e-05
## 18288    1 48044 2.081425e-05
## 18289    1 48044 2.081425e-05
## 18290    1 48044 2.081425e-05
## 18291    1 48044 2.081425e-05
## 18292    1 48044 2.081425e-05
## 18293    1 48044 2.081425e-05
## 18294    1 48044 2.081425e-05
## 18295    1 48044 2.081425e-05
## 18296    1 48044 2.081425e-05
## 18297    1 48044 2.081425e-05
## 18298    1 48044 2.081425e-05
## 18299    1 48044 2.081425e-05
## 18300    1 48044 2.081425e-05
## 18301    1 48044 2.081425e-05
## 18302    1 48044 2.081425e-05
## 18303    1 48044 2.081425e-05
## 18304    1 48044 2.081425e-05
## 18305    1 48044 2.081425e-05
## 18306    1 48044 2.081425e-05
## 18307    1 48044 2.081425e-05
## 18308    1 48044 2.081425e-05
## 18309    1 48044 2.081425e-05
## 18310    1 48044 2.081425e-05
## 18311    1 48044 2.081425e-05
## 18312    1 48044 2.081425e-05
## 18313    1 48044 2.081425e-05
## 18314    1 48044 2.081425e-05
## 18315    1 48044 2.081425e-05
## 18316    1 48044 2.081425e-05
## 18317    1 48044 2.081425e-05
## 18318    1 48044 2.081425e-05
## 18319    1 48044 2.081425e-05
## 18320    1 48044 2.081425e-05
## 18321    1 48044 2.081425e-05
## 18322    1 48044 2.081425e-05
## 18323    1 48044 2.081425e-05
## 18324    1 48044 2.081425e-05
## 18325    1 48044 2.081425e-05
## 18326    1 48044 2.081425e-05
## 18327    1 48044 2.081425e-05
## 18328    1 48044 2.081425e-05
## 18329    1 48044 2.081425e-05
## 18330    1 48044 2.081425e-05
## 18331    1 48044 2.081425e-05
## 18332    1 48044 2.081425e-05
## 18333    1 48044 2.081425e-05
## 18334    1 48044 2.081425e-05
## 18335    1 48044 2.081425e-05
## 18336    1 48044 2.081425e-05
## 18337    1 48044 2.081425e-05
## 18338    1 48044 2.081425e-05
## 18339    1 48044 2.081425e-05
## 18340    1 48044 2.081425e-05
## 18341    1 48044 2.081425e-05
## 18342    1 48044 2.081425e-05
## 18343    1 48044 2.081425e-05
## 18344    1 48044 2.081425e-05
## 18345    1 48044 2.081425e-05
## 18346    1 48044 2.081425e-05
## 18347    1 48044 2.081425e-05
## 18348    1 48044 2.081425e-05
## 18349    1 48044 2.081425e-05
## 18350    1 48044 2.081425e-05
## 18351    1 48044 2.081425e-05
## 18352    1 48044 2.081425e-05
## 18353    1 48044 2.081425e-05
## 18354    1 48044 2.081425e-05
## 18355    1 48044 2.081425e-05
## 18356    1 48044 2.081425e-05
## 18357    1 48044 2.081425e-05
## 18358    1 48044 2.081425e-05
## 18359    1 48044 2.081425e-05
## 18360    1 48044 2.081425e-05
## 18361    1 48044 2.081425e-05
## 18362    1 48044 2.081425e-05
## 18363    1 48044 2.081425e-05
## 18364    1 48044 2.081425e-05
## 18365    1 48044 2.081425e-05
## 18366    1 48044 2.081425e-05
## 18367    1 48044 2.081425e-05
## 18368    1 48044 2.081425e-05
## 18369    1 48044 2.081425e-05
## 18370    1 48044 2.081425e-05
## 18371    1 48044 2.081425e-05
## 18372    1 48044 2.081425e-05
## 18373    1 48044 2.081425e-05
## 18374    1 48044 2.081425e-05
## 18375    1 48044 2.081425e-05
## 18376    1 48044 2.081425e-05
## 18377    1 48044 2.081425e-05
## 18378    1 48044 2.081425e-05
## 18379    1 48044 2.081425e-05
## 18380    1 48044 2.081425e-05
## 18381    1 48044 2.081425e-05
## 18382    1 48044 2.081425e-05
## 18383    1 48044 2.081425e-05
## 18384    1 48044 2.081425e-05
## 18385    1 48044 2.081425e-05
## 18386    1 48044 2.081425e-05
## 18387    1 48044 2.081425e-05
## 18388    1 48044 2.081425e-05
## 18389    1 48044 2.081425e-05
## 18390    1 48044 2.081425e-05
## 18391    1 48044 2.081425e-05
## 18392    1 48044 2.081425e-05
## 18393    1 48044 2.081425e-05
## 18394    1 48044 2.081425e-05
## 18395    1 48044 2.081425e-05
## 18396    1 48044 2.081425e-05
## 18397    1 48044 2.081425e-05
## 18398    1 48044 2.081425e-05
## 18399    1 48044 2.081425e-05
## 18400    1 48044 2.081425e-05
## 18401    1 48044 2.081425e-05
## 18402    1 48044 2.081425e-05
## 18403    1 48044 2.081425e-05
## 18404    1 48044 2.081425e-05
## 18405    1 48044 2.081425e-05
## 18406    1 48044 2.081425e-05
## 18407    1 48044 2.081425e-05
## 18408    1 48044 2.081425e-05
## 18409    1 48044 2.081425e-05
## 18410    1 48044 2.081425e-05
## 18411    1 48044 2.081425e-05
## 18412    1 48044 2.081425e-05
## 18413    1 48044 2.081425e-05
## 18414    1 48044 2.081425e-05
## 18415    1 48044 2.081425e-05
## 18416    1 48044 2.081425e-05
## 18417    1 48044 2.081425e-05
## 18418    1 48044 2.081425e-05
## 18419    1 48044 2.081425e-05
## 18420    1 48044 2.081425e-05
## 18421    1 48044 2.081425e-05
## 18422    1 48044 2.081425e-05
## 18423    1 48044 2.081425e-05
## 18424    1 48044 2.081425e-05
## 18425    1 48044 2.081425e-05
## 18426    1 48044 2.081425e-05
## 18427    1 48044 2.081425e-05
## 18428    1 48044 2.081425e-05
## 18429    1 48044 2.081425e-05
## 18430    1 48044 2.081425e-05
## 18431    1 48044 2.081425e-05
## 18432    1 48044 2.081425e-05
## 18433    1 48044 2.081425e-05
## 18434    1 48044 2.081425e-05
## 18435    1 48044 2.081425e-05
## 18436    1 48044 2.081425e-05
## 18437    1 48044 2.081425e-05
## 18438    1 48044 2.081425e-05
## 18439    1 48044 2.081425e-05
## 18440    1 48044 2.081425e-05
## 18441    1 48044 2.081425e-05
## 18442    1 48044 2.081425e-05
## 18443    1 48044 2.081425e-05
## 18444    1 48044 2.081425e-05
## 18445    1 48044 2.081425e-05
## 18446    1 48044 2.081425e-05
## 18447    1 48044 2.081425e-05
## 18448    1 48044 2.081425e-05
## 18449    1 48044 2.081425e-05
## 18450    1 48044 2.081425e-05
## 18451    1 48044 2.081425e-05
## 18452    1 48044 2.081425e-05
## 18453    1 48044 2.081425e-05
## 18454    1 48044 2.081425e-05
## 18455    1 48044 2.081425e-05
## 18456    1 48044 2.081425e-05
## 18457    1 48044 2.081425e-05
## 18458    1 48044 2.081425e-05
## 18459    1 48044 2.081425e-05
## 18460    1 48044 2.081425e-05
## 18461    1 48044 2.081425e-05
## 18462    1 48044 2.081425e-05
## 18463    1 48044 2.081425e-05
## 18464    1 48044 2.081425e-05
## 18465    1 48044 2.081425e-05
## 18466    1 48044 2.081425e-05
## 18467    1 48044 2.081425e-05
## 18468    1 48044 2.081425e-05
## 18469    1 48044 2.081425e-05
## 18470    1 48044 2.081425e-05
## 18471    1 48044 2.081425e-05
## 18472    1 48044 2.081425e-05
## 18473    1 48044 2.081425e-05
## 18474    1 48044 2.081425e-05
## 18475    1 48044 2.081425e-05
## 18476    1 48044 2.081425e-05
## 18477    1 48044 2.081425e-05
## 18478    1 48044 2.081425e-05
## 18479    1 48044 2.081425e-05
## 18480    1 48044 2.081425e-05
## 18481    1 48044 2.081425e-05
## 18482    1 48044 2.081425e-05
## 18483    1 48044 2.081425e-05
## 18484    1 48044 2.081425e-05
## 18485    1 48044 2.081425e-05
## 18486    1 48044 2.081425e-05
## 18487    1 48044 2.081425e-05
## 18488    1 48044 2.081425e-05
## 18489    1 48044 2.081425e-05
## 18490    1 48044 2.081425e-05
## 18491    1 48044 2.081425e-05
## 18492    1 48044 2.081425e-05
## 18493    1 48044 2.081425e-05
## 18494    1 48044 2.081425e-05
## 18495    1 48044 2.081425e-05
## 18496    1 48044 2.081425e-05
## 18497    1 48044 2.081425e-05
## 18498    1 48044 2.081425e-05
## 18499    1 48044 2.081425e-05
## 18500    1 48044 2.081425e-05
## 18501    1 48044 2.081425e-05
## 18502    1 48044 2.081425e-05
## 18503    1 48044 2.081425e-05
## 18504    1 48044 2.081425e-05
## 18505    1 48044 2.081425e-05
## 18506    1 48044 2.081425e-05
## 18507    1 48044 2.081425e-05
## 18508    1 48044 2.081425e-05
## 18509    1 48044 2.081425e-05
## 18510    1 48044 2.081425e-05
## 18511    1 48044 2.081425e-05
## 18512    1 48044 2.081425e-05
## 18513    1 48044 2.081425e-05
## 18514    1 48044 2.081425e-05
## 18515    1 48044 2.081425e-05
## 18516    1 48044 2.081425e-05
## 18517    1 48044 2.081425e-05
## 18518    1 48044 2.081425e-05
## 18519    1 48044 2.081425e-05
## 18520    1 48044 2.081425e-05
## 18521    1 48044 2.081425e-05
## 18522    1 48044 2.081425e-05
## 18523    1 48044 2.081425e-05
## 18524    1 48044 2.081425e-05
## 18525    1 48044 2.081425e-05
## 18526    1 48044 2.081425e-05
## 18527    1 48044 2.081425e-05
## 18528    1 48044 2.081425e-05
## 18529    1 48044 2.081425e-05
## 18530    1 48044 2.081425e-05
## 18531    1 48044 2.081425e-05
## 18532    1 48044 2.081425e-05
## 18533    1 48044 2.081425e-05
## 18534    1 48044 2.081425e-05
## 18535    1 48044 2.081425e-05
## 18536    1 48044 2.081425e-05
## 18537    1 48044 2.081425e-05
## 18538    1 48044 2.081425e-05
## 18539    1 48044 2.081425e-05
## 18540    1 48044 2.081425e-05
## 18541    1 48044 2.081425e-05
## 18542    1 48044 2.081425e-05
## 18543    1 48044 2.081425e-05
## 18544    1 48044 2.081425e-05
## 18545    1 48044 2.081425e-05
## 18546    1 48044 2.081425e-05
## 18547    1 48044 2.081425e-05
## 18548    1 48044 2.081425e-05
## 18549    1 48044 2.081425e-05
## 18550    1 48044 2.081425e-05
## 18551    1 48044 2.081425e-05
## 18552    1 48044 2.081425e-05
## 18553    1 48044 2.081425e-05
## 18554    1 48044 2.081425e-05
## 18555    1 48044 2.081425e-05
## 18556    1 48044 2.081425e-05
## 18557    1 48044 2.081425e-05
## 18558    1 48044 2.081425e-05
## 18559    1 48044 2.081425e-05
## 18560    1 48044 2.081425e-05
## 18561    1 48044 2.081425e-05
## 18562    1 48044 2.081425e-05
## 18563    1 48044 2.081425e-05
## 18564    1 48044 2.081425e-05
## 18565    1 48044 2.081425e-05
## 18566    1 48044 2.081425e-05
## 18567    1 48044 2.081425e-05
## 18568    1 48044 2.081425e-05
## 18569    1 48044 2.081425e-05
## 18570    1 48044 2.081425e-05
## 18571    1 48044 2.081425e-05
## 18572    1 48044 2.081425e-05
## 18573    1 48044 2.081425e-05
## 18574    1 48044 2.081425e-05
## 18575    1 48044 2.081425e-05
## 18576    1 48044 2.081425e-05
## 18577    1 48044 2.081425e-05
## 18578    1 48044 2.081425e-05
## 18579    1 48044 2.081425e-05
## 18580    1 48044 2.081425e-05
## 18581    1 48044 2.081425e-05
## 18582    1 48044 2.081425e-05
## 18583    1 48044 2.081425e-05
## 18584    1 48044 2.081425e-05
## 18585    1 48044 2.081425e-05
## 18586    1 48044 2.081425e-05
## 18587    1 48044 2.081425e-05
## 18588    1 48044 2.081425e-05
## 18589    1 48044 2.081425e-05
## 18590    1 48044 2.081425e-05
## 18591    1 48044 2.081425e-05
## 18592    1 48044 2.081425e-05
## 18593    1 48044 2.081425e-05
## 18594    1 48044 2.081425e-05
## 18595    1 48044 2.081425e-05
## 18596    1 48044 2.081425e-05
## 18597    1 48044 2.081425e-05
## 18598    1 48044 2.081425e-05
## 18599    1 48044 2.081425e-05
## 18600    1 48044 2.081425e-05
## 18601    1 48044 2.081425e-05
## 18602    1 48044 2.081425e-05
## 18603    1 48044 2.081425e-05
## 18604    1 48044 2.081425e-05
## 18605    1 48044 2.081425e-05
## 18606    1 48044 2.081425e-05
## 18607    1 48044 2.081425e-05
## 18608    1 48044 2.081425e-05
## 18609    1 48044 2.081425e-05
## 18610    1 48044 2.081425e-05
## 18611    1 48044 2.081425e-05
## 18612    1 48044 2.081425e-05
## 18613    1 48044 2.081425e-05
## 18614    1 48044 2.081425e-05
## 18615    1 48044 2.081425e-05
## 18616    1 48044 2.081425e-05
## 18617    1 48044 2.081425e-05
## 18618    1 48044 2.081425e-05
## 18619    1 48044 2.081425e-05
## 18620    1 48044 2.081425e-05
## 18621    1 48044 2.081425e-05
## 18622    1 48044 2.081425e-05
## 18623    1 48044 2.081425e-05
## 18624    1 48044 2.081425e-05
## 18625    1 48044 2.081425e-05
## 18626    1 48044 2.081425e-05
## 18627    1 48044 2.081425e-05
## 18628    1 48044 2.081425e-05
## 18629    1 48044 2.081425e-05
## 18630    1 48044 2.081425e-05
## 18631    1 48044 2.081425e-05
## 18632    1 48044 2.081425e-05
## 18633    1 48044 2.081425e-05
## 18634    1 48044 2.081425e-05
## 18635    1 48044 2.081425e-05
## 18636    1 48044 2.081425e-05
## 18637    1 48044 2.081425e-05
## 18638    1 48044 2.081425e-05
## 18639    1 48044 2.081425e-05
## 18640    1 48044 2.081425e-05
## 18641    1 48044 2.081425e-05
## 18642    1 48044 2.081425e-05
## 18643    1 48044 2.081425e-05
## 18644    1 48044 2.081425e-05
## 18645    1 48044 2.081425e-05
## 18646    1 48044 2.081425e-05
## 18647    1 48044 2.081425e-05
## 18648    1 48044 2.081425e-05
## 18649    1 48044 2.081425e-05
## 18650    1 48044 2.081425e-05
## 18651    1 48044 2.081425e-05
## 18652    1 48044 2.081425e-05
## 18653    1 48044 2.081425e-05
## 18654    1 48044 2.081425e-05
## 18655    1 48044 2.081425e-05
## 18656    1 48044 2.081425e-05
## 18657    1 48044 2.081425e-05
## 18658    1 48044 2.081425e-05
## 18659    1 48044 2.081425e-05
## 18660    1 48044 2.081425e-05
## 18661    1 48044 2.081425e-05
## 18662    1 48044 2.081425e-05
## 18663    1 48044 2.081425e-05
## 18664    1 48044 2.081425e-05
## 18665    1 48044 2.081425e-05
## 18666    1 48044 2.081425e-05
## 18667    1 48044 2.081425e-05
## 18668    1 48044 2.081425e-05
## 18669    1 48044 2.081425e-05
## 18670    1 48044 2.081425e-05
## 18671    1 48044 2.081425e-05
## 18672    1 48044 2.081425e-05
## 18673    1 48044 2.081425e-05
## 18674    1 48044 2.081425e-05
## 18675    1 48044 2.081425e-05
## 18676    1 48044 2.081425e-05
## 18677    1 48044 2.081425e-05
## 18678    1 48044 2.081425e-05
## 18679    1 48044 2.081425e-05
## 18680    1 48044 2.081425e-05
## 18681    1 48044 2.081425e-05
## 18682    1 48044 2.081425e-05
## 18683    1 48044 2.081425e-05
## 18684    1 48044 2.081425e-05
## 18685    1 48044 2.081425e-05
## 18686    1 48044 2.081425e-05
## 18687    1 48044 2.081425e-05
## 18688    1 48044 2.081425e-05
## 18689    1 48044 2.081425e-05
## 18690    1 48044 2.081425e-05
## 18691    1 48044 2.081425e-05
## 18692    1 48044 2.081425e-05
## 18693    1 48044 2.081425e-05
## 18694    1 48044 2.081425e-05
## 18695    1 48044 2.081425e-05
## 18696    1 48044 2.081425e-05
## 18697    1 48044 2.081425e-05
## 18698    1 48044 2.081425e-05
## 18699    1 48044 2.081425e-05
## 18700    1 48044 2.081425e-05
## 18701    1 48044 2.081425e-05
## 18702    1 48044 2.081425e-05
## 18703    1 48044 2.081425e-05
## 18704    1 48044 2.081425e-05
## 18705    1 48044 2.081425e-05
## 18706    1 48044 2.081425e-05
## 18707    1 48044 2.081425e-05
## 18708    1 48044 2.081425e-05
## 18709    1 48044 2.081425e-05
## 18710    1 48044 2.081425e-05
## 18711    1 48044 2.081425e-05
## 18712    1 48044 2.081425e-05
## 18713    1 48044 2.081425e-05
## 18714    1 48044 2.081425e-05
## 18715    1 48044 2.081425e-05
## 18716    1 48044 2.081425e-05
## 18717    1 48044 2.081425e-05
## 18718    1 48044 2.081425e-05
## 18719    1 48044 2.081425e-05
## 18720    1 48044 2.081425e-05
## 18721    1 48044 2.081425e-05
## 18722    1 48044 2.081425e-05
## 18723    1 48044 2.081425e-05
## 18724    1 48044 2.081425e-05
## 18725    1 48044 2.081425e-05
## 18726    1 48044 2.081425e-05
## 18727    1 48044 2.081425e-05
## 18728    1 48044 2.081425e-05
## 18729    1 48044 2.081425e-05
## 18730    1 48044 2.081425e-05
## 18731    1 48044 2.081425e-05
## 18732    1 48044 2.081425e-05
## 18733    1 48044 2.081425e-05
## 18734    1 48044 2.081425e-05
## 18735    1 48044 2.081425e-05
## 18736    1 48044 2.081425e-05
## 18737    1 48044 2.081425e-05
## 18738    1 48044 2.081425e-05
## 18739    1 48044 2.081425e-05
## 18740    1 48044 2.081425e-05
## 18741    1 48044 2.081425e-05
## 18742    1 48044 2.081425e-05
## 18743    1 48044 2.081425e-05
## 18744    1 48044 2.081425e-05
## 18745    1 48044 2.081425e-05
## 18746    1 48044 2.081425e-05
## 18747    1 48044 2.081425e-05
## 18748    1 48044 2.081425e-05
## 18749    1 48044 2.081425e-05
## 18750    1 48044 2.081425e-05
## 18751    1 48044 2.081425e-05
## 18752    1 48044 2.081425e-05
## 18753    1 48044 2.081425e-05
## 18754    1 48044 2.081425e-05
## 18755    1 48044 2.081425e-05
## 18756    1 48044 2.081425e-05
## 18757    1 48044 2.081425e-05
## 18758    1 48044 2.081425e-05
## 18759    1 48044 2.081425e-05
## 18760    1 48044 2.081425e-05
## 18761    1 48044 2.081425e-05
## 18762    1 48044 2.081425e-05
## 18763    1 48044 2.081425e-05
## 18764    1 48044 2.081425e-05
## 18765    1 48044 2.081425e-05
## 18766    1 48044 2.081425e-05
## 18767    1 48044 2.081425e-05
## 18768    1 48044 2.081425e-05
## 18769    1 48044 2.081425e-05
## 18770    1 48044 2.081425e-05
## 18771    1 48044 2.081425e-05
## 18772    1 48044 2.081425e-05
## 18773    1 48044 2.081425e-05
## 18774    1 48044 2.081425e-05
## 18775    1 48044 2.081425e-05
## 18776    1 48044 2.081425e-05
## 18777    1 48044 2.081425e-05
## 18778    1 48044 2.081425e-05
## 18779    1 48044 2.081425e-05
## 18780    1 48044 2.081425e-05
## 18781    1 48044 2.081425e-05
## 18782    1 48044 2.081425e-05
## 18783    1 48044 2.081425e-05
## 18784    1 48044 2.081425e-05
## 18785    1 48044 2.081425e-05
## 18786    1 48044 2.081425e-05
## 18787    1 48044 2.081425e-05
## 18788    1 48044 2.081425e-05
## 18789    1 48044 2.081425e-05
## 18790    1 48044 2.081425e-05
## 18791    1 48044 2.081425e-05
## 18792    1 48044 2.081425e-05
## 18793    1 48044 2.081425e-05
## 18794    1 48044 2.081425e-05
## 18795    1 48044 2.081425e-05
## 18796    1 48044 2.081425e-05
## 18797    1 48044 2.081425e-05
## 18798    1 48044 2.081425e-05
## 18799    1 48044 2.081425e-05
## 18800    1 48044 2.081425e-05
## 18801    1 48044 2.081425e-05
## 18802    1 48044 2.081425e-05
## 18803    1 48044 2.081425e-05
## 18804    1 48044 2.081425e-05
## 18805    1 48044 2.081425e-05
## 18806    1 48044 2.081425e-05
## 18807    1 48044 2.081425e-05
## 18808    1 48044 2.081425e-05
## 18809    1 48044 2.081425e-05
## 18810    1 48044 2.081425e-05
## 18811    1 48044 2.081425e-05
## 18812    1 48044 2.081425e-05
## 18813    1 48044 2.081425e-05
## 18814    1 48044 2.081425e-05
## 18815    1 48044 2.081425e-05
## 18816    1 48044 2.081425e-05
## 18817    1 48044 2.081425e-05
## 18818    1 48044 2.081425e-05
## 18819    1 48044 2.081425e-05
## 18820    1 48044 2.081425e-05
## 18821    1 48044 2.081425e-05
## 18822    1 48044 2.081425e-05
## 18823    1 48044 2.081425e-05
## 18824    1 48044 2.081425e-05
## 18825    1 48044 2.081425e-05
## 18826    1 48044 2.081425e-05
## 18827    1 48044 2.081425e-05
## 18828    1 48044 2.081425e-05
## 18829    1 48044 2.081425e-05
## 18830    1 48044 2.081425e-05
## 18831    1 48044 2.081425e-05
## 18832    1 48044 2.081425e-05
## 18833    1 48044 2.081425e-05
## 18834    1 48044 2.081425e-05
## 18835    1 48044 2.081425e-05
## 18836    1 48044 2.081425e-05
## 18837    1 48044 2.081425e-05
## 18838    1 48044 2.081425e-05
## 18839    1 48044 2.081425e-05
## 18840    1 48044 2.081425e-05
## 18841    1 48044 2.081425e-05
## 18842    1 48044 2.081425e-05
## 18843    1 48044 2.081425e-05
## 18844    1 48044 2.081425e-05
## 18845    1 48044 2.081425e-05
## 18846    1 48044 2.081425e-05
## 18847    1 48044 2.081425e-05
## 18848    1 48044 2.081425e-05
## 18849    1 48044 2.081425e-05
## 18850    1 48044 2.081425e-05
## 18851    1 48044 2.081425e-05
## 18852    1 48044 2.081425e-05
## 18853    1 48044 2.081425e-05
## 18854    1 48044 2.081425e-05
## 18855    1 48044 2.081425e-05
## 18856    1 48044 2.081425e-05
## 18857    1 48044 2.081425e-05
## 18858    1 48044 2.081425e-05
## 18859    1 48044 2.081425e-05
## 18860    1 48044 2.081425e-05
## 18861    1 48044 2.081425e-05
## 18862    1 48044 2.081425e-05
## 18863    1 48044 2.081425e-05
## 18864    1 48044 2.081425e-05
## 18865    1 48044 2.081425e-05
## 18866    1 48044 2.081425e-05
## 18867    1 48044 2.081425e-05
## 18868    1 48044 2.081425e-05
## 18869    1 48044 2.081425e-05
## 18870    1 48044 2.081425e-05
## 18871    1 48044 2.081425e-05
## 18872    1 48044 2.081425e-05
## 18873    1 48044 2.081425e-05
## 18874    1 48044 2.081425e-05
## 18875    1 48044 2.081425e-05
## 18876    1 48044 2.081425e-05
## 18877    1 48044 2.081425e-05
## 18878    1 48044 2.081425e-05
## 18879    1 48044 2.081425e-05
## 18880    1 48044 2.081425e-05
## 18881    1 48044 2.081425e-05
## 18882    1 48044 2.081425e-05
## 18883    1 48044 2.081425e-05
## 18884    1 48044 2.081425e-05
## 18885    1 48044 2.081425e-05
## 18886    1 48044 2.081425e-05
## 18887    1 48044 2.081425e-05
## 18888    1 48044 2.081425e-05
## 18889    1 48044 2.081425e-05
## 18890    1 48044 2.081425e-05
## 18891    1 48044 2.081425e-05
## 18892    1 48044 2.081425e-05
## 18893    1 48044 2.081425e-05
## 18894    1 48044 2.081425e-05
## 18895    1 48044 2.081425e-05
## 18896    1 48044 2.081425e-05
## 18897    1 48044 2.081425e-05
## 18898    1 48044 2.081425e-05
## 18899    1 48044 2.081425e-05
## 18900    1 48044 2.081425e-05
## 18901    1 48044 2.081425e-05
## 18902    1 48044 2.081425e-05
## 18903    1 48044 2.081425e-05
## 18904    1 48044 2.081425e-05
## 18905    1 48044 2.081425e-05
## 18906    1 48044 2.081425e-05
## 18907    1 48044 2.081425e-05
## 18908    1 48044 2.081425e-05
## 18909    1 48044 2.081425e-05
## 18910    1 48044 2.081425e-05
## 18911    1 48044 2.081425e-05
## 18912    1 48044 2.081425e-05
## 18913    1 48044 2.081425e-05
## 18914    1 48044 2.081425e-05
## 18915    1 48044 2.081425e-05
## 18916    1 48044 2.081425e-05
## 18917    1 48044 2.081425e-05
## 18918    1 48044 2.081425e-05
## 18919    1 48044 2.081425e-05
## 18920    1 48044 2.081425e-05
## 18921    1 48044 2.081425e-05
## 18922    1 48044 2.081425e-05
## 18923    1 48044 2.081425e-05
## 18924    1 48044 2.081425e-05
## 18925    1 48044 2.081425e-05
## 18926    1 48044 2.081425e-05
## 18927    1 48044 2.081425e-05
## 18928    1 48044 2.081425e-05
## 18929    1 48044 2.081425e-05
## 18930    1 48044 2.081425e-05
## 18931    1 48044 2.081425e-05
## 18932    1 48044 2.081425e-05
## 18933    1 48044 2.081425e-05
## 18934    1 48044 2.081425e-05
## 18935    1 48044 2.081425e-05
## 18936    1 48044 2.081425e-05
## 18937    1 48044 2.081425e-05
## 18938    1 48044 2.081425e-05
## 18939    1 48044 2.081425e-05
## 18940    1 48044 2.081425e-05
## 18941    1 48044 2.081425e-05
## 18942    1 48044 2.081425e-05
## 18943    1 48044 2.081425e-05
## 18944    1 48044 2.081425e-05
## 18945    1 48044 2.081425e-05
## 18946    1 48044 2.081425e-05
## 18947    1 48044 2.081425e-05
## 18948    1 48044 2.081425e-05
## 18949    1 48044 2.081425e-05
## 18950    1 48044 2.081425e-05
## 18951    1 48044 2.081425e-05
## 18952    1 48044 2.081425e-05
## 18953    1 48044 2.081425e-05
## 18954    1 48044 2.081425e-05
## 18955    1 48044 2.081425e-05
## 18956    1 48044 2.081425e-05
## 18957    1 48044 2.081425e-05
## 18958    1 48044 2.081425e-05
## 18959    1 48044 2.081425e-05
## 18960    1 48044 2.081425e-05
## 18961    1 48044 2.081425e-05
## 18962    1 48044 2.081425e-05
## 18963    1 48044 2.081425e-05
## 18964    1 48044 2.081425e-05
## 18965    1 48044 2.081425e-05
## 18966    1 48044 2.081425e-05
## 18967    1 48044 2.081425e-05
## 18968    1 48044 2.081425e-05
## 18969    1 48044 2.081425e-05
## 18970    1 48044 2.081425e-05
## 18971    1 48044 2.081425e-05
## 18972    1 48044 2.081425e-05
## 18973    1 48044 2.081425e-05
## 18974    1 48044 2.081425e-05
## 18975    1 48044 2.081425e-05
## 18976    1 48044 2.081425e-05
## 18977    1 48044 2.081425e-05
## 18978    1 48044 2.081425e-05
## 18979    1 48044 2.081425e-05
## 18980    1 48044 2.081425e-05
## 18981    1 48044 2.081425e-05
## 18982    1 48044 2.081425e-05
## 18983    1 48044 2.081425e-05
## 18984    1 48044 2.081425e-05
## 18985    1 48044 2.081425e-05
## 18986    1 48044 2.081425e-05
## 18987    1 48044 2.081425e-05
## 18988    1 48044 2.081425e-05
## 18989    1 48044 2.081425e-05
## 18990    1 48044 2.081425e-05
## 18991    1 48044 2.081425e-05
## 18992    1 48044 2.081425e-05
## 18993    1 48044 2.081425e-05
## 18994    1 48044 2.081425e-05
## 18995    1 48044 2.081425e-05
## 18996    1 48044 2.081425e-05
## 18997    1 48044 2.081425e-05
## 18998    1 48044 2.081425e-05
## 18999    1 48044 2.081425e-05
## 19000    1 48044 2.081425e-05
## 19001    1 48044 2.081425e-05
## 19002    1 48044 2.081425e-05
## 19003    1 48044 2.081425e-05
## 19004    1 48044 2.081425e-05
## 19005    1 48044 2.081425e-05
## 19006    1 48044 2.081425e-05
## 19007    1 48044 2.081425e-05
## 19008    1 48044 2.081425e-05
## 19009    1 48044 2.081425e-05
## 19010    1 48044 2.081425e-05
## 19011    1 48044 2.081425e-05
## 19012    1 48044 2.081425e-05
## 19013    1 48044 2.081425e-05
## 19014    1 48044 2.081425e-05
## 19015    1 48044 2.081425e-05
## 19016    1 48044 2.081425e-05
## 19017    1 48044 2.081425e-05
## 19018    1 48044 2.081425e-05
## 19019    1 48044 2.081425e-05
## 19020    1 48044 2.081425e-05
## 19021    1 48044 2.081425e-05
## 19022    1 48044 2.081425e-05
## 19023    1 48044 2.081425e-05
## 19024    1 48044 2.081425e-05
## 19025    1 48044 2.081425e-05
## 19026    1 48044 2.081425e-05
## 19027    1 48044 2.081425e-05
## 19028    1 48044 2.081425e-05
## 19029    1 48044 2.081425e-05
## 19030    1 48044 2.081425e-05
## 19031    1 48044 2.081425e-05
## 19032    1 48044 2.081425e-05
## 19033    1 48044 2.081425e-05
## 19034    1 48044 2.081425e-05
## 19035    1 48044 2.081425e-05
## 19036    1 48044 2.081425e-05
## 19037    1 48044 2.081425e-05
## 19038    1 48044 2.081425e-05
## 19039    1 48044 2.081425e-05
## 19040    1 48044 2.081425e-05
## 19041    1 48044 2.081425e-05
## 19042    1 48044 2.081425e-05
## 19043    1 48044 2.081425e-05
## 19044    1 48044 2.081425e-05
## 19045    1 48044 2.081425e-05
## 19046    1 48044 2.081425e-05
## 19047    1 48044 2.081425e-05
## 19048    1 48044 2.081425e-05
## 19049    1 48044 2.081425e-05
## 19050    1 48044 2.081425e-05
## 19051    1 48044 2.081425e-05
## 19052    1 48044 2.081425e-05
## 19053    1 48044 2.081425e-05
## 19054    1 48044 2.081425e-05
## 19055    1 48044 2.081425e-05
## 19056    1 48044 2.081425e-05
## 19057    1 48044 2.081425e-05
## 19058    1 48044 2.081425e-05
## 19059    1 48044 2.081425e-05
## 19060    1 48044 2.081425e-05
## 19061    1 48044 2.081425e-05
## 19062    1 48044 2.081425e-05
## 19063    1 48044 2.081425e-05
## 19064    1 48044 2.081425e-05
## 19065    1 48044 2.081425e-05
## 19066    1 48044 2.081425e-05
## 19067    1 48044 2.081425e-05
## 19068    1 48044 2.081425e-05
## 19069    1 48044 2.081425e-05
## 19070    1 48044 2.081425e-05
## 19071    1 48044 2.081425e-05
## 19072    1 48044 2.081425e-05
## 19073    1 48044 2.081425e-05
## 19074    1 48044 2.081425e-05
## 19075    1 48044 2.081425e-05
## 19076    1 48044 2.081425e-05
## 19077    1 48044 2.081425e-05
## 19078    1 48044 2.081425e-05
## 19079    1 48044 2.081425e-05
## 19080    1 48044 2.081425e-05
## 19081    1 48044 2.081425e-05
## 19082    1 48044 2.081425e-05
## 19083    1 48044 2.081425e-05
## 19084    1 48044 2.081425e-05
## 19085    1 48044 2.081425e-05
## 19086    1 48044 2.081425e-05
## 19087    1 48044 2.081425e-05
## 19088    1 48044 2.081425e-05
## 19089    1 48044 2.081425e-05
## 19090    1 48044 2.081425e-05
## 19091    1 48044 2.081425e-05
## 19092    1 48044 2.081425e-05
## 19093    1 48044 2.081425e-05
## 19094    1 48044 2.081425e-05
## 19095    1 48044 2.081425e-05
## 19096    1 48044 2.081425e-05
## 19097    1 48044 2.081425e-05
## 19098    1 48044 2.081425e-05
## 19099    1 48044 2.081425e-05
## 19100    1 48044 2.081425e-05
## 19101    1 48044 2.081425e-05
## 19102    1 48044 2.081425e-05
## 19103    1 48044 2.081425e-05
## 19104    1 48044 2.081425e-05
## 19105    1 48044 2.081425e-05
## 19106    1 48044 2.081425e-05
## 19107    1 48044 2.081425e-05
## 19108    1 48044 2.081425e-05
## 19109    1 48044 2.081425e-05
## 19110    1 48044 2.081425e-05
## 19111    1 48044 2.081425e-05
## 19112    1 48044 2.081425e-05
## 19113    1 48044 2.081425e-05
## 19114    1 48044 2.081425e-05
## 19115    1 48044 2.081425e-05
## 19116    1 48044 2.081425e-05
## 19117    1 48044 2.081425e-05
## 19118    1 48044 2.081425e-05
## 19119    1 48044 2.081425e-05
## 19120    1 48044 2.081425e-05
## 19121    1 48044 2.081425e-05
## 19122    1 48044 2.081425e-05
## 19123    1 48044 2.081425e-05
## 19124    1 48044 2.081425e-05
## 19125    1 48044 2.081425e-05
## 19126    1 48044 2.081425e-05
## 19127    1 48044 2.081425e-05
## 19128    1 48044 2.081425e-05
## 19129    1 48044 2.081425e-05
## 19130    1 48044 2.081425e-05
## 19131    1 48044 2.081425e-05
## 19132    1 48044 2.081425e-05
## 19133    1 48044 2.081425e-05
## 19134    1 48044 2.081425e-05
## 19135    1 48044 2.081425e-05
## 19136    1 48044 2.081425e-05
## 19137    1 48044 2.081425e-05
## 19138    1 48044 2.081425e-05
## 19139    1 48044 2.081425e-05
## 19140    1 48044 2.081425e-05
## 19141    1 48044 2.081425e-05
## 19142    1 48044 2.081425e-05
## 19143    1 48044 2.081425e-05
## 19144    1 48044 2.081425e-05
## 19145    1 48044 2.081425e-05
## 19146    1 48044 2.081425e-05
## 19147    1 48044 2.081425e-05
## 19148    1 48044 2.081425e-05
## 19149    1 48044 2.081425e-05
## 19150    1 48044 2.081425e-05
## 19151    1 48044 2.081425e-05
## 19152    1 48044 2.081425e-05
## 19153    1 48044 2.081425e-05
## 19154    1 48044 2.081425e-05
## 19155    1 48044 2.081425e-05
## 19156    1 48044 2.081425e-05
## 19157    1 48044 2.081425e-05
## 19158    1 48044 2.081425e-05
## 19159    1 48044 2.081425e-05
## 19160    1 48044 2.081425e-05
## 19161    1 48044 2.081425e-05
## 19162    1 48044 2.081425e-05
## 19163    1 48044 2.081425e-05
## 19164    1 48044 2.081425e-05
## 19165    1 48044 2.081425e-05
## 19166    1 48044 2.081425e-05
## 19167    1 48044 2.081425e-05
## 19168    1 48044 2.081425e-05
## 19169    1 48044 2.081425e-05
## 19170    1 48044 2.081425e-05
## 19171    1 48044 2.081425e-05
## 19172    1 48044 2.081425e-05
## 19173    1 48044 2.081425e-05
## 19174    1 48044 2.081425e-05
## 19175    1 48044 2.081425e-05
## 19176    1 48044 2.081425e-05
## 19177    1 48044 2.081425e-05
## 19178    1 48044 2.081425e-05
## 19179    1 48044 2.081425e-05
## 19180    1 48044 2.081425e-05
## 19181    1 48044 2.081425e-05
## 19182    1 48044 2.081425e-05
## 19183    1 48044 2.081425e-05
## 19184    1 48044 2.081425e-05
## 19185    1 48044 2.081425e-05
## 19186    1 48044 2.081425e-05
## 19187    1 48044 2.081425e-05
## 19188    1 48044 2.081425e-05
## 19189    1 48044 2.081425e-05
## 19190    1 48044 2.081425e-05
## 19191    1 48044 2.081425e-05
## 19192    1 48044 2.081425e-05
## 19193    1 48044 2.081425e-05
## 19194    1 48044 2.081425e-05
## 19195    1 48044 2.081425e-05
## 19196    1 48044 2.081425e-05
## 19197    1 48044 2.081425e-05
## 19198    1 48044 2.081425e-05
## 19199    1 48044 2.081425e-05
## 19200    1 48044 2.081425e-05
## 19201    1 48044 2.081425e-05
## 19202    1 48044 2.081425e-05
## 19203    1 48044 2.081425e-05
## 19204    1 48044 2.081425e-05
## 19205    1 48044 2.081425e-05
## 19206    1 48044 2.081425e-05
## 19207    1 48044 2.081425e-05
## 19208    1 48044 2.081425e-05
## 19209    1 48044 2.081425e-05
## 19210    1 48044 2.081425e-05
## 19211    1 48044 2.081425e-05
## 19212    1 48044 2.081425e-05
## 19213    1 48044 2.081425e-05
## 19214    1 48044 2.081425e-05
## 19215    1 48044 2.081425e-05
## 19216    1 48044 2.081425e-05
## 19217    1 48044 2.081425e-05
## 19218    1 48044 2.081425e-05
## 19219    1 48044 2.081425e-05
## 19220    1 48044 2.081425e-05
## 19221    1 48044 2.081425e-05
## 19222    1 48044 2.081425e-05
## 19223    1 48044 2.081425e-05
## 19224    1 48044 2.081425e-05
## 19225    1 48044 2.081425e-05
## 19226    1 48044 2.081425e-05
## 19227    1 48044 2.081425e-05
## 19228    1 48044 2.081425e-05
## 19229    1 48044 2.081425e-05
## 19230    1 48044 2.081425e-05
## 19231    1 48044 2.081425e-05
## 19232    1 48044 2.081425e-05
## 19233    1 48044 2.081425e-05
## 19234    1 48044 2.081425e-05
## 19235    1 48044 2.081425e-05
## 19236    1 48044 2.081425e-05
## 19237    1 48044 2.081425e-05
## 19238    1 48044 2.081425e-05
## 19239    1 48044 2.081425e-05
## 19240    1 48044 2.081425e-05
## 19241    1 48044 2.081425e-05
## 19242    1 48044 2.081425e-05
## 19243    1 48044 2.081425e-05
## 19244    1 48044 2.081425e-05
## 19245    1 48044 2.081425e-05
## 19246    1 48044 2.081425e-05
## 19247    1 48044 2.081425e-05
## 19248    1 48044 2.081425e-05
## 19249    1 48044 2.081425e-05
## 19250    1 48044 2.081425e-05
## 19251    1 48044 2.081425e-05
## 19252    1 48044 2.081425e-05
## 19253    1 48044 2.081425e-05
## 19254    1 48044 2.081425e-05
## 19255    1 48044 2.081425e-05
## 19256    1 48044 2.081425e-05
## 19257    1 48044 2.081425e-05
## 19258    1 48044 2.081425e-05
## 19259    1 48044 2.081425e-05
## 19260    1 48044 2.081425e-05
## 19261    1 48044 2.081425e-05
## 19262    1 48044 2.081425e-05
## 19263    1 48044 2.081425e-05
## 19264    1 48044 2.081425e-05
## 19265    1 48044 2.081425e-05
## 19266    1 48044 2.081425e-05
## 19267    1 48044 2.081425e-05
## 19268    1 48044 2.081425e-05
## 19269    1 48044 2.081425e-05
## 19270    1 48044 2.081425e-05
## 19271    1 48044 2.081425e-05
## 19272    1 48044 2.081425e-05
## 19273    1 48044 2.081425e-05
## 19274    1 48044 2.081425e-05
## 19275    1 48044 2.081425e-05
## 19276    1 48044 2.081425e-05
## 19277    1 48044 2.081425e-05
## 19278    1 48044 2.081425e-05
## 19279    1 48044 2.081425e-05
## 19280    1 48044 2.081425e-05
## 19281    1 48044 2.081425e-05
## 19282    1 48044 2.081425e-05
## 19283    1 48044 2.081425e-05
## 19284    1 48044 2.081425e-05
## 19285    1 48044 2.081425e-05
## 19286    1 48044 2.081425e-05
## 19287    1 48044 2.081425e-05
## 19288    1 48044 2.081425e-05
## 19289    1 48044 2.081425e-05
## 19290    1 48044 2.081425e-05
## 19291    1 48044 2.081425e-05
## 19292    1 48044 2.081425e-05
## 19293    1 48044 2.081425e-05
## 19294    1 48044 2.081425e-05
## 19295    1 48044 2.081425e-05
## 19296    1 48044 2.081425e-05
## 19297    1 48044 2.081425e-05
## 19298    1 48044 2.081425e-05
## 19299    1 48044 2.081425e-05
## 19300    1 48044 2.081425e-05
## 19301    1 48044 2.081425e-05
## 19302    1 48044 2.081425e-05
## 19303    1 48044 2.081425e-05
## 19304    1 48044 2.081425e-05
## 19305    1 48044 2.081425e-05
## 19306    1 48044 2.081425e-05
## 19307    1 48044 2.081425e-05
## 19308    1 48044 2.081425e-05
## 19309    1 48044 2.081425e-05
## 19310    1 48044 2.081425e-05
## 19311    1 48044 2.081425e-05
## 19312    1 48044 2.081425e-05
## 19313    1 48044 2.081425e-05
## 19314    1 48044 2.081425e-05
## 19315    1 48044 2.081425e-05
## 19316    1 48044 2.081425e-05
## 19317    1 48044 2.081425e-05
## 19318    1 48044 2.081425e-05
## 19319    1 48044 2.081425e-05
## 19320    1 48044 2.081425e-05
## 19321    1 48044 2.081425e-05
## 19322    1 48044 2.081425e-05
## 19323    1 48044 2.081425e-05
## 19324    1 48044 2.081425e-05
## 19325    1 48044 2.081425e-05
## 19326    1 48044 2.081425e-05
## 19327    1 48044 2.081425e-05
## 19328    1 48044 2.081425e-05
## 19329    1 48044 2.081425e-05
## 19330    1 48044 2.081425e-05
## 19331    1 48044 2.081425e-05
## 19332    1 48044 2.081425e-05
## 19333    1 48044 2.081425e-05
## 19334    1 48044 2.081425e-05
## 19335    1 48044 2.081425e-05
## 19336    1 48044 2.081425e-05
## 19337    1 48044 2.081425e-05
## 19338    1 48044 2.081425e-05
## 19339    1 48044 2.081425e-05
## 19340    1 48044 2.081425e-05
## 19341    1 48044 2.081425e-05
## 19342    1 48044 2.081425e-05
## 19343    1 48044 2.081425e-05
## 19344    1 48044 2.081425e-05
## 19345    1 48044 2.081425e-05
## 19346    1 48044 2.081425e-05
## 19347    1 48044 2.081425e-05
## 19348    1 48044 2.081425e-05
## 19349    1 48044 2.081425e-05
## 19350    1 48044 2.081425e-05
## 19351    1 48044 2.081425e-05
## 19352    1 48044 2.081425e-05
## 19353    1 48044 2.081425e-05
## 19354    1 48044 2.081425e-05
## 19355    1 48044 2.081425e-05
## 19356    1 48044 2.081425e-05
## 19357    1 48044 2.081425e-05
## 19358    1 48044 2.081425e-05
## 19359    1 48044 2.081425e-05
## 19360    1 48044 2.081425e-05
## 19361    1 48044 2.081425e-05
## 19362    1 48044 2.081425e-05
## 19363    1 48044 2.081425e-05
## 19364    1 48044 2.081425e-05
## 19365    1 48044 2.081425e-05
## 19366    1 48044 2.081425e-05
## 19367    1 48044 2.081425e-05
## 19368    1 48044 2.081425e-05
## 19369    1 48044 2.081425e-05
## 19370    1 48044 2.081425e-05
## 19371    1 48044 2.081425e-05
## 19372    1 48044 2.081425e-05
## 19373    1 48044 2.081425e-05
## 19374    1 48044 2.081425e-05
## 19375    1 48044 2.081425e-05
## 19376    1 48044 2.081425e-05
## 19377    1 48044 2.081425e-05
## 19378    1 48044 2.081425e-05
## 19379    1 48044 2.081425e-05
## 19380    1 48044 2.081425e-05
## 19381    1 48044 2.081425e-05
## 19382    1 48044 2.081425e-05
## 19383    1 48044 2.081425e-05
## 19384    1 48044 2.081425e-05
## 19385    1 48044 2.081425e-05
## 19386    1 48044 2.081425e-05
## 19387    1 48044 2.081425e-05
## 19388    1 48044 2.081425e-05
## 19389    1 48044 2.081425e-05
## 19390    1 48044 2.081425e-05
## 19391    1 48044 2.081425e-05
## 19392    1 48044 2.081425e-05
## 19393    1 48044 2.081425e-05
## 19394    1 48044 2.081425e-05
## 19395    1 48044 2.081425e-05
## 19396    1 48044 2.081425e-05
## 19397    1 48044 2.081425e-05
## 19398    1 48044 2.081425e-05
## 19399    1 48044 2.081425e-05
## 19400    1 48044 2.081425e-05
## 19401    1 48044 2.081425e-05
## 19402    1 48044 2.081425e-05
## 19403    1 48044 2.081425e-05
## 19404    1 48044 2.081425e-05
## 19405    1 48044 2.081425e-05
## 19406    1 48044 2.081425e-05
## 19407    1 48044 2.081425e-05
## 19408    1 48044 2.081425e-05
## 19409    1 48044 2.081425e-05
## 19410    1 48044 2.081425e-05
## 19411    1 48044 2.081425e-05
## 19412    1 48044 2.081425e-05
## 19413    1 48044 2.081425e-05
## 19414    1 48044 2.081425e-05
## 19415    1 48044 2.081425e-05
## 19416    1 48044 2.081425e-05
## 19417    1 48044 2.081425e-05
## 19418    1 48044 2.081425e-05
## 19419    1 48044 2.081425e-05
## 19420    1 48044 2.081425e-05
## 19421    1 48044 2.081425e-05
## 19422    1 48044 2.081425e-05
## 19423    1 48044 2.081425e-05
## 19424    1 48044 2.081425e-05
## 19425    1 48044 2.081425e-05
## 19426    1 48044 2.081425e-05
## 19427    1 48044 2.081425e-05
## 19428    1 48044 2.081425e-05
## 19429    1 48044 2.081425e-05
## 19430    1 48044 2.081425e-05
## 19431    1 48044 2.081425e-05
## 19432    1 48044 2.081425e-05
## 19433    1 48044 2.081425e-05
## 19434    1 48044 2.081425e-05
## 19435    1 48044 2.081425e-05
## 19436    1 48044 2.081425e-05
## 19437    1 48044 2.081425e-05
## 19438    1 48044 2.081425e-05
## 19439    1 48044 2.081425e-05
## 19440    1 48044 2.081425e-05
## 19441    1 48044 2.081425e-05
## 19442    1 48044 2.081425e-05
## 19443    1 48044 2.081425e-05
## 19444    1 48044 2.081425e-05
## 19445    1 48044 2.081425e-05
## 19446    1 48044 2.081425e-05
## 19447    1 48044 2.081425e-05
## 19448    1 48044 2.081425e-05
## 19449    1 48044 2.081425e-05
## 19450    1 48044 2.081425e-05
## 19451    1 48044 2.081425e-05
## 19452    1 48044 2.081425e-05
## 19453    1 48044 2.081425e-05
## 19454    1 48044 2.081425e-05
## 19455    1 48044 2.081425e-05
## 19456    1 48044 2.081425e-05
## 19457    1 48044 2.081425e-05
## 19458    1 48044 2.081425e-05
## 19459    1 48044 2.081425e-05
## 19460    1 48044 2.081425e-05
## 19461    1 48044 2.081425e-05
## 19462    1 48044 2.081425e-05
## 19463    1 48044 2.081425e-05
## 19464    1 48044 2.081425e-05
## 19465    1 48044 2.081425e-05
## 19466    1 48044 2.081425e-05
## 19467    1 48044 2.081425e-05
## 19468    1 48044 2.081425e-05
## 19469    1 48044 2.081425e-05
## 19470    1 48044 2.081425e-05
## 19471    1 48044 2.081425e-05
## 19472    1 48044 2.081425e-05
## 19473    1 48044 2.081425e-05
## 19474    1 48044 2.081425e-05
## 19475    1 48044 2.081425e-05
## 19476    1 48044 2.081425e-05
## 19477    1 48044 2.081425e-05
## 19478    1 48044 2.081425e-05
## 19479    1 48044 2.081425e-05
## 19480    1 48044 2.081425e-05
## 19481    1 48044 2.081425e-05
## 19482    1 48044 2.081425e-05
## 19483    1 48044 2.081425e-05
## 19484    1 48044 2.081425e-05
## 19485    1 48044 2.081425e-05
## 19486    1 48044 2.081425e-05
## 19487    1 48044 2.081425e-05
## 19488    1 48044 2.081425e-05
## 19489    1 48044 2.081425e-05
## 19490    1 48044 2.081425e-05
## 19491    1 48044 2.081425e-05
## 19492    1 48044 2.081425e-05
## 19493    1 48044 2.081425e-05
## 19494    1 48044 2.081425e-05
## 19495    1 48044 2.081425e-05
## 19496    1 48044 2.081425e-05
## 19497    1 48044 2.081425e-05
## 19498    1 48044 2.081425e-05
## 19499    1 48044 2.081425e-05
## 19500    1 48044 2.081425e-05
## 19501    1 48044 2.081425e-05
## 19502    1 48044 2.081425e-05
## 19503    1 48044 2.081425e-05
## 19504    1 48044 2.081425e-05
## 19505    1 48044 2.081425e-05
## 19506    1 48044 2.081425e-05
## 19507    1 48044 2.081425e-05
## 19508    1 48044 2.081425e-05
## 19509    1 48044 2.081425e-05
## 19510    1 48044 2.081425e-05
## 19511    1 48044 2.081425e-05
## 19512    1 48044 2.081425e-05
## 19513    1 48044 2.081425e-05
## 19514    1 48044 2.081425e-05
## 19515    1 48044 2.081425e-05
## 19516    1 48044 2.081425e-05
## 19517    1 48044 2.081425e-05
## 19518    1 48044 2.081425e-05
## 19519    1 48044 2.081425e-05
## 19520    1 48044 2.081425e-05
## 19521    1 48044 2.081425e-05
## 19522    1 48044 2.081425e-05
## 19523    1 48044 2.081425e-05
## 19524    1 48044 2.081425e-05
## 19525    1 48044 2.081425e-05
## 19526    1 48044 2.081425e-05
## 19527    1 48044 2.081425e-05
## 19528    1 48044 2.081425e-05
## 19529    1 48044 2.081425e-05
## 19530    1 48044 2.081425e-05
## 19531    1 48044 2.081425e-05
## 19532    1 48044 2.081425e-05
## 19533    1 48044 2.081425e-05
## 19534    1 48044 2.081425e-05
## 19535    1 48044 2.081425e-05
## 19536    1 48044 2.081425e-05
## 19537    1 48044 2.081425e-05
## 19538    1 48044 2.081425e-05
## 19539    1 48044 2.081425e-05
## 19540    1 48044 2.081425e-05
## 19541    1 48044 2.081425e-05
## 19542    1 48044 2.081425e-05
## 19543    1 48044 2.081425e-05
## 19544    1 48044 2.081425e-05
## 19545    1 48044 2.081425e-05
## 19546    1 48044 2.081425e-05
## 19547    1 48044 2.081425e-05
## 19548    1 48044 2.081425e-05
## 19549    1 48044 2.081425e-05
## 19550    1 48044 2.081425e-05
## 19551    1 48044 2.081425e-05
## 19552    1 48044 2.081425e-05
## 19553    1 48044 2.081425e-05
## 19554    1 48044 2.081425e-05
## 19555    1 48044 2.081425e-05
## 19556    1 48044 2.081425e-05
## 19557    1 48044 2.081425e-05
## 19558    1 48044 2.081425e-05
## 19559    1 48044 2.081425e-05
## 19560    1 48044 2.081425e-05
## 19561    1 48044 2.081425e-05
## 19562    1 48044 2.081425e-05
## 19563    1 48044 2.081425e-05
## 19564    1 48044 2.081425e-05
## 19565    1 48044 2.081425e-05
## 19566    1 48044 2.081425e-05
## 19567    1 48044 2.081425e-05
## 19568    1 48044 2.081425e-05
## 19569    1 48044 2.081425e-05
## 19570    1 48044 2.081425e-05
## 19571    1 48044 2.081425e-05
## 19572    1 48044 2.081425e-05
## 19573    1 48044 2.081425e-05
## 19574    1 48044 2.081425e-05
## 19575    1 48044 2.081425e-05
## 19576    1 48044 2.081425e-05
## 19577    1 48044 2.081425e-05
## 19578    1 48044 2.081425e-05
## 19579    1 48044 2.081425e-05
## 19580    1 48044 2.081425e-05
## 19581    1 48044 2.081425e-05
## 19582    1 48044 2.081425e-05
## 19583    1 48044 2.081425e-05
## 19584    1 48044 2.081425e-05
## 19585    1 48044 2.081425e-05
## 19586    1 48044 2.081425e-05
## 19587    1 48044 2.081425e-05
## 19588    1 48044 2.081425e-05
## 19589    1 48044 2.081425e-05
## 19590    1 48044 2.081425e-05
## 19591    1 48044 2.081425e-05
## 19592    1 48044 2.081425e-05
## 19593    1 48044 2.081425e-05
## 19594    1 48044 2.081425e-05
## 19595    1 48044 2.081425e-05
## 19596    1 48044 2.081425e-05
## 19597    1 48044 2.081425e-05
## 19598    1 48044 2.081425e-05
## 19599    1 48044 2.081425e-05
## 19600    1 48044 2.081425e-05
## 19601    1 48044 2.081425e-05
## 19602    1 48044 2.081425e-05
## 19603    1 48044 2.081425e-05
## 19604    1 48044 2.081425e-05
## 19605    1 48044 2.081425e-05
## 19606    1 48044 2.081425e-05
## 19607    1 48044 2.081425e-05
## 19608    1 48044 2.081425e-05
## 19609    1 48044 2.081425e-05
## 19610    1 48044 2.081425e-05
## 19611    1 48044 2.081425e-05
## 19612    1 48044 2.081425e-05
## 19613    1 48044 2.081425e-05
## 19614    1 48044 2.081425e-05
## 19615    1 48044 2.081425e-05
## 19616    1 48044 2.081425e-05
## 19617    1 48044 2.081425e-05
## 19618    1 48044 2.081425e-05
## 19619    1 48044 2.081425e-05
## 19620    1 48044 2.081425e-05
## 19621    1 48044 2.081425e-05
## 19622    1 48044 2.081425e-05
## 19623    1 48044 2.081425e-05
## 19624    1 48044 2.081425e-05
## 19625    1 48044 2.081425e-05
## 19626    1 48044 2.081425e-05
## 19627    1 48044 2.081425e-05
## 19628    1 48044 2.081425e-05
## 19629    1 48044 2.081425e-05
## 19630    1 48044 2.081425e-05
## 19631    1 48044 2.081425e-05
## 19632    1 48044 2.081425e-05
## 19633    1 48044 2.081425e-05
## 19634    1 48044 2.081425e-05
## 19635    1 48044 2.081425e-05
## 19636    1 48044 2.081425e-05
## 19637    1 48044 2.081425e-05
## 19638    1 48044 2.081425e-05
## 19639    1 48044 2.081425e-05
## 19640    1 48044 2.081425e-05
## 19641    1 48044 2.081425e-05
## 19642    1 48044 2.081425e-05
## 19643    1 48044 2.081425e-05
## 19644    1 48044 2.081425e-05
## 19645    1 48044 2.081425e-05
## 19646    1 48044 2.081425e-05
## 19647    1 48044 2.081425e-05
## 19648    1 48044 2.081425e-05
## 19649    1 48044 2.081425e-05
## 19650    1 48044 2.081425e-05
## 19651    1 48044 2.081425e-05
## 19652    1 48044 2.081425e-05
## 19653    1 48044 2.081425e-05
## 19654    1 48044 2.081425e-05
## 19655    1 48044 2.081425e-05
## 19656    1 48044 2.081425e-05
## 19657    1 48044 2.081425e-05
## 19658    1 48044 2.081425e-05
## 19659    1 48044 2.081425e-05
## 19660    1 48044 2.081425e-05
## 19661    1 48044 2.081425e-05
## 19662    1 48044 2.081425e-05
## 19663    1 48044 2.081425e-05
## 19664    1 48044 2.081425e-05
## 19665    1 48044 2.081425e-05
## 19666    1 48044 2.081425e-05
## 19667    1 48044 2.081425e-05
## 19668    1 48044 2.081425e-05
## 19669    1 48044 2.081425e-05
## 19670    1 48044 2.081425e-05
## 19671    1 48044 2.081425e-05
## 19672    1 48044 2.081425e-05
## 19673    1 48044 2.081425e-05
## 19674    1 48044 2.081425e-05
## 19675    1 48044 2.081425e-05
## 19676    1 48044 2.081425e-05
## 19677    1 48044 2.081425e-05
## 19678    1 48044 2.081425e-05
## 19679    1 48044 2.081425e-05
## 19680    1 48044 2.081425e-05
## 19681    1 48044 2.081425e-05
## 19682    1 48044 2.081425e-05
## 19683    1 48044 2.081425e-05
## 19684    1 48044 2.081425e-05
## 19685    1 48044 2.081425e-05
## 19686    1 48044 2.081425e-05
## 19687    1 48044 2.081425e-05
## 19688    1 48044 2.081425e-05
## 19689    1 48044 2.081425e-05
## 19690    1 48044 2.081425e-05
## 19691    1 48044 2.081425e-05
## 19692    1 48044 2.081425e-05
## 19693    1 48044 2.081425e-05
## 19694    1 48044 2.081425e-05
## 19695    1 48044 2.081425e-05
## 19696    1 48044 2.081425e-05
## 19697    1 48044 2.081425e-05
## 19698    1 48044 2.081425e-05
## 19699    1 48044 2.081425e-05
## 19700    1 48044 2.081425e-05
## 19701    1 48044 2.081425e-05
## 19702    1 48044 2.081425e-05
## 19703    1 48044 2.081425e-05
## 19704    1 48044 2.081425e-05
## 19705    1 48044 2.081425e-05
## 19706    1 48044 2.081425e-05
## 19707    1 48044 2.081425e-05
## 19708    1 48044 2.081425e-05
## 19709    1 48044 2.081425e-05
## 19710    1 48044 2.081425e-05
## 19711    1 48044 2.081425e-05
## 19712    1 48044 2.081425e-05
## 19713    1 48044 2.081425e-05
## 19714    1 48044 2.081425e-05
## 19715    1 48044 2.081425e-05
## 19716    1 48044 2.081425e-05
## 19717    1 48044 2.081425e-05
## 19718    1 48044 2.081425e-05
## 19719    1 48044 2.081425e-05
## 19720    1 48044 2.081425e-05
## 19721    1 48044 2.081425e-05
## 19722    1 48044 2.081425e-05
## 19723    1 48044 2.081425e-05
## 19724    1 48044 2.081425e-05
## 19725    1 48044 2.081425e-05
## 19726    1 48044 2.081425e-05
## 19727    1 48044 2.081425e-05
## 19728    1 48044 2.081425e-05
## 19729    1 48044 2.081425e-05
## 19730    1 48044 2.081425e-05
## 19731    1 48044 2.081425e-05
## 19732    1 48044 2.081425e-05
## 19733    1 48044 2.081425e-05
## 19734    1 48044 2.081425e-05
## 19735    1 48044 2.081425e-05
## 19736    1 48044 2.081425e-05
## 19737    1 48044 2.081425e-05
## 19738    1 48044 2.081425e-05
## 19739    1 48044 2.081425e-05
## 19740    1 48044 2.081425e-05
## 19741    1 48044 2.081425e-05
## 19742    1 48044 2.081425e-05
## 19743    1 48044 2.081425e-05
## 19744    1 48044 2.081425e-05
## 19745    1 48044 2.081425e-05
## 19746    1 48044 2.081425e-05
## 19747    1 48044 2.081425e-05
## 19748    1 48044 2.081425e-05
## 19749    1 48044 2.081425e-05
## 19750    1 48044 2.081425e-05
## 19751    1 48044 2.081425e-05
## 19752    1 48044 2.081425e-05
## 19753    1 48044 2.081425e-05
## 19754    1 48044 2.081425e-05
## 19755    1 48044 2.081425e-05
## 19756    1 48044 2.081425e-05
## 19757    1 48044 2.081425e-05
## 19758    1 48044 2.081425e-05
## 19759    1 48044 2.081425e-05
## 19760    1 48044 2.081425e-05
## 19761    1 48044 2.081425e-05
## 19762    1 48044 2.081425e-05
## 19763    1 48044 2.081425e-05
## 19764    1 48044 2.081425e-05
## 19765    1 48044 2.081425e-05
## 19766    1 48044 2.081425e-05
## 19767    1 48044 2.081425e-05
## 19768    1 48044 2.081425e-05
## 19769    1 48044 2.081425e-05
## 19770    1 48044 2.081425e-05
## 19771    1 48044 2.081425e-05
## 19772    1 48044 2.081425e-05
## 19773    1 48044 2.081425e-05
## 19774    1 48044 2.081425e-05
## 19775    1 48044 2.081425e-05
## 19776    1 48044 2.081425e-05
## 19777    1 48044 2.081425e-05
## 19778    1 48044 2.081425e-05
## 19779    1 48044 2.081425e-05
## 19780    1 48044 2.081425e-05
## 19781    1 48044 2.081425e-05
## 19782    1 48044 2.081425e-05
## 19783    1 48044 2.081425e-05
## 19784    1 48044 2.081425e-05
## 19785    1 48044 2.081425e-05
## 19786    1 48044 2.081425e-05
## 19787    1 48044 2.081425e-05
## 19788    1 48044 2.081425e-05
## 19789    1 48044 2.081425e-05
## 19790    1 48044 2.081425e-05
## 19791    1 48044 2.081425e-05
## 19792    1 48044 2.081425e-05
## 19793    1 48044 2.081425e-05
## 19794    1 48044 2.081425e-05
## 19795    1 48044 2.081425e-05
## 19796    1 48044 2.081425e-05
## 19797    1 48044 2.081425e-05
## 19798    1 48044 2.081425e-05
## 19799    1 48044 2.081425e-05
## 19800    1 48044 2.081425e-05
## 19801    1 48044 2.081425e-05
## 19802    1 48044 2.081425e-05
## 19803    1 48044 2.081425e-05
## 19804    1 48044 2.081425e-05
## 19805    1 48044 2.081425e-05
## 19806    1 48044 2.081425e-05
## 19807    1 48044 2.081425e-05
## 19808    1 48044 2.081425e-05
## 19809    1 48044 2.081425e-05
## 19810    1 48044 2.081425e-05
## 19811    1 48044 2.081425e-05
## 19812    1 48044 2.081425e-05
## 19813    1 48044 2.081425e-05
## 19814    1 48044 2.081425e-05
## 19815    1 48044 2.081425e-05
## 19816    1 48044 2.081425e-05
## 19817    1 48044 2.081425e-05
## 19818    1 48044 2.081425e-05
## 19819    1 48044 2.081425e-05
## 19820    1 48044 2.081425e-05
## 19821    1 48044 2.081425e-05
## 19822    1 48044 2.081425e-05
## 19823    1 48044 2.081425e-05
## 19824    1 48044 2.081425e-05
## 19825    1 48044 2.081425e-05
## 19826    1 48044 2.081425e-05
## 19827    1 48044 2.081425e-05
## 19828    1 48044 2.081425e-05
## 19829    1 48044 2.081425e-05
## 19830    1 48044 2.081425e-05
## 19831    1 48044 2.081425e-05
## 19832    1 48044 2.081425e-05
## 19833    1 48044 2.081425e-05
## 19834    1 48044 2.081425e-05
## 19835    1 48044 2.081425e-05
## 19836    1 48044 2.081425e-05
## 19837    1 48044 2.081425e-05
## 19838    1 48044 2.081425e-05
## 19839    1 48044 2.081425e-05
## 19840    1 48044 2.081425e-05
## 19841    1 48044 2.081425e-05
## 19842    1 48044 2.081425e-05
## 19843    1 48044 2.081425e-05
## 19844    1 48044 2.081425e-05
## 19845    1 48044 2.081425e-05
## 19846    1 48044 2.081425e-05
## 19847    1 48044 2.081425e-05
## 19848    1 48044 2.081425e-05
## 19849    1 48044 2.081425e-05
## 19850    1 48044 2.081425e-05
## 19851    1 48044 2.081425e-05
## 19852    1 48044 2.081425e-05
## 19853    1 48044 2.081425e-05
## 19854    1 48044 2.081425e-05
## 19855    1 48044 2.081425e-05
## 19856    1 48044 2.081425e-05
## 19857    1 48044 2.081425e-05
## 19858    1 48044 2.081425e-05
## 19859    1 48044 2.081425e-05
## 19860    1 48044 2.081425e-05
## 19861    1 48044 2.081425e-05
## 19862    1 48044 2.081425e-05
## 19863    1 48044 2.081425e-05
## 19864    1 48044 2.081425e-05
## 19865    1 48044 2.081425e-05
## 19866    1 48044 2.081425e-05
## 19867    1 48044 2.081425e-05
## 19868    1 48044 2.081425e-05
## 19869    1 48044 2.081425e-05
## 19870    1 48044 2.081425e-05
## 19871    1 48044 2.081425e-05
## 19872    1 48044 2.081425e-05
## 19873    1 48044 2.081425e-05
## 19874    1 48044 2.081425e-05
## 19875    1 48044 2.081425e-05
## 19876    1 48044 2.081425e-05
## 19877    1 48044 2.081425e-05
## 19878    1 48044 2.081425e-05
## 19879    1 48044 2.081425e-05
## 19880    1 48044 2.081425e-05
## 19881    1 48044 2.081425e-05
## 19882    1 48044 2.081425e-05
## 19883    1 48044 2.081425e-05
## 19884    1 48044 2.081425e-05
## 19885    1 48044 2.081425e-05
## 19886    1 48044 2.081425e-05
## 19887    1 48044 2.081425e-05
## 19888    1 48044 2.081425e-05
## 19889    1 48044 2.081425e-05
## 19890    1 48044 2.081425e-05
## 19891    1 48044 2.081425e-05
## 19892    1 48044 2.081425e-05
## 19893    1 48044 2.081425e-05
## 19894    1 48044 2.081425e-05
## 19895    1 48044 2.081425e-05
## 19896    1 48044 2.081425e-05
## 19897    1 48044 2.081425e-05
## 19898    1 48044 2.081425e-05
## 19899    1 48044 2.081425e-05
## 19900    1 48044 2.081425e-05
## 19901    1 48044 2.081425e-05
## 19902    1 48044 2.081425e-05
## 19903    1 48044 2.081425e-05
## 19904    1 48044 2.081425e-05
## 19905    1 48044 2.081425e-05
## 19906    1 48044 2.081425e-05
## 19907    1 48044 2.081425e-05
## 19908    1 48044 2.081425e-05
## 19909    1 48044 2.081425e-05
## 19910    1 48044 2.081425e-05
## 19911    1 48044 2.081425e-05
## 19912    1 48044 2.081425e-05
## 19913    1 48044 2.081425e-05
## 19914    1 48044 2.081425e-05
## 19915    1 48044 2.081425e-05
## 19916    1 48044 2.081425e-05
## 19917    1 48044 2.081425e-05
## 19918    1 48044 2.081425e-05
## 19919    1 48044 2.081425e-05
## 19920    1 48044 2.081425e-05
## 19921    1 48044 2.081425e-05
## 19922    1 48044 2.081425e-05
## 19923    1 48044 2.081425e-05
## 19924    1 48044 2.081425e-05
## 19925    1 48044 2.081425e-05
## 19926    1 48044 2.081425e-05
## 19927    1 48044 2.081425e-05
## 19928    1 48044 2.081425e-05
## 19929    1 48044 2.081425e-05
## 19930    1 48044 2.081425e-05
## 19931    1 48044 2.081425e-05
## 19932    1 48044 2.081425e-05
## 19933    1 48044 2.081425e-05
## 19934    1 48044 2.081425e-05
## 19935    1 48044 2.081425e-05
## 19936    1 48044 2.081425e-05
## 19937    1 48044 2.081425e-05
## 19938    1 48044 2.081425e-05
## 19939    1 48044 2.081425e-05
## 19940    1 48044 2.081425e-05
## 19941    1 48044 2.081425e-05
## 19942    1 48044 2.081425e-05
## 19943    1 48044 2.081425e-05
## 19944    1 48044 2.081425e-05
## 19945    1 48044 2.081425e-05
## 19946    1 48044 2.081425e-05
## 19947    1 48044 2.081425e-05
## 19948    1 48044 2.081425e-05
## 19949    1 48044 2.081425e-05
## 19950    1 48044 2.081425e-05
## 19951    1 48044 2.081425e-05
## 19952    1 48044 2.081425e-05
## 19953    1 48044 2.081425e-05
## 19954    1 48044 2.081425e-05
## 19955    1 48044 2.081425e-05
## 19956    1 48044 2.081425e-05
## 19957    1 48044 2.081425e-05
## 19958    1 48044 2.081425e-05
## 19959    1 48044 2.081425e-05
## 19960    1 48044 2.081425e-05
## 19961    1 48044 2.081425e-05
## 19962    1 48044 2.081425e-05
## 19963    1 48044 2.081425e-05
## 19964    1 48044 2.081425e-05
## 19965    1 48044 2.081425e-05
## 19966    1 48044 2.081425e-05
## 19967    1 48044 2.081425e-05
## 19968    1 48044 2.081425e-05
## 19969    1 48044 2.081425e-05
## 19970    1 48044 2.081425e-05
## 19971    1 48044 2.081425e-05
## 19972    1 48044 2.081425e-05
## 19973    1 48044 2.081425e-05
## 19974    1 48044 2.081425e-05
## 19975    1 48044 2.081425e-05
## 19976    1 48044 2.081425e-05
## 19977    1 48044 2.081425e-05
## 19978    1 48044 2.081425e-05
## 19979    1 48044 2.081425e-05
## 19980    1 48044 2.081425e-05
## 19981    1 48044 2.081425e-05
## 19982    1 48044 2.081425e-05
## 19983    1 48044 2.081425e-05
## 19984    1 48044 2.081425e-05
## 19985    1 48044 2.081425e-05
## 19986    1 48044 2.081425e-05
## 19987    1 48044 2.081425e-05
## 19988    1 48044 2.081425e-05
## 19989    1 48044 2.081425e-05
## 19990    1 48044 2.081425e-05
## 19991    1 48044 2.081425e-05
## 19992    1 48044 2.081425e-05
## 19993    1 48044 2.081425e-05
## 19994    1 48044 2.081425e-05
## 19995    1 48044 2.081425e-05
## 19996    1 48044 2.081425e-05
## 19997    1 48044 2.081425e-05
## 19998    1 48044 2.081425e-05
## 19999    1 48044 2.081425e-05
##  [ reached 'max' / getOption("max.print") -- omitted 15291 rows ]

Let’s look at percentage of words compared to the whole for US.

library(tidyr)

frequencyUS2 <- frequencyUS %>%
  select(year, word, freq) %>%
  pivot_wider(names_from = year, values_from = freq) %>%
  arrange('y2020', 'y2021', 'y2022')

head(frequencyUS2)
## # A tibble: 6 × 4
##   word       y2021    y2020   y2022
##   <chr>      <dbl>    <dbl>   <dbl>
## 1 covid19  0.0582  0.0543   0.0462 
## 2 #covid19 0.00536 0.00583  0.0161 
## 3 vaccine  0.00977 0.000494 0.00426
## 4 covid    0.00758 0.00901  0.00855
## 5 people   0.00690 0.00648  0.00598
## 6 testing  0.00149 0.00192  0.00624

Let’s look at frequencies for GB.

library(tidyr)

frequencyGB2 <- frequencyGB %>%
  select(year, word, freq) %>%
  pivot_wider(names_from = year, values_from = freq) %>%
  arrange('y2020', 'y2021', 'y2022')

head(frequencyGB2)
## # A tibble: 6 × 4
##   word        y2020   y2021   y2022
##   <chr>       <dbl>   <dbl>   <dbl>
## 1 covid19  0.0412   0.0485  0.0343 
## 2 #covid19 0.0127   0.00834 0.0231 
## 3 covid    0.0114   0.0121  0.0117 
## 4 people   0.00772  0.00764 0.00713
## 5 vaccine  0.000457 0.00724 0.00496
## 6 uk       0.00520  0.00628 0.00363

Let’s look at frequencies for Canada.

library(tidyr)

frequencyCA2 <- frequencyCA %>%
  select(year, word, freq) %>%
  pivot_wider(names_from = year, values_from = freq) %>%
  arrange('y2020', 'y2021', 'y2022')

head(frequencyCA2)
## # A tibble: 6 × 4
##   word       y2020   y2021    y2022
##   <chr>      <dbl>   <dbl>    <dbl>
## 1 covid19  0.0447  0.0464  0.0372  
## 2 stigma   0.0114  0.00997 0.000477
## 3 #covid19 0.00905 0.00497 0.0150  
## 4 health   0.00891 0.0122  0.00501 
## 5 fighting 0.00824 0.00924 0.000537
## 6 de       0.00774 0.00793 0.00656

Load libraries

library(scales)

Let’s plot the US data.

ggplot(frequencyUS2, aes(2020, 2022)) +
  geom_jitter(alpha = 0.05, size = 2.5, width = 0.25, height = 0.25) +
  geom_text(aes(label = word), check_overlap = TRUE, vjust = 1.5) +
  scale_x_log10(labels = percent_format()) +
  scale_y_log10(labels = percent_format()) +
  geom_abline(color = "red")

Let’s load the required libraries.

library(dplyr)
library(stringr)
library(tidytext)
library(textdata)

Let’s load the data.

bing <- get_sentiments("bing")

bing
## # A tibble: 6,786 × 2
##    word        sentiment
##    <chr>       <chr>    
##  1 2-faces     negative 
##  2 abnormal    negative 
##  3 abolish     negative 
##  4 abominable  negative 
##  5 abominably  negative 
##  6 abominate   negative 
##  7 abomination negative 
##  8 abort       negative 
##  9 aborted     negative 
## 10 aborts      negative 
## # … with 6,776 more rows
nrc <- nrc

nrc
##           X              word    sentiment
## 1         1            abacus        trust
## 2         2           abandon         fear
## 3         3           abandon     negative
## 4         4           abandon      sadness
## 5         5         abandoned        anger
## 6         6         abandoned         fear
## 7         7         abandoned     negative
## 8         8         abandoned      sadness
## 9         9       abandonment        anger
## 10       10       abandonment         fear
## 11       11       abandonment     negative
## 12       12       abandonment      sadness
## 13       13       abandonment     surprise
## 14       14              abba     positive
## 15       15             abbot        trust
## 16       16         abduction         fear
## 17       17         abduction     negative
## 18       18         abduction      sadness
## 19       19         abduction     surprise
## 20       20          aberrant     negative
## 21       21        aberration      disgust
## 22       22        aberration     negative
## 23       23             abhor        anger
## 24       24             abhor      disgust
## 25       25             abhor         fear
## 26       26             abhor     negative
## 27       27         abhorrent        anger
## 28       28         abhorrent      disgust
## 29       29         abhorrent         fear
## 30       30         abhorrent     negative
## 31       31           ability     positive
## 32       32            abject      disgust
## 33       33            abject     negative
## 34       34          abnormal      disgust
## 35       35          abnormal     negative
## 36       36           abolish        anger
## 37       37           abolish     negative
## 38       38         abolition     negative
## 39       39        abominable      disgust
## 40       40        abominable         fear
## 41       41        abominable     negative
## 42       42       abomination        anger
## 43       43       abomination      disgust
## 44       44       abomination         fear
## 45       45       abomination     negative
## 46       46             abort     negative
## 47       47          abortion      disgust
## 48       48          abortion         fear
## 49       49          abortion     negative
## 50       50          abortion      sadness
## 51       51          abortive     negative
## 52       52          abortive      sadness
## 53       53    abovementioned     positive
## 54       54          abrasion     negative
## 55       55          abrogate     negative
## 56       56            abrupt     surprise
## 57       57           abscess     negative
## 58       58           abscess      sadness
## 59       59           absence         fear
## 60       60           absence     negative
## 61       61           absence      sadness
## 62       62            absent     negative
## 63       63            absent      sadness
## 64       64          absentee     negative
## 65       65          absentee      sadness
## 66       66       absenteeism     negative
## 67       67          absolute     positive
## 68       68        absolution          joy
## 69       69        absolution     positive
## 70       70        absolution        trust
## 71       71          absorbed     positive
## 72       72            absurd     negative
## 73       73         absurdity     negative
## 74       74         abundance anticipation
## 75       75         abundance      disgust
## 76       76         abundance          joy
## 77       77         abundance     negative
## 78       78         abundance     positive
## 79       79         abundance        trust
## 80       80          abundant          joy
## 81       81          abundant     positive
## 82       82             abuse        anger
## 83       83             abuse      disgust
## 84       84             abuse         fear
## 85       85             abuse     negative
## 86       86             abuse      sadness
## 87       87           abysmal     negative
## 88       88           abysmal      sadness
## 89       89             abyss         fear
## 90       90             abyss     negative
## 91       91             abyss      sadness
## 92       92          academic     positive
## 93       93          academic        trust
## 94       94           academy     positive
## 95       95        accelerate anticipation
## 96       96        acceptable     positive
## 97       97        acceptance     positive
## 98       98        accessible     positive
## 99       99          accident         fear
## 100     100          accident     negative
## 101     101          accident      sadness
## 102     102          accident     surprise
## 103     103        accidental         fear
## 104     104        accidental     negative
## 105     105        accidental     surprise
## 106     106      accidentally     surprise
## 107     107          accolade anticipation
## 108     108          accolade          joy
## 109     109          accolade     positive
## 110     110          accolade     surprise
## 111     111          accolade        trust
## 112     112     accommodation     positive
## 113     113     accompaniment anticipation
## 114     114     accompaniment          joy
## 115     115     accompaniment     positive
## 116     116     accompaniment        trust
## 117     117        accomplish          joy
## 118     118        accomplish     positive
## 119     119      accomplished          joy
## 120     120      accomplished     positive
## 121     121    accomplishment     positive
## 122     122            accord     positive
## 123     123            accord        trust
## 124     124           account        trust
## 125     125    accountability     positive
## 126     126    accountability        trust
## 127     127       accountable     positive
## 128     128       accountable        trust
## 129     129        accountant        trust
## 130     130          accounts        trust
## 131     131        accredited     positive
## 132     132        accredited        trust
## 133     133           accueil     positive
## 134     134          accurate     positive
## 135     135          accurate        trust
## 136     136          accursed        anger
## 137     137          accursed         fear
## 138     138          accursed     negative
## 139     139          accursed      sadness
## 140     140        accusation        anger
## 141     141        accusation      disgust
## 142     142        accusation     negative
## 143     143        accusative     negative
## 144     144           accused        anger
## 145     145           accused         fear
## 146     146           accused     negative
## 147     147           accuser        anger
## 148     148           accuser         fear
## 149     149           accuser     negative
## 150     150          accusing        anger
## 151     151          accusing         fear
## 152     152          accusing     negative
## 153     153               ace     positive
## 154     154              ache     negative
## 155     155              ache      sadness
## 156     156           achieve          joy
## 157     157           achieve     positive
## 158     158           achieve        trust
## 159     159       achievement anticipation
## 160     160       achievement          joy
## 161     161       achievement     positive
## 162     162       achievement        trust
## 163     163            aching     negative
## 164     164            aching      sadness
## 165     165              acid     negative
## 166     166    acknowledgment     positive
## 167     167           acquire     positive
## 168     168         acquiring anticipation
## 169     169         acquiring     positive
## 170     170           acrobat         fear
## 171     171           acrobat          joy
## 172     172           acrobat     positive
## 173     173           acrobat        trust
## 174     174            action     positive
## 175     175        actionable        anger
## 176     176        actionable      disgust
## 177     177        actionable     negative
## 178     178            actual     positive
## 179     179            acuity     positive
## 180     180            acumen     positive
## 181     181             adapt     positive
## 182     182         adaptable     positive
## 183     183             adder        anger
## 184     184             adder      disgust
## 185     185             adder         fear
## 186     186             adder     negative
## 187     187             adder      sadness
## 188     188         addiction     negative
## 189     189         addresses anticipation
## 190     190         addresses     positive
## 191     191             adept     positive
## 192     192          adequacy     positive
## 193     193          adhering        trust
## 194     194           adipose     negative
## 195     195        adjudicate         fear
## 196     196        adjudicate     negative
## 197     197           adjunct     positive
## 198     198    administrative        trust
## 199     199         admirable          joy
## 200     200         admirable     positive
## 201     201         admirable        trust
## 202     202           admiral     positive
## 203     203           admiral        trust
## 204     204        admiration          joy
## 205     205        admiration     positive
## 206     206        admiration        trust
## 207     207            admire     positive
## 208     208            admire        trust
## 209     209           admirer     positive
## 210     210        admissible     positive
## 211     211        admissible        trust
## 212     212        admonition         fear
## 213     213        admonition     negative
## 214     214          adorable          joy
## 215     215          adorable     positive
## 216     216         adoration          joy
## 217     217         adoration     positive
## 218     218         adoration        trust
## 219     219             adore anticipation
## 220     220             adore          joy
## 221     221             adore     positive
## 222     222             adore        trust
## 223     223            adrift anticipation
## 224     224            adrift         fear
## 225     225            adrift     negative
## 226     226            adrift      sadness
## 227     227       adulterated     negative
## 228     228          adultery      disgust
## 229     229          adultery     negative
## 230     230          adultery      sadness
## 231     231           advance anticipation
## 232     232           advance         fear
## 233     233           advance          joy
## 234     234           advance     positive
## 235     235           advance     surprise
## 236     236          advanced     positive
## 237     237       advancement     positive
## 238     238         advantage     positive
## 239     239      advantageous     positive
## 240     240            advent anticipation
## 241     241            advent          joy
## 242     242            advent     positive
## 243     243            advent        trust
## 244     244         adventure anticipation
## 245     245         adventure     positive
## 246     246       adventurous     positive
## 247     247         adversary        anger
## 248     248         adversary     negative
## 249     249           adverse        anger
## 250     250           adverse      disgust
## 251     251           adverse         fear
## 252     252           adverse     negative
## 253     253           adverse      sadness
## 254     254         adversity        anger
## 255     255         adversity         fear
## 256     256         adversity     negative
## 257     257         adversity      sadness
## 258     258            advice        trust
## 259     259         advisable     positive
## 260     260         advisable        trust
## 261     261            advise     positive
## 262     262            advise        trust
## 263     263           advised        trust
## 264     264           adviser     positive
## 265     265           adviser        trust
## 266     266          advocacy        anger
## 267     267          advocacy anticipation
## 268     268          advocacy          joy
## 269     269          advocacy     positive
## 270     270          advocacy        trust
## 271     271          advocate        trust
## 272     272         aesthetic     positive
## 273     273        aesthetics          joy
## 274     274        aesthetics     positive
## 275     275           affable     positive
## 276     276         affection          joy
## 277     277         affection     positive
## 278     278         affection        trust
## 279     279        affiliated     positive
## 280     280            affirm     positive
## 281     281            affirm        trust
## 282     282       affirmation     positive
## 283     283       affirmative     positive
## 284     284     affirmatively     positive
## 285     285     affirmatively        trust
## 286     286           afflict         fear
## 287     287           afflict     negative
## 288     288           afflict      sadness
## 289     289         afflicted     negative
## 290     290        affliction      disgust
## 291     291        affliction         fear
## 292     292        affliction     negative
## 293     293        affliction      sadness
## 294     294         affluence          joy
## 295     295         affluence     positive
## 296     296          affluent     positive
## 297     297            afford     positive
## 298     298           affront        anger
## 299     299           affront      disgust
## 300     300           affront         fear
## 301     301           affront     negative
## 302     302           affront      sadness
## 303     303           affront     surprise
## 304     304            afraid         fear
## 305     305            afraid     negative
## 306     306         aftermath        anger
## 307     307         aftermath      disgust
## 308     308         aftermath         fear
## 309     309         aftermath     negative
## 310     310         aftermath      sadness
## 311     311        aftertaste     negative
## 312     312               aga         fear
## 313     313               aga     positive
## 314     314               aga        trust
## 315     315        aggravated        anger
## 316     316        aggravated     negative
## 317     317       aggravating        anger
## 318     318       aggravating     negative
## 319     319       aggravating      sadness
## 320     320       aggravation        anger
## 321     321       aggravation      disgust
## 322     322       aggravation     negative
## 323     323        aggression        anger
## 324     324        aggression         fear
## 325     325        aggression     negative
## 326     326        aggressive        anger
## 327     327        aggressive         fear
## 328     328        aggressive     negative
## 329     329         aggressor        anger
## 330     330         aggressor         fear
## 331     331         aggressor     negative
## 332     332            aghast      disgust
## 333     333            aghast         fear
## 334     334            aghast     negative
## 335     335            aghast     surprise
## 336     336             agile     positive
## 337     337           agility     positive
## 338     338          agitated        anger
## 339     339          agitated     negative
## 340     340         agitation        anger
## 341     341         agitation     negative
## 342     342         agonizing         fear
## 343     343         agonizing     negative
## 344     344             agony        anger
## 345     345             agony         fear
## 346     346             agony     negative
## 347     347             agony      sadness
## 348     348             agree     positive
## 349     349         agreeable     positive
## 350     350         agreeable        trust
## 351     351            agreed     positive
## 352     352            agreed        trust
## 353     353          agreeing     positive
## 354     354          agreeing        trust
## 355     355         agreement     positive
## 356     356         agreement        trust
## 357     357       agriculture     positive
## 358     358           aground     negative
## 359     359             ahead     positive
## 360     360               aid     positive
## 361     361            aiding     positive
## 362     362               ail     negative
## 363     363               ail      sadness
## 364     364            ailing         fear
## 365     365            ailing     negative
## 366     366            ailing      sadness
## 367     367           aimless     negative
## 368     368           airport anticipation
## 369     369              airs      disgust
## 370     370              airs     negative
## 371     371              akin        trust
## 372     372         alabaster     positive
## 373     373             alarm         fear
## 374     374             alarm     negative
## 375     375             alarm     surprise
## 376     376          alarming         fear
## 377     377          alarming     negative
## 378     378          alarming     surprise
## 379     379               alb        trust
## 380     380        alcoholism        anger
## 381     381        alcoholism      disgust
## 382     382        alcoholism         fear
## 383     383        alcoholism     negative
## 384     384        alcoholism      sadness
## 385     385         alertness anticipation
## 386     386         alertness         fear
## 387     387         alertness     positive
## 388     388         alertness     surprise
## 389     389            alerts anticipation
## 390     390            alerts         fear
## 391     391            alerts     surprise
## 392     392             alien      disgust
## 393     393             alien         fear
## 394     394             alien     negative
## 395     395          alienate        anger
## 396     396          alienate      disgust
## 397     397          alienate     negative
## 398     398         alienated     negative
## 399     399         alienated      sadness
## 400     400        alienation        anger
## 401     401        alienation      disgust
## 402     402        alienation         fear
## 403     403        alienation     negative
## 404     404        alienation      sadness
## 405     405      alimentation     positive
## 406     406           alimony     negative
## 407     407             alive anticipation
## 408     408             alive          joy
## 409     409             alive     positive
## 410     410             alive        trust
## 411     411             allay     positive
## 412     412        allegation        anger
## 413     413        allegation     negative
## 414     414            allege     negative
## 415     415        allegiance     positive
## 416     416        allegiance        trust
## 417     417           allegro     positive
## 418     418         alleviate     positive
## 419     419       alleviation     positive
## 420     420          alliance        trust
## 421     421            allied     positive
## 422     422            allied        trust
## 423     423         allowable     positive
## 424     424            allure anticipation
## 425     425            allure          joy
## 426     426            allure     positive
## 427     427            allure     surprise
## 428     428          alluring     positive
## 429     429              ally     positive
## 430     430              ally        trust
## 431     431          almighty     positive
## 432     432             aloha anticipation
## 433     433             aloha          joy
## 434     434             aloha     positive
## 435     435             aloof     negative
## 436     436       altercation        anger
## 437     437       altercation     negative
## 438     438             amaze     surprise
## 439     439         amazingly          joy
## 440     440         amazingly     positive
## 441     441         amazingly     surprise
## 442     442        ambassador     positive
## 443     443        ambassador        trust
## 444     444         ambiguous     negative
## 445     445          ambition anticipation
## 446     446          ambition          joy
## 447     447          ambition     positive
## 448     448          ambition        trust
## 449     449         ambulance         fear
## 450     450         ambulance        trust
## 451     451            ambush        anger
## 452     452            ambush         fear
## 453     453            ambush     negative
## 454     454            ambush     surprise
## 455     455        ameliorate     positive
## 456     456              amen          joy
## 457     457              amen     positive
## 458     458              amen        trust
## 459     459          amenable     positive
## 460     460             amend     positive
## 461     461            amends     positive
## 462     462           amenity     positive
## 463     463           amiable     positive
## 464     464          amicable          joy
## 465     465          amicable     positive
## 466     466           ammonia      disgust
## 467     467           amnesia     negative
## 468     468           amnesty          joy
## 469     469           amnesty     positive
## 470     470      amortization        trust
## 471     471             amour anticipation
## 472     472             amour          joy
## 473     473             amour     positive
## 474     474             amour        trust
## 475     475      amphetamines      disgust
## 476     476      amphetamines     negative
## 477     477             amuse          joy
## 478     478             amuse     positive
## 479     479            amused          joy
## 480     480            amused     positive
## 481     481         amusement          joy
## 482     482         amusement     positive
## 483     483           amusing          joy
## 484     484           amusing     positive
## 485     485          anaconda      disgust
## 486     486          anaconda         fear
## 487     487          anaconda     negative
## 488     488              anal     negative
## 489     489           analyst anticipation
## 490     490           analyst     positive
## 491     491           analyst        trust
## 492     492         anarchism        anger
## 493     493         anarchism         fear
## 494     494         anarchism     negative
## 495     495         anarchist        anger
## 496     496         anarchist         fear
## 497     497         anarchist     negative
## 498     498           anarchy        anger
## 499     499           anarchy         fear
## 500     500           anarchy     negative
## 501     501          anathema        anger
## 502     502          anathema      disgust
## 503     503          anathema         fear
## 504     504          anathema     negative
## 505     505          anathema      sadness
## 506     506         ancestral        trust
## 507     507            anchor     positive
## 508     508         anchorage     positive
## 509     509         anchorage      sadness
## 510     510           ancient     negative
## 511     511             angel anticipation
## 512     512             angel          joy
## 513     513             angel     positive
## 514     514             angel     surprise
## 515     515             angel        trust
## 516     516           angelic          joy
## 517     517           angelic     positive
## 518     518           angelic        trust
## 519     519             anger        anger
## 520     520             anger     negative
## 521     521            angina         fear
## 522     522            angina     negative
## 523     523           angling anticipation
## 524     524           angling     negative
## 525     525             angry        anger
## 526     526             angry      disgust
## 527     527             angry     negative
## 528     528           anguish        anger
## 529     529           anguish         fear
## 530     530           anguish     negative
## 531     531           anguish      sadness
## 532     532           animate     positive
## 533     533          animated          joy
## 534     534          animated     positive
## 535     535         animosity        anger
## 536     536         animosity      disgust
## 537     537         animosity         fear
## 538     538         animosity     negative
## 539     539         animosity      sadness
## 540     540            animus        anger
## 541     541            animus     negative
## 542     542        annihilate        anger
## 543     543        annihilate         fear
## 544     544        annihilate     negative
## 545     545       annihilated        anger
## 546     546       annihilated         fear
## 547     547       annihilated     negative
## 548     548       annihilated      sadness
## 549     549      annihilation        anger
## 550     550      annihilation         fear
## 551     551      annihilation     negative
## 552     552      annihilation      sadness
## 553     553      announcement anticipation
## 554     554             annoy        anger
## 555     555             annoy      disgust
## 556     556             annoy     negative
## 557     557         annoyance        anger
## 558     558         annoyance      disgust
## 559     559         annoyance     negative
## 560     560          annoying        anger
## 561     561          annoying     negative
## 562     562             annul     negative
## 563     563         annulment     negative
## 564     564         annulment      sadness
## 565     565           anomaly         fear
## 566     566           anomaly     negative
## 567     567           anomaly     surprise
## 568     568         anonymous     negative
## 569     569        answerable        trust
## 570     570        antagonism        anger
## 571     571        antagonism     negative
## 572     572        antagonist        anger
## 573     573        antagonist     negative
## 574     574      antagonistic        anger
## 575     575      antagonistic      disgust
## 576     576      antagonistic     negative
## 577     577           anthrax      disgust
## 578     578           anthrax         fear
## 579     579           anthrax     negative
## 580     580           anthrax      sadness
## 581     581       antibiotics     positive
## 582     582        antichrist        anger
## 583     583        antichrist      disgust
## 584     584        antichrist         fear
## 585     585        antichrist     negative
## 586     586      anticipation anticipation
## 587     587      anticipatory anticipation
## 588     588          antidote anticipation
## 589     589          antidote     positive
## 590     590          antidote        trust
## 591     591        antifungal     positive
## 592     592        antifungal        trust
## 593     593         antipathy        anger
## 594     594         antipathy      disgust
## 595     595         antipathy     negative
## 596     596        antiquated     negative
## 597     597           antique     positive
## 598     598        antiseptic     positive
## 599     599        antiseptic        trust
## 600     600        antisocial        anger
## 601     601        antisocial      disgust
## 602     602        antisocial         fear
## 603     603        antisocial     negative
## 604     604        antisocial      sadness
## 605     605        antithesis        anger
## 606     606        antithesis     negative
## 607     607           anxiety        anger
## 608     608           anxiety anticipation
## 609     609           anxiety         fear
## 610     610           anxiety     negative
## 611     611           anxiety      sadness
## 612     612           anxious anticipation
## 613     613           anxious         fear
## 614     614           anxious     negative
## 615     615            apache         fear
## 616     616            apache     negative
## 617     617         apathetic     negative
## 618     618         apathetic      sadness
## 619     619            apathy     negative
## 620     620            apathy      sadness
## 621     621             aphid      disgust
## 622     622             aphid     negative
## 623     623            aplomb     positive
## 624     624        apologetic     positive
## 625     625        apologetic        trust
## 626     626         apologize     positive
## 627     627         apologize      sadness
## 628     628         apologize        trust
## 629     629           apology     positive
## 630     630           apostle     positive
## 631     631           apostle        trust
## 632     632         apostolic        trust
## 633     633         appalling      disgust
## 634     634         appalling         fear
## 635     635         appalling     negative
## 636     636        apparition         fear
## 637     637        apparition     surprise
## 638     638            appeal anticipation
## 639     639      appendicitis         fear
## 640     640      appendicitis     negative
## 641     641      appendicitis      sadness
## 642     642          applause          joy
## 643     643          applause     positive
## 644     644          applause     surprise
## 645     645          applause        trust
## 646     646         applicant anticipation
## 647     647      appreciation          joy
## 648     648      appreciation     positive
## 649     649      appreciation        trust
## 650     650         apprehend         fear
## 651     651      apprehension         fear
## 652     652      apprehension     negative
## 653     653      apprehensive anticipation
## 654     654      apprehensive         fear
## 655     655      apprehensive     negative
## 656     656        apprentice        trust
## 657     657       approaching anticipation
## 658     658       approbation     positive
## 659     659       approbation        trust
## 660     660     appropriation     negative
## 661     661          approval     positive
## 662     662           approve          joy
## 663     663           approve     positive
## 664     664           approve        trust
## 665     665         approving     positive
## 666     666               apt     positive
## 667     667          aptitude     positive
## 668     668           arbiter        trust
## 669     669       arbitration anticipation
## 670     670        arbitrator        trust
## 671     671       archaeology anticipation
## 672     672       archaeology     positive
## 673     673           archaic     negative
## 674     674      architecture        trust
## 675     675            ardent anticipation
## 676     676            ardent          joy
## 677     677            ardent     positive
## 678     678             ardor     positive
## 679     679           arduous     negative
## 680     680             argue        anger
## 681     681             argue     negative
## 682     682          argument        anger
## 683     683          argument     negative
## 684     684     argumentation        anger
## 685     685     argumentative     negative
## 686     686         arguments        anger
## 687     687              arid     negative
## 688     688              arid      sadness
## 689     689       aristocracy     positive
## 690     690      aristocratic     positive
## 691     691          armament        anger
## 692     692          armament         fear
## 693     693         armaments         fear
## 694     694         armaments     negative
## 695     695             armed        anger
## 696     696             armed         fear
## 697     697             armed     negative
## 698     698             armed     positive
## 699     699             armor         fear
## 700     700             armor     positive
## 701     701             armor        trust
## 702     702           armored         fear
## 703     703            armory        trust
## 704     704             aroma     positive
## 705     705            arouse anticipation
## 706     706            arouse     positive
## 707     707       arraignment        anger
## 708     708       arraignment         fear
## 709     709       arraignment     negative
## 710     710       arraignment      sadness
## 711     711             array     positive
## 712     712           arrears     negative
## 713     713            arrest     negative
## 714     714           arrival anticipation
## 715     715            arrive anticipation
## 716     716         arrogance     negative
## 717     717          arrogant        anger
## 718     718          arrogant      disgust
## 719     719          arrogant     negative
## 720     720           arsenic      disgust
## 721     721           arsenic         fear
## 722     722           arsenic     negative
## 723     723           arsenic      sadness
## 724     724             arson        anger
## 725     725             arson         fear
## 726     726             arson     negative
## 727     727               art anticipation
## 728     728               art          joy
## 729     729               art     positive
## 730     730               art      sadness
## 731     731               art     surprise
## 732     732        articulate     positive
## 733     733      articulation     positive
## 734     734         artillery         fear
## 735     735         artillery     negative
## 736     736           artisan     positive
## 737     737           artiste     positive
## 738     738          artistic     positive
## 739     739        ascendancy     positive
## 740     740            ascent     positive
## 741     741               ash     negative
## 742     742           ashamed      disgust
## 743     743           ashamed     negative
## 744     744           ashamed      sadness
## 745     745             ashes     negative
## 746     746             ashes      sadness
## 747     747               asp         fear
## 748     748        aspiration anticipation
## 749     749        aspiration          joy
## 750     750        aspiration     positive
## 751     751        aspiration     surprise
## 752     752        aspiration        trust
## 753     753            aspire anticipation
## 754     754            aspire          joy
## 755     755            aspire     positive
## 756     756          aspiring anticipation
## 757     757          aspiring          joy
## 758     758          aspiring     positive
## 759     759          aspiring        trust
## 760     760               ass     negative
## 761     761            assail        anger
## 762     762            assail         fear
## 763     763            assail     negative
## 764     764            assail     surprise
## 765     765         assailant        anger
## 766     766         assailant         fear
## 767     767         assailant     negative
## 768     768         assailant      sadness
## 769     769          assassin        anger
## 770     770          assassin         fear
## 771     771          assassin     negative
## 772     772          assassin      sadness
## 773     773       assassinate        anger
## 774     774       assassinate         fear
## 775     775       assassinate     negative
## 776     776     assassination        anger
## 777     777     assassination         fear
## 778     778     assassination     negative
## 779     779     assassination      sadness
## 780     780           assault        anger
## 781     781           assault         fear
## 782     782           assault     negative
## 783     783          assembly     positive
## 784     784          assembly        trust
## 785     785            assent     positive
## 786     786         asserting     positive
## 787     787         asserting        trust
## 788     788        assessment     surprise
## 789     789        assessment        trust
## 790     790          assessor        trust
## 791     791            assets     positive
## 792     792           asshole        anger
## 793     793           asshole      disgust
## 794     794           asshole     negative
## 795     795          assignee        trust
## 796     796            assist     positive
## 797     797            assist        trust
## 798     798        assistance     positive
## 799     799         associate     positive
## 800     800         associate        trust
## 801     801       association        trust
## 802     802           assuage     positive
## 803     803         assurance     positive
## 804     804         assurance        trust
## 805     805            assure        trust
## 806     806           assured     positive
## 807     807           assured        trust
## 808     808         assuredly        trust
## 809     809     astonishingly     positive
## 810     810     astonishingly     surprise
## 811     811      astonishment          joy
## 812     812      astonishment     positive
## 813     813      astonishment     surprise
## 814     814            astray         fear
## 815     815            astray     negative
## 816     816        astringent     negative
## 817     817        astrologer anticipation
## 818     818        astrologer     positive
## 819     819         astronaut     positive
## 820     820        astronomer anticipation
## 821     821        astronomer     positive
## 822     822            astute     positive
## 823     823            asylum         fear
## 824     824            asylum     negative
## 825     825         asymmetry      disgust
## 826     826           atheism     negative
## 827     827   atherosclerosis         fear
## 828     828   atherosclerosis     negative
## 829     829   atherosclerosis      sadness
## 830     830           athlete     positive
## 831     831          athletic     positive
## 832     832              atom     positive
## 833     833             atone anticipation
## 834     834             atone          joy
## 835     835             atone     positive
## 836     836             atone        trust
## 837     837         atonement     positive
## 838     838         atrocious        anger
## 839     839         atrocious      disgust
## 840     840         atrocious     negative
## 841     841          atrocity        anger
## 842     842          atrocity      disgust
## 843     843          atrocity         fear
## 844     844          atrocity     negative
## 845     845          atrocity      sadness
## 846     846           atrophy      disgust
## 847     847           atrophy         fear
## 848     848           atrophy     negative
## 849     849           atrophy      sadness
## 850     850        attachment     positive
## 851     851            attack        anger
## 852     852            attack         fear
## 853     853            attack     negative
## 854     854         attacking        anger
## 855     855         attacking      disgust
## 856     856         attacking         fear
## 857     857         attacking     negative
## 858     858         attacking      sadness
## 859     859         attacking     surprise
## 860     860        attainable anticipation
## 861     861        attainable     positive
## 862     862        attainment     positive
## 863     863           attempt anticipation
## 864     864        attendance anticipation
## 865     865         attendant     positive
## 866     866         attendant        trust
## 867     867         attention     positive
## 868     868         attentive     positive
## 869     869         attentive        trust
## 870     870        attenuated     negative
## 871     871       attenuation     negative
## 872     872       attenuation      sadness
## 873     873            attest     positive
## 874     874            attest        trust
## 875     875       attestation        trust
## 876     876          attorney        anger
## 877     877          attorney         fear
## 878     878          attorney     positive
## 879     879          attorney        trust
## 880     880        attraction     positive
## 881     881    attractiveness     positive
## 882     882           auction anticipation
## 883     883          audacity     negative
## 884     884          audience anticipation
## 885     885           auditor         fear
## 886     886           auditor        trust
## 887     887           augment     positive
## 888     888            august     positive
## 889     889              aunt     positive
## 890     890              aunt        trust
## 891     891              aura     positive
## 892     892        auspicious anticipation
## 893     893        auspicious          joy
## 894     894        auspicious     positive
## 895     895           austere         fear
## 896     896           austere     negative
## 897     897           austere      sadness
## 898     898         austerity     negative
## 899     899         authentic          joy
## 900     900         authentic     positive
## 901     901         authentic        trust
## 902     902      authenticate        trust
## 903     903    authentication        trust
## 904     904      authenticity     positive
## 905     905      authenticity        trust
## 906     906            author     positive
## 907     907            author        trust
## 908     908     authoritative     positive
## 909     909     authoritative        trust
## 910     910         authority     positive
## 911     911         authority        trust
## 912     912     authorization     positive
## 913     913     authorization        trust
## 914     914         authorize        trust
## 915     915        authorized     positive
## 916     916        autocratic     negative
## 917     917         automatic        trust
## 918     918           autopsy      disgust
## 919     919           autopsy         fear
## 920     920           autopsy     negative
## 921     921           autopsy      sadness
## 922     922         avalanche         fear
## 923     923         avalanche     negative
## 924     924         avalanche      sadness
## 925     925         avalanche     surprise
## 926     926           avarice        anger
## 927     927           avarice      disgust
## 928     928           avarice     negative
## 929     929            avatar     positive
## 930     930           avenger        anger
## 931     931           avenger     negative
## 932     932            averse        anger
## 933     933            averse      disgust
## 934     934            averse         fear
## 935     935            averse     negative
## 936     936          aversion        anger
## 937     937          aversion      disgust
## 938     938          aversion         fear
## 939     939          aversion     negative
## 940     940             avoid         fear
## 941     941             avoid     negative
## 942     942         avoidance         fear
## 943     943         avoidance     negative
## 944     944          avoiding         fear
## 945     945             await anticipation
## 946     946             award anticipation
## 947     947             award          joy
## 948     948             award     positive
## 949     949             award     surprise
## 950     950             award        trust
## 951     951             awful        anger
## 952     952             awful      disgust
## 953     953             awful         fear
## 954     954             awful     negative
## 955     955             awful      sadness
## 956     956       awkwardness      disgust
## 957     957       awkwardness     negative
## 958     958              awry     negative
## 959     959             axiom        trust
## 960     960         axiomatic        trust
## 961     961                ay     positive
## 962     962               aye     positive
## 963     963            babble     negative
## 964     964          babbling     negative
## 965     965            baboon      disgust
## 966     966            baboon     negative
## 967     967              baby          joy
## 968     968              baby     positive
## 969     969        babysitter        trust
## 970     970     baccalaureate     positive
## 971     971          backbone        anger
## 972     972          backbone     positive
## 973     973          backbone        trust
## 974     974            backer        trust
## 975     975          backward     negative
## 976     976         backwards      disgust
## 977     977         backwards     negative
## 978     978         backwater     negative
## 979     979         backwater      sadness
## 980     980          bacteria      disgust
## 981     981          bacteria         fear
## 982     982          bacteria     negative
## 983     983          bacteria      sadness
## 984     984         bacterium      disgust
## 985     985         bacterium         fear
## 986     986         bacterium     negative
## 987     987               bad        anger
## 988     988               bad      disgust
## 989     989               bad         fear
## 990     990               bad     negative
## 991     991               bad      sadness
## 992     992             badge        trust
## 993     993            badger        anger
## 994     994            badger     negative
## 995     995             badly     negative
## 996     996             badly      sadness
## 997     997           badness        anger
## 998     998           badness      disgust
## 999     999           badness         fear
## 1000   1000           badness     negative
## 1001   1001           bailiff         fear
## 1002   1002           bailiff     negative
## 1003   1003           bailiff        trust
## 1004   1004              bait         fear
## 1005   1005              bait     negative
## 1006   1006              bait        trust
## 1007   1007           balance     positive
## 1008   1008          balanced     positive
## 1009   1009              bale         fear
## 1010   1010              bale     negative
## 1011   1011              balk     negative
## 1012   1012            ballad     positive
## 1013   1013            ballet     positive
## 1014   1014            ballot anticipation
## 1015   1015            ballot     positive
## 1016   1016            ballot        trust
## 1017   1017              balm anticipation
## 1018   1018              balm          joy
## 1019   1019              balm     negative
## 1020   1020              balm     positive
## 1021   1021            balsam     positive
## 1022   1022               ban     negative
## 1023   1023            bandit     negative
## 1024   1024              bane        anger
## 1025   1025              bane      disgust
## 1026   1026              bane         fear
## 1027   1027              bane     negative
## 1028   1028              bang        anger
## 1029   1029              bang      disgust
## 1030   1030              bang         fear
## 1031   1031              bang     negative
## 1032   1032              bang      sadness
## 1033   1033              bang     surprise
## 1034   1034            banger        anger
## 1035   1035            banger anticipation
## 1036   1036            banger         fear
## 1037   1037            banger     negative
## 1038   1038            banger     surprise
## 1039   1039            banish        anger
## 1040   1040            banish      disgust
## 1041   1041            banish         fear
## 1042   1042            banish     negative
## 1043   1043            banish      sadness
## 1044   1044          banished        anger
## 1045   1045          banished         fear
## 1046   1046          banished     negative
## 1047   1047          banished      sadness
## 1048   1048        banishment        anger
## 1049   1049        banishment      disgust
## 1050   1050        banishment     negative
## 1051   1051        banishment      sadness
## 1052   1052              bank        trust
## 1053   1053            banker        trust
## 1054   1054          bankrupt         fear
## 1055   1055          bankrupt     negative
## 1056   1056          bankrupt      sadness
## 1057   1057        bankruptcy        anger
## 1058   1058        bankruptcy      disgust
## 1059   1059        bankruptcy         fear
## 1060   1060        bankruptcy     negative
## 1061   1061        bankruptcy      sadness
## 1062   1062           banquet anticipation
## 1063   1063           banquet          joy
## 1064   1064           banquet     positive
## 1065   1065           banshee        anger
## 1066   1066           banshee      disgust
## 1067   1067           banshee         fear
## 1068   1068           banshee     negative
## 1069   1069           banshee      sadness
## 1070   1070           baptism     positive
## 1071   1071         baptismal          joy
## 1072   1072         baptismal     positive
## 1073   1073              barb        anger
## 1074   1074              barb     negative
## 1075   1075         barbarian         fear
## 1076   1076         barbarian     negative
## 1077   1077          barbaric        anger
## 1078   1078          barbaric      disgust
## 1079   1079          barbaric         fear
## 1080   1080          barbaric     negative
## 1081   1081         barbarism     negative
## 1082   1082              bard     positive
## 1083   1083              barf      disgust
## 1084   1084           bargain     positive
## 1085   1085           bargain        trust
## 1086   1086              bark        anger
## 1087   1087              bark     negative
## 1088   1088            barred     negative
## 1089   1089            barren     negative
## 1090   1090            barren      sadness
## 1091   1091         barricade         fear
## 1092   1092         barricade     negative
## 1093   1093           barrier        anger
## 1094   1094           barrier     negative
## 1095   1095            barrow      disgust
## 1096   1096         bartender        trust
## 1097   1097            barter        trust
## 1098   1098              base        trust
## 1099   1099          baseless     negative
## 1100   1100        basketball anticipation
## 1101   1101        basketball          joy
## 1102   1102        basketball     positive
## 1103   1103           bastard      disgust
## 1104   1104           bastard     negative
## 1105   1105           bastard      sadness
## 1106   1106           bastion        anger
## 1107   1107           bastion     positive
## 1108   1108              bath     positive
## 1109   1109         battalion        anger
## 1110   1110            batter        anger
## 1111   1111            batter         fear
## 1112   1112            batter     negative
## 1113   1113          battered         fear
## 1114   1114          battered     negative
## 1115   1115          battered      sadness
## 1116   1116           battery        anger
## 1117   1117           battery     negative
## 1118   1118            battle        anger
## 1119   1119            battle     negative
## 1120   1120           battled        anger
## 1121   1121           battled         fear
## 1122   1122           battled     negative
## 1123   1123           battled      sadness
## 1124   1124       battlefield         fear
## 1125   1125       battlefield     negative
## 1126   1126             bawdy     negative
## 1127   1127           bayonet        anger
## 1128   1128           bayonet         fear
## 1129   1129           bayonet     negative
## 1130   1130             beach          joy
## 1131   1131              beam          joy
## 1132   1132              beam     positive
## 1133   1133           beaming anticipation
## 1134   1134           beaming          joy
## 1135   1135           beaming     positive
## 1136   1136              bear        anger
## 1137   1137              bear         fear
## 1138   1138            bearer     negative
## 1139   1139           bearish        anger
## 1140   1140           bearish         fear
## 1141   1141             beast        anger
## 1142   1142             beast         fear
## 1143   1143             beast     negative
## 1144   1144           beastly      disgust
## 1145   1145           beastly         fear
## 1146   1146           beastly     negative
## 1147   1147           beating        anger
## 1148   1148           beating         fear
## 1149   1149           beating     negative
## 1150   1150           beating      sadness
## 1151   1151    beautification          joy
## 1152   1152    beautification     positive
## 1153   1153    beautification        trust
## 1154   1154         beautiful          joy
## 1155   1155         beautiful     positive
## 1156   1156          beautify          joy
## 1157   1157          beautify     positive
## 1158   1158            beauty          joy
## 1159   1159            beauty     positive
## 1160   1160           bedrock     positive
## 1161   1161           bedrock        trust
## 1162   1162               bee        anger
## 1163   1163               bee         fear
## 1164   1164              beer          joy
## 1165   1165              beer     positive
## 1166   1166            befall     negative
## 1167   1167         befitting     positive
## 1168   1168          befriend          joy
## 1169   1169          befriend     positive
## 1170   1170          befriend        trust
## 1171   1171               beg     negative
## 1172   1172               beg      sadness
## 1173   1173            beggar     negative
## 1174   1174            beggar      sadness
## 1175   1175           begging     negative
## 1176   1176             begun anticipation
## 1177   1177          behemoth         fear
## 1178   1178          behemoth     negative
## 1179   1179          beholden     negative
## 1180   1180           belated     negative
## 1181   1181          believed        trust
## 1182   1182          believer        trust
## 1183   1183         believing     positive
## 1184   1184         believing        trust
## 1185   1185          belittle        anger
## 1186   1186          belittle      disgust
## 1187   1187          belittle         fear
## 1188   1188          belittle     negative
## 1189   1189          belittle      sadness
## 1190   1190       belligerent        anger
## 1191   1191       belligerent         fear
## 1192   1192       belligerent     negative
## 1193   1193           bellows        anger
## 1194   1194              belt        anger
## 1195   1195              belt         fear
## 1196   1196              belt     negative
## 1197   1197            bender     negative
## 1198   1198        benefactor     positive
## 1199   1199        benefactor        trust
## 1200   1200        beneficial     positive
## 1201   1201           benefit     positive
## 1202   1202       benevolence          joy
## 1203   1203       benevolence     positive
## 1204   1204       benevolence        trust
## 1205   1205            benign          joy
## 1206   1206            benign     positive
## 1207   1207           bequest        trust
## 1208   1208          bereaved     negative
## 1209   1209          bereaved      sadness
## 1210   1210       bereavement     negative
## 1211   1211       bereavement      sadness
## 1212   1212            bereft     negative
## 1213   1213           berserk        anger
## 1214   1214           berserk     negative
## 1215   1215             berth     positive
## 1216   1216           bestial      disgust
## 1217   1217           bestial         fear
## 1218   1218           bestial     negative
## 1219   1219            betray        anger
## 1220   1220            betray      disgust
## 1221   1221            betray     negative
## 1222   1222            betray      sadness
## 1223   1223            betray     surprise
## 1224   1224          betrayal        anger
## 1225   1225          betrayal      disgust
## 1226   1226          betrayal     negative
## 1227   1227          betrayal      sadness
## 1228   1228         betrothed anticipation
## 1229   1229         betrothed          joy
## 1230   1230         betrothed     positive
## 1231   1231         betrothed        trust
## 1232   1232        betterment     positive
## 1233   1233          beverage     positive
## 1234   1234            beware anticipation
## 1235   1235            beware         fear
## 1236   1236            beware     negative
## 1237   1237        bewildered         fear
## 1238   1238        bewildered     negative
## 1239   1239        bewildered     surprise
## 1240   1240      bewilderment         fear
## 1241   1241      bewilderment     surprise
## 1242   1242              bias        anger
## 1243   1243              bias     negative
## 1244   1244            biased     negative
## 1245   1245          biblical     positive
## 1246   1246         bickering        anger
## 1247   1247         bickering      disgust
## 1248   1248         bickering     negative
## 1249   1249          biennial anticipation
## 1250   1250              bier         fear
## 1251   1251              bier     negative
## 1252   1252              bier      sadness
## 1253   1253             bigot        anger
## 1254   1254             bigot      disgust
## 1255   1255             bigot         fear
## 1256   1256             bigot     negative
## 1257   1257           bigoted        anger
## 1258   1258           bigoted      disgust
## 1259   1259           bigoted         fear
## 1260   1260           bigoted     negative
## 1261   1261           bigoted      sadness
## 1262   1262              bile        anger
## 1263   1263              bile      disgust
## 1264   1264              bile     negative
## 1265   1265         bilingual     positive
## 1266   1266            biopsy         fear
## 1267   1267            biopsy     negative
## 1268   1268             birch        anger
## 1269   1269             birch      disgust
## 1270   1270             birch         fear
## 1271   1271             birch     negative
## 1272   1272             birth anticipation
## 1273   1273             birth         fear
## 1274   1274             birth          joy
## 1275   1275             birth     positive
## 1276   1276             birth        trust
## 1277   1277          birthday anticipation
## 1278   1278          birthday          joy
## 1279   1279          birthday     positive
## 1280   1280          birthday     surprise
## 1281   1281        birthplace        anger
## 1282   1282        birthplace     negative
## 1283   1283             bitch        anger
## 1284   1284             bitch      disgust
## 1285   1285             bitch         fear
## 1286   1286             bitch     negative
## 1287   1287             bitch      sadness
## 1288   1288              bite     negative
## 1289   1289          bitterly        anger
## 1290   1290          bitterly      disgust
## 1291   1291          bitterly     negative
## 1292   1292          bitterly      sadness
## 1293   1293        bitterness        anger
## 1294   1294        bitterness      disgust
## 1295   1295        bitterness     negative
## 1296   1296        bitterness      sadness
## 1297   1297           bizarre     negative
## 1298   1298           bizarre     surprise
## 1299   1299         blackjack     negative
## 1300   1300         blackmail        anger
## 1301   1301         blackmail         fear
## 1302   1302         blackmail     negative
## 1303   1303         blackness         fear
## 1304   1304         blackness     negative
## 1305   1305         blackness      sadness
## 1306   1306             blame        anger
## 1307   1307             blame      disgust
## 1308   1308             blame     negative
## 1309   1309         blameless     positive
## 1310   1310             bland     negative
## 1311   1311           blanket        trust
## 1312   1312       blasphemous        anger
## 1313   1313       blasphemous      disgust
## 1314   1314       blasphemous     negative
## 1315   1315         blasphemy        anger
## 1316   1316         blasphemy     negative
## 1317   1317             blast        anger
## 1318   1318             blast         fear
## 1319   1319             blast     negative
## 1320   1320             blast     surprise
## 1321   1321           blatant        anger
## 1322   1322           blatant      disgust
## 1323   1323           blatant     negative
## 1324   1324           blather     negative
## 1325   1325             blaze        anger
## 1326   1326             blaze     negative
## 1327   1327             bleak     negative
## 1328   1328             bleak      sadness
## 1329   1329          bleeding      disgust
## 1330   1330          bleeding         fear
## 1331   1331          bleeding     negative
## 1332   1332          bleeding      sadness
## 1333   1333           blemish        anger
## 1334   1334           blemish      disgust
## 1335   1335           blemish         fear
## 1336   1336           blemish     negative
## 1337   1337           blemish      sadness
## 1338   1338             bless anticipation
## 1339   1339             bless          joy
## 1340   1340             bless     positive
## 1341   1341             bless        trust
## 1342   1342           blessed          joy
## 1343   1343           blessed     positive
## 1344   1344          blessing anticipation
## 1345   1345          blessing          joy
## 1346   1346          blessing     positive
## 1347   1347          blessing        trust
## 1348   1348         blessings anticipation
## 1349   1349         blessings          joy
## 1350   1350         blessings     positive
## 1351   1351         blessings     surprise
## 1352   1352         blessings        trust
## 1353   1353            blight      disgust
## 1354   1354            blight         fear
## 1355   1355            blight     negative
## 1356   1356            blight      sadness
## 1357   1357          blighted      disgust
## 1358   1358          blighted     negative
## 1359   1359          blighted      sadness
## 1360   1360           blinded     negative
## 1361   1361         blindfold anticipation
## 1362   1362         blindfold         fear
## 1363   1363         blindfold     surprise
## 1364   1364           blindly     negative
## 1365   1365           blindly      sadness
## 1366   1366         blindness     negative
## 1367   1367         blindness      sadness
## 1368   1368             bliss          joy
## 1369   1369             bliss     positive
## 1370   1370          blissful          joy
## 1371   1371          blissful     positive
## 1372   1372           blister      disgust
## 1373   1373           blister     negative
## 1374   1374             blitz     surprise
## 1375   1375           bloated      disgust
## 1376   1376           bloated     negative
## 1377   1377              blob      disgust
## 1378   1378              blob         fear
## 1379   1379              blob     negative
## 1380   1380          blockade        anger
## 1381   1381          blockade         fear
## 1382   1382          blockade     negative
## 1383   1383          blockade      sadness
## 1384   1384         bloodless     positive
## 1385   1385         bloodshed        anger
## 1386   1386         bloodshed      disgust
## 1387   1387         bloodshed         fear
## 1388   1388         bloodshed     negative
## 1389   1389         bloodshed      sadness
## 1390   1390         bloodshed     surprise
## 1391   1391      bloodthirsty        anger
## 1392   1392      bloodthirsty      disgust
## 1393   1393      bloodthirsty         fear
## 1394   1394      bloodthirsty     negative
## 1395   1395            bloody        anger
## 1396   1396            bloody      disgust
## 1397   1397            bloody         fear
## 1398   1398            bloody     negative
## 1399   1399            bloody      sadness
## 1400   1400             bloom anticipation
## 1401   1401             bloom          joy
## 1402   1402             bloom     positive
## 1403   1403             bloom        trust
## 1404   1404           blossom          joy
## 1405   1405           blossom     positive
## 1406   1406              blot     negative
## 1407   1407            blower     negative
## 1408   1408           blowout     negative
## 1409   1409              blue      sadness
## 1410   1410             blues         fear
## 1411   1411             blues     negative
## 1412   1412             blues      sadness
## 1413   1413             bluff     negative
## 1414   1414           blunder      disgust
## 1415   1415           blunder     negative
## 1416   1416           blunder      sadness
## 1417   1417              blur     negative
## 1418   1418           blurred     negative
## 1419   1419             blush     negative
## 1420   1420             board anticipation
## 1421   1421             boast     negative
## 1422   1422             boast     positive
## 1423   1423          boasting     negative
## 1424   1424         bodyguard     positive
## 1425   1425         bodyguard        trust
## 1426   1426               bog     negative
## 1427   1427             bogus        anger
## 1428   1428             bogus      disgust
## 1429   1429             bogus     negative
## 1430   1430              boil      disgust
## 1431   1431              boil     negative
## 1432   1432       boilerplate     negative
## 1433   1433        boisterous        anger
## 1434   1434        boisterous anticipation
## 1435   1435        boisterous          joy
## 1436   1436        boisterous     negative
## 1437   1437        boisterous     positive
## 1438   1438              bold     positive
## 1439   1439          boldness     positive
## 1440   1440           bolster     positive
## 1441   1441              bomb        anger
## 1442   1442              bomb         fear
## 1443   1443              bomb     negative
## 1444   1444              bomb      sadness
## 1445   1445              bomb     surprise
## 1446   1446           bombard        anger
## 1447   1447           bombard         fear
## 1448   1448           bombard     negative
## 1449   1449       bombardment        anger
## 1450   1450       bombardment         fear
## 1451   1451       bombardment     negative
## 1452   1452            bombed      disgust
## 1453   1453            bombed     negative
## 1454   1454            bomber         fear
## 1455   1455            bomber      sadness
## 1456   1456           bonanza          joy
## 1457   1457           bonanza     positive
## 1458   1458           bondage         fear
## 1459   1459           bondage     negative
## 1460   1460           bondage      sadness
## 1461   1461             bonds     negative
## 1462   1462             bonne     positive
## 1463   1463             bonus anticipation
## 1464   1464             bonus          joy
## 1465   1465             bonus     positive
## 1466   1466             bonus     surprise
## 1467   1467               boo     negative
## 1468   1468             booby     negative
## 1469   1469           bookish     positive
## 1470   1470          bookshop     positive
## 1471   1471          bookworm     negative
## 1472   1472          bookworm     positive
## 1473   1473         boomerang anticipation
## 1474   1474         boomerang        trust
## 1475   1475              boon     positive
## 1476   1476             booze     negative
## 1477   1477              bore     negative
## 1478   1478           boredom     negative
## 1479   1479           boredom      sadness
## 1480   1480            boring     negative
## 1481   1481          borrower     negative
## 1482   1482            bother     negative
## 1483   1483         bothering        anger
## 1484   1484         bothering     negative
## 1485   1485         bothering      sadness
## 1486   1486            bottom     negative
## 1487   1487            bottom      sadness
## 1488   1488        bottomless         fear
## 1489   1489             bound     negative
## 1490   1490         bountiful anticipation
## 1491   1491         bountiful          joy
## 1492   1492         bountiful     positive
## 1493   1493            bounty anticipation
## 1494   1494            bounty          joy
## 1495   1495            bounty     positive
## 1496   1496            bounty        trust
## 1497   1497           bouquet          joy
## 1498   1498           bouquet     positive
## 1499   1499           bouquet        trust
## 1500   1500              bout        anger
## 1501   1501              bout     negative
## 1502   1502            bovine      disgust
## 1503   1503            bovine     negative
## 1504   1504            bowels      disgust
## 1505   1505            boxing        anger
## 1506   1506           boycott     negative
## 1507   1507              brag     negative
## 1508   1508            brains     positive
## 1509   1509              bran      disgust
## 1510   1510            brandy     negative
## 1511   1511           bravado     negative
## 1512   1512           bravery     positive
## 1513   1513             brawl        anger
## 1514   1514             brawl      disgust
## 1515   1515             brawl         fear
## 1516   1516             brawl     negative
## 1517   1517            brazen        anger
## 1518   1518            brazen     negative
## 1519   1519            breach     negative
## 1520   1520             break     surprise
## 1521   1521         breakdown     negative
## 1522   1522         breakfast     positive
## 1523   1523         breakneck     negative
## 1524   1524           breakup     negative
## 1525   1525           breakup      sadness
## 1526   1526             bribe     negative
## 1527   1527           bribery      disgust
## 1528   1528           bribery     negative
## 1529   1529            bridal anticipation
## 1530   1530            bridal          joy
## 1531   1531            bridal     positive
## 1532   1532            bridal        trust
## 1533   1533             bride anticipation
## 1534   1534             bride          joy
## 1535   1535             bride     positive
## 1536   1536             bride        trust
## 1537   1537        bridegroom anticipation
## 1538   1538        bridegroom          joy
## 1539   1539        bridegroom     positive
## 1540   1540        bridegroom        trust
## 1541   1541        bridesmaid          joy
## 1542   1542        bridesmaid     positive
## 1543   1543        bridesmaid        trust
## 1544   1544           brigade         fear
## 1545   1545           brigade     negative
## 1546   1546          brighten          joy
## 1547   1547          brighten     positive
## 1548   1548          brighten     surprise
## 1549   1549          brighten        trust
## 1550   1550        brightness     positive
## 1551   1551         brilliant anticipation
## 1552   1552         brilliant          joy
## 1553   1553         brilliant     positive
## 1554   1554         brilliant        trust
## 1555   1555         brimstone        anger
## 1556   1556         brimstone         fear
## 1557   1557         brimstone     negative
## 1558   1558           bristle     negative
## 1559   1559         broadside anticipation
## 1560   1560         broadside     negative
## 1561   1561           brocade     positive
## 1562   1562             broil        anger
## 1563   1563             broil     negative
## 1564   1564             broke         fear
## 1565   1565             broke     negative
## 1566   1566             broke      sadness
## 1567   1567            broken        anger
## 1568   1568            broken         fear
## 1569   1569            broken     negative
## 1570   1570            broken      sadness
## 1571   1571           brothel      disgust
## 1572   1572           brothel     negative
## 1573   1573           brother     positive
## 1574   1574           brother        trust
## 1575   1575       brotherhood     positive
## 1576   1576       brotherhood        trust
## 1577   1577         brotherly anticipation
## 1578   1578         brotherly          joy
## 1579   1579         brotherly     positive
## 1580   1580         brotherly        trust
## 1581   1581            bruise anticipation
## 1582   1582            bruise     negative
## 1583   1583             brunt        anger
## 1584   1584             brunt     negative
## 1585   1585            brutal        anger
## 1586   1586            brutal         fear
## 1587   1587            brutal     negative
## 1588   1588         brutality        anger
## 1589   1589         brutality         fear
## 1590   1590         brutality     negative
## 1591   1591             brute        anger
## 1592   1592             brute         fear
## 1593   1593             brute     negative
## 1594   1594             brute      sadness
## 1595   1595              buck         fear
## 1596   1596              buck     negative
## 1597   1597              buck     positive
## 1598   1598              buck     surprise
## 1599   1599             buddy anticipation
## 1600   1600             buddy          joy
## 1601   1601             buddy     positive
## 1602   1602             buddy        trust
## 1603   1603            budget        trust
## 1604   1604            buffet        anger
## 1605   1605            buffet     negative
## 1606   1606               bug      disgust
## 1607   1607               bug         fear
## 1608   1608               bug     negative
## 1609   1609           bugaboo        anger
## 1610   1610           bugaboo         fear
## 1611   1611           bugaboo     negative
## 1612   1612           bugaboo      sadness
## 1613   1613             bugle anticipation
## 1614   1614             build     positive
## 1615   1615          building     positive
## 1616   1616           bulbous     negative
## 1617   1617           bulldog     positive
## 1618   1618       bulletproof     positive
## 1619   1619             bully        anger
## 1620   1620             bully         fear
## 1621   1621             bully     negative
## 1622   1622               bum      disgust
## 1623   1623               bum     negative
## 1624   1624               bum      sadness
## 1625   1625            bummer        anger
## 1626   1626            bummer      disgust
## 1627   1627            bummer     negative
## 1628   1628            bunker         fear
## 1629   1629              buoy     positive
## 1630   1630        burdensome         fear
## 1631   1631        burdensome     negative
## 1632   1632        burdensome      sadness
## 1633   1633       bureaucracy     negative
## 1634   1634       bureaucracy        trust
## 1635   1635        bureaucrat      disgust
## 1636   1636        bureaucrat     negative
## 1637   1637           burglar      disgust
## 1638   1638           burglar         fear
## 1639   1639           burglar     negative
## 1640   1640          burglary     negative
## 1641   1641            burial        anger
## 1642   1642            burial         fear
## 1643   1643            burial     negative
## 1644   1644            burial      sadness
## 1645   1645            buried         fear
## 1646   1646            buried     negative
## 1647   1647            buried      sadness
## 1648   1648             burke        anger
## 1649   1649             burke      disgust
## 1650   1650             burke         fear
## 1651   1651             burke     negative
## 1652   1652             burke      sadness
## 1653   1653         burlesque     surprise
## 1654   1654             burnt      disgust
## 1655   1655             burnt     negative
## 1656   1656           bursary        trust
## 1657   1657              bury      sadness
## 1658   1658              buss          joy
## 1659   1659              buss     positive
## 1660   1660            busted        anger
## 1661   1661            busted         fear
## 1662   1662            busted     negative
## 1663   1663           butcher        anger
## 1664   1664           butcher      disgust
## 1665   1665           butcher         fear
## 1666   1666           butcher     negative
## 1667   1667            butler     positive
## 1668   1668            butler        trust
## 1669   1669              butt     negative
## 1670   1670           buttery     positive
## 1671   1671             buxom     positive
## 1672   1672              buzz anticipation
## 1673   1673              buzz         fear
## 1674   1674              buzz     positive
## 1675   1675            buzzed     negative
## 1676   1676               bye anticipation
## 1677   1677             bylaw        trust
## 1678   1678               cab     positive
## 1679   1679             cabal         fear
## 1680   1680             cabal     negative
## 1681   1681           cabinet     positive
## 1682   1682           cabinet        trust
## 1683   1683             cable     surprise
## 1684   1684         cacophony        anger
## 1685   1685         cacophony      disgust
## 1686   1686         cacophony     negative
## 1687   1687               cad        anger
## 1688   1688               cad      disgust
## 1689   1689               cad     negative
## 1690   1690           cadaver      disgust
## 1691   1691           cadaver         fear
## 1692   1692           cadaver     negative
## 1693   1693           cadaver      sadness
## 1694   1694           cadaver     surprise
## 1695   1695              cafe     positive
## 1696   1696              cage     negative
## 1697   1697              cage      sadness
## 1698   1698          calamity      sadness
## 1699   1699       calculating     negative
## 1700   1700       calculation anticipation
## 1701   1701        calculator     positive
## 1702   1702        calculator        trust
## 1703   1703              calf          joy
## 1704   1704              calf     positive
## 1705   1705              calf        trust
## 1706   1706           callous        anger
## 1707   1707           callous      disgust
## 1708   1708           callous     negative
## 1709   1709             calls anticipation
## 1710   1710             calls     negative
## 1711   1711             calls        trust
## 1712   1712              calm     positive
## 1713   1713        camouflage     surprise
## 1714   1714       camouflaged     surprise
## 1715   1715       campaigning        anger
## 1716   1716       campaigning         fear
## 1717   1717       campaigning     negative
## 1718   1718            canary     positive
## 1719   1719            cancel     negative
## 1720   1720            cancel      sadness
## 1721   1721            cancer        anger
## 1722   1722            cancer      disgust
## 1723   1723            cancer         fear
## 1724   1724            cancer     negative
## 1725   1725            cancer      sadness
## 1726   1726            candid anticipation
## 1727   1727            candid          joy
## 1728   1728            candid     positive
## 1729   1729            candid     surprise
## 1730   1730            candid        trust
## 1731   1731         candidate     positive
## 1732   1732           candied     positive
## 1733   1733              cane        anger
## 1734   1734              cane         fear
## 1735   1735            canker        anger
## 1736   1736            canker      disgust
## 1737   1737            canker     negative
## 1738   1738          cannibal      disgust
## 1739   1739          cannibal         fear
## 1740   1740          cannibal     negative
## 1741   1741       cannibalism      disgust
## 1742   1742       cannibalism     negative
## 1743   1743            cannon        anger
## 1744   1744            cannon         fear
## 1745   1745            cannon     negative
## 1746   1746            canons        trust
## 1747   1747               cap anticipation
## 1748   1748               cap        trust
## 1749   1749        capitalist     positive
## 1750   1750           captain     positive
## 1751   1751         captivate anticipation
## 1752   1752         captivate          joy
## 1753   1753         captivate     positive
## 1754   1754         captivate     surprise
## 1755   1755         captivate        trust
## 1756   1756       captivating     positive
## 1757   1757           captive         fear
## 1758   1758           captive     negative
## 1759   1759           captive      sadness
## 1760   1760         captivity     negative
## 1761   1761         captivity      sadness
## 1762   1762            captor         fear
## 1763   1763            captor     negative
## 1764   1764           capture     negative
## 1765   1765           carcass      disgust
## 1766   1766           carcass         fear
## 1767   1767           carcass     negative
## 1768   1768           carcass      sadness
## 1769   1769         carcinoma         fear
## 1770   1770         carcinoma     negative
## 1771   1771         carcinoma      sadness
## 1772   1772    cardiomyopathy         fear
## 1773   1773    cardiomyopathy     negative
## 1774   1774    cardiomyopathy      sadness
## 1775   1775            career anticipation
## 1776   1776            career     positive
## 1777   1777           careful     positive
## 1778   1778         carefully     positive
## 1779   1779      carelessness        anger
## 1780   1780      carelessness      disgust
## 1781   1781      carelessness     negative
## 1782   1782            caress     positive
## 1783   1783         caretaker     positive
## 1784   1784         caretaker        trust
## 1785   1785        caricature     negative
## 1786   1786            caries      disgust
## 1787   1787            caries     negative
## 1788   1788           carnage        anger
## 1789   1789           carnage      disgust
## 1790   1790           carnage         fear
## 1791   1791           carnage     negative
## 1792   1792           carnage      sadness
## 1793   1793           carnage     surprise
## 1794   1794            carnal     negative
## 1795   1795       carnivorous         fear
## 1796   1796       carnivorous     negative
## 1797   1797             carol          joy
## 1798   1798             carol     positive
## 1799   1799             carol        trust
## 1800   1800            cartel     negative
## 1801   1801         cartridge         fear
## 1802   1802           cascade     positive
## 1803   1803              case         fear
## 1804   1804              case     negative
## 1805   1805              case      sadness
## 1806   1806              cash        anger
## 1807   1807              cash anticipation
## 1808   1808              cash         fear
## 1809   1809              cash          joy
## 1810   1810              cash     positive
## 1811   1811              cash        trust
## 1812   1812           cashier        trust
## 1813   1813            casket         fear
## 1814   1814            casket     negative
## 1815   1815            casket      sadness
## 1816   1816             caste     negative
## 1817   1817          casualty        anger
## 1818   1818          casualty         fear
## 1819   1819          casualty     negative
## 1820   1820          casualty      sadness
## 1821   1821          cataract anticipation
## 1822   1822          cataract         fear
## 1823   1823          cataract     negative
## 1824   1824          cataract      sadness
## 1825   1825       catastrophe        anger
## 1826   1826       catastrophe      disgust
## 1827   1827       catastrophe         fear
## 1828   1828       catastrophe     negative
## 1829   1829       catastrophe      sadness
## 1830   1830       catastrophe     surprise
## 1831   1831             catch     surprise
## 1832   1832         catechism      disgust
## 1833   1833       categorical     positive
## 1834   1834             cater     positive
## 1835   1835         cathartic     positive
## 1836   1836         cathedral          joy
## 1837   1837         cathedral     positive
## 1838   1838         cathedral        trust
## 1839   1839          catheter     negative
## 1840   1840           caution        anger
## 1841   1841           caution anticipation
## 1842   1842           caution         fear
## 1843   1843           caution     negative
## 1844   1844        cautionary         fear
## 1845   1845          cautious anticipation
## 1846   1846          cautious         fear
## 1847   1847          cautious     positive
## 1848   1848          cautious        trust
## 1849   1849        cautiously         fear
## 1850   1850        cautiously     positive
## 1851   1851              cede     negative
## 1852   1852        celebrated anticipation
## 1853   1853        celebrated          joy
## 1854   1854        celebrated     positive
## 1855   1855       celebrating anticipation
## 1856   1856       celebrating          joy
## 1857   1857       celebrating     positive
## 1858   1858       celebration anticipation
## 1859   1859       celebration          joy
## 1860   1860       celebration     positive
## 1861   1861       celebration     surprise
## 1862   1862       celebration        trust
## 1863   1863         celebrity        anger
## 1864   1864         celebrity anticipation
## 1865   1865         celebrity      disgust
## 1866   1866         celebrity          joy
## 1867   1867         celebrity     negative
## 1868   1868         celebrity     positive
## 1869   1869         celebrity     surprise
## 1870   1870         celebrity        trust
## 1871   1871         celestial anticipation
## 1872   1872         celestial          joy
## 1873   1873         celestial     positive
## 1874   1874            cement anticipation
## 1875   1875            cement        trust
## 1876   1876          cemetery         fear
## 1877   1877          cemetery     negative
## 1878   1878          cemetery      sadness
## 1879   1879            censor        anger
## 1880   1880            censor      disgust
## 1881   1881            censor         fear
## 1882   1882            censor     negative
## 1883   1883            censor        trust
## 1884   1884           censure     negative
## 1885   1885            center     positive
## 1886   1886            center        trust
## 1887   1887         centurion     positive
## 1888   1888          cerebral     positive
## 1889   1889          ceremony          joy
## 1890   1890          ceremony     positive
## 1891   1891          ceremony     surprise
## 1892   1892         certainty     positive
## 1893   1893           certify        trust
## 1894   1894              cess      disgust
## 1895   1895              cess     negative
## 1896   1896         cessation     negative
## 1897   1897             chaff        anger
## 1898   1898             chaff         fear
## 1899   1899             chaff     negative
## 1900   1900           chafing     negative
## 1901   1901           chagrin      disgust
## 1902   1902           chagrin     negative
## 1903   1903           chagrin      sadness
## 1904   1904          chairman     positive
## 1905   1905          chairman        trust
## 1906   1906        chairwoman     positive
## 1907   1907        chairwoman        trust
## 1908   1908         challenge        anger
## 1909   1909         challenge         fear
## 1910   1910         challenge     negative
## 1911   1911          champion anticipation
## 1912   1912          champion          joy
## 1913   1913          champion     positive
## 1914   1914          champion        trust
## 1915   1915            chance     surprise
## 1916   1916        chancellor        trust
## 1917   1917            change         fear
## 1918   1918        changeable anticipation
## 1919   1919        changeable     surprise
## 1920   1920             chant        anger
## 1921   1921             chant anticipation
## 1922   1922             chant          joy
## 1923   1923             chant     positive
## 1924   1924             chant     surprise
## 1925   1925             chaos        anger
## 1926   1926             chaos         fear
## 1927   1927             chaos     negative
## 1928   1928             chaos      sadness
## 1929   1929           chaotic        anger
## 1930   1930           chaotic     negative
## 1931   1931          chaplain        trust
## 1932   1932           charade     negative
## 1933   1933        chargeable         fear
## 1934   1934        chargeable     negative
## 1935   1935        chargeable      sadness
## 1936   1936           charger     positive
## 1937   1937        charitable anticipation
## 1938   1938        charitable          joy
## 1939   1939        charitable     positive
## 1940   1940        charitable        trust
## 1941   1941           charity          joy
## 1942   1942           charity     positive
## 1943   1943             charm     positive
## 1944   1944           charmed          joy
## 1945   1945           charmed     negative
## 1946   1946           charmed     positive
## 1947   1947          charming     positive
## 1948   1948             chart        trust
## 1949   1949             chase     negative
## 1950   1950             chasm         fear
## 1951   1951      chastisement     negative
## 1952   1952          chastity anticipation
## 1953   1953          chastity     positive
## 1954   1954          chastity        trust
## 1955   1955        chattering     positive
## 1956   1956            chatty     negative
## 1957   1957             cheap     negative
## 1958   1958             cheat        anger
## 1959   1959             cheat      disgust
## 1960   1960             cheat     negative
## 1961   1961         checklist     positive
## 1962   1962         checklist        trust
## 1963   1963             cheer anticipation
## 1964   1964             cheer          joy
## 1965   1965             cheer     positive
## 1966   1966             cheer     surprise
## 1967   1967             cheer        trust
## 1968   1968          cheerful          joy
## 1969   1969          cheerful     positive
## 1970   1970          cheerful     surprise
## 1971   1971      cheerfulness anticipation
## 1972   1972      cheerfulness          joy
## 1973   1973      cheerfulness     positive
## 1974   1974      cheerfulness        trust
## 1975   1975          cheering          joy
## 1976   1976          cheering     positive
## 1977   1977            cheery anticipation
## 1978   1978            cheery          joy
## 1979   1979            cheery     positive
## 1980   1980        cheesecake     negative
## 1981   1981           chemist     positive
## 1982   1982           chemist        trust
## 1983   1983           cherish anticipation
## 1984   1984           cherish          joy
## 1985   1985           cherish     positive
## 1986   1986           cherish     surprise
## 1987   1987           cherish        trust
## 1988   1988            cherry     positive
## 1989   1989           chicane anticipation
## 1990   1990           chicane     negative
## 1991   1991           chicane     surprise
## 1992   1992           chicane        trust
## 1993   1993           chicken         fear
## 1994   1994         chieftain     positive
## 1995   1995             child anticipation
## 1996   1996             child          joy
## 1997   1997             child     positive
## 1998   1998         childhood          joy
## 1999   1999         childhood     positive
## 2000   2000          childish     negative
## 2001   2001            chilly     negative
## 2002   2002           chimera         fear
## 2003   2003           chimera     surprise
## 2004   2004             chirp          joy
## 2005   2005             chirp     positive
## 2006   2006            chisel     positive
## 2007   2007          chivalry     positive
## 2008   2008        chloroform     negative
## 2009   2009         chocolate anticipation
## 2010   2010         chocolate          joy
## 2011   2011         chocolate     positive
## 2012   2012         chocolate        trust
## 2013   2013            choice     positive
## 2014   2014             choir          joy
## 2015   2015             choir     positive
## 2016   2016             choir        trust
## 2017   2017             choke        anger
## 2018   2018             choke     negative
## 2019   2019             choke      sadness
## 2020   2020           cholera      disgust
## 2021   2021           cholera         fear
## 2022   2022           cholera     negative
## 2023   2023           cholera      sadness
## 2024   2024              chop     negative
## 2025   2025            choral          joy
## 2026   2026            choral     positive
## 2027   2027             chore     negative
## 2028   2028            chorus     positive
## 2029   2029            chosen     positive
## 2030   2030           chowder     positive
## 2031   2031           chronic     negative
## 2032   2032           chronic      sadness
## 2033   2033         chronicle     positive
## 2034   2034         chronicle        trust
## 2035   2035           chuckle anticipation
## 2036   2036           chuckle          joy
## 2037   2037           chuckle     positive
## 2038   2038           chuckle     surprise
## 2039   2039           chuckle        trust
## 2040   2040            church anticipation
## 2041   2041            church          joy
## 2042   2042            church     positive
## 2043   2043            church        trust
## 2044   2044             cider     positive
## 2045   2045         cigarette     negative
## 2046   2046      circumcision     positive
## 2047   2047     circumvention     negative
## 2048   2048     circumvention     positive
## 2049   2049           citizen     positive
## 2050   2050             civil     positive
## 2051   2051          civility     positive
## 2052   2052      civilization     positive
## 2053   2053      civilization        trust
## 2054   2054         civilized          joy
## 2055   2055         civilized     positive
## 2056   2056         civilized        trust
## 2057   2057          claimant        anger
## 2058   2058          claimant      disgust
## 2059   2059       clairvoyant     positive
## 2060   2060            clamor        anger
## 2061   2061            clamor anticipation
## 2062   2062            clamor      disgust
## 2063   2063            clamor     negative
## 2064   2064            clamor     surprise
## 2065   2065              clan        trust
## 2066   2066              clap anticipation
## 2067   2067              clap          joy
## 2068   2068              clap     positive
## 2069   2069              clap        trust
## 2070   2070           clarify     positive
## 2071   2071             clash        anger
## 2072   2072             clash     negative
## 2073   2073          clashing        anger
## 2074   2074          clashing         fear
## 2075   2075          clashing     negative
## 2076   2076           classic     positive
## 2077   2077         classical     positive
## 2078   2078          classics          joy
## 2079   2079          classics     positive
## 2080   2080          classify     positive
## 2081   2081              claw        anger
## 2082   2082              claw         fear
## 2083   2083              claw     negative
## 2084   2084             clean          joy
## 2085   2085             clean     positive
## 2086   2086             clean        trust
## 2087   2087          cleaning     positive
## 2088   2088       cleanliness     positive
## 2089   2089           cleanly     positive
## 2090   2090           cleanse     positive
## 2091   2091         cleansing     positive
## 2092   2092         clearance     positive
## 2093   2093         clearance        trust
## 2094   2094         clearness     positive
## 2095   2095            cleave         fear
## 2096   2096          clerical     positive
## 2097   2097          clerical        trust
## 2098   2098            clever     positive
## 2099   2099        cleverness     positive
## 2100   2100             cliff         fear
## 2101   2101            climax anticipation
## 2102   2102            climax          joy
## 2103   2103            climax     positive
## 2104   2104            climax     surprise
## 2105   2105            climax        trust
## 2106   2106             clock anticipation
## 2107   2107          cloister     negative
## 2108   2108         closeness          joy
## 2109   2109         closeness     positive
## 2110   2110         closeness        trust
## 2111   2111           closure anticipation
## 2112   2112           closure          joy
## 2113   2113           closure     positive
## 2114   2114           closure      sadness
## 2115   2115            clothe     positive
## 2116   2116           clouded     negative
## 2117   2117           clouded      sadness
## 2118   2118        cloudiness         fear
## 2119   2119        cloudiness     negative
## 2120   2120            cloudy      sadness
## 2121   2121             clown anticipation
## 2122   2122             clown          joy
## 2123   2123             clown     positive
## 2124   2124             clown     surprise
## 2125   2125              clue anticipation
## 2126   2126             clump     negative
## 2127   2127            clumsy      disgust
## 2128   2128            clumsy     negative
## 2129   2129             coach        trust
## 2130   2130          coalesce        trust
## 2131   2131         coalition     positive
## 2132   2132             coast     positive
## 2133   2133              coax        trust
## 2134   2134             cobra         fear
## 2135   2135           cocaine     negative
## 2136   2136           cocaine      sadness
## 2137   2137            coerce        anger
## 2138   2138            coerce      disgust
## 2139   2139            coerce         fear
## 2140   2140            coerce     negative
## 2141   2141          coercion        anger
## 2142   2142          coercion      disgust
## 2143   2143          coercion         fear
## 2144   2144          coercion     negative
## 2145   2145          coercion      sadness
## 2146   2146           coexist     positive
## 2147   2147           coexist        trust
## 2148   2148        coexisting        trust
## 2149   2149            coffin         fear
## 2150   2150            coffin     negative
## 2151   2151            coffin      sadness
## 2152   2152            cogent     positive
## 2153   2153            cogent        trust
## 2154   2154         cognitive     positive
## 2155   2155         coherence     positive
## 2156   2156          coherent     positive
## 2157   2157          cohesion        trust
## 2158   2158          cohesive     positive
## 2159   2159          cohesive        trust
## 2160   2160       coincidence     surprise
## 2161   2161              cold     negative
## 2162   2162            coldly     negative
## 2163   2163          coldness        anger
## 2164   2164          coldness      disgust
## 2165   2165          coldness         fear
## 2166   2166          coldness     negative
## 2167   2167          coldness      sadness
## 2168   2168             colic     negative
## 2169   2169      collaborator        trust
## 2170   2170          collapse      disgust
## 2171   2171          collapse         fear
## 2172   2172          collapse     negative
## 2173   2173          collapse      sadness
## 2174   2174        collateral        trust
## 2175   2175      collectively     positive
## 2176   2176      collectively        trust
## 2177   2177         collision        anger
## 2178   2178         collision     negative
## 2179   2179         collusion        anger
## 2180   2180         collusion      disgust
## 2181   2181         collusion         fear
## 2182   2182         collusion     negative
## 2183   2183         collusion      sadness
## 2184   2184           colonel     positive
## 2185   2185           colonel        trust
## 2186   2186          colossal     positive
## 2187   2187              coma         fear
## 2188   2188              coma     negative
## 2189   2189              coma      sadness
## 2190   2190          comatose         fear
## 2191   2191          comatose     negative
## 2192   2192          comatose      sadness
## 2193   2193            combat        anger
## 2194   2194            combat         fear
## 2195   2195            combat     negative
## 2196   2196         combatant        anger
## 2197   2197         combatant         fear
## 2198   2198         combatant     negative
## 2199   2199         combative        anger
## 2200   2200         combative         fear
## 2201   2201         combative     negative
## 2202   2202           comfort anticipation
## 2203   2203           comfort          joy
## 2204   2204           comfort     positive
## 2205   2205           comfort        trust
## 2206   2206            coming anticipation
## 2207   2207        commandant     positive
## 2208   2208        commandant        trust
## 2209   2209        commanding     positive
## 2210   2210        commanding        trust
## 2211   2211       commemorate anticipation
## 2212   2212       commemorate          joy
## 2213   2213       commemorate     positive
## 2214   2214       commemorate      sadness
## 2215   2215     commemoration anticipation
## 2216   2216     commemoration          joy
## 2217   2217     commemoration     positive
## 2218   2218     commemorative anticipation
## 2219   2219     commemorative     positive
## 2220   2220           commend     positive
## 2221   2221       commendable          joy
## 2222   2222       commendable     positive
## 2223   2223       commendable        trust
## 2224   2224       commentator     positive
## 2225   2225          commerce        trust
## 2226   2226        commission        trust
## 2227   2227         committal     negative
## 2228   2228         committal      sadness
## 2229   2229         committed     positive
## 2230   2230         committed        trust
## 2231   2231         committee        trust
## 2232   2232         commodore     positive
## 2233   2233         commodore        trust
## 2234   2234       commonplace anticipation
## 2235   2235       commonplace        trust
## 2236   2236      commonwealth     positive
## 2237   2237      commonwealth        trust
## 2238   2238         commotion        anger
## 2239   2239         commotion     negative
## 2240   2240       communicate     positive
## 2241   2241       communicate        trust
## 2242   2242     communication        trust
## 2243   2243     communicative     positive
## 2244   2244         communion          joy
## 2245   2245         communion     positive
## 2246   2246         communion        trust
## 2247   2247         communism        anger
## 2248   2248         communism         fear
## 2249   2249         communism     negative
## 2250   2250         communism      sadness
## 2251   2251         communist     negative
## 2252   2252         community     positive
## 2253   2253       commutation     positive
## 2254   2254           commute     positive
## 2255   2255           compact        trust
## 2256   2256         companion          joy
## 2257   2257         companion     positive
## 2258   2258         companion        trust
## 2259   2259           compass        trust
## 2260   2260        compassion         fear
## 2261   2261        compassion     positive
## 2262   2262     compassionate     positive
## 2263   2263     compatibility     positive
## 2264   2264        compatible     positive
## 2265   2265        compelling     positive
## 2266   2266        compensate anticipation
## 2267   2267        compensate          joy
## 2268   2268        compensate     positive
## 2269   2269        compensate     surprise
## 2270   2270        compensate        trust
## 2271   2271      compensatory     positive
## 2272   2272        competence     positive
## 2273   2273        competence        trust
## 2274   2274        competency     positive
## 2275   2275        competency        trust
## 2276   2276         competent     positive
## 2277   2277         competent        trust
## 2278   2278       competition anticipation
## 2279   2279       competition     negative
## 2280   2280       complacency     positive
## 2281   2281          complain        anger
## 2282   2282          complain     negative
## 2283   2283          complain      sadness
## 2284   2284         complaint        anger
## 2285   2285         complaint     negative
## 2286   2286        complement anticipation
## 2287   2287        complement          joy
## 2288   2288        complement     positive
## 2289   2289        complement     surprise
## 2290   2290        complement        trust
## 2291   2291     complementary     positive
## 2292   2292        completely     positive
## 2293   2293      completeness     positive
## 2294   2294        completing anticipation
## 2295   2295        completing          joy
## 2296   2296        completing     positive
## 2297   2297        completion anticipation
## 2298   2298        completion          joy
## 2299   2299        completion     positive
## 2300   2300         complexed     negative
## 2301   2301        complexity     negative
## 2302   2302        compliance     positive
## 2303   2303        compliance        trust
## 2304   2304         compliant     positive
## 2305   2305        complicate        anger
## 2306   2306        complicate     negative
## 2307   2307       complicated     negative
## 2308   2308      complication     negative
## 2309   2309        complicity     negative
## 2310   2310        complicity     positive
## 2311   2311        compliment anticipation
## 2312   2312        compliment          joy
## 2313   2313        compliment     positive
## 2314   2314        compliment     surprise
## 2315   2315        compliment        trust
## 2316   2316          composed     positive
## 2317   2317          composer     positive
## 2318   2318           compost      disgust
## 2319   2319           compost     negative
## 2320   2320         composure     positive
## 2321   2321        comprehend     positive
## 2322   2322     comprehensive     positive
## 2323   2323          compress        anger
## 2324   2324       comptroller        trust
## 2325   2325        compulsion        anger
## 2326   2326        compulsion     negative
## 2327   2327        compulsory     negative
## 2328   2328           comrade     positive
## 2329   2329           comrade        trust
## 2330   2330           conceal     negative
## 2331   2331           conceal      sadness
## 2332   2332         concealed anticipation
## 2333   2333         concealed         fear
## 2334   2334         concealed     negative
## 2335   2335         concealed     surprise
## 2336   2336       concealment        anger
## 2337   2337       concealment anticipation
## 2338   2338       concealment         fear
## 2339   2339       concealment     negative
## 2340   2340           conceit     negative
## 2341   2341         conceited     negative
## 2342   2342        concentric     positive
## 2343   2343         concerned         fear
## 2344   2344         concerned      sadness
## 2345   2345      conciliation          joy
## 2346   2346      conciliation     positive
## 2347   2347      conciliation        trust
## 2348   2348        concluding     positive
## 2349   2349           concord     positive
## 2350   2350           concord        trust
## 2351   2351       concordance     positive
## 2352   2352       concordance        trust
## 2353   2353        concussion        anger
## 2354   2354        concussion     negative
## 2355   2355        concussion      sadness
## 2356   2356           condemn        anger
## 2357   2357           condemn     negative
## 2358   2358      condemnation        anger
## 2359   2359      condemnation anticipation
## 2360   2360      condemnation      disgust
## 2361   2361      condemnation         fear
## 2362   2362      condemnation     negative
## 2363   2363      condemnation      sadness
## 2364   2364     condescending     negative
## 2365   2365     condescension        anger
## 2366   2366     condescension      disgust
## 2367   2367     condescension     negative
## 2368   2368     condescension      sadness
## 2369   2369        condolence     positive
## 2370   2370        condolence      sadness
## 2371   2371           condone     positive
## 2372   2372         conducive     positive
## 2373   2373      conductivity     positive
## 2374   2374       confederate     positive
## 2375   2375       confederate        trust
## 2376   2376           confess     negative
## 2377   2377           confess     positive
## 2378   2378           confess        trust
## 2379   2379        confession anticipation
## 2380   2380        confession         fear
## 2381   2381        confession     negative
## 2382   2382        confession      sadness
## 2383   2383        confession     surprise
## 2384   2384      confessional         fear
## 2385   2385      confessional        trust
## 2386   2386           confide        trust
## 2387   2387        confidence         fear
## 2388   2388        confidence          joy
## 2389   2389        confidence     positive
## 2390   2390        confidence        trust
## 2391   2391         confident          joy
## 2392   2392         confident     positive
## 2393   2393         confident        trust
## 2394   2394      confidential        trust
## 2395   2395    confidentially        trust
## 2396   2396           confine        anger
## 2397   2397           confine         fear
## 2398   2398           confine     negative
## 2399   2399           confine      sadness
## 2400   2400          confined        anger
## 2401   2401          confined      disgust
## 2402   2402          confined         fear
## 2403   2403          confined     negative
## 2404   2404          confined      sadness
## 2405   2405       confinement        anger
## 2406   2406       confinement         fear
## 2407   2407       confinement     negative
## 2408   2408       confinement      sadness
## 2409   2409      confirmation        trust
## 2410   2410         confirmed     positive
## 2411   2411         confirmed        trust
## 2412   2412        confiscate        anger
## 2413   2413        confiscate     negative
## 2414   2414        confiscate      sadness
## 2415   2415      confiscation     negative
## 2416   2416     conflagration        anger
## 2417   2417     conflagration         fear
## 2418   2418     conflagration     negative
## 2419   2419          conflict        anger
## 2420   2420          conflict         fear
## 2421   2421          conflict     negative
## 2422   2422          conflict      sadness
## 2423   2423       conflicting     negative
## 2424   2424       conformance     positive
## 2425   2425        conformity        trust
## 2426   2426          confound     negative
## 2427   2427        confounded     negative
## 2428   2428          confront        anger
## 2429   2429           confuse     negative
## 2430   2430         confusion        anger
## 2431   2431         confusion         fear
## 2432   2432         confusion     negative
## 2433   2433         congenial     positive
## 2434   2434        congestion     negative
## 2435   2435      conglomerate        trust
## 2436   2436    congratulatory          joy
## 2437   2437    congratulatory     positive
## 2438   2438      congregation     positive
## 2439   2439      congregation        trust
## 2440   2440          congress      disgust
## 2441   2441          congress        trust
## 2442   2442       congressman        trust
## 2443   2443        congruence     positive
## 2444   2444        congruence        trust
## 2445   2445        conjecture anticipation
## 2446   2446           conjure anticipation
## 2447   2447           conjure     surprise
## 2448   2448         conjuring     negative
## 2449   2449        connective        trust
## 2450   2450       connoisseur          joy
## 2451   2451       connoisseur     positive
## 2452   2452       connoisseur        trust
## 2453   2453          conquest        anger
## 2454   2454          conquest         fear
## 2455   2455          conquest     negative
## 2456   2456        conscience     positive
## 2457   2457        conscience        trust
## 2458   2458     conscientious     positive
## 2459   2459     conscientious        trust
## 2460   2460     consciousness     positive
## 2461   2461      consecration anticipation
## 2462   2462      consecration          joy
## 2463   2463      consecration     positive
## 2464   2464      consecration      sadness
## 2465   2465      consecration        trust
## 2466   2466        consequent anticipation
## 2467   2467      conservation anticipation
## 2468   2468      conservation     positive
## 2469   2469      conservation        trust
## 2470   2470          conserve     positive
## 2471   2471      considerable     positive
## 2472   2472       considerate     positive
## 2473   2473       considerate        trust
## 2474   2474       consistency     positive
## 2475   2475       consistency        trust
## 2476   2476           console     positive
## 2477   2477           console      sadness
## 2478   2478         consonant     positive
## 2479   2479           consort        trust
## 2480   2480        conspiracy         fear
## 2481   2481       conspirator        anger
## 2482   2482       conspirator anticipation
## 2483   2483       conspirator      disgust
## 2484   2484       conspirator         fear
## 2485   2485       conspirator     negative
## 2486   2486          conspire         fear
## 2487   2487          conspire     negative
## 2488   2488         constable        trust
## 2489   2489         constancy     positive
## 2490   2490         constancy        trust
## 2491   2491          constant     positive
## 2492   2492          constant        trust
## 2493   2493        constantly        trust
## 2494   2494     consternation        anger
## 2495   2495     consternation         fear
## 2496   2496     consternation     negative
## 2497   2497      constipation      disgust
## 2498   2498      constipation     negative
## 2499   2499        constitute        trust
## 2500   2500    constitutional     positive
## 2501   2501    constitutional        trust
## 2502   2502         constrain         fear
## 2503   2503         constrain     negative
## 2504   2504       constrained     negative
## 2505   2505        constraint        anger
## 2506   2506        constraint         fear
## 2507   2507        constraint     negative
## 2508   2508        constraint      sadness
## 2509   2509         construct     positive
## 2510   2510            consul        trust
## 2511   2511           consult        trust
## 2512   2512        consummate     positive
## 2513   2513           contact     positive
## 2514   2514         contagion anticipation
## 2515   2515         contagion      disgust
## 2516   2516         contagion         fear
## 2517   2517         contagion     negative
## 2518   2518        contagious      disgust
## 2519   2519        contagious         fear
## 2520   2520        contagious     negative
## 2521   2521       contaminate      disgust
## 2522   2522       contaminate     negative
## 2523   2523      contaminated      disgust
## 2524   2524      contaminated         fear
## 2525   2525      contaminated     negative
## 2526   2526      contaminated      sadness
## 2527   2527     contamination      disgust
## 2528   2528     contamination     negative
## 2529   2529     contemplation     positive
## 2530   2530          contempt        anger
## 2531   2531          contempt      disgust
## 2532   2532          contempt         fear
## 2533   2533          contempt     negative
## 2534   2534      contemptible        anger
## 2535   2535      contemptible      disgust
## 2536   2536      contemptible     negative
## 2537   2537      contemptuous        anger
## 2538   2538      contemptuous     negative
## 2539   2539           content          joy
## 2540   2540           content     positive
## 2541   2541           content        trust
## 2542   2542       contentious        anger
## 2543   2543       contentious      disgust
## 2544   2544       contentious         fear
## 2545   2545       contentious     negative
## 2546   2546        contingent anticipation
## 2547   2547      continuation anticipation
## 2548   2548          continue anticipation
## 2549   2549          continue     positive
## 2550   2550          continue        trust
## 2551   2551           contour     positive
## 2552   2552        contraband        anger
## 2553   2553        contraband      disgust
## 2554   2554        contraband         fear
## 2555   2555        contraband     negative
## 2556   2556        contracted     negative
## 2557   2557        contradict        anger
## 2558   2558        contradict     negative
## 2559   2559     contradiction     negative
## 2560   2560     contradictory     negative
## 2561   2561          contrary     negative
## 2562   2562        contrasted     negative
## 2563   2563        contravene     negative
## 2564   2564     contravention     negative
## 2565   2565        contribute     positive
## 2566   2566       contributor     positive
## 2567   2567       contributor        trust
## 2568   2568     controversial        anger
## 2569   2569     controversial     negative
## 2570   2570       controversy     negative
## 2571   2571       convenience     positive
## 2572   2572        convenient     positive
## 2573   2573           convent     positive
## 2574   2574           convent        trust
## 2575   2575        convention     positive
## 2576   2576       convergence anticipation
## 2577   2577        conversant     positive
## 2578   2578    conversational     positive
## 2579   2579           convert     positive
## 2580   2580      conveyancing        trust
## 2581   2581           convict        anger
## 2582   2582           convict      disgust
## 2583   2583           convict         fear
## 2584   2584           convict     negative
## 2585   2585           convict      sadness
## 2586   2586        conviction     negative
## 2587   2587          convince anticipation
## 2588   2588          convince     positive
## 2589   2589          convince        trust
## 2590   2590         convinced        trust
## 2591   2591        convincing        trust
## 2592   2592              cool     positive
## 2593   2593          coolness     positive
## 2594   2594              coop        anger
## 2595   2595              coop      disgust
## 2596   2596              coop     negative
## 2597   2597         cooperate     positive
## 2598   2598       cooperating     positive
## 2599   2599       cooperating        trust
## 2600   2600       cooperation     positive
## 2601   2601       cooperation        trust
## 2602   2602       cooperative     positive
## 2603   2603       cooperative        trust
## 2604   2604               cop         fear
## 2605   2605               cop        trust
## 2606   2606              copy     negative
## 2607   2607           copycat        anger
## 2608   2608           copycat      disgust
## 2609   2609           copycat     negative
## 2610   2610              core     positive
## 2611   2611        coronation          joy
## 2612   2612        coronation     positive
## 2613   2613        coronation        trust
## 2614   2614           coroner     negative
## 2615   2615          corporal     negative
## 2616   2616       corporation     positive
## 2617   2617       corporation        trust
## 2618   2618         corporeal     positive
## 2619   2619            corpse      disgust
## 2620   2620            corpse     negative
## 2621   2621            corpse      sadness
## 2622   2622        correction     negative
## 2623   2623        corrective     positive
## 2624   2624       correctness        trust
## 2625   2625    correspondence anticipation
## 2626   2626    correspondence     positive
## 2627   2627       corroborate     positive
## 2628   2628       corroborate        trust
## 2629   2629     corroboration        trust
## 2630   2630         corrosion     negative
## 2631   2631         corrosive         fear
## 2632   2632         corrosive     negative
## 2633   2633           corrupt     negative
## 2634   2634        corrupting        anger
## 2635   2635        corrupting      disgust
## 2636   2636        corrupting         fear
## 2637   2637        corrupting     negative
## 2638   2638        corrupting      sadness
## 2639   2639        corruption      disgust
## 2640   2640        corruption     negative
## 2641   2641             corse      sadness
## 2642   2642      cosmopolitan     positive
## 2643   2643      cosmopolitan        trust
## 2644   2644              cosy     positive
## 2645   2645             couch      sadness
## 2646   2646             cough      disgust
## 2647   2647             cough     negative
## 2648   2648           council anticipation
## 2649   2649           council     positive
## 2650   2650           council        trust
## 2651   2651           counsel     positive
## 2652   2652           counsel        trust
## 2653   2653        counsellor        anger
## 2654   2654        counsellor         fear
## 2655   2655        counsellor     negative
## 2656   2656        counsellor        trust
## 2657   2657         counselor     positive
## 2658   2658         counselor        trust
## 2659   2659             count     positive
## 2660   2660             count        trust
## 2661   2661         countdown anticipation
## 2662   2662          countess     positive
## 2663   2663        countryman        trust
## 2664   2664            county        trust
## 2665   2665              coup        anger
## 2666   2666              coup     surprise
## 2667   2667           courage     positive
## 2668   2668        courageous         fear
## 2669   2669        courageous     positive
## 2670   2670           courier        trust
## 2671   2671          coursing     negative
## 2672   2672             court        anger
## 2673   2673             court anticipation
## 2674   2674             court         fear
## 2675   2675         courteous     positive
## 2676   2676          courtesy     positive
## 2677   2677         courtship anticipation
## 2678   2678         courtship          joy
## 2679   2679         courtship     positive
## 2680   2680         courtship        trust
## 2681   2681              cove anticipation
## 2682   2682              cove      disgust
## 2683   2683              cove         fear
## 2684   2684              cove          joy
## 2685   2685              cove     positive
## 2686   2686          covenant     positive
## 2687   2687          covenant        trust
## 2688   2688             cover        trust
## 2689   2689             covet     negative
## 2690   2690            coward      disgust
## 2691   2691            coward         fear
## 2692   2692            coward     negative
## 2693   2693            coward      sadness
## 2694   2694         cowardice         fear
## 2695   2695         cowardice     negative
## 2696   2696          cowardly         fear
## 2697   2697          cowardly     negative
## 2698   2698               coy         fear
## 2699   2699            coyote         fear
## 2700   2700            crabby        anger
## 2701   2701            crabby     negative
## 2702   2702             crack     negative
## 2703   2703           cracked        anger
## 2704   2704           cracked         fear
## 2705   2705           cracked     negative
## 2706   2706          cracking     negative
## 2707   2707            cradle anticipation
## 2708   2708            cradle          joy
## 2709   2709            cradle     positive
## 2710   2710            cradle        trust
## 2711   2711             craft     positive
## 2712   2712         craftsman     positive
## 2713   2713             cramp anticipation
## 2714   2714             cramp     negative
## 2715   2715           cramped     negative
## 2716   2716             crank     negative
## 2717   2717            cranky        anger
## 2718   2718            cranky     negative
## 2719   2719              crap      disgust
## 2720   2720              crap     negative
## 2721   2721             craps anticipation
## 2722   2722             crash         fear
## 2723   2723             crash     negative
## 2724   2724             crash      sadness
## 2725   2725             crash     surprise
## 2726   2726             crave anticipation
## 2727   2727           craving anticipation
## 2728   2728             crawl      disgust
## 2729   2729             crawl     negative
## 2730   2730            crazed        anger
## 2731   2731            crazed         fear
## 2732   2732            crazed     negative
## 2733   2733             crazy        anger
## 2734   2734             crazy         fear
## 2735   2735             crazy     negative
## 2736   2736             crazy      sadness
## 2737   2737          creaking     negative
## 2738   2738             cream anticipation
## 2739   2739             cream          joy
## 2740   2740             cream     positive
## 2741   2741             cream     surprise
## 2742   2742            create          joy
## 2743   2743            create     positive
## 2744   2744          creative     positive
## 2745   2745          creature      disgust
## 2746   2746          creature         fear
## 2747   2747          creature     negative
## 2748   2748          credence     positive
## 2749   2749          credence        trust
## 2750   2750        credential     positive
## 2751   2751        credential        trust
## 2752   2752       credibility     positive
## 2753   2753       credibility        trust
## 2754   2754          credible     positive
## 2755   2755          credible        trust
## 2756   2756            credit     positive
## 2757   2757            credit        trust
## 2758   2758        creditable     positive
## 2759   2759        creditable        trust
## 2760   2760          credited     positive
## 2761   2761             creep     negative
## 2762   2762          creeping anticipation
## 2763   2763         cremation      sadness
## 2764   2764         crescendo anticipation
## 2765   2765         crescendo          joy
## 2766   2766         crescendo     positive
## 2767   2767         crescendo     surprise
## 2768   2768         crescendo        trust
## 2769   2769              crew        trust
## 2770   2770             crime        anger
## 2771   2771             crime     negative
## 2772   2772          criminal        anger
## 2773   2773          criminal      disgust
## 2774   2774          criminal         fear
## 2775   2775          criminal     negative
## 2776   2776       criminality        anger
## 2777   2777       criminality      disgust
## 2778   2778       criminality         fear
## 2779   2779       criminality     negative
## 2780   2780            cringe      disgust
## 2781   2781            cringe         fear
## 2782   2782            cringe     negative
## 2783   2783            cringe      sadness
## 2784   2784           cripple         fear
## 2785   2785           cripple     negative
## 2786   2786           cripple      sadness
## 2787   2787          crippled     negative
## 2788   2788          crippled      sadness
## 2789   2789            crisis     negative
## 2790   2790             crisp     negative
## 2791   2791             crisp        trust
## 2792   2792            critic     negative
## 2793   2793         criticism        anger
## 2794   2794         criticism     negative
## 2795   2795         criticism      sadness
## 2796   2796         criticize        anger
## 2797   2797         criticize      disgust
## 2798   2798         criticize         fear
## 2799   2799         criticize     negative
## 2800   2800         criticize      sadness
## 2801   2801          critique     positive
## 2802   2802           critter      disgust
## 2803   2803         crocodile         fear
## 2804   2804             crook     negative
## 2805   2805             cross        anger
## 2806   2806             cross         fear
## 2807   2807             cross     negative
## 2808   2808             cross      sadness
## 2809   2809            crouch         fear
## 2810   2810         crouching         fear
## 2811   2811         crouching     negative
## 2812   2812          crowning anticipation
## 2813   2813          crowning          joy
## 2814   2814          crowning     positive
## 2815   2815          crowning     surprise
## 2816   2816          crowning        trust
## 2817   2817           crucial     positive
## 2818   2818           crucial        trust
## 2819   2819          cruciate     negative
## 2820   2820       crucifixion        anger
## 2821   2821       crucifixion      disgust
## 2822   2822       crucifixion         fear
## 2823   2823       crucifixion     negative
## 2824   2824       crucifixion      sadness
## 2825   2825             crude      disgust
## 2826   2826             crude     negative
## 2827   2827             cruel        anger
## 2828   2828             cruel      disgust
## 2829   2829             cruel         fear
## 2830   2830             cruel     negative
## 2831   2831             cruel      sadness
## 2832   2832           cruelly        anger
## 2833   2833           cruelly         fear
## 2834   2834           cruelly     negative
## 2835   2835           cruelty        anger
## 2836   2836           cruelty      disgust
## 2837   2837           cruelty         fear
## 2838   2838           cruelty     negative
## 2839   2839           cruelty      sadness
## 2840   2840         crumbling     negative
## 2841   2841         crumbling      sadness
## 2842   2842            crunch        anger
## 2843   2843            crunch     negative
## 2844   2844           crusade        anger
## 2845   2845           crusade         fear
## 2846   2846           crusade     negative
## 2847   2847           crushed        anger
## 2848   2848           crushed      disgust
## 2849   2849           crushed         fear
## 2850   2850           crushed     negative
## 2851   2851           crushed      sadness
## 2852   2852          crushing        anger
## 2853   2853          crushing      disgust
## 2854   2854          crushing         fear
## 2855   2855          crushing     negative
## 2856   2856            crusty      disgust
## 2857   2857            crusty     negative
## 2858   2858               cry     negative
## 2859   2859               cry      sadness
## 2860   2860            crying     negative
## 2861   2861            crying      sadness
## 2862   2862             crypt         fear
## 2863   2863             crypt     negative
## 2864   2864             crypt      sadness
## 2865   2865           crystal     positive
## 2866   2866              cube        trust
## 2867   2867           cuckold      disgust
## 2868   2868           cuckold     negative
## 2869   2869            cuckoo     negative
## 2870   2870            cuddle          joy
## 2871   2871            cuddle     positive
## 2872   2872            cuddle        trust
## 2873   2873               cue anticipation
## 2874   2874          culinary     positive
## 2875   2875          culinary        trust
## 2876   2876              cull     negative
## 2877   2877       culmination     positive
## 2878   2878       culpability     negative
## 2879   2879          culpable     negative
## 2880   2880           culprit     negative
## 2881   2881              cult         fear
## 2882   2882              cult     negative
## 2883   2883         cultivate anticipation
## 2884   2884         cultivate     positive
## 2885   2885         cultivate        trust
## 2886   2886        cultivated     positive
## 2887   2887       cultivation     positive
## 2888   2888           culture     positive
## 2889   2889        cumbersome     negative
## 2890   2890        cumbersome      sadness
## 2891   2891           cunning     negative
## 2892   2892           cunning     positive
## 2893   2893           cupping      disgust
## 2894   2894           cupping         fear
## 2895   2895           cupping     negative
## 2896   2896           cupping      sadness
## 2897   2897               cur        anger
## 2898   2898               cur      disgust
## 2899   2899               cur         fear
## 2900   2900               cur     negative
## 2901   2901           curable     positive
## 2902   2902           curable        trust
## 2903   2903         curiosity anticipation
## 2904   2904         curiosity     positive
## 2905   2905         curiosity     surprise
## 2906   2906              curl     positive
## 2907   2907             curse        anger
## 2908   2908             curse      disgust
## 2909   2909             curse         fear
## 2910   2910             curse     negative
## 2911   2911             curse      sadness
## 2912   2912            cursed        anger
## 2913   2913            cursed         fear
## 2914   2914            cursed     negative
## 2915   2915            cursed      sadness
## 2916   2916           cursing        anger
## 2917   2917           cursing      disgust
## 2918   2918           cursing     negative
## 2919   2919           cursory     negative
## 2920   2920           cushion     positive
## 2921   2921            cussed        anger
## 2922   2922         custodian        trust
## 2923   2923           custody        trust
## 2924   2924          customer     positive
## 2925   2925              cute     positive
## 2926   2926            cutter         fear
## 2927   2927            cutter     negative
## 2928   2928           cutters     positive
## 2929   2929         cutthroat        anger
## 2930   2930         cutthroat         fear
## 2931   2931         cutthroat     negative
## 2932   2932           cutting        anger
## 2933   2933           cutting      disgust
## 2934   2934           cutting         fear
## 2935   2935           cutting     negative
## 2936   2936           cutting      sadness
## 2937   2937           cyanide         fear
## 2938   2938           cyanide     negative
## 2939   2939           cyclone         fear
## 2940   2940           cyclone     negative
## 2941   2941           cyclone     surprise
## 2942   2942              cyst         fear
## 2943   2943              cyst     negative
## 2944   2944              cyst      sadness
## 2945   2945            cystic      disgust
## 2946   2946   cytomegalovirus     negative
## 2947   2947   cytomegalovirus      sadness
## 2948   2948          dabbling        anger
## 2949   2949          dabbling      disgust
## 2950   2950          dabbling     negative
## 2951   2951            daemon        anger
## 2952   2952            daemon      disgust
## 2953   2953            daemon         fear
## 2954   2954            daemon     negative
## 2955   2955            daemon      sadness
## 2956   2956            daemon     surprise
## 2957   2957              daft      disgust
## 2958   2958              daft     negative
## 2959   2959            dagger         fear
## 2960   2960            dagger     negative
## 2961   2961             daily anticipation
## 2962   2962            damage        anger
## 2963   2963            damage      disgust
## 2964   2964            damage     negative
## 2965   2965            damage      sadness
## 2966   2966           damages     negative
## 2967   2967           damages      sadness
## 2968   2968              dame        anger
## 2969   2969              dame      disgust
## 2970   2970              dame     positive
## 2971   2971              dame        trust
## 2972   2972              damn        anger
## 2973   2973              damn      disgust
## 2974   2974              damn     negative
## 2975   2975         damnation        anger
## 2976   2976         damnation         fear
## 2977   2977         damnation     negative
## 2978   2978         damnation      sadness
## 2979   2979            damned     negative
## 2980   2980            damper     negative
## 2981   2981             dance          joy
## 2982   2982             dance     positive
## 2983   2983             dance        trust
## 2984   2984          dandruff     negative
## 2985   2985             dandy      disgust
## 2986   2986             dandy     negative
## 2987   2987            danger         fear
## 2988   2988            danger     negative
## 2989   2989            danger      sadness
## 2990   2990         dangerous         fear
## 2991   2991         dangerous     negative
## 2992   2992              dank      disgust
## 2993   2993              dare anticipation
## 2994   2994              dare        trust
## 2995   2995            daring     positive
## 2996   2996              dark      sadness
## 2997   2997            darken         fear
## 2998   2998            darken     negative
## 2999   2999            darken      sadness
## 3000   3000          darkened         fear
## 3001   3001          darkened     negative
## 3002   3002          darkened      sadness
## 3003   3003          darkness        anger
## 3004   3004          darkness         fear
## 3005   3005          darkness     negative
## 3006   3006          darkness      sadness
## 3007   3007           darling          joy
## 3008   3008           darling     positive
## 3009   3009           darling        trust
## 3010   3010              dart         fear
## 3011   3011            dashed        anger
## 3012   3012            dashed         fear
## 3013   3013            dashed     negative
## 3014   3014            dashed      sadness
## 3015   3015           dashing     positive
## 3016   3016         dastardly        anger
## 3017   3017         dastardly      disgust
## 3018   3018         dastardly         fear
## 3019   3019         dastardly     negative
## 3020   3020          daughter          joy
## 3021   3021          daughter     positive
## 3022   3022              dawn anticipation
## 3023   3023              dawn          joy
## 3024   3024              dawn     positive
## 3025   3025              dawn     surprise
## 3026   3026              dawn        trust
## 3027   3027             dazed     negative
## 3028   3028            deacon        trust
## 3029   3029        deactivate     negative
## 3030   3030          deadlock     negative
## 3031   3031            deadly        anger
## 3032   3032            deadly      disgust
## 3033   3033            deadly         fear
## 3034   3034            deadly     negative
## 3035   3035            deadly      sadness
## 3036   3036              deal anticipation
## 3037   3037              deal          joy
## 3038   3038              deal     positive
## 3039   3039              deal     surprise
## 3040   3040              deal        trust
## 3041   3041          dealings        trust
## 3042   3042              dear     positive
## 3043   3043             death        anger
## 3044   3044             death anticipation
## 3045   3045             death      disgust
## 3046   3046             death         fear
## 3047   3047             death     negative
## 3048   3048             death      sadness
## 3049   3049             death     surprise
## 3050   3050           debacle         fear
## 3051   3051           debacle     negative
## 3052   3052           debacle      sadness
## 3053   3053            debate     positive
## 3054   3054        debauchery      disgust
## 3055   3055        debauchery         fear
## 3056   3056        debauchery     negative
## 3057   3057         debenture anticipation
## 3058   3058            debris      disgust
## 3059   3059            debris     negative
## 3060   3060              debt     negative
## 3061   3061              debt      sadness
## 3062   3062            debtor     negative
## 3063   3063             decay         fear
## 3064   3064             decay     negative
## 3065   3065             decay      sadness
## 3066   3066           decayed      disgust
## 3067   3067           decayed     negative
## 3068   3068           decayed      sadness
## 3069   3069          deceased     negative
## 3070   3070          deceased      sadness
## 3071   3071            deceit        anger
## 3072   3072            deceit      disgust
## 3073   3073            deceit         fear
## 3074   3074            deceit     negative
## 3075   3075            deceit      sadness
## 3076   3076            deceit     surprise
## 3077   3077         deceitful      disgust
## 3078   3078         deceitful     negative
## 3079   3079         deceitful      sadness
## 3080   3080           deceive        anger
## 3081   3081           deceive      disgust
## 3082   3082           deceive     negative
## 3083   3083           deceive      sadness
## 3084   3084          deceived        anger
## 3085   3085          deceived     negative
## 3086   3086         deceiving     negative
## 3087   3087         deceiving        trust
## 3088   3088           decency     positive
## 3089   3089            decent     positive
## 3090   3090         deception     negative
## 3091   3091         deceptive     negative
## 3092   3092       declaratory     positive
## 3093   3093       declination     negative
## 3094   3094           decline     negative
## 3095   3095         declining     negative
## 3096   3096         decompose      disgust
## 3097   3097        decomposed      sadness
## 3098   3098     decomposition      disgust
## 3099   3099     decomposition         fear
## 3100   3100     decomposition     negative
## 3101   3101     decomposition      sadness
## 3102   3102             decoy     surprise
## 3103   3103          decrease     negative
## 3104   3104         decrement     negative
## 3105   3105          decrepit     negative
## 3106   3106             decry        anger
## 3107   3107             decry     negative
## 3108   3108        dedication     positive
## 3109   3109            deduct     negative
## 3110   3110              deed        trust
## 3111   3111        defamation      disgust
## 3112   3112        defamation         fear
## 3113   3113        defamation     negative
## 3114   3114        defamatory        anger
## 3115   3115        defamatory     negative
## 3116   3116           default      disgust
## 3117   3117           default         fear
## 3118   3118           default     negative
## 3119   3119           default      sadness
## 3120   3120            defeat     negative
## 3121   3121          defeated     negative
## 3122   3122          defeated      sadness
## 3123   3123            defect        anger
## 3124   3124            defect     negative
## 3125   3125         defection         fear
## 3126   3126         defection     negative
## 3127   3127         defective      disgust
## 3128   3128         defective     negative
## 3129   3129            defend         fear
## 3130   3130            defend     positive
## 3131   3131         defendant        anger
## 3132   3132         defendant         fear
## 3133   3133         defendant      sadness
## 3134   3134          defended     positive
## 3135   3135          defended        trust
## 3136   3136          defender     positive
## 3137   3137          defender        trust
## 3138   3138         defending     positive
## 3139   3139           defense        anger
## 3140   3140           defense anticipation
## 3141   3141           defense         fear
## 3142   3142           defense     positive
## 3143   3143       defenseless         fear
## 3144   3144       defenseless     negative
## 3145   3145       defenseless      sadness
## 3146   3146         deference     positive
## 3147   3147         deference        trust
## 3148   3148          deferral     negative
## 3149   3149          defiance        anger
## 3150   3150          defiance      disgust
## 3151   3151          defiance         fear
## 3152   3152          defiance     negative
## 3153   3153           defiant        anger
## 3154   3154           defiant     negative
## 3155   3155        deficiency     negative
## 3156   3156           deficit     negative
## 3157   3157        definitive     positive
## 3158   3158        definitive        trust
## 3159   3159           deflate        anger
## 3160   3160           deflate     negative
## 3161   3161           deflate      sadness
## 3162   3162         deflation         fear
## 3163   3163         deflation     negative
## 3164   3164            deform      disgust
## 3165   3165            deform     negative
## 3166   3166          deformed      disgust
## 3167   3167          deformed     negative
## 3168   3168          deformed      sadness
## 3169   3169         deformity      disgust
## 3170   3170         deformity         fear
## 3171   3171         deformity     negative
## 3172   3172         deformity      sadness
## 3173   3173           defraud        anger
## 3174   3174           defraud      disgust
## 3175   3175           defraud     negative
## 3176   3176           defunct     negative
## 3177   3177           defunct      sadness
## 3178   3178              defy        anger
## 3179   3179              defy         fear
## 3180   3180              defy     negative
## 3181   3181              defy      sadness
## 3182   3182              defy     surprise
## 3183   3183        degeneracy        anger
## 3184   3184        degeneracy      disgust
## 3185   3185        degeneracy     negative
## 3186   3186        degeneracy      sadness
## 3187   3187        degenerate     negative
## 3188   3188       degradation     negative
## 3189   3189           degrade      disgust
## 3190   3190           degrade     negative
## 3191   3191         degrading      disgust
## 3192   3192         degrading         fear
## 3193   3193         degrading     negative
## 3194   3194         degrading      sadness
## 3195   3195            degree     positive
## 3196   3196             delay        anger
## 3197   3197             delay      disgust
## 3198   3198             delay         fear
## 3199   3199             delay     negative
## 3200   3200             delay      sadness
## 3201   3201           delayed     negative
## 3202   3202        delectable     positive
## 3203   3203          delegate     positive
## 3204   3204          delegate        trust
## 3205   3205       deleterious        anger
## 3206   3206       deleterious      disgust
## 3207   3207       deleterious         fear
## 3208   3208       deleterious     negative
## 3209   3209          deletion     negative
## 3210   3210        deliberate     positive
## 3211   3211         delicious          joy
## 3212   3212         delicious     positive
## 3213   3213           delight anticipation
## 3214   3214           delight          joy
## 3215   3215           delight     positive
## 3216   3216         delighted anticipation
## 3217   3217         delighted          joy
## 3218   3218         delighted     positive
## 3219   3219         delighted     surprise
## 3220   3220        delightful anticipation
## 3221   3221        delightful          joy
## 3222   3222        delightful     positive
## 3223   3223        delightful        trust
## 3224   3224       delinquency     negative
## 3225   3225        delinquent        anger
## 3226   3226        delinquent      disgust
## 3227   3227        delinquent     negative
## 3228   3228         delirious     negative
## 3229   3229         delirious      sadness
## 3230   3230          delirium      disgust
## 3231   3231          delirium     negative
## 3232   3232          delirium      sadness
## 3233   3233       deliverance anticipation
## 3234   3234       deliverance          joy
## 3235   3235       deliverance     positive
## 3236   3236       deliverance        trust
## 3237   3237          delivery anticipation
## 3238   3238          delivery     positive
## 3239   3239            deluge         fear
## 3240   3240            deluge     negative
## 3241   3241            deluge      sadness
## 3242   3242            deluge     surprise
## 3243   3243          delusion        anger
## 3244   3244          delusion         fear
## 3245   3245          delusion     negative
## 3246   3246          delusion      sadness
## 3247   3247        delusional        anger
## 3248   3248        delusional         fear
## 3249   3249        delusional     negative
## 3250   3250            demand        anger
## 3251   3251            demand     negative
## 3252   3252         demanding     negative
## 3253   3253          demented         fear
## 3254   3254          demented     negative
## 3255   3255          dementia         fear
## 3256   3256          dementia     negative
## 3257   3257          dementia      sadness
## 3258   3258            demise         fear
## 3259   3259            demise     negative
## 3260   3260            demise      sadness
## 3261   3261         democracy     positive
## 3262   3262          demolish        anger
## 3263   3263          demolish     negative
## 3264   3264          demolish      sadness
## 3265   3265        demolition     negative
## 3266   3266             demon        anger
## 3267   3267             demon      disgust
## 3268   3268             demon         fear
## 3269   3269             demon     negative
## 3270   3270             demon      sadness
## 3271   3271           demonic        anger
## 3272   3272           demonic      disgust
## 3273   3273           demonic         fear
## 3274   3274           demonic     negative
## 3275   3275           demonic      sadness
## 3276   3276      demonstrable     positive
## 3277   3277     demonstrative          joy
## 3278   3278     demonstrative     positive
## 3279   3279     demonstrative      sadness
## 3280   3280       demoralized         fear
## 3281   3281       demoralized     negative
## 3282   3282       demoralized      sadness
## 3283   3283            denial     negative
## 3284   3284            denied     negative
## 3285   3285            denied      sadness
## 3286   3286          denounce        anger
## 3287   3287          denounce      disgust
## 3288   3288          denounce     negative
## 3289   3289         dentistry         fear
## 3290   3290      denunciation        anger
## 3291   3291      denunciation      disgust
## 3292   3292      denunciation         fear
## 3293   3293      denunciation     negative
## 3294   3294              deny        anger
## 3295   3295              deny     negative
## 3296   3296           denying anticipation
## 3297   3297           denying     negative
## 3298   3298            depart anticipation
## 3299   3299            depart      sadness
## 3300   3300          departed     negative
## 3301   3301          departed      sadness
## 3302   3302         departure     negative
## 3303   3303         departure      sadness
## 3304   3304            depend anticipation
## 3305   3305            depend        trust
## 3306   3306        dependence         fear
## 3307   3307        dependence     negative
## 3308   3308        dependence      sadness
## 3309   3309        dependency     negative
## 3310   3310         dependent     negative
## 3311   3311         dependent     positive
## 3312   3312         dependent        trust
## 3313   3313        deplorable        anger
## 3314   3314        deplorable      disgust
## 3315   3315        deplorable         fear
## 3316   3316        deplorable     negative
## 3317   3317        deplorable      sadness
## 3318   3318           deplore        anger
## 3319   3319           deplore      disgust
## 3320   3320           deplore     negative
## 3321   3321           deplore      sadness
## 3322   3322            deport         fear
## 3323   3323            deport     negative
## 3324   3324            deport      sadness
## 3325   3325       deportation        anger
## 3326   3326       deportation         fear
## 3327   3327       deportation     negative
## 3328   3328       deportation      sadness
## 3329   3329        depository        trust
## 3330   3330          depraved        anger
## 3331   3331          depraved anticipation
## 3332   3332          depraved      disgust
## 3333   3333          depraved         fear
## 3334   3334          depraved     negative
## 3335   3335          depraved      sadness
## 3336   3336         depravity        anger
## 3337   3337         depravity      disgust
## 3338   3338         depravity     negative
## 3339   3339        depreciate        anger
## 3340   3340        depreciate      disgust
## 3341   3341        depreciate     negative
## 3342   3342       depreciated        anger
## 3343   3343       depreciated      disgust
## 3344   3344       depreciated         fear
## 3345   3345       depreciated     negative
## 3346   3346       depreciated      sadness
## 3347   3347      depreciation         fear
## 3348   3348      depreciation     negative
## 3349   3349           depress         fear
## 3350   3350           depress     negative
## 3351   3351           depress      sadness
## 3352   3352         depressed        anger
## 3353   3353         depressed         fear
## 3354   3354         depressed     negative
## 3355   3355         depressed      sadness
## 3356   3356        depressing      disgust
## 3357   3357        depressing     negative
## 3358   3358        depressing      sadness
## 3359   3359        depression     negative
## 3360   3360        depression      sadness
## 3361   3361        depressive     negative
## 3362   3362        depressive      sadness
## 3363   3363       deprivation        anger
## 3364   3364       deprivation      disgust
## 3365   3365       deprivation         fear
## 3366   3366       deprivation     negative
## 3367   3367       deprivation      sadness
## 3368   3368             depth     positive
## 3369   3369             depth        trust
## 3370   3370            deputy        trust
## 3371   3371          deranged        anger
## 3372   3372          deranged      disgust
## 3373   3373          deranged         fear
## 3374   3374          deranged     negative
## 3375   3375          derelict     negative
## 3376   3376          derision        anger
## 3377   3377          derision      disgust
## 3378   3378          derision     negative
## 3379   3379     dermatologist        trust
## 3380   3380        derogation        anger
## 3381   3381        derogation      disgust
## 3382   3382        derogation         fear
## 3383   3383        derogation     negative
## 3384   3384        derogation      sadness
## 3385   3385        derogatory        anger
## 3386   3386        derogatory      disgust
## 3387   3387        derogatory         fear
## 3388   3388        derogatory     negative
## 3389   3389        derogatory      sadness
## 3390   3390           descent         fear
## 3391   3391           descent      sadness
## 3392   3392       descriptive     positive
## 3393   3393       desecration        anger
## 3394   3394       desecration      disgust
## 3395   3395       desecration         fear
## 3396   3396       desecration     negative
## 3397   3397       desecration      sadness
## 3398   3398            desert        anger
## 3399   3399            desert      disgust
## 3400   3400            desert         fear
## 3401   3401            desert     negative
## 3402   3402            desert      sadness
## 3403   3403          deserted        anger
## 3404   3404          deserted      disgust
## 3405   3405          deserted         fear
## 3406   3406          deserted     negative
## 3407   3407          deserted      sadness
## 3408   3408         desertion     negative
## 3409   3409           deserve        anger
## 3410   3410           deserve anticipation
## 3411   3411           deserve     positive
## 3412   3412           deserve        trust
## 3413   3413          deserved     positive
## 3414   3414       designation        trust
## 3415   3415          designer     positive
## 3416   3416         desirable     positive
## 3417   3417          desiring     positive
## 3418   3418          desirous     positive
## 3419   3419            desist        anger
## 3420   3420            desist      disgust
## 3421   3421            desist     negative
## 3422   3422        desolation         fear
## 3423   3423        desolation     negative
## 3424   3424        desolation      sadness
## 3425   3425           despair        anger
## 3426   3426           despair      disgust
## 3427   3427           despair         fear
## 3428   3428           despair     negative
## 3429   3429           despair      sadness
## 3430   3430        despairing         fear
## 3431   3431        despairing     negative
## 3432   3432        despairing      sadness
## 3433   3433         desperate     negative
## 3434   3434        despicable        anger
## 3435   3435        despicable      disgust
## 3436   3436        despicable     negative
## 3437   3437           despise        anger
## 3438   3438           despise      disgust
## 3439   3439           despise     negative
## 3440   3440          despotic         fear
## 3441   3441          despotic     negative
## 3442   3442         despotism        anger
## 3443   3443         despotism      disgust
## 3444   3444         despotism         fear
## 3445   3445         despotism     negative
## 3446   3446         despotism      sadness
## 3447   3447       destination anticipation
## 3448   3448       destination         fear
## 3449   3449       destination          joy
## 3450   3450       destination     positive
## 3451   3451       destination      sadness
## 3452   3452       destination     surprise
## 3453   3453          destined anticipation
## 3454   3454         destitute         fear
## 3455   3455         destitute     negative
## 3456   3456         destitute      sadness
## 3457   3457         destroyed        anger
## 3458   3458         destroyed         fear
## 3459   3459         destroyed     negative
## 3460   3460         destroyed      sadness
## 3461   3461         destroyer        anger
## 3462   3462         destroyer         fear
## 3463   3463         destroyer     negative
## 3464   3464        destroying        anger
## 3465   3465        destroying         fear
## 3466   3466        destroying     negative
## 3467   3467        destroying      sadness
## 3468   3468       destruction        anger
## 3469   3469       destruction     negative
## 3470   3470       destructive        anger
## 3471   3471       destructive      disgust
## 3472   3472       destructive         fear
## 3473   3473       destructive     negative
## 3474   3474        detachment     negative
## 3475   3475            detain     negative
## 3476   3476          detainee        anger
## 3477   3477          detainee anticipation
## 3478   3478          detainee         fear
## 3479   3479          detainee     negative
## 3480   3480          detainee      sadness
## 3481   3481            detect     positive
## 3482   3482         detection     positive
## 3483   3483         detention     negative
## 3484   3484         detention      sadness
## 3485   3485       deteriorate         fear
## 3486   3486       deteriorate     negative
## 3487   3487       deteriorate      sadness
## 3488   3488      deteriorated      disgust
## 3489   3489      deteriorated     negative
## 3490   3490      deteriorated      sadness
## 3491   3491     deterioration        anger
## 3492   3492     deterioration      disgust
## 3493   3493     deterioration         fear
## 3494   3494     deterioration     negative
## 3495   3495     deterioration      sadness
## 3496   3496       determinate anticipation
## 3497   3497       determinate        trust
## 3498   3498     determination     positive
## 3499   3499     determination        trust
## 3500   3500        determined     positive
## 3501   3501            detest        anger
## 3502   3502            detest      disgust
## 3503   3503            detest     negative
## 3504   3504          detonate         fear
## 3505   3505          detonate     negative
## 3506   3506          detonate     surprise
## 3507   3507        detonation        anger
## 3508   3508           detract        anger
## 3509   3509           detract     negative
## 3510   3510         detriment     negative
## 3511   3511       detrimental     negative
## 3512   3512          detritus     negative
## 3513   3513         devastate        anger
## 3514   3514         devastate         fear
## 3515   3515         devastate     negative
## 3516   3516         devastate      sadness
## 3517   3517       devastating        anger
## 3518   3518       devastating      disgust
## 3519   3519       devastating         fear
## 3520   3520       devastating     negative
## 3521   3521       devastating      sadness
## 3522   3522       devastating        trust
## 3523   3523       devastation        anger
## 3524   3524       devastation         fear
## 3525   3525       devastation     negative
## 3526   3526       devastation      sadness
## 3527   3527       devastation     surprise
## 3528   3528           develop anticipation
## 3529   3529           develop     positive
## 3530   3530         deviation      sadness
## 3531   3531             devil        anger
## 3532   3532             devil anticipation
## 3533   3533             devil      disgust
## 3534   3534             devil         fear
## 3535   3535             devil     negative
## 3536   3536             devil      sadness
## 3537   3537          devilish      disgust
## 3538   3538          devilish         fear
## 3539   3539          devilish     negative
## 3540   3540           devious     negative
## 3541   3541        devolution     negative
## 3542   3542        devotional     positive
## 3543   3543        devotional        trust
## 3544   3544            devour     negative
## 3545   3545            devout anticipation
## 3546   3546            devout          joy
## 3547   3547            devout     positive
## 3548   3548            devout        trust
## 3549   3549         dexterity     positive
## 3550   3550        diabolical        anger
## 3551   3551        diabolical      disgust
## 3552   3552        diabolical         fear
## 3553   3553        diabolical     negative
## 3554   3554         diagnosis anticipation
## 3555   3555         diagnosis         fear
## 3556   3556         diagnosis     negative
## 3557   3557         diagnosis        trust
## 3558   3558           diamond          joy
## 3559   3559           diamond     positive
## 3560   3560            diaper      disgust
## 3561   3561         diarrhoea      disgust
## 3562   3562             diary          joy
## 3563   3563             diary     positive
## 3564   3564             diary        trust
## 3565   3565          diatribe        anger
## 3566   3566          diatribe      disgust
## 3567   3567          diatribe     negative
## 3568   3568          dictator         fear
## 3569   3569          dictator     negative
## 3570   3570       dictatorial        anger
## 3571   3571       dictatorial     negative
## 3572   3572      dictatorship        anger
## 3573   3573      dictatorship anticipation
## 3574   3574      dictatorship      disgust
## 3575   3575      dictatorship         fear
## 3576   3576      dictatorship     negative
## 3577   3577      dictatorship      sadness
## 3578   3578        dictionary     positive
## 3579   3579        dictionary        trust
## 3580   3580            dictum        trust
## 3581   3581          didactic     positive
## 3582   3582               die         fear
## 3583   3583               die     negative
## 3584   3584               die      sadness
## 3585   3585           dietary anticipation
## 3586   3586           dietary     positive
## 3587   3587      differential        trust
## 3588   3588       differently     surprise
## 3589   3589         difficult         fear
## 3590   3590      difficulties     negative
## 3591   3591      difficulties      sadness
## 3592   3592        difficulty        anger
## 3593   3593        difficulty         fear
## 3594   3594        difficulty     negative
## 3595   3595        difficulty      sadness
## 3596   3596             digit        trust
## 3597   3597         dignified     positive
## 3598   3598           dignity     positive
## 3599   3599           dignity        trust
## 3600   3600           digress anticipation
## 3601   3601           digress     negative
## 3602   3602              dike         fear
## 3603   3603       dilapidated      disgust
## 3604   3604       dilapidated     negative
## 3605   3605       dilapidated      sadness
## 3606   3606         diligence     positive
## 3607   3607         diligence        trust
## 3608   3608            dilute     negative
## 3609   3609          diminish     negative
## 3610   3610          diminish      sadness
## 3611   3611        diminished     negative
## 3612   3612               din     negative
## 3613   3613            dinner     positive
## 3614   3614          dinosaur         fear
## 3615   3615         diplomacy anticipation
## 3616   3616         diplomacy     positive
## 3617   3617         diplomacy        trust
## 3618   3618        diplomatic     positive
## 3619   3619        diplomatic        trust
## 3620   3620              dire      disgust
## 3621   3621              dire         fear
## 3622   3622              dire     negative
## 3623   3623              dire      sadness
## 3624   3624              dire     surprise
## 3625   3625          director     positive
## 3626   3626          director        trust
## 3627   3627              dirt      disgust
## 3628   3628              dirt     negative
## 3629   3629             dirty      disgust
## 3630   3630             dirty     negative
## 3631   3631        disability     negative
## 3632   3632        disability      sadness
## 3633   3633           disable         fear
## 3634   3634           disable     negative
## 3635   3635           disable      sadness
## 3636   3636          disabled         fear
## 3637   3637          disabled     negative
## 3638   3638          disabled      sadness
## 3639   3639       disaffected     negative
## 3640   3640          disagree        anger
## 3641   3641          disagree     negative
## 3642   3642       disagreeing        anger
## 3643   3643       disagreeing     negative
## 3644   3644       disagreeing      sadness
## 3645   3645      disagreement        anger
## 3646   3646      disagreement     negative
## 3647   3647      disagreement      sadness
## 3648   3648        disallowed        anger
## 3649   3649        disallowed      disgust
## 3650   3650        disallowed         fear
## 3651   3651        disallowed     negative
## 3652   3652        disallowed      sadness
## 3653   3653         disappear         fear
## 3654   3654        disappoint        anger
## 3655   3655        disappoint      disgust
## 3656   3656        disappoint     negative
## 3657   3657        disappoint      sadness
## 3658   3658      disappointed        anger
## 3659   3659      disappointed      disgust
## 3660   3660      disappointed     negative
## 3661   3661      disappointed      sadness
## 3662   3662     disappointing     negative
## 3663   3663     disappointing      sadness
## 3664   3664    disappointment      disgust
## 3665   3665    disappointment     negative
## 3666   3666    disappointment      sadness
## 3667   3667       disapproval     negative
## 3668   3668       disapproval      sadness
## 3669   3669        disapprove        anger
## 3670   3670        disapprove      disgust
## 3671   3671        disapprove         fear
## 3672   3672        disapprove     negative
## 3673   3673        disapprove      sadness
## 3674   3674       disapproved        anger
## 3675   3675       disapproved     negative
## 3676   3676       disapproved      sadness
## 3677   3677      disapproving        anger
## 3678   3678      disapproving      disgust
## 3679   3679      disapproving     negative
## 3680   3680      disapproving      sadness
## 3681   3681          disaster        anger
## 3682   3682          disaster      disgust
## 3683   3683          disaster         fear
## 3684   3684          disaster     negative
## 3685   3685          disaster      sadness
## 3686   3686          disaster     surprise
## 3687   3687        disastrous        anger
## 3688   3688        disastrous         fear
## 3689   3689        disastrous     negative
## 3690   3690        disastrous      sadness
## 3691   3691        disbelieve     negative
## 3692   3692          discards     negative
## 3693   3693         discharge     negative
## 3694   3694          disciple        trust
## 3695   3695        discipline         fear
## 3696   3696        discipline     negative
## 3697   3697          disclaim        anger
## 3698   3698          disclaim      disgust
## 3699   3699          disclaim     negative
## 3700   3700          disclaim        trust
## 3701   3701         disclosed        trust
## 3702   3702     discoloration      disgust
## 3703   3703     discoloration     negative
## 3704   3704        discolored      disgust
## 3705   3705        discolored     negative
## 3706   3706        discolored      sadness
## 3707   3707        discomfort     negative
## 3708   3708        discomfort      sadness
## 3709   3709        disconnect     negative
## 3710   3710        disconnect      sadness
## 3711   3711      disconnected     negative
## 3712   3712      disconnected      sadness
## 3713   3713     disconnection     negative
## 3714   3714        discontent        anger
## 3715   3715        discontent      disgust
## 3716   3716        discontent         fear
## 3717   3717        discontent     negative
## 3718   3718        discontent      sadness
## 3719   3719       discontinue     negative
## 3720   3720     discontinuity      disgust
## 3721   3721     discontinuity         fear
## 3722   3722     discontinuity     negative
## 3723   3723     discontinuity      sadness
## 3724   3724           discord        anger
## 3725   3725           discord      disgust
## 3726   3726           discord     negative
## 3727   3727        discourage         fear
## 3728   3728        discourage     negative
## 3729   3729        discourage      sadness
## 3730   3730    discouragement     negative
## 3731   3731         discovery     positive
## 3732   3732         discredit     negative
## 3733   3733          discreet anticipation
## 3734   3734          discreet     positive
## 3735   3735        discretion anticipation
## 3736   3736        discretion     positive
## 3737   3737        discretion        trust
## 3738   3738     discretionary     positive
## 3739   3739      discriminate        anger
## 3740   3740      discriminate     negative
## 3741   3741      discriminate      sadness
## 3742   3742    discriminating      disgust
## 3743   3743    discriminating     negative
## 3744   3744    discrimination        anger
## 3745   3745    discrimination      disgust
## 3746   3746    discrimination         fear
## 3747   3747    discrimination     negative
## 3748   3748    discrimination      sadness
## 3749   3749        discussion     positive
## 3750   3750           disdain        anger
## 3751   3751           disdain      disgust
## 3752   3752           disdain     negative
## 3753   3753           disease        anger
## 3754   3754           disease      disgust
## 3755   3755           disease         fear
## 3756   3756           disease     negative
## 3757   3757           disease      sadness
## 3758   3758          diseased      disgust
## 3759   3759          diseased         fear
## 3760   3760          diseased     negative
## 3761   3761          diseased      sadness
## 3762   3762       disembodied         fear
## 3763   3763       disembodied     negative
## 3764   3764       disembodied      sadness
## 3765   3765     disengagement     negative
## 3766   3766        disfigured        anger
## 3767   3767        disfigured      disgust
## 3768   3768        disfigured         fear
## 3769   3769        disfigured     negative
## 3770   3770        disfigured      sadness
## 3771   3771          disgrace        anger
## 3772   3772          disgrace      disgust
## 3773   3773          disgrace     negative
## 3774   3774          disgrace      sadness
## 3775   3775         disgraced        anger
## 3776   3776         disgraced      disgust
## 3777   3777         disgraced     negative
## 3778   3778         disgraced      sadness
## 3779   3779       disgraceful        anger
## 3780   3780       disgraceful      disgust
## 3781   3781       disgraceful     negative
## 3782   3782       disgruntled        anger
## 3783   3783       disgruntled      disgust
## 3784   3784       disgruntled     negative
## 3785   3785       disgruntled      sadness
## 3786   3786           disgust        anger
## 3787   3787           disgust      disgust
## 3788   3788           disgust         fear
## 3789   3789           disgust     negative
## 3790   3790           disgust      sadness
## 3791   3791        disgusting        anger
## 3792   3792        disgusting      disgust
## 3793   3793        disgusting         fear
## 3794   3794        disgusting     negative
## 3795   3795      disheartened     negative
## 3796   3796      disheartened      sadness
## 3797   3797     disheartening     negative
## 3798   3798     disheartening      sadness
## 3799   3799         dishonest        anger
## 3800   3800         dishonest      disgust
## 3801   3801         dishonest     negative
## 3802   3802         dishonest      sadness
## 3803   3803        dishonesty      disgust
## 3804   3804        dishonesty     negative
## 3805   3805          dishonor        anger
## 3806   3806          dishonor      disgust
## 3807   3807          dishonor         fear
## 3808   3808          dishonor     negative
## 3809   3809          dishonor      sadness
## 3810   3810   disillusionment        anger
## 3811   3811   disillusionment      disgust
## 3812   3812   disillusionment     negative
## 3813   3813   disillusionment      sadness
## 3814   3814      disinfection     positive
## 3815   3815    disinformation        anger
## 3816   3816    disinformation         fear
## 3817   3817    disinformation     negative
## 3818   3818      disingenuous      disgust
## 3819   3819      disingenuous     negative
## 3820   3820      disintegrate      disgust
## 3821   3821      disintegrate         fear
## 3822   3822      disintegrate     negative
## 3823   3823    disintegration     negative
## 3824   3824     disinterested     negative
## 3825   3825           dislike        anger
## 3826   3826           dislike      disgust
## 3827   3827           dislike     negative
## 3828   3828          disliked        anger
## 3829   3829          disliked     negative
## 3830   3830          disliked      sadness
## 3831   3831        dislocated        anger
## 3832   3832        dislocated      disgust
## 3833   3833        dislocated         fear
## 3834   3834        dislocated     negative
## 3835   3835        dislocated      sadness
## 3836   3836            dismal      disgust
## 3837   3837            dismal         fear
## 3838   3838            dismal     negative
## 3839   3839            dismal      sadness
## 3840   3840            dismay        anger
## 3841   3841            dismay anticipation
## 3842   3842            dismay         fear
## 3843   3843            dismay     negative
## 3844   3844            dismay      sadness
## 3845   3845            dismay     surprise
## 3846   3846     dismemberment      disgust
## 3847   3847     dismemberment         fear
## 3848   3848     dismemberment     negative
## 3849   3849     dismemberment      sadness
## 3850   3850         dismissal        anger
## 3851   3851         dismissal      disgust
## 3852   3852         dismissal         fear
## 3853   3853         dismissal     negative
## 3854   3854         dismissal      sadness
## 3855   3855         dismissal     surprise
## 3856   3856      disobedience        anger
## 3857   3857      disobedience      disgust
## 3858   3858      disobedience     negative
## 3859   3859       disobedient        anger
## 3860   3860       disobedient     negative
## 3861   3861           disobey        anger
## 3862   3862           disobey      disgust
## 3863   3863           disobey     negative
## 3864   3864          disorder         fear
## 3865   3865          disorder     negative
## 3866   3866        disorderly     negative
## 3867   3867      disorganized     negative
## 3868   3868         disparage        anger
## 3869   3869         disparage      disgust
## 3870   3870         disparage     negative
## 3871   3871         disparage      sadness
## 3872   3872       disparaging        anger
## 3873   3873       disparaging      disgust
## 3874   3874       disparaging     negative
## 3875   3875       disparaging      sadness
## 3876   3876         disparity        anger
## 3877   3877         disparity      disgust
## 3878   3878         disparity     negative
## 3879   3879         disparity      sadness
## 3880   3880     dispassionate     negative
## 3881   3881     dispassionate      sadness
## 3882   3882            dispel     negative
## 3883   3883            dispel      sadness
## 3884   3884        dispersion     negative
## 3885   3885          displace     negative
## 3886   3886         displaced        anger
## 3887   3887         displaced         fear
## 3888   3888         displaced      sadness
## 3889   3889        displeased        anger
## 3890   3890        displeased      disgust
## 3891   3891        displeased         fear
## 3892   3892        displeased     negative
## 3893   3893        displeased      sadness
## 3894   3894       displeasure      disgust
## 3895   3895       displeasure     negative
## 3896   3896          disposal     negative
## 3897   3897           dispose      disgust
## 3898   3898          disposed anticipation
## 3899   3899          disposed     positive
## 3900   3900          disposed        trust
## 3901   3901      dispossessed        anger
## 3902   3902      dispossessed         fear
## 3903   3903      dispossessed     negative
## 3904   3904      dispossessed      sadness
## 3905   3905           dispute        anger
## 3906   3906           dispute     negative
## 3907   3907  disqualification     negative
## 3908   3908      disqualified        anger
## 3909   3909      disqualified      disgust
## 3910   3910      disqualified     negative
## 3911   3911      disqualified      sadness
## 3912   3912        disqualify     negative
## 3913   3913        disqualify      sadness
## 3914   3914         disregard     negative
## 3915   3915       disregarded      disgust
## 3916   3916       disregarded     negative
## 3917   3917      disreputable        anger
## 3918   3918      disreputable      disgust
## 3919   3919      disreputable         fear
## 3920   3920      disreputable     negative
## 3921   3921        disrespect        anger
## 3922   3922        disrespect     negative
## 3923   3923     disrespectful        anger
## 3924   3924     disrespectful      disgust
## 3925   3925     disrespectful         fear
## 3926   3926     disrespectful     negative
## 3927   3927     disrespectful      sadness
## 3928   3928        disruption        anger
## 3929   3929        disruption         fear
## 3930   3930        disruption     negative
## 3931   3931        disruption     surprise
## 3932   3932   dissatisfaction     negative
## 3933   3933        dissection      disgust
## 3934   3934       disseminate     positive
## 3935   3935        dissension        anger
## 3936   3936        dissension     negative
## 3937   3937        dissenting     negative
## 3938   3938        disservice        anger
## 3939   3939        disservice      disgust
## 3940   3940        disservice     negative
## 3941   3941        disservice      sadness
## 3942   3942         dissident        anger
## 3943   3943         dissident         fear
## 3944   3944         dissident     negative
## 3945   3945       dissolution        anger
## 3946   3946       dissolution         fear
## 3947   3947       dissolution     negative
## 3948   3948       dissolution      sadness
## 3949   3949       dissolution     surprise
## 3950   3950        dissonance        anger
## 3951   3951        dissonance     negative
## 3952   3952          distaste      disgust
## 3953   3953          distaste     negative
## 3954   3954       distasteful      disgust
## 3955   3955       distasteful     negative
## 3956   3956      distillation     positive
## 3957   3957       distinction     positive
## 3958   3958         distorted      disgust
## 3959   3959         distorted     negative
## 3960   3960        distortion     negative
## 3961   3961          distract     negative
## 3962   3962        distracted        anger
## 3963   3963        distracted     negative
## 3964   3964       distracting        anger
## 3965   3965       distracting anticipation
## 3966   3966       distracting     negative
## 3967   3967       distraction     negative
## 3968   3968        distraught     negative
## 3969   3969        distraught      sadness
## 3970   3970          distress        anger
## 3971   3971          distress      disgust
## 3972   3972          distress         fear
## 3973   3973          distress     negative
## 3974   3974          distress      sadness
## 3975   3975          distress     surprise
## 3976   3976        distressed         fear
## 3977   3977        distressed     negative
## 3978   3978       distressing        anger
## 3979   3979       distressing         fear
## 3980   3980       distressing     negative
## 3981   3981          distrust        anger
## 3982   3982          distrust      disgust
## 3983   3983          distrust         fear
## 3984   3984          distrust     negative
## 3985   3985       disturbance        anger
## 3986   3986       disturbance         fear
## 3987   3987       disturbance     negative
## 3988   3988       disturbance      sadness
## 3989   3989       disturbance     surprise
## 3990   3990         disturbed        anger
## 3991   3991         disturbed     negative
## 3992   3992         disturbed      sadness
## 3993   3993            disuse     negative
## 3994   3994           disused        anger
## 3995   3995           disused     negative
## 3996   3996             ditty          joy
## 3997   3997             ditty     positive
## 3998   3998             divan        trust
## 3999   3999         divergent     negative
## 4000   4000         divergent     surprise
## 4001   4001           diverse     negative
## 4002   4002           diverse     positive
## 4003   4003       diversified     positive
## 4004   4004         diversion     positive
## 4005   4005         diversion     surprise
## 4006   4006          divested     negative
## 4007   4007        divestment     negative
## 4008   4008        divination anticipation
## 4009   4009          divinity     positive
## 4010   4010           divorce        anger
## 4011   4011           divorce      disgust
## 4012   4012           divorce         fear
## 4013   4013           divorce     negative
## 4014   4014           divorce      sadness
## 4015   4015           divorce     surprise
## 4016   4016           divorce        trust
## 4017   4017         dizziness     negative
## 4018   4018             dizzy     negative
## 4019   4019            docked     negative
## 4020   4020            doctor     positive
## 4021   4021            doctor        trust
## 4022   4022          doctrine        trust
## 4023   4023              doer     positive
## 4024   4024            dogged     positive
## 4025   4025             dogma        trust
## 4026   4026              doit     negative
## 4027   4027          doldrums     negative
## 4028   4028          doldrums      sadness
## 4029   4029              dole     negative
## 4030   4030              dole      sadness
## 4031   4031              doll          joy
## 4032   4032             dolor     negative
## 4033   4033             dolor      sadness
## 4034   4034           dolphin          joy
## 4035   4035           dolphin     positive
## 4036   4036           dolphin     surprise
## 4037   4037           dolphin        trust
## 4038   4038          dominant         fear
## 4039   4039          dominant     negative
## 4040   4040          dominate        anger
## 4041   4041          dominate         fear
## 4042   4042          dominate     negative
## 4043   4043          dominate     positive
## 4044   4044        domination        anger
## 4045   4045        domination         fear
## 4046   4046        domination     negative
## 4047   4047        domination      sadness
## 4048   4048          dominion         fear
## 4049   4049          dominion        trust
## 4050   4050               don     positive
## 4051   4051               don        trust
## 4052   4052          donation     positive
## 4053   4053            donkey      disgust
## 4054   4054            donkey     negative
## 4055   4055            doodle     negative
## 4056   4056              doom         fear
## 4057   4057              doom     negative
## 4058   4058            doomed         fear
## 4059   4059            doomed     negative
## 4060   4060            doomed      sadness
## 4061   4061          doomsday        anger
## 4062   4062          doomsday anticipation
## 4063   4063          doomsday      disgust
## 4064   4064          doomsday         fear
## 4065   4065          doomsday     negative
## 4066   4066          doomsday      sadness
## 4067   4067             doubt         fear
## 4068   4068             doubt     negative
## 4069   4069             doubt      sadness
## 4070   4070             doubt        trust
## 4071   4071          doubtful     negative
## 4072   4072          doubting     negative
## 4073   4073         doubtless     positive
## 4074   4074         doubtless        trust
## 4075   4075            douche     negative
## 4076   4076              dour     negative
## 4077   4077              dove anticipation
## 4078   4078              dove          joy
## 4079   4079              dove     positive
## 4080   4080              dove        trust
## 4081   4081          downfall         fear
## 4082   4082          downfall     negative
## 4083   4083          downfall      sadness
## 4084   4084         downright        trust
## 4085   4085             downy     positive
## 4086   4086              drab     negative
## 4087   4087              drab      sadness
## 4088   4088             draft anticipation
## 4089   4089            dragon         fear
## 4090   4090          drainage     negative
## 4091   4091          drawback     negative
## 4092   4092             dread anticipation
## 4093   4093             dread         fear
## 4094   4094             dread     negative
## 4095   4095          dreadful        anger
## 4096   4096          dreadful anticipation
## 4097   4097          dreadful      disgust
## 4098   4098          dreadful         fear
## 4099   4099          dreadful     negative
## 4100   4100          dreadful      sadness
## 4101   4101        dreadfully      disgust
## 4102   4102        dreadfully         fear
## 4103   4103        dreadfully     negative
## 4104   4104        dreadfully      sadness
## 4105   4105        dreadfully     surprise
## 4106   4106            dreary     negative
## 4107   4107            dreary      sadness
## 4108   4108          drinking     negative
## 4109   4109            drivel      disgust
## 4110   4110            drivel     negative
## 4111   4111             drone     negative
## 4112   4112             drool      disgust
## 4113   4113          drooping     negative
## 4114   4114           drought     negative
## 4115   4115             drown         fear
## 4116   4116             drown     negative
## 4117   4117             drown      sadness
## 4118   4118        drowsiness     negative
## 4119   4119          drudgery     negative
## 4120   4120           drugged      sadness
## 4121   4121           drunken      disgust
## 4122   4122           drunken     negative
## 4123   4123       drunkenness     negative
## 4124   4124           dubious         fear
## 4125   4125           dubious     negative
## 4126   4126           dubious        trust
## 4127   4127              duel        anger
## 4128   4128              duel anticipation
## 4129   4129              duel         fear
## 4130   4130              duet     positive
## 4131   4131              duke     positive
## 4132   4132              dull     negative
## 4133   4133              dull      sadness
## 4134   4134              dumb     negative
## 4135   4135             dummy     negative
## 4136   4136             dumps        anger
## 4137   4137             dumps     negative
## 4138   4138             dumps      sadness
## 4139   4139               dun     negative
## 4140   4140              dung      disgust
## 4141   4141           dungeon         fear
## 4142   4142           dungeon     negative
## 4143   4143              dupe        anger
## 4144   4144              dupe     negative
## 4145   4145         duplicity        anger
## 4146   4146         duplicity     negative
## 4147   4147        durability     positive
## 4148   4148        durability        trust
## 4149   4149           durable     positive
## 4150   4150           durable        trust
## 4151   4151            duress        anger
## 4152   4152            duress      disgust
## 4153   4153            duress         fear
## 4154   4154            duress     negative
## 4155   4155            duress      sadness
## 4156   4156              dust     negative
## 4157   4157           dutiful anticipation
## 4158   4158           dutiful     positive
## 4159   4159           dutiful        trust
## 4160   4160           dwarfed         fear
## 4161   4161           dwarfed     negative
## 4162   4162           dwarfed      sadness
## 4163   4163             dying        anger
## 4164   4164             dying      disgust
## 4165   4165             dying         fear
## 4166   4166             dying     negative
## 4167   4167             dying      sadness
## 4168   4168           dynamic     surprise
## 4169   4169         dysentery      disgust
## 4170   4170         dysentery     negative
## 4171   4171         dysentery      sadness
## 4172   4172             eager anticipation
## 4173   4173             eager          joy
## 4174   4174             eager     positive
## 4175   4175             eager     surprise
## 4176   4176             eager        trust
## 4177   4177         eagerness anticipation
## 4178   4178         eagerness          joy
## 4179   4179         eagerness     positive
## 4180   4180         eagerness        trust
## 4181   4181             eagle        trust
## 4182   4182              earl     positive
## 4183   4183              earn     positive
## 4184   4184           earnest     positive
## 4185   4185         earnestly     positive
## 4186   4186       earnestness     positive
## 4187   4187        earthquake        anger
## 4188   4188        earthquake         fear
## 4189   4189        earthquake     negative
## 4190   4190        earthquake      sadness
## 4191   4191        earthquake     surprise
## 4192   4192              ease     positive
## 4193   4193          easement     positive
## 4194   4194         easygoing     positive
## 4195   4195               eat     positive
## 4196   4196     eavesdropping     negative
## 4197   4197           economy        trust
## 4198   4198           ecstasy anticipation
## 4199   4199           ecstasy          joy
## 4200   4200           ecstasy     positive
## 4201   4201          ecstatic anticipation
## 4202   4202          ecstatic          joy
## 4203   4203          ecstatic     positive
## 4204   4204          ecstatic     surprise
## 4205   4205             edict         fear
## 4206   4206             edict     negative
## 4207   4207       edification anticipation
## 4208   4208       edification          joy
## 4209   4209       edification     positive
## 4210   4210       edification        trust
## 4211   4211           edition anticipation
## 4212   4212           educate     positive
## 4213   4213          educated     positive
## 4214   4214       educational     positive
## 4215   4215       educational        trust
## 4216   4216               eel         fear
## 4217   4217         effective     positive
## 4218   4218         effective        trust
## 4219   4219        effeminate     negative
## 4220   4220          efficacy     positive
## 4221   4221        efficiency     positive
## 4222   4222         efficient anticipation
## 4223   4223         efficient     positive
## 4224   4224         efficient        trust
## 4225   4225            effigy        anger
## 4226   4226            effort     positive
## 4227   4227       egotistical      disgust
## 4228   4228       egotistical     negative
## 4229   4229         egregious        anger
## 4230   4230         egregious      disgust
## 4231   4231         egregious     negative
## 4232   4232       ejaculation anticipation
## 4233   4233       ejaculation          joy
## 4234   4234       ejaculation     positive
## 4235   4235       ejaculation     surprise
## 4236   4236       ejaculation        trust
## 4237   4237             eject     negative
## 4238   4238          ejection     negative
## 4239   4239       elaboration     positive
## 4240   4240            elated          joy
## 4241   4241            elated     positive
## 4242   4242             elbow        anger
## 4243   4243             elder     positive
## 4244   4244             elder        trust
## 4245   4245            elders     positive
## 4246   4246            elders        trust
## 4247   4247             elect     positive
## 4248   4248             elect        trust
## 4249   4249        electorate        trust
## 4250   4250          electric          joy
## 4251   4251          electric     positive
## 4252   4252          electric     surprise
## 4253   4253       electricity     positive
## 4254   4254          elegance anticipation
## 4255   4255          elegance          joy
## 4256   4256          elegance     positive
## 4257   4257          elegance        trust
## 4258   4258           elegant          joy
## 4259   4259           elegant     positive
## 4260   4260         elevation anticipation
## 4261   4261         elevation         fear
## 4262   4262         elevation          joy
## 4263   4263         elevation     positive
## 4264   4264         elevation        trust
## 4265   4265               elf        anger
## 4266   4266               elf      disgust
## 4267   4267               elf         fear
## 4268   4268          eligible     positive
## 4269   4269       elimination        anger
## 4270   4270       elimination      disgust
## 4271   4271       elimination         fear
## 4272   4272       elimination     negative
## 4273   4273       elimination      sadness
## 4274   4274             elite anticipation
## 4275   4275             elite          joy
## 4276   4276             elite     positive
## 4277   4277             elite        trust
## 4278   4278         eloquence     positive
## 4279   4279          eloquent     positive
## 4280   4280         elucidate     positive
## 4281   4281         elucidate        trust
## 4282   4282           elusive     negative
## 4283   4283           elusive     surprise
## 4284   4284         emaciated         fear
## 4285   4285         emaciated     negative
## 4286   4286         emaciated      sadness
## 4287   4287      emancipation anticipation
## 4288   4288      emancipation          joy
## 4289   4289      emancipation     positive
## 4290   4290           embargo     negative
## 4291   4291         embarrass     negative
## 4292   4292         embarrass      sadness
## 4293   4293      embarrassing     negative
## 4294   4294     embarrassment         fear
## 4295   4295     embarrassment     negative
## 4296   4296     embarrassment      sadness
## 4297   4297     embarrassment     surprise
## 4298   4298      embezzlement     negative
## 4299   4299          embolism         fear
## 4300   4300          embolism     negative
## 4301   4301          embolism      sadness
## 4302   4302           embrace anticipation
## 4303   4303           embrace          joy
## 4304   4304           embrace     positive
## 4305   4305           embrace     surprise
## 4306   4306           embrace        trust
## 4307   4307         embroiled     negative
## 4308   4308         emergency         fear
## 4309   4309         emergency     negative
## 4310   4310         emergency      sadness
## 4311   4311         emergency     surprise
## 4312   4312          emeritus     positive
## 4313   4313          eminence     positive
## 4314   4314          eminence        trust
## 4315   4315           eminent     positive
## 4316   4316         eminently     positive
## 4317   4317              emir     positive
## 4318   4318           empathy     positive
## 4319   4319         emphasize        trust
## 4320   4320            employ        trust
## 4321   4321           empower     positive
## 4322   4322         emptiness      sadness
## 4323   4323           emulate     positive
## 4324   4324            enable     positive
## 4325   4325            enable        trust
## 4326   4326        enablement     positive
## 4327   4327        enablement        trust
## 4328   4328           enchant anticipation
## 4329   4329           enchant          joy
## 4330   4330           enchant     positive
## 4331   4331           enchant     surprise
## 4332   4332         enchanted          joy
## 4333   4333         enchanted     positive
## 4334   4334         enchanted        trust
## 4335   4335        enchanting anticipation
## 4336   4336        enchanting          joy
## 4337   4337        enchanting     positive
## 4338   4338           enclave     negative
## 4339   4339            encore     positive
## 4340   4340         encourage          joy
## 4341   4341         encourage     positive
## 4342   4342         encourage        trust
## 4343   4343     encouragement     positive
## 4344   4344      encroachment         fear
## 4345   4345      encroachment     negative
## 4346   4346       encumbrance        anger
## 4347   4347       encumbrance         fear
## 4348   4348       encumbrance     negative
## 4349   4349       encumbrance      sadness
## 4350   4350      encyclopedia     positive
## 4351   4351      encyclopedia        trust
## 4352   4352          endanger anticipation
## 4353   4353          endanger         fear
## 4354   4354          endanger     negative
## 4355   4355        endangered         fear
## 4356   4356        endangered     negative
## 4357   4357          endeavor anticipation
## 4358   4358          endeavor     positive
## 4359   4359           endemic      disgust
## 4360   4360           endemic         fear
## 4361   4361           endemic     negative
## 4362   4362           endemic      sadness
## 4363   4363           endless        anger
## 4364   4364           endless         fear
## 4365   4365           endless          joy
## 4366   4366           endless     negative
## 4367   4367           endless     positive
## 4368   4368           endless      sadness
## 4369   4369           endless        trust
## 4370   4370      endocarditis         fear
## 4371   4371      endocarditis      sadness
## 4372   4372             endow     positive
## 4373   4373             endow        trust
## 4374   4374           endowed     positive
## 4375   4375         endowment     positive
## 4376   4376         endowment        trust
## 4377   4377         endurance     positive
## 4378   4378            endure     positive
## 4379   4379             enema      disgust
## 4380   4380             enemy        anger
## 4381   4381             enemy      disgust
## 4382   4382             enemy         fear
## 4383   4383             enemy     negative
## 4384   4384         energetic     positive
## 4385   4385           enforce        anger
## 4386   4386           enforce         fear
## 4387   4387           enforce     negative
## 4388   4388           enforce     positive
## 4389   4389       enforcement     negative
## 4390   4390           engaged anticipation
## 4391   4391           engaged          joy
## 4392   4392           engaged     positive
## 4393   4393           engaged        trust
## 4394   4394          engaging          joy
## 4395   4395          engaging     positive
## 4396   4396          engaging        trust
## 4397   4397            engulf anticipation
## 4398   4398           enhance     positive
## 4399   4399         enigmatic         fear
## 4400   4400         enigmatic     negative
## 4401   4401             enjoy anticipation
## 4402   4402             enjoy          joy
## 4403   4403             enjoy     positive
## 4404   4404             enjoy        trust
## 4405   4405          enjoying anticipation
## 4406   4406          enjoying          joy
## 4407   4407          enjoying     positive
## 4408   4408          enjoying        trust
## 4409   4409         enlighten          joy
## 4410   4410         enlighten     positive
## 4411   4411         enlighten        trust
## 4412   4412     enlightenment          joy
## 4413   4413     enlightenment     positive
## 4414   4414     enlightenment        trust
## 4415   4415           enliven          joy
## 4416   4416           enliven     positive
## 4417   4417           enliven     surprise
## 4418   4418           enliven        trust
## 4419   4419            enmity        anger
## 4420   4420            enmity         fear
## 4421   4421            enmity     negative
## 4422   4422            enmity      sadness
## 4423   4423            enrich     positive
## 4424   4424            enroll anticipation
## 4425   4425            enroll        trust
## 4426   4426          ensemble     positive
## 4427   4427          ensemble        trust
## 4428   4428            ensign     positive
## 4429   4429           enslave     negative
## 4430   4430          enslaved        anger
## 4431   4431          enslaved      disgust
## 4432   4432          enslaved         fear
## 4433   4433          enslaved     negative
## 4434   4434          enslaved      sadness
## 4435   4435       enslavement     negative
## 4436   4436         entangled        anger
## 4437   4437         entangled      disgust
## 4438   4438         entangled         fear
## 4439   4439         entangled     negative
## 4440   4440         entangled      sadness
## 4441   4441      entanglement     negative
## 4442   4442      enterprising     positive
## 4443   4443         entertain          joy
## 4444   4444         entertain     positive
## 4445   4445       entertained          joy
## 4446   4446       entertained     positive
## 4447   4447      entertaining anticipation
## 4448   4448      entertaining          joy
## 4449   4449      entertaining     positive
## 4450   4450     entertainment anticipation
## 4451   4451     entertainment          joy
## 4452   4452     entertainment     positive
## 4453   4453     entertainment     surprise
## 4454   4454     entertainment        trust
## 4455   4455        enthusiasm anticipation
## 4456   4456        enthusiasm          joy
## 4457   4457        enthusiasm     positive
## 4458   4458        enthusiasm     surprise
## 4459   4459        enthusiast anticipation
## 4460   4460        enthusiast          joy
## 4461   4461        enthusiast     positive
## 4462   4462        enthusiast     surprise
## 4463   4463          entrails      disgust
## 4464   4464          entrails     negative
## 4465   4465           entrust        trust
## 4466   4466           envious     negative
## 4467   4467           environ     positive
## 4468   4468         ephemeris     positive
## 4469   4469              epic     positive
## 4470   4470          epidemic        anger
## 4471   4471          epidemic anticipation
## 4472   4472          epidemic      disgust
## 4473   4473          epidemic         fear
## 4474   4474          epidemic     negative
## 4475   4475          epidemic      sadness
## 4476   4476          epidemic     surprise
## 4477   4477          epilepsy     negative
## 4478   4478         episcopal        trust
## 4479   4479           epitaph      sadness
## 4480   4480           epitome     positive
## 4481   4481          equality          joy
## 4482   4482          equality     positive
## 4483   4483          equality        trust
## 4484   4484           equally     positive
## 4485   4485       equilibrium     positive
## 4486   4486            equity     positive
## 4487   4487         eradicate        anger
## 4488   4488         eradicate     negative
## 4489   4489       eradication        anger
## 4490   4490       eradication      disgust
## 4491   4491       eradication         fear
## 4492   4492       eradication     negative
## 4493   4493             erase         fear
## 4494   4494             erase     negative
## 4495   4495           erosion     negative
## 4496   4496            erotic anticipation
## 4497   4497            erotic          joy
## 4498   4498            erotic     negative
## 4499   4499            erotic     positive
## 4500   4500            erotic     surprise
## 4501   4501            erotic        trust
## 4502   4502               err     negative
## 4503   4503            errand anticipation
## 4504   4504            errand     positive
## 4505   4505            errand        trust
## 4506   4506            errant     negative
## 4507   4507           erratic     negative
## 4508   4508           erratic     surprise
## 4509   4509           erratum     negative
## 4510   4510         erroneous     negative
## 4511   4511             error     negative
## 4512   4512             error      sadness
## 4513   4513           erudite     positive
## 4514   4514             erupt        anger
## 4515   4515             erupt     negative
## 4516   4516             erupt     surprise
## 4517   4517          eruption        anger
## 4518   4518          eruption         fear
## 4519   4519          eruption     negative
## 4520   4520          eruption     surprise
## 4521   4521          escalate        anger
## 4522   4522          escalate     negative
## 4523   4523            escape anticipation
## 4524   4524            escape         fear
## 4525   4525            escape     negative
## 4526   4526            escape     positive
## 4527   4527           escaped         fear
## 4528   4528            eschew        anger
## 4529   4529            eschew     negative
## 4530   4530            eschew      sadness
## 4531   4531            escort        trust
## 4532   4532         espionage     negative
## 4533   4533            esprit     positive
## 4534   4534         essential     positive
## 4535   4535         establish        trust
## 4536   4536       established          joy
## 4537   4537       established     positive
## 4538   4538            esteem          joy
## 4539   4539            esteem     positive
## 4540   4540            esteem      sadness
## 4541   4541            esteem        trust
## 4542   4542          esthetic     positive
## 4543   4543         estranged     negative
## 4544   4544          ethereal         fear
## 4545   4545           ethical     positive
## 4546   4546            ethics     positive
## 4547   4547        euthanasia         fear
## 4548   4548        euthanasia     negative
## 4549   4549        euthanasia      sadness
## 4550   4550          evacuate         fear
## 4551   4551          evacuate     negative
## 4552   4552        evacuation     negative
## 4553   4553             evade        anger
## 4554   4554             evade      disgust
## 4555   4555             evade         fear
## 4556   4556             evade     negative
## 4557   4557       evanescence      sadness
## 4558   4558       evanescence     surprise
## 4559   4559           evasion         fear
## 4560   4560           evasion     negative
## 4561   4561           evasion      sadness
## 4562   4562          eventual anticipation
## 4563   4563       eventuality anticipation
## 4564   4564       eventuality         fear
## 4565   4565         evergreen          joy
## 4566   4566         evergreen     positive
## 4567   4567         evergreen        trust
## 4568   4568       everlasting     positive
## 4569   4569             evict     negative
## 4570   4570             evict      sadness
## 4571   4571          eviction        anger
## 4572   4572          eviction      disgust
## 4573   4573          eviction         fear
## 4574   4574          eviction     negative
## 4575   4575          eviction      sadness
## 4576   4576           evident     positive
## 4577   4577           evident        trust
## 4578   4578              evil        anger
## 4579   4579              evil      disgust
## 4580   4580              evil         fear
## 4581   4581              evil     negative
## 4582   4582              evil      sadness
## 4583   4583         evolution     positive
## 4584   4584        exacerbate     negative
## 4585   4585      exacerbation        anger
## 4586   4586      exacerbation         fear
## 4587   4587      exacerbation     negative
## 4588   4588          exacting     negative
## 4589   4589        exaggerate        anger
## 4590   4590        exaggerate     negative
## 4591   4591       exaggerated     negative
## 4592   4592             exalt anticipation
## 4593   4593             exalt          joy
## 4594   4594             exalt     positive
## 4595   4595             exalt        trust
## 4596   4596        exaltation          joy
## 4597   4597        exaltation     positive
## 4598   4598        exaltation        trust
## 4599   4599           exalted          joy
## 4600   4600           exalted     positive
## 4601   4601           exalted        trust
## 4602   4602       examination         fear
## 4603   4603       examination     negative
## 4604   4604       examination     surprise
## 4605   4605      exasperation        anger
## 4606   4606      exasperation      disgust
## 4607   4607      exasperation     negative
## 4608   4608        excavation anticipation
## 4609   4609        excavation     negative
## 4610   4610        excavation     surprise
## 4611   4611            exceed anticipation
## 4612   4612            exceed          joy
## 4613   4613            exceed     positive
## 4614   4614             excel anticipation
## 4615   4615             excel          joy
## 4616   4616             excel     positive
## 4617   4617             excel     surprise
## 4618   4618             excel        trust
## 4619   4619        excellence      disgust
## 4620   4620        excellence          joy
## 4621   4621        excellence     positive
## 4622   4622        excellence        trust
## 4623   4623         excellent          joy
## 4624   4624         excellent     positive
## 4625   4625         excellent        trust
## 4626   4626            excess     negative
## 4627   4627          exchange     positive
## 4628   4628          exchange        trust
## 4629   4629            excise     negative
## 4630   4630         excitable     positive
## 4631   4631        excitation        anger
## 4632   4632        excitation anticipation
## 4633   4633        excitation         fear
## 4634   4634        excitation          joy
## 4635   4635        excitation     positive
## 4636   4636        excitation     surprise
## 4637   4637            excite        anger
## 4638   4638            excite anticipation
## 4639   4639            excite         fear
## 4640   4640            excite          joy
## 4641   4641            excite     positive
## 4642   4642            excite     surprise
## 4643   4643           excited anticipation
## 4644   4644           excited          joy
## 4645   4645           excited     positive
## 4646   4646           excited     surprise
## 4647   4647           excited        trust
## 4648   4648        excitement anticipation
## 4649   4649        excitement          joy
## 4650   4650        excitement     positive
## 4651   4651        excitement     surprise
## 4652   4652          exciting anticipation
## 4653   4653          exciting          joy
## 4654   4654          exciting     positive
## 4655   4655          exciting     surprise
## 4656   4656           exclaim     surprise
## 4657   4657          excluded      disgust
## 4658   4658          excluded     negative
## 4659   4659          excluded      sadness
## 4660   4660         excluding     negative
## 4661   4661         excluding      sadness
## 4662   4662         exclusion      disgust
## 4663   4663         exclusion         fear
## 4664   4664         exclusion     negative
## 4665   4665         exclusion      sadness
## 4666   4666         excrement      disgust
## 4667   4667         excrement     negative
## 4668   4668         excretion      disgust
## 4669   4669      excruciating         fear
## 4670   4670      excruciating     negative
## 4671   4671            excuse     negative
## 4672   4672         execution        anger
## 4673   4673         execution         fear
## 4674   4674         execution     negative
## 4675   4675         execution      sadness
## 4676   4676         execution        trust
## 4677   4677       executioner        anger
## 4678   4678       executioner         fear
## 4679   4679       executioner     negative
## 4680   4680       executioner      sadness
## 4681   4681          executor        trust
## 4682   4682         exemplary     positive
## 4683   4683         exemption     positive
## 4684   4684           exhaust     negative
## 4685   4685         exhausted     negative
## 4686   4686         exhausted      sadness
## 4687   4687        exhaustion anticipation
## 4688   4688        exhaustion     negative
## 4689   4689        exhaustion      sadness
## 4690   4690        exhaustive        trust
## 4691   4691      exhilaration          joy
## 4692   4692      exhilaration     positive
## 4693   4693      exhilaration     surprise
## 4694   4694            exhort     positive
## 4695   4695       exhortation     positive
## 4696   4696           exigent anticipation
## 4697   4697           exigent      disgust
## 4698   4698           exigent         fear
## 4699   4699           exigent     negative
## 4700   4700           exigent     surprise
## 4701   4701             exile        anger
## 4702   4702             exile         fear
## 4703   4703             exile     negative
## 4704   4704             exile      sadness
## 4705   4705         existence     positive
## 4706   4706          exorcism         fear
## 4707   4707          exorcism     negative
## 4708   4708          exorcism      sadness
## 4709   4709            exotic     positive
## 4710   4710        expatriate     negative
## 4711   4711            expect anticipation
## 4712   4712            expect     positive
## 4713   4713            expect     surprise
## 4714   4714            expect        trust
## 4715   4715        expectancy anticipation
## 4716   4716         expectant anticipation
## 4717   4717       expectation anticipation
## 4718   4718       expectation     positive
## 4719   4719          expected anticipation
## 4720   4720         expecting anticipation
## 4721   4721         expedient          joy
## 4722   4722         expedient     positive
## 4723   4723         expedient        trust
## 4724   4724        expedition anticipation
## 4725   4725        expedition     positive
## 4726   4726             expel        anger
## 4727   4727             expel      disgust
## 4728   4728             expel         fear
## 4729   4729             expel     negative
## 4730   4730             expel      sadness
## 4731   4731       expenditure     negative
## 4732   4732          expenses     negative
## 4733   4733       experienced     positive
## 4734   4734       experienced        trust
## 4735   4735        experiment anticipation
## 4736   4736        experiment     surprise
## 4737   4737            expert     positive
## 4738   4738            expert        trust
## 4739   4739         expertise     positive
## 4740   4740         expertise        trust
## 4741   4741            expire     negative
## 4742   4742            expire      sadness
## 4743   4743           expired     negative
## 4744   4744           explain     positive
## 4745   4745           explain        trust
## 4746   4746         expletive        anger
## 4747   4747         expletive     negative
## 4748   4748           explode        anger
## 4749   4749           explode         fear
## 4750   4750           explode     negative
## 4751   4751           explode      sadness
## 4752   4752           explode     surprise
## 4753   4753           explore anticipation
## 4754   4754         explosion         fear
## 4755   4755         explosion     negative
## 4756   4756         explosion     surprise
## 4757   4757         explosive        anger
## 4758   4758         explosive anticipation
## 4759   4759         explosive         fear
## 4760   4760         explosive     negative
## 4761   4761         explosive     surprise
## 4762   4762            expose anticipation
## 4763   4763            expose         fear
## 4764   4764           exposed     negative
## 4765   4765     expropriation     negative
## 4766   4766         expulsion        anger
## 4767   4767         expulsion      disgust
## 4768   4768         expulsion         fear
## 4769   4769         expulsion     negative
## 4770   4770         expulsion      sadness
## 4771   4771         exquisite          joy
## 4772   4772         exquisite     positive
## 4773   4773       exquisitely     positive
## 4774   4774            extend     positive
## 4775   4775         extensive     positive
## 4776   4776       exterminate         fear
## 4777   4777       exterminate     negative
## 4778   4778       exterminate      sadness
## 4779   4779     extermination        anger
## 4780   4780     extermination         fear
## 4781   4781     extermination     negative
## 4782   4782           extinct     negative
## 4783   4783           extinct      sadness
## 4784   4784        extinguish        anger
## 4785   4785        extinguish     negative
## 4786   4786             extra     positive
## 4787   4787     extrajudicial         fear
## 4788   4788     extrajudicial     negative
## 4789   4789     extraordinary     positive
## 4790   4790         extremity     negative
## 4791   4791         extricate anticipation
## 4792   4792         extricate     positive
## 4793   4793        exuberance          joy
## 4794   4794        exuberance     positive
## 4795   4795        eyewitness        trust
## 4796   4796         fabricate     negative
## 4797   4797       fabrication     negative
## 4798   4798       fabrication        trust
## 4799   4799        facilitate     positive
## 4800   4800              fact        trust
## 4801   4801             facts     positive
## 4802   4802             facts        trust
## 4803   4803           faculty     positive
## 4804   4804           faculty        trust
## 4805   4805              fade     negative
## 4806   4806            faeces      disgust
## 4807   4807            faeces     negative
## 4808   4808           failing        anger
## 4809   4809           failing anticipation
## 4810   4810           failing         fear
## 4811   4811           failing     negative
## 4812   4812           failing      sadness
## 4813   4813           failure      disgust
## 4814   4814           failure         fear
## 4815   4815           failure     negative
## 4816   4816           failure      sadness
## 4817   4817              fain anticipation
## 4818   4818              fain          joy
## 4819   4819              fain     positive
## 4820   4820              fain        trust
## 4821   4821          fainting         fear
## 4822   4822          fainting     negative
## 4823   4823          fainting      sadness
## 4824   4824          fainting     surprise
## 4825   4825              fair     positive
## 4826   4826            fairly     positive
## 4827   4827            fairly        trust
## 4828   4828             faith anticipation
## 4829   4829             faith          joy
## 4830   4830             faith     positive
## 4831   4831             faith        trust
## 4832   4832          faithful     positive
## 4833   4833          faithful        trust
## 4834   4834         faithless     negative
## 4835   4835         faithless      sadness
## 4836   4836              fake     negative
## 4837   4837              fall     negative
## 4838   4838              fall      sadness
## 4839   4839        fallacious        anger
## 4840   4840        fallacious     negative
## 4841   4841           fallacy     negative
## 4842   4842          fallible     negative
## 4843   4843           falling     negative
## 4844   4844           falling      sadness
## 4845   4845            fallow     negative
## 4846   4846         falsehood        anger
## 4847   4847         falsehood     negative
## 4848   4848         falsehood        trust
## 4849   4849           falsely     negative
## 4850   4850     falsification        anger
## 4851   4851     falsification     negative
## 4852   4852           falsify      disgust
## 4853   4853           falsify     negative
## 4854   4854           falsity      disgust
## 4855   4855           falsity     negative
## 4856   4856            falter         fear
## 4857   4857            falter     negative
## 4858   4858              fame     positive
## 4859   4859          familiar     positive
## 4860   4860          familiar        trust
## 4861   4861       familiarity anticipation
## 4862   4862       familiarity          joy
## 4863   4863       familiarity     positive
## 4864   4864       familiarity        trust
## 4865   4865            famine     negative
## 4866   4866            famine      sadness
## 4867   4867            famous     positive
## 4868   4868          famously     positive
## 4869   4869           fanatic     negative
## 4870   4870        fanaticism         fear
## 4871   4871             fancy anticipation
## 4872   4872             fancy          joy
## 4873   4873             fancy     positive
## 4874   4874           fanfare anticipation
## 4875   4875           fanfare          joy
## 4876   4876           fanfare     positive
## 4877   4877           fanfare     surprise
## 4878   4878              fang         fear
## 4879   4879             fangs         fear
## 4880   4880             farce     negative
## 4881   4881          farcical      disgust
## 4882   4882          farcical     negative
## 4883   4883              farm anticipation
## 4884   4884       fascinating     positive
## 4885   4885       fascination     positive
## 4886   4886       fashionable     positive
## 4887   4887           fasting     negative
## 4888   4888           fasting      sadness
## 4889   4889               fat      disgust
## 4890   4890               fat     negative
## 4891   4891               fat      sadness
## 4892   4892             fatal        anger
## 4893   4893             fatal         fear
## 4894   4894             fatal     negative
## 4895   4895             fatal      sadness
## 4896   4896          fatality         fear
## 4897   4897          fatality     negative
## 4898   4898          fatality      sadness
## 4899   4899              fate anticipation
## 4900   4900              fate     negative
## 4901   4901            father        trust
## 4902   4902           fatigue     negative
## 4903   4903          fatigued     negative
## 4904   4904          fatigued      sadness
## 4905   4905             fatty      disgust
## 4906   4906             fatty     negative
## 4907   4907             fatty      sadness
## 4908   4908             fault     negative
## 4909   4909             fault      sadness
## 4910   4910         faultless     positive
## 4911   4911         faultless        trust
## 4912   4912            faulty     negative
## 4913   4913         favorable anticipation
## 4914   4914         favorable          joy
## 4915   4915         favorable     positive
## 4916   4916         favorable     surprise
## 4917   4917         favorable        trust
## 4918   4918          favorite          joy
## 4919   4919          favorite     positive
## 4920   4920          favorite        trust
## 4921   4921        favoritism     positive
## 4922   4922              fawn     negative
## 4923   4923              fear        anger
## 4924   4924              fear         fear
## 4925   4925              fear     negative
## 4926   4926           fearful         fear
## 4927   4927           fearful     negative
## 4928   4928           fearful      sadness
## 4929   4929         fearfully         fear
## 4930   4930         fearfully     negative
## 4931   4931         fearfully      sadness
## 4932   4932         fearfully     surprise
## 4933   4933           fearing         fear
## 4934   4934           fearing     negative
## 4935   4935          fearless         fear
## 4936   4936          fearless     positive
## 4937   4937              feat anticipation
## 4938   4938              feat          joy
## 4939   4939              feat     positive
## 4940   4940              feat     surprise
## 4941   4941           feature     positive
## 4942   4942           febrile     negative
## 4943   4943             fecal      disgust
## 4944   4944             fecal     negative
## 4945   4945             feces      disgust
## 4946   4946             feces     negative
## 4947   4947               fee        anger
## 4948   4948               fee     negative
## 4949   4949            feeble     negative
## 4950   4950            feeble      sadness
## 4951   4951           feeling        anger
## 4952   4952           feeling anticipation
## 4953   4953           feeling      disgust
## 4954   4954           feeling         fear
## 4955   4955           feeling          joy
## 4956   4956           feeling     negative
## 4957   4957           feeling     positive
## 4958   4958           feeling      sadness
## 4959   4959           feeling     surprise
## 4960   4960           feeling        trust
## 4961   4961           feigned     negative
## 4962   4962          felicity          joy
## 4963   4963          felicity     positive
## 4964   4964              fell     negative
## 4965   4965              fell      sadness
## 4966   4966            fellow     positive
## 4967   4967            fellow        trust
## 4968   4968        fellowship     positive
## 4969   4969             felon         fear
## 4970   4970             felon     negative
## 4971   4971            felony     negative
## 4972   4972            fenced        anger
## 4973   4973            fender        trust
## 4974   4974           ferment anticipation
## 4975   4975           ferment     negative
## 4976   4976      fermentation anticipation
## 4977   4977         ferocious        anger
## 4978   4978         ferocious      disgust
## 4979   4979         ferocious         fear
## 4980   4980         ferocious     negative
## 4981   4981          ferocity        anger
## 4982   4982          ferocity     negative
## 4983   4983           fertile     positive
## 4984   4984            fervor        anger
## 4985   4985            fervor          joy
## 4986   4986            fervor     positive
## 4987   4987          festival anticipation
## 4988   4988          festival          joy
## 4989   4989          festival     positive
## 4990   4990          festival     surprise
## 4991   4991           festive          joy
## 4992   4992           festive     positive
## 4993   4993              fete anticipation
## 4994   4994              fete          joy
## 4995   4995              fete     positive
## 4996   4996              fete     surprise
## 4997   4997              feud        anger
## 4998   4998              feud     negative
## 4999   4999            feudal     negative
## 5000   5000         feudalism        anger
## 5001   5001         feudalism     negative
## 5002   5002         feudalism      sadness
## 5003   5003             fever         fear
## 5004   5004          feverish     negative
## 5005   5005            fiasco     negative
## 5006   5006               fib        anger
## 5007   5007               fib     negative
## 5008   5008            fickle     negative
## 5009   5009        fictitious     negative
## 5010   5010          fidelity          joy
## 5011   5011          fidelity     positive
## 5012   5012          fidelity        trust
## 5013   5013             fiend        anger
## 5014   5014             fiend      disgust
## 5015   5015             fiend         fear
## 5016   5016             fiend     negative
## 5017   5017            fierce        anger
## 5018   5018            fierce      disgust
## 5019   5019            fierce         fear
## 5020   5020            fierce     negative
## 5021   5021            fiesta anticipation
## 5022   5022            fiesta          joy
## 5023   5023            fiesta     positive
## 5024   5024            fiesta     surprise
## 5025   5025            fiesta        trust
## 5026   5026             fight        anger
## 5027   5027             fight         fear
## 5028   5028             fight     negative
## 5029   5029          fighting        anger
## 5030   5030          fighting     negative
## 5031   5031        filibuster     negative
## 5032   5032              fill        trust
## 5033   5033             filth      disgust
## 5034   5034             filth     negative
## 5035   5035            filthy      disgust
## 5036   5036            filthy     negative
## 5037   5037           finally anticipation
## 5038   5038           finally      disgust
## 5039   5039           finally          joy
## 5040   5040           finally     positive
## 5041   5041           finally     surprise
## 5042   5042           finally        trust
## 5043   5043            finery     positive
## 5044   5044           finesse     positive
## 5045   5045              fire         fear
## 5046   5046          firearms        anger
## 5047   5047          firearms         fear
## 5048   5048          firearms     negative
## 5049   5049          fireball     positive
## 5050   5050           fireman        trust
## 5051   5051         fireproof     positive
## 5052   5052          firmness     positive
## 5053   5053          firmness        trust
## 5054   5054         firstborn anticipation
## 5055   5055         firstborn          joy
## 5056   5056         firstborn     positive
## 5057   5057         firstborn        trust
## 5058   5058              fits        anger
## 5059   5059              fits     negative
## 5060   5060           fitting anticipation
## 5061   5061           fitting          joy
## 5062   5062           fitting     positive
## 5063   5063           fitting        trust
## 5064   5064             fixed        trust
## 5065   5065           fixture     positive
## 5066   5066            flabby      disgust
## 5067   5067            flabby     negative
## 5068   5068           flaccid     negative
## 5069   5069           flaccid      sadness
## 5070   5070          flagging     negative
## 5071   5071          flagrant        anger
## 5072   5072          flagrant      disgust
## 5073   5073          flagrant     negative
## 5074   5074          flagship        trust
## 5075   5075             flake     negative
## 5076   5076            flange        trust
## 5077   5077              flap     negative
## 5078   5078        flattering          joy
## 5079   5079        flattering     positive
## 5080   5080        flatulence      disgust
## 5081   5081        flatulence     negative
## 5082   5082            flaunt     negative
## 5083   5083              flaw     negative
## 5084   5084              flaw      sadness
## 5085   5085              flea      disgust
## 5086   5086              flea     negative
## 5087   5087              fled         fear
## 5088   5088              flee         fear
## 5089   5089              flee     negative
## 5090   5090            fleece        anger
## 5091   5091            fleece      disgust
## 5092   5092            fleece     negative
## 5093   5093            fleece      sadness
## 5094   5094             fleet     positive
## 5095   5095             flesh      disgust
## 5096   5096            fleshy     negative
## 5097   5097       flexibility     positive
## 5098   5098            flinch anticipation
## 5099   5099            flinch      disgust
## 5100   5100            flinch         fear
## 5101   5101            flinch     negative
## 5102   5102            flinch      sadness
## 5103   5103            flinch     surprise
## 5104   5104             flirt anticipation
## 5105   5105             flirt          joy
## 5106   5106             flirt     negative
## 5107   5107             flirt     positive
## 5108   5108             flirt     surprise
## 5109   5109             flirt        trust
## 5110   5110              flog        anger
## 5111   5111              flog      disgust
## 5112   5112              flog         fear
## 5113   5113              flog     negative
## 5114   5114              flog      sadness
## 5115   5115             flood         fear
## 5116   5116              flop      disgust
## 5117   5117              flop     negative
## 5118   5118              flop      sadness
## 5119   5119            floral     positive
## 5120   5120          flounder         fear
## 5121   5121          flounder     negative
## 5122   5122          flounder      sadness
## 5123   5123              flow     positive
## 5124   5124           flowery     positive
## 5125   5125               flu         fear
## 5126   5126               flu     negative
## 5127   5127       fluctuation        anger
## 5128   5128       fluctuation         fear
## 5129   5129       fluctuation     negative
## 5130   5130             fluke     surprise
## 5131   5131             flush     positive
## 5132   5132            flying         fear
## 5133   5133            flying     positive
## 5134   5134             focus     positive
## 5135   5135               foe        anger
## 5136   5136               foe         fear
## 5137   5137               foe     negative
## 5138   5138            foiled     negative
## 5139   5139          follower        trust
## 5140   5140             folly     negative
## 5141   5141          fondness          joy
## 5142   5142          fondness     positive
## 5143   5143              food          joy
## 5144   5144              food     positive
## 5145   5145              food        trust
## 5146   5146              fool      disgust
## 5147   5147              fool     negative
## 5148   5148           foolish     negative
## 5149   5149       foolishness     negative
## 5150   5150          football anticipation
## 5151   5151          football          joy
## 5152   5152          football     positive
## 5153   5153           footing        trust
## 5154   5154            forage     negative
## 5155   5155             foray        anger
## 5156   5156             foray     negative
## 5157   5157       forbearance     positive
## 5158   5158            forbid     negative
## 5159   5159            forbid      sadness
## 5160   5160        forbidding        anger
## 5161   5161        forbidding         fear
## 5162   5162        forbidding     negative
## 5163   5163             force        anger
## 5164   5164             force         fear
## 5165   5165             force     negative
## 5166   5166            forced         fear
## 5167   5167            forced     negative
## 5168   5168          forcibly        anger
## 5169   5169          forcibly         fear
## 5170   5170          forcibly     negative
## 5171   5171              fore     positive
## 5172   5172           forearm        anger
## 5173   5173           forearm anticipation
## 5174   5174        foreboding anticipation
## 5175   5175        foreboding         fear
## 5176   5176        foreboding     negative
## 5177   5177          forecast anticipation
## 5178   5178          forecast        trust
## 5179   5179         foreclose         fear
## 5180   5180         foreclose     negative
## 5181   5181         foreclose      sadness
## 5182   5182       forefathers          joy
## 5183   5183       forefathers     positive
## 5184   5184       forefathers        trust
## 5185   5185            forego     negative
## 5186   5186         foregoing     positive
## 5187   5187           foreign     negative
## 5188   5188         foreigner         fear
## 5189   5189         foreigner     negative
## 5190   5190           foreman     positive
## 5191   5191        forerunner     positive
## 5192   5192           foresee anticipation
## 5193   5193           foresee     positive
## 5194   5194           foresee     surprise
## 5195   5195           foresee        trust
## 5196   5196          foreseen anticipation
## 5197   5197          foreseen     positive
## 5198   5198         foresight anticipation
## 5199   5199         foresight     positive
## 5200   5200         foresight        trust
## 5201   5201        forewarned anticipation
## 5202   5202        forewarned         fear
## 5203   5203        forewarned     negative
## 5204   5204           forfeit        anger
## 5205   5205           forfeit     negative
## 5206   5206           forfeit      sadness
## 5207   5207         forfeited     negative
## 5208   5208        forfeiture         fear
## 5209   5209        forfeiture     negative
## 5210   5210        forfeiture      sadness
## 5211   5211             forge     positive
## 5212   5212           forgery     negative
## 5213   5213            forget     negative
## 5214   5214           forgive     positive
## 5215   5215          forgiven     positive
## 5216   5216         forgiving     positive
## 5217   5217         forgiving        trust
## 5218   5218         forgotten         fear
## 5219   5219         forgotten     negative
## 5220   5220         forgotten      sadness
## 5221   5221           forlorn     negative
## 5222   5222           forlorn      sadness
## 5223   5223         formality        trust
## 5224   5224         formative     positive
## 5225   5225         formative        trust
## 5226   5226        formidable         fear
## 5227   5227           forming anticipation
## 5228   5228          formless     negative
## 5229   5229           formula     positive
## 5230   5230           formula        trust
## 5231   5231       fornication     negative
## 5232   5232           forsake     negative
## 5233   5233           forsake      sadness
## 5234   5234          forsaken        anger
## 5235   5235          forsaken     negative
## 5236   5236          forsaken      sadness
## 5237   5237              fort        trust
## 5238   5238             forte     positive
## 5239   5239       forthcoming     positive
## 5240   5240           fortify     positive
## 5241   5241         fortitude          joy
## 5242   5242         fortitude     positive
## 5243   5243         fortitude        trust
## 5244   5244          fortress         fear
## 5245   5245          fortress     positive
## 5246   5246          fortress      sadness
## 5247   5247          fortress        trust
## 5248   5248         fortunate     positive
## 5249   5249           fortune anticipation
## 5250   5250           fortune          joy
## 5251   5251           fortune     positive
## 5252   5252           fortune     surprise
## 5253   5253           fortune        trust
## 5254   5254           forward     positive
## 5255   5255              foul        anger
## 5256   5256              foul      disgust
## 5257   5257              foul         fear
## 5258   5258              foul     negative
## 5259   5259             found          joy
## 5260   5260             found     positive
## 5261   5261             found        trust
## 5262   5262        foundation     positive
## 5263   5263          fracture     negative
## 5264   5264           fragile         fear
## 5265   5265           fragile     negative
## 5266   5266           fragile      sadness
## 5267   5267          fragrant     positive
## 5268   5268           frailty     negative
## 5269   5269           frailty      sadness
## 5270   5270         framework        trust
## 5271   5271             frank     positive
## 5272   5272             frank        trust
## 5273   5273         frankness     positive
## 5274   5274         frankness        trust
## 5275   5275           frantic anticipation
## 5276   5276           frantic      disgust
## 5277   5277           frantic         fear
## 5278   5278           frantic     negative
## 5279   5279           frantic     surprise
## 5280   5280         fraternal          joy
## 5281   5281         fraternal     positive
## 5282   5282         fraternal        trust
## 5283   5283             fraud        anger
## 5284   5284             fraud     negative
## 5285   5285        fraudulent        anger
## 5286   5286        fraudulent      disgust
## 5287   5287        fraudulent     negative
## 5288   5288           fraught         fear
## 5289   5289           fraught     negative
## 5290   5290           fraught      sadness
## 5291   5291              fray     negative
## 5292   5292            frayed     negative
## 5293   5293            frayed      sadness
## 5294   5294          freakish      disgust
## 5295   5295          freakish         fear
## 5296   5296          freakish     negative
## 5297   5297          freakish     surprise
## 5298   5298           freedom          joy
## 5299   5299           freedom     positive
## 5300   5300           freedom        trust
## 5301   5301            freely          joy
## 5302   5302            freely     positive
## 5303   5303            freely        trust
## 5304   5304          freezing     negative
## 5305   5305          frenetic        anger
## 5306   5306          frenetic         fear
## 5307   5307          frenetic     negative
## 5308   5308          frenetic     surprise
## 5309   5309          frenzied        anger
## 5310   5310          frenzied         fear
## 5311   5311          frenzied     negative
## 5312   5312            frenzy     negative
## 5313   5313              fret         fear
## 5314   5314              fret     negative
## 5315   5315          friction        anger
## 5316   5316            friend          joy
## 5317   5317            friend     positive
## 5318   5318            friend        trust
## 5319   5319      friendliness          joy
## 5320   5320      friendliness     positive
## 5321   5321      friendliness        trust
## 5322   5322          friendly anticipation
## 5323   5323          friendly          joy
## 5324   5324          friendly     positive
## 5325   5325          friendly        trust
## 5326   5326        friendship          joy
## 5327   5327        friendship     positive
## 5328   5328        friendship        trust
## 5329   5329           frigate         fear
## 5330   5330            fright         fear
## 5331   5331            fright     negative
## 5332   5332            fright     surprise
## 5333   5333          frighten         fear
## 5334   5334          frighten     negative
## 5335   5335          frighten      sadness
## 5336   5336          frighten     surprise
## 5337   5337        frightened         fear
## 5338   5338        frightened     negative
## 5339   5339        frightened     surprise
## 5340   5340         frightful        anger
## 5341   5341         frightful         fear
## 5342   5342         frightful     negative
## 5343   5343         frightful      sadness
## 5344   5344            frigid     negative
## 5345   5345            frisky anticipation
## 5346   5346            frisky          joy
## 5347   5347            frisky     positive
## 5348   5348            frisky     surprise
## 5349   5349         frivolous     negative
## 5350   5350            frolic          joy
## 5351   5351            frolic     positive
## 5352   5352         frostbite     negative
## 5353   5353             froth     negative
## 5354   5354             frown     negative
## 5355   5355             frown      sadness
## 5356   5356          frowning        anger
## 5357   5357          frowning      disgust
## 5358   5358          frowning     negative
## 5359   5359          frowning      sadness
## 5360   5360            frugal     positive
## 5361   5361          fruitful     positive
## 5362   5362         fruitless     negative
## 5363   5363         fruitless      sadness
## 5364   5364         frustrate        anger
## 5365   5365         frustrate      disgust
## 5366   5366         frustrate     negative
## 5367   5367         frustrate      sadness
## 5368   5368        frustrated        anger
## 5369   5369        frustrated     negative
## 5370   5370       frustration        anger
## 5371   5371       frustration     negative
## 5372   5372             fudge     negative
## 5373   5373          fugitive        anger
## 5374   5374          fugitive      disgust
## 5375   5375          fugitive         fear
## 5376   5376          fugitive     negative
## 5377   5377          fugitive      sadness
## 5378   5378          fugitive        trust
## 5379   5379           fulfill          joy
## 5380   5380           fulfill     positive
## 5381   5381       fulfillment anticipation
## 5382   5382       fulfillment          joy
## 5383   5383       fulfillment     positive
## 5384   5384       fulfillment        trust
## 5385   5385              full     positive
## 5386   5386             fully     positive
## 5387   5387             fully        trust
## 5388   5388            fumble     negative
## 5389   5389              fume     negative
## 5390   5390            fuming        anger
## 5391   5391            fuming     negative
## 5392   5392               fun anticipation
## 5393   5393               fun          joy
## 5394   5394               fun     positive
## 5395   5395       fundamental     positive
## 5396   5396       fundamental        trust
## 5397   5397           funeral      sadness
## 5398   5398            fungus      disgust
## 5399   5399            fungus     negative
## 5400   5400              funk     negative
## 5401   5401              funk      sadness
## 5402   5402           furious        anger
## 5403   5403           furious      disgust
## 5404   5404           furious     negative
## 5405   5405         furiously        anger
## 5406   5406           furnace        anger
## 5407   5407             furor        anger
## 5408   5408             furor     negative
## 5409   5409            furrow      sadness
## 5410   5410              fury        anger
## 5411   5411              fury         fear
## 5412   5412              fury     negative
## 5413   5413              fury      sadness
## 5414   5414              fuse     positive
## 5415   5415              fuse        trust
## 5416   5416            fusion     positive
## 5417   5417              fuss        anger
## 5418   5418              fuss     negative
## 5419   5419              fuss      sadness
## 5420   5420             fussy      disgust
## 5421   5421             fussy     negative
## 5422   5422            futile     negative
## 5423   5423            futile      sadness
## 5424   5424          futility     negative
## 5425   5425              gaby      disgust
## 5426   5426              gaby     negative
## 5427   5427               gag      disgust
## 5428   5428               gag     negative
## 5429   5429              gage        trust
## 5430   5430              gain anticipation
## 5431   5431              gain          joy
## 5432   5432              gain     positive
## 5433   5433           gaining     positive
## 5434   5434              gall        anger
## 5435   5435              gall      disgust
## 5436   5436              gall     negative
## 5437   5437           gallant     positive
## 5438   5438         gallantry     positive
## 5439   5439           gallows        anger
## 5440   5440           gallows         fear
## 5441   5441           gallows     negative
## 5442   5442           gallows      sadness
## 5443   5443            galore     positive
## 5444   5444            gamble     negative
## 5445   5445           gambler anticipation
## 5446   5446           gambler     negative
## 5447   5447           gambler     surprise
## 5448   5448          gambling anticipation
## 5449   5449          gambling     negative
## 5450   5450          gambling     surprise
## 5451   5451              gang        anger
## 5452   5452              gang         fear
## 5453   5453              gang     negative
## 5454   5454              gaol     negative
## 5455   5455               gap     negative
## 5456   5456              gape     surprise
## 5457   5457           garbage      disgust
## 5458   5458           garbage     negative
## 5459   5459            garden          joy
## 5460   5460            garden     positive
## 5461   5461            garish      disgust
## 5462   5462            garish     negative
## 5463   5463            garish     surprise
## 5464   5464            garnet     positive
## 5465   5465           garnish     negative
## 5466   5466          garrison     positive
## 5467   5467          garrison        trust
## 5468   5468              gash         fear
## 5469   5469              gash     negative
## 5470   5470              gasp     surprise
## 5471   5471           gasping         fear
## 5472   5472           gasping     negative
## 5473   5473              gate        trust
## 5474   5474           gateway        trust
## 5475   5475            gauche     negative
## 5476   5476           gauging        trust
## 5477   5477             gaunt     negative
## 5478   5478              gawk     surprise
## 5479   5479           gazette     positive
## 5480   5480           gazette        trust
## 5481   5481              gear     positive
## 5482   5482           gelatin      disgust
## 5483   5483               gem          joy
## 5484   5484               gem     positive
## 5485   5485           general     positive
## 5486   5486           general        trust
## 5487   5487        generosity anticipation
## 5488   5488        generosity          joy
## 5489   5489        generosity     positive
## 5490   5490        generosity     surprise
## 5491   5491        generosity        trust
## 5492   5492          generous          joy
## 5493   5493          generous     positive
## 5494   5494          generous        trust
## 5495   5495            genial          joy
## 5496   5496            genial     positive
## 5497   5497            genius     positive
## 5498   5498              gent        anger
## 5499   5499              gent      disgust
## 5500   5500              gent         fear
## 5501   5501              gent     negative
## 5502   5502           genteel     positive
## 5503   5503         gentleman     positive
## 5504   5504         gentleman        trust
## 5505   5505        gentleness     positive
## 5506   5506            gentry     positive
## 5507   5507            gentry        trust
## 5508   5508           genuine     positive
## 5509   5509           genuine        trust
## 5510   5510          geranium     positive
## 5511   5511         geriatric     negative
## 5512   5512         geriatric      sadness
## 5513   5513              germ anticipation
## 5514   5514              germ      disgust
## 5515   5515       germination anticipation
## 5516   5516           ghastly      disgust
## 5517   5517           ghastly         fear
## 5518   5518           ghastly     negative
## 5519   5519            ghetto      disgust
## 5520   5520            ghetto         fear
## 5521   5521            ghetto     negative
## 5522   5522            ghetto      sadness
## 5523   5523             ghost         fear
## 5524   5524           ghostly         fear
## 5525   5525           ghostly     negative
## 5526   5526             giant         fear
## 5527   5527         gibberish        anger
## 5528   5528         gibberish     negative
## 5529   5529              gift anticipation
## 5530   5530              gift          joy
## 5531   5531              gift     positive
## 5532   5532              gift     surprise
## 5533   5533            gifted     positive
## 5534   5534          gigantic     positive
## 5535   5535            giggle          joy
## 5536   5536            giggle     positive
## 5537   5537            girder     positive
## 5538   5538            girder        trust
## 5539   5539            giving     positive
## 5540   5540           glacial     negative
## 5541   5541              glad anticipation
## 5542   5542              glad          joy
## 5543   5543              glad     positive
## 5544   5544         gladiator         fear
## 5545   5545          gladness          joy
## 5546   5546          gladness     positive
## 5547   5547             glare        anger
## 5548   5548             glare         fear
## 5549   5549             glare     negative
## 5550   5550           glaring        anger
## 5551   5551           glaring     negative
## 5552   5552              glee          joy
## 5553   5553              glee     positive
## 5554   5554              glib     negative
## 5555   5555             glide anticipation
## 5556   5556             glide          joy
## 5557   5557             glide     positive
## 5558   5558           glimmer anticipation
## 5559   5559           glimmer          joy
## 5560   5560           glimmer     positive
## 5561   5561           glimmer     surprise
## 5562   5562           glitter      disgust
## 5563   5563           glitter          joy
## 5564   5564        glittering     positive
## 5565   5565             gloom     negative
## 5566   5566             gloom      sadness
## 5567   5567            gloomy     negative
## 5568   5568            gloomy      sadness
## 5569   5569     glorification          joy
## 5570   5570     glorification     positive
## 5571   5571           glorify anticipation
## 5572   5572           glorify          joy
## 5573   5573           glorify     positive
## 5574   5574           glorify     surprise
## 5575   5575           glorify        trust
## 5576   5576             glory anticipation
## 5577   5577             glory          joy
## 5578   5578             glory     positive
## 5579   5579             glory        trust
## 5580   5580             gloss     positive
## 5581   5581              glow anticipation
## 5582   5582              glow          joy
## 5583   5583              glow     positive
## 5584   5584              glow        trust
## 5585   5585           glowing     positive
## 5586   5586              glum     negative
## 5587   5587              glum      sadness
## 5588   5588              glut      disgust
## 5589   5589              glut     negative
## 5590   5590          gluttony      disgust
## 5591   5591          gluttony     negative
## 5592   5592             gnome        anger
## 5593   5593             gnome      disgust
## 5594   5594             gnome         fear
## 5595   5595             gnome     negative
## 5596   5596               gob      disgust
## 5597   5597            goblin      disgust
## 5598   5598            goblin         fear
## 5599   5599            goblin     negative
## 5600   5600               god anticipation
## 5601   5601               god         fear
## 5602   5602               god          joy
## 5603   5603               god     positive
## 5604   5604               god        trust
## 5605   5605           godless        anger
## 5606   5606           godless     negative
## 5607   5607             godly          joy
## 5608   5608             godly     positive
## 5609   5609             godly        trust
## 5610   5610           godsend          joy
## 5611   5611           godsend     positive
## 5612   5612           godsend     surprise
## 5613   5613              gold     positive
## 5614   5614         gonorrhea        anger
## 5615   5615         gonorrhea      disgust
## 5616   5616         gonorrhea         fear
## 5617   5617         gonorrhea     negative
## 5618   5618         gonorrhea      sadness
## 5619   5619               goo      disgust
## 5620   5620               goo     negative
## 5621   5621              good anticipation
## 5622   5622              good          joy
## 5623   5623              good     positive
## 5624   5624              good     surprise
## 5625   5625              good        trust
## 5626   5626            goodly     positive
## 5627   5627          goodness anticipation
## 5628   5628          goodness          joy
## 5629   5629          goodness     positive
## 5630   5630          goodness     surprise
## 5631   5631          goodness        trust
## 5632   5632             goods     positive
## 5633   5633          goodwill     positive
## 5634   5634              gore        anger
## 5635   5635              gore      disgust
## 5636   5636              gore         fear
## 5637   5637              gore     negative
## 5638   5638              gore      sadness
## 5639   5639             gorge      disgust
## 5640   5640             gorge     negative
## 5641   5641          gorgeous          joy
## 5642   5642          gorgeous     positive
## 5643   5643           gorilla     negative
## 5644   5644              gory        anger
## 5645   5645              gory      disgust
## 5646   5646              gory         fear
## 5647   5647              gory     negative
## 5648   5648              gory      sadness
## 5649   5649            gospel     positive
## 5650   5650            gospel        trust
## 5651   5651            gossip     negative
## 5652   5652             gouge     negative
## 5653   5653              gout     negative
## 5654   5654            govern     positive
## 5655   5655            govern        trust
## 5656   5656         governess        trust
## 5657   5657        government         fear
## 5658   5658        government     negative
## 5659   5659          governor        trust
## 5660   5660              grab        anger
## 5661   5661              grab     negative
## 5662   5662             grace     positive
## 5663   5663          graceful     positive
## 5664   5664          gracious     positive
## 5665   5665        graciously     positive
## 5666   5666           gradual anticipation
## 5667   5667        graduation anticipation
## 5668   5668        graduation         fear
## 5669   5669        graduation          joy
## 5670   5670        graduation     positive
## 5671   5671        graduation     surprise
## 5672   5672        graduation        trust
## 5673   5673           grammar        trust
## 5674   5674     grandchildren anticipation
## 5675   5675     grandchildren          joy
## 5676   5676     grandchildren     positive
## 5677   5677     grandchildren        trust
## 5678   5678          grandeur     positive
## 5679   5679       grandfather        trust
## 5680   5680       grandmother     positive
## 5681   5681             grant anticipation
## 5682   5682             grant          joy
## 5683   5683             grant     positive
## 5684   5684             grant        trust
## 5685   5685           granted     positive
## 5686   5686          grasping anticipation
## 5687   5687          grasping     negative
## 5688   5688             grate     negative
## 5689   5689            grated        anger
## 5690   5690            grated     negative
## 5691   5691          grateful     positive
## 5692   5692           gratify          joy
## 5693   5693           gratify     positive
## 5694   5694           gratify     surprise
## 5695   5695           grating        anger
## 5696   5696           grating      disgust
## 5697   5697           grating     negative
## 5698   5698         gratitude          joy
## 5699   5699         gratitude     positive
## 5700   5700        gratuitous      disgust
## 5701   5701             grave         fear
## 5702   5702             grave     negative
## 5703   5703             grave      sadness
## 5704   5704         gravitate anticipation
## 5705   5705              gray      disgust
## 5706   5706              gray      sadness
## 5707   5707            greasy      disgust
## 5708   5708           greater     positive
## 5709   5709         greatness          joy
## 5710   5710         greatness     positive
## 5711   5711         greatness     surprise
## 5712   5712         greatness        trust
## 5713   5713             greed        anger
## 5714   5714             greed      disgust
## 5715   5715             greed     negative
## 5716   5716            greedy      disgust
## 5717   5717            greedy     negative
## 5718   5718             green          joy
## 5719   5719             green     positive
## 5720   5720             green        trust
## 5721   5721          greeting     positive
## 5722   5722          greeting     surprise
## 5723   5723        gregarious     positive
## 5724   5724           grenade         fear
## 5725   5725           grenade     negative
## 5726   5726             grief     negative
## 5727   5727             grief      sadness
## 5728   5728         grievance        anger
## 5729   5729         grievance      disgust
## 5730   5730         grievance     negative
## 5731   5731         grievance      sadness
## 5732   5732            grieve         fear
## 5733   5733            grieve     negative
## 5734   5734            grieve      sadness
## 5735   5735          grievous        anger
## 5736   5736          grievous         fear
## 5737   5737          grievous     negative
## 5738   5738          grievous      sadness
## 5739   5739              grim        anger
## 5740   5740              grim anticipation
## 5741   5741              grim      disgust
## 5742   5742              grim         fear
## 5743   5743              grim     negative
## 5744   5744              grim      sadness
## 5745   5745             grime      disgust
## 5746   5746             grime     negative
## 5747   5747             grimy      disgust
## 5748   5748             grimy     negative
## 5749   5749              grin anticipation
## 5750   5750              grin          joy
## 5751   5751              grin     positive
## 5752   5752              grin     surprise
## 5753   5753              grin        trust
## 5754   5754          grinding     negative
## 5755   5755            grisly      disgust
## 5756   5756            grisly         fear
## 5757   5757            grisly     negative
## 5758   5758             grist     positive
## 5759   5759              grit     positive
## 5760   5760              grit        trust
## 5761   5761           grizzly         fear
## 5762   5762           grizzly     negative
## 5763   5763             groan      disgust
## 5764   5764             groan     negative
## 5765   5765             groan      sadness
## 5766   5766             grope        anger
## 5767   5767             grope      disgust
## 5768   5768             grope         fear
## 5769   5769             grope     negative
## 5770   5770             gross      disgust
## 5771   5771             gross     negative
## 5772   5772         grotesque      disgust
## 5773   5773         grotesque     negative
## 5774   5774            ground        trust
## 5775   5775          grounded         fear
## 5776   5776          grounded     negative
## 5777   5777          grounded      sadness
## 5778   5778        groundless     negative
## 5779   5779        groundwork     positive
## 5780   5780              grow anticipation
## 5781   5781              grow          joy
## 5782   5782              grow     positive
## 5783   5783              grow        trust
## 5784   5784             growl        anger
## 5785   5785             growl         fear
## 5786   5786             growl     negative
## 5787   5787          growling        anger
## 5788   5788          growling      disgust
## 5789   5789          growling         fear
## 5790   5790          growling     negative
## 5791   5791            growth     positive
## 5792   5792            grudge        anger
## 5793   5793            grudge     negative
## 5794   5794        grudgingly     negative
## 5795   5795          gruesome      disgust
## 5796   5796          gruesome     negative
## 5797   5797             gruff        anger
## 5798   5798             gruff      disgust
## 5799   5799             gruff     negative
## 5800   5800           grumble        anger
## 5801   5801           grumble      disgust
## 5802   5802           grumble     negative
## 5803   5803            grumpy        anger
## 5804   5804            grumpy      disgust
## 5805   5805            grumpy     negative
## 5806   5806            grumpy      sadness
## 5807   5807         guarantee     positive
## 5808   5808         guarantee        trust
## 5809   5809             guard         fear
## 5810   5810             guard     positive
## 5811   5811             guard        trust
## 5812   5812           guarded        trust
## 5813   5813          guardian     positive
## 5814   5814          guardian        trust
## 5815   5815      guardianship     positive
## 5816   5816      guardianship        trust
## 5817   5817     gubernatorial     positive
## 5818   5818     gubernatorial        trust
## 5819   5819          guerilla         fear
## 5820   5820          guerilla     negative
## 5821   5821             guess     surprise
## 5822   5822          guidance     positive
## 5823   5823          guidance        trust
## 5824   5824             guide     positive
## 5825   5825             guide        trust
## 5826   5826         guidebook     positive
## 5827   5827         guidebook        trust
## 5828   5828             guile     negative
## 5829   5829        guillotine        anger
## 5830   5830        guillotine anticipation
## 5831   5831        guillotine      disgust
## 5832   5832        guillotine         fear
## 5833   5833        guillotine     negative
## 5834   5834        guillotine      sadness
## 5835   5835             guilt      disgust
## 5836   5836             guilt     negative
## 5837   5837             guilt      sadness
## 5838   5838            guilty        anger
## 5839   5839            guilty     negative
## 5840   5840            guilty      sadness
## 5841   5841             guise     negative
## 5842   5842              gull     negative
## 5843   5843          gullible     negative
## 5844   5844          gullible      sadness
## 5845   5845          gullible        trust
## 5846   5846              gulp         fear
## 5847   5847              gulp     surprise
## 5848   5848               gun        anger
## 5849   5849               gun         fear
## 5850   5850               gun     negative
## 5851   5851         gunpowder         fear
## 5852   5852              guru     positive
## 5853   5853              guru        trust
## 5854   5854              gush      disgust
## 5855   5855              gush          joy
## 5856   5856              gush     negative
## 5857   5857            gusset        trust
## 5858   5858               gut      disgust
## 5859   5859              guts     positive
## 5860   5860            gutter      disgust
## 5861   5861          guzzling     negative
## 5862   5862           gymnast     positive
## 5863   5863             gypsy     negative
## 5864   5864           habitat     positive
## 5865   5865          habitual anticipation
## 5866   5866               hag      disgust
## 5867   5867               hag         fear
## 5868   5868               hag     negative
## 5869   5869           haggard     negative
## 5870   5870           haggard      sadness
## 5871   5871              hail     negative
## 5872   5872              hail     positive
## 5873   5873              hail        trust
## 5874   5874             hairy      disgust
## 5875   5875             hairy     negative
## 5876   5876              hale     positive
## 5877   5877           halfway     negative
## 5878   5878     hallucination         fear
## 5879   5879     hallucination     negative
## 5880   5880            halter        anger
## 5881   5881            halter         fear
## 5882   5882            halter     negative
## 5883   5883            halter      sadness
## 5884   5884           halting         fear
## 5885   5885           halting     negative
## 5886   5886           halting      sadness
## 5887   5887            hamper     negative
## 5888   5888         hamstring        anger
## 5889   5889         hamstring     negative
## 5890   5890         hamstring      sadness
## 5891   5891          handbook        trust
## 5892   5892          handicap     negative
## 5893   5893          handicap      sadness
## 5894   5894             handy     positive
## 5895   5895           hanging        anger
## 5896   5896           hanging      disgust
## 5897   5897           hanging         fear
## 5898   5898           hanging     negative
## 5899   5899           hanging      sadness
## 5900   5900           hangman         fear
## 5901   5901           hangman     negative
## 5902   5902         hankering anticipation
## 5903   5903               hap anticipation
## 5904   5904               hap     surprise
## 5905   5905            happen anticipation
## 5906   5906           happily          joy
## 5907   5907           happily     positive
## 5908   5908         happiness anticipation
## 5909   5909         happiness          joy
## 5910   5910         happiness     positive
## 5911   5911             happy anticipation
## 5912   5912             happy          joy
## 5913   5913             happy     positive
## 5914   5914             happy        trust
## 5915   5915            harass        anger
## 5916   5916            harass      disgust
## 5917   5917            harass     negative
## 5918   5918         harassing        anger
## 5919   5919         harbinger        anger
## 5920   5920         harbinger anticipation
## 5921   5921         harbinger         fear
## 5922   5922         harbinger     negative
## 5923   5923            harbor        trust
## 5924   5924          hardened        anger
## 5925   5925          hardened      disgust
## 5926   5926          hardened         fear
## 5927   5927          hardened     negative
## 5928   5928          hardness     negative
## 5929   5929          hardship     negative
## 5930   5930          hardship      sadness
## 5931   5931             hardy          joy
## 5932   5932             hardy     positive
## 5933   5933             hardy        trust
## 5934   5934            harlot      disgust
## 5935   5935            harlot     negative
## 5936   5936              harm         fear
## 5937   5937              harm     negative
## 5938   5938           harmful        anger
## 5939   5939           harmful      disgust
## 5940   5940           harmful         fear
## 5941   5941           harmful     negative
## 5942   5942           harmful      sadness
## 5943   5943      harmoniously          joy
## 5944   5944      harmoniously     positive
## 5945   5945      harmoniously        trust
## 5946   5946           harmony          joy
## 5947   5947           harmony     positive
## 5948   5948           harmony        trust
## 5949   5949         harrowing         fear
## 5950   5950         harrowing     negative
## 5951   5951             harry        anger
## 5952   5952             harry     negative
## 5953   5953             harry      sadness
## 5954   5954         harshness        anger
## 5955   5955         harshness         fear
## 5956   5956         harshness     negative
## 5957   5957           harvest anticipation
## 5958   5958           harvest          joy
## 5959   5959           harvest     positive
## 5960   5960              hash     negative
## 5961   5961           hashish     negative
## 5962   5962             haste anticipation
## 5963   5963             hasty     negative
## 5964   5964              hate        anger
## 5965   5965              hate      disgust
## 5966   5966              hate         fear
## 5967   5967              hate     negative
## 5968   5968              hate      sadness
## 5969   5969           hateful        anger
## 5970   5970           hateful      disgust
## 5971   5971           hateful         fear
## 5972   5972           hateful     negative
## 5973   5973           hateful      sadness
## 5974   5974            hating        anger
## 5975   5975            hating     negative
## 5976   5976            hatred        anger
## 5977   5977            hatred      disgust
## 5978   5978            hatred         fear
## 5979   5979            hatred     negative
## 5980   5980            hatred      sadness
## 5981   5981           haughty        anger
## 5982   5982           haughty     negative
## 5983   5983             haunt         fear
## 5984   5984             haunt     negative
## 5985   5985           haunted         fear
## 5986   5986           haunted     negative
## 5987   5987           haunted      sadness
## 5988   5988             haven     positive
## 5989   5989             haven        trust
## 5990   5990             havoc        anger
## 5991   5991             havoc         fear
## 5992   5992             havoc     negative
## 5993   5993              hawk         fear
## 5994   5994            hazard         fear
## 5995   5995            hazard     negative
## 5996   5996         hazardous         fear
## 5997   5997         hazardous     negative
## 5998   5998              haze         fear
## 5999   5999              haze     negative
## 6000   6000          headache     negative
## 6001   6001         headlight anticipation
## 6002   6002           headway     positive
## 6003   6003             heady     negative
## 6004   6004              heal          joy
## 6005   6005              heal     positive
## 6006   6006              heal        trust
## 6007   6007           healing anticipation
## 6008   6008           healing          joy
## 6009   6009           healing     positive
## 6010   6010           healing        trust
## 6011   6011         healthful          joy
## 6012   6012         healthful     positive
## 6013   6013           healthy     positive
## 6014   6014           hearing         fear
## 6015   6015           hearing     negative
## 6016   6016           hearsay     negative
## 6017   6017            hearse         fear
## 6018   6018            hearse     negative
## 6019   6019            hearse      sadness
## 6020   6020         heartache     negative
## 6021   6021         heartache      sadness
## 6022   6022         heartburn     negative
## 6023   6023         heartfelt          joy
## 6024   6024         heartfelt     positive
## 6025   6025         heartfelt      sadness
## 6026   6026         heartfelt        trust
## 6027   6027            hearth     positive
## 6028   6028          heartily          joy
## 6029   6029          heartily     positive
## 6030   6030         heartless     negative
## 6031   6031         heartless      sadness
## 6032   6032         heartworm      disgust
## 6033   6033           heathen         fear
## 6034   6034           heathen     negative
## 6035   6035          heavenly anticipation
## 6036   6036          heavenly          joy
## 6037   6037          heavenly     positive
## 6038   6038          heavenly        trust
## 6039   6039           heavens          joy
## 6040   6040           heavens     positive
## 6041   6041           heavens        trust
## 6042   6042           heavily     negative
## 6043   6043          hedonism          joy
## 6044   6044          hedonism     negative
## 6045   6045          hedonism     positive
## 6046   6046              heel     negative
## 6047   6047              heft anticipation
## 6048   6048              heft         fear
## 6049   6049              heft     positive
## 6050   6050          heighten         fear
## 6051   6051          heighten     negative
## 6052   6052           heinous     negative
## 6053   6053              hell        anger
## 6054   6054              hell      disgust
## 6055   6055              hell         fear
## 6056   6056              hell     negative
## 6057   6057              hell      sadness
## 6058   6058           hellish        anger
## 6059   6059           hellish      disgust
## 6060   6060           hellish         fear
## 6061   6061           hellish     negative
## 6062   6062           hellish      sadness
## 6063   6063            helmet         fear
## 6064   6064            helmet     positive
## 6065   6065            helper     positive
## 6066   6066            helper        trust
## 6067   6067           helpful          joy
## 6068   6068           helpful     positive
## 6069   6069           helpful        trust
## 6070   6070          helpless         fear
## 6071   6071          helpless     negative
## 6072   6072          helpless      sadness
## 6073   6073      helplessness         fear
## 6074   6074      helplessness     negative
## 6075   6075      helplessness      sadness
## 6076   6076        hemorrhage      disgust
## 6077   6077        hemorrhage         fear
## 6078   6078        hemorrhage     negative
## 6079   6079        hemorrhage      sadness
## 6080   6080       hemorrhoids     negative
## 6081   6081            herbal     positive
## 6082   6082            heresy     negative
## 6083   6083           heretic      disgust
## 6084   6084           heretic     negative
## 6085   6085          heritage        trust
## 6086   6086     hermaphrodite     negative
## 6087   6087     hermaphrodite     surprise
## 6088   6088            hermit      sadness
## 6089   6089            hermit        trust
## 6090   6090              hero anticipation
## 6091   6091              hero          joy
## 6092   6092              hero     positive
## 6093   6093              hero     surprise
## 6094   6094              hero        trust
## 6095   6095            heroic          joy
## 6096   6096            heroic     positive
## 6097   6097            heroic     surprise
## 6098   6098            heroic        trust
## 6099   6099           heroics     positive
## 6100   6100            heroin     negative
## 6101   6101           heroine     positive
## 6102   6102           heroine        trust
## 6103   6103           heroism anticipation
## 6104   6104           heroism          joy
## 6105   6105           heroism     positive
## 6106   6106           heroism     surprise
## 6107   6107           heroism        trust
## 6108   6108            herpes      disgust
## 6109   6109            herpes     negative
## 6110   6110       herpesvirus      disgust
## 6111   6111       herpesvirus     negative
## 6112   6112        hesitation         fear
## 6113   6113        hesitation     negative
## 6114   6114            heyday anticipation
## 6115   6115            heyday          joy
## 6116   6116            heyday     positive
## 6117   6117            heyday        trust
## 6118   6118            hidden     negative
## 6119   6119              hide         fear
## 6120   6120           hideous      disgust
## 6121   6121           hideous         fear
## 6122   6122           hideous     negative
## 6123   6123           hideous      sadness
## 6124   6124            hiding         fear
## 6125   6125           highest anticipation
## 6126   6126           highest         fear
## 6127   6127           highest          joy
## 6128   6128           highest     negative
## 6129   6129           highest     positive
## 6130   6130           highest     surprise
## 6131   6131         hilarious          joy
## 6132   6132         hilarious     positive
## 6133   6133         hilarious     surprise
## 6134   6134          hilarity          joy
## 6135   6135          hilarity     positive
## 6136   6136         hindering     negative
## 6137   6137         hindering      sadness
## 6138   6138         hindrance     negative
## 6139   6139            hippie     negative
## 6140   6140              hire anticipation
## 6141   6141              hire          joy
## 6142   6142              hire     positive
## 6143   6143              hire        trust
## 6144   6144              hiss        anger
## 6145   6145              hiss         fear
## 6146   6146              hiss     negative
## 6147   6147           hissing     negative
## 6148   6148               hit        anger
## 6149   6149               hit     negative
## 6150   6150          hitherto     negative
## 6151   6151              hive     negative
## 6152   6152            hoarse     negative
## 6153   6153             hoary     negative
## 6154   6154             hoary      sadness
## 6155   6155              hoax        anger
## 6156   6156              hoax      disgust
## 6157   6157              hoax     negative
## 6158   6158              hoax      sadness
## 6159   6159              hoax     surprise
## 6160   6160             hobby          joy
## 6161   6161             hobby     positive
## 6162   6162              hobo     negative
## 6163   6163              hobo      sadness
## 6164   6164               hog      disgust
## 6165   6165               hog     negative
## 6166   6166           holiday anticipation
## 6167   6167           holiday          joy
## 6168   6168           holiday     positive
## 6169   6169          holiness anticipation
## 6170   6170          holiness         fear
## 6171   6171          holiness          joy
## 6172   6172          holiness     positive
## 6173   6173          holiness     surprise
## 6174   6174          holiness        trust
## 6175   6175            hollow     negative
## 6176   6176            hollow      sadness
## 6177   6177         holocaust        anger
## 6178   6178         holocaust      disgust
## 6179   6179         holocaust         fear
## 6180   6180         holocaust     negative
## 6181   6181         holocaust      sadness
## 6182   6182              holy     positive
## 6183   6183            homage     positive
## 6184   6184          homeless        anger
## 6185   6185          homeless anticipation
## 6186   6186          homeless      disgust
## 6187   6187          homeless         fear
## 6188   6188          homeless     negative
## 6189   6189          homeless      sadness
## 6190   6190          homesick     negative
## 6191   6191          homesick      sadness
## 6192   6192          homework         fear
## 6193   6193         homicidal        anger
## 6194   6194         homicidal         fear
## 6195   6195         homicidal     negative
## 6196   6196          homicide        anger
## 6197   6197          homicide      disgust
## 6198   6198          homicide         fear
## 6199   6199          homicide     negative
## 6200   6200          homicide      sadness
## 6201   6201          homology     positive
## 6202   6202            honest        anger
## 6203   6203            honest      disgust
## 6204   6204            honest         fear
## 6205   6205            honest          joy
## 6206   6206            honest     positive
## 6207   6207            honest      sadness
## 6208   6208            honest        trust
## 6209   6209           honesty     positive
## 6210   6210           honesty        trust
## 6211   6211             honey     positive
## 6212   6212         honeymoon anticipation
## 6213   6213         honeymoon          joy
## 6214   6214         honeymoon     positive
## 6215   6215         honeymoon     surprise
## 6216   6216         honeymoon        trust
## 6217   6217             honor     positive
## 6218   6218             honor        trust
## 6219   6219         honorable     positive
## 6220   6220         honorable        trust
## 6221   6221              hood        anger
## 6222   6222              hood      disgust
## 6223   6223              hood         fear
## 6224   6224              hood     negative
## 6225   6225            hooded         fear
## 6226   6226            hooked     negative
## 6227   6227              hoot        anger
## 6228   6228              hoot      disgust
## 6229   6229              hoot     negative
## 6230   6230              hope anticipation
## 6231   6231              hope          joy
## 6232   6232              hope     positive
## 6233   6233              hope     surprise
## 6234   6234              hope        trust
## 6235   6235           hopeful anticipation
## 6236   6236           hopeful          joy
## 6237   6237           hopeful     positive
## 6238   6238           hopeful     surprise
## 6239   6239           hopeful        trust
## 6240   6240          hopeless         fear
## 6241   6241          hopeless     negative
## 6242   6242          hopeless      sadness
## 6243   6243      hopelessness        anger
## 6244   6244      hopelessness      disgust
## 6245   6245      hopelessness         fear
## 6246   6246      hopelessness     negative
## 6247   6247      hopelessness      sadness
## 6248   6248             horde     negative
## 6249   6249             horde     surprise
## 6250   6250           horizon anticipation
## 6251   6251           horizon     positive
## 6252   6252         horoscope anticipation
## 6253   6253          horrible        anger
## 6254   6254          horrible      disgust
## 6255   6255          horrible         fear
## 6256   6256          horrible     negative
## 6257   6257          horribly     negative
## 6258   6258            horrid        anger
## 6259   6259            horrid      disgust
## 6260   6260            horrid         fear
## 6261   6261            horrid     negative
## 6262   6262            horrid      sadness
## 6263   6263          horrific        anger
## 6264   6264          horrific      disgust
## 6265   6265          horrific         fear
## 6266   6266          horrific     negative
## 6267   6267          horrific      sadness
## 6268   6268         horrified         fear
## 6269   6269         horrified     negative
## 6270   6270        horrifying      disgust
## 6271   6271        horrifying         fear
## 6272   6272        horrifying     negative
## 6273   6273        horrifying      sadness
## 6274   6274            horror        anger
## 6275   6275            horror      disgust
## 6276   6276            horror         fear
## 6277   6277            horror     negative
## 6278   6278            horror      sadness
## 6279   6279            horror     surprise
## 6280   6280           horrors         fear
## 6281   6281           horrors     negative
## 6282   6282           horrors      sadness
## 6283   6283             horse        trust
## 6284   6284           hospice      sadness
## 6285   6285          hospital         fear
## 6286   6286          hospital      sadness
## 6287   6287          hospital        trust
## 6288   6288       hospitality     positive
## 6289   6289           hostage        anger
## 6290   6290           hostage         fear
## 6291   6291           hostage     negative
## 6292   6292           hostile        anger
## 6293   6293           hostile      disgust
## 6294   6294           hostile         fear
## 6295   6295           hostile     negative
## 6296   6296       hostilities        anger
## 6297   6297       hostilities         fear
## 6298   6298       hostilities     negative
## 6299   6299         hostility        anger
## 6300   6300         hostility      disgust
## 6301   6301         hostility     negative
## 6302   6302               hot        anger
## 6303   6303         household     positive
## 6304   6304      housekeeping     positive
## 6305   6305              howl        anger
## 6306   6306              howl      disgust
## 6307   6307              howl         fear
## 6308   6308              howl     negative
## 6309   6309              howl      sadness
## 6310   6310              howl     surprise
## 6311   6311              huff        anger
## 6312   6312              huff      disgust
## 6313   6313              huff     negative
## 6314   6314               hug          joy
## 6315   6315               hug     positive
## 6316   6316               hug        trust
## 6317   6317              hulk      disgust
## 6318   6318            humane     positive
## 6319   6319      humanitarian anticipation
## 6320   6320      humanitarian          joy
## 6321   6321      humanitarian     positive
## 6322   6322      humanitarian     surprise
## 6323   6323      humanitarian        trust
## 6324   6324          humanity          joy
## 6325   6325          humanity     positive
## 6326   6326          humanity        trust
## 6327   6327            humble      disgust
## 6328   6328            humble     negative
## 6329   6329            humble     positive
## 6330   6330            humble      sadness
## 6331   6331           humbled     positive
## 6332   6332           humbled      sadness
## 6333   6333            humbly     positive
## 6334   6334            humbug        anger
## 6335   6335            humbug      disgust
## 6336   6336            humbug     negative
## 6337   6337            humbug      sadness
## 6338   6338         humiliate        anger
## 6339   6339         humiliate     negative
## 6340   6340         humiliate      sadness
## 6341   6341       humiliating      disgust
## 6342   6342       humiliating     negative
## 6343   6343       humiliation      disgust
## 6344   6344       humiliation     negative
## 6345   6345       humiliation      sadness
## 6346   6346          humility     positive
## 6347   6347          humility        trust
## 6348   6348          humorist     positive
## 6349   6349          humorous          joy
## 6350   6350          humorous     positive
## 6351   6351             hunch     negative
## 6352   6352            hungry anticipation
## 6353   6353            hungry     negative
## 6354   6354            hunter anticipation
## 6355   6355            hunter         fear
## 6356   6356            hunter     negative
## 6357   6357            hunter      sadness
## 6358   6358           hunting        anger
## 6359   6359           hunting anticipation
## 6360   6360           hunting         fear
## 6361   6361           hunting     negative
## 6362   6362            hurrah          joy
## 6363   6363            hurrah     positive
## 6364   6364         hurricane         fear
## 6365   6365         hurricane     negative
## 6366   6366           hurried anticipation
## 6367   6367           hurried     negative
## 6368   6368             hurry anticipation
## 6369   6369              hurt        anger
## 6370   6370              hurt         fear
## 6371   6371              hurt     negative
## 6372   6372              hurt      sadness
## 6373   6373           hurtful        anger
## 6374   6374           hurtful      disgust
## 6375   6375           hurtful         fear
## 6376   6376           hurtful     negative
## 6377   6377           hurtful      sadness
## 6378   6378           hurting        anger
## 6379   6379           hurting         fear
## 6380   6380           hurting     negative
## 6381   6381           hurting      sadness
## 6382   6382         husbandry     positive
## 6383   6383         husbandry        trust
## 6384   6384              hush     positive
## 6385   6385           hustler     negative
## 6386   6386               hut     positive
## 6387   6387               hut      sadness
## 6388   6388             hydra         fear
## 6389   6389             hydra     negative
## 6390   6390     hydrocephalus      disgust
## 6391   6391     hydrocephalus         fear
## 6392   6392     hydrocephalus     negative
## 6393   6393     hydrocephalus      sadness
## 6394   6394          hygienic     positive
## 6395   6395              hymn anticipation
## 6396   6396              hymn          joy
## 6397   6397              hymn     positive
## 6398   6398              hymn      sadness
## 6399   6399              hymn        trust
## 6400   6400              hype anticipation
## 6401   6401              hype     negative
## 6402   6402         hyperbole     negative
## 6403   6403       hypertrophy      disgust
## 6404   6404       hypertrophy         fear
## 6405   6405       hypertrophy     surprise
## 6406   6406         hypocrisy     negative
## 6407   6407         hypocrite      disgust
## 6408   6408         hypocrite     negative
## 6409   6409      hypocritical      disgust
## 6410   6410      hypocritical     negative
## 6411   6411        hypothesis anticipation
## 6412   6412        hypothesis     surprise
## 6413   6413          hysteria         fear
## 6414   6414          hysteria     negative
## 6415   6415        hysterical        anger
## 6416   6416        hysterical         fear
## 6417   6417        hysterical     negative
## 6418   6418          idealism     positive
## 6419   6419            idiocy        anger
## 6420   6420            idiocy      disgust
## 6421   6421            idiocy     negative
## 6422   6422            idiocy      sadness
## 6423   6423             idiot      disgust
## 6424   6424             idiot     negative
## 6425   6425           idiotic        anger
## 6426   6426           idiotic      disgust
## 6427   6427           idiotic     negative
## 6428   6428             idler     negative
## 6429   6429              idol     positive
## 6430   6430          idolatry      disgust
## 6431   6431          idolatry         fear
## 6432   6432          idolatry     negative
## 6433   6433         ignorance     negative
## 6434   6434          ignorant      disgust
## 6435   6435          ignorant     negative
## 6436   6436            ignore     negative
## 6437   6437               ill        anger
## 6438   6438               ill      disgust
## 6439   6439               ill         fear
## 6440   6440               ill     negative
## 6441   6441               ill      sadness
## 6442   6442           illegal        anger
## 6443   6443           illegal      disgust
## 6444   6444           illegal         fear
## 6445   6445           illegal     negative
## 6446   6446           illegal      sadness
## 6447   6447        illegality        anger
## 6448   6448        illegality      disgust
## 6449   6449        illegality         fear
## 6450   6450        illegality     negative
## 6451   6451         illegible     negative
## 6452   6452      illegitimate        anger
## 6453   6453      illegitimate      disgust
## 6454   6454      illegitimate         fear
## 6455   6455      illegitimate     negative
## 6456   6456      illegitimate      sadness
## 6457   6457      illegitimate     surprise
## 6458   6458           illicit        anger
## 6459   6459           illicit      disgust
## 6460   6460           illicit         fear
## 6461   6461           illicit     negative
## 6462   6462        illiterate      disgust
## 6463   6463        illiterate     negative
## 6464   6464           illness         fear
## 6465   6465           illness     negative
## 6466   6466           illness      sadness
## 6467   6467         illogical     negative
## 6468   6468        illuminate anticipation
## 6469   6469        illuminate          joy
## 6470   6470        illuminate     positive
## 6471   6471        illuminate     surprise
## 6472   6472      illumination          joy
## 6473   6473      illumination     positive
## 6474   6474      illumination     surprise
## 6475   6475      illumination        trust
## 6476   6476          illusion     negative
## 6477   6477          illusion     surprise
## 6478   6478        illustrate     positive
## 6479   6479       illustrious     positive
## 6480   6480       imaginative     positive
## 6481   6481          imitated     negative
## 6482   6482         imitation     negative
## 6483   6483        immaculate          joy
## 6484   6484        immaculate     positive
## 6485   6485        immaculate        trust
## 6486   6486          immature anticipation
## 6487   6487          immature     negative
## 6488   6488        immaturity        anger
## 6489   6489        immaturity anticipation
## 6490   6490        immaturity     negative
## 6491   6491         immediacy     surprise
## 6492   6492       immediately anticipation
## 6493   6493       immediately     negative
## 6494   6494       immediately     positive
## 6495   6495           immense     positive
## 6496   6496           immerse anticipation
## 6497   6497           immerse         fear
## 6498   6498           immerse          joy
## 6499   6499           immerse     positive
## 6500   6500           immerse     surprise
## 6501   6501           immerse        trust
## 6502   6502         immigrant         fear
## 6503   6503          imminent anticipation
## 6504   6504          imminent         fear
## 6505   6505           immoral        anger
## 6506   6506           immoral      disgust
## 6507   6507           immoral         fear
## 6508   6508           immoral     negative
## 6509   6509           immoral      sadness
## 6510   6510        immorality        anger
## 6511   6511        immorality      disgust
## 6512   6512        immorality     negative
## 6513   6513          immortal     positive
## 6514   6514       immortality anticipation
## 6515   6515         immovable     negative
## 6516   6516         immovable     positive
## 6517   6517         immovable        trust
## 6518   6518      immunization        trust
## 6519   6519            impair     negative
## 6520   6520        impairment     negative
## 6521   6521            impart     positive
## 6522   6522            impart        trust
## 6523   6523         impartial     positive
## 6524   6524         impartial        trust
## 6525   6525      impartiality     positive
## 6526   6526      impartiality        trust
## 6527   6527        impassable     negative
## 6528   6528        impatience     negative
## 6529   6529         impatient anticipation
## 6530   6530         impatient     negative
## 6531   6531           impeach      disgust
## 6532   6532           impeach         fear
## 6533   6533           impeach     negative
## 6534   6534       impeachment     negative
## 6535   6535        impeccable     positive
## 6536   6536        impeccable        trust
## 6537   6537            impede     negative
## 6538   6538         impending anticipation
## 6539   6539         impending         fear
## 6540   6540      impenetrable        trust
## 6541   6541      imperfection     negative
## 6542   6542       imperfectly     negative
## 6543   6543       impermeable        anger
## 6544   6544       impermeable         fear
## 6545   6545       impersonate     negative
## 6546   6546     impersonation     negative
## 6547   6547        impervious     positive
## 6548   6548        implacable     negative
## 6549   6549         implicate        anger
## 6550   6550         implicate     negative
## 6551   6551          impolite      disgust
## 6552   6552          impolite     negative
## 6553   6553        importance anticipation
## 6554   6554        importance     positive
## 6555   6555         important     positive
## 6556   6556         important        trust
## 6557   6557        imposition     negative
## 6558   6558        impossible     negative
## 6559   6559        impossible      sadness
## 6560   6560         impotence        anger
## 6561   6561         impotence         fear
## 6562   6562         impotence     negative
## 6563   6563         impotence      sadness
## 6564   6564          impotent     negative
## 6565   6565           impound     negative
## 6566   6566     impracticable     negative
## 6567   6567           impress     positive
## 6568   6568        impression     positive
## 6569   6569    impressionable        trust
## 6570   6570          imprison     negative
## 6571   6571        imprisoned        anger
## 6572   6572        imprisoned      disgust
## 6573   6573        imprisoned         fear
## 6574   6574        imprisoned     negative
## 6575   6575        imprisoned      sadness
## 6576   6576      imprisonment        anger
## 6577   6577      imprisonment      disgust
## 6578   6578      imprisonment         fear
## 6579   6579      imprisonment     negative
## 6580   6580      imprisonment      sadness
## 6581   6581       impropriety     negative
## 6582   6582           improve anticipation
## 6583   6583           improve          joy
## 6584   6584           improve     positive
## 6585   6585           improve        trust
## 6586   6586          improved     positive
## 6587   6587       improvement          joy
## 6588   6588       improvement     positive
## 6589   6589       improvement        trust
## 6590   6590         improving     positive
## 6591   6591     improvisation     surprise
## 6592   6592         improvise anticipation
## 6593   6593         improvise     positive
## 6594   6594         improvise     surprise
## 6595   6595         imprudent     negative
## 6596   6596         imprudent      sadness
## 6597   6597            impure      disgust
## 6598   6598            impure     negative
## 6599   6599          impurity      disgust
## 6600   6600          impurity     negative
## 6601   6601        imputation     negative
## 6602   6602         inability     negative
## 6603   6603         inability      sadness
## 6604   6604      inaccessible     negative
## 6605   6605        inaccurate     negative
## 6606   6606          inaction     negative
## 6607   6607        inactivity     negative
## 6608   6608        inadequacy     negative
## 6609   6609        inadequate     negative
## 6610   6610        inadequate      sadness
## 6611   6611      inadmissible        anger
## 6612   6612      inadmissible      disgust
## 6613   6613      inadmissible     negative
## 6614   6614       inalienable     positive
## 6615   6615             inane     negative
## 6616   6616      inapplicable     negative
## 6617   6617     inappropriate        anger
## 6618   6618     inappropriate      disgust
## 6619   6619     inappropriate     negative
## 6620   6620     inappropriate      sadness
## 6621   6621       inattention        anger
## 6622   6622       inattention     negative
## 6623   6623         inaudible     negative
## 6624   6624         inaugural anticipation
## 6625   6625      inauguration anticipation
## 6626   6626      inauguration          joy
## 6627   6627      inauguration     positive
## 6628   6628      inauguration        trust
## 6629   6629      incalculable     negative
## 6630   6630        incapacity     negative
## 6631   6631     incarceration        anger
## 6632   6632     incarceration      disgust
## 6633   6633     incarceration         fear
## 6634   6634     incarceration     negative
## 6635   6635     incarceration      sadness
## 6636   6636            incase        anger
## 6637   6637            incase      disgust
## 6638   6638            incase         fear
## 6639   6639            incase     negative
## 6640   6640            incase      sadness
## 6641   6641        incendiary        anger
## 6642   6642        incendiary         fear
## 6643   6643        incendiary     negative
## 6644   6644        incendiary     surprise
## 6645   6645           incense        anger
## 6646   6646           incense     negative
## 6647   6647         incessant     negative
## 6648   6648            incest        anger
## 6649   6649            incest      disgust
## 6650   6650            incest         fear
## 6651   6651            incest     negative
## 6652   6652            incest      sadness
## 6653   6653        incestuous      disgust
## 6654   6654        incestuous     negative
## 6655   6655          incident     surprise
## 6656   6656      incineration     negative
## 6657   6657          incisive     positive
## 6658   6658            incite        anger
## 6659   6659            incite anticipation
## 6660   6660            incite         fear
## 6661   6661            incite     negative
## 6662   6662         inclement     negative
## 6663   6663           incline        trust
## 6664   6664           include     positive
## 6665   6665          included     positive
## 6666   6666         including     positive
## 6667   6667         inclusion        trust
## 6668   6668         inclusive     positive
## 6669   6669        incoherent     negative
## 6670   6670            income anticipation
## 6671   6671            income          joy
## 6672   6672            income     negative
## 6673   6673            income     positive
## 6674   6674            income      sadness
## 6675   6675            income        trust
## 6676   6676      incompatible        anger
## 6677   6677      incompatible      disgust
## 6678   6678      incompatible     negative
## 6679   6679      incompatible      sadness
## 6680   6680      incompetence     negative
## 6681   6681       incompetent        anger
## 6682   6682       incompetent     negative
## 6683   6683       incompetent      sadness
## 6684   6684    incompleteness     negative
## 6685   6685  incomprehensible     negative
## 6686   6686       incongruous        anger
## 6687   6687       incongruous     negative
## 6688   6688   inconsequential     negative
## 6689   6689   inconsequential      sadness
## 6690   6690     inconsiderate        anger
## 6691   6691     inconsiderate      disgust
## 6692   6692     inconsiderate     negative
## 6693   6693     inconsiderate      sadness
## 6694   6694     inconsistency     negative
## 6695   6695      incontinence     surprise
## 6696   6696      inconvenient        anger
## 6697   6697      inconvenient      disgust
## 6698   6698      inconvenient     negative
## 6699   6699      inconvenient      sadness
## 6700   6700         incorrect     negative
## 6701   6701          increase     positive
## 6702   6702       incredulous        anger
## 6703   6703       incredulous      disgust
## 6704   6704       incredulous     negative
## 6705   6705     incrimination         fear
## 6706   6706     incrimination     negative
## 6707   6707     incrimination      sadness
## 6708   6708           incubus      disgust
## 6709   6709           incubus         fear
## 6710   6710           incubus     negative
## 6711   6711             incur     negative
## 6712   6712         incurable        anger
## 6713   6713         incurable      disgust
## 6714   6714         incurable         fear
## 6715   6715         incurable     negative
## 6716   6716         incurable      sadness
## 6717   6717         incursion         fear
## 6718   6718         incursion     negative
## 6719   6719         indecency        anger
## 6720   6720         indecency      disgust
## 6721   6721          indecent      disgust
## 6722   6722          indecent     negative
## 6723   6723        indecision     negative
## 6724   6724        indecisive     negative
## 6725   6725      indefensible         fear
## 6726   6726      indefensible     negative
## 6727   6727         indelible     positive
## 6728   6728         indelible        trust
## 6729   6729         indemnify     negative
## 6730   6730         indemnity     positive
## 6731   6731         indemnity        trust
## 6732   6732            indent        trust
## 6733   6733         indenture        anger
## 6734   6734         indenture     negative
## 6735   6735      independence anticipation
## 6736   6736      independence          joy
## 6737   6737      independence     positive
## 6738   6738      independence     surprise
## 6739   6739      independence        trust
## 6740   6740    indestructible     positive
## 6741   6741    indestructible        trust
## 6742   6742     indeterminate     negative
## 6743   6743            indict        anger
## 6744   6744            indict         fear
## 6745   6745            indict     negative
## 6746   6746        indictment         fear
## 6747   6747        indictment     negative
## 6748   6748      indifference        anger
## 6749   6749      indifference      disgust
## 6750   6750      indifference         fear
## 6751   6751      indifference     negative
## 6752   6752      indifference      sadness
## 6753   6753          indigent     negative
## 6754   6754          indigent      sadness
## 6755   6755         indignant        anger
## 6756   6756         indignant     negative
## 6757   6757       indignation        anger
## 6758   6758       indignation      disgust
## 6759   6759       indignation     negative
## 6760   6760        indistinct     negative
## 6761   6761     individuality     positive
## 6762   6762       indivisible        trust
## 6763   6763    indoctrination        anger
## 6764   6764    indoctrination         fear
## 6765   6765    indoctrination     negative
## 6766   6766          indolent     negative
## 6767   6767       indomitable         fear
## 6768   6768       indomitable     positive
## 6769   6769         ineffable     positive
## 6770   6770       ineffective     negative
## 6771   6771       ineffectual      disgust
## 6772   6772       ineffectual     negative
## 6773   6773      inefficiency      disgust
## 6774   6774      inefficiency     negative
## 6775   6775      inefficiency      sadness
## 6776   6776       inefficient     negative
## 6777   6777       inefficient      sadness
## 6778   6778             inept        anger
## 6779   6779             inept      disgust
## 6780   6780             inept     negative
## 6781   6781        ineptitude      disgust
## 6782   6782        ineptitude         fear
## 6783   6783        ineptitude     negative
## 6784   6784        ineptitude      sadness
## 6785   6785        inequality        anger
## 6786   6786        inequality         fear
## 6787   6787        inequality     negative
## 6788   6788        inequality      sadness
## 6789   6789       inequitable     negative
## 6790   6790             inert     negative
## 6791   6791       inexcusable        anger
## 6792   6792       inexcusable      disgust
## 6793   6793       inexcusable     negative
## 6794   6794       inexcusable      sadness
## 6795   6795       inexpensive     positive
## 6796   6796      inexperience     negative
## 6797   6797     inexperienced     negative
## 6798   6798      inexplicable     negative
## 6799   6799      inexplicable     surprise
## 6800   6800     infallibility        trust
## 6801   6801        infallible     positive
## 6802   6802          infamous        anger
## 6803   6803          infamous      disgust
## 6804   6804          infamous         fear
## 6805   6805          infamous     negative
## 6806   6806            infamy     negative
## 6807   6807            infamy      sadness
## 6808   6808            infant anticipation
## 6809   6809            infant         fear
## 6810   6810            infant          joy
## 6811   6811            infant     positive
## 6812   6812            infant     surprise
## 6813   6813       infanticide        anger
## 6814   6814       infanticide anticipation
## 6815   6815       infanticide      disgust
## 6816   6816       infanticide         fear
## 6817   6817       infanticide     negative
## 6818   6818       infanticide      sadness
## 6819   6819         infantile        anger
## 6820   6820         infantile      disgust
## 6821   6821         infantile     negative
## 6822   6822           infarct         fear
## 6823   6823           infarct     negative
## 6824   6824           infarct     surprise
## 6825   6825            infect      disgust
## 6826   6826            infect     negative
## 6827   6827         infection         fear
## 6828   6828         infection     negative
## 6829   6829        infectious      disgust
## 6830   6830        infectious         fear
## 6831   6831        infectious     negative
## 6832   6832        infectious      sadness
## 6833   6833          inferior     negative
## 6834   6834          inferior      sadness
## 6835   6835       inferiority     negative
## 6836   6836           inferno        anger
## 6837   6837           inferno         fear
## 6838   6838           inferno     negative
## 6839   6839       infertility     negative
## 6840   6840       infertility      sadness
## 6841   6841       infestation      disgust
## 6842   6842       infestation         fear
## 6843   6843       infestation     negative
## 6844   6844           infidel        anger
## 6845   6845           infidel      disgust
## 6846   6846           infidel         fear
## 6847   6847           infidel     negative
## 6848   6848        infidelity        anger
## 6849   6849        infidelity      disgust
## 6850   6850        infidelity         fear
## 6851   6851        infidelity     negative
## 6852   6852        infidelity      sadness
## 6853   6853      infiltration     negative
## 6854   6854      infiltration     positive
## 6855   6855          infinite     positive
## 6856   6856          infinity anticipation
## 6857   6857          infinity          joy
## 6858   6858          infinity     positive
## 6859   6859          infinity        trust
## 6860   6860            infirm     negative
## 6861   6861         infirmity         fear
## 6862   6862         infirmity     negative
## 6863   6863      inflammation     negative
## 6864   6864          inflated     negative
## 6865   6865         inflation         fear
## 6866   6866         inflation     negative
## 6867   6867           inflict        anger
## 6868   6868           inflict         fear
## 6869   6869           inflict     negative
## 6870   6870           inflict      sadness
## 6871   6871        infliction         fear
## 6872   6872        infliction     negative
## 6873   6873        infliction      sadness
## 6874   6874         influence     negative
## 6875   6875         influence     positive
## 6876   6876       influential     positive
## 6877   6877       influential        trust
## 6878   6878         influenza     negative
## 6879   6879            inform        trust
## 6880   6880       information     positive
## 6881   6881          informer     negative
## 6882   6882        infraction        anger
## 6883   6883        infraction     negative
## 6884   6884        infrequent     surprise
## 6885   6885      infrequently     negative
## 6886   6886      infringement     negative
## 6887   6887         ingenious     positive
## 6888   6888       inheritance anticipation
## 6889   6889       inheritance          joy
## 6890   6890       inheritance     positive
## 6891   6891       inheritance     surprise
## 6892   6892       inheritance        trust
## 6893   6893           inhibit        anger
## 6894   6894           inhibit      disgust
## 6895   6895           inhibit     negative
## 6896   6896           inhibit      sadness
## 6897   6897      inhospitable     negative
## 6898   6898      inhospitable      sadness
## 6899   6899           inhuman        anger
## 6900   6900           inhuman      disgust
## 6901   6901           inhuman         fear
## 6902   6902           inhuman     negative
## 6903   6903           inhuman      sadness
## 6904   6904        inhumanity     negative
## 6905   6905        inhumanity      sadness
## 6906   6906          inimical        anger
## 6907   6907          inimical     negative
## 6908   6908          inimical      sadness
## 6909   6909        inimitable     positive
## 6910   6910        inimitable        trust
## 6911   6911          iniquity      disgust
## 6912   6912          iniquity     negative
## 6913   6913         injection         fear
## 6914   6914        injunction     negative
## 6915   6915            injure        anger
## 6916   6916            injure         fear
## 6917   6917            injure     negative
## 6918   6918            injure      sadness
## 6919   6919           injured         fear
## 6920   6920           injured     negative
## 6921   6921           injured      sadness
## 6922   6922         injurious        anger
## 6923   6923         injurious         fear
## 6924   6924         injurious     negative
## 6925   6925         injurious      sadness
## 6926   6926            injury        anger
## 6927   6927            injury         fear
## 6928   6928            injury     negative
## 6929   6929            injury      sadness
## 6930   6930         injustice        anger
## 6931   6931         injustice     negative
## 6932   6932            inmate      disgust
## 6933   6933            inmate         fear
## 6934   6934            inmate     negative
## 6935   6935         innocence     positive
## 6936   6936          innocent     positive
## 6937   6937          innocent        trust
## 6938   6938        innocently     positive
## 6939   6939         innocuous     positive
## 6940   6940          innovate     positive
## 6941   6941        innovation     positive
## 6942   6942       inoculation anticipation
## 6943   6943       inoculation        trust
## 6944   6944       inoperative        anger
## 6945   6945       inoperative     negative
## 6946   6946          inquirer     positive
## 6947   6947           inquiry anticipation
## 6948   6948           inquiry     positive
## 6949   6949       inquisitive     positive
## 6950   6950            insane        anger
## 6951   6951            insane         fear
## 6952   6952            insane     negative
## 6953   6953          insanity        anger
## 6954   6954          insanity      disgust
## 6955   6955          insanity         fear
## 6956   6956          insanity     negative
## 6957   6957          insanity      sadness
## 6958   6958          insecure        anger
## 6959   6959          insecure         fear
## 6960   6960          insecure     negative
## 6961   6961          insecure      sadness
## 6962   6962        insecurity         fear
## 6963   6963        insecurity     negative
## 6964   6964       inseparable          joy
## 6965   6965       inseparable     positive
## 6966   6966       inseparable        trust
## 6967   6967         insidious        anger
## 6968   6968         insidious      disgust
## 6969   6969         insidious         fear
## 6970   6970         insidious     negative
## 6971   6971          insignia     positive
## 6972   6972    insignificance     negative
## 6973   6973     insignificant        anger
## 6974   6974     insignificant     negative
## 6975   6975     insignificant      sadness
## 6976   6976           insipid     negative
## 6977   6977          insolent     negative
## 6978   6978        insolvency         fear
## 6979   6979        insolvency     negative
## 6980   6980        insolvency      sadness
## 6981   6981        insolvency     surprise
## 6982   6982         insolvent         fear
## 6983   6983         insolvent     negative
## 6984   6984         insolvent      sadness
## 6985   6985         insolvent        trust
## 6986   6986         inspector     positive
## 6987   6987       inspiration anticipation
## 6988   6988       inspiration          joy
## 6989   6989       inspiration     positive
## 6990   6990           inspire anticipation
## 6991   6991           inspire          joy
## 6992   6992           inspire     positive
## 6993   6993           inspire        trust
## 6994   6994          inspired          joy
## 6995   6995          inspired     positive
## 6996   6996          inspired     surprise
## 6997   6997          inspired        trust
## 6998   6998       instability      disgust
## 6999   6999       instability         fear
## 7000   7000       instability     negative
## 7001   7001           install anticipation
## 7002   7002         instigate     negative
## 7003   7003       instigation     negative
## 7004   7004       instinctive        anger
## 7005   7005       instinctive      disgust
## 7006   7006       instinctive         fear
## 7007   7007       instinctive     positive
## 7008   7008         institute        trust
## 7009   7009          instruct     positive
## 7010   7010          instruct        trust
## 7011   7011       instruction     positive
## 7012   7012       instruction        trust
## 7013   7013      instructions anticipation
## 7014   7014      instructions        trust
## 7015   7015        instructor anticipation
## 7016   7016        instructor     positive
## 7017   7017        instructor        trust
## 7018   7018      instrumental     positive
## 7019   7019     insufficiency        anger
## 7020   7020     insufficiency     negative
## 7021   7021      insufficient     negative
## 7022   7022    insufficiently     negative
## 7023   7023        insulation        trust
## 7024   7024            insult        anger
## 7025   7025            insult      disgust
## 7026   7026            insult     negative
## 7027   7027            insult      sadness
## 7028   7028            insult     surprise
## 7029   7029         insulting        anger
## 7030   7030         insulting      disgust
## 7031   7031         insulting         fear
## 7032   7032         insulting     negative
## 7033   7033         insulting      sadness
## 7034   7034            insure     positive
## 7035   7035            insure        trust
## 7036   7036         insurgent     negative
## 7037   7037    insurmountable         fear
## 7038   7038    insurmountable     negative
## 7039   7039    insurmountable      sadness
## 7040   7040      insurrection        anger
## 7041   7041      insurrection     negative
## 7042   7042            intact     positive
## 7043   7043            intact        trust
## 7044   7044         integrity     positive
## 7045   7045         integrity        trust
## 7046   7046         intellect     positive
## 7047   7047      intellectual     positive
## 7048   7048      intelligence         fear
## 7049   7049      intelligence          joy
## 7050   7050      intelligence     positive
## 7051   7051      intelligence        trust
## 7052   7052       intelligent     positive
## 7053   7053       intelligent        trust
## 7054   7054            intend        trust
## 7055   7055          intended anticipation
## 7056   7056          intended     positive
## 7057   7057           intense        anger
## 7058   7058           intense      disgust
## 7059   7059           intense         fear
## 7060   7060           intense          joy
## 7061   7061           intense     negative
## 7062   7062           intense     positive
## 7063   7063           intense     surprise
## 7064   7064           intense        trust
## 7065   7065             inter     negative
## 7066   7066             inter      sadness
## 7067   7067         intercede         fear
## 7068   7068         intercede      sadness
## 7069   7069      intercession        trust
## 7070   7070       intercourse     positive
## 7071   7071      interdiction     negative
## 7072   7072          interest     positive
## 7073   7073        interested      disgust
## 7074   7074        interested     positive
## 7075   7075        interested      sadness
## 7076   7076       interesting     positive
## 7077   7077      interference     negative
## 7078   7078           interim anticipation
## 7079   7079          interior      disgust
## 7080   7080          interior     positive
## 7081   7081          interior        trust
## 7082   7082     interlocutory     positive
## 7083   7083         interlude     positive
## 7084   7084         interment     negative
## 7085   7085         interment      sadness
## 7086   7086      interminable        anger
## 7087   7087      interminable anticipation
## 7088   7088      interminable     negative
## 7089   7089      interminable     positive
## 7090   7090      intermission anticipation
## 7091   7091       interrogate         fear
## 7092   7092     interrogation         fear
## 7093   7093         interrupt        anger
## 7094   7094         interrupt     negative
## 7095   7095         interrupt     surprise
## 7096   7096       interrupted     negative
## 7097   7097       interrupted      sadness
## 7098   7098      intervention     negative
## 7099   7099      intervention     positive
## 7100   7100      intervention      sadness
## 7101   7101       interviewer         fear
## 7102   7102         intestate     negative
## 7103   7103        intestinal      disgust
## 7104   7104          intimate anticipation
## 7105   7105          intimate          joy
## 7106   7106          intimate     positive
## 7107   7107          intimate        trust
## 7108   7108        intimately anticipation
## 7109   7109        intimately         fear
## 7110   7110        intimately          joy
## 7111   7111        intimidate         fear
## 7112   7112        intimidate     negative
## 7113   7113      intimidation        anger
## 7114   7114      intimidation         fear
## 7115   7115      intimidation     negative
## 7116   7116       intolerable        anger
## 7117   7117       intolerable     negative
## 7118   7118       intolerance        anger
## 7119   7119       intolerance      disgust
## 7120   7120       intolerance         fear
## 7121   7121       intolerance     negative
## 7122   7122        intolerant        anger
## 7123   7123        intolerant      disgust
## 7124   7124        intolerant         fear
## 7125   7125        intolerant     negative
## 7126   7126        intolerant      sadness
## 7127   7127        intonation     positive
## 7128   7128       intoxicated      disgust
## 7129   7129       intoxicated     negative
## 7130   7130       intractable        anger
## 7131   7131       intractable     negative
## 7132   7132          intrepid     positive
## 7133   7133          intrigue anticipation
## 7134   7134          intrigue         fear
## 7135   7135          intrigue     negative
## 7136   7136          intrigue     surprise
## 7137   7137          intruder        anger
## 7138   7138          intruder         fear
## 7139   7139          intruder     negative
## 7140   7140          intruder     surprise
## 7141   7141         intrusion         fear
## 7142   7142         intrusion     negative
## 7143   7143         intrusive        anger
## 7144   7144         intrusive      disgust
## 7145   7145         intrusive         fear
## 7146   7146         intrusive     negative
## 7147   7147         intrusive     surprise
## 7148   7148         intuition     positive
## 7149   7149         intuition        trust
## 7150   7150         intuitive     positive
## 7151   7151       intuitively anticipation
## 7152   7152            invade        anger
## 7153   7153            invade         fear
## 7154   7154            invade     negative
## 7155   7155            invade      sadness
## 7156   7156            invade     surprise
## 7157   7157           invader        anger
## 7158   7158           invader         fear
## 7159   7159           invader     negative
## 7160   7160           invader      sadness
## 7161   7161           invalid      sadness
## 7162   7162        invalidate     negative
## 7163   7163      invalidation     negative
## 7164   7164        invalidity     negative
## 7165   7165        invariably     positive
## 7166   7166          invasion        anger
## 7167   7167          invasion     negative
## 7168   7168         inventive     positive
## 7169   7169          inventor     positive
## 7170   7170       investigate     positive
## 7171   7171     investigation anticipation
## 7172   7172        invigorate     positive
## 7173   7173        invitation anticipation
## 7174   7174        invitation     positive
## 7175   7175            invite anticipation
## 7176   7176            invite          joy
## 7177   7177            invite     positive
## 7178   7178            invite     surprise
## 7179   7179            invite        trust
## 7180   7180          inviting anticipation
## 7181   7181          inviting          joy
## 7182   7182          inviting     positive
## 7183   7183          inviting     surprise
## 7184   7184          inviting        trust
## 7185   7185        invocation anticipation
## 7186   7186        invocation        trust
## 7187   7187            invoke anticipation
## 7188   7188       involuntary     negative
## 7189   7189        involution        anger
## 7190   7190        involution     negative
## 7191   7191       involvement        anger
## 7192   7192             irate        anger
## 7193   7193             irate     negative
## 7194   7194               ire        anger
## 7195   7195               ire     negative
## 7196   7196              iris         fear
## 7197   7197              iron     positive
## 7198   7198              iron        trust
## 7199   7199             irons     negative
## 7200   7200        irrational      disgust
## 7201   7201        irrational         fear
## 7202   7202        irrational     negative
## 7203   7203     irrationality     negative
## 7204   7204    irreconcilable        anger
## 7205   7205    irreconcilable         fear
## 7206   7206    irreconcilable     negative
## 7207   7207    irreconcilable      sadness
## 7208   7208       irreducible     positive
## 7209   7209       irrefutable     positive
## 7210   7210       irrefutable        trust
## 7211   7211         irregular     negative
## 7212   7212      irregularity     negative
## 7213   7213        irrelevant     negative
## 7214   7214       irreparable         fear
## 7215   7215       irreparable     negative
## 7216   7216       irreparable      sadness
## 7217   7217     irresponsible     negative
## 7218   7218        irreverent     negative
## 7219   7219       irrevocable     negative
## 7220   7220      irritability        anger
## 7221   7221      irritability     negative
## 7222   7222         irritable        anger
## 7223   7223         irritable     negative
## 7224   7224        irritating        anger
## 7225   7225        irritating      disgust
## 7226   7226        irritating     negative
## 7227   7227        irritation        anger
## 7228   7228        irritation      disgust
## 7229   7229        irritation     negative
## 7230   7230        irritation      sadness
## 7231   7231           isolate      sadness
## 7232   7232          isolated         fear
## 7233   7233          isolated     negative
## 7234   7234          isolated      sadness
## 7235   7235         isolation     negative
## 7236   7236         isolation      sadness
## 7237   7237               jab        anger
## 7238   7238            jabber     negative
## 7239   7239           jackpot anticipation
## 7240   7240           jackpot          joy
## 7241   7241           jackpot     positive
## 7242   7242           jackpot     surprise
## 7243   7243              jail         fear
## 7244   7244              jail     negative
## 7245   7245              jail      sadness
## 7246   7246               jam     positive
## 7247   7247           janitor      disgust
## 7248   7248            jargon     negative
## 7249   7249           jarring         fear
## 7250   7250           jarring     negative
## 7251   7251           jarring      sadness
## 7252   7252          jaundice         fear
## 7253   7253          jaundice     negative
## 7254   7254              jaws         fear
## 7255   7255           jealous        anger
## 7256   7256           jealous      disgust
## 7257   7257           jealous     negative
## 7258   7258          jealousy        anger
## 7259   7259          jealousy      disgust
## 7260   7260          jealousy         fear
## 7261   7261          jealousy     negative
## 7262   7262          jealousy      sadness
## 7263   7263        jeopardize        anger
## 7264   7264        jeopardize         fear
## 7265   7265        jeopardize     negative
## 7266   7266          jeopardy anticipation
## 7267   7267          jeopardy         fear
## 7268   7268          jeopardy     negative
## 7269   7269              jerk        anger
## 7270   7270              jerk     surprise
## 7271   7271              jest          joy
## 7272   7272              jest     positive
## 7273   7273              jest     surprise
## 7274   7274               job     positive
## 7275   7275              john      disgust
## 7276   7276              john     negative
## 7277   7277              join     positive
## 7278   7278            joined     positive
## 7279   7279              joke     negative
## 7280   7280             joker          joy
## 7281   7281             joker     positive
## 7282   7282             joker     surprise
## 7283   7283            joking     positive
## 7284   7284              jolt     surprise
## 7285   7285           jornada     negative
## 7286   7286        journalism        trust
## 7287   7287        journalist     positive
## 7288   7288           journey anticipation
## 7289   7289           journey         fear
## 7290   7290           journey          joy
## 7291   7291           journey     positive
## 7292   7292        journeyman        trust
## 7293   7293            jovial          joy
## 7294   7294            jovial     positive
## 7295   7295               joy          joy
## 7296   7296               joy     positive
## 7297   7297            joyful          joy
## 7298   7298            joyful     positive
## 7299   7299            joyful        trust
## 7300   7300            joyous          joy
## 7301   7301            joyous     positive
## 7302   7302          jubilant          joy
## 7303   7303          jubilant     positive
## 7304   7304          jubilant     surprise
## 7305   7305          jubilant        trust
## 7306   7306           jubilee          joy
## 7307   7307           jubilee     positive
## 7308   7308           jubilee     surprise
## 7309   7309          judgment     surprise
## 7310   7310          judicial anticipation
## 7311   7311          judicial     positive
## 7312   7312          judicial        trust
## 7313   7313         judiciary anticipation
## 7314   7314         judiciary        trust
## 7315   7315         judicious     positive
## 7316   7316         judicious        trust
## 7317   7317            jumble     negative
## 7318   7318              jump          joy
## 7319   7319              jump     positive
## 7320   7320            jungle         fear
## 7321   7321              junk     negative
## 7322   7322             junta     negative
## 7323   7323     jurisprudence      sadness
## 7324   7324            jurist        trust
## 7325   7325              jury        trust
## 7326   7326           justice     positive
## 7327   7327           justice        trust
## 7328   7328       justifiable     positive
## 7329   7329       justifiable        trust
## 7330   7330     justification     positive
## 7331   7331          juvenile     negative
## 7332   7332          keepsake     positive
## 7333   7333               ken     positive
## 7334   7334            kennel      sadness
## 7335   7335              kern     negative
## 7336   7336          kerosene         fear
## 7337   7337           keynote     positive
## 7338   7338          keystone     positive
## 7339   7339              khan         fear
## 7340   7340              khan        trust
## 7341   7341              kick        anger
## 7342   7342              kick     negative
## 7343   7343           kicking        anger
## 7344   7344            kidnap        anger
## 7345   7345            kidnap         fear
## 7346   7346            kidnap     negative
## 7347   7347            kidnap      sadness
## 7348   7348            kidnap     surprise
## 7349   7349              kill         fear
## 7350   7350              kill     negative
## 7351   7351              kill      sadness
## 7352   7352           killing        anger
## 7353   7353           killing         fear
## 7354   7354           killing     negative
## 7355   7355           killing      sadness
## 7356   7356              kind          joy
## 7357   7357              kind     positive
## 7358   7358              kind        trust
## 7359   7359          kindness     positive
## 7360   7360           kindred anticipation
## 7361   7361           kindred          joy
## 7362   7362           kindred     positive
## 7363   7363           kindred        trust
## 7364   7364              king     positive
## 7365   7365              kiss anticipation
## 7366   7366              kiss          joy
## 7367   7367              kiss     positive
## 7368   7368              kiss     surprise
## 7369   7369              kite      disgust
## 7370   7370              kite     negative
## 7371   7371            kitten          joy
## 7372   7372            kitten     positive
## 7373   7373            kitten        trust
## 7374   7374             knack     positive
## 7375   7375             knell         fear
## 7376   7376             knell     negative
## 7377   7377             knell      sadness
## 7378   7378          knickers        trust
## 7379   7379            knight     positive
## 7380   7380           knotted     negative
## 7381   7381           knowing     positive
## 7382   7382         knowledge     positive
## 7383   7383             kudos          joy
## 7384   7384             kudos     positive
## 7385   7385             label        trust
## 7386   7386             labor anticipation
## 7387   7387             labor          joy
## 7388   7388             labor     positive
## 7389   7389             labor     surprise
## 7390   7390             labor        trust
## 7391   7391           labored     negative
## 7392   7392           labored      sadness
## 7393   7393         laborious     negative
## 7394   7394         labyrinth anticipation
## 7395   7395         labyrinth     negative
## 7396   7396              lace        anger
## 7397   7397              lace         fear
## 7398   7398              lace     negative
## 7399   7399              lace     positive
## 7400   7400              lace      sadness
## 7401   7401              lace        trust
## 7402   7402              lack     negative
## 7403   7403           lacking     negative
## 7404   7404        lackluster     negative
## 7405   7405             laden     negative
## 7406   7406               lag     negative
## 7407   7407           lagging        anger
## 7408   7408           lagging anticipation
## 7409   7409           lagging      disgust
## 7410   7410           lagging     negative
## 7411   7411           lagging      sadness
## 7412   7412              lair     negative
## 7413   7413              lamb          joy
## 7414   7414              lamb     positive
## 7415   7415              lamb        trust
## 7416   7416            lament      disgust
## 7417   7417            lament         fear
## 7418   7418            lament     negative
## 7419   7419            lament      sadness
## 7420   7420         lamenting      sadness
## 7421   7421              land     positive
## 7422   7422            landed     positive
## 7423   7423          landmark        trust
## 7424   7424         landslide         fear
## 7425   7425         landslide     negative
## 7426   7426         landslide      sadness
## 7427   7427           languid     negative
## 7428   7428          languish     negative
## 7429   7429       languishing         fear
## 7430   7430       languishing     negative
## 7431   7431       languishing      sadness
## 7432   7432             lapse     negative
## 7433   7433           larceny      disgust
## 7434   7434           larceny     negative
## 7435   7435            larger      disgust
## 7436   7436            larger     surprise
## 7437   7437            larger        trust
## 7438   7438             laser     positive
## 7439   7439             laser        trust
## 7440   7440              lash        anger
## 7441   7441              lash         fear
## 7442   7442              lash     negative
## 7443   7443              late     negative
## 7444   7444              late      sadness
## 7445   7445          lateness     negative
## 7446   7446            latent        anger
## 7447   7447            latent anticipation
## 7448   7448            latent      disgust
## 7449   7449            latent     negative
## 7450   7450            latent     surprise
## 7451   7451          latrines      disgust
## 7452   7452          latrines     negative
## 7453   7453          laudable     positive
## 7454   7454             laugh          joy
## 7455   7455             laugh     positive
## 7456   7456             laugh     surprise
## 7457   7457         laughable      disgust
## 7458   7458         laughable     negative
## 7459   7459          laughing          joy
## 7460   7460          laughing     positive
## 7461   7461          laughter anticipation
## 7462   7462          laughter          joy
## 7463   7463          laughter     positive
## 7464   7464          laughter     surprise
## 7465   7465            launch anticipation
## 7466   7466            launch     positive
## 7467   7467          laureate     positive
## 7468   7468          laureate        trust
## 7469   7469            laurel     positive
## 7470   7470           laurels          joy
## 7471   7471           laurels     positive
## 7472   7472              lava        anger
## 7473   7473              lava         fear
## 7474   7474              lava     negative
## 7475   7475          lavatory      disgust
## 7476   7476            lavish     positive
## 7477   7477               law        trust
## 7478   7478            lawful     positive
## 7479   7479            lawful        trust
## 7480   7480       lawlessness        anger
## 7481   7481       lawlessness         fear
## 7482   7482       lawlessness     negative
## 7483   7483           lawsuit        anger
## 7484   7484           lawsuit      disgust
## 7485   7485           lawsuit         fear
## 7486   7486           lawsuit     negative
## 7487   7487           lawsuit      sadness
## 7488   7488           lawsuit     surprise
## 7489   7489            lawyer        anger
## 7490   7490            lawyer      disgust
## 7491   7491            lawyer         fear
## 7492   7492            lawyer     negative
## 7493   7493               lax     negative
## 7494   7494               lax      sadness
## 7495   7495          laxative      disgust
## 7496   7496          laxative         fear
## 7497   7497          laxative     negative
## 7498   7498              lazy     negative
## 7499   7499              lead     positive
## 7500   7500            leader     positive
## 7501   7501            leader        trust
## 7502   7502           leading        trust
## 7503   7503            league     positive
## 7504   7504              leak     negative
## 7505   7505           leakage     negative
## 7506   7506             leaky     negative
## 7507   7507           leaning        trust
## 7508   7508             learn     positive
## 7509   7509          learning     positive
## 7510   7510             leave     negative
## 7511   7511             leave      sadness
## 7512   7512             leave     surprise
## 7513   7513          lecturer     positive
## 7514   7514             leech     negative
## 7515   7515           leeches      disgust
## 7516   7516           leeches         fear
## 7517   7517           leeches     negative
## 7518   7518              leer      disgust
## 7519   7519              leer     negative
## 7520   7520             leery     surprise
## 7521   7521            leeway     positive
## 7522   7522             legal     positive
## 7523   7523             legal        trust
## 7524   7524         legalized        anger
## 7525   7525         legalized         fear
## 7526   7526         legalized          joy
## 7527   7527         legalized     positive
## 7528   7528         legalized        trust
## 7529   7529         legendary     positive
## 7530   7530        legibility     positive
## 7531   7531           legible     positive
## 7532   7532        legislator        trust
## 7533   7533       legislature        trust
## 7534   7534        legitimacy        trust
## 7535   7535           leisure anticipation
## 7536   7536           leisure          joy
## 7537   7537           leisure     positive
## 7538   7538           leisure     surprise
## 7539   7539           leisure        trust
## 7540   7540         leisurely     positive
## 7541   7541             lemma     positive
## 7542   7542             lemon      disgust
## 7543   7543             lemon     negative
## 7544   7544            lender        trust
## 7545   7545           lenient     positive
## 7546   7546           leprosy      disgust
## 7547   7547           leprosy         fear
## 7548   7548           leprosy     negative
## 7549   7549           leprosy      sadness
## 7550   7550            lessen anticipation
## 7551   7551            lessen     negative
## 7552   7552            lesser      disgust
## 7553   7553            lesser     negative
## 7554   7554            lesson anticipation
## 7555   7555            lesson     positive
## 7556   7556            lesson        trust
## 7557   7557            lethal      disgust
## 7558   7558            lethal         fear
## 7559   7559            lethal     negative
## 7560   7560            lethal      sadness
## 7561   7561          lethargy     negative
## 7562   7562          lethargy      sadness
## 7563   7563            letter anticipation
## 7564   7564          lettered anticipation
## 7565   7565          lettered     positive
## 7566   7566          lettered        trust
## 7567   7567          leukemia        anger
## 7568   7568          leukemia         fear
## 7569   7569          leukemia     negative
## 7570   7570          leukemia      sadness
## 7571   7571             levee        trust
## 7572   7572             level     positive
## 7573   7573             level        trust
## 7574   7574          leverage     positive
## 7575   7575              levy     negative
## 7576   7576              lewd      disgust
## 7577   7577              lewd     negative
## 7578   7578           liaison     negative
## 7579   7579              liar      disgust
## 7580   7580              liar     negative
## 7581   7581             libel        anger
## 7582   7582             libel         fear
## 7583   7583             libel     negative
## 7584   7584             libel        trust
## 7585   7585           liberal     negative
## 7586   7586           liberal     positive
## 7587   7587          liberate        anger
## 7588   7588          liberate anticipation
## 7589   7589          liberate          joy
## 7590   7590          liberate     positive
## 7591   7591          liberate     surprise
## 7592   7592          liberate        trust
## 7593   7593        liberation anticipation
## 7594   7594        liberation          joy
## 7595   7595        liberation     positive
## 7596   7596        liberation     surprise
## 7597   7597           liberty anticipation
## 7598   7598           liberty          joy
## 7599   7599           liberty     positive
## 7600   7600           liberty     surprise
## 7601   7601           liberty        trust
## 7602   7602           library     positive
## 7603   7603              lick      disgust
## 7604   7604              lick     negative
## 7605   7605               lie        anger
## 7606   7606               lie      disgust
## 7607   7607               lie     negative
## 7608   7608               lie      sadness
## 7609   7609        lieutenant        trust
## 7610   7610         lifeblood     positive
## 7611   7611          lifeless         fear
## 7612   7612          lifeless     negative
## 7613   7613          lifeless      sadness
## 7614   7614        lighthouse     positive
## 7615   7615         lightning        anger
## 7616   7616         lightning         fear
## 7617   7617         lightning     surprise
## 7618   7618            liking          joy
## 7619   7619            liking     positive
## 7620   7620            liking        trust
## 7621   7621           limited        anger
## 7622   7622           limited     negative
## 7623   7623           limited      sadness
## 7624   7624              limp     negative
## 7625   7625             lines         fear
## 7626   7626            linger anticipation
## 7627   7627          linguist     positive
## 7628   7628          linguist        trust
## 7629   7629              lint     negative
## 7630   7630              lion         fear
## 7631   7631              lion     positive
## 7632   7632            liquor        anger
## 7633   7633            liquor          joy
## 7634   7634            liquor     negative
## 7635   7635            liquor      sadness
## 7636   7636          listless     negative
## 7637   7637          listless      sadness
## 7638   7638             lithe     positive
## 7639   7639          litigant     negative
## 7640   7640          litigate        anger
## 7641   7641          litigate anticipation
## 7642   7642          litigate      disgust
## 7643   7643          litigate         fear
## 7644   7644          litigate     negative
## 7645   7645          litigate      sadness
## 7646   7646        litigation     negative
## 7647   7647         litigious        anger
## 7648   7648         litigious      disgust
## 7649   7649         litigious     negative
## 7650   7650            litter     negative
## 7651   7651             livid        anger
## 7652   7652             livid      disgust
## 7653   7653             livid     negative
## 7654   7654              loaf     negative
## 7655   7655            loafer     negative
## 7656   7656             loath        anger
## 7657   7657             loath     negative
## 7658   7658            loathe        anger
## 7659   7659            loathe      disgust
## 7660   7660            loathe     negative
## 7661   7661          loathing      disgust
## 7662   7662          loathing     negative
## 7663   7663         loathsome        anger
## 7664   7664         loathsome      disgust
## 7665   7665         loathsome     negative
## 7666   7666          lobbyist     negative
## 7667   7667          localize anticipation
## 7668   7668            lockup         fear
## 7669   7669            lockup     negative
## 7670   7670            lockup      sadness
## 7671   7671            locust         fear
## 7672   7672            locust     negative
## 7673   7673           lodging        trust
## 7674   7674             lofty     negative
## 7675   7675           logical     positive
## 7676   7676              lone      sadness
## 7677   7677        loneliness         fear
## 7678   7678        loneliness     negative
## 7679   7679        loneliness      sadness
## 7680   7680            lonely        anger
## 7681   7681            lonely      disgust
## 7682   7682            lonely         fear
## 7683   7683            lonely     negative
## 7684   7684            lonely      sadness
## 7685   7685          lonesome     negative
## 7686   7686          lonesome      sadness
## 7687   7687              long anticipation
## 7688   7688         longevity     positive
## 7689   7689           longing anticipation
## 7690   7690           longing      sadness
## 7691   7691               loo      disgust
## 7692   7692               loo     negative
## 7693   7693              loom anticipation
## 7694   7694              loom         fear
## 7695   7695              loom     negative
## 7696   7696              loon      disgust
## 7697   7697              loon     negative
## 7698   7698             loony     negative
## 7699   7699              loot     negative
## 7700   7700              lord      disgust
## 7701   7701              lord     negative
## 7702   7702              lord     positive
## 7703   7703              lord        trust
## 7704   7704          lordship     positive
## 7705   7705              lose        anger
## 7706   7706              lose      disgust
## 7707   7707              lose         fear
## 7708   7708              lose     negative
## 7709   7709              lose      sadness
## 7710   7710              lose     surprise
## 7711   7711            losing        anger
## 7712   7712            losing     negative
## 7713   7713            losing      sadness
## 7714   7714              loss        anger
## 7715   7715              loss         fear
## 7716   7716              loss     negative
## 7717   7717              loss      sadness
## 7718   7718              lost     negative
## 7719   7719              lost      sadness
## 7720   7720           lottery anticipation
## 7721   7721          loudness        anger
## 7722   7722          loudness     negative
## 7723   7723            lounge     negative
## 7724   7724             louse      disgust
## 7725   7725             louse     negative
## 7726   7726           lovable          joy
## 7727   7727           lovable     positive
## 7728   7728           lovable        trust
## 7729   7729              love          joy
## 7730   7730              love     positive
## 7731   7731            lovely anticipation
## 7732   7732            lovely          joy
## 7733   7733            lovely     positive
## 7734   7734            lovely      sadness
## 7735   7735            lovely     surprise
## 7736   7736            lovely        trust
## 7737   7737        lovemaking          joy
## 7738   7738        lovemaking     positive
## 7739   7739        lovemaking        trust
## 7740   7740             lover anticipation
## 7741   7741             lover          joy
## 7742   7742             lover     positive
## 7743   7743             lover        trust
## 7744   7744            loving          joy
## 7745   7745            loving     positive
## 7746   7746            loving        trust
## 7747   7747             lower     negative
## 7748   7748             lower      sadness
## 7749   7749          lowering     negative
## 7750   7750            lowest     negative
## 7751   7751            lowest      sadness
## 7752   7752          lowlands     negative
## 7753   7753             lowly     negative
## 7754   7754             lowly      sadness
## 7755   7755             loyal         fear
## 7756   7756             loyal          joy
## 7757   7757             loyal     positive
## 7758   7758             loyal     surprise
## 7759   7759             loyal        trust
## 7760   7760           loyalty     positive
## 7761   7761           loyalty        trust
## 7762   7762              luck anticipation
## 7763   7763              luck          joy
## 7764   7764              luck     positive
## 7765   7765              luck     surprise
## 7766   7766             lucky          joy
## 7767   7767             lucky     positive
## 7768   7768             lucky     surprise
## 7769   7769         ludicrous     negative
## 7770   7770              lull anticipation
## 7771   7771         lumbering     negative
## 7772   7772              lump     negative
## 7773   7773             lumpy      disgust
## 7774   7774             lumpy     negative
## 7775   7775            lunacy        anger
## 7776   7776            lunacy      disgust
## 7777   7777            lunacy         fear
## 7778   7778            lunacy     negative
## 7779   7779            lunacy      sadness
## 7780   7780           lunatic        anger
## 7781   7781           lunatic      disgust
## 7782   7782           lunatic         fear
## 7783   7783           lunatic     negative
## 7784   7784             lunge     surprise
## 7785   7785             lurch     negative
## 7786   7786              lure     negative
## 7787   7787             lurid      disgust
## 7788   7788             lurid     negative
## 7789   7789              lurk     negative
## 7790   7790           lurking     negative
## 7791   7791          luscious anticipation
## 7792   7792          luscious          joy
## 7793   7793          luscious     positive
## 7794   7794              lush      disgust
## 7795   7795              lush     negative
## 7796   7796              lush      sadness
## 7797   7797              lust anticipation
## 7798   7798              lust     negative
## 7799   7799            luster          joy
## 7800   7800            luster     positive
## 7801   7801           lustful     negative
## 7802   7802          lustrous     positive
## 7803   7803             lusty      disgust
## 7804   7804         luxuriant     positive
## 7805   7805         luxurious          joy
## 7806   7806         luxurious     positive
## 7807   7807            luxury          joy
## 7808   7808            luxury     positive
## 7809   7809             lying        anger
## 7810   7810             lying      disgust
## 7811   7811             lying     negative
## 7812   7812             lynch        anger
## 7813   7813             lynch      disgust
## 7814   7814             lynch         fear
## 7815   7815             lynch     negative
## 7816   7816             lynch      sadness
## 7817   7817              lyre          joy
## 7818   7818              lyre     positive
## 7819   7819           lyrical          joy
## 7820   7820           lyrical     positive
## 7821   7821              mace         fear
## 7822   7822              mace     negative
## 7823   7823           machine        trust
## 7824   7824               mad        anger
## 7825   7825               mad      disgust
## 7826   7826               mad         fear
## 7827   7827               mad     negative
## 7828   7828               mad      sadness
## 7829   7829            madden        anger
## 7830   7830            madden         fear
## 7831   7831            madden     negative
## 7832   7832            madman        anger
## 7833   7833            madman         fear
## 7834   7834            madman     negative
## 7835   7835           madness        anger
## 7836   7836           madness         fear
## 7837   7837           madness     negative
## 7838   7838             mafia         fear
## 7839   7839             mafia     negative
## 7840   7840              mage         fear
## 7841   7841            maggot      disgust
## 7842   7842            maggot     negative
## 7843   7843           magical anticipation
## 7844   7844           magical          joy
## 7845   7845           magical     positive
## 7846   7846           magical     surprise
## 7847   7847          magician     surprise
## 7848   7848            magnet     positive
## 7849   7849            magnet        trust
## 7850   7850         magnetism     positive
## 7851   7851         magnetite     positive
## 7852   7852      magnificence anticipation
## 7853   7853      magnificence          joy
## 7854   7854      magnificence     positive
## 7855   7855      magnificence        trust
## 7856   7856       magnificent anticipation
## 7857   7857       magnificent          joy
## 7858   7858       magnificent     positive
## 7859   7859       magnificent     surprise
## 7860   7860       magnificent        trust
## 7861   7861            maiden     positive
## 7862   7862              mail anticipation
## 7863   7863              main     positive
## 7864   7864          mainstay     positive
## 7865   7865          mainstay        trust
## 7866   7866       maintenance        trust
## 7867   7867          majestic anticipation
## 7868   7868          majestic          joy
## 7869   7869          majestic     positive
## 7870   7870          majestic     surprise
## 7871   7871          majestic        trust
## 7872   7872           majesty     positive
## 7873   7873           majesty        trust
## 7874   7874             major     positive
## 7875   7875          majority          joy
## 7876   7876          majority     positive
## 7877   7877          majority        trust
## 7878   7878         makeshift     negative
## 7879   7879            malady     negative
## 7880   7880           malaise     negative
## 7881   7881           malaise      sadness
## 7882   7882           malaria      disgust
## 7883   7883           malaria         fear
## 7884   7884           malaria     negative
## 7885   7885           malaria      sadness
## 7886   7886        malevolent        anger
## 7887   7887        malevolent      disgust
## 7888   7888        malevolent         fear
## 7889   7889        malevolent     negative
## 7890   7890        malevolent      sadness
## 7891   7891       malfeasance      disgust
## 7892   7892       malfeasance     negative
## 7893   7893      malformation     negative
## 7894   7894            malice        anger
## 7895   7895            malice         fear
## 7896   7896            malice     negative
## 7897   7897         malicious        anger
## 7898   7898         malicious      disgust
## 7899   7899         malicious         fear
## 7900   7900         malicious     negative
## 7901   7901         malicious      sadness
## 7902   7902            malign        anger
## 7903   7903            malign      disgust
## 7904   7904            malign     negative
## 7905   7905        malignancy         fear
## 7906   7906        malignancy     negative
## 7907   7907        malignancy      sadness
## 7908   7908         malignant        anger
## 7909   7909         malignant         fear
## 7910   7910         malignant     negative
## 7911   7911       malpractice        anger
## 7912   7912       malpractice     negative
## 7913   7913             mamma        trust
## 7914   7914            manage     positive
## 7915   7915            manage        trust
## 7916   7916        management     positive
## 7917   7917        management        trust
## 7918   7918          mandamus         fear
## 7919   7919          mandamus     negative
## 7920   7920          mandarin     positive
## 7921   7921          mandarin        trust
## 7922   7922             mange      disgust
## 7923   7923             mange         fear
## 7924   7924             mange     negative
## 7925   7925            mangle        anger
## 7926   7926            mangle      disgust
## 7927   7927            mangle         fear
## 7928   7928            mangle     negative
## 7929   7929            mangle      sadness
## 7930   7930           manhood     positive
## 7931   7931             mania     negative
## 7932   7932            maniac        anger
## 7933   7933            maniac         fear
## 7934   7934            maniac     negative
## 7935   7935          maniacal     negative
## 7936   7936     manifestation         fear
## 7937   7937        manifested     positive
## 7938   7938        manipulate     negative
## 7939   7939      manipulation        anger
## 7940   7940      manipulation         fear
## 7941   7941      manipulation     negative
## 7942   7942             manly     positive
## 7943   7943             manna     positive
## 7944   7944          mannered     positive
## 7945   7945           manners     positive
## 7946   7946      manslaughter        anger
## 7947   7947      manslaughter      disgust
## 7948   7948      manslaughter         fear
## 7949   7949      manslaughter     negative
## 7950   7950      manslaughter      sadness
## 7951   7951      manslaughter     surprise
## 7952   7952            manual        trust
## 7953   7953      manufacturer     positive
## 7954   7954            manure      disgust
## 7955   7955            manure     negative
## 7956   7956               mar     negative
## 7957   7957             march     positive
## 7958   7958            margin     negative
## 7959   7959            margin      sadness
## 7960   7960            marine        trust
## 7961   7961            marked     positive
## 7962   7962        marketable     positive
## 7963   7963            maroon     negative
## 7964   7964           marquis     positive
## 7965   7965          marriage anticipation
## 7966   7966          marriage          joy
## 7967   7967          marriage     positive
## 7968   7968          marriage        trust
## 7969   7969            marrow          joy
## 7970   7970            marrow     positive
## 7971   7971            marrow        trust
## 7972   7972             marry anticipation
## 7973   7973             marry         fear
## 7974   7974             marry          joy
## 7975   7975             marry     positive
## 7976   7976             marry     surprise
## 7977   7977             marry        trust
## 7978   7978           marshal     positive
## 7979   7979           marshal        trust
## 7980   7980           martial        anger
## 7981   7981        martingale     negative
## 7982   7982            martyr         fear
## 7983   7983            martyr     negative
## 7984   7984            martyr      sadness
## 7985   7985         martyrdom         fear
## 7986   7986         martyrdom     negative
## 7987   7987         martyrdom      sadness
## 7988   7988            marvel     positive
## 7989   7989            marvel     surprise
## 7990   7990         marvelous          joy
## 7991   7991         marvelous     positive
## 7992   7992       marvelously          joy
## 7993   7993       marvelously     positive
## 7994   7994         masculine     positive
## 7995   7995         masochism        anger
## 7996   7996         masochism      disgust
## 7997   7997         masochism         fear
## 7998   7998         masochism     negative
## 7999   7999          massacre        anger
## 8000   8000          massacre      disgust
## 8001   8001          massacre         fear
## 8002   8002          massacre     negative
## 8003   8003          massacre      sadness
## 8004   8004           massage          joy
## 8005   8005           massage     positive
## 8006   8006            master     positive
## 8007   8007       masterpiece          joy
## 8008   8008       masterpiece     positive
## 8009   8009           mastery        anger
## 8010   8010           mastery          joy
## 8011   8011           mastery     positive
## 8012   8012           mastery        trust
## 8013   8013        matchmaker anticipation
## 8014   8014              mate     positive
## 8015   8015              mate        trust
## 8016   8016       materialism     negative
## 8017   8017       materialist      disgust
## 8018   8018       materialist     negative
## 8019   8019          maternal anticipation
## 8020   8020          maternal     negative
## 8021   8021          maternal     positive
## 8022   8022      mathematical        trust
## 8023   8023         matrimony anticipation
## 8024   8024         matrimony          joy
## 8025   8025         matrimony     positive
## 8026   8026         matrimony        trust
## 8027   8027            matron     positive
## 8028   8028            matron        trust
## 8029   8029         mausoleum      sadness
## 8030   8030             maxim        trust
## 8031   8031           maximum     positive
## 8032   8032             mayor     positive
## 8033   8033            meadow     positive
## 8034   8034        meandering     negative
## 8035   8035       meaningless     negative
## 8036   8036       meaningless      sadness
## 8037   8037           measles      disgust
## 8038   8038           measles         fear
## 8039   8039           measles     negative
## 8040   8040           measles      sadness
## 8041   8041           measure        trust
## 8042   8042          measured     positive
## 8043   8043          measured        trust
## 8044   8044             medal anticipation
## 8045   8045             medal          joy
## 8046   8046             medal     positive
## 8047   8047             medal     surprise
## 8048   8048             medal        trust
## 8049   8049            meddle        anger
## 8050   8050            meddle     negative
## 8051   8051           mediate anticipation
## 8052   8052           mediate     positive
## 8053   8053           mediate        trust
## 8054   8054         mediation     positive
## 8055   8055          mediator anticipation
## 8056   8056          mediator     positive
## 8057   8057          mediator        trust
## 8058   8058           medical anticipation
## 8059   8059           medical         fear
## 8060   8060           medical     positive
## 8061   8061           medical        trust
## 8062   8062          mediocre     negative
## 8063   8063        mediocrity     negative
## 8064   8064          meditate anticipation
## 8065   8065          meditate          joy
## 8066   8066          meditate     positive
## 8067   8067          meditate        trust
## 8068   8068     mediterranean     positive
## 8069   8069            medley     positive
## 8070   8070              meek      sadness
## 8071   8071       melancholic     negative
## 8072   8072       melancholic      sadness
## 8073   8073        melancholy     negative
## 8074   8074        melancholy      sadness
## 8075   8075             melee         fear
## 8076   8076             melee     negative
## 8077   8077         melodrama        anger
## 8078   8078         melodrama     negative
## 8079   8079         melodrama      sadness
## 8080   8080          meltdown     negative
## 8081   8081          meltdown      sadness
## 8082   8082           memento     positive
## 8083   8083         memorable          joy
## 8084   8084         memorable     positive
## 8085   8085         memorable     surprise
## 8086   8086         memorable        trust
## 8087   8087         memorials      sadness
## 8088   8088            menace        anger
## 8089   8089            menace         fear
## 8090   8090            menace     negative
## 8091   8091          menacing        anger
## 8092   8092          menacing         fear
## 8093   8093          menacing     negative
## 8094   8094           mending     positive
## 8095   8095            menial     negative
## 8096   8096            menses     positive
## 8097   8097            mentor     positive
## 8098   8098            mentor        trust
## 8099   8099         mercenary         fear
## 8100   8100         mercenary     negative
## 8101   8101          merchant        trust
## 8102   8102          merciful     positive
## 8103   8103         merciless         fear
## 8104   8104         merciless     negative
## 8105   8105             mercy     positive
## 8106   8106             merge anticipation
## 8107   8107             merge     positive
## 8108   8108             merit     positive
## 8109   8109             merit        trust
## 8110   8110       meritorious          joy
## 8111   8111       meritorious     positive
## 8112   8112       meritorious        trust
## 8113   8113         merriment          joy
## 8114   8114         merriment     positive
## 8115   8115         merriment     surprise
## 8116   8116             merry          joy
## 8117   8117             merry     positive
## 8118   8118              mess      disgust
## 8119   8119              mess     negative
## 8120   8120         messenger        trust
## 8121   8121             messy      disgust
## 8122   8122             messy     negative
## 8123   8123        metastasis     negative
## 8124   8124          methanol     negative
## 8125   8125      metropolitan     positive
## 8126   8126            mettle     positive
## 8127   8127        microscope        trust
## 8128   8128        microscopy     positive
## 8129   8129           midwife anticipation
## 8130   8130           midwife          joy
## 8131   8131           midwife     negative
## 8132   8132           midwife     positive
## 8133   8133           midwife        trust
## 8134   8134         midwifery     positive
## 8135   8135            mighty        anger
## 8136   8136            mighty         fear
## 8137   8137            mighty          joy
## 8138   8138            mighty     positive
## 8139   8139            mighty        trust
## 8140   8140            mildew      disgust
## 8141   8141            mildew     negative
## 8142   8142          military         fear
## 8143   8143           militia        anger
## 8144   8144           militia         fear
## 8145   8145           militia     negative
## 8146   8146           militia      sadness
## 8147   8147              mill anticipation
## 8148   8148              mime     positive
## 8149   8149           mimicry     negative
## 8150   8150           mimicry     surprise
## 8151   8151           mindful     positive
## 8152   8152       mindfulness     positive
## 8153   8153          minimize     negative
## 8154   8154           minimum     negative
## 8155   8155          ministry          joy
## 8156   8156          ministry     positive
## 8157   8157          ministry        trust
## 8158   8158          minority     negative
## 8159   8159           miracle anticipation
## 8160   8160           miracle          joy
## 8161   8161           miracle     positive
## 8162   8162           miracle     surprise
## 8163   8163           miracle        trust
## 8164   8164        miraculous          joy
## 8165   8165        miraculous     positive
## 8166   8166        miraculous     surprise
## 8167   8167              mire      disgust
## 8168   8168              mire     negative
## 8169   8169             mirth          joy
## 8170   8170             mirth     positive
## 8171   8171       misbehavior        anger
## 8172   8172       misbehavior      disgust
## 8173   8173       misbehavior     negative
## 8174   8174       misbehavior     surprise
## 8175   8175       miscarriage         fear
## 8176   8176       miscarriage     negative
## 8177   8177       miscarriage      sadness
## 8178   8178          mischief     negative
## 8179   8179       mischievous     negative
## 8180   8180     misconception        anger
## 8181   8181     misconception      disgust
## 8182   8182     misconception         fear
## 8183   8183     misconception     negative
## 8184   8184        misconduct      disgust
## 8185   8185        misconduct     negative
## 8186   8186         miserable        anger
## 8187   8187         miserable      disgust
## 8188   8188         miserable     negative
## 8189   8189         miserable      sadness
## 8190   8190         miserably     negative
## 8191   8191         miserably      sadness
## 8192   8192            misery        anger
## 8193   8193            misery      disgust
## 8194   8194            misery         fear
## 8195   8195            misery     negative
## 8196   8196            misery      sadness
## 8197   8197        misfortune         fear
## 8198   8198        misfortune     negative
## 8199   8199        misfortune      sadness
## 8200   8200         misguided      disgust
## 8201   8201         misguided     negative
## 8202   8202            mishap      disgust
## 8203   8203            mishap         fear
## 8204   8204            mishap     negative
## 8205   8205            mishap      sadness
## 8206   8206            mishap     surprise
## 8207   8207 misinterpretation     negative
## 8208   8208           mislead        anger
## 8209   8209           mislead         fear
## 8210   8210           mislead     negative
## 8211   8211           mislead        trust
## 8212   8212        misleading        anger
## 8213   8213        misleading      disgust
## 8214   8214        misleading     negative
## 8215   8215     mismanagement     negative
## 8216   8216          mismatch     negative
## 8217   8217          misnomer     negative
## 8218   8218          misplace        anger
## 8219   8219          misplace      disgust
## 8220   8220          misplace     negative
## 8221   8221         misplaced     negative
## 8222   8222      misrepresent     negative
## 8223   8223 misrepresentation     negative
## 8224   8224 misrepresentation      sadness
## 8225   8225    misrepresented        anger
## 8226   8226    misrepresented     negative
## 8227   8227           missile         fear
## 8228   8228           missing         fear
## 8229   8229           missing     negative
## 8230   8230           missing      sadness
## 8231   8231        missionary     positive
## 8232   8232      misstatement        anger
## 8233   8233      misstatement      disgust
## 8234   8234      misstatement     negative
## 8235   8235           mistake     negative
## 8236   8236           mistake      sadness
## 8237   8237          mistaken         fear
## 8238   8238          mistaken     negative
## 8239   8239          mistress        anger
## 8240   8240          mistress      disgust
## 8241   8241          mistress     negative
## 8242   8242          mistrust      disgust
## 8243   8243          mistrust         fear
## 8244   8244          mistrust     negative
## 8245   8245     misunderstand     negative
## 8246   8246  misunderstanding        anger
## 8247   8247  misunderstanding     negative
## 8248   8248  misunderstanding      sadness
## 8249   8249            misuse     negative
## 8250   8250              mite      disgust
## 8251   8251              mite     negative
## 8252   8252              moan         fear
## 8253   8253              moan      sadness
## 8254   8254              moat        trust
## 8255   8255               mob        anger
## 8256   8256               mob         fear
## 8257   8257               mob     negative
## 8258   8258            mobile anticipation
## 8259   8259           mockery      disgust
## 8260   8260           mockery     negative
## 8261   8261           mocking        anger
## 8262   8262           mocking      disgust
## 8263   8263           mocking     negative
## 8264   8264           mocking      sadness
## 8265   8265             model     positive
## 8266   8266          moderate     positive
## 8267   8267         moderator     positive
## 8268   8268         moderator        trust
## 8269   8269            modest     positive
## 8270   8270            modest        trust
## 8271   8271           modesty     positive
## 8272   8272            modify     surprise
## 8273   8273       molestation        anger
## 8274   8274       molestation      disgust
## 8275   8275       molestation         fear
## 8276   8276       molestation     negative
## 8277   8277       molestation      sadness
## 8278   8278          momentum anticipation
## 8279   8279          momentum     positive
## 8280   8280          monetary anticipation
## 8281   8281          monetary     positive
## 8282   8282             money        anger
## 8283   8283             money anticipation
## 8284   8284             money          joy
## 8285   8285             money     positive
## 8286   8286             money     surprise
## 8287   8287             money        trust
## 8288   8288              monk     positive
## 8289   8289              monk        trust
## 8290   8290        monochrome      disgust
## 8291   8291        monochrome     negative
## 8292   8292          monogamy        trust
## 8293   8293        monopolist     negative
## 8294   8294           monsoon     negative
## 8295   8295           monsoon      sadness
## 8296   8296           monster         fear
## 8297   8297           monster     negative
## 8298   8298       monstrosity        anger
## 8299   8299       monstrosity      disgust
## 8300   8300       monstrosity         fear
## 8301   8301       monstrosity     negative
## 8302   8302       monstrosity     surprise
## 8303   8303          monument     positive
## 8304   8304             moody        anger
## 8305   8305             moody     negative
## 8306   8306             moody      sadness
## 8307   8307          moorings        trust
## 8308   8308              moot     negative
## 8309   8309             moral        anger
## 8310   8310             moral     positive
## 8311   8311             moral        trust
## 8312   8312          morality     positive
## 8313   8313          morality        trust
## 8314   8314            morals        anger
## 8315   8315            morals anticipation
## 8316   8316            morals      disgust
## 8317   8317            morals          joy
## 8318   8318            morals     positive
## 8319   8319            morals     surprise
## 8320   8320            morals        trust
## 8321   8321            morbid     negative
## 8322   8322            morbid      sadness
## 8323   8323         morbidity        anger
## 8324   8324         morbidity      disgust
## 8325   8325         morbidity         fear
## 8326   8326         morbidity     negative
## 8327   8327         morbidity      sadness
## 8328   8328            morgue      disgust
## 8329   8329            morgue         fear
## 8330   8330            morgue     negative
## 8331   8331            morgue      sadness
## 8332   8332          moribund     negative
## 8333   8333          moribund      sadness
## 8334   8334              morn anticipation
## 8335   8335             moron     negative
## 8336   8336           moronic     negative
## 8337   8337            morrow anticipation
## 8338   8338            morsel     negative
## 8339   8339            mortal     negative
## 8340   8340         mortality        anger
## 8341   8341         mortality         fear
## 8342   8342         mortality     negative
## 8343   8343         mortality      sadness
## 8344   8344            mortar     positive
## 8345   8345          mortgage         fear
## 8346   8346         mortgagee        trust
## 8347   8347         mortgagor         fear
## 8348   8348     mortification anticipation
## 8349   8349     mortification      disgust
## 8350   8350     mortification         fear
## 8351   8351     mortification     negative
## 8352   8352     mortification      sadness
## 8353   8353          mortuary         fear
## 8354   8354          mortuary     negative
## 8355   8355          mortuary      sadness
## 8356   8356          mosquito        anger
## 8357   8357          mosquito      disgust
## 8358   8358          mosquito     negative
## 8359   8359            mother anticipation
## 8360   8360            mother          joy
## 8361   8361            mother     negative
## 8362   8362            mother     positive
## 8363   8363            mother      sadness
## 8364   8364            mother        trust
## 8365   8365        motherhood          joy
## 8366   8366        motherhood     positive
## 8367   8367        motherhood        trust
## 8368   8368            motion anticipation
## 8369   8369            motive     positive
## 8370   8370          mountain anticipation
## 8371   8371             mourn     negative
## 8372   8372             mourn      sadness
## 8373   8373          mournful        anger
## 8374   8374          mournful         fear
## 8375   8375          mournful     negative
## 8376   8376          mournful      sadness
## 8377   8377          mourning     negative
## 8378   8378          mourning      sadness
## 8379   8379             mouth     surprise
## 8380   8380          mouthful      disgust
## 8381   8381           movable     positive
## 8382   8382             mover     positive
## 8383   8383              muck      disgust
## 8384   8384              muck     negative
## 8385   8385            mucous      disgust
## 8386   8386             mucus      disgust
## 8387   8387               mud     negative
## 8388   8388            muddle     negative
## 8389   8389           muddled     negative
## 8390   8390             muddy      disgust
## 8391   8391             muddy     negative
## 8392   8392              muff        anger
## 8393   8393              muff      disgust
## 8394   8394              muff     negative
## 8395   8395               mug        anger
## 8396   8396               mug         fear
## 8397   8397               mug     negative
## 8398   8398               mug     positive
## 8399   8399               mug      sadness
## 8400   8400              mule        anger
## 8401   8401              mule     negative
## 8402   8402              mule        trust
## 8403   8403               mum         fear
## 8404   8404               mum     negative
## 8405   8405            mumble     negative
## 8406   8406             mumps     negative
## 8407   8407            murder        anger
## 8408   8408            murder      disgust
## 8409   8409            murder         fear
## 8410   8410            murder     negative
## 8411   8411            murder      sadness
## 8412   8412            murder     surprise
## 8413   8413          murderer        anger
## 8414   8414          murderer      disgust
## 8415   8415          murderer         fear
## 8416   8416          murderer     negative
## 8417   8417          murderer      sadness
## 8418   8418         murderous        anger
## 8419   8419         murderous      disgust
## 8420   8420         murderous         fear
## 8421   8421         murderous     negative
## 8422   8422         murderous      sadness
## 8423   8423         murderous     surprise
## 8424   8424             murky      disgust
## 8425   8425             murky     negative
## 8426   8426             murky      sadness
## 8427   8427          muscular     positive
## 8428   8428             music          joy
## 8429   8429             music     positive
## 8430   8430             music      sadness
## 8431   8431           musical        anger
## 8432   8432           musical anticipation
## 8433   8433           musical          joy
## 8434   8434           musical     positive
## 8435   8435           musical      sadness
## 8436   8436           musical     surprise
## 8437   8437           musical        trust
## 8438   8438            musket         fear
## 8439   8439              muss     negative
## 8440   8440             musty      disgust
## 8441   8441             musty     negative
## 8442   8442           mutable anticipation
## 8443   8443           mutable     positive
## 8444   8444            mutant     negative
## 8445   8445         mutilated      disgust
## 8446   8446         mutilated     negative
## 8447   8447        mutilation        anger
## 8448   8448        mutilation      disgust
## 8449   8449        mutilation         fear
## 8450   8450        mutilation     negative
## 8451   8451        mutilation      sadness
## 8452   8452            mutiny        anger
## 8453   8453            mutiny      disgust
## 8454   8454            mutiny         fear
## 8455   8455            mutiny     negative
## 8456   8456            mutiny     surprise
## 8457   8457            mutter        anger
## 8458   8458            mutter     negative
## 8459   8459            mutual     positive
## 8460   8460            muzzle         fear
## 8461   8461            muzzle     negative
## 8462   8462            myopia        anger
## 8463   8463            myopia     negative
## 8464   8464            myopia      sadness
## 8465   8465        mysterious anticipation
## 8466   8466        mysterious         fear
## 8467   8467        mysterious     surprise
## 8468   8468           mystery anticipation
## 8469   8469           mystery     surprise
## 8470   8470            mystic     surprise
## 8471   8471               nab     negative
## 8472   8472               nab     surprise
## 8473   8473             nadir     negative
## 8474   8474               nag        anger
## 8475   8475               nag     negative
## 8476   8476             naive     negative
## 8477   8477          nameless      disgust
## 8478   8478          nameless     negative
## 8479   8479               nap          joy
## 8480   8480               nap     positive
## 8481   8481            napkin      sadness
## 8482   8482             nappy      disgust
## 8483   8483             nappy     negative
## 8484   8484          narcotic     negative
## 8485   8485           nascent anticipation
## 8486   8486             nasty        anger
## 8487   8487             nasty      disgust
## 8488   8488             nasty         fear
## 8489   8489             nasty     negative
## 8490   8490             nasty      sadness
## 8491   8491            nation        trust
## 8492   8492        naturalist     positive
## 8493   8493           naughty     negative
## 8494   8494            nausea      disgust
## 8495   8495            nausea     negative
## 8496   8496          nauseous      disgust
## 8497   8497          nauseous     negative
## 8498   8498          nauseous      sadness
## 8499   8499         navigable anticipation
## 8500   8500         navigable     positive
## 8501   8501         navigator anticipation
## 8502   8502         navigator        trust
## 8503   8503               nay     negative
## 8504   8504            neatly     positive
## 8505   8505         necessity      sadness
## 8506   8506            nectar     positive
## 8507   8507           needful     negative
## 8508   8508            needle     positive
## 8509   8509             needy     negative
## 8510   8510         nefarious      disgust
## 8511   8511         nefarious         fear
## 8512   8512         nefarious     negative
## 8513   8513         nefarious      sadness
## 8514   8514         nefarious     surprise
## 8515   8515          negation        anger
## 8516   8516          negation     negative
## 8517   8517          negative     negative
## 8518   8518          negative      sadness
## 8519   8519           neglect     negative
## 8520   8520         neglected        anger
## 8521   8521         neglected      disgust
## 8522   8522         neglected     negative
## 8523   8523         neglected      sadness
## 8524   8524        neglecting     negative
## 8525   8525        negligence     negative
## 8526   8526         negligent     negative
## 8527   8527       negligently     negative
## 8528   8528         negotiate     positive
## 8529   8529         negotiate        trust
## 8530   8530        negotiator     positive
## 8531   8531             negro     negative
## 8532   8532             negro      sadness
## 8533   8533          neighbor anticipation
## 8534   8534          neighbor     positive
## 8535   8535          neighbor        trust
## 8536   8536      neighborhood anticipation
## 8537   8537          nepotism        anger
## 8538   8538          nepotism      disgust
## 8539   8539          nepotism     negative
## 8540   8540          nepotism      sadness
## 8541   8541             nerve     positive
## 8542   8542           nervous anticipation
## 8543   8543           nervous         fear
## 8544   8544           nervous     negative
## 8545   8545       nervousness         fear
## 8546   8546              nest        trust
## 8547   8547            nestle     positive
## 8548   8548            nestle        trust
## 8549   8549            nether        anger
## 8550   8550            nether         fear
## 8551   8551            nether     negative
## 8552   8552            nether      sadness
## 8553   8553            nettle        anger
## 8554   8554            nettle      disgust
## 8555   8555            nettle     negative
## 8556   8556           network anticipation
## 8557   8557         neuralgia         fear
## 8558   8558         neuralgia     negative
## 8559   8559         neuralgia      sadness
## 8560   8560          neurosis         fear
## 8561   8561          neurosis     negative
## 8562   8562          neurosis      sadness
## 8563   8563          neurotic      disgust
## 8564   8564          neurotic         fear
## 8565   8565          neurotic     negative
## 8566   8566           neutral anticipation
## 8567   8567           neutral        trust
## 8568   8568        neutrality        trust
## 8569   8569          newcomer         fear
## 8570   8570          newcomer     surprise
## 8571   8571          nicotine      disgust
## 8572   8572          nicotine     negative
## 8573   8573         nightmare         fear
## 8574   8574         nightmare     negative
## 8575   8575          nihilism     negative
## 8576   8576          nobility anticipation
## 8577   8577          nobility     positive
## 8578   8578          nobility        trust
## 8579   8579             noble     positive
## 8580   8580             noble        trust
## 8581   8581          nobleman     positive
## 8582   8582          nobleman        trust
## 8583   8583             noise     negative
## 8584   8584             noisy        anger
## 8585   8585             noisy     negative
## 8586   8586        nomination     positive
## 8587   8587     noncompliance        anger
## 8588   8588     noncompliance anticipation
## 8589   8589     noncompliance         fear
## 8590   8590     noncompliance     negative
## 8591   8591     noncompliance      sadness
## 8592   8592          nonsense     negative
## 8593   8593       nonsensical     negative
## 8594   8594       nonsensical      sadness
## 8595   8595             noose     negative
## 8596   8596             noose      sadness
## 8597   8597         normality     positive
## 8598   8598              nose      disgust
## 8599   8599           notable          joy
## 8600   8600           notable     positive
## 8601   8601           notable        trust
## 8602   8602          notables     positive
## 8603   8603            notary        trust
## 8604   8604             noted     positive
## 8605   8605       nothingness     negative
## 8606   8606       nothingness      sadness
## 8607   8607      notification anticipation
## 8608   8608            notion     positive
## 8609   8609         notoriety        anger
## 8610   8610         notoriety      disgust
## 8611   8611         notoriety         fear
## 8612   8612         notoriety     negative
## 8613   8613         notoriety     positive
## 8614   8614       nourishment     positive
## 8615   8615           noxious      disgust
## 8616   8616           noxious         fear
## 8617   8617           noxious     negative
## 8618   8618          nuisance        anger
## 8619   8619          nuisance     negative
## 8620   8620               nul     negative
## 8621   8621           nullify     negative
## 8622   8622           nullify     surprise
## 8623   8623              numb     negative
## 8624   8624           numbers     positive
## 8625   8625          numbness     negative
## 8626   8626          numbness      sadness
## 8627   8627               nun     negative
## 8628   8628               nun        trust
## 8629   8629             nurse     positive
## 8630   8630             nurse        trust
## 8631   8631           nursery          joy
## 8632   8632           nursery     positive
## 8633   8633           nursery        trust
## 8634   8634           nurture        anger
## 8635   8635           nurture anticipation
## 8636   8636           nurture      disgust
## 8637   8637           nurture         fear
## 8638   8638           nurture          joy
## 8639   8639           nurture     positive
## 8640   8640           nurture        trust
## 8641   8641        nutritious     positive
## 8642   8642        nutritious      sadness
## 8643   8643               oaf     negative
## 8644   8644               oak     positive
## 8645   8645             oasis anticipation
## 8646   8646             oasis          joy
## 8647   8647             oasis     positive
## 8648   8648             oasis        trust
## 8649   8649              oath     positive
## 8650   8650              oath        trust
## 8651   8651         obedience     positive
## 8652   8652         obedience        trust
## 8653   8653             obese      disgust
## 8654   8654             obese     negative
## 8655   8655           obesity      disgust
## 8656   8656           obesity     negative
## 8657   8657           obesity      sadness
## 8658   8658              obey         fear
## 8659   8659              obey        trust
## 8660   8660               obi      disgust
## 8661   8661               obi         fear
## 8662   8662               obi     negative
## 8663   8663              obit     negative
## 8664   8664              obit      sadness
## 8665   8665              obit     surprise
## 8666   8666          obituary     negative
## 8667   8667          obituary      sadness
## 8668   8668         objection        anger
## 8669   8669         objection     negative
## 8670   8670     objectionable     negative
## 8671   8671         objective anticipation
## 8672   8672         objective     positive
## 8673   8673         objective        trust
## 8674   8674            oblige     negative
## 8675   8675            oblige        trust
## 8676   8676          obliging        anger
## 8677   8677          obliging anticipation
## 8678   8678          obliging      disgust
## 8679   8679          obliging         fear
## 8680   8680          obliging          joy
## 8681   8681          obliging     positive
## 8682   8682          obliging     surprise
## 8683   8683          obliging        trust
## 8684   8684           obligor         fear
## 8685   8685           obligor     negative
## 8686   8686        obliterate        anger
## 8687   8687        obliterate         fear
## 8688   8688        obliterate     negative
## 8689   8689        obliterate      sadness
## 8690   8690       obliterated        anger
## 8691   8691       obliterated         fear
## 8692   8692       obliterated     negative
## 8693   8693      obliteration         fear
## 8694   8694      obliteration     negative
## 8695   8695      obliteration      sadness
## 8696   8696          oblivion        anger
## 8697   8697          oblivion         fear
## 8698   8698          oblivion     negative
## 8699   8699         obnoxious        anger
## 8700   8700         obnoxious      disgust
## 8701   8701         obnoxious     negative
## 8702   8702         obnoxious      sadness
## 8703   8703           obscene      disgust
## 8704   8704           obscene     negative
## 8705   8705         obscenity        anger
## 8706   8706         obscenity      disgust
## 8707   8707         obscenity     negative
## 8708   8708         obscurity     negative
## 8709   8709         observant     positive
## 8710   8710          obstacle        anger
## 8711   8711          obstacle         fear
## 8712   8712          obstacle     negative
## 8713   8713          obstacle      sadness
## 8714   8714      obstetrician        trust
## 8715   8715         obstinate     negative
## 8716   8716          obstruct        anger
## 8717   8717          obstruct         fear
## 8718   8718          obstruct     negative
## 8719   8719       obstruction     negative
## 8720   8720       obstructive        anger
## 8721   8721       obstructive     negative
## 8722   8722        obtainable          joy
## 8723   8723        obtainable     positive
## 8724   8724            obtuse     negative
## 8725   8725           obvious     positive
## 8726   8726           obvious        trust
## 8727   8727        occasional     surprise
## 8728   8728            occult      disgust
## 8729   8729            occult         fear
## 8730   8730            occult     negative
## 8731   8731          occupant     positive
## 8732   8732          occupant        trust
## 8733   8733        occupation     positive
## 8734   8734            occupy     positive
## 8735   8735           octopus      disgust
## 8736   8736            oddity      disgust
## 8737   8737            oddity     negative
## 8738   8738            oddity      sadness
## 8739   8739            oddity     surprise
## 8740   8740            odious        anger
## 8741   8741            odious      disgust
## 8742   8742            odious         fear
## 8743   8743            odious     negative
## 8744   8744              odor     negative
## 8745   8745            offend        anger
## 8746   8746            offend      disgust
## 8747   8747            offend     negative
## 8748   8748          offended        anger
## 8749   8749          offended     negative
## 8750   8750          offended      sadness
## 8751   8751          offender        anger
## 8752   8752          offender      disgust
## 8753   8753          offender         fear
## 8754   8754          offender     negative
## 8755   8755          offender      sadness
## 8756   8756           offense        anger
## 8757   8757           offense      disgust
## 8758   8758           offense         fear
## 8759   8759           offense     negative
## 8760   8760           offense      sadness
## 8761   8761         offensive        anger
## 8762   8762         offensive      disgust
## 8763   8763         offensive     negative
## 8764   8764             offer     positive
## 8765   8765          offering        trust
## 8766   8766           offhand     negative
## 8767   8767           officer     positive
## 8768   8768           officer        trust
## 8769   8769          official        trust
## 8770   8770            offing     negative
## 8771   8771            offset anticipation
## 8772   8772            offset     positive
## 8773   8773          offshoot     positive
## 8774   8774              ogre      disgust
## 8775   8775              ogre         fear
## 8776   8776              ogre     negative
## 8777   8777         olfactory anticipation
## 8778   8778         olfactory     negative
## 8779   8779         oligarchy     negative
## 8780   8780              omen anticipation
## 8781   8781              omen         fear
## 8782   8782              omen     negative
## 8783   8783           ominous anticipation
## 8784   8784           ominous         fear
## 8785   8785           ominous     negative
## 8786   8786              omit     negative
## 8787   8787       omnipotence         fear
## 8788   8788       omnipotence     negative
## 8789   8789       omnipotence     positive
## 8790   8790        omniscient     positive
## 8791   8791        omniscient        trust
## 8792   8792           onerous        anger
## 8793   8793           onerous     negative
## 8794   8794           onerous      sadness
## 8795   8795           ongoing anticipation
## 8796   8796             onset anticipation
## 8797   8797              onus     negative
## 8798   8798              ooze      disgust
## 8799   8799              ooze     negative
## 8800   8800            opaque     negative
## 8801   8801          openness     positive
## 8802   8802             opera        anger
## 8803   8803             opera anticipation
## 8804   8804             opera         fear
## 8805   8805             opera          joy
## 8806   8806             opera     positive
## 8807   8807             opera      sadness
## 8808   8808             opera     surprise
## 8809   8809             opera        trust
## 8810   8810          operatic     negative
## 8811   8811         operation         fear
## 8812   8812         operation        trust
## 8813   8813            opiate     negative
## 8814   8814       opinionated        anger
## 8815   8815       opinionated     negative
## 8816   8816             opium        anger
## 8817   8817             opium      disgust
## 8818   8818             opium         fear
## 8819   8819             opium     negative
## 8820   8820             opium      sadness
## 8821   8821          opponent        anger
## 8822   8822          opponent anticipation
## 8823   8823          opponent      disgust
## 8824   8824          opponent         fear
## 8825   8825          opponent     negative
## 8826   8826         opportune          joy
## 8827   8827         opportune     positive
## 8828   8828       opportunity anticipation
## 8829   8829       opportunity     positive
## 8830   8830            oppose     negative
## 8831   8831           opposed        anger
## 8832   8832           opposed         fear
## 8833   8833           opposed     negative
## 8834   8834        opposition        anger
## 8835   8835        opposition     negative
## 8836   8836           oppress        anger
## 8837   8837           oppress      disgust
## 8838   8838           oppress         fear
## 8839   8839           oppress     negative
## 8840   8840           oppress      sadness
## 8841   8841        oppression        anger
## 8842   8842        oppression      disgust
## 8843   8843        oppression         fear
## 8844   8844        oppression     negative
## 8845   8845        oppression      sadness
## 8846   8846        oppressive        anger
## 8847   8847        oppressive      disgust
## 8848   8848        oppressive         fear
## 8849   8849        oppressive     negative
## 8850   8850        oppressive      sadness
## 8851   8851         oppressor        anger
## 8852   8852         oppressor         fear
## 8853   8853         oppressor     negative
## 8854   8854         oppressor      sadness
## 8855   8855          optimism anticipation
## 8856   8856          optimism          joy
## 8857   8857          optimism     positive
## 8858   8858          optimism     surprise
## 8859   8859          optimism        trust
## 8860   8860          optimist     positive
## 8861   8861          optimist        trust
## 8862   8862            option     positive
## 8863   8863          optional     positive
## 8864   8864            oracle anticipation
## 8865   8865            oracle     positive
## 8866   8866            oracle        trust
## 8867   8867           oration     positive
## 8868   8868               orc        anger
## 8869   8869               orc      disgust
## 8870   8870               orc         fear
## 8871   8871               orc     negative
## 8872   8872         orchestra        anger
## 8873   8873         orchestra          joy
## 8874   8874         orchestra     positive
## 8875   8875         orchestra      sadness
## 8876   8876         orchestra        trust
## 8877   8877          ordained     positive
## 8878   8878          ordained        trust
## 8879   8879            ordeal        anger
## 8880   8880            ordeal     negative
## 8881   8881            ordeal     surprise
## 8882   8882           orderly     positive
## 8883   8883         ordinance        trust
## 8884   8884        ordination anticipation
## 8885   8885        ordination          joy
## 8886   8886        ordination     positive
## 8887   8887        ordination        trust
## 8888   8888          ordnance         fear
## 8889   8889          ordnance     negative
## 8890   8890             organ anticipation
## 8891   8891             organ          joy
## 8892   8892           organic     positive
## 8893   8893      organization anticipation
## 8894   8894      organization          joy
## 8895   8895      organization     positive
## 8896   8896      organization     surprise
## 8897   8897      organization        trust
## 8898   8898          organize     positive
## 8899   8899         organized     positive
## 8900   8900            orgasm anticipation
## 8901   8901            orgasm          joy
## 8902   8902            orgasm     positive
## 8903   8903       originality     positive
## 8904   8904       originality     surprise
## 8905   8905        ornamented     positive
## 8906   8906            ornate     positive
## 8907   8907            orphan         fear
## 8908   8908            orphan     negative
## 8909   8909            orphan      sadness
## 8910   8910         orthodoxy        trust
## 8911   8911        ostensibly     negative
## 8912   8912              oust        anger
## 8913   8913              oust     negative
## 8914   8914              oust      sadness
## 8915   8915          outburst        anger
## 8916   8916          outburst         fear
## 8917   8917          outburst          joy
## 8918   8918          outburst     negative
## 8919   8919          outburst     positive
## 8920   8920          outburst      sadness
## 8921   8921          outburst     surprise
## 8922   8922           outcast      disgust
## 8923   8923           outcast         fear
## 8924   8924           outcast     negative
## 8925   8925           outcast      sadness
## 8926   8926           outcome     positive
## 8927   8927            outcry        anger
## 8928   8928            outcry         fear
## 8929   8929            outcry     negative
## 8930   8930            outcry     surprise
## 8931   8931             outdo anticipation
## 8932   8932             outdo     positive
## 8933   8933          outhouse      disgust
## 8934   8934          outhouse     negative
## 8935   8935        outlandish     negative
## 8936   8936            outlaw     negative
## 8937   8937           outpost         fear
## 8938   8938           outrage        anger
## 8939   8939           outrage      disgust
## 8940   8940           outrage     negative
## 8941   8941        outrageous     surprise
## 8942   8942          outsider         fear
## 8943   8943       outstanding          joy
## 8944   8944       outstanding     negative
## 8945   8945       outstanding     positive
## 8946   8946           outward     positive
## 8947   8947           ovation     negative
## 8948   8948           ovation      sadness
## 8949   8949       overbearing        anger
## 8950   8950       overbearing     negative
## 8951   8951        overburden     negative
## 8952   8952          overcast     negative
## 8953   8953            overdo     negative
## 8954   8954          overdose     negative
## 8955   8955           overdue anticipation
## 8956   8956           overdue     negative
## 8957   8957           overdue      sadness
## 8958   8958           overdue     surprise
## 8959   8959      overestimate     surprise
## 8960   8960     overestimated     negative
## 8961   8961          overflow     negative
## 8962   8962         overgrown     negative
## 8963   8963         overjoyed          joy
## 8964   8964         overjoyed     positive
## 8965   8965          overload     negative
## 8966   8966          overload      sadness
## 8967   8967          overpaid     negative
## 8968   8968         overpower     negative
## 8969   8969      overpowering        anger
## 8970   8970      overpowering         fear
## 8971   8971      overpowering     negative
## 8972   8972        overpriced        anger
## 8973   8973        overpriced      disgust
## 8974   8974        overpriced     negative
## 8975   8975        overpriced      sadness
## 8976   8976         oversight     negative
## 8977   8977             overt         fear
## 8978   8978         overthrow anticipation
## 8979   8979         overthrow         fear
## 8980   8980         overthrow     negative
## 8981   8981          overture anticipation
## 8982   8982          overturn     negative
## 8983   8983         overwhelm     negative
## 8984   8984       overwhelmed     negative
## 8985   8985       overwhelmed      sadness
## 8986   8986      overwhelming     positive
## 8987   8987             owing        anger
## 8988   8988             owing anticipation
## 8989   8989             owing      disgust
## 8990   8990             owing         fear
## 8991   8991             owing     negative
## 8992   8992             owing      sadness
## 8993   8993             owing        trust
## 8994   8994         ownership     positive
## 8995   8995         oxidation     negative
## 8996   8996           pacific     positive
## 8997   8997              pact        trust
## 8998   8998               pad     positive
## 8999   8999           padding     positive
## 9000   9000            paddle anticipation
## 9001   9001            paddle     positive
## 9002   9002              pain         fear
## 9003   9003              pain     negative
## 9004   9004              pain      sadness
## 9005   9005            pained         fear
## 9006   9006            pained     negative
## 9007   9007            pained      sadness
## 9008   9008           painful        anger
## 9009   9009           painful      disgust
## 9010   9010           painful         fear
## 9011   9011           painful     negative
## 9012   9012           painful      sadness
## 9013   9013         painfully     negative
## 9014   9014         painfully      sadness
## 9015   9015             pains     negative
## 9016   9016         palatable     positive
## 9017   9017        palliative     positive
## 9018   9018          palpable     surprise
## 9019   9019             palsy      disgust
## 9020   9020             palsy         fear
## 9021   9021             palsy     negative
## 9022   9022             palsy      sadness
## 9023   9023           panacea     positive
## 9024   9024           panache     positive
## 9025   9025          pandemic         fear
## 9026   9026          pandemic     negative
## 9027   9027          pandemic      sadness
## 9028   9028              pang     negative
## 9029   9029              pang     surprise
## 9030   9030             panic         fear
## 9031   9031             panic     negative
## 9032   9032            panier     positive
## 9033   9033           paprika     positive
## 9034   9034         parachute         fear
## 9035   9035            parade anticipation
## 9036   9036            parade         fear
## 9037   9037            parade          joy
## 9038   9038            parade     negative
## 9039   9039            parade     positive
## 9040   9040            parade     surprise
## 9041   9041           paragon anticipation
## 9042   9042           paragon          joy
## 9043   9043           paragon     positive
## 9044   9044           paragon        trust
## 9045   9045         paralysis        anger
## 9046   9046         paralysis anticipation
## 9047   9047         paralysis         fear
## 9048   9048         paralysis     negative
## 9049   9049         paralysis      sadness
## 9050   9050         paramount     positive
## 9051   9051          paranoia         fear
## 9052   9052          paranoia     negative
## 9053   9053        paraphrase     negative
## 9054   9054        paraphrase     positive
## 9055   9055          parasite      disgust
## 9056   9056          parasite         fear
## 9057   9057          parasite     negative
## 9058   9058            pardon     positive
## 9059   9059              pare        anger
## 9060   9060              pare anticipation
## 9061   9061              pare         fear
## 9062   9062              pare     negative
## 9063   9063              pare      sadness
## 9064   9064         parentage     positive
## 9065   9065          parietal     positive
## 9066   9066          parietal        trust
## 9067   9067            parish        trust
## 9068   9068        parliament        trust
## 9069   9069            parole anticipation
## 9070   9070            parrot      disgust
## 9071   9071            parrot     negative
## 9072   9072      parsimonious     negative
## 9073   9073           partake     positive
## 9074   9074           partake        trust
## 9075   9075     participation     positive
## 9076   9076           parting      sadness
## 9077   9077          partisan     negative
## 9078   9078           partner     positive
## 9079   9079       partnership     positive
## 9080   9080       partnership        trust
## 9081   9081             passe     negative
## 9082   9082         passenger anticipation
## 9083   9083           passion anticipation
## 9084   9084           passion          joy
## 9085   9085           passion     positive
## 9086   9086           passion        trust
## 9087   9087        passionate anticipation
## 9088   9088        passionate          joy
## 9089   9089        passionate     positive
## 9090   9090        passionate        trust
## 9091   9091           passive     negative
## 9092   9092         passivity     negative
## 9093   9093           pastime     positive
## 9094   9094            pastor          joy
## 9095   9095            pastor     positive
## 9096   9096            pastor        trust
## 9097   9097            pastry          joy
## 9098   9098            pastry     positive
## 9099   9099           pasture     positive
## 9100   9100             patch     negative
## 9101   9101            patent     positive
## 9102   9102          pathetic      disgust
## 9103   9103          pathetic     negative
## 9104   9104          pathetic      sadness
## 9105   9105          patience anticipation
## 9106   9106          patience     positive
## 9107   9107          patience        trust
## 9108   9108           patient anticipation
## 9109   9109           patient     positive
## 9110   9110       patriarchal     positive
## 9111   9111       patriarchal        trust
## 9112   9112            patrol        trust
## 9113   9113            patron     positive
## 9114   9114            patron        trust
## 9115   9115         patronage     positive
## 9116   9116         patronage        trust
## 9117   9117       patronizing     negative
## 9118   9118            patter        anger
## 9119   9119            patter     negative
## 9120   9120           paucity        anger
## 9121   9121           paucity      disgust
## 9122   9122           paucity     negative
## 9123   9123           paucity      sadness
## 9124   9124            pauper     negative
## 9125   9125            pauper      sadness
## 9126   9126          pavement        trust
## 9127   9127              pawn     negative
## 9128   9128              pawn        trust
## 9129   9129               pay anticipation
## 9130   9130               pay          joy
## 9131   9131               pay     positive
## 9132   9132               pay        trust
## 9133   9133           payback        anger
## 9134   9134           payback     negative
## 9135   9135           payment     negative
## 9136   9136             peace anticipation
## 9137   9137             peace          joy
## 9138   9138             peace     positive
## 9139   9139             peace        trust
## 9140   9140         peaceable     positive
## 9141   9141          peaceful anticipation
## 9142   9142          peaceful          joy
## 9143   9143          peaceful     positive
## 9144   9144          peaceful     surprise
## 9145   9145          peaceful        trust
## 9146   9146           peacock     positive
## 9147   9147              peck     positive
## 9148   9148     peculiarities     negative
## 9149   9149       peculiarity     positive
## 9150   9150        pedestrian     negative
## 9151   9151          pedigree     positive
## 9152   9152          pedigree        trust
## 9153   9153          peerless     positive
## 9154   9154             penal         fear
## 9155   9155             penal     negative
## 9156   9156             penal      sadness
## 9157   9157           penalty        anger
## 9158   9158           penalty         fear
## 9159   9159           penalty     negative
## 9160   9160           penalty      sadness
## 9161   9161           penance         fear
## 9162   9162           penance      sadness
## 9163   9163          penchant     positive
## 9164   9164       penetration        anger
## 9165   9165       penetration         fear
## 9166   9166       penetration     negative
## 9167   9167      penitentiary        anger
## 9168   9168      penitentiary     negative
## 9169   9169           pensive      sadness
## 9170   9170          perceive     positive
## 9171   9171          perceive        trust
## 9172   9172       perceptible     positive
## 9173   9173         perchance     surprise
## 9174   9174         perdition        anger
## 9175   9175         perdition      disgust
## 9176   9176         perdition         fear
## 9177   9177         perdition     negative
## 9178   9178         perdition      sadness
## 9179   9179         perennial     positive
## 9180   9180         perennial        trust
## 9181   9181           perfect anticipation
## 9182   9182           perfect          joy
## 9183   9183           perfect     positive
## 9184   9184           perfect        trust
## 9185   9185        perfection anticipation
## 9186   9186        perfection          joy
## 9187   9187        perfection     positive
## 9188   9188        perfection     surprise
## 9189   9189        perfection        trust
## 9190   9190         performer     positive
## 9191   9191              peri     surprise
## 9192   9192             peril anticipation
## 9193   9193             peril         fear
## 9194   9194             peril     negative
## 9195   9195             peril      sadness
## 9196   9196          perilous anticipation
## 9197   9197          perilous         fear
## 9198   9198          perilous     negative
## 9199   9199          perilous      sadness
## 9200   9200       periodicity        trust
## 9201   9201            perish         fear
## 9202   9202            perish     negative
## 9203   9203            perish      sadness
## 9204   9204        perishable     negative
## 9205   9205          perished     negative
## 9206   9206          perished      sadness
## 9207   9207         perishing         fear
## 9208   9208         perishing     negative
## 9209   9209         perishing      sadness
## 9210   9210           perjury         fear
## 9211   9211           perjury     negative
## 9212   9212           perjury     surprise
## 9213   9213              perk     positive
## 9214   9214        permission     positive
## 9215   9215        pernicious        anger
## 9216   9216        pernicious         fear
## 9217   9217        pernicious     negative
## 9218   9218        pernicious      sadness
## 9219   9219       perpetrator        anger
## 9220   9220       perpetrator      disgust
## 9221   9221       perpetrator         fear
## 9222   9222       perpetrator     negative
## 9223   9223       perpetrator      sadness
## 9224   9224        perpetuate anticipation
## 9225   9225      perpetuation     negative
## 9226   9226        perpetuity anticipation
## 9227   9227        perpetuity     positive
## 9228   9228        perpetuity        trust
## 9229   9229         perplexed     negative
## 9230   9230        perplexity     negative
## 9231   9231        perplexity      sadness
## 9232   9232         persecute        anger
## 9233   9233         persecute         fear
## 9234   9234         persecute     negative
## 9235   9235       persecution        anger
## 9236   9236       persecution      disgust
## 9237   9237       persecution         fear
## 9238   9238       persecution     negative
## 9239   9239       persecution      sadness
## 9240   9240       persistence     positive
## 9241   9241        persistent     positive
## 9242   9242        personable     positive
## 9243   9243          personal        trust
## 9244   9244      perspiration      disgust
## 9245   9245          persuade        trust
## 9246   9246         pertinent     positive
## 9247   9247         pertinent        trust
## 9248   9248      perturbation         fear
## 9249   9249      perturbation     negative
## 9250   9250         pertussis     negative
## 9251   9251          perverse        anger
## 9252   9252          perverse      disgust
## 9253   9253          perverse         fear
## 9254   9254          perverse     negative
## 9255   9255        perversion        anger
## 9256   9256        perversion      disgust
## 9257   9257        perversion     negative
## 9258   9258        perversion      sadness
## 9259   9259           pervert        anger
## 9260   9260           pervert      disgust
## 9261   9261           pervert     negative
## 9262   9262         perverted      disgust
## 9263   9263         perverted     negative
## 9264   9264         pessimism        anger
## 9265   9265         pessimism         fear
## 9266   9266         pessimism     negative
## 9267   9267         pessimism      sadness
## 9268   9268         pessimist         fear
## 9269   9269         pessimist     negative
## 9270   9270         pessimist      sadness
## 9271   9271              pest        anger
## 9272   9272              pest      disgust
## 9273   9273              pest         fear
## 9274   9274              pest     negative
## 9275   9275        pestilence      disgust
## 9276   9276        pestilence         fear
## 9277   9277        pestilence     negative
## 9278   9278               pet     negative
## 9279   9279         petroleum      disgust
## 9280   9280         petroleum     negative
## 9281   9281         petroleum     positive
## 9282   9282             petty     negative
## 9283   9283           phalanx         fear
## 9284   9284           phalanx        trust
## 9285   9285           phantom         fear
## 9286   9286           phantom     negative
## 9287   9287    pharmaceutical     positive
## 9288   9288     philanthropic        trust
## 9289   9289    philanthropist     positive
## 9290   9290    philanthropist        trust
## 9291   9291      philanthropy     positive
## 9292   9292       philosopher     positive
## 9293   9293       philosopher        trust
## 9294   9294            phlegm      disgust
## 9295   9295            phlegm     negative
## 9296   9296           phoenix     positive
## 9297   9297          phonetic     positive
## 9298   9298             phony        anger
## 9299   9299             phony      disgust
## 9300   9300             phony     negative
## 9301   9301         physician     positive
## 9302   9302         physician        trust
## 9303   9303         physicist        trust
## 9304   9304           physics     positive
## 9305   9305        physiology     positive
## 9306   9306          physique     positive
## 9307   9307              pick     positive
## 9308   9308            picket        anger
## 9309   9309            picket anticipation
## 9310   9310            picket         fear
## 9311   9311            picket     negative
## 9312   9312         picketing        anger
## 9313   9313         picketing     negative
## 9314   9314            pickle     negative
## 9315   9315            picnic anticipation
## 9316   9316            picnic          joy
## 9317   9317            picnic     positive
## 9318   9318            picnic     surprise
## 9319   9319            picnic        trust
## 9320   9320       picturesque          joy
## 9321   9321       picturesque     positive
## 9322   9322             piety     positive
## 9323   9323               pig      disgust
## 9324   9324               pig     negative
## 9325   9325            pigeon     negative
## 9326   9326             piles      disgust
## 9327   9327             piles     negative
## 9328   9328              pill     positive
## 9329   9329              pill        trust
## 9330   9330           pillage        anger
## 9331   9331           pillage      disgust
## 9332   9332           pillage         fear
## 9333   9333           pillage     negative
## 9334   9334            pillow     positive
## 9335   9335             pilot     positive
## 9336   9336             pilot        trust
## 9337   9337              pimp     negative
## 9338   9338            pimple      disgust
## 9339   9339            pimple     negative
## 9340   9340              pine     negative
## 9341   9341              pine      sadness
## 9342   9342            pinion         fear
## 9343   9343            pinion     negative
## 9344   9344          pinnacle     positive
## 9345   9345           pioneer     positive
## 9346   9346             pious      disgust
## 9347   9347             pious     positive
## 9348   9348             pious      sadness
## 9349   9349             pious        trust
## 9350   9350             pique        anger
## 9351   9351             pique     negative
## 9352   9352            piracy     negative
## 9353   9353            pirate        anger
## 9354   9354            pirate     negative
## 9355   9355            pistol     negative
## 9356   9356           pitfall        anger
## 9357   9357           pitfall      disgust
## 9358   9358           pitfall         fear
## 9359   9359           pitfall     negative
## 9360   9360           pitfall      sadness
## 9361   9361           pitfall     surprise
## 9362   9362              pith     positive
## 9363   9363              pith        trust
## 9364   9364              pity      sadness
## 9365   9365             pivot     positive
## 9366   9366             pivot        trust
## 9367   9367           placard     surprise
## 9368   9368            placid     positive
## 9369   9369        plagiarism      disgust
## 9370   9370        plagiarism     negative
## 9371   9371            plague      disgust
## 9372   9372            plague         fear
## 9373   9373            plague     negative
## 9374   9374            plague      sadness
## 9375   9375         plaintiff     negative
## 9376   9376         plaintive      sadness
## 9377   9377              plan anticipation
## 9378   9378          planning anticipation
## 9379   9379          planning     positive
## 9380   9380          planning        trust
## 9381   9381            plated     negative
## 9382   9382            player     negative
## 9383   9383           playful        anger
## 9384   9384           playful          joy
## 9385   9385           playful     positive
## 9386   9386           playful     surprise
## 9387   9387           playful        trust
## 9388   9388        playground anticipation
## 9389   9389        playground          joy
## 9390   9390        playground     positive
## 9391   9391        playground     surprise
## 9392   9392        playground        trust
## 9393   9393         playhouse          joy
## 9394   9394         playhouse     positive
## 9395   9395              plea anticipation
## 9396   9396              plea         fear
## 9397   9397              plea     negative
## 9398   9398              plea      sadness
## 9399   9399          pleasant anticipation
## 9400   9400          pleasant          joy
## 9401   9401          pleasant     positive
## 9402   9402          pleasant     surprise
## 9403   9403          pleasant        trust
## 9404   9404           pleased          joy
## 9405   9405           pleased     positive
## 9406   9406       pleasurable          joy
## 9407   9407       pleasurable     positive
## 9408   9408            pledge          joy
## 9409   9409            pledge     positive
## 9410   9410            pledge        trust
## 9411   9411           plenary     positive
## 9412   9412         plentiful     positive
## 9413   9413            plexus     positive
## 9414   9414            plight anticipation
## 9415   9415            plight      disgust
## 9416   9416            plight         fear
## 9417   9417            plight     negative
## 9418   9418            plight      sadness
## 9419   9419          plodding     negative
## 9420   9420              plum     positive
## 9421   9421             plumb     positive
## 9422   9422           plummet         fear
## 9423   9423           plummet     negative
## 9424   9424             plump anticipation
## 9425   9425           plunder        anger
## 9426   9426           plunder      disgust
## 9427   9427           plunder         fear
## 9428   9428           plunder     negative
## 9429   9429           plunder      sadness
## 9430   9430           plunder     surprise
## 9431   9431            plunge         fear
## 9432   9432            plunge     negative
## 9433   9433             plush     positive
## 9434   9434               ply     positive
## 9435   9435         pneumonia         fear
## 9436   9436         pneumonia     negative
## 9437   9437          poaching        anger
## 9438   9438          poaching      disgust
## 9439   9439          poaching         fear
## 9440   9440          poaching     negative
## 9441   9441          poaching      sadness
## 9442   9442         pointedly     positive
## 9443   9443         pointless     negative
## 9444   9444         pointless      sadness
## 9445   9445            poison        anger
## 9446   9446            poison      disgust
## 9447   9447            poison         fear
## 9448   9448            poison     negative
## 9449   9449            poison      sadness
## 9450   9450          poisoned        anger
## 9451   9451          poisoned      disgust
## 9452   9452          poisoned         fear
## 9453   9453          poisoned     negative
## 9454   9454          poisoned      sadness
## 9455   9455         poisoning      disgust
## 9456   9456         poisoning     negative
## 9457   9457         poisonous        anger
## 9458   9458         poisonous      disgust
## 9459   9459         poisonous         fear
## 9460   9460         poisonous     negative
## 9461   9461         poisonous      sadness
## 9462   9462              poke anticipation
## 9463   9463              poke     negative
## 9464   9464          polarity     surprise
## 9465   9465           polemic        anger
## 9466   9466           polemic      disgust
## 9467   9467           polemic     negative
## 9468   9468            police         fear
## 9469   9469            police     positive
## 9470   9470            police        trust
## 9471   9471         policeman         fear
## 9472   9472         policeman     positive
## 9473   9473         policeman        trust
## 9474   9474            policy        trust
## 9475   9475             polio         fear
## 9476   9476             polio     negative
## 9477   9477             polio      sadness
## 9478   9478            polish     positive
## 9479   9479          polished     positive
## 9480   9480            polite     positive
## 9481   9481        politeness     positive
## 9482   9482           politic      disgust
## 9483   9483           politic     positive
## 9484   9484          politics        anger
## 9485   9485              poll        trust
## 9486   9486           pollute      disgust
## 9487   9487           pollute     negative
## 9488   9488         pollution      disgust
## 9489   9489         pollution     negative
## 9490   9490          polygamy      disgust
## 9491   9491          polygamy     negative
## 9492   9492              pomp     negative
## 9493   9493           pompous      disgust
## 9494   9494           pompous     negative
## 9495   9495         ponderous     negative
## 9496   9496           pontiff        trust
## 9497   9497              pool     positive
## 9498   9498            poorly     negative
## 9499   9499               pop     negative
## 9500   9500               pop     surprise
## 9501   9501              pope     positive
## 9502   9502        popularity     positive
## 9503   9503       popularized     positive
## 9504   9504        population     positive
## 9505   9505         porcupine     negative
## 9506   9506              porn      disgust
## 9507   9507              porn     negative
## 9508   9508             porno     negative
## 9509   9509      pornographic     negative
## 9510   9510       pornography      disgust
## 9511   9511       pornography     negative
## 9512   9512          portable     positive
## 9513   9513              pose     negative
## 9514   9514             posse         fear
## 9515   9515           possess anticipation
## 9516   9516           possess          joy
## 9517   9517           possess     positive
## 9518   9518           possess        trust
## 9519   9519         possessed        anger
## 9520   9520         possessed      disgust
## 9521   9521         possessed         fear
## 9522   9522         possessed     negative
## 9523   9523        possession        anger
## 9524   9524        possession      disgust
## 9525   9525        possession         fear
## 9526   9526        possession     negative
## 9527   9527       possibility anticipation
## 9528   9528        posthumous     negative
## 9529   9529        posthumous      sadness
## 9530   9530      postponement     negative
## 9531   9531      postponement     surprise
## 9532   9532           potable     positive
## 9533   9533           potency     positive
## 9534   9534             pound        anger
## 9535   9535             pound     negative
## 9536   9536           poverty        anger
## 9537   9537           poverty      disgust
## 9538   9538           poverty         fear
## 9539   9539           poverty     negative
## 9540   9540           poverty      sadness
## 9541   9541               pow        anger
## 9542   9542          powerful        anger
## 9543   9543          powerful anticipation
## 9544   9544          powerful      disgust
## 9545   9545          powerful         fear
## 9546   9546          powerful          joy
## 9547   9547          powerful     positive
## 9548   9548          powerful        trust
## 9549   9549        powerfully         fear
## 9550   9550        powerfully     positive
## 9551   9551         powerless        anger
## 9552   9552         powerless      disgust
## 9553   9553         powerless         fear
## 9554   9554         powerless     negative
## 9555   9555         powerless      sadness
## 9556   9556          practice     positive
## 9557   9557         practiced          joy
## 9558   9558         practiced     positive
## 9559   9559         practiced     surprise
## 9560   9560         practiced        trust
## 9561   9561          practise anticipation
## 9562   9562          practise     positive
## 9563   9563            praise          joy
## 9564   9564            praise     positive
## 9565   9565            praise        trust
## 9566   9566           praised          joy
## 9567   9567           praised     positive
## 9568   9568      praiseworthy anticipation
## 9569   9569      praiseworthy          joy
## 9570   9570      praiseworthy     positive
## 9571   9571      praiseworthy     surprise
## 9572   9572      praiseworthy        trust
## 9573   9573             prank     negative
## 9574   9574             prank     surprise
## 9575   9575              pray anticipation
## 9576   9576              pray         fear
## 9577   9577              pray          joy
## 9578   9578              pray     positive
## 9579   9579              pray     surprise
## 9580   9580              pray        trust
## 9581   9581        precarious anticipation
## 9582   9582        precarious         fear
## 9583   9583        precarious     negative
## 9584   9584        precarious      sadness
## 9585   9585        precaution     positive
## 9586   9586           precede     positive
## 9587   9587        precedence     positive
## 9588   9588        precedence        trust
## 9589   9589          precinct     negative
## 9590   9590          precious anticipation
## 9591   9591          precious          joy
## 9592   9592          precious     positive
## 9593   9593          precious     surprise
## 9594   9594         precipice         fear
## 9595   9595           precise     positive
## 9596   9596         precision     positive
## 9597   9597          preclude        anger
## 9598   9598         precursor anticipation
## 9599   9599         predatory     negative
## 9600   9600       predicament         fear
## 9601   9601       predicament     negative
## 9602   9602           predict anticipation
## 9603   9603        prediction anticipation
## 9604   9604      predilection anticipation
## 9605   9605      predilection     positive
## 9606   9606        predispose anticipation
## 9607   9607       predominant     positive
## 9608   9608       predominant        trust
## 9609   9609        preeminent     positive
## 9610   9610            prefer     positive
## 9611   9611            prefer        trust
## 9612   9612         pregnancy      disgust
## 9613   9613         pregnancy     negative
## 9614   9614         prejudice        anger
## 9615   9615         prejudice     negative
## 9616   9616        prejudiced      disgust
## 9617   9617        prejudiced         fear
## 9618   9618        prejudiced     negative
## 9619   9619       prejudicial        anger
## 9620   9620       prejudicial     negative
## 9621   9621       preliminary anticipation
## 9622   9622         premature     surprise
## 9623   9623      premeditated         fear
## 9624   9624      premeditated     negative
## 9625   9625           premier     positive
## 9626   9626          premises     positive
## 9627   9627       preparation anticipation
## 9628   9628       preparatory anticipation
## 9629   9629           prepare anticipation
## 9630   9630           prepare     positive
## 9631   9631          prepared anticipation
## 9632   9632          prepared     positive
## 9633   9633          prepared        trust
## 9634   9634      preparedness anticipation
## 9635   9635     preponderance        trust
## 9636   9636      prerequisite anticipation
## 9637   9637         prescient anticipation
## 9638   9638         prescient     positive
## 9639   9639          presence     positive
## 9640   9640           present anticipation
## 9641   9641           present          joy
## 9642   9642           present     positive
## 9643   9643           present     surprise
## 9644   9644           present        trust
## 9645   9645       presentable     positive
## 9646   9646       presentment     negative
## 9647   9647       presentment     positive
## 9648   9648      preservative anticipation
## 9649   9649      preservative          joy
## 9650   9650      preservative     positive
## 9651   9651      preservative     surprise
## 9652   9652      preservative        trust
## 9653   9653          preserve     positive
## 9654   9654         president     positive
## 9655   9655         president        trust
## 9656   9656          pressure     negative
## 9657   9657          prestige          joy
## 9658   9658          prestige     positive
## 9659   9659          prestige        trust
## 9660   9660            presto          joy
## 9661   9661            presto     positive
## 9662   9662            presto     surprise
## 9663   9663       presumption        trust
## 9664   9664      presumptuous        anger
## 9665   9665      presumptuous      disgust
## 9666   9666      presumptuous     negative
## 9667   9667           pretend     negative
## 9668   9668         pretended     negative
## 9669   9669        pretending        anger
## 9670   9670        pretending     negative
## 9671   9671          pretense     negative
## 9672   9672       pretensions     negative
## 9673   9673            pretty anticipation
## 9674   9674            pretty          joy
## 9675   9675            pretty     positive
## 9676   9676            pretty        trust
## 9677   9677           prevail anticipation
## 9678   9678           prevail          joy
## 9679   9679           prevail     positive
## 9680   9680         prevalent        trust
## 9681   9681           prevent         fear
## 9682   9682        prevention anticipation
## 9683   9683        prevention     positive
## 9684   9684        preventive     negative
## 9685   9685              prey         fear
## 9686   9686              prey     negative
## 9687   9687         priceless     positive
## 9688   9688             prick        anger
## 9689   9689             prick      disgust
## 9690   9690             prick         fear
## 9691   9691             prick     negative
## 9692   9692             prick     surprise
## 9693   9693           prickly     negative
## 9694   9694             pride          joy
## 9695   9695             pride     positive
## 9696   9696            priest     positive
## 9697   9697            priest        trust
## 9698   9698        priesthood anticipation
## 9699   9699        priesthood          joy
## 9700   9700        priesthood     positive
## 9701   9701        priesthood      sadness
## 9702   9702        priesthood        trust
## 9703   9703          priestly     positive
## 9704   9704           primacy     positive
## 9705   9705           primary     positive
## 9706   9706             prime     positive
## 9707   9707            primer     positive
## 9708   9708            primer        trust
## 9709   9709            prince     positive
## 9710   9710          princely anticipation
## 9711   9711          princely          joy
## 9712   9712          princely     positive
## 9713   9713          princely     surprise
## 9714   9714          princely        trust
## 9715   9715          princess     positive
## 9716   9716         principal     positive
## 9717   9717         principal        trust
## 9718   9718            prison        anger
## 9719   9719            prison         fear
## 9720   9720            prison     negative
## 9721   9721            prison      sadness
## 9722   9722          prisoner        anger
## 9723   9723          prisoner      disgust
## 9724   9724          prisoner         fear
## 9725   9725          prisoner     negative
## 9726   9726          prisoner      sadness
## 9727   9727          pristine     positive
## 9728   9728        privileged          joy
## 9729   9729        privileged     positive
## 9730   9730        privileged        trust
## 9731   9731             privy     negative
## 9732   9732             privy        trust
## 9733   9733       probability anticipation
## 9734   9734         probation anticipation
## 9735   9735         probation         fear
## 9736   9736         probation      sadness
## 9737   9737           probity     positive
## 9738   9738           probity        trust
## 9739   9739           problem         fear
## 9740   9740           problem     negative
## 9741   9741           problem      sadness
## 9742   9742         procedure         fear
## 9743   9743         procedure     positive
## 9744   9744        proceeding anticipation
## 9745   9745        procession          joy
## 9746   9746        procession     positive
## 9747   9747        procession      sadness
## 9748   9748        procession     surprise
## 9749   9749     procrastinate     negative
## 9750   9750   procrastination     negative
## 9751   9751           proctor     positive
## 9752   9752           proctor        trust
## 9753   9753           procure     positive
## 9754   9754          prodigal     negative
## 9755   9755          prodigal     positive
## 9756   9756        prodigious     positive
## 9757   9757           prodigy     positive
## 9758   9758          producer     positive
## 9759   9759         producing     positive
## 9760   9760        production anticipation
## 9761   9761        production     positive
## 9762   9762        productive     positive
## 9763   9763      productivity     positive
## 9764   9764           profane        anger
## 9765   9765           profane     negative
## 9766   9766         profanity        anger
## 9767   9767         profanity     negative
## 9768   9768        profession     positive
## 9769   9769      professional     positive
## 9770   9770      professional        trust
## 9771   9771         professor     positive
## 9772   9772         professor        trust
## 9773   9773     professorship        trust
## 9774   9774       proficiency anticipation
## 9775   9775       proficiency          joy
## 9776   9776       proficiency     positive
## 9777   9777       proficiency     surprise
## 9778   9778       proficiency        trust
## 9779   9779        proficient     positive
## 9780   9780        proficient        trust
## 9781   9781           profuse     positive
## 9782   9782         profusion     negative
## 9783   9783         prognosis anticipation
## 9784   9784         prognosis         fear
## 9785   9785        prognostic anticipation
## 9786   9786          progress anticipation
## 9787   9787          progress          joy
## 9788   9788          progress     positive
## 9789   9789       progression anticipation
## 9790   9790       progression          joy
## 9791   9791       progression     positive
## 9792   9792       progression      sadness
## 9793   9793       progression        trust
## 9794   9794       progressive     positive
## 9795   9795        prohibited        anger
## 9796   9796        prohibited      disgust
## 9797   9797        prohibited         fear
## 9798   9798        prohibited     negative
## 9799   9799       prohibition     negative
## 9800   9800        projectile         fear
## 9801   9801       projectiles         fear
## 9802   9802          prolific     positive
## 9803   9803          prologue anticipation
## 9804   9804           prolong      disgust
## 9805   9805           prolong     negative
## 9806   9806        prominence     positive
## 9807   9807       prominently     positive
## 9808   9808       promiscuous     negative
## 9809   9809           promise          joy
## 9810   9810           promise     positive
## 9811   9811           promise        trust
## 9812   9812         promising     positive
## 9813   9813         promotion     positive
## 9814   9814             proof        trust
## 9815   9815              prop     positive
## 9816   9816        propaganda     negative
## 9817   9817            proper     positive
## 9818   9818          prophecy anticipation
## 9819   9819           prophet anticipation
## 9820   9820           prophet     positive
## 9821   9821           prophet        trust
## 9822   9822         prophetic anticipation
## 9823   9823      prophylactic anticipation
## 9824   9824      prophylactic     positive
## 9825   9825      prophylactic        trust
## 9826   9826       proposition     positive
## 9827   9827         prosecute        anger
## 9828   9828         prosecute         fear
## 9829   9829         prosecute     negative
## 9830   9830         prosecute      sadness
## 9831   9831       prosecution      disgust
## 9832   9832       prosecution     negative
## 9833   9833          prospect     positive
## 9834   9834     prospectively anticipation
## 9835   9835           prosper anticipation
## 9836   9836           prosper          joy
## 9837   9837           prosper     positive
## 9838   9838        prosperity     positive
## 9839   9839        prosperous          joy
## 9840   9840        prosperous     positive
## 9841   9841        prostitute      disgust
## 9842   9842        prostitute     negative
## 9843   9843      prostitution      disgust
## 9844   9844      prostitution     negative
## 9845   9845      prostitution      sadness
## 9846   9846           protect     positive
## 9847   9847         protected        trust
## 9848   9848        protecting     positive
## 9849   9849        protecting        trust
## 9850   9850        protective     positive
## 9851   9851         protector     positive
## 9852   9852         protector        trust
## 9853   9853             proud anticipation
## 9854   9854             proud          joy
## 9855   9855             proud     positive
## 9856   9856             proud        trust
## 9857   9857             prove     positive
## 9858   9858            proven        trust
## 9859   9859        proverbial     positive
## 9860   9860           provide     positive
## 9861   9861           provide        trust
## 9862   9862         providing anticipation
## 9863   9863         providing          joy
## 9864   9864         providing     positive
## 9865   9865         providing        trust
## 9866   9866           proviso        trust
## 9867   9867       provocation        anger
## 9868   9868       provocation     negative
## 9869   9869         provoking        anger
## 9870   9870         provoking      disgust
## 9871   9871         provoking     negative
## 9872   9872             prowl         fear
## 9873   9873             prowl     surprise
## 9874   9874             proxy        trust
## 9875   9875          prudence     positive
## 9876   9876           prudent     positive
## 9877   9877           prudent        trust
## 9878   9878               pry        anger
## 9879   9879               pry anticipation
## 9880   9880               pry     negative
## 9881   9881               pry        trust
## 9882   9882            prying     negative
## 9883   9883             psalm     positive
## 9884   9884         psychosis        anger
## 9885   9885         psychosis         fear
## 9886   9886         psychosis     negative
## 9887   9887         psychosis      sadness
## 9888   9888            public anticipation
## 9889   9889            public     positive
## 9890   9890         publicist     negative
## 9891   9891             puffy     negative
## 9892   9892              puke      disgust
## 9893   9893              pull     positive
## 9894   9894            pulpit     positive
## 9895   9895              puma         fear
## 9896   9896              puma     surprise
## 9897   9897             punch        anger
## 9898   9898             punch         fear
## 9899   9899             punch     negative
## 9900   9900             punch      sadness
## 9901   9901             punch     surprise
## 9902   9902          punctual anticipation
## 9903   9903          punctual     positive
## 9904   9904          punctual        trust
## 9905   9905       punctuality     positive
## 9906   9906           pungent      disgust
## 9907   9907           pungent     negative
## 9908   9908            punish         fear
## 9909   9909            punish     negative
## 9910   9910          punished        anger
## 9911   9911          punished anticipation
## 9912   9912          punished      disgust
## 9913   9913          punished         fear
## 9914   9914          punished     negative
## 9915   9915          punished      sadness
## 9916   9916         punishing        anger
## 9917   9917         punishing         fear
## 9918   9918         punishing     negative
## 9919   9919         punishing      sadness
## 9920   9920        punishment        anger
## 9921   9921        punishment      disgust
## 9922   9922        punishment         fear
## 9923   9923        punishment     negative
## 9924   9924          punitive        anger
## 9925   9925          punitive         fear
## 9926   9926          punitive     negative
## 9927   9927          punitive      sadness
## 9928   9928              punt anticipation
## 9929   9929             puppy anticipation
## 9930   9930             puppy     positive
## 9931   9931             puppy        trust
## 9932   9932            purely     positive
## 9933   9933            purely        trust
## 9934   9934         purgatory      disgust
## 9935   9935         purgatory         fear
## 9936   9936         purgatory     negative
## 9937   9937             purge         fear
## 9938   9938             purge     negative
## 9939   9939      purification     positive
## 9940   9940      purification        trust
## 9941   9941            purify          joy
## 9942   9942            purify     positive
## 9943   9943            purify        trust
## 9944   9944            purist     positive
## 9945   9945            purity     positive
## 9946   9946            purity     surprise
## 9947   9947              purr          joy
## 9948   9948              purr     positive
## 9949   9949              purr        trust
## 9950   9950               pus      disgust
## 9951   9951               pus     negative
## 9952   9952          putative        trust
## 9953   9953             quack      disgust
## 9954   9954             quack     negative
## 9955   9955          quagmire      disgust
## 9956   9956          quagmire     negative
## 9957   9957             quail         fear
## 9958   9958             quail     negative
## 9959   9959            quaint          joy
## 9960   9960            quaint     positive
## 9961   9961            quaint        trust
## 9962   9962             quake         fear
## 9963   9963         qualified     positive
## 9964   9964         qualified        trust
## 9965   9965        qualifying     positive
## 9966   9966          quandary        anger
## 9967   9967          quandary         fear
## 9968   9968          quandary     negative
## 9969   9969        quarantine         fear
## 9970   9970           quarrel        anger
## 9971   9971           quarrel     negative
## 9972   9972             quash         fear
## 9973   9973             quash     negative
## 9974   9974             quell     negative
## 9975   9975             quest anticipation
## 9976   9976             quest     positive
## 9977   9977          question     positive
## 9978   9978      questionable      disgust
## 9979   9979      questionable     negative
## 9980   9980           quicken anticipation
## 9981   9981         quickness     positive
## 9982   9982         quickness     surprise
## 9983   9983       quicksilver     negative
## 9984   9984       quicksilver     surprise
## 9985   9985         quiescent     positive
## 9986   9986             quiet     positive
## 9987   9987             quiet      sadness
## 9988   9988           quinine     positive
## 9989   9989              quit     negative
## 9990   9990            quiver         fear
## 9991   9991            quiver     negative
## 9992   9992         quivering         fear
## 9993   9993         quivering     negative
## 9994   9994              quiz     negative
## 9995   9995             quote anticipation
## 9996   9996             quote     negative
## 9997   9997             quote     positive
## 9998   9998             quote     surprise
## 9999   9999            rabble        anger
## 10000 10000            rabble         fear
## 10001 10001            rabble     negative
## 10002 10002             rabid        anger
## 10003 10003             rabid anticipation
## 10004 10004             rabid      disgust
## 10005 10005             rabid         fear
## 10006 10006             rabid     negative
## 10007 10007             rabid      sadness
## 10008 10008            rabies     negative
## 10009 10009              rack     negative
## 10010 10010              rack      sadness
## 10011 10011            racket     negative
## 10012 10012             radar        trust
## 10013 10013          radiance anticipation
## 10014 10014          radiance          joy
## 10015 10015          radiance     positive
## 10016 10016          radiance        trust
## 10017 10017           radiant          joy
## 10018 10018           radiant     positive
## 10019 10019           radiate     positive
## 10020 10020         radiation         fear
## 10021 10021         radiation     negative
## 10022 10022             radio     positive
## 10023 10023       radioactive         fear
## 10024 10024       radioactive     negative
## 10025 10025             radon         fear
## 10026 10026             radon     negative
## 10027 10027            raffle anticipation
## 10028 10028            raffle     surprise
## 10029 10029              rage        anger
## 10030 10030              rage     negative
## 10031 10031            raging        anger
## 10032 10032            raging      disgust
## 10033 10033            raging         fear
## 10034 10034            raging     negative
## 10035 10035              rags      disgust
## 10036 10036              rags     negative
## 10037 10037              raid        anger
## 10038 10038              raid         fear
## 10039 10039              raid     negative
## 10040 10040              raid     surprise
## 10041 10041              rail        anger
## 10042 10042              rail anticipation
## 10043 10043              rail     negative
## 10044 10044             rainy      sadness
## 10045 10045               ram        anger
## 10046 10046               ram anticipation
## 10047 10047               ram     negative
## 10048 10048          rambling     negative
## 10049 10049           rampage        anger
## 10050 10050           rampage         fear
## 10051 10051           rampage     negative
## 10052 10052            rancid      disgust
## 10053 10053            rancid     negative
## 10054 10054          randomly     surprise
## 10055 10055            ranger        trust
## 10056 10056            ransom        anger
## 10057 10057            ransom         fear
## 10058 10058            ransom     negative
## 10059 10059              rape        anger
## 10060 10060              rape      disgust
## 10061 10061              rape         fear
## 10062 10062              rape     negative
## 10063 10063              rape      sadness
## 10064 10064             rapid     surprise
## 10065 10065           rapping        anger
## 10066 10066              rapt          joy
## 10067 10067              rapt     positive
## 10068 10068              rapt     surprise
## 10069 10069              rapt        trust
## 10070 10070           raptors         fear
## 10071 10071           raptors     negative
## 10072 10072           rapture anticipation
## 10073 10073           rapture          joy
## 10074 10074           rapture     positive
## 10075 10075            rarity     surprise
## 10076 10076            rascal        anger
## 10077 10077            rascal      disgust
## 10078 10078            rascal         fear
## 10079 10079            rascal     negative
## 10080 10080              rash      disgust
## 10081 10081              rash     negative
## 10082 10082               rat      disgust
## 10083 10083               rat         fear
## 10084 10084               rat     negative
## 10085 10085            ratify        trust
## 10086 10086            rating        anger
## 10087 10087            rating         fear
## 10088 10088            rating     negative
## 10089 10089            rating      sadness
## 10090 10090          rational     positive
## 10091 10091          rational        trust
## 10092 10092       rattlesnake         fear
## 10093 10093           raucous     negative
## 10094 10094              rave        anger
## 10095 10095              rave      disgust
## 10096 10096              rave          joy
## 10097 10097              rave     negative
## 10098 10098              rave     positive
## 10099 10099              rave     surprise
## 10100 10100              rave        trust
## 10101 10101          ravenous        anger
## 10102 10102          ravenous         fear
## 10103 10103          ravenous     negative
## 10104 10104          ravenous      sadness
## 10105 10105            ravine         fear
## 10106 10106            raving        anger
## 10107 10107            raving anticipation
## 10108 10108            raving         fear
## 10109 10109            raving          joy
## 10110 10110            raving     negative
## 10111 10111            raving     surprise
## 10112 10112             razor         fear
## 10113 10113             react        anger
## 10114 10114             react         fear
## 10115 10115       reactionary     negative
## 10116 10116            reader     positive
## 10117 10117           readily     positive
## 10118 10118         readiness anticipation
## 10119 10119         readiness          joy
## 10120 10120         readiness     positive
## 10121 10121         readiness        trust
## 10122 10122           reading     positive
## 10123 10123             ready anticipation
## 10124 10124          reaffirm     positive
## 10125 10125              real     positive
## 10126 10126              real        trust
## 10127 10127          reappear     surprise
## 10128 10128              rear     negative
## 10129 10129            reason     positive
## 10130 10130       reassurance     positive
## 10131 10131       reassurance        trust
## 10132 10132          reassure     positive
## 10133 10133          reassure        trust
## 10134 10134            rebate     positive
## 10135 10135             rebel        anger
## 10136 10136             rebel         fear
## 10137 10137             rebel     negative
## 10138 10138         rebellion        anger
## 10139 10139         rebellion      disgust
## 10140 10140         rebellion         fear
## 10141 10141            rebuke     negative
## 10142 10142             rebut     negative
## 10143 10143      recalcitrant        anger
## 10144 10144      recalcitrant      disgust
## 10145 10145      recalcitrant     negative
## 10146 10146            recast     positive
## 10147 10147          received     positive
## 10148 10148         receiving anticipation
## 10149 10149         receiving          joy
## 10150 10150         receiving     positive
## 10151 10151         receiving     surprise
## 10152 10152          recesses         fear
## 10153 10153         recession        anger
## 10154 10154         recession      disgust
## 10155 10155         recession         fear
## 10156 10156         recession     negative
## 10157 10157         recession      sadness
## 10158 10158         recherche     positive
## 10159 10159        recidivism        anger
## 10160 10160        recidivism      disgust
## 10161 10161        recidivism     negative
## 10162 10162        recidivism      sadness
## 10163 10163         recipient anticipation
## 10164 10164       reciprocate     positive
## 10165 10165          reckless        anger
## 10166 10166          reckless         fear
## 10167 10167          reckless     negative
## 10168 10168      recklessness        anger
## 10169 10169      recklessness      disgust
## 10170 10170      recklessness         fear
## 10171 10171      recklessness     negative
## 10172 10172      recklessness     surprise
## 10173 10173       reclamation     positive
## 10174 10174           recline     positive
## 10175 10175           recline        trust
## 10176 10176      recognizable anticipation
## 10177 10177      recognizable     positive
## 10178 10178     recombination anticipation
## 10179 10179         recommend     positive
## 10180 10180         recommend        trust
## 10181 10181    reconciliation anticipation
## 10182 10182    reconciliation          joy
## 10183 10183    reconciliation     positive
## 10184 10184    reconciliation        trust
## 10185 10185   reconsideration     positive
## 10186 10186   reconsideration        trust
## 10187 10187       reconstruct anticipation
## 10188 10188       reconstruct     positive
## 10189 10189    reconstruction anticipation
## 10190 10190    reconstruction     positive
## 10191 10191          recorder     positive
## 10192 10192            recoup     positive
## 10193 10193          recovery     positive
## 10194 10194        recreation anticipation
## 10195 10195        recreation          joy
## 10196 10196        recreation     positive
## 10197 10197      recreational anticipation
## 10198 10198      recreational          joy
## 10199 10199      recreational     positive
## 10200 10200          recruits        trust
## 10201 10201           rectify     positive
## 10202 10202         recurrent anticipation
## 10203 10203        redemption     positive
## 10204 10204           redress     positive
## 10205 10205         redundant     negative
## 10206 10206           referee        trust
## 10207 10207            refine     positive
## 10208 10208        refinement     positive
## 10209 10209            reflex     surprise
## 10210 10210            reflux      disgust
## 10211 10211            reflux     negative
## 10212 10212            reform     positive
## 10213 10213       reformation     positive
## 10214 10214          reformer     positive
## 10215 10215        refractory     negative
## 10216 10216        refreshing     positive
## 10217 10217           refugee      sadness
## 10218 10218         refurbish     positive
## 10219 10219           refusal     negative
## 10220 10220            refuse     negative
## 10221 10221           refused     negative
## 10222 10222           refused      sadness
## 10223 10223        refutation         fear
## 10224 10224             regal     positive
## 10225 10225             regal        trust
## 10226 10226           regatta anticipation
## 10227 10227            regent     positive
## 10228 10228            regent        trust
## 10229 10229          regiment         fear
## 10230 10230          registry        trust
## 10231 10231           regress     negative
## 10232 10232        regression     negative
## 10233 10233        regressive     negative
## 10234 10234        regressive     positive
## 10235 10235            regret     negative
## 10236 10236            regret      sadness
## 10237 10237       regrettable     negative
## 10238 10238       regrettable      sadness
## 10239 10239         regretted     negative
## 10240 10240         regretted      sadness
## 10241 10241        regretting     negative
## 10242 10242        regretting      sadness
## 10243 10243        regularity anticipation
## 10244 10244        regularity     positive
## 10245 10245        regularity        trust
## 10246 10246          regulate     positive
## 10247 10247        regulatory         fear
## 10248 10248        regulatory     negative
## 10249 10249     regurgitation      disgust
## 10250 10250      rehabilitate     positive
## 10251 10251    rehabilitation anticipation
## 10252 10252    rehabilitation     positive
## 10253 10253         reimburse     positive
## 10254 10254     reimbursement     positive
## 10255 10255     reimbursement        trust
## 10256 10256              rein     negative
## 10257 10257     reinforcement     positive
## 10258 10258     reinforcement        trust
## 10259 10259    reinforcements        trust
## 10260 10260         reinstate     positive
## 10261 10261            reject        anger
## 10262 10262            reject         fear
## 10263 10263            reject     negative
## 10264 10264            reject      sadness
## 10265 10265          rejected     negative
## 10266 10266         rejection        anger
## 10267 10267         rejection      disgust
## 10268 10268         rejection         fear
## 10269 10269         rejection     negative
## 10270 10270         rejection      sadness
## 10271 10271           rejects        anger
## 10272 10272           rejects         fear
## 10273 10273           rejects     negative
## 10274 10274           rejects      sadness
## 10275 10275           rejoice anticipation
## 10276 10276           rejoice          joy
## 10277 10277           rejoice     positive
## 10278 10278           rejoice     surprise
## 10279 10279           rejoice        trust
## 10280 10280         rejoicing anticipation
## 10281 10281         rejoicing          joy
## 10282 10282         rejoicing     positive
## 10283 10283         rejoicing     surprise
## 10284 10284        rejuvenate     positive
## 10285 10285       rejuvenated     positive
## 10286 10286          rekindle anticipation
## 10287 10287          rekindle         fear
## 10288 10288          rekindle          joy
## 10289 10289          rekindle     negative
## 10290 10290          rekindle     positive
## 10291 10291          rekindle     surprise
## 10292 10292           relapse         fear
## 10293 10293           relapse     negative
## 10294 10294           relapse      sadness
## 10295 10295           related        trust
## 10296 10296          relative        trust
## 10297 10297        relaxation     positive
## 10298 10298        relegation     negative
## 10299 10299          relevant     positive
## 10300 10300          relevant        trust
## 10301 10301       reliability     positive
## 10302 10302       reliability        trust
## 10303 10303          reliable     positive
## 10304 10304          reliable        trust
## 10305 10305          reliance     positive
## 10306 10306          reliance        trust
## 10307 10307            relics      sadness
## 10308 10308            relief     positive
## 10309 10309         relieving     positive
## 10310 10310          religion        trust
## 10311 10311        relinquish     negative
## 10312 10312         reluctant         fear
## 10313 10313         reluctant     negative
## 10314 10314           remains      disgust
## 10315 10315           remains         fear
## 10316 10316           remains     negative
## 10317 10317           remains     positive
## 10318 10318           remains        trust
## 10319 10319            remake     positive
## 10320 10320            remand        anger
## 10321 10321            remand     negative
## 10322 10322        remarkable          joy
## 10323 10323        remarkable     positive
## 10324 10324        remarkable     surprise
## 10325 10325        remarkable        trust
## 10326 10326        remarkably     positive
## 10327 10327          remedial     negative
## 10328 10328            remedy anticipation
## 10329 10329            remedy          joy
## 10330 10330            remedy     positive
## 10331 10331            remedy        trust
## 10332 10332            remiss        anger
## 10333 10333            remiss      disgust
## 10334 10334            remiss     negative
## 10335 10335            remiss      sadness
## 10336 10336         remission     positive
## 10337 10337           remodel     positive
## 10338 10338           remorse     negative
## 10339 10339           remorse      sadness
## 10340 10340           removal     negative
## 10341 10341            remove        anger
## 10342 10342            remove         fear
## 10343 10343            remove     negative
## 10344 10344            remove      sadness
## 10345 10345       renaissance     positive
## 10346 10346         rencontre     negative
## 10347 10347              rend     negative
## 10348 10348            render     positive
## 10349 10349          renegade        anger
## 10350 10350          renegade     negative
## 10351 10351           renewal     positive
## 10352 10352          renounce        anger
## 10353 10353          renounce     negative
## 10354 10354          renovate anticipation
## 10355 10355          renovate     positive
## 10356 10356        renovation anticipation
## 10357 10357        renovation          joy
## 10358 10358        renovation     positive
## 10359 10359            renown     positive
## 10360 10360          renowned     positive
## 10361 10361      renunciation     negative
## 10362 10362        reorganize     positive
## 10363 10363        reparation     positive
## 10364 10364        reparation        trust
## 10365 10365             repay        anger
## 10366 10366             repay anticipation
## 10367 10367             repay          joy
## 10368 10368             repay     positive
## 10369 10369             repay        trust
## 10370 10370         repellant      disgust
## 10371 10371         repellant         fear
## 10372 10372         repellant     negative
## 10373 10373         repellent        anger
## 10374 10374         repellent      disgust
## 10375 10375         repellent         fear
## 10376 10376         repellent     negative
## 10377 10377         repelling      disgust
## 10378 10378         repelling     negative
## 10379 10379            repent         fear
## 10380 10380            repent     positive
## 10381 10381         replenish     positive
## 10382 10382           replete     positive
## 10383 10383          reporter     positive
## 10384 10384          reporter        trust
## 10385 10385            repose     positive
## 10386 10386       represented     positive
## 10387 10387      representing anticipation
## 10388 10388           repress     negative
## 10389 10389           repress      sadness
## 10390 10390        repression         fear
## 10391 10391        repression     negative
## 10392 10392         reprimand        anger
## 10393 10393         reprimand     negative
## 10394 10394           reprint     negative
## 10395 10395          reprisal        anger
## 10396 10396          reprisal         fear
## 10397 10397          reprisal     negative
## 10398 10398          reprisal      sadness
## 10399 10399          reproach        anger
## 10400 10400          reproach      disgust
## 10401 10401          reproach     negative
## 10402 10402          reproach      sadness
## 10403 10403      reproductive          joy
## 10404 10404      reproductive     positive
## 10405 10405          republic     negative
## 10406 10406       repudiation        anger
## 10407 10407       repudiation      disgust
## 10408 10408       repudiation     negative
## 10409 10409         repulsion      disgust
## 10410 10410         repulsion         fear
## 10411 10411         repulsion     negative
## 10412 10412         reputable     positive
## 10413 10413         reputable        trust
## 10414 10414           requiem      sadness
## 10415 10415           rescind     negative
## 10416 10416        rescission     negative
## 10417 10417            rescue anticipation
## 10418 10418            rescue          joy
## 10419 10419            rescue     positive
## 10420 10420            rescue     surprise
## 10421 10421            rescue        trust
## 10422 10422         resection         fear
## 10423 10423            resent        anger
## 10424 10424            resent     negative
## 10425 10425         resentful        anger
## 10426 10426         resentful     negative
## 10427 10427        resentment        anger
## 10428 10428        resentment      disgust
## 10429 10429        resentment     negative
## 10430 10430        resentment      sadness
## 10431 10431           reserve     positive
## 10432 10432          resident     positive
## 10433 10433            resign        anger
## 10434 10434            resign      disgust
## 10435 10435            resign         fear
## 10436 10436            resign     negative
## 10437 10437            resign      sadness
## 10438 10438       resignation     negative
## 10439 10439       resignation      sadness
## 10440 10440       resignation     surprise
## 10441 10441          resigned     negative
## 10442 10442          resigned      sadness
## 10443 10443         resilient     positive
## 10444 10444            resist     negative
## 10445 10445        resistance        anger
## 10446 10446        resistance     negative
## 10447 10447         resistant         fear
## 10448 10448         resistant     negative
## 10449 10449         resisting        anger
## 10450 10450         resisting         fear
## 10451 10451         resisting     negative
## 10452 10452         resisting      sadness
## 10453 10453         resistive     positive
## 10454 10454        resolutely     positive
## 10455 10455         resources          joy
## 10456 10456         resources     positive
## 10457 10457         resources        trust
## 10458 10458           respect anticipation
## 10459 10459           respect          joy
## 10460 10460           respect     positive
## 10461 10461           respect        trust
## 10462 10462    respectability     positive
## 10463 10463       respectable     positive
## 10464 10464       respectable        trust
## 10465 10465        respectful     positive
## 10466 10466        respectful        trust
## 10467 10467        respecting     positive
## 10468 10468          respects     positive
## 10469 10469          respects        trust
## 10470 10470           respite          joy
## 10471 10471           respite     positive
## 10472 10472           respite        trust
## 10473 10473       resplendent          joy
## 10474 10474       resplendent     positive
## 10475 10475       responsible     positive
## 10476 10476       responsible        trust
## 10477 10477        responsive anticipation
## 10478 10478        responsive     positive
## 10479 10479        responsive        trust
## 10480 10480              rest     positive
## 10481 10481           restful     positive
## 10482 10482       restitution        anger
## 10483 10483       restitution     positive
## 10484 10484      restlessness anticipation
## 10485 10485       restorative anticipation
## 10486 10486       restorative          joy
## 10487 10487       restorative     positive
## 10488 10488       restorative        trust
## 10489 10489         restoring     positive
## 10490 10490          restrain        anger
## 10491 10491          restrain         fear
## 10492 10492          restrain     negative
## 10493 10493        restrained         fear
## 10494 10494         restraint     positive
## 10495 10495          restrict     negative
## 10496 10496          restrict      sadness
## 10497 10497       restriction        anger
## 10498 10498       restriction         fear
## 10499 10499       restriction     negative
## 10500 10500       restriction      sadness
## 10501 10501       restrictive     negative
## 10502 10502            result anticipation
## 10503 10503         resultant anticipation
## 10504 10504        resumption     positive
## 10505 10505            retain        trust
## 10506 10506         retaliate        anger
## 10507 10507         retaliate     negative
## 10508 10508       retaliation        anger
## 10509 10509       retaliation         fear
## 10510 10510       retaliation     negative
## 10511 10511       retaliatory        anger
## 10512 10512       retaliatory     negative
## 10513 10513            retard      disgust
## 10514 10514            retard         fear
## 10515 10515            retard     negative
## 10516 10516            retard      sadness
## 10517 10517       retardation     negative
## 10518 10518         retention     positive
## 10519 10519          reticent         fear
## 10520 10520          reticent     negative
## 10521 10521        retirement anticipation
## 10522 10522        retirement         fear
## 10523 10523        retirement          joy
## 10524 10524        retirement     negative
## 10525 10525        retirement     positive
## 10526 10526        retirement      sadness
## 10527 10527        retirement        trust
## 10528 10528            retort     negative
## 10529 10529           retract        anger
## 10530 10530           retract     negative
## 10531 10531        retraction     negative
## 10532 10532      retrenchment         fear
## 10533 10533      retrenchment     negative
## 10534 10534       retribution        anger
## 10535 10535       retribution         fear
## 10536 10536       retribution     negative
## 10537 10537       retribution      sadness
## 10538 10538        retrograde     negative
## 10539 10539           reunion anticipation
## 10540 10540           reunion     positive
## 10541 10541           reunion        trust
## 10542 10542             revel          joy
## 10543 10543             revel     positive
## 10544 10544            revels          joy
## 10545 10545            revels     positive
## 10546 10546           revenge        anger
## 10547 10547           revenge anticipation
## 10548 10548           revenge         fear
## 10549 10549           revenge     negative
## 10550 10550           revenge     surprise
## 10551 10551            revere anticipation
## 10552 10552            revere          joy
## 10553 10553            revere     positive
## 10554 10554            revere        trust
## 10555 10555         reverence          joy
## 10556 10556         reverence     positive
## 10557 10557         reverence        trust
## 10558 10558          reverend          joy
## 10559 10559          reverend     positive
## 10560 10560           reverie          joy
## 10561 10561           reverie     positive
## 10562 10562           reverie        trust
## 10563 10563          reversal        anger
## 10564 10564          reversal      disgust
## 10565 10565          reversal     negative
## 10566 10566          reversal     surprise
## 10567 10567            revise     positive
## 10568 10568           revival anticipation
## 10569 10569           revival          joy
## 10570 10570           revival     positive
## 10571 10571           revival        trust
## 10572 10572            revive anticipation
## 10573 10573            revive     negative
## 10574 10574            revive     positive
## 10575 10575        revocation     negative
## 10576 10576            revoke        anger
## 10577 10577            revoke      disgust
## 10578 10578            revoke         fear
## 10579 10579            revoke     negative
## 10580 10580            revoke      sadness
## 10581 10581            revolt        anger
## 10582 10582            revolt     negative
## 10583 10583            revolt     surprise
## 10584 10584         revolting        anger
## 10585 10585         revolting      disgust
## 10586 10586         revolting         fear
## 10587 10587         revolting     negative
## 10588 10588        revolution        anger
## 10589 10589        revolution anticipation
## 10590 10590        revolution         fear
## 10591 10591        revolution     negative
## 10592 10592        revolution     positive
## 10593 10593        revolution      sadness
## 10594 10594        revolution     surprise
## 10595 10595     revolutionary     positive
## 10596 10596          revolver        anger
## 10597 10597          revolver         fear
## 10598 10598          revolver     negative
## 10599 10599          revolver      sadness
## 10600 10600         revulsion        anger
## 10601 10601         revulsion      disgust
## 10602 10602         revulsion         fear
## 10603 10603         revulsion     negative
## 10604 10604            reward anticipation
## 10605 10605            reward          joy
## 10606 10606            reward     positive
## 10607 10607            reward     surprise
## 10608 10608            reward        trust
## 10609 10609        rheumatism        anger
## 10610 10610        rheumatism         fear
## 10611 10611        rheumatism     negative
## 10612 10612        rheumatism      sadness
## 10613 10613            rhythm     positive
## 10614 10614        rhythmical          joy
## 10615 10615        rhythmical     positive
## 10616 10616        rhythmical     surprise
## 10617 10617            ribbon        anger
## 10618 10618            ribbon anticipation
## 10619 10619            ribbon          joy
## 10620 10620            ribbon     positive
## 10621 10621          richness     positive
## 10622 10622           rickety     negative
## 10623 10623            riddle     surprise
## 10624 10624           riddled     negative
## 10625 10625             rider     positive
## 10626 10626          ridicule        anger
## 10627 10627          ridicule      disgust
## 10628 10628          ridicule     negative
## 10629 10629          ridicule      sadness
## 10630 10630        ridiculous        anger
## 10631 10631        ridiculous      disgust
## 10632 10632        ridiculous     negative
## 10633 10633              rife     negative
## 10634 10634             rifle        anger
## 10635 10635             rifle         fear
## 10636 10636             rifle     negative
## 10637 10637              rift     negative
## 10638 10638         righteous     positive
## 10639 10639          rightful     positive
## 10640 10640           rightly     positive
## 10641 10641             rigid     negative
## 10642 10642          rigidity     negative
## 10643 10643             rigor      disgust
## 10644 10644             rigor         fear
## 10645 10645             rigor     negative
## 10646 10646          rigorous     negative
## 10647 10647            ringer        anger
## 10648 10648            ringer     negative
## 10649 10649              riot        anger
## 10650 10650              riot         fear
## 10651 10651              riot     negative
## 10652 10652           riotous        anger
## 10653 10653           riotous         fear
## 10654 10654           riotous     negative
## 10655 10655           riotous     surprise
## 10656 10656              ripe     positive
## 10657 10657             ripen anticipation
## 10658 10658             ripen     positive
## 10659 10659            rising anticipation
## 10660 10660            rising          joy
## 10661 10661            rising     positive
## 10662 10662              risk anticipation
## 10663 10663              risk         fear
## 10664 10664              risk     negative
## 10665 10665             risky anticipation
## 10666 10666             risky         fear
## 10667 10667             risky     negative
## 10668 10668           rivalry        anger
## 10669 10669           rivalry     negative
## 10670 10670          riveting     positive
## 10671 10671          roadster          joy
## 10672 10672          roadster     positive
## 10673 10673          roadster        trust
## 10674 10674               rob        anger
## 10675 10675               rob      disgust
## 10676 10676               rob         fear
## 10677 10677               rob     negative
## 10678 10678               rob      sadness
## 10679 10679            robber      disgust
## 10680 10680            robber         fear
## 10681 10681            robber     negative
## 10682 10682           robbery        anger
## 10683 10683           robbery      disgust
## 10684 10684           robbery         fear
## 10685 10685           robbery     negative
## 10686 10686           robbery      sadness
## 10687 10687            robust     positive
## 10688 10688              rock     positive
## 10689 10689            rocket        anger
## 10690 10690               rod         fear
## 10691 10691               rod     positive
## 10692 10692               rod        trust
## 10693 10693             rogue      disgust
## 10694 10694             rogue     negative
## 10695 10695        rollicking          joy
## 10696 10696        rollicking     positive
## 10697 10697           romance anticipation
## 10698 10698           romance         fear
## 10699 10699           romance          joy
## 10700 10700           romance     positive
## 10701 10701           romance      sadness
## 10702 10702           romance     surprise
## 10703 10703           romance        trust
## 10704 10704          romantic anticipation
## 10705 10705          romantic          joy
## 10706 10706          romantic     positive
## 10707 10707          romantic        trust
## 10708 10708       romanticism          joy
## 10709 10709       romanticism     positive
## 10710 10710              romp          joy
## 10711 10711              romp     positive
## 10712 10712              rook        anger
## 10713 10713              rook      disgust
## 10714 10714              rook     negative
## 10715 10715            rooted     positive
## 10716 10716            rooted        trust
## 10717 10717              rosy     positive
## 10718 10718               rot      disgust
## 10719 10719               rot         fear
## 10720 10720               rot     negative
## 10721 10721               rot      sadness
## 10722 10722              rota     positive
## 10723 10723              rota        trust
## 10724 10724           rotting      disgust
## 10725 10725           rotting     negative
## 10726 10726         roughness     negative
## 10727 10727          roulette anticipation
## 10728 10728              rout     negative
## 10729 10729           routine     positive
## 10730 10730           routine        trust
## 10731 10731               row        anger
## 10732 10732               row     negative
## 10733 10733             rowdy     negative
## 10734 10734           royalty     positive
## 10735 10735           rubbish      disgust
## 10736 10736           rubbish     negative
## 10737 10737            rubble         fear
## 10738 10738            rubble     negative
## 10739 10739            rubble      sadness
## 10740 10740            rubric     positive
## 10741 10741               rue     negative
## 10742 10742               rue      sadness
## 10743 10743            ruffle     negative
## 10744 10744            rugged     negative
## 10745 10745              ruin         fear
## 10746 10746              ruin     negative
## 10747 10747              ruin      sadness
## 10748 10748            ruined        anger
## 10749 10749            ruined      disgust
## 10750 10750            ruined         fear
## 10751 10751            ruined     negative
## 10752 10752            ruined      sadness
## 10753 10753           ruinous        anger
## 10754 10754           ruinous      disgust
## 10755 10755           ruinous         fear
## 10756 10756           ruinous     negative
## 10757 10757           ruinous      sadness
## 10758 10758              rule         fear
## 10759 10759              rule        trust
## 10760 10760             rumor     negative
## 10761 10761             rumor      sadness
## 10762 10762           runaway     negative
## 10763 10763           runaway      sadness
## 10764 10764           rupture         fear
## 10765 10765           rupture     negative
## 10766 10766           rupture      sadness
## 10767 10767           rupture     surprise
## 10768 10768              ruse     negative
## 10769 10769              rust     negative
## 10770 10770             rusty     negative
## 10771 10771              ruth     positive
## 10772 10772          ruthless        anger
## 10773 10773          ruthless      disgust
## 10774 10774          ruthless         fear
## 10775 10775          ruthless     negative
## 10776 10776             saber        anger
## 10777 10777             saber         fear
## 10778 10778             saber     negative
## 10779 10779          sabotage        anger
## 10780 10780          sabotage      disgust
## 10781 10781          sabotage         fear
## 10782 10782          sabotage     negative
## 10783 10783          sabotage      sadness
## 10784 10784          sabotage     surprise
## 10785 10785        sacrifices      disgust
## 10786 10786        sacrifices         fear
## 10787 10787        sacrifices     negative
## 10788 10788        sacrifices      sadness
## 10789 10789             sadly     negative
## 10790 10790             sadly      sadness
## 10791 10791           sadness     negative
## 10792 10792           sadness      sadness
## 10793 10793           sadness        trust
## 10794 10794              safe          joy
## 10795 10795              safe     positive
## 10796 10796              safe        trust
## 10797 10797         safeguard     positive
## 10798 10798         safeguard        trust
## 10799 10799       safekeeping        trust
## 10800 10800               sag         fear
## 10801 10801               sag     negative
## 10802 10802              sage     positive
## 10803 10803              sage        trust
## 10804 10804             saint anticipation
## 10805 10805             saint          joy
## 10806 10806             saint     positive
## 10807 10807             saint     surprise
## 10808 10808             saint        trust
## 10809 10809           saintly anticipation
## 10810 10810           saintly          joy
## 10811 10811           saintly     positive
## 10812 10812           saintly     surprise
## 10813 10813           saintly        trust
## 10814 10814            salary anticipation
## 10815 10815            salary          joy
## 10816 10816            salary     positive
## 10817 10817            salary        trust
## 10818 10818           salient     positive
## 10819 10819            saliva anticipation
## 10820 10820             sally     surprise
## 10821 10821            saloon        anger
## 10822 10822          salutary          joy
## 10823 10823          salutary     positive
## 10824 10824          salutary        trust
## 10825 10825            salute          joy
## 10826 10826            salute     positive
## 10827 10827         salvation anticipation
## 10828 10828         salvation          joy
## 10829 10829         salvation     positive
## 10830 10830         salvation        trust
## 10831 10831             salve     positive
## 10832 10832           samurai         fear
## 10833 10833           samurai     positive
## 10834 10834    sanctification          joy
## 10835 10835    sanctification     positive
## 10836 10836    sanctification        trust
## 10837 10837          sanctify anticipation
## 10838 10838          sanctify          joy
## 10839 10839          sanctify     positive
## 10840 10840          sanctify      sadness
## 10841 10841          sanctify     surprise
## 10842 10842          sanctify        trust
## 10843 10843         sanctuary anticipation
## 10844 10844         sanctuary          joy
## 10845 10845         sanctuary     positive
## 10846 10846         sanctuary        trust
## 10847 10847          sanguine     positive
## 10848 10848          sanitary     positive
## 10849 10849               sap     negative
## 10850 10850               sap      sadness
## 10851 10851             sappy        trust
## 10852 10852           sarcasm        anger
## 10853 10853           sarcasm      disgust
## 10854 10854           sarcasm     negative
## 10855 10855           sarcasm      sadness
## 10856 10856           sarcoma         fear
## 10857 10857           sarcoma     negative
## 10858 10858           sarcoma      sadness
## 10859 10859          sardonic     negative
## 10860 10860           satanic        anger
## 10861 10861           satanic     negative
## 10862 10862             satin     positive
## 10863 10863    satisfactorily     positive
## 10864 10864         satisfied          joy
## 10865 10865         satisfied     positive
## 10866 10866         saturated      disgust
## 10867 10867         saturated     negative
## 10868 10868            savage        anger
## 10869 10869            savage         fear
## 10870 10870            savage     negative
## 10871 10871          savagery        anger
## 10872 10872          savagery         fear
## 10873 10873          savagery     negative
## 10874 10874              save          joy
## 10875 10875              save     positive
## 10876 10876              save        trust
## 10877 10877           savings     positive
## 10878 10878             savor anticipation
## 10879 10879             savor      disgust
## 10880 10880             savor          joy
## 10881 10881             savor     positive
## 10882 10882             savor      sadness
## 10883 10883             savor        trust
## 10884 10884            savory     positive
## 10885 10885             savvy     positive
## 10886 10886              scab     negative
## 10887 10887          scaffold         fear
## 10888 10888          scaffold     negative
## 10889 10889           scalpel         fear
## 10890 10890           scalpel     negative
## 10891 10891             scaly     negative
## 10892 10892           scandal         fear
## 10893 10893           scandal     negative
## 10894 10894        scandalous        anger
## 10895 10895        scandalous     negative
## 10896 10896            scanty     negative
## 10897 10897         scapegoat        anger
## 10898 10898         scapegoat         fear
## 10899 10899         scapegoat     negative
## 10900 10900              scar        anger
## 10901 10901              scar      disgust
## 10902 10902              scar         fear
## 10903 10903              scar     negative
## 10904 10904              scar      sadness
## 10905 10905            scarce         fear
## 10906 10906            scarce     negative
## 10907 10907            scarce      sadness
## 10908 10908          scarcely     negative
## 10909 10909          scarcely      sadness
## 10910 10910          scarcity        anger
## 10911 10911          scarcity         fear
## 10912 10912          scarcity     negative
## 10913 10913          scarcity      sadness
## 10914 10914             scare        anger
## 10915 10915             scare anticipation
## 10916 10916             scare         fear
## 10917 10917             scare     negative
## 10918 10918             scare     surprise
## 10919 10919         scarecrow         fear
## 10920 10920         scarecrow     negative
## 10921 10921         scarecrow     positive
## 10922 10922         scavenger     negative
## 10923 10923         sceptical        trust
## 10924 10924            scheme     negative
## 10925 10925            schism        anger
## 10926 10926            schism     negative
## 10927 10927     schizophrenia        anger
## 10928 10928     schizophrenia      disgust
## 10929 10929     schizophrenia         fear
## 10930 10930     schizophrenia     negative
## 10931 10931     schizophrenia      sadness
## 10932 10932           scholar     positive
## 10933 10933       scholarship          joy
## 10934 10934       scholarship     positive
## 10935 10935            school        trust
## 10936 10936          sciatica     negative
## 10937 10937        scientific     positive
## 10938 10938        scientific        trust
## 10939 10939         scientist anticipation
## 10940 10940         scientist     positive
## 10941 10941         scientist        trust
## 10942 10942         scintilla     positive
## 10943 10943             scoff        anger
## 10944 10944             scoff      disgust
## 10945 10945             scoff     negative
## 10946 10946             scold        anger
## 10947 10947             scold      disgust
## 10948 10948             scold         fear
## 10949 10949             scold     negative
## 10950 10950             scold      sadness
## 10951 10951          scolding        anger
## 10952 10952          scolding     negative
## 10953 10953         scorching        anger
## 10954 10954         scorching     negative
## 10955 10955             score anticipation
## 10956 10956             score          joy
## 10957 10957             score     positive
## 10958 10958             score     surprise
## 10959 10959             scorn        anger
## 10960 10960             scorn     negative
## 10961 10961          scorpion        anger
## 10962 10962          scorpion      disgust
## 10963 10963          scorpion         fear
## 10964 10964          scorpion     negative
## 10965 10965          scorpion     surprise
## 10966 10966            scotch     negative
## 10967 10967         scoundrel        anger
## 10968 10968         scoundrel      disgust
## 10969 10969         scoundrel         fear
## 10970 10970         scoundrel     negative
## 10971 10971         scoundrel        trust
## 10972 10972           scourge        anger
## 10973 10973           scourge         fear
## 10974 10974           scourge     negative
## 10975 10975           scourge      sadness
## 10976 10976        scrambling     negative
## 10977 10977           scrapie        anger
## 10978 10978           scrapie         fear
## 10979 10979           scrapie     negative
## 10980 10980           scrapie      sadness
## 10981 10981            scream        anger
## 10982 10982            scream      disgust
## 10983 10983            scream         fear
## 10984 10984            scream     negative
## 10985 10985            scream     surprise
## 10986 10986         screaming        anger
## 10987 10987         screaming      disgust
## 10988 10988         screaming         fear
## 10989 10989         screaming     negative
## 10990 10990           screech         fear
## 10991 10991           screech     negative
## 10992 10992           screech     surprise
## 10993 10993           screwed        anger
## 10994 10994           screwed     negative
## 10995 10995            scribe     positive
## 10996 10996         scrimmage     negative
## 10997 10997         scrimmage     surprise
## 10998 10998            script     positive
## 10999 10999         scripture        trust
## 11000 11000             scrub      disgust
## 11001 11001             scrub     negative
## 11002 11002       scrumptious     positive
## 11003 11003        scrutinize anticipation
## 11004 11004        scrutinize     negative
## 11005 11005          scrutiny     negative
## 11006 11006         sculpture     positive
## 11007 11007              scum      disgust
## 11008 11008              scum     negative
## 11009 11009               sea     positive
## 11010 11010              seal     positive
## 11011 11011              seal        trust
## 11012 11012             seals        trust
## 11013 11013              sear     negative
## 11014 11014          seasoned     positive
## 11015 11015         secession     negative
## 11016 11016          secluded     negative
## 11017 11017          secluded      sadness
## 11018 11018         seclusion         fear
## 11019 11019         seclusion     negative
## 11020 11020         seclusion     positive
## 11021 11021        secondhand     negative
## 11022 11022           secrecy     surprise
## 11023 11023           secrecy        trust
## 11024 11024            secret        trust
## 11025 11025       secretariat     positive
## 11026 11026           secrete      disgust
## 11027 11027         secretion      disgust
## 11028 11028         secretion     negative
## 11029 11029         secretive     negative
## 11030 11030         sectarian        anger
## 11031 11031         sectarian         fear
## 11032 11032         sectarian     negative
## 11033 11033           secular anticipation
## 11034 11034        securities        trust
## 11035 11035          sedition        anger
## 11036 11036          sedition     negative
## 11037 11037          sedition      sadness
## 11038 11038            seduce     negative
## 11039 11039         seduction     negative
## 11040 11040         seductive anticipation
## 11041 11041              seek anticipation
## 11042 11042         segregate        anger
## 11043 11043         segregate      disgust
## 11044 11044         segregate     negative
## 11045 11045         segregate      sadness
## 11046 11046        segregated     negative
## 11047 11047             seize         fear
## 11048 11048             seize     negative
## 11049 11049           seizure         fear
## 11050 11050           selfish        anger
## 11051 11051           selfish      disgust
## 11052 11052           selfish     negative
## 11053 11053       selfishness     negative
## 11054 11054            senate        trust
## 11055 11055            senile         fear
## 11056 11056            senile     negative
## 11057 11057            senile      sadness
## 11058 11058         seniority     positive
## 11059 11059         seniority        trust
## 11060 11060       sensational          joy
## 11061 11061       sensational     positive
## 11062 11062             sense     positive
## 11063 11063         senseless        anger
## 11064 11064         senseless      disgust
## 11065 11065         senseless         fear
## 11066 11066         senseless     negative
## 11067 11067         senseless      sadness
## 11068 11068         senseless     surprise
## 11069 11069       sensibility     positive
## 11070 11070          sensibly     positive
## 11071 11071           sensual anticipation
## 11072 11072           sensual          joy
## 11073 11073           sensual     negative
## 11074 11074           sensual     positive
## 11075 11075           sensual     surprise
## 11076 11076           sensual        trust
## 11077 11077        sensuality anticipation
## 11078 11078        sensuality          joy
## 11079 11079        sensuality     positive
## 11080 11080          sensuous          joy
## 11081 11081          sensuous     positive
## 11082 11082          sentence        anger
## 11083 11083          sentence anticipation
## 11084 11084          sentence      disgust
## 11085 11085          sentence         fear
## 11086 11086          sentence     negative
## 11087 11087          sentence      sadness
## 11088 11088       sentimental     positive
## 11089 11089    sentimentality     positive
## 11090 11090          sentinel     positive
## 11091 11091          sentinel        trust
## 11092 11092            sentry        trust
## 11093 11093        separatist        anger
## 11094 11094        separatist      disgust
## 11095 11095        separatist     negative
## 11096 11096            sepsis         fear
## 11097 11097            sepsis     negative
## 11098 11098            sepsis      sadness
## 11099 11099            septic      disgust
## 11100 11100            septic     negative
## 11101 11101            sequel anticipation
## 11102 11102     sequestration     negative
## 11103 11103     sequestration      sadness
## 11104 11104            serene     negative
## 11105 11105            serene        trust
## 11106 11106          serenity anticipation
## 11107 11107          serenity          joy
## 11108 11108          serenity     positive
## 11109 11109          serenity        trust
## 11110 11110            serial anticipation
## 11111 11111            series        trust
## 11112 11112       seriousness         fear
## 11113 11113       seriousness      sadness
## 11114 11114            sermon     positive
## 11115 11115            sermon        trust
## 11116 11116           serpent      disgust
## 11117 11117           serpent         fear
## 11118 11118           serpent     negative
## 11119 11119             serum     positive
## 11120 11120           servant     negative
## 11121 11121           servant        trust
## 11122 11122             serve     negative
## 11123 11123             serve        trust
## 11124 11124           servile      disgust
## 11125 11125           servile         fear
## 11126 11126           servile     negative
## 11127 11127           servile      sadness
## 11128 11128         servitude     negative
## 11129 11129           setback     negative
## 11130 11130           setback      sadness
## 11131 11131           settlor         fear
## 11132 11132           settlor     positive
## 11133 11133             sever     negative
## 11134 11134         severance      sadness
## 11135 11135            sewage      disgust
## 11136 11136            sewage     negative
## 11137 11137             sewer      disgust
## 11138 11138          sewerage      disgust
## 11139 11139          sewerage     negative
## 11140 11140               sex anticipation
## 11141 11141               sex          joy
## 11142 11142               sex     positive
## 11143 11143               sex        trust
## 11144 11144            shabby      disgust
## 11145 11145            shabby     negative
## 11146 11146             shack      disgust
## 11147 11147             shack     negative
## 11148 11148             shack      sadness
## 11149 11149           shackle        anger
## 11150 11150           shackle anticipation
## 11151 11151           shackle      disgust
## 11152 11152           shackle         fear
## 11153 11153           shackle     negative
## 11154 11154           shackle      sadness
## 11155 11155             shady         fear
## 11156 11156             shady     negative
## 11157 11157           shaking         fear
## 11158 11158           shaking     negative
## 11159 11159             shaky        anger
## 11160 11160             shaky anticipation
## 11161 11161             shaky         fear
## 11162 11162             shaky     negative
## 11163 11163              sham        anger
## 11164 11164              sham      disgust
## 11165 11165              sham     negative
## 11166 11166          shambles     negative
## 11167 11167             shame      disgust
## 11168 11168             shame         fear
## 11169 11169             shame     negative
## 11170 11170             shame      sadness
## 11171 11171          shameful     negative
## 11172 11172          shameful      sadness
## 11173 11173         shameless      disgust
## 11174 11174         shameless     negative
## 11175 11175          shanghai      disgust
## 11176 11176          shanghai         fear
## 11177 11177          shanghai     negative
## 11178 11178             shank         fear
## 11179 11179             shape     positive
## 11180 11180           shapely     positive
## 11181 11181             share anticipation
## 11182 11182             share          joy
## 11183 11183             share     positive
## 11184 11184             share        trust
## 11185 11185             shark     negative
## 11186 11186           sharpen        anger
## 11187 11187           sharpen anticipation
## 11188 11188           shatter        anger
## 11189 11189           shatter         fear
## 11190 11190           shatter     negative
## 11191 11191           shatter      sadness
## 11192 11192           shatter     surprise
## 11193 11193         shattered     negative
## 11194 11194         shattered      sadness
## 11195 11195              shed     negative
## 11196 11196             shell        anger
## 11197 11197             shell         fear
## 11198 11198             shell     negative
## 11199 11199             shell      sadness
## 11200 11200             shell     surprise
## 11201 11201           shelter     positive
## 11202 11202           shelter        trust
## 11203 11203           shelved     negative
## 11204 11204          shepherd     positive
## 11205 11205          shepherd        trust
## 11206 11206           sheriff        trust
## 11207 11207             shine     positive
## 11208 11208           shining anticipation
## 11209 11209           shining          joy
## 11210 11210           shining     positive
## 11211 11211              ship anticipation
## 11212 11212         shipwreck         fear
## 11213 11213         shipwreck     negative
## 11214 11214         shipwreck      sadness
## 11215 11215              shit        anger
## 11216 11216              shit      disgust
## 11217 11217              shit     negative
## 11218 11218            shiver        anger
## 11219 11219            shiver anticipation
## 11220 11220            shiver         fear
## 11221 11221            shiver     negative
## 11222 11222            shiver      sadness
## 11223 11223             shock        anger
## 11224 11224             shock         fear
## 11225 11225             shock     negative
## 11226 11226             shock     surprise
## 11227 11227        shockingly     surprise
## 11228 11228            shoddy        anger
## 11229 11229            shoddy      disgust
## 11230 11230            shoddy     negative
## 11231 11231             shoot        anger
## 11232 11232             shoot         fear
## 11233 11233             shoot     negative
## 11234 11234           shooter         fear
## 11235 11235          shooting        anger
## 11236 11236          shooting         fear
## 11237 11237          shooting     negative
## 11238 11238        shopkeeper        trust
## 11239 11239       shoplifting        anger
## 11240 11240       shoplifting      disgust
## 11241 11241       shoplifting     negative
## 11242 11242          shopping anticipation
## 11243 11243          shopping          joy
## 11244 11244          shopping     positive
## 11245 11245          shopping     surprise
## 11246 11246          shopping        trust
## 11247 11247          shortage        anger
## 11248 11248          shortage         fear
## 11249 11249          shortage     negative
## 11250 11250          shortage      sadness
## 11251 11251       shortcoming     negative
## 11252 11252           shortly anticipation
## 11253 11253              shot        anger
## 11254 11254              shot         fear
## 11255 11255              shot     negative
## 11256 11256              shot      sadness
## 11257 11257              shot     surprise
## 11258 11258          shoulder     positive
## 11259 11259          shoulder        trust
## 11260 11260             shout        anger
## 11261 11261             shout     surprise
## 11262 11262             shove        anger
## 11263 11263             shove     negative
## 11264 11264              show        trust
## 11265 11265             showy     negative
## 11266 11266          shrapnel         fear
## 11267 11267            shrewd     positive
## 11268 11268            shriek        anger
## 11269 11269            shriek         fear
## 11270 11270            shriek     negative
## 11271 11271            shriek      sadness
## 11272 11272            shriek     surprise
## 11273 11273            shrill        anger
## 11274 11274            shrill         fear
## 11275 11275            shrill     negative
## 11276 11276            shrill     surprise
## 11277 11277            shrink         fear
## 11278 11278            shrink     negative
## 11279 11279            shrink      sadness
## 11280 11280            shroud      sadness
## 11281 11281            shrunk     negative
## 11282 11282           shudder         fear
## 11283 11283           shudder     negative
## 11284 11284              shun        anger
## 11285 11285              shun      disgust
## 11286 11286              shun     negative
## 11287 11287              shun      sadness
## 11288 11288               sib        trust
## 11289 11289              sick      disgust
## 11290 11290              sick     negative
## 11291 11291              sick      sadness
## 11292 11292         sickening        anger
## 11293 11293         sickening      disgust
## 11294 11294         sickening         fear
## 11295 11295         sickening     negative
## 11296 11296         sickening      sadness
## 11297 11297            sickly      disgust
## 11298 11298            sickly     negative
## 11299 11299            sickly      sadness
## 11300 11300          sickness      disgust
## 11301 11301          sickness         fear
## 11302 11302          sickness     negative
## 11303 11303          sickness      sadness
## 11304 11304         signature        trust
## 11305 11305           signify anticipation
## 11306 11306              silk     positive
## 11307 11307             silly          joy
## 11308 11308             silly     negative
## 11309 11309            simmer        anger
## 11310 11310            simmer anticipation
## 11311 11311         simmering anticipation
## 11312 11312          simplify anticipation
## 11313 11313          simplify          joy
## 11314 11314          simplify     positive
## 11315 11315          simplify     surprise
## 11316 11316          simplify        trust
## 11317 11317               sin        anger
## 11318 11318               sin      disgust
## 11319 11319               sin         fear
## 11320 11320               sin     negative
## 11321 11321               sin      sadness
## 11322 11322           sincere     positive
## 11323 11323           sincere        trust
## 11324 11324         sincerity     positive
## 11325 11325            sinful        anger
## 11326 11326            sinful      disgust
## 11327 11327            sinful         fear
## 11328 11328            sinful     negative
## 11329 11329            sinful      sadness
## 11330 11330              sing anticipation
## 11331 11331              sing          joy
## 11332 11332              sing     positive
## 11333 11333              sing      sadness
## 11334 11334              sing        trust
## 11335 11335            singly     positive
## 11336 11336        singularly     surprise
## 11337 11337          sinister        anger
## 11338 11338          sinister      disgust
## 11339 11339          sinister         fear
## 11340 11340          sinister     negative
## 11341 11341            sinner        anger
## 11342 11342            sinner      disgust
## 11343 11343            sinner         fear
## 11344 11344            sinner     negative
## 11345 11345            sinner      sadness
## 11346 11346           sinning      disgust
## 11347 11347           sinning     negative
## 11348 11348               sir     positive
## 11349 11349               sir        trust
## 11350 11350             siren         fear
## 11351 11351             siren     negative
## 11352 11352             sissy     negative
## 11353 11353        sisterhood        anger
## 11354 11354        sisterhood     positive
## 11355 11355        sisterhood      sadness
## 11356 11356        sisterhood     surprise
## 11357 11357        sisterhood        trust
## 11358 11358            sizzle        anger
## 11359 11359         skeptical     negative
## 11360 11360           sketchy     negative
## 11361 11361            skewed        anger
## 11362 11362            skewed anticipation
## 11363 11363            skewed     negative
## 11364 11364              skid        anger
## 11365 11365              skid         fear
## 11366 11366              skid     negative
## 11367 11367              skid      sadness
## 11368 11368           skilled     positive
## 11369 11369          skillful     positive
## 11370 11370          skillful        trust
## 11371 11371              skip     negative
## 11372 11372          skirmish        anger
## 11373 11373          skirmish     negative
## 11374 11374               sky     positive
## 11375 11375             slack     negative
## 11376 11376              slag     negative
## 11377 11377              slam        anger
## 11378 11378              slam         fear
## 11379 11379              slam     negative
## 11380 11380              slam     surprise
## 11381 11381           slander        anger
## 11382 11382           slander      disgust
## 11383 11383           slander     negative
## 11384 11384        slanderous     negative
## 11385 11385              slap        anger
## 11386 11386              slap     negative
## 11387 11387              slap     surprise
## 11388 11388             slash        anger
## 11389 11389             slate     positive
## 11390 11390         slaughter        anger
## 11391 11391         slaughter      disgust
## 11392 11392         slaughter         fear
## 11393 11393         slaughter     negative
## 11394 11394         slaughter      sadness
## 11395 11395         slaughter     surprise
## 11396 11396    slaughterhouse        anger
## 11397 11397    slaughterhouse      disgust
## 11398 11398    slaughterhouse         fear
## 11399 11399    slaughterhouse     negative
## 11400 11400    slaughterhouse      sadness
## 11401 11401      slaughtering        anger
## 11402 11402      slaughtering      disgust
## 11403 11403      slaughtering         fear
## 11404 11404      slaughtering     negative
## 11405 11405      slaughtering      sadness
## 11406 11406      slaughtering     surprise
## 11407 11407             slave        anger
## 11408 11408             slave         fear
## 11409 11409             slave     negative
## 11410 11410             slave      sadness
## 11411 11411           slavery        anger
## 11412 11412           slavery      disgust
## 11413 11413           slavery         fear
## 11414 11414           slavery     negative
## 11415 11415           slavery      sadness
## 11416 11416              slay        anger
## 11417 11417              slay     negative
## 11418 11418            slayer        anger
## 11419 11419            slayer      disgust
## 11420 11420            slayer         fear
## 11421 11421            slayer     negative
## 11422 11422            slayer      sadness
## 11423 11423            slayer     surprise
## 11424 11424             sleek     positive
## 11425 11425             sleet     negative
## 11426 11426           slender     positive
## 11427 11427              slim     positive
## 11428 11428             slime      disgust
## 11429 11429             slimy      disgust
## 11430 11430             slimy     negative
## 11431 11431             slink     negative
## 11432 11432              slip     negative
## 11433 11433              slip     surprise
## 11434 11434              slop      disgust
## 11435 11435              slop     negative
## 11436 11436            sloppy      disgust
## 11437 11437            sloppy     negative
## 11438 11438             sloth      disgust
## 11439 11439             sloth     negative
## 11440 11440            slouch     negative
## 11441 11441            slough     negative
## 11442 11442          slowness     negative
## 11443 11443            sludge      disgust
## 11444 11444            sludge     negative
## 11445 11445              slug      disgust
## 11446 11446              slug     negative
## 11447 11447          sluggish     negative
## 11448 11448          sluggish      sadness
## 11449 11449              slum      disgust
## 11450 11450              slum     negative
## 11451 11451             slump     negative
## 11452 11452             slump      sadness
## 11453 11453              slur        anger
## 11454 11454              slur      disgust
## 11455 11455              slur     negative
## 11456 11456              slur      sadness
## 11457 11457             slush      disgust
## 11458 11458             slush     negative
## 11459 11459             slush     surprise
## 11460 11460              slut        anger
## 11461 11461              slut      disgust
## 11462 11462              slut     negative
## 11463 11463               sly        anger
## 11464 11464               sly      disgust
## 11465 11465               sly         fear
## 11466 11466               sly     negative
## 11467 11467             smack        anger
## 11468 11468             smack     negative
## 11469 11469             small     negative
## 11470 11470             smash        anger
## 11471 11471             smash         fear
## 11472 11472             smash     negative
## 11473 11473           smashed     negative
## 11474 11474        smattering     negative
## 11475 11475             smell        anger
## 11476 11476             smell      disgust
## 11477 11477             smell     negative
## 11478 11478          smelling      disgust
## 11479 11479          smelling     negative
## 11480 11480             smile          joy
## 11481 11481             smile     positive
## 11482 11482             smile     surprise
## 11483 11483             smile        trust
## 11484 11484           smiling          joy
## 11485 11485           smiling     positive
## 11486 11486             smirk     negative
## 11487 11487             smite        anger
## 11488 11488             smite         fear
## 11489 11489             smite     negative
## 11490 11490             smite      sadness
## 11491 11491             smith        trust
## 11492 11492           smitten     positive
## 11493 11493            smoker     negative
## 11494 11494        smoothness     positive
## 11495 11495           smother        anger
## 11496 11496           smother     negative
## 11497 11497            smudge     negative
## 11498 11498              smug     negative
## 11499 11499           smuggle         fear
## 11500 11500           smuggle     negative
## 11501 11501          smuggler        anger
## 11502 11502          smuggler      disgust
## 11503 11503          smuggler         fear
## 11504 11504          smuggler     negative
## 11505 11505         smuggling     negative
## 11506 11506              smut      disgust
## 11507 11507              smut         fear
## 11508 11508              smut     negative
## 11509 11509              snag     negative
## 11510 11510              snag     surprise
## 11511 11511             snags     negative
## 11512 11512             snake      disgust
## 11513 11513             snake         fear
## 11514 11514             snake     negative
## 11515 11515             snare         fear
## 11516 11516             snare     negative
## 11517 11517             snarl        anger
## 11518 11518             snarl      disgust
## 11519 11519             snarl     negative
## 11520 11520          snarling        anger
## 11521 11521          snarling     negative
## 11522 11522             sneak        anger
## 11523 11523             sneak         fear
## 11524 11524             sneak     negative
## 11525 11525             sneak     surprise
## 11526 11526          sneaking anticipation
## 11527 11527          sneaking         fear
## 11528 11528          sneaking     negative
## 11529 11529          sneaking        trust
## 11530 11530             sneer        anger
## 11531 11531             sneer      disgust
## 11532 11532             sneer     negative
## 11533 11533            sneeze      disgust
## 11534 11534            sneeze     negative
## 11535 11535            sneeze     surprise
## 11536 11536           snicker     positive
## 11537 11537             snide     negative
## 11538 11538              snob     negative
## 11539 11539             snort      sadness
## 11540 11540              soak     negative
## 11541 11541               sob     negative
## 11542 11542               sob      sadness
## 11543 11543          sobriety     positive
## 11544 11544          sobriety        trust
## 11545 11545          sociable     positive
## 11546 11546         socialism      disgust
## 11547 11547         socialism         fear
## 11548 11548         socialist        anger
## 11549 11549         socialist      disgust
## 11550 11550         socialist         fear
## 11551 11551         socialist     negative
## 11552 11552         socialist      sadness
## 11553 11553              soil      disgust
## 11554 11554              soil     negative
## 11555 11555            soiled      disgust
## 11556 11556            soiled     negative
## 11557 11557            solace     positive
## 11558 11558           soldier        anger
## 11559 11559           soldier     positive
## 11560 11560           soldier      sadness
## 11561 11561             solid     positive
## 11562 11562        solidarity        trust
## 11563 11563          solidity     positive
## 11564 11564          solidity        trust
## 11565 11565          solution     positive
## 11566 11566          solvency     positive
## 11567 11567           somatic     negative
## 11568 11568           somatic     surprise
## 11569 11569            somber     negative
## 11570 11570            somber      sadness
## 11571 11571             sonar anticipation
## 11572 11572             sonar     positive
## 11573 11573            sonata     positive
## 11574 11574            sonnet          joy
## 11575 11575            sonnet     positive
## 11576 11576            sonnet      sadness
## 11577 11577          sonorous          joy
## 11578 11578          sonorous     positive
## 11579 11579              soot      disgust
## 11580 11580              soot     negative
## 11581 11581            soothe     positive
## 11582 11582          soothing          joy
## 11583 11583          soothing     positive
## 11584 11584          soothing        trust
## 11585 11585           sorcery anticipation
## 11586 11586           sorcery         fear
## 11587 11587           sorcery     negative
## 11588 11588           sorcery     surprise
## 11589 11589            sordid        anger
## 11590 11590            sordid      disgust
## 11591 11591            sordid         fear
## 11592 11592            sordid     negative
## 11593 11593            sordid      sadness
## 11594 11594              sore        anger
## 11595 11595              sore     negative
## 11596 11596              sore      sadness
## 11597 11597            sorely     negative
## 11598 11598            sorely      sadness
## 11599 11599          soreness      disgust
## 11600 11600          soreness     negative
## 11601 11601          soreness      sadness
## 11602 11602            sorrow         fear
## 11603 11603            sorrow     negative
## 11604 11604            sorrow      sadness
## 11605 11605         sorrowful     negative
## 11606 11606         sorrowful      sadness
## 11607 11607            sorter     positive
## 11608 11608            sortie         fear
## 11609 11609            sortie     negative
## 11610 11610          soulless      disgust
## 11611 11611          soulless         fear
## 11612 11612          soulless     negative
## 11613 11613          soulless      sadness
## 11614 11614          soulmate         fear
## 11615 11615          soulmate     negative
## 11616 11616         soundness anticipation
## 11617 11617         soundness          joy
## 11618 11618         soundness     positive
## 11619 11619         soundness        trust
## 11620 11620              soup     positive
## 11621 11621              sour      disgust
## 11622 11622              sour     negative
## 11623 11623         sovereign        trust
## 11624 11624               spa anticipation
## 11625 11625               spa          joy
## 11626 11626               spa     positive
## 11627 11627               spa     surprise
## 11628 11628               spa        trust
## 11629 11629          spacious     positive
## 11630 11630           spaniel          joy
## 11631 11631           spaniel     positive
## 11632 11632           spaniel        trust
## 11633 11633             spank        anger
## 11634 11634             spank         fear
## 11635 11635             spank     negative
## 11636 11636             spank      sadness
## 11637 11637          spanking        anger
## 11638 11638           sparkle anticipation
## 11639 11639           sparkle          joy
## 11640 11640           sparkle     positive
## 11641 11641           sparkle     surprise
## 11642 11642             spasm         fear
## 11643 11643             spasm     negative
## 11644 11644              spat        anger
## 11645 11645              spat     negative
## 11646 11646             spear        anger
## 11647 11647             spear anticipation
## 11648 11648             spear         fear
## 11649 11649             spear     negative
## 11650 11650           special          joy
## 11651 11651           special     positive
## 11652 11652        specialist        trust
## 11653 11653        specialize        trust
## 11654 11654            specie     positive
## 11655 11655             speck      disgust
## 11656 11656             speck     negative
## 11657 11657         spectacle     negative
## 11658 11658         spectacle     positive
## 11659 11659       spectacular anticipation
## 11660 11660       spectacular     surprise
## 11661 11661           specter         fear
## 11662 11662           specter     negative
## 11663 11663           specter      sadness
## 11664 11664          spectral     negative
## 11665 11665       speculation         fear
## 11666 11666       speculation     negative
## 11667 11667       speculation      sadness
## 11668 11668       speculative anticipation
## 11669 11669            speech     positive
## 11670 11670            speedy     positive
## 11671 11671          spelling     positive
## 11672 11672             spent     negative
## 11673 11673              spew      disgust
## 11674 11674             spice     positive
## 11675 11675            spider      disgust
## 11676 11676            spider         fear
## 11677 11677             spike         fear
## 11678 11678             spine        anger
## 11679 11679             spine     negative
## 11680 11680             spine     positive
## 11681 11681          spinster         fear
## 11682 11682          spinster     negative
## 11683 11683          spinster      sadness
## 11684 11684            spirit     positive
## 11685 11685           spirits anticipation
## 11686 11686           spirits          joy
## 11687 11687           spirits     positive
## 11688 11688           spirits     surprise
## 11689 11689              spit      disgust
## 11690 11690             spite        anger
## 11691 11691             spite     negative
## 11692 11692          spiteful        anger
## 11693 11693          spiteful     negative
## 11694 11694            splash     surprise
## 11695 11695          splendid          joy
## 11696 11696          splendid     positive
## 11697 11697          splendid     surprise
## 11698 11698          splendor anticipation
## 11699 11699          splendor          joy
## 11700 11700          splendor     positive
## 11701 11701          splendor     surprise
## 11702 11702          splinter     negative
## 11703 11703             split     negative
## 11704 11704         splitting     negative
## 11705 11705         splitting      sadness
## 11706 11706             spoil      disgust
## 11707 11707             spoil     negative
## 11708 11708           spoiler     negative
## 11709 11709           spoiler      sadness
## 11710 11710             spoke     negative
## 11711 11711         spokesman        trust
## 11712 11712            sponge     negative
## 11713 11713           sponsor     positive
## 11714 11714           sponsor        trust
## 11715 11715             spook         fear
## 11716 11716             spook     negative
## 11717 11717          spotless     positive
## 11718 11718          spotless        trust
## 11719 11719            spouse          joy
## 11720 11720            spouse     positive
## 11721 11721            spouse        trust
## 11722 11722            sprain     negative
## 11723 11723            sprain      sadness
## 11724 11724             spree     negative
## 11725 11725            sprite         fear
## 11726 11726            sprite     negative
## 11727 11727            spruce     positive
## 11728 11728              spur         fear
## 11729 11729          spurious      disgust
## 11730 11730          spurious     negative
## 11731 11731            squall         fear
## 11732 11732            squall     negative
## 11733 11733            squall      sadness
## 11734 11734          squatter     negative
## 11735 11735         squeamish      disgust
## 11736 11736         squeamish         fear
## 11737 11737         squeamish     negative
## 11738 11738           squelch        anger
## 11739 11739           squelch      disgust
## 11740 11740           squelch     negative
## 11741 11741            squirm      disgust
## 11742 11742            squirm     negative
## 11743 11743              stab        anger
## 11744 11744              stab         fear
## 11745 11745              stab     negative
## 11746 11746              stab      sadness
## 11747 11747              stab     surprise
## 11748 11748            stable     positive
## 11749 11749            stable        trust
## 11750 11750          staccato     positive
## 11751 11751           stagger     surprise
## 11752 11752        staggering     negative
## 11753 11753          stagnant     negative
## 11754 11754          stagnant      sadness
## 11755 11755             stain      disgust
## 11756 11756             stain     negative
## 11757 11757         stainless     positive
## 11758 11758             stale     negative
## 11759 11759         stalemate        anger
## 11760 11760         stalemate      disgust
## 11761 11761             stalk         fear
## 11762 11762             stalk     negative
## 11763 11763             stall      disgust
## 11764 11764          stallion     positive
## 11765 11765          stalwart     positive
## 11766 11766           stamina     positive
## 11767 11767           stamina        trust
## 11768 11768          standing     positive
## 11769 11769          standoff        anger
## 11770 11770          standoff         fear
## 11771 11771          standoff     negative
## 11772 11772        standstill        anger
## 11773 11773        standstill     negative
## 11774 11774              star anticipation
## 11775 11775              star          joy
## 11776 11776              star     positive
## 11777 11777              star        trust
## 11778 11778           staring     negative
## 11779 11779             stark     negative
## 11780 11780             stark        trust
## 11781 11781         starlight     positive
## 11782 11782            starry anticipation
## 11783 11783            starry          joy
## 11784 11784            starry     positive
## 11785 11785             start anticipation
## 11786 11786           startle         fear
## 11787 11787           startle     negative
## 11788 11788           startle     surprise
## 11789 11789         startling     surprise
## 11790 11790        starvation         fear
## 11791 11791        starvation     negative
## 11792 11792        starvation      sadness
## 11793 11793           starved     negative
## 11794 11794          starving     negative
## 11795 11795           stately     positive
## 11796 11796         statement     positive
## 11797 11797         statement        trust
## 11798 11798        stationary     negative
## 11799 11799       statistical        trust
## 11800 11800            statue     positive
## 11801 11801            status     positive
## 11802 11802           staunch     positive
## 11803 11803             stave     negative
## 11804 11804         steadfast     positive
## 11805 11805         steadfast        trust
## 11806 11806            steady     surprise
## 11807 11807            steady        trust
## 11808 11808             steal        anger
## 11809 11809             steal         fear
## 11810 11810             steal     negative
## 11811 11811             steal      sadness
## 11812 11812          stealing      disgust
## 11813 11813          stealing         fear
## 11814 11814          stealing     negative
## 11815 11815           stealth     surprise
## 11816 11816        stealthily     surprise
## 11817 11817          stealthy anticipation
## 11818 11818          stealthy         fear
## 11819 11819          stealthy     negative
## 11820 11820          stealthy     surprise
## 11821 11821           stellar     positive
## 11822 11822        stereotype     negative
## 11823 11823       stereotyped     negative
## 11824 11824           sterile     negative
## 11825 11825           sterile      sadness
## 11826 11826         sterility     negative
## 11827 11827          sterling        anger
## 11828 11828          sterling anticipation
## 11829 11829          sterling          joy
## 11830 11830          sterling     negative
## 11831 11831          sterling     positive
## 11832 11832          sterling        trust
## 11833 11833             stern     negative
## 11834 11834           steward     positive
## 11835 11835           steward        trust
## 11836 11836            sticky      disgust
## 11837 11837             stiff     negative
## 11838 11838         stiffness     negative
## 11839 11839            stifle     negative
## 11840 11840           stifled        anger
## 11841 11841           stifled         fear
## 11842 11842           stifled     negative
## 11843 11843           stifled      sadness
## 11844 11844            stigma        anger
## 11845 11845            stigma      disgust
## 11846 11846            stigma         fear
## 11847 11847            stigma     negative
## 11848 11848            stigma      sadness
## 11849 11849         stillborn     negative
## 11850 11850         stillborn      sadness
## 11851 11851         stillness         fear
## 11852 11852         stillness     positive
## 11853 11853         stillness      sadness
## 11854 11854             sting        anger
## 11855 11855             sting         fear
## 11856 11856             sting     negative
## 11857 11857          stinging     negative
## 11858 11858            stingy        anger
## 11859 11859            stingy      disgust
## 11860 11860            stingy         fear
## 11861 11861            stingy     negative
## 11862 11862            stingy      sadness
## 11863 11863             stink      disgust
## 11864 11864             stink     negative
## 11865 11865          stinking      disgust
## 11866 11866          stinking     negative
## 11867 11867             stint         fear
## 11868 11868             stint     negative
## 11869 11869             stint      sadness
## 11870 11870            stocks     negative
## 11871 11871            stolen        anger
## 11872 11872            stolen     negative
## 11873 11873           stomach      disgust
## 11874 11874             stone        anger
## 11875 11875             stone     negative
## 11876 11876            stoned     negative
## 11877 11877            stools      disgust
## 11878 11878            stools     negative
## 11879 11879          stoppage     negative
## 11880 11880             store anticipation
## 11881 11881             store     positive
## 11882 11882             storm        anger
## 11883 11883             storm     negative
## 11884 11884          storming        anger
## 11885 11885            stormy         fear
## 11886 11886            stormy     negative
## 11887 11887   straightforward     positive
## 11888 11888   straightforward        trust
## 11889 11889          strained        anger
## 11890 11890          strained     negative
## 11891 11891           straits         fear
## 11892 11892           straits     negative
## 11893 11893          stranded     negative
## 11894 11894          stranger         fear
## 11895 11895          stranger     negative
## 11896 11896          strangle        anger
## 11897 11897          strangle      disgust
## 11898 11898          strangle         fear
## 11899 11899          strangle     negative
## 11900 11900          strangle      sadness
## 11901 11901          strangle     surprise
## 11902 11902         strategic     positive
## 11903 11903        strategist anticipation
## 11904 11904        strategist     positive
## 11905 11905        strategist        trust
## 11906 11906             stray     negative
## 11907 11907          strength     positive
## 11908 11908          strength        trust
## 11909 11909        strengthen     positive
## 11910 11910     strengthening          joy
## 11911 11911     strengthening     positive
## 11912 11912     strengthening        trust
## 11913 11913            stress     negative
## 11914 11914         stretcher         fear
## 11915 11915         stretcher      sadness
## 11916 11916          stricken      sadness
## 11917 11917            strife        anger
## 11918 11918            strife     negative
## 11919 11919            strike        anger
## 11920 11920            strike     negative
## 11921 11921          striking     positive
## 11922 11922        strikingly     positive
## 11923 11923             strip     negative
## 11924 11924             strip      sadness
## 11925 11925            stripe     negative
## 11926 11926          stripped        anger
## 11927 11927          stripped anticipation
## 11928 11928          stripped      disgust
## 11929 11929          stripped         fear
## 11930 11930          stripped     negative
## 11931 11931          stripped      sadness
## 11932 11932            strive anticipation
## 11933 11933            stroke         fear
## 11934 11934            stroke     negative
## 11935 11935            stroke      sadness
## 11936 11936          strongly     positive
## 11937 11937        structural        trust
## 11938 11938         structure     positive
## 11939 11939         structure        trust
## 11940 11940          struggle        anger
## 11941 11941          struggle         fear
## 11942 11942          struggle     negative
## 11943 11943          struggle      sadness
## 11944 11944             strut     negative
## 11945 11945              stud     positive
## 11946 11946             study     positive
## 11947 11947            stuffy     negative
## 11948 11948           stumble     negative
## 11949 11949           stunned         fear
## 11950 11950           stunned     negative
## 11951 11951           stunned     surprise
## 11952 11952           stunted     negative
## 11953 11953            stupid     negative
## 11954 11954         stupidity     negative
## 11955 11955            stupor     negative
## 11956 11956            sturdy     positive
## 11957 11957               sty      disgust
## 11958 11958               sty     negative
## 11959 11959            subdue     negative
## 11960 11960            subito     surprise
## 11961 11961           subject     negative
## 11962 11962         subjected     negative
## 11963 11963         subjected      sadness
## 11964 11964        subjection     negative
## 11965 11965       subjugation        anger
## 11966 11966       subjugation      disgust
## 11967 11967       subjugation         fear
## 11968 11968       subjugation     negative
## 11969 11969       subjugation      sadness
## 11970 11970       sublimation          joy
## 11971 11971       sublimation     positive
## 11972 11972            submit anticipation
## 11973 11973       subordinate         fear
## 11974 11974       subordinate     negative
## 11975 11975          subpoena     negative
## 11976 11976         subscribe anticipation
## 11977 11977        subsidence     negative
## 11978 11978        subsidence      sadness
## 11979 11979           subsidy        anger
## 11980 11980           subsidy      disgust
## 11981 11981           subsidy     negative
## 11982 11982           subsist     negative
## 11983 11983         substance     positive
## 11984 11984      substantiate        trust
## 11985 11985       substantive     positive
## 11986 11986          subtract     negative
## 11987 11987        subversion        anger
## 11988 11988        subversion         fear
## 11989 11989        subversion     negative
## 11990 11990        subversive        anger
## 11991 11991        subversive     negative
## 11992 11992        subversive     surprise
## 11993 11993           subvert      disgust
## 11994 11994           subvert         fear
## 11995 11995           subvert     negative
## 11996 11996           subvert      sadness
## 11997 11997           succeed anticipation
## 11998 11998           succeed          joy
## 11999 11999           succeed     positive
## 12000 12000           succeed     surprise
## 12001 12001           succeed        trust
## 12002 12002        succeeding anticipation
## 12003 12003        succeeding          joy
## 12004 12004        succeeding     positive
## 12005 12005        succeeding        trust
## 12006 12006           success anticipation
## 12007 12007           success          joy
## 12008 12008           success     positive
## 12009 12009        successful anticipation
## 12010 12010        successful          joy
## 12011 12011        successful     positive
## 12012 12012        successful        trust
## 12013 12013          succinct     positive
## 12014 12014         succulent     negative
## 12015 12015         succulent     positive
## 12016 12016           succumb     negative
## 12017 12017              suck     negative
## 12018 12018            sucker        anger
## 12019 12019            sucker     negative
## 12020 12020            sudden     surprise
## 12021 12021          suddenly     surprise
## 12022 12022               sue        anger
## 12023 12023               sue     negative
## 12024 12024               sue      sadness
## 12025 12025            suffer     negative
## 12026 12026          sufferer         fear
## 12027 12027          sufferer     negative
## 12028 12028          sufferer      sadness
## 12029 12029         suffering      disgust
## 12030 12030         suffering         fear
## 12031 12031         suffering     negative
## 12032 12032         suffering      sadness
## 12033 12033       sufficiency     positive
## 12034 12034       suffocating      disgust
## 12035 12035       suffocating         fear
## 12036 12036       suffocating     negative
## 12037 12037       suffocating      sadness
## 12038 12038       suffocation        anger
## 12039 12039       suffocation         fear
## 12040 12040       suffocation     negative
## 12041 12041             sugar     positive
## 12042 12042           suggest        trust
## 12043 12043          suicidal        anger
## 12044 12044          suicidal      disgust
## 12045 12045          suicidal         fear
## 12046 12046          suicidal     negative
## 12047 12047          suicidal      sadness
## 12048 12048           suicide        anger
## 12049 12049           suicide         fear
## 12050 12050           suicide     negative
## 12051 12051           suicide      sadness
## 12052 12052          suitable     positive
## 12053 12053            sullen        anger
## 12054 12054            sullen     negative
## 12055 12055            sullen      sadness
## 12056 12056            sultan         fear
## 12057 12057            sultry     positive
## 12058 12058           summons     negative
## 12059 12059              sump      disgust
## 12060 12060               sun anticipation
## 12061 12061               sun          joy
## 12062 12062               sun     positive
## 12063 12063               sun     surprise
## 12064 12064               sun        trust
## 12065 12065           sundial anticipation
## 12066 12066           sundial        trust
## 12067 12067              sunk      disgust
## 12068 12068              sunk         fear
## 12069 12069              sunk     negative
## 12070 12070              sunk      sadness
## 12071 12071             sunny anticipation
## 12072 12072             sunny          joy
## 12073 12073             sunny     positive
## 12074 12074             sunny     surprise
## 12075 12075            sunset anticipation
## 12076 12076            sunset     positive
## 12077 12077          sunshine          joy
## 12078 12078          sunshine     positive
## 12079 12079            superb     positive
## 12080 12080       superficial     negative
## 12081 12081       superfluous     negative
## 12082 12082        superhuman     positive
## 12083 12083          superior     positive
## 12084 12084       superiority     positive
## 12085 12085          superman          joy
## 12086 12086          superman     positive
## 12087 12087          superman        trust
## 12088 12088         superstar          joy
## 12089 12089         superstar     positive
## 12090 12090         superstar        trust
## 12091 12091      superstition         fear
## 12092 12092      superstition     negative
## 12093 12093      superstition     positive
## 12094 12094     superstitious anticipation
## 12095 12095     superstitious         fear
## 12096 12096     superstitious     negative
## 12097 12097      supplication     positive
## 12098 12098      supplication        trust
## 12099 12099          supplies     positive
## 12100 12100            supply     positive
## 12101 12101         supported     positive
## 12102 12102         supporter          joy
## 12103 12103         supporter     positive
## 12104 12104         supporter        trust
## 12105 12105        supporting     positive
## 12106 12106        supporting        trust
## 12107 12107          suppress        anger
## 12108 12108          suppress         fear
## 12109 12109          suppress     negative
## 12110 12110          suppress      sadness
## 12111 12111       suppression        anger
## 12112 12112       suppression      disgust
## 12113 12113       suppression         fear
## 12114 12114       suppression     negative
## 12115 12115         supremacy        anger
## 12116 12116         supremacy anticipation
## 12117 12117         supremacy         fear
## 12118 12118         supremacy          joy
## 12119 12119         supremacy     negative
## 12120 12120         supremacy     positive
## 12121 12121         supremacy     surprise
## 12122 12122         supremacy        trust
## 12123 12123           supreme     positive
## 12124 12124         supremely     positive
## 12125 12125         surcharge        anger
## 12126 12126         surcharge     negative
## 12127 12127            surety     positive
## 12128 12128            surety        trust
## 12129 12129             surge     surprise
## 12130 12130           surgery         fear
## 12131 12131           surgery      sadness
## 12132 12132             surly        anger
## 12133 12133             surly      disgust
## 12134 12134             surly     negative
## 12135 12135           surmise     positive
## 12136 12136        surpassing     positive
## 12137 12137          surprise         fear
## 12138 12138          surprise          joy
## 12139 12139          surprise     positive
## 12140 12140          surprise     surprise
## 12141 12141         surprised     surprise
## 12142 12142        surprising     surprise
## 12143 12143      surprisingly anticipation
## 12144 12144      surprisingly     surprise
## 12145 12145         surrender         fear
## 12146 12146         surrender     negative
## 12147 12147         surrender      sadness
## 12148 12148      surrendering     negative
## 12149 12149      surrendering      sadness
## 12150 12150         surrogate        trust
## 12151 12151          surround anticipation
## 12152 12152          surround     negative
## 12153 12153          surround     positive
## 12154 12154      surveillance         fear
## 12155 12155         surveying     positive
## 12156 12156           survive     positive
## 12157 12157       susceptible     negative
## 12158 12158           suspect         fear
## 12159 12159           suspect     negative
## 12160 12160          suspense anticipation
## 12161 12161          suspense         fear
## 12162 12162          suspense     surprise
## 12163 12163        suspension         fear
## 12164 12164        suspension     negative
## 12165 12165         suspicion         fear
## 12166 12166         suspicion     negative
## 12167 12167        suspicious        anger
## 12168 12168        suspicious anticipation
## 12169 12169        suspicious     negative
## 12170 12170              swab     negative
## 12171 12171             swamp      disgust
## 12172 12172             swamp         fear
## 12173 12173             swamp     negative
## 12174 12174            swampy      disgust
## 12175 12175            swampy         fear
## 12176 12176            swampy     negative
## 12177 12177             swarm      disgust
## 12178 12178          swastika        anger
## 12179 12179          swastika         fear
## 12180 12180          swastika     negative
## 12181 12181             swear     positive
## 12182 12182             swear        trust
## 12183 12183             sweat         fear
## 12184 12184             sweet anticipation
## 12185 12185             sweet          joy
## 12186 12186             sweet     positive
## 12187 12187             sweet     surprise
## 12188 12188             sweet        trust
## 12189 12189        sweetheart anticipation
## 12190 12190        sweetheart          joy
## 12191 12191        sweetheart     positive
## 12192 12192        sweetheart      sadness
## 12193 12193        sweetheart        trust
## 12194 12194           sweetie     positive
## 12195 12195         sweetness     positive
## 12196 12196            sweets anticipation
## 12197 12197            sweets          joy
## 12198 12198            sweets     positive
## 12199 12199          swelling         fear
## 12200 12200          swelling     negative
## 12201 12201            swerve         fear
## 12202 12202            swerve     surprise
## 12203 12203             swift     positive
## 12204 12204              swig      disgust
## 12205 12205              swig     negative
## 12206 12206              swim anticipation
## 12207 12207              swim         fear
## 12208 12208              swim          joy
## 12209 12209              swim     positive
## 12210 12210             swine      disgust
## 12211 12211             swine     negative
## 12212 12212           swollen     negative
## 12213 12213          symbolic     positive
## 12214 12214       symmetrical     positive
## 12215 12215          symmetry          joy
## 12216 12216          symmetry     positive
## 12217 12217          symmetry        trust
## 12218 12218       sympathetic         fear
## 12219 12219       sympathetic          joy
## 12220 12220       sympathetic     positive
## 12221 12221       sympathetic      sadness
## 12222 12222       sympathetic        trust
## 12223 12223        sympathize      sadness
## 12224 12224          sympathy     positive
## 12225 12225          sympathy      sadness
## 12226 12226          symphony anticipation
## 12227 12227          symphony          joy
## 12228 12228          symphony     positive
## 12229 12229           symptom     negative
## 12230 12230       synchronize anticipation
## 12231 12231       synchronize          joy
## 12232 12232       synchronize     positive
## 12233 12233       synchronize     surprise
## 12234 12234       synchronize        trust
## 12235 12235           syncope         fear
## 12236 12236           syncope     negative
## 12237 12237           syncope      sadness
## 12238 12238           syncope     surprise
## 12239 12239       synergistic     positive
## 12240 12240       synergistic        trust
## 12241 12241             synod     positive
## 12242 12242             synod        trust
## 12243 12243        synonymous         fear
## 12244 12244        synonymous     negative
## 12245 12245        synonymous     positive
## 12246 12246        synonymous        trust
## 12247 12247           syringe         fear
## 12248 12248            system        trust
## 12249 12249             taboo      disgust
## 12250 12250             taboo         fear
## 12251 12251             taboo     negative
## 12252 12252          tabulate anticipation
## 12253 12253            tackle        anger
## 12254 12254            tackle     surprise
## 12255 12255              tact     positive
## 12256 12256           tactics         fear
## 12257 12257           tactics        trust
## 12258 12258             taint     negative
## 12259 12259             taint      sadness
## 12260 12260              tale     positive
## 12261 12261            talent     positive
## 12262 12262          talisman     positive
## 12263 12263              talk     positive
## 12264 12264            talons        anger
## 12265 12265            talons         fear
## 12266 12266            talons     negative
## 12267 12267            tandem        trust
## 12268 12268           tangled     negative
## 12269 12269            tanned     positive
## 12270 12270       tantalizing anticipation
## 12271 12271       tantalizing          joy
## 12272 12272       tantalizing     negative
## 12273 12273       tantalizing     positive
## 12274 12274       tantalizing     surprise
## 12275 12275        tantamount        trust
## 12276 12276         tardiness     negative
## 12277 12277             tardy     negative
## 12278 12278            tariff        anger
## 12279 12279            tariff      disgust
## 12280 12280            tariff     negative
## 12281 12281           tarnish      disgust
## 12282 12282           tarnish     negative
## 12283 12283           tarnish      sadness
## 12284 12284             tarry     negative
## 12285 12285              task     positive
## 12286 12286          tasteful     positive
## 12287 12287         tasteless      disgust
## 12288 12288         tasteless     negative
## 12289 12289             tasty     positive
## 12290 12290            taught        trust
## 12291 12291             taunt        anger
## 12292 12292             taunt         fear
## 12293 12293             taunt     negative
## 12294 12294             taunt      sadness
## 12295 12295             tawny      disgust
## 12296 12296               tax     negative
## 12297 12297               tax      sadness
## 12298 12298             teach          joy
## 12299 12299             teach     positive
## 12300 12300             teach     surprise
## 12301 12301             teach        trust
## 12302 12302           teacher     positive
## 12303 12303           teacher        trust
## 12304 12304              team        trust
## 12305 12305           tearful      disgust
## 12306 12306           tearful         fear
## 12307 12307           tearful      sadness
## 12308 12308             tease        anger
## 12309 12309             tease anticipation
## 12310 12310             tease     negative
## 12311 12311             tease      sadness
## 12312 12312           teasing        anger
## 12313 12313           teasing         fear
## 12314 12314           teasing     negative
## 12315 12315        technology     positive
## 12316 12316           tedious     negative
## 12317 12317            tedium     negative
## 12318 12318           teeming      disgust
## 12319 12319             teens     negative
## 12320 12320             teens     positive
## 12321 12321        temperance     positive
## 12322 12322         temperate        trust
## 12323 12323          tempered     positive
## 12324 12324           tempest        anger
## 12325 12325           tempest anticipation
## 12326 12326           tempest         fear
## 12327 12327           tempest     negative
## 12328 12328           tempest      sadness
## 12329 12329           tempest     surprise
## 12330 12330        temptation     negative
## 12331 12331           tenable     positive
## 12332 12332         tenacious     positive
## 12333 12333          tenacity     positive
## 12334 12334           tenancy     positive
## 12335 12335            tenant     positive
## 12336 12336            tender          joy
## 12337 12337            tender     positive
## 12338 12338            tender        trust
## 12339 12339        tenderness          joy
## 12340 12340        tenderness     positive
## 12341 12341          tenement     negative
## 12342 12342           tension        anger
## 12343 12343          terminal         fear
## 12344 12344          terminal     negative
## 12345 12345          terminal      sadness
## 12346 12346         terminate      sadness
## 12347 12347       termination     negative
## 12348 12348       termination      sadness
## 12349 12349           termite      disgust
## 12350 12350           termite     negative
## 12351 12351          terrible        anger
## 12352 12352          terrible      disgust
## 12353 12353          terrible         fear
## 12354 12354          terrible     negative
## 12355 12355          terrible      sadness
## 12356 12356          terribly      sadness
## 12357 12357          terrific      sadness
## 12358 12358            terror         fear
## 12359 12359            terror     negative
## 12360 12360         terrorism        anger
## 12361 12361         terrorism      disgust
## 12362 12362         terrorism         fear
## 12363 12363         terrorism     negative
## 12364 12364         terrorism      sadness
## 12365 12365         terrorist        anger
## 12366 12366         terrorist      disgust
## 12367 12367         terrorist         fear
## 12368 12368         terrorist     negative
## 12369 12369         terrorist      sadness
## 12370 12370         terrorist     surprise
## 12371 12371         terrorize        anger
## 12372 12372         terrorize         fear
## 12373 12373         terrorize     negative
## 12374 12374         terrorize      sadness
## 12375 12375         testament anticipation
## 12376 12376         testament        trust
## 12377 12377         testimony        trust
## 12378 12378           tetanus      disgust
## 12379 12379           tetanus     negative
## 12380 12380            tether     negative
## 12381 12381          thankful          joy
## 12382 12382          thankful     positive
## 12383 12383      thanksgiving          joy
## 12384 12384      thanksgiving     positive
## 12385 12385             theft        anger
## 12386 12386             theft      disgust
## 12387 12387             theft         fear
## 12388 12388             theft     negative
## 12389 12389             theft      sadness
## 12390 12390            theism      disgust
## 12391 12391            theism     negative
## 12392 12392        theocratic        anger
## 12393 12393        theocratic         fear
## 12394 12394        theocratic     negative
## 12395 12395        theocratic      sadness
## 12396 12396        theocratic        trust
## 12397 12397       theological        trust
## 12398 12398          theology anticipation
## 12399 12399           theorem        trust
## 12400 12400       theoretical     positive
## 12401 12401            theory anticipation
## 12402 12402            theory        trust
## 12403 12403       therapeutic          joy
## 12404 12404       therapeutic     positive
## 12405 12405       therapeutic        trust
## 12406 12406      therapeutics     positive
## 12407 12407      thermocouple anticipation
## 12408 12408       thermometer        trust
## 12409 12409             thief        anger
## 12410 12410             thief      disgust
## 12411 12411             thief         fear
## 12412 12412             thief     negative
## 12413 12413             thief      sadness
## 12414 12414             thief     surprise
## 12415 12415           thinker     positive
## 12416 12416            thirst anticipation
## 12417 12417            thirst      sadness
## 12418 12418            thirst     surprise
## 12419 12419           thirsty     negative
## 12420 12420        thirteenth         fear
## 12421 12421             thorn     negative
## 12422 12422            thorny         fear
## 12423 12423            thorny     negative
## 12424 12424      thoroughbred     positive
## 12425 12425           thought anticipation
## 12426 12426        thoughtful     positive
## 12427 12427        thoughtful        trust
## 12428 12428    thoughtfulness     positive
## 12429 12429       thoughtless        anger
## 12430 12430       thoughtless      disgust
## 12431 12431       thoughtless     negative
## 12432 12432            thrash        anger
## 12433 12433            thrash      disgust
## 12434 12434            thrash         fear
## 12435 12435            thrash     negative
## 12436 12436            thrash      sadness
## 12437 12437            threat        anger
## 12438 12438            threat         fear
## 12439 12439            threat     negative
## 12440 12440          threaten        anger
## 12441 12441          threaten anticipation
## 12442 12442          threaten         fear
## 12443 12443          threaten     negative
## 12444 12444       threatening        anger
## 12445 12445       threatening      disgust
## 12446 12446       threatening         fear
## 12447 12447       threatening     negative
## 12448 12448            thresh        anger
## 12449 12449            thresh         fear
## 12450 12450            thresh     negative
## 12451 12451            thresh      sadness
## 12452 12452            thrift      disgust
## 12453 12453            thrift     positive
## 12454 12454            thrift        trust
## 12455 12455            thrill anticipation
## 12456 12456            thrill         fear
## 12457 12457            thrill          joy
## 12458 12458            thrill     positive
## 12459 12459            thrill     surprise
## 12460 12460         thrilling anticipation
## 12461 12461         thrilling          joy
## 12462 12462         thrilling     positive
## 12463 12463         thrilling     surprise
## 12464 12464          thriving anticipation
## 12465 12465          thriving          joy
## 12466 12466          thriving     positive
## 12467 12467             throb         fear
## 12468 12468             throb     negative
## 12469 12469             throb      sadness
## 12470 12470            throne     positive
## 12471 12471            throne        trust
## 12472 12472          throttle        anger
## 12473 12473          throttle     negative
## 12474 12474              thug        anger
## 12475 12475              thug      disgust
## 12476 12476              thug         fear
## 12477 12477              thug     negative
## 12478 12478             thump        anger
## 12479 12479             thump     negative
## 12480 12480          thumping         fear
## 12481 12481        thundering        anger
## 12482 12482        thundering         fear
## 12483 12483        thundering     negative
## 12484 12484            thwart     negative
## 12485 12485            thwart     surprise
## 12486 12486            tickle anticipation
## 12487 12487            tickle          joy
## 12488 12488            tickle     positive
## 12489 12489            tickle     surprise
## 12490 12490            tickle        trust
## 12491 12491              tiff        anger
## 12492 12492              tiff     negative
## 12493 12493           tighten        anger
## 12494 12494            tiling     positive
## 12495 12495              time anticipation
## 12496 12496            timely     positive
## 12497 12497             timid         fear
## 12498 12498             timid     negative
## 12499 12499             timid      sadness
## 12500 12500          timidity anticipation
## 12501 12501          timidity         fear
## 12502 12502          timidity     negative
## 12503 12503            tinsel          joy
## 12504 12504            tinsel     positive
## 12505 12505             tipsy     negative
## 12506 12506            tirade        anger
## 12507 12507            tirade      disgust
## 12508 12508            tirade     negative
## 12509 12509             tired     negative
## 12510 12510         tiredness     negative
## 12511 12511          tiresome     negative
## 12512 12512               tit     negative
## 12513 12513             title     positive
## 12514 12514             title        trust
## 12515 12515              toad      disgust
## 12516 12516              toad     negative
## 12517 12517             toast          joy
## 12518 12518             toast     positive
## 12519 12519           tobacco     negative
## 12520 12520            toilet      disgust
## 12521 12521            toilet     negative
## 12522 12522             toils     negative
## 12523 12523          tolerant     positive
## 12524 12524          tolerate        anger
## 12525 12525          tolerate     negative
## 12526 12526          tolerate      sadness
## 12527 12527        toleration     positive
## 12528 12528              tomb      sadness
## 12529 12529          tomorrow anticipation
## 12530 12530         toothache         fear
## 12531 12531         toothache     negative
## 12532 12532               top anticipation
## 12533 12533               top     positive
## 12534 12534               top        trust
## 12535 12535            topple     surprise
## 12536 12536           torment        anger
## 12537 12537           torment         fear
## 12538 12538           torment     negative
## 12539 12539           torment      sadness
## 12540 12540              torn     negative
## 12541 12541           tornado         fear
## 12542 12542           torpedo        anger
## 12543 12543           torpedo     negative
## 12544 12544           torrent         fear
## 12545 12545            torrid     negative
## 12546 12546              tort     negative
## 12547 12547          tortious        anger
## 12548 12548          tortious      disgust
## 12549 12549          tortious     negative
## 12550 12550           torture        anger
## 12551 12551           torture anticipation
## 12552 12552           torture      disgust
## 12553 12553           torture         fear
## 12554 12554           torture     negative
## 12555 12555           torture      sadness
## 12556 12556           touched     negative
## 12557 12557            touchy        anger
## 12558 12558            touchy     negative
## 12559 12559            touchy      sadness
## 12560 12560             tough     negative
## 12561 12561             tough      sadness
## 12562 12562         toughness        anger
## 12563 12563         toughness         fear
## 12564 12564         toughness     positive
## 12565 12565         toughness        trust
## 12566 12566             tower     positive
## 12567 12567          towering anticipation
## 12568 12568          towering         fear
## 12569 12569          towering     positive
## 12570 12570             toxic      disgust
## 12571 12571             toxic     negative
## 12572 12572             toxin         fear
## 12573 12573             toxin     negative
## 12574 12574             track anticipation
## 12575 12575             tract         fear
## 12576 12576             trade        trust
## 12577 12577       traditional     positive
## 12578 12578           tragedy         fear
## 12579 12579           tragedy     negative
## 12580 12580           tragedy      sadness
## 12581 12581            tragic     negative
## 12582 12582           trainer        trust
## 12583 12583           traitor        anger
## 12584 12584           traitor      disgust
## 12585 12585           traitor         fear
## 12586 12586           traitor     negative
## 12587 12587           traitor      sadness
## 12588 12588             tramp      disgust
## 12589 12589             tramp         fear
## 12590 12590             tramp     negative
## 12591 12591             tramp      sadness
## 12592 12592            trance     negative
## 12593 12593          tranquil          joy
## 12594 12594          tranquil     positive
## 12595 12595       tranquility          joy
## 12596 12596       tranquility     positive
## 12597 12597       tranquility        trust
## 12598 12598       transaction        trust
## 12599 12599     transcendence anticipation
## 12600 12600     transcendence          joy
## 12601 12601     transcendence     positive
## 12602 12602     transcendence     surprise
## 12603 12603     transcendence        trust
## 12604 12604    transcendental     positive
## 12605 12605        transcript        trust
## 12606 12606     transgression     negative
## 12607 12607      transitional anticipation
## 12608 12608       translation        trust
## 12609 12609         trappings     negative
## 12610 12610             traps     negative
## 12611 12611             trash      disgust
## 12612 12612             trash     negative
## 12613 12613             trash      sadness
## 12614 12614            trashy      disgust
## 12615 12615            trashy     negative
## 12616 12616         traumatic        anger
## 12617 12617         traumatic         fear
## 12618 12618         traumatic     negative
## 12619 12619         traumatic      sadness
## 12620 12620           travail     negative
## 12621 12621         traveling     positive
## 12622 12622          travesty      disgust
## 12623 12623          travesty         fear
## 12624 12624          travesty     negative
## 12625 12625          travesty      sadness
## 12626 12626       treacherous        anger
## 12627 12627       treacherous      disgust
## 12628 12628       treacherous         fear
## 12629 12629       treacherous     negative
## 12630 12630         treachery        anger
## 12631 12631         treachery         fear
## 12632 12632         treachery     negative
## 12633 12633         treachery      sadness
## 12634 12634         treachery     surprise
## 12635 12635         treadmill anticipation
## 12636 12636           treason        anger
## 12637 12637           treason      disgust
## 12638 12638           treason         fear
## 12639 12639           treason     negative
## 12640 12640           treason     surprise
## 12641 12641          treasure anticipation
## 12642 12642          treasure          joy
## 12643 12643          treasure     positive
## 12644 12644          treasure        trust
## 12645 12645         treasurer        trust
## 12646 12646             treat        anger
## 12647 12647             treat anticipation
## 12648 12648             treat      disgust
## 12649 12649             treat         fear
## 12650 12650             treat          joy
## 12651 12651             treat     negative
## 12652 12652             treat     positive
## 12653 12653             treat      sadness
## 12654 12654             treat     surprise
## 12655 12655             treat        trust
## 12656 12656              tree        anger
## 12657 12657              tree anticipation
## 12658 12658              tree      disgust
## 12659 12659              tree          joy
## 12660 12660              tree     positive
## 12661 12661              tree     surprise
## 12662 12662              tree        trust
## 12663 12663         trembling         fear
## 12664 12664         trembling     negative
## 12665 12665      tremendously     positive
## 12666 12666            tremor        anger
## 12667 12667            tremor anticipation
## 12668 12668            tremor         fear
## 12669 12669            tremor     negative
## 12670 12670            tremor      sadness
## 12671 12671             trend     positive
## 12672 12672            trendy     positive
## 12673 12673       trepidation anticipation
## 12674 12674       trepidation         fear
## 12675 12675       trepidation     negative
## 12676 12676       trepidation     surprise
## 12677 12677          trespass        anger
## 12678 12678          trespass     negative
## 12679 12679             tribe        trust
## 12680 12680       tribulation         fear
## 12681 12681       tribulation     negative
## 12682 12682       tribulation      sadness
## 12683 12683          tribunal anticipation
## 12684 12684          tribunal      disgust
## 12685 12685          tribunal         fear
## 12686 12686          tribunal     negative
## 12687 12687          tribunal        trust
## 12688 12688           tribune        trust
## 12689 12689         tributary anticipation
## 12690 12690         tributary     positive
## 12691 12691           tribute     positive
## 12692 12692             trick     negative
## 12693 12693             trick     surprise
## 12694 12694          trickery        anger
## 12695 12695          trickery      disgust
## 12696 12696          trickery         fear
## 12697 12697          trickery     negative
## 12698 12698          trickery      sadness
## 12699 12699          trickery     surprise
## 12700 12700            trifle     negative
## 12701 12701              trig     positive
## 12702 12702              trip     surprise
## 12703 12703          tripping        anger
## 12704 12704          tripping     negative
## 12705 12705          tripping      sadness
## 12706 12706           triumph anticipation
## 12707 12707           triumph          joy
## 12708 12708           triumph     positive
## 12709 12709        triumphant anticipation
## 12710 12710        triumphant          joy
## 12711 12711        triumphant     positive
## 12712 12712        triumphant        trust
## 12713 12713             troll        anger
## 12714 12714             troll         fear
## 12715 12715             troll     negative
## 12716 12716            trophy anticipation
## 12717 12717            trophy          joy
## 12718 12718            trophy     positive
## 12719 12719            trophy     surprise
## 12720 12720            trophy        trust
## 12721 12721       troublesome        anger
## 12722 12722       troublesome         fear
## 12723 12723       troublesome     negative
## 12724 12724             truce          joy
## 12725 12725             truce     positive
## 12726 12726             truce        trust
## 12727 12727             truck        trust
## 12728 12728              true          joy
## 12729 12729              true     positive
## 12730 12730              true        trust
## 12731 12731             trump     surprise
## 12732 12732           trumpet     negative
## 12733 12733             truss        trust
## 12734 12734             trust        trust
## 12735 12735           trustee        trust
## 12736 12736            trusty     positive
## 12737 12737             truth     positive
## 12738 12738             truth        trust
## 12739 12739          truthful        trust
## 12740 12740      truthfulness     positive
## 12741 12741      truthfulness        trust
## 12742 12742            tumble     negative
## 12743 12743             tumor         fear
## 12744 12744             tumor     negative
## 12745 12745            tumour         fear
## 12746 12746            tumour     negative
## 12747 12747            tumour      sadness
## 12748 12748            tumult        anger
## 12749 12749            tumult         fear
## 12750 12750            tumult     negative
## 12751 12751            tumult     surprise
## 12752 12752        tumultuous        anger
## 12753 12753        tumultuous         fear
## 12754 12754        tumultuous     negative
## 12755 12755        turbulence        anger
## 12756 12756        turbulence         fear
## 12757 12757        turbulence     negative
## 12758 12758         turbulent         fear
## 12759 12759         turbulent     negative
## 12760 12760           turmoil        anger
## 12761 12761           turmoil         fear
## 12762 12762           turmoil     negative
## 12763 12763           turmoil      sadness
## 12764 12764            tussle        anger
## 12765 12765          tutelage     positive
## 12766 12766          tutelage        trust
## 12767 12767             tutor     positive
## 12768 12768              twin     positive
## 12769 12769           twinkle anticipation
## 12770 12770           twinkle          joy
## 12771 12771           twinkle     positive
## 12772 12772            twitch     negative
## 12773 12773           typhoon         fear
## 12774 12774           typhoon     negative
## 12775 12775        tyrannical        anger
## 12776 12776        tyrannical      disgust
## 12777 12777        tyrannical         fear
## 12778 12778        tyrannical     negative
## 12779 12779           tyranny         fear
## 12780 12780           tyranny     negative
## 12781 12781           tyranny      sadness
## 12782 12782            tyrant        anger
## 12783 12783            tyrant      disgust
## 12784 12784            tyrant         fear
## 12785 12785            tyrant     negative
## 12786 12786            tyrant      sadness
## 12787 12787          ugliness      disgust
## 12788 12788          ugliness         fear
## 12789 12789          ugliness     negative
## 12790 12790          ugliness      sadness
## 12791 12791              ugly      disgust
## 12792 12792              ugly     negative
## 12793 12793             ulcer        anger
## 12794 12794             ulcer      disgust
## 12795 12795             ulcer         fear
## 12796 12796             ulcer     negative
## 12797 12797             ulcer      sadness
## 12798 12798          ulterior     negative
## 12799 12799          ultimate anticipation
## 12800 12800          ultimate      sadness
## 12801 12801        ultimately anticipation
## 12802 12802        ultimately     positive
## 12803 12803         ultimatum        anger
## 12804 12804         ultimatum         fear
## 12805 12805         ultimatum     negative
## 12806 12806            umpire     positive
## 12807 12807            umpire        trust
## 12808 12808            unable     negative
## 12809 12809            unable      sadness
## 12810 12810      unacceptable     negative
## 12811 12811      unacceptable      sadness
## 12812 12812     unaccountable anticipation
## 12813 12813     unaccountable      disgust
## 12814 12814     unaccountable     negative
## 12815 12815     unaccountable      sadness
## 12816 12816     unaccountable        trust
## 12817 12817    unacknowledged      sadness
## 12818 12818         unanimity     positive
## 12819 12819         unanimous     positive
## 12820 12820     unanticipated     surprise
## 12821 12821        unapproved     negative
## 12822 12822        unassuming     positive
## 12823 12823        unattached     negative
## 12824 12824      unattainable        anger
## 12825 12825      unattainable     negative
## 12826 12826      unattainable      sadness
## 12827 12827      unattractive      disgust
## 12828 12828      unattractive     negative
## 12829 12829      unattractive      sadness
## 12830 12830      unauthorized     negative
## 12831 12831       unavoidable     negative
## 12832 12832           unaware     negative
## 12833 12833        unbearable      disgust
## 12834 12834        unbearable     negative
## 12835 12835        unbearable      sadness
## 12836 12836          unbeaten anticipation
## 12837 12837          unbeaten          joy
## 12838 12838          unbeaten     negative
## 12839 12839          unbeaten     positive
## 12840 12840          unbeaten      sadness
## 12841 12841          unbeaten     surprise
## 12842 12842          unbelief     negative
## 12843 12843      unbelievable     negative
## 12844 12844          unbiased     positive
## 12845 12845            unborn     negative
## 12846 12846       unbreakable     positive
## 12847 12847         unbridled        anger
## 12848 12848         unbridled anticipation
## 12849 12849         unbridled         fear
## 12850 12850         unbridled     negative
## 12851 12851         unbridled     positive
## 12852 12852         unbridled     surprise
## 12853 12853          unbroken     positive
## 12854 12854          unbroken        trust
## 12855 12855           uncanny         fear
## 12856 12856           uncanny     negative
## 12857 12857           uncanny     surprise
## 12858 12858          uncaring        anger
## 12859 12859          uncaring      disgust
## 12860 12860          uncaring     negative
## 12861 12861          uncaring      sadness
## 12862 12862         uncertain        anger
## 12863 12863         uncertain      disgust
## 12864 12864         uncertain         fear
## 12865 12865         uncertain     negative
## 12866 12866         uncertain     surprise
## 12867 12867      unchangeable     negative
## 12868 12868           unclean      disgust
## 12869 12869           unclean     negative
## 12870 12870     uncomfortable     negative
## 12871 12871    unconscionable      disgust
## 12872 12872    unconscionable     negative
## 12873 12873       unconscious     negative
## 12874 12874  unconstitutional     negative
## 12875 12875     unconstrained          joy
## 12876 12876     unconstrained     positive
## 12877 12877    uncontrollable        anger
## 12878 12878    uncontrollable anticipation
## 12879 12879    uncontrollable     negative
## 12880 12880    uncontrollable     surprise
## 12881 12881      uncontrolled     negative
## 12882 12882           uncover     surprise
## 12883 12883         undecided anticipation
## 12884 12884         undecided         fear
## 12885 12885         undecided     negative
## 12886 12886     underestimate     surprise
## 12887 12887         underline     positive
## 12888 12888        undermined     negative
## 12889 12889         underpaid        anger
## 12890 12890         underpaid     negative
## 12891 12891         underpaid      sadness
## 12892 12892        undersized     negative
## 12893 12893     understanding     positive
## 12894 12894     understanding        trust
## 12895 12895        undertaker      sadness
## 12896 12896       undertaking anticipation
## 12897 12897        underwrite     positive
## 12898 12898        underwrite        trust
## 12899 12899       undesirable        anger
## 12900 12900       undesirable      disgust
## 12901 12901       undesirable         fear
## 12902 12902       undesirable     negative
## 12903 12903       undesirable      sadness
## 12904 12904         undesired     negative
## 12905 12905         undesired      sadness
## 12906 12906       undisclosed anticipation
## 12907 12907      undiscovered     surprise
## 12908 12908         undivided     positive
## 12909 12909              undo     negative
## 12910 12910         undoubted anticipation
## 12911 12911         undoubted      disgust
## 12912 12912           undying anticipation
## 12913 12913           undying          joy
## 12914 12914           undying     positive
## 12915 12915           undying      sadness
## 12916 12916           undying        trust
## 12917 12917        uneasiness anticipation
## 12918 12918        uneasiness     negative
## 12919 12919        uneasiness      sadness
## 12920 12920            uneasy      disgust
## 12921 12921            uneasy         fear
## 12922 12922            uneasy     negative
## 12923 12923        uneducated     negative
## 12924 12924        uneducated      sadness
## 12925 12925        unemployed         fear
## 12926 12926        unemployed     negative
## 12927 12927        unemployed      sadness
## 12928 12928           unequal        anger
## 12929 12929           unequal      disgust
## 12930 12930           unequal         fear
## 12931 12931           unequal     negative
## 12932 12932           unequal      sadness
## 12933 12933       unequivocal        trust
## 12934 12934     unequivocally     positive
## 12935 12935            uneven     negative
## 12936 12936        unexpected anticipation
## 12937 12937        unexpected         fear
## 12938 12938        unexpected          joy
## 12939 12939        unexpected     negative
## 12940 12940        unexpected     positive
## 12941 12941        unexpected     surprise
## 12942 12942      unexpectedly     surprise
## 12943 12943       unexplained anticipation
## 12944 12944       unexplained     negative
## 12945 12945       unexplained      sadness
## 12946 12946            unfair        anger
## 12947 12947            unfair      disgust
## 12948 12948            unfair     negative
## 12949 12949            unfair      sadness
## 12950 12950        unfairness        anger
## 12951 12951        unfairness     negative
## 12952 12952        unfairness      sadness
## 12953 12953        unfaithful      disgust
## 12954 12954        unfaithful     negative
## 12955 12955       unfavorable      disgust
## 12956 12956       unfavorable     negative
## 12957 12957       unfavorable      sadness
## 12958 12958        unfinished     negative
## 12959 12959            unfold anticipation
## 12960 12960            unfold     positive
## 12961 12961        unforeseen     surprise
## 12962 12962       unforgiving        anger
## 12963 12963       unforgiving     negative
## 12964 12964       unforgiving      sadness
## 12965 12965       unfortunate     negative
## 12966 12966       unfortunate      sadness
## 12967 12967        unfriendly        anger
## 12968 12968        unfriendly      disgust
## 12969 12969        unfriendly         fear
## 12970 12970        unfriendly     negative
## 12971 12971        unfriendly      sadness
## 12972 12972       unfulfilled        anger
## 12973 12973       unfulfilled anticipation
## 12974 12974       unfulfilled     negative
## 12975 12975       unfulfilled      sadness
## 12976 12976       unfulfilled     surprise
## 12977 12977       unfurnished     negative
## 12978 12978           ungodly     negative
## 12979 12979           ungodly      sadness
## 12980 12980        ungrateful        anger
## 12981 12981        ungrateful      disgust
## 12982 12982        ungrateful     negative
## 12983 12983         unguarded     surprise
## 12984 12984       unhappiness     negative
## 12985 12985       unhappiness      sadness
## 12986 12986           unhappy        anger
## 12987 12987           unhappy      disgust
## 12988 12988           unhappy     negative
## 12989 12989           unhappy      sadness
## 12990 12990         unhealthy      disgust
## 12991 12991         unhealthy         fear
## 12992 12992         unhealthy     negative
## 12993 12993         unhealthy      sadness
## 12994 12994            unholy         fear
## 12995 12995            unholy     negative
## 12996 12996       unification anticipation
## 12997 12997       unification          joy
## 12998 12998       unification     positive
## 12999 12999       unification        trust
## 13000 13000         uniformly     positive
## 13001 13001      unimaginable     negative
## 13002 13002      unimaginable     positive
## 13003 13003      unimaginable     surprise
## 13004 13004       unimportant     negative
## 13005 13005       unimportant      sadness
## 13006 13006       unimpressed     negative
## 13007 13007        unimproved     negative
## 13008 13008        uninfected     positive
## 13009 13009        uninformed     negative
## 13010 13010       uninitiated     negative
## 13011 13011        uninspired     negative
## 13012 13012        uninspired      sadness
## 13013 13013    unintelligible     negative
## 13014 13014        unintended     surprise
## 13015 13015     unintentional     surprise
## 13016 13016   unintentionally     negative
## 13017 13017   unintentionally     surprise
## 13018 13018      uninterested     negative
## 13019 13019      uninterested      sadness
## 13020 13020     uninteresting     negative
## 13021 13021     uninteresting      sadness
## 13022 13022         uninvited      sadness
## 13023 13023            unique     positive
## 13024 13024            unique     surprise
## 13025 13025            unison     positive
## 13026 13026           unitary     positive
## 13027 13027            united     positive
## 13028 13028            united        trust
## 13029 13029             unity     positive
## 13030 13030             unity        trust
## 13031 13031        university anticipation
## 13032 13032        university     positive
## 13033 13033            unjust        anger
## 13034 13034            unjust     negative
## 13035 13035     unjustifiable        anger
## 13036 13036     unjustifiable      disgust
## 13037 13037     unjustifiable         fear
## 13038 13038     unjustifiable     negative
## 13039 13039       unjustified     negative
## 13040 13040            unkind        anger
## 13041 13041            unkind      disgust
## 13042 13042            unkind         fear
## 13043 13043            unkind     negative
## 13044 13044            unkind      sadness
## 13045 13045           unknown anticipation
## 13046 13046           unknown         fear
## 13047 13047           unknown     negative
## 13048 13048          unlawful        anger
## 13049 13049          unlawful      disgust
## 13050 13050          unlawful         fear
## 13051 13051          unlawful     negative
## 13052 13052          unlawful      sadness
## 13053 13053        unlicensed     negative
## 13054 13054         unlimited     positive
## 13055 13055           unlucky        anger
## 13056 13056           unlucky      disgust
## 13057 13057           unlucky         fear
## 13058 13058           unlucky     negative
## 13059 13059           unlucky      sadness
## 13060 13060      unmanageable      disgust
## 13061 13061      unmanageable     negative
## 13062 13062         unnatural      disgust
## 13063 13063         unnatural         fear
## 13064 13064         unnatural     negative
## 13065 13065        unofficial     negative
## 13066 13066            unpaid        anger
## 13067 13067            unpaid     negative
## 13068 13068            unpaid      sadness
## 13069 13069        unpleasant      disgust
## 13070 13070        unpleasant     negative
## 13071 13071        unpleasant      sadness
## 13072 13072         unpopular      disgust
## 13073 13073         unpopular     negative
## 13074 13074         unpopular      sadness
## 13075 13075     unprecedented     surprise
## 13076 13076     unpredictable     negative
## 13077 13077     unpredictable     surprise
## 13078 13078        unprepared     negative
## 13079 13079     unpretentious     positive
## 13080 13080      unproductive     negative
## 13081 13081      unprofitable     negative
## 13082 13082       unprotected     negative
## 13083 13083       unpublished anticipation
## 13084 13084       unpublished     negative
## 13085 13085       unpublished      sadness
## 13086 13086    unquestionable     positive
## 13087 13087    unquestionable        trust
## 13088 13088    unquestionably     positive
## 13089 13089    unquestionably        trust
## 13090 13090      unquestioned     positive
## 13091 13091      unquestioned        trust
## 13092 13092        unreliable     negative
## 13093 13093        unreliable        trust
## 13094 13094        unrequited     negative
## 13095 13095        unrequited      sadness
## 13096 13096        unresolved anticipation
## 13097 13097            unrest         fear
## 13098 13098            unrest      sadness
## 13099 13099            unruly        anger
## 13100 13100            unruly      disgust
## 13101 13101            unruly         fear
## 13102 13102            unruly     negative
## 13103 13103            unsafe         fear
## 13104 13104            unsafe     negative
## 13105 13105    unsatisfactory      disgust
## 13106 13106    unsatisfactory     negative
## 13107 13107       unsatisfied      disgust
## 13108 13108       unsatisfied     negative
## 13109 13109       unsatisfied      sadness
## 13110 13110          unsavory     negative
## 13111 13111         unscathed     positive
## 13112 13112      unscrupulous     negative
## 13113 13113            unseat      sadness
## 13114 13114         unselfish     positive
## 13115 13115         unsettled        anger
## 13116 13116         unsettled      disgust
## 13117 13117         unsettled         fear
## 13118 13118         unsettled     negative
## 13119 13119         unsightly      disgust
## 13120 13120         unsightly     negative
## 13121 13121   unsophisticated     negative
## 13122 13122       unspeakable         fear
## 13123 13123       unspeakable     negative
## 13124 13124          unstable         fear
## 13125 13125          unstable     negative
## 13126 13126          unstable     surprise
## 13127 13127          unsteady         fear
## 13128 13128      unsuccessful     negative
## 13129 13129      unsuccessful      sadness
## 13130 13130        unsuitable     negative
## 13131 13131            unsung     negative
## 13132 13132       unsupported     negative
## 13133 13133       unsurpassed anticipation
## 13134 13134       unsurpassed         fear
## 13135 13135       unsurpassed          joy
## 13136 13136       unsurpassed     positive
## 13137 13137       unsurpassed        trust
## 13138 13138      unsuspecting     surprise
## 13139 13139     unsustainable     negative
## 13140 13140     unsympathetic        anger
## 13141 13141     unsympathetic     negative
## 13142 13142           untamed     negative
## 13143 13143         untenable     negative
## 13144 13144       unthinkable        anger
## 13145 13145       unthinkable      disgust
## 13146 13146       unthinkable         fear
## 13147 13147       unthinkable     negative
## 13148 13148            untidy      disgust
## 13149 13149            untidy     negative
## 13150 13150             untie          joy
## 13151 13151             untie     negative
## 13152 13152             untie     positive
## 13153 13153          untimely     negative
## 13154 13154          untitled     negative
## 13155 13155          untitled      sadness
## 13156 13156            untold anticipation
## 13157 13157            untold     negative
## 13158 13158          untoward        anger
## 13159 13159          untoward      disgust
## 13160 13160          untoward     negative
## 13161 13161         untrained     negative
## 13162 13162            untrue     negative
## 13163 13163     untrustworthy        anger
## 13164 13164     untrustworthy     negative
## 13165 13165        unverified anticipation
## 13166 13166       unwarranted     negative
## 13167 13167          unwashed      disgust
## 13168 13168          unwashed     negative
## 13169 13169        unwavering     positive
## 13170 13170        unwavering        trust
## 13171 13171         unwelcome     negative
## 13172 13172         unwelcome      sadness
## 13173 13173            unwell     negative
## 13174 13174            unwell      sadness
## 13175 13175     unwillingness     negative
## 13176 13176            unwise     negative
## 13177 13177         unwitting     negative
## 13178 13178          unworthy      disgust
## 13179 13179          unworthy     negative
## 13180 13180        unyielding     negative
## 13181 13181          upheaval        anger
## 13182 13182          upheaval         fear
## 13183 13183          upheaval     negative
## 13184 13184          upheaval      sadness
## 13185 13185            uphill anticipation
## 13186 13186            uphill         fear
## 13187 13187            uphill     negative
## 13188 13188            uphill     positive
## 13189 13189            uplift anticipation
## 13190 13190            uplift          joy
## 13191 13191            uplift     positive
## 13192 13192            uplift        trust
## 13193 13193           upright     positive
## 13194 13194           upright        trust
## 13195 13195          uprising        anger
## 13196 13196          uprising anticipation
## 13197 13197          uprising         fear
## 13198 13198          uprising     negative
## 13199 13199            uproar     negative
## 13200 13200             upset        anger
## 13201 13201             upset     negative
## 13202 13202             upset      sadness
## 13203 13203            urchin     negative
## 13204 13204           urgency anticipation
## 13205 13205           urgency         fear
## 13206 13206           urgency     surprise
## 13207 13207            urgent anticipation
## 13208 13208            urgent         fear
## 13209 13209            urgent     negative
## 13210 13210            urgent     surprise
## 13211 13211               urn      sadness
## 13212 13212        usefulness     positive
## 13213 13213           useless     negative
## 13214 13214             usher     positive
## 13215 13215             usher        trust
## 13216 13216             usual     positive
## 13217 13217             usual        trust
## 13218 13218             usurp        anger
## 13219 13219             usurp     negative
## 13220 13220           usurped        anger
## 13221 13221           usurped         fear
## 13222 13222           usurped     negative
## 13223 13223             usury     negative
## 13224 13224           utility     positive
## 13225 13225           utopian anticipation
## 13226 13226           utopian          joy
## 13227 13227           utopian     positive
## 13228 13228           utopian        trust
## 13229 13229           vacancy     negative
## 13230 13230          vacation anticipation
## 13231 13231          vacation          joy
## 13232 13232          vacation     positive
## 13233 13233           vaccine     positive
## 13234 13234           vacuous      disgust
## 13235 13235           vacuous     negative
## 13236 13236             vague     negative
## 13237 13237         vagueness     negative
## 13238 13238            vainly      disgust
## 13239 13239            vainly     negative
## 13240 13240            vainly      sadness
## 13241 13241           valiant     positive
## 13242 13242          validity         fear
## 13243 13243             valor     positive
## 13244 13244             valor        trust
## 13245 13245          valuable     positive
## 13246 13246           vampire        anger
## 13247 13247           vampire      disgust
## 13248 13248           vampire         fear
## 13249 13249           vampire     negative
## 13250 13250          vanguard     positive
## 13251 13251            vanish     surprise
## 13252 13252          vanished         fear
## 13253 13253          vanished     negative
## 13254 13254          vanished      sadness
## 13255 13255          vanished     surprise
## 13256 13256            vanity     negative
## 13257 13257          vanquish     positive
## 13258 13258          variable     surprise
## 13259 13259         varicella      disgust
## 13260 13260         varicella         fear
## 13261 13261         varicella     negative
## 13262 13262         varicella      sadness
## 13263 13263          varicose     negative
## 13264 13264              veal      sadness
## 13265 13265              veal        trust
## 13266 13266              veer         fear
## 13267 13267              veer     surprise
## 13268 13268        vegetative      disgust
## 13269 13269        vegetative     negative
## 13270 13270        vegetative      sadness
## 13271 13271          vehement        anger
## 13272 13272          vehement         fear
## 13273 13273          vehement     negative
## 13274 13274            velvet     positive
## 13275 13275           velvety     positive
## 13276 13276          vendetta        anger
## 13277 13277          vendetta         fear
## 13278 13278          vendetta     negative
## 13279 13279          vendetta      sadness
## 13280 13280         venerable anticipation
## 13281 13281         venerable          joy
## 13282 13282         venerable     positive
## 13283 13283         venerable        trust
## 13284 13284        veneration     positive
## 13285 13285         vengeance        anger
## 13286 13286         vengeance     negative
## 13287 13287          vengeful        anger
## 13288 13288          vengeful         fear
## 13289 13289          vengeful     negative
## 13290 13290             venom        anger
## 13291 13291             venom      disgust
## 13292 13292             venom         fear
## 13293 13293             venom     negative
## 13294 13294          venomous        anger
## 13295 13295          venomous      disgust
## 13296 13296          venomous         fear
## 13297 13297          venomous     negative
## 13298 13298              vent        anger
## 13299 13299          veracity anticipation
## 13300 13300          veracity          joy
## 13301 13301          veracity     positive
## 13302 13302          veracity     surprise
## 13303 13303          veracity        trust
## 13304 13304         verbosity     negative
## 13305 13305           verdant     positive
## 13306 13306           verdict         fear
## 13307 13307             verge anticipation
## 13308 13308             verge         fear
## 13309 13309             verge     negative
## 13310 13310      verification     positive
## 13311 13311      verification        trust
## 13312 13312          verified     positive
## 13313 13313          verified        trust
## 13314 13314            verily     positive
## 13315 13315            verily        trust
## 13316 13316         veritable     positive
## 13317 13317            vermin        anger
## 13318 13318            vermin      disgust
## 13319 13319            vermin         fear
## 13320 13320            vermin     negative
## 13321 13321            vernal          joy
## 13322 13322            vernal     positive
## 13323 13323            versus        anger
## 13324 13324            versus     negative
## 13325 13325           vertigo         fear
## 13326 13326           vertigo     negative
## 13327 13327             verve     positive
## 13328 13328         vesicular      disgust
## 13329 13329           veteran     positive
## 13330 13330           veteran        trust
## 13331 13331              veto        anger
## 13332 13332              veto     negative
## 13333 13333             vicar     positive
## 13334 13334             vicar        trust
## 13335 13335              vice     negative
## 13336 13336           vicious        anger
## 13337 13337           vicious      disgust
## 13338 13338           vicious     negative
## 13339 13339            victim        anger
## 13340 13340            victim         fear
## 13341 13341            victim     negative
## 13342 13342            victim      sadness
## 13343 13343        victimized        anger
## 13344 13344        victimized      disgust
## 13345 13345        victimized         fear
## 13346 13346        victimized     negative
## 13347 13347        victimized      sadness
## 13348 13348        victimized     surprise
## 13349 13349            victor          joy
## 13350 13350            victor     positive
## 13351 13351        victorious          joy
## 13352 13352        victorious     positive
## 13353 13353           victory anticipation
## 13354 13354           victory          joy
## 13355 13355           victory     positive
## 13356 13356           victory        trust
## 13357 13357             vigil anticipation
## 13358 13358         vigilance anticipation
## 13359 13359         vigilance     positive
## 13360 13360         vigilance        trust
## 13361 13361          vigilant         fear
## 13362 13362          vigilant     positive
## 13363 13363          vigilant        trust
## 13364 13364             vigor     positive
## 13365 13365          vigorous     positive
## 13366 13366          vigorous        trust
## 13367 13367          villager     positive
## 13368 13368          villager        trust
## 13369 13369           villain         fear
## 13370 13370           villain     negative
## 13371 13371        villainous        anger
## 13372 13372        villainous      disgust
## 13373 13373        villainous         fear
## 13374 13374        villainous     negative
## 13375 13375         vindicate        anger
## 13376 13376        vindicated     positive
## 13377 13377       vindication anticipation
## 13378 13378       vindication          joy
## 13379 13379       vindication     positive
## 13380 13380       vindication        trust
## 13381 13381        vindictive        anger
## 13382 13382        vindictive      disgust
## 13383 13383        vindictive     negative
## 13384 13384         violation        anger
## 13385 13385         violation         fear
## 13386 13386         violation     negative
## 13387 13387         violation      sadness
## 13388 13388         violation     surprise
## 13389 13389          violence        anger
## 13390 13390          violence         fear
## 13391 13391          violence     negative
## 13392 13392          violence      sadness
## 13393 13393           violent        anger
## 13394 13394           violent      disgust
## 13395 13395           violent         fear
## 13396 13396           violent     negative
## 13397 13397           violent     surprise
## 13398 13398         violently        anger
## 13399 13399         violently      disgust
## 13400 13400         violently         fear
## 13401 13401         violently     negative
## 13402 13402         violently      sadness
## 13403 13403             viper         fear
## 13404 13404             viper     negative
## 13405 13405            virgin     positive
## 13406 13406            virgin        trust
## 13407 13407         virginity anticipation
## 13408 13408         virginity     positive
## 13409 13409            virtue     positive
## 13410 13410            virtue        trust
## 13411 13411          virtuous          joy
## 13412 13412          virtuous     positive
## 13413 13413          virtuous        trust
## 13414 13414         virulence        anger
## 13415 13415         virulence         fear
## 13416 13416         virulence     negative
## 13417 13417             virus     negative
## 13418 13418            vision anticipation
## 13419 13419            vision     positive
## 13420 13420         visionary anticipation
## 13421 13421         visionary          joy
## 13422 13422         visionary     positive
## 13423 13423         visionary        trust
## 13424 13424             visit     positive
## 13425 13425        visitation     negative
## 13426 13426           visitor anticipation
## 13427 13427           visitor          joy
## 13428 13428           visitor     positive
## 13429 13429             visor anticipation
## 13430 13430             visor     surprise
## 13431 13431             vital     positive
## 13432 13432          vitality          joy
## 13433 13433          vitality     positive
## 13434 13434          vitality        trust
## 13435 13435         vivacious          joy
## 13436 13436         vivacious     positive
## 13437 13437             vivid          joy
## 13438 13438             vivid     positive
## 13439 13439             vixen     negative
## 13440 13440        vocabulary     positive
## 13441 13441        volatility        anger
## 13442 13442        volatility anticipation
## 13443 13443        volatility         fear
## 13444 13444        volatility     negative
## 13445 13445        volatility     surprise
## 13446 13446           volcano         fear
## 13447 13447           volcano     negative
## 13448 13448           volcano     surprise
## 13449 13449         volunteer anticipation
## 13450 13450         volunteer         fear
## 13451 13451         volunteer          joy
## 13452 13452         volunteer     positive
## 13453 13453         volunteer        trust
## 13454 13454        volunteers        trust
## 13455 13455        voluptuous anticipation
## 13456 13456        voluptuous          joy
## 13457 13457        voluptuous     positive
## 13458 13458             vomit      disgust
## 13459 13459          vomiting     negative
## 13460 13460            voodoo     negative
## 13461 13461              vote        anger
## 13462 13462              vote anticipation
## 13463 13463              vote          joy
## 13464 13464              vote     negative
## 13465 13465              vote     positive
## 13466 13466              vote      sadness
## 13467 13467              vote     surprise
## 13468 13468              vote        trust
## 13469 13469            votive        trust
## 13470 13470             vouch     positive
## 13471 13471             vouch        trust
## 13472 13472           voucher        trust
## 13473 13473               vow anticipation
## 13474 13474               vow          joy
## 13475 13475               vow     positive
## 13476 13476               vow        trust
## 13477 13477            voyage anticipation
## 13478 13478            vulgar      disgust
## 13479 13479            vulgar     negative
## 13480 13480         vulgarity        anger
## 13481 13481         vulgarity      disgust
## 13482 13482         vulgarity     negative
## 13483 13483         vulgarity      sadness
## 13484 13484     vulnerability         fear
## 13485 13485     vulnerability     negative
## 13486 13486     vulnerability      sadness
## 13487 13487           vulture      disgust
## 13488 13488           vulture         fear
## 13489 13489           vulture     negative
## 13490 13490            waffle        anger
## 13491 13491            waffle     negative
## 13492 13492            waffle      sadness
## 13493 13493             wages          joy
## 13494 13494             wages     positive
## 13495 13495              wail         fear
## 13496 13496              wail     negative
## 13497 13497              wail      sadness
## 13498 13498              wait anticipation
## 13499 13499              wait     negative
## 13500 13500            wallow      disgust
## 13501 13501            wallow     negative
## 13502 13502            wallow      sadness
## 13503 13503               wan         fear
## 13504 13504               wan     negative
## 13505 13505               wan      sadness
## 13506 13506              wane     negative
## 13507 13507              wane      sadness
## 13508 13508           wanting     negative
## 13509 13509           wanting      sadness
## 13510 13510               war         fear
## 13511 13511               war     negative
## 13512 13512            warden        anger
## 13513 13513            warden         fear
## 13514 13514            warden     negative
## 13515 13515            warden        trust
## 13516 13516              ware         fear
## 13517 13517              ware     negative
## 13518 13518           warfare        anger
## 13519 13519           warfare         fear
## 13520 13520           warfare     negative
## 13521 13521           warfare      sadness
## 13522 13522           warlike        anger
## 13523 13523           warlike         fear
## 13524 13524           warlike     negative
## 13525 13525           warlock         fear
## 13526 13526              warn anticipation
## 13527 13527              warn         fear
## 13528 13528              warn     negative
## 13529 13529              warn     surprise
## 13530 13530              warn        trust
## 13531 13531            warned anticipation
## 13532 13532            warned         fear
## 13533 13533            warned     surprise
## 13534 13534           warning         fear
## 13535 13535              warp        anger
## 13536 13536              warp     negative
## 13537 13537              warp      sadness
## 13538 13538            warped     negative
## 13539 13539          warranty     positive
## 13540 13540          warranty        trust
## 13541 13541           warrior        anger
## 13542 13542           warrior         fear
## 13543 13543           warrior     positive
## 13544 13544              wart      disgust
## 13545 13545              wart     negative
## 13546 13546              wary         fear
## 13547 13547             waste      disgust
## 13548 13548             waste     negative
## 13549 13549            wasted        anger
## 13550 13550            wasted      disgust
## 13551 13551            wasted     negative
## 13552 13552          wasteful        anger
## 13553 13553          wasteful      disgust
## 13554 13554          wasteful     negative
## 13555 13555          wasteful      sadness
## 13556 13556           wasting      disgust
## 13557 13557           wasting         fear
## 13558 13558           wasting     negative
## 13559 13559           wasting      sadness
## 13560 13560             watch anticipation
## 13561 13561             watch         fear
## 13562 13562          watchdog     positive
## 13563 13563          watchdog        trust
## 13564 13564          watchful     positive
## 13565 13565          watchful        trust
## 13566 13566          watchman     positive
## 13567 13567          watchman        trust
## 13568 13568        waterproof     positive
## 13569 13569            watery     negative
## 13570 13570             waver         fear
## 13571 13571             waver     negative
## 13572 13572          weakened     negative
## 13573 13573            weakly         fear
## 13574 13574            weakly     negative
## 13575 13575            weakly      sadness
## 13576 13576          weakness     negative
## 13577 13577            wealth          joy
## 13578 13578            wealth     positive
## 13579 13579            wealth        trust
## 13580 13580              wear     negative
## 13581 13581              wear        trust
## 13582 13582           wearily     negative
## 13583 13583           wearily      sadness
## 13584 13584         weariness     negative
## 13585 13585         weariness      sadness
## 13586 13586             weary     negative
## 13587 13587             weary      sadness
## 13588 13588      weatherproof     positive
## 13589 13589             weeds     negative
## 13590 13590             weeds      sadness
## 13591 13591              weep     negative
## 13592 13592              weep      sadness
## 13593 13593           weeping      sadness
## 13594 13594             weigh anticipation
## 13595 13595             weigh        trust
## 13596 13596            weight anticipation
## 13597 13597            weight      disgust
## 13598 13598            weight         fear
## 13599 13599            weight          joy
## 13600 13600            weight     negative
## 13601 13601            weight     positive
## 13602 13602            weight      sadness
## 13603 13603            weight     surprise
## 13604 13604            weight        trust
## 13605 13605           weighty         fear
## 13606 13606             weird      disgust
## 13607 13607             weird     negative
## 13608 13608            weirdo         fear
## 13609 13609            weirdo     negative
## 13610 13610          welcomed          joy
## 13611 13611          welcomed     positive
## 13612 13612               wen     negative
## 13613 13613             wench        anger
## 13614 13614             wench      disgust
## 13615 13615             wench     negative
## 13616 13616             whack     negative
## 13617 13617              whim anticipation
## 13618 13618              whim          joy
## 13619 13619              whim     negative
## 13620 13620              whim     surprise
## 13621 13621           whimper         fear
## 13622 13622           whimper      sadness
## 13623 13623         whimsical          joy
## 13624 13624             whine      disgust
## 13625 13625             whine     negative
## 13626 13626             whine      sadness
## 13627 13627              whip        anger
## 13628 13628              whip     negative
## 13629 13629         whirlpool         fear
## 13630 13630         whirlwind         fear
## 13631 13631         whirlwind     negative
## 13632 13632            whisky     negative
## 13633 13633         whiteness          joy
## 13634 13634         whiteness     positive
## 13635 13635         wholesome     positive
## 13636 13636         wholesome        trust
## 13637 13637             whore      disgust
## 13638 13638             whore     negative
## 13639 13639            wicked         fear
## 13640 13640            wicked     negative
## 13641 13641        wickedness      disgust
## 13642 13642        wickedness     negative
## 13643 13643            wicket     positive
## 13644 13644        widespread     positive
## 13645 13645             widow      sadness
## 13646 13646           widower      sadness
## 13647 13647              wild     negative
## 13648 13648              wild     surprise
## 13649 13649           wildcat     negative
## 13650 13650        wilderness anticipation
## 13651 13651        wilderness         fear
## 13652 13652        wilderness      sadness
## 13653 13653          wildfire         fear
## 13654 13654          wildfire     negative
## 13655 13655          wildfire      sadness
## 13656 13656          wildfire     surprise
## 13657 13657           willful        anger
## 13658 13658           willful     negative
## 13659 13659           willful      sadness
## 13660 13660         willingly     positive
## 13661 13661       willingness     positive
## 13662 13662              wimp      disgust
## 13663 13663              wimp         fear
## 13664 13664              wimp     negative
## 13665 13665             wimpy        anger
## 13666 13666             wimpy      disgust
## 13667 13667             wimpy         fear
## 13668 13668             wimpy     negative
## 13669 13669             wimpy      sadness
## 13670 13670             wince        anger
## 13671 13671             wince      disgust
## 13672 13672             wince         fear
## 13673 13673             wince     negative
## 13674 13674             wince      sadness
## 13675 13675          windfall     positive
## 13676 13676            winner anticipation
## 13677 13677            winner          joy
## 13678 13678            winner     positive
## 13679 13679            winner     surprise
## 13680 13680           winning anticipation
## 13681 13681           winning      disgust
## 13682 13682           winning          joy
## 13683 13683           winning     positive
## 13684 13684           winning      sadness
## 13685 13685           winning     surprise
## 13686 13686           winning        trust
## 13687 13687          winnings anticipation
## 13688 13688          winnings          joy
## 13689 13689          winnings     positive
## 13690 13690          wireless        anger
## 13691 13691          wireless anticipation
## 13692 13692          wireless     positive
## 13693 13693          wireless     surprise
## 13694 13694               wis     positive
## 13695 13695            wisdom     positive
## 13696 13696            wisdom        trust
## 13697 13697              wise     positive
## 13698 13698           wishful anticipation
## 13699 13699               wit     positive
## 13700 13700             witch        anger
## 13701 13701             witch      disgust
## 13702 13702             witch         fear
## 13703 13703             witch     negative
## 13704 13704        witchcraft        anger
## 13705 13705        witchcraft         fear
## 13706 13706        witchcraft     negative
## 13707 13707        witchcraft      sadness
## 13708 13708          withdraw     negative
## 13709 13709          withdraw      sadness
## 13710 13710            wither     negative
## 13711 13711            wither      sadness
## 13712 13712          withered      disgust
## 13713 13713          withered     negative
## 13714 13714         withstand anticipation
## 13715 13715         withstand         fear
## 13716 13716         withstand     positive
## 13717 13717           witness        trust
## 13718 13718              wits     positive
## 13719 13719             witty          joy
## 13720 13720             witty     positive
## 13721 13721            wizard anticipation
## 13722 13722            wizard     positive
## 13723 13723            wizard     surprise
## 13724 13724               woe      disgust
## 13725 13725               woe         fear
## 13726 13726               woe     negative
## 13727 13727               woe      sadness
## 13728 13728            woeful     negative
## 13729 13729            woeful      sadness
## 13730 13730          woefully      disgust
## 13731 13731          woefully     negative
## 13732 13732          woefully      sadness
## 13733 13733              womb     positive
## 13734 13734         wonderful          joy
## 13735 13735         wonderful     positive
## 13736 13736         wonderful     surprise
## 13737 13737         wonderful        trust
## 13738 13738       wonderfully          joy
## 13739 13739       wonderfully     positive
## 13740 13740       wonderfully     surprise
## 13741 13741          wondrous     positive
## 13742 13742              wont anticipation
## 13743 13743               wop        anger
## 13744 13744              word     positive
## 13745 13745              word        trust
## 13746 13746             words        anger
## 13747 13747             words     negative
## 13748 13748           working     positive
## 13749 13749              worm anticipation
## 13750 13750              worm     negative
## 13751 13751              worm     surprise
## 13752 13752              worn     negative
## 13753 13753              worn      sadness
## 13754 13754           worried     negative
## 13755 13755           worried      sadness
## 13756 13756             worry anticipation
## 13757 13757             worry         fear
## 13758 13758             worry     negative
## 13759 13759             worry      sadness
## 13760 13760          worrying anticipation
## 13761 13761          worrying         fear
## 13762 13762          worrying     negative
## 13763 13763          worrying      sadness
## 13764 13764             worse         fear
## 13765 13765             worse     negative
## 13766 13766             worse      sadness
## 13767 13767         worsening      disgust
## 13768 13768         worsening     negative
## 13769 13769         worsening      sadness
## 13770 13770           worship anticipation
## 13771 13771           worship         fear
## 13772 13772           worship          joy
## 13773 13773           worship     positive
## 13774 13774           worship        trust
## 13775 13775             worth     positive
## 13776 13776         worthless        anger
## 13777 13777         worthless      disgust
## 13778 13778         worthless     negative
## 13779 13779         worthless      sadness
## 13780 13780            worthy     positive
## 13781 13781            worthy        trust
## 13782 13782               wot     positive
## 13783 13783               wot        trust
## 13784 13784             wound        anger
## 13785 13785             wound         fear
## 13786 13786             wound     negative
## 13787 13787             wound      sadness
## 13788 13788         wrangling        anger
## 13789 13789         wrangling      disgust
## 13790 13790         wrangling         fear
## 13791 13791         wrangling     negative
## 13792 13792         wrangling      sadness
## 13793 13793             wrath        anger
## 13794 13794             wrath         fear
## 13795 13795             wrath     negative
## 13796 13796             wreak        anger
## 13797 13797             wreak     negative
## 13798 13798             wreck        anger
## 13799 13799             wreck      disgust
## 13800 13800             wreck         fear
## 13801 13801             wreck     negative
## 13802 13802             wreck      sadness
## 13803 13803             wreck     surprise
## 13804 13804           wrecked        anger
## 13805 13805           wrecked         fear
## 13806 13806           wrecked     negative
## 13807 13807           wrecked      sadness
## 13808 13808            wrench     negative
## 13809 13809         wrestling     negative
## 13810 13810            wretch        anger
## 13811 13811            wretch      disgust
## 13812 13812            wretch     negative
## 13813 13813            wretch      sadness
## 13814 13814          wretched      disgust
## 13815 13815          wretched     negative
## 13816 13816          wretched      sadness
## 13817 13817             wring        anger
## 13818 13818          wrinkled      sadness
## 13819 13819            writer     positive
## 13820 13820             wrong     negative
## 13821 13821        wrongdoing        anger
## 13822 13822        wrongdoing      disgust
## 13823 13823        wrongdoing     negative
## 13824 13824        wrongdoing      sadness
## 13825 13825          wrongful        anger
## 13826 13826          wrongful      disgust
## 13827 13827          wrongful     negative
## 13828 13828          wrongful      sadness
## 13829 13829           wrongly        anger
## 13830 13830           wrongly         fear
## 13831 13831           wrongly     negative
## 13832 13832           wrongly      sadness
## 13833 13833           wrought     negative
## 13834 13834               wry     negative
## 13835 13835        xenophobia         fear
## 13836 13836        xenophobia     negative
## 13837 13837              yawn     negative
## 13838 13838           yawning     negative
## 13839 13839          yearning anticipation
## 13840 13840          yearning          joy
## 13841 13841          yearning     negative
## 13842 13842          yearning     positive
## 13843 13843          yearning        trust
## 13844 13844              yell        anger
## 13845 13845              yell         fear
## 13846 13846              yell     negative
## 13847 13847              yell     surprise
## 13848 13848           yellows     negative
## 13849 13849              yelp        anger
## 13850 13850              yelp         fear
## 13851 13851              yelp     negative
## 13852 13852              yelp     surprise
## 13853 13853             youth        anger
## 13854 13854             youth anticipation
## 13855 13855             youth         fear
## 13856 13856             youth          joy
## 13857 13857             youth     positive
## 13858 13858             youth     surprise
## 13859 13859              zany     surprise
## 13860 13860              zeal anticipation
## 13861 13861              zeal          joy
## 13862 13862              zeal     positive
## 13863 13863              zeal     surprise
## 13864 13864              zeal        trust
## 13865 13865           zealous          joy
## 13866 13866           zealous     positive
## 13867 13867           zealous        trust
## 13868 13868              zest anticipation
## 13869 13869              zest          joy
## 13870 13870              zest     positive
## 13871 13871              zest        trust
## 13872 13872               zip     negative

Let’s join the data.

nrc_joy <- nrc %>%
  filter(sentiment == "joy")

tidy_tweetsUS %>%
  filter(year == "y2020") %>%
  inner_join(nrc_joy) %>%
  count(word, sort = TRUE)
## Joining, by = "word"
##              word  n
## 1            safe 91
## 2           money 62
## 3            hope 56
## 4            food 49
## 5            love 43
## 6             god 42
## 7            vote 37
## 8           share 35
## 9            true 31
## 10          happy 30
## 11          found 27
## 12       peaceful 27
## 13       football 26
## 14            pay 26
## 15      resources 26
## 16         church 25
## 17         friend 24
## 18         rising 23
## 19          proud 20
## 20        excited 19
## 21        feeling 19
## 22         mother 18
## 23        respect 18
## 24      beautiful 17
## 25        finally 17
## 26     graduation 17
## 27           pray 17
## 28         pretty 17
## 29          treat 17
## 30          beach 16
## 31           deal 16
## 32            fun 16
## 33           hero 16
## 34        special 16
## 35       birthday 15
## 36       favorite 15
## 37      providing 14
## 38          alive 13
## 39         create 13
## 40           star 13
## 41           baby 12
## 42          enjoy 12
## 43          peace 12
## 44        success 12
## 45          bless 11
## 46        closure 11
## 47      excellent 11
## 48           glad 11
## 49           luck 11
## 50           save 11
## 51      wonderful 11
## 52          youth 11
## 53           beer 10
## 54         income 10
## 55          pride 10
## 56            sun 10
## 57           cash  9
## 58    celebration  9
## 59       ceremony  9
## 60          child  9
## 61           jump  9
## 62         praise  9
## 63        advance  8
## 64          clean  8
## 65      encourage  8
## 66       thankful  8
## 67          award  7
## 68          faith  7
## 69        freedom  7
## 70          grant  7
## 71       humanity  7
## 72        perfect  7
## 73       daughter  6
## 74       friendly  6
## 75         garden  6
## 76        healing  6
## 77            joy  6
## 78          labor  6
## 79       progress  6
## 80            art  5
## 81     basketball  5
## 82          dance  5
## 83       equality  5
## 84       generous  5
## 85        helpful  5
## 86        improve  5
## 87       laughing  5
## 88        miracle  5
## 89      supremacy  5
## 90       thriving  5
## 91       vacation  5
## 92         wealth  5
## 93       advocacy  4
## 94          birth  4
## 95        blessed  4
## 96     celebrated  4
## 97    celebrating  4
## 98        charity  4
## 99        content  4
## 100     delicious  4
## 101          gain  4
## 102         green  4
## 103          heal  4
## 104         laugh  4
## 105        loving  4
## 106      majority  4
## 107         music  4
## 108       pleased  4
## 109      powerful  4
## 110       promise  4
## 111         saint  4
## 112    successful  4
## 113      surprise  4
## 114  appreciation  3
## 115        beauty  3
## 116      blessing  3
## 117         bonus  3
## 118     cathedral  3
## 119     childhood  3
## 120       comfort  3
## 121       endless  3
## 122      festival  3
## 123        freely  3
## 124          grow  3
## 125     heartfelt  3
## 126  organization  3
## 127        parade  3
## 128    retirement  3
## 129         score  3
## 130       smiling  3
## 131           spa  3
## 132         sweet  3
## 133          swim  3
## 134    unexpected  3
## 135     visionary  3
## 136       visitor  3
## 137     volunteer  3
## 138        weight  3
## 139       winning  3
## 140  accomplished  2
## 141       approve  2
## 142        candid  2
## 143      cheering  2
## 144     closeness  2
## 145         cream  2
## 146         elite  2
## 147       engaged  2
## 148      enjoying  2
## 149 entertainment  2
## 150      exciting  2
## 151       fitting  2
## 152         glory  2
## 153      gorgeous  2
## 154 grandchildren  2
## 155       holiday  2
## 156       hopeful  2
## 157           hug  2
## 158   improvement  2
## 159  inauguration  2
## 160      inspired  2
## 161    intimately  2
## 162        invite  2
## 163       journey  2
## 164        joyous  2
## 165         kudos  2
## 166        liquor  2
## 167         lucky  2
## 168     marvelous  2
## 169     practiced  2
## 170        salute  2
## 171           sex  2
## 172      shopping  2
## 173       spirits  2
## 174       succeed  2
## 175       victory  2
## 176         wages  2
## 177      welcomed  2
## 178     abundance  1
## 179    accomplish  1
## 180     adoration  1
## 181          amen  1
## 182     amusement  1
## 183       banquet  1
## 184     blessings  1
## 185         bloom  1
## 186        bridal  1
## 187     brilliant  1
## 188         buddy  1
## 189         chant  1
## 190    charitable  1
## 191     chocolate  1
## 192         clown  1
## 193     communion  1
## 194    compliment  1
## 195    confidence  1
## 196     confident  1
## 197          dawn  1
## 198       embrace  1
## 199     enlighten  1
## 200  entertaining  1
## 201        erotic  1
## 202        exceed  1
## 203         fancy  1
## 204          gift  1
## 205        giggle  1
## 206       glimmer  1
## 207     gratitude  1
## 208     happiness  1
## 209     healthful  1
## 210        heroic  1
## 211        heyday  1
## 212     hilarious  1
## 213          hire  1
## 214        honest  1
## 215  humanitarian  1
## 216  independence  1
## 217   inspiration  1
## 218       inspire  1
## 219  intelligence  1
## 220          kiss  1
## 221      liberate  1
## 222       liberty  1
## 223         loyal  1
## 224        luxury  1
## 225      majestic  1
## 226      marriage  1
## 227         marry  1
## 228       massage  1
## 229         medal  1
## 230      ministry  1
## 231       musical  1
## 232       notable  1
## 233         opera  1
## 234   outstanding  1
## 235       passion  1
## 236    passionate  1
## 237        pastor  1
## 238      pleasant  1
## 239       praised  1
## 240      precious  1
## 241    privileged  1
## 242     readiness  1
## 243     receiving  1
## 244    recreation  1
## 245       rejoice  1
## 246         repay  1
## 247        rescue  1
## 248        reward  1
## 249        ribbon  1
## 250       romance  1
## 251        salary  1
## 252     satisfied  1
## 253   scholarship  1
## 254       shining  1
## 255         silly  1
## 256         smile  1
## 257        spouse  1
## 258      sunshine  1
## 259     supporter  1
## 260        sweets  1
## 261      symphony  1
## 262         teach  1
## 263        tender  1
## 264   tranquility  1
## 265      treasure  1
## 266        trophy  1
## 267       undying  1
## 268         vivid  1
## 269          whim  1
## 270        winner  1
## 271   wonderfully  1
## 272       worship  1
nrc_anger <- nrc %>%
  filter(sentiment == "anger")

tidy_tweetsGB %>%
  filter(year == "y2022") %>%
  inner_join(nrc_anger) %>%
  count(word, sort = TRUE)
## Joining, by = "word"
##              word  n
## 1           death 25
## 2             bad 18
## 3             jab 15
## 4         disease 10
## 5         feeling  9
## 6             hit  8
## 7          cancer  7
## 8         deserve  7
## 9           dying  7
## 10        killing  7
## 11         bloody  6
## 12          fight  6
## 13          money  6
## 14         deadly  5
## 15           fear  5
## 16         losing  5
## 17       politics  5
## 18        poverty  5
## 19           shit  5
## 20           shot  5
## 21          smell  5
## 22          treat  5
## 23          words  5
## 24         attack  4
## 25          awful  4
## 26          blame  4
## 27          court  4
## 28     disruption  4
## 29       fighting  4
## 30      mortality  4
## 31        opposed  4
## 32         resign  4
## 33         threat  4
## 34        adverse  3
## 35         broken  3
## 36          clash  3
## 37         damage  3
## 38           hate  3
## 39  insignificant  3
## 40           loss  3
## 41          lying  3
## 42            mad  3
## 43     opposition  3
## 44          shock  3
## 45       argument  2
## 46        assault  2
## 47          chaos  2
## 48         combat  2
## 49        cutting  2
## 50          delay  2
## 51           deny  2
## 52       disagree  2
## 53       disaster  2
## 54        enforce  2
## 55          harry  2
## 56       horrible  2
## 57     misleading  2
## 58      morbidity  2
## 59       shortage  2
## 60          shout  2
## 61           sore  2
## 62         victim  2
## 63          youth  2
## 64      abandoned  1
## 65          abuse  1
## 66        accused  1
## 67     aggression  1
## 68        anxiety  1
## 69          armed  1
## 70       arrogant  1
## 71           bear  1
## 72          bitch  1
## 73    campaigning  1
## 74        caution  1
## 75      celebrity  1
## 76      challenge  1
## 77      communism  1
## 78    confinement  1
## 79      confusion  1
## 80       contempt  1
## 81          crazy  1
## 82       criminal  1
## 83           defy  1
## 84         demand  1
## 85        despair  1
## 86     diabolical  1
## 87       disgrace  1
## 88    disgraceful  1
## 89      displaced  1
## 90     disrespect  1
## 91       epidemic  1
## 92       escalate  1
## 93           evil  1
## 94          exile  1
## 95        failing  1
## 96            fee  1
## 97          fraud  1
## 98     frustrated  1
## 99           grab  1
## 100          grim  1
## 101        guilty  1
## 102           hot  1
## 103      insanity  1
## 104        insult  1
## 105      invasion  1
## 106          kick  1
## 107       limited  1
## 108        lonely  1
## 109          lose  1
## 110       lunatic  1
## 111       madness  1
## 112  manslaughter  1
## 113        misery  1
## 114       mocking  1
## 115        morals  1
## 116           mug  1
## 117       offense  1
## 118     offensive  1
## 119   persecution  1
## 120    pretending  1
## 121         prick  1
## 122        prison  1
## 123     psychosis  1
## 124          rage  1
## 125          rail  1
## 126        rating  1
## 127         react  1
## 128    resentment  1
## 129       retract  1
## 130      ridicule  1
## 131       sarcasm  1
## 132        savage  1
## 133      sentence  1
## 134     socialist  1
## 135        strike  1
## 136      terrible  1
## 137         thief  1
## 138       traitor  1
## 139       violent  1
nrc_fear <- nrc %>%
  filter(sentiment == "fear")

tidy_tweetsCA %>%
  filter(year == "y2020") %>%
  inner_join(nrc_fear) %>%
  count(word, sort = TRUE)
## Joining, by = "word"
##               word   n
## 1           stigma 547
## 2         pandemic 219
## 3            death  83
## 4          medical  75
## 5        emergency  65
## 6       government  62
## 7         hospital  51
## 8             risk  48
## 9            fight  44
## 10          change  37
## 11         disease  27
## 12            fear  25
## 13           spike  21
## 14           force  19
## 15         prevent  19
## 16           watch  18
## 17           avoid  15
## 18             bad  15
## 19             die  15
## 20      quarantine  15
## 21       infection  14
## 22          police  14
## 23         remains  14
## 24    surveillance  14
## 25       challenge  13
## 26  discrimination  13
## 27           youth  13
## 28           delay  12
## 29             god  11
## 30         illness  11
## 31          deadly  10
## 32           dying   9
## 33      infectious   9
## 34       concerned   8
## 35         feeling   8
## 36      inequality   8
## 37            lose   8
## 38            warn   8
## 39           worry   8
## 40          afraid   7
## 41     confinement   7
## 42           crazy   7
## 43       dangerous   7
## 44       difficult   7
## 45        disaster   7
## 46        epidemic   7
## 47             flu   7
## 48         poverty   7
## 49          prison   7
## 50           worse   7
## 51           abuse   6
## 52         caution   6
## 53          forced   6
## 54           lines   6
## 55           treat   6
## 56             war   6
## 57         warning   6
## 58          cancer   5
## 59           court   5
## 60          danger   5
## 61         failure   5
## 62            fire   5
## 63         hearing   5
## 64        struggle   5
## 65        violence   5
## 66          warden   5
## 67         abandon   4
## 68         advance   4
## 69           alarm   4
## 70          combat   4
## 71      confidence   4
## 72       contagion   4
## 73      contagious   4
## 74        disabled   4
## 75           doubt   4
## 76         enforce   4
## 77           guard   4
## 78            loss   4
## 79        military   4
## 80          murder   4
## 81         nervous   4
## 82            rule   4
## 83        surprise   4
## 84          unsafe   4
## 85          urgent   4
## 86         worship   4
## 87         anxiety   3
## 88            bear   3
## 89       brutality   3
## 90           burke   3
## 91      compassion   3
## 92       confusion   3
## 93       diagnosis   3
## 94     examination   3
## 95      graduation   3
## 96            hate   3
## 97         illegal   3
## 98      insecurity   3
## 99          lawyer   3
## 100        missing   3
## 101        painful   3
## 102          polio   3
## 103     retirement   3
## 104         stroke   3
## 105      suffering   3
## 106     suspension   3
## 107       terrible   3
## 108      volunteer   3
## 109         warned   3
## 110        accused   2
## 111     apparition   2
## 112        assault   2
## 113         beware   2
## 114          bitch   2
## 115          blues   2
## 116          broke   2
## 117         broken   2
## 118           cash   2
## 119          chaos   2
## 120     conspiracy   2
## 121   contaminated   2
## 122          cross   2
## 123          cruel   2
## 124        crushed   2
## 125       dementia   2
## 126     destroying   2
## 127   dictatorship   2
## 128 disinformation   2
## 129     disruption   2
## 130        failing   2
## 131        fearful   2
## 132          fever   2
## 133          flood   2
## 134        fragile   2
## 135           gore   2
## 136        hanging   2
## 137        hunting   2
## 138         injury   2
## 139   intelligence   2
## 140        journey   2
## 141           khan   2
## 142           kill   2
## 143        killing   2
## 144          loyal   2
## 145  manifestation   2
## 146      mortality   2
## 147           pain   2
## 148           plea   2
## 149      procedure   2
## 150       punitive   2
## 151         remove   2
## 152          shame   2
## 153          shoot   2
## 154       shooting   2
## 155           shot   2
## 156         shrink   2
## 157        suicide   2
## 158        suspect   2
## 159       threaten   2
## 160        tragedy   2
## 161     unexpected   2
## 162        unknown   2
## 163         unruly   2
## 164           wary   2
## 165         weight   2
## 166      abandoned   1
## 167       accident   1
## 168      aftermath   1
## 169      agonizing   1
## 170       alarming   1
## 171      ambulance   1
## 172        anarchy   1
## 173          armed   1
## 174         attack   1
## 175       attorney   1
## 176        autopsy   1
## 177       avoiding   1
## 178          awful   1
## 179       bacteria   1
## 180        beating   1
## 181        bigoted   1
## 182          birth   1
## 183         bloody   1
## 184    bombardment   1
## 185         brutal   1
## 186           buck   1
## 187          bully   1
## 188         burial   1
## 189          cabal   1
## 190       cautious   1
## 191       cemetery   1
## 192          cliff   1
## 193      concealed   1
## 194       conflict   1
## 195         coward   1
## 196          crash   1
## 197       criminal   1
## 198        cyclone   1
## 199           dart   1
## 200        default   1
## 201         defend   1
## 202        defense   1
## 203    deleterious   1
## 204         demise   1
## 205      dentistry   1
## 206    destination   1
## 207  deterioration   1
## 208    devastating   1
## 209           dire   1
## 210      disappear   1
## 211     disastrous   1
## 212     discipline   1
## 213     discourage   1
## 214     disgusting   1
## 215      dismissal   1
## 216     distressed   1
## 217        divorce   1
## 218       dominant   1
## 219         dragon   1
## 220        endless   1
## 221          erase   1
## 222       exorcism   1
## 223      explosive   1
## 224       fatality   1
## 225           fled   1
## 226         flying   1
## 227      forgotten   1
## 228          giant   1
## 229          grave   1
## 230            gun   1
## 231           harm   1
## 232           hide   1
## 233         hiding   1
## 234      holocaust   1
## 235       homeless   1
## 236         honest   1
## 237       horrible   1
## 238       horrific   1
## 239        horrors   1
## 240        hostage   1
## 241           hurt   1
## 242      immigrant   1
## 243  incarceration   1
## 244         inmate   1
## 245         insane   1
## 246       insanity   1
## 247       insecure   1
## 248           jail   1
## 249        lawsuit   1
## 250           loom   1
## 251          lynch   1
## 252            mad   1
## 253        madness   1
## 254   manipulation   1
## 255            mob   1
## 256       mortgage   1
## 257       newcomer   1
## 258       opponent   1
## 259        opposed   1
## 260       ordnance   1
## 261          panic   1
## 262       paranoia   1
## 263        penalty   1
## 264         plight   1
## 265      pneumonia   1
## 266       poisoned   1
## 267       powerful   1
## 268           pray   1
## 269         punish   1
## 270      punishing   1
## 271            rat   1
## 272         ravine   1
## 273      recession   1
## 274       reckless   1
## 275     regulatory   1
## 276        rejects   1
## 277      reluctant   1
## 278         resign   1
## 279           riot   1
## 280            sag   1
## 281        scandal   1
## 282          scare   1
## 283      screaming   1
## 284       sentence   1
## 285      sickening   1
## 286            sin   1
## 287       sinister   1
## 288           slam   1
## 289          stint   1
## 290      supremacy   1
## 291        surgery   1
## 292          sweat   1
## 293      terrorist   1
## 294          theft   1
## 295         threat   1
## 296          troll   1
## 297        turmoil   1
## 298      uncertain   1
## 299     unemployed   1
## 300         uphill   1
## 301       vanished   1
## 302          venom   1
## 303        violent   1
## 304       worrying   1
## 305          wrath   1
## 306     xenophobia   1

Let’s create the GB function

GB_Covid_Sentiment <- tidy_tweetsGB %>%
  inner_join(get_sentiments("bing")) %>%
  count(year, index = id %/% 80, sentiment) %>%
  pivot_wider(names_from = sentiment, values_from = n, values_fill = 0) %>%
  dplyr::mutate(sentiment = positive - negative)
## Joining, by = "word"

Let’s plot the sentiment analysis for GB.

library(ggplot2)

ggplot(GB_Covid_Sentiment, aes(sentiment, fill = year)) +
  geom_histogram(show.legend = FALSE) +
  facet_wrap(~year, ncol = 2, scales = "free_x") 
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

Let’s load the required package.

library(stats)

Let’s get the aggregate sentiment score for the COVID-19 tweets in GB

GB_Covid_Sentiment_Means <- aggregate(x = GB_Covid_Sentiment$sentiment, by = list(GB_Covid_Sentiment$year), FUN = mean)

GB_Covid_Sentiment_Means
##   Group.1          x
## 1   y2020 -0.5427632
## 2   y2021 -0.3676412
## 3   y2022 -0.4467806

Let’s look at the US data.

US_Covid_Sentiment <- tidy_tweetsUS %>%
  inner_join(get_sentiments("bing")) %>%
  count(year, index = id %/% 80, sentiment) %>%
  pivot_wider(names_from = sentiment, values_from = n, values_fill = 0) %>%
  dplyr::mutate(sentiment = positive - negative)
## Joining, by = "word"

Let’s plot the sentiment analysis for US.

library(ggplot2)

ggplot(US_Covid_Sentiment, aes(sentiment, fill = year)) +
  geom_histogram(show.legend = FALSE) +
  facet_wrap(~year, ncol = 2, scales = "free_x") 
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

Let’s load the required package.

library(stats)

Let’s get the aggregate sentiment score for the COVID-19 tweets in the US.

US_Covid_Sentiment_Means <- aggregate(x = US_Covid_Sentiment$sentiment, by = list(US_Covid_Sentiment$year), FUN = mean)

US_Covid_Sentiment_Means
##   Group.1          x
## 1   y2020 -0.6524333
## 2   y2021 -0.6231979
## 3   y2022 -0.5132297

Let’s look at the Canada Data.

CA_Covid_Sentiment <- tidy_tweetsCA %>%
  inner_join(get_sentiments("bing")) %>%
  count(year, index = id %/% 80, sentiment) %>%
  pivot_wider(names_from = sentiment, values_from = n, values_fill = 0) %>%
  dplyr::mutate(sentiment = positive - negative)
## Joining, by = "word"

Let’s plot the sentiment analysis for Canada.

library(ggplot2)

ggplot(CA_Covid_Sentiment, aes(sentiment, fill = year)) +
  geom_histogram(show.legend = FALSE) +
  facet_wrap(~year, ncol = 2, scales = "free_x") 
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

Let’s load the required package.

library(stats)

Let’s get the aggregate sentiment score for the COVID-19 tweets in Canada.

CA_Covid_Sentiment_Means <- aggregate(x = CA_Covid_Sentiment$sentiment, by = list(CA_Covid_Sentiment$year), FUN = mean)

CA_Covid_Sentiment_Means
##   Group.1          x
## 1   y2020 -0.5991539
## 2   y2021 -0.6831442
## 3   y2022 -0.3742138

Let’s join the US data.

bing_word_counts_US <- tidy_tweetsUS %>%
  inner_join(get_sentiments("bing")) %>%
  count(word, sentiment, sort = TRUE) %>%
  ungroup() 
## Joining, by = "word"
bing_word_counts_US
##                  word sentiment   n
## 1            positive  positive 609
## 2               trump  positive 433
## 3               virus  negative 411
## 4                died  negative 297
## 5               death  negative 292
## 6                safe  positive 237
## 7                free  positive 223
## 8                lost  negative 186
## 9            symptoms  negative 178
## 10           protests  negative 170
## 11                die  negative 164
## 12               sick  negative 155
## 13               risk  negative 150
## 14            protect  positive 140
## 15                bad  negative 137
## 16            support  positive 136
## 17           breaking  negative 123
## 18              happy  positive 122
## 19            protest  negative 118
## 20               dead  negative 115
## 21           negative  negative 110
## 22             issues  negative 105
## 23               love  positive 104
## 24               shit  negative 103
## 25              dying  negative 101
## 26          infection  negative 100
## 27             relief  positive  98
## 28             racism  negative  97
## 29           infected  negative  95
## 30             crisis  negative  93
## 31               hard  negative  93
## 32               fuck  negative  85
## 33              rapid  positive  85
## 34              worse  negative  84
## 35         protesting  negative  80
## 36          emergency  negative  77
## 37             killed  negative  77
## 38            healthy  positive  76
## 39                top  positive  69
## 40               dies  negative  67
## 41               kill  negative  66
## 42               toll  negative  66
## 43               fake  negative  64
## 44           outbreak  negative  64
## 45              wrong  negative  64
## 46               cold  negative  60
## 47             deadly  negative  60
## 48             excuse  negative  60
## 49              ready  positive  60
## 50              super  positive  60
## 51              issue  negative  59
## 52              break  negative  58
## 53            killing  negative  58
## 54             severe  negative  58
## 55              blame  negative  57
## 56               damn  negative  57
## 57               hoax  negative  57
## 58           recovery  positive  57
## 59                sad  negative  57
## 60           concerns  negative  55
## 61         impossible  negative  54
## 62              loved  positive  54
## 63             pretty  positive  53
## 64              shame  negative  52
## 65          effective  positive  51
## 66           grateful  positive  51
## 67         infections  negative  50
## 68            amazing  positive  49
## 69               hate  negative  48
## 70               fear  negative  47
## 71            fucking  negative  47
## 72              worst  negative  47
## 73          dangerous  negative  46
## 74              proud  positive  46
## 75             stupid  negative  46
## 76            helping  positive  45
## 77            limited  negative  44
## 78               miss  negative  44
## 79             strain  negative  43
## 80         vulnerable  negative  43
## 81          brutality  negative  42
## 82            failure  negative  42
## 83               fall  negative  40
## 84               lack  negative  40
## 85          appealing  positive  39
## 86               fine  positive  39
## 87            illness  negative  39
## 88            patient  positive  39
## 89         unemployed  negative  39
## 90             cancer  negative  38
## 91            excited  positive  38
## 92                lie  negative  38
## 93             murder  negative  38
## 94                win  positive  38
## 95              crazy  negative  37
## 96               cure  positive  37
## 97             strong  positive  37
## 98              trust  positive  37
## 99          concerned  negative  36
## 100          guidance  positive  36
## 101             lying  negative  36
## 102            racist  negative  36
## 103              slow  negative  36
## 104              easy  positive  35
## 105            failed  negative  35
## 106         isolation  negative  35
## 107              lies  negative  35
## 108               wow  positive  35
## 109               fun  positive  34
## 110           worried  negative  34
## 111              loss  negative  33
## 112            missed  negative  33
## 113        protection  positive  33
## 114             tired  negative  33
## 115              lose  negative  32
## 116              pain  negative  32
## 117              poor  negative  32
## 118        struggling  negative  32
## 119             worry  negative  32
## 120        conspiracy  negative  31
## 121             false  negative  31
## 122              fans  positive  31
## 123              glad  positive  31
## 124            threat  negative  31
## 125         difficult  negative  30
## 126             peace  positive  30
## 127          peaceful  positive  30
## 128             worth  positive  30
## 129        contagious  negative  29
## 130           leading  positive  29
## 131         beautiful  positive  28
## 132          favorite  positive  28
## 133              lead  positive  28
## 134       significant  positive  28
## 135            unrest  negative  28
## 136            afraid  negative  27
## 137            losing  negative  27
## 138           respect  positive  27
## 139          terrible  negative  27
## 140         wonderful  positive  27
## 141          bullshit  negative  26
## 142          critical  negative  26
## 143              fast  positive  26
## 144              luck  positive  26
## 145            prison  negative  26
## 146          thankful  positive  26
## 147                bs  negative  25
## 148           concern  negative  25
## 149              hurt  negative  25
## 150            scared  negative  25
## 151         excellent  positive  24
## 152              hero  positive  24
## 153            proper  positive  24
## 154           recover  positive  24
## 155             delay  negative  23
## 156             funny  negative  23
## 157          benefits  positive  22
## 158             bless  positive  22
## 159          disaster  negative  22
## 160              joke  negative  22
## 161              nice  positive  22
## 162             scary  negative  22
## 163            unable  negative  22
## 164           awesome  positive  21
## 165            denied  negative  21
## 166            impede  negative  21
## 167             kills  negative  21
## 168           perfect  positive  21
## 169          refusing  negative  21
## 170         suffering  negative  21
## 171        supporting  positive  21
## 172             tough  positive  21
## 173            breaks  negative  20
## 174   congratulations  positive  20
## 175          criminal  negative  20
## 176             doubt  negative  20
## 177         encourage  positive  20
## 178              evil  negative  20
## 179            helped  positive  20
## 180             sadly  negative  20
## 181             sucks  negative  20
## 182          alarming  negative  19
## 183            damage  negative  19
## 184           delayed  negative  19
## 185              fair  positive  19
## 186             honor  positive  19
## 187              lied  negative  19
## 188              mess  negative  19
## 189             risks  negative  19
## 190              wild  negative  19
## 191            attack  negative  18
## 192            delays  negative  18
## 193             fraud  negative  18
## 194           freedom  positive  18
## 195       overwhelmed  negative  18
## 196         recommend  positive  18
## 197              rich  positive  18
## 198           success  positive  18
## 199          survival  positive  18
## 200          approval  positive  17
## 201             chaos  negative  17
## 202             clean  positive  17
## 203             crime  negative  17
## 204        depression  negative  17
## 205           destroy  negative  17
## 206          horrible  negative  17
## 207               hot  positive  17
## 208      incompetence  negative  17
## 209        ridiculous  negative  17
## 210            safely  positive  17
## 211             smart  positive  17
## 212           supreme  positive  17
## 213           symptom  negative  17
## 214             waste  negative  17
## 215            afford  positive  16
## 216           anxiety  negative  16
## 217         celebrate  positive  16
## 218            danger  negative  16
## 219              dumb  negative  16
## 220           expired  negative  16
## 221             idiot  negative  16
## 222         injustice  negative  16
## 223            killer  negative  16
## 224            refuse  negative  16
## 225               rip  negative  16
## 226           selfish  negative  16
## 227          severity  negative  16
## 228          struggle  negative  16
## 229           warning  negative  16
## 230          accurate  positive  15
## 231             angry  negative  15
## 232          confused  negative  15
## 233              cool  positive  15
## 234              dark  negative  15
## 235             enjoy  positive  15
## 236          epidemic  negative  15
## 237             favor  positive  15
## 238             lucky  positive  15
## 239               mad  negative  15
## 240            proven  positive  15
## 241           qualify  positive  15
## 242               sin  negative  15
## 243           suspect  negative  15
## 244              weak  negative  15
## 245             weird  negative  15
## 246        disgusting  negative  14
## 247            easier  positive  14
## 248             faith  positive  14
## 249            faster  positive  14
## 250             fault  negative  14
## 251              holy  positive  14
## 252            idiots  negative  14
## 253        incredible  positive  14
## 254          isolated  negative  14
## 255             pride  positive  14
## 256            raging  negative  14
## 257           rampant  negative  14
## 258         struggles  negative  14
## 259       unnecessary  negative  14
## 260      breakthrough  positive  13
## 261             broke  negative  13
## 262           complex  negative  13
## 263             fever  negative  13
## 264       incompetent  negative  13
## 265           isolate  negative  13
## 266              liar  negative  13
## 267             limit  negative  13
## 268             moron  negative  13
## 269       recommended  positive  13
## 270              sore  negative  13
## 271          suffered  negative  13
## 272          supports  positive  13
## 273             trash  negative  13
## 274            urgent  negative  13
## 275             bitch  negative  12
## 276       celebration  positive  12
## 277           correct  positive  12
## 278              fail  negative  12
## 279            insane  negative  12
## 280            losses  negative  12
## 281          nonsense  negative  12
## 282               odd  negative  12
## 283      overwhelming  negative  12
## 284            plague  negative  12
## 285          powerful  positive  12
## 286          progress  positive  12
## 287          properly  positive  12
## 288           refused  negative  12
## 289          shortage  negative  12
## 290             smell  negative  12
## 291            stress  negative  12
## 292             stuck  negative  12
## 293            suffer  negative  12
## 294               won  positive  12
## 295           attacks  negative  11
## 296           benefit  positive  11
## 297              debt  negative  11
## 298           decline  negative  11
## 299          enjoying  positive  11
## 300           failing  negative  11
## 301             fresh  positive  11
## 302              hang  negative  11
## 303         hypocrisy  negative  11
## 304         ignorance  negative  11
## 305               joy  positive  11
## 306               led  positive  11
## 307            loving  positive  11
## 308        misleading  negative  11
## 309           nervous  negative  11
## 310            secure  positive  11
## 311           unknown  negative  11
## 312             award  positive  10
## 313              burn  negative  10
## 314      conservative  negative  10
## 315           crowded  negative  10
## 316            denial  negative  10
## 317           denying  negative  10
## 318      disappointed  negative  10
## 319            expire  negative  10
## 320             fails  negative  10
## 321           fatigue  negative  10
## 322              gain  positive  10
## 323             grand  positive  10
## 324               hug  positive  10
## 325          ignorant  negative  10
## 326            ignore  negative  10
## 327       improvement  positive  10
## 328        inequality  negative  10
## 329     irresponsible  negative  10
## 330             leads  positive  10
## 331           miracle  positive  10
## 332              plot  negative  10
## 333            praise  positive  10
## 334         promising  positive  10
## 335   recommendations  positive  10
## 336              scam  negative  10
## 337            slowly  negative  10
## 338            speedy  positive  10
## 339          stronger  positive  10
## 340              warm  positive  10
## 341           winning  positive  10
## 342         advantage  positive   9
## 343             awful  negative   9
## 344           begging  negative   9
## 345            bright  positive   9
## 346             bully  negative   9
## 347       challenging  negative   9
## 348             cheap  negative   9
## 349           comfort  positive   9
## 350        commitment  positive   9
## 351        confidence  positive   9
## 352           corrupt  negative   9
## 353              crap  negative   9
## 354            damned  negative   9
## 355            defeat  positive   9
## 356  disproportionate  negative   9
## 357             enemy  negative   9
## 358             error  negative   9
## 359             fatal  negative   9
## 360             fears  negative   9
## 361          friendly  positive   9
## 362       frustrating  negative   9
## 363              hack  negative   9
## 364              harm  negative   9
## 365           honored  positive   9
## 366          honoring  positive   9
## 367             hurts  negative   9
## 368           improve  positive   9
## 369        incredibly  positive   9
## 370      insurrection  negative   9
## 371            lethal  negative   9
## 372             loses  negative   9
## 373              loud  negative   9
## 374             mercy  positive   9
## 375           monster  negative   9
## 376           promise  positive   9
## 377              rage  negative   9
## 378            reform  positive   9
## 379        starvation  negative   9
## 380        successful  positive   9
## 381          survivor  positive   9
## 382            timely  positive   9
## 383            touted  negative   9
## 384             upset  negative   9
## 385           absence  negative   8
## 386        affordable  positive   8
## 387            awards  positive   8
## 388            broken  negative   8
## 389            burden  negative   8
## 390          collapse  negative   8
## 391       comfortable  positive   8
## 392         complicit  negative   8
## 393         confusion  negative   8
## 394          creative  positive   8
## 395         dedicated  positive   8
## 396       devastating  negative   8
## 397              dire  negative   8
## 398             dirty  negative   8
## 399           empathy  positive   8
## 400       encouraging  positive   8
## 401         equitable  positive   8
## 402               fat  negative   8
## 403           garbage  negative   8
## 404          goodness  positive   8
## 405           hurting  negative   8
## 406       ineffective  negative   8
## 407            morons  negative   8
## 408             nasty  negative   8
## 409        negligence  negative   8
## 410         nightmare  negative   8
## 411          obsolete  negative   8
## 412               pig  negative   8
## 413           popular  positive   8
## 414         privilege  positive   8
## 415             quiet  positive   8
## 416           radical  negative   8
## 417             rough  negative   8
## 418            ruined  negative   8
## 419        solidarity  positive   8
## 420          stealing  negative   8
## 421           strange  negative   8
## 422           suicide  negative   8
## 423             sweet  positive   8
## 424            tragic  negative   8
## 425          vigilant  positive   8
## 426            warned  negative   8
## 427              worn  negative   8
## 428            absurd  negative   7
## 429             abuse  negative   7
## 430          adequate  positive   7
## 431          advocate  positive   7
## 432       appreciated  positive   7
## 433           ashamed  negative   7
## 434            brutal  negative   7
## 435           cleared  positive   7
## 436        corruption  negative   7
## 437            coward  negative   7
## 438             crash  negative   7
## 439              deny  negative   7
## 440          disagree  negative   7
## 441       effectively  positive   7
## 442          exciting  positive   7
## 443           falsely  negative   7
## 444          freaking  negative   7
## 445              gold  positive   7
## 446             grace  positive   7
## 447              grim  negative   7
## 448              heck  negative   7
## 449           helpful  positive   7
## 450           idiotic  negative   7
## 451           illegal  negative   7
## 452         inability  negative   7
## 453            injury  negative   7
## 454         liability  negative   7
## 455          needless  negative   7
## 456        optimistic  positive   7
## 457           pleased  positive   7
## 458           pretend  negative   7
## 459        propaganda  negative   7
## 460            proves  positive   7
## 461            regret  negative   7
## 462           screwed  negative   7
## 463          sickness  negative   7
## 464             smoke  negative   7
## 465            smooth  positive   7
## 466             stole  negative   7
## 467              suck  negative   7
## 468         supported  positive   7
## 469         supremacy  positive   7
## 470       susceptible  negative   7
## 471          thrilled  positive   7
## 472          thriving  positive   7
## 473              tops  positive   7
## 474           trouble  negative   7
## 475               ugh  negative   7
## 476      unacceptable  negative   7
## 477         uncertain  negative   7
## 478      undocumented  negative   7
## 479              weed  negative   7
## 480               yay  positive   7
## 481          absentee  negative   6
## 482         abundance  positive   6
## 483      accomplished  positive   6
## 484             aches  negative   6
## 485        apocalypse  negative   6
## 486          arrogant  negative   6
## 487            beauty  positive   6
## 488             blind  negative   6
## 489             bored  negative   6
## 490            bother  negative   6
## 491             brave  positive   6
## 492               bug  negative   6
## 493           burning  negative   6
## 494          champion  positive   6
## 495             cheer  positive   6
## 496          complain  negative   6
## 497         confusing  negative   6
## 498          credible  positive   6
## 499       desperately  negative   6
## 500       destruction  negative   6
## 501             devil  negative   6
## 502              dick  negative   6
## 503        difficulty  negative   6
## 504          disgrace  negative   6
## 505        disturbing  negative   6
## 506              dump  negative   6
## 507              dust  negative   6
## 508              ease  positive   6
## 509     effectiveness  positive   6
## 510              fell  negative   6
## 511              fool  negative   6
## 512       frustration  negative   6
## 513             gains  positive   6
## 514         happiness  positive   6
## 515          hardship  negative   6
## 516            hatred  negative   6
## 517             havoc  negative   6
## 518              heal  positive   6
## 519         heartfelt  positive   6
## 520            honest  positive   6
## 521           hopeful  positive   6
## 522        impressive  positive   6
## 523          inaction  negative   6
## 524     inconvenience  negative   6
## 525        inequities  negative   6
## 526       inexcusable  negative   6
## 527            ironic  negative   6
## 528             loser  negative   6
## 529             magic  positive   6
## 530            messed  negative   6
## 531              myth  negative   6
## 532           outrage  negative   6
## 533           painful  negative   6
## 534               pan  negative   6
## 535             panic  negative   6
## 536          pleasure  positive   6
## 537         pointless  negative   6
## 538            poorly  negative   6
## 539         positives  positive   6
## 540           poverty  negative   6
## 541           premier  positive   6
## 542        privileged  positive   6
## 543           proving  positive   6
## 544           quicker  positive   6
## 545            robust  positive   6
## 546             scare  negative   6
## 547           shocked  negative   6
## 548            silent  positive   6
## 549         skeptical  negative   6
## 550             steal  negative   6
## 551            strict  negative   6
## 552              sued  negative   6
## 553       sustainable  positive   6
## 554         terrorism  negative   6
## 555           threats  negative   6
## 556           treason  negative   6
## 557       unfortunate  negative   6
## 558        accurately  positive   5
## 559           adverse  negative   5
## 560           allergy  negative   5
## 561          annoying  negative   5
## 562           approve  positive   5
## 563           assault  negative   5
## 564           beloved  positive   5
## 565             bonus  positive   5
## 566             boost  positive   5
## 567         breakdown  negative   5
## 568         brilliant  positive   5
## 569              calm  positive   5
## 570             chill  negative   5
## 571           chronic  negative   5
## 572           classic  positive   5
## 573        congestion  negative   5
## 574        consistent  positive   5
## 575      contribution  positive   5
## 576         correctly  positive   5
## 577         criticism  negative   5
## 578             cruel  negative   5
## 579               cry  negative   5
## 580            decent  positive   5
## 581         declining  negative   5
## 582        deficiency  negative   5
## 583              defy  negative   5
## 584         delicious  positive   5
## 585        delusional  negative   5
## 586         desperate  negative   5
## 587          disabled  negative   5
## 588        disastrous  negative   5
## 589       distraction  negative   5
## 590             elite  positive   5
## 591           excuses  negative   5
## 592          failures  negative   5
## 593             falls  negative   5
## 594         fantastic  positive   5
## 595         fortunate  positive   5
## 596            fumble  negative   5
## 597          generous  positive   5
## 598             glory  positive   5
## 599             greed  negative   5
## 600             gripe  negative   5
## 601           grossly  negative   5
## 602            guilty  negative   5
## 603             hates  negative   5
## 604            hazard  negative   5
## 605         headaches  negative   5
## 606     heartbreaking  negative   5
## 607          horrific  negative   5
## 608          improved  positive   5
## 609         improving  positive   5
## 610         incorrect  negative   5
## 611        inevitable  negative   5
## 612        insecurity  negative   5
## 613         invisible  negative   5
## 614          jeopardy  negative   5
## 615             knock  negative   5
## 616             kudos  positive   5
## 617             liars  negative   5
## 618           liberty  positive   5
## 619             likes  positive   5
## 620             loose  negative   5
## 621              loot  negative   5
## 622            modern  positive   5
## 623        needlessly  negative   5
## 624            object  negative   5
## 625            openly  positive   5
## 626          painless  positive   5
## 627          pathetic  negative   5
## 628        protective  positive   5
## 629           racists  negative   5
## 630        reasonable  positive   5
## 631         recession  negative   5
## 632           refuses  negative   5
## 633          rhetoric  negative   5
## 634            richer  positive   5
## 635            scream  negative   5
## 636       selfishness  negative   5
## 637       seriousness  negative   5
## 638         sincerely  positive   5
## 639           smarter  positive   5
## 640             smile  positive   5
## 641           smiling  positive   5
## 642             solid  positive   5
## 643          soreness  negative   5
## 644             spite  negative   5
## 645            strike  negative   5
## 646         stupidity  negative   5
## 647      successfully  positive   5
## 648            sucked  negative   5
## 649       transparent  positive   5
## 650     uncomfortable  negative   5
## 651        unexpected  negative   5
## 652            unjust  negative   5
## 653         unwilling  negative   5
## 654          valuable  positive   5
## 655              vice  negative   5
## 656              vile  negative   5
## 657           violent  negative   5
## 658              warp  negative   5
## 659            wasted  negative   5
## 660         wellbeing  positive   5
## 661              wins  positive   5
## 662        accessible  positive   4
## 663          advanced  positive   4
## 664         adversity  negative   4
## 665        aggressive  negative   4
## 666         allergies  negative   4
## 667            appeal  positive   4
## 668             badly  negative   4
## 669              bias  negative   4
## 670          bleeding  negative   4
## 671          blessing  positive   4
## 672             bravo  positive   4
## 673          brighter  positive   4
## 674              bump  negative   4
## 675            burned  negative   4
## 676              bust  negative   4
## 677              cave  negative   4
## 678        celebrated  positive   4
## 679           clarity  positive   4
## 680       comfortably  positive   4
## 681        compassion  positive   4
## 682       complicated  negative   4
## 683        convenient  positive   4
## 684      conveniently  positive   4
## 685       cornerstone  positive   4
## 686       criticizing  negative   4
## 687          damaging  negative   4
## 688          defeated  positive   4
## 689        depressing  negative   4
## 690        despicable  negative   4
## 691          dictator  negative   4
## 692           dignity  positive   4
## 693         discredit  negative   4
## 694           dislike  negative   4
## 695         disregard  negative   4
## 696            doubts  negative   4
## 697       drastically  negative   4
## 698           easiest  positive   4
## 699         efficient  positive   4
## 700      embarrassing  negative   4
## 701       exceptional  positive   4
## 702         exhausted  negative   4
## 703     extraordinary  positive   4
## 704           falling  negative   4
## 705           fascism  negative   4
## 706           fascist  negative   4
## 707          feasible  positive   4
## 708            flawed  negative   4
## 709       flexibility  positive   4
## 710            fooled  negative   4
## 711              foul  negative   4
## 712            freeze  negative   4
## 713            genius  positive   4
## 714          genocide  negative   4
## 715          gorgeous  positive   4
## 716            greedy  negative   4
## 717             grief  negative   4
## 718         guarantee  positive   4
## 719             harsh  negative   4
## 720            hating  negative   4
## 721          headache  negative   4
## 722             ideal  positive   4
## 723         impressed  positive   4
## 724      improvements  positive   4
## 725        inaccurate  negative   4
## 726          insanity  negative   4
## 727       insensitive  negative   4
## 728           inspire  positive   4
## 729         inspiring  positive   4
## 730        irrelevant  negative   4
## 731              leak  negative   4
## 732            limits  negative   4
## 733        manipulate  negative   4
## 734         miserable  negative   4
## 735       misinformed  negative   4
## 736          murderer  negative   4
## 737           neglect  negative   4
## 738          opponent  negative   4
## 739            oppose  negative   4
## 740        opposition  negative   4
## 741        oppression  negative   4
## 742       outstanding  positive   4
## 743          patience  positive   4
## 744               pep  positive   4
## 745          pleasant  positive   4
## 746            poison  negative   4
## 747            prefer  positive   4
## 748             prize  positive   4
## 749        productive  positive   4
## 750          promised  positive   4
## 751          promises  positive   4
## 752         prosecute  negative   4
## 753         protested  negative   4
## 754        providence  positive   4
## 755            refund  positive   4
## 756            regard  positive   4
## 757         rejecting  negative   4
## 758          reliable  positive   4
## 759        resistance  negative   4
## 760        restricted  negative   4
## 761             saint  positive   4
## 762            scarce  negative   4
## 763             shake  negative   4
## 764          shambles  negative   4
## 765             shark  negative   4
## 766              sink  negative   4
## 767            steady  positive   4
## 768          stricken  negative   4
## 769               sue  negative   4
## 770        sufficient  positive   4
## 771       suppression  negative   4
## 772        suspicious  negative   4
## 773          syndrome  negative   4
## 774            talent  positive   4
## 775          talented  positive   4
## 776          terrific  positive   4
## 777          threaten  negative   4
## 778       threatening  negative   4
## 779           tougher  positive   4
## 780              tout  negative   4
## 781             touts  negative   4
## 782           tragedy  negative   4
## 783        treasonous  negative   4
## 784           trusted  positive   4
## 785              ugly  negative   4
## 786         uninsured  negative   4
## 787             unity  positive   4
## 788            unsafe  negative   4
## 789         upsetting  negative   4
## 790           useless  negative   4
## 791           victory  positive   4
## 792          vomiting  negative   4
## 793        weaknesses  negative   4
## 794            winner  positive   4
## 795            wisdom  positive   4
## 796              wise  positive   4
## 797           worries  negative   4
## 798         worsening  negative   4
## 799            worthy  positive   4
## 800             wound  negative   4
## 801            zombie  negative   4
## 802    accomplishment  positive   3
## 803          allergic  negative   3
## 804           anxious  negative   3
## 805       apocalyptic  negative   3
## 806           applaud  positive   3
## 807         atrocious  negative   3
## 808     authoritarian  negative   3
## 809              bash  negative   3
## 810           bastard  negative   3
## 811             beset  negative   3
## 812              blah  negative   3
## 813           blatant  negative   3
## 814             bogus  negative   3
## 815              boom  positive   3
## 816          brutally  negative   3
## 817           bullies  negative   3
## 818           capable  positive   3
## 819       catastrophe  negative   3
## 820      catastrophic  negative   3
## 821             clash  negative   3
## 822          clueless  negative   3
## 823           commend  positive   3
## 824     compassionate  positive   3
## 825        complaints  negative   3
## 826           condemn  negative   3
## 827         confident  positive   3
## 828          confront  negative   3
## 829      consistently  positive   3
## 830     controversial  negative   3
## 831       controversy  negative   3
## 832       convenience  positive   3
## 833           courage  positive   3
## 834        courageous  positive   3
## 835            crappy  negative   3
## 836         craziness  negative   3
## 837           critics  negative   3
## 838              cute  positive   3
## 839           damages  negative   3
## 840              deaf  negative   3
## 841            demise  negative   3
## 842             demon  negative   3
## 843          depraved  negative   3
## 844           despair  negative   3
## 845       destructive  negative   3
## 846        devastated  negative   3
## 847      difficulties  negative   3
## 848              dirt  negative   3
## 849     disappointing  negative   3
## 850    discrimination  negative   3
## 851       disgraceful  negative   3
## 852        disrespect  negative   3
## 853           disrupt  negative   3
## 854        disruption  negative   3
## 855        disruptive  negative   3
## 856          distress  negative   3
## 857          draining  negative   3
## 858            easing  positive   3
## 859          educated  positive   3
## 860       efficiently  positive   3
## 861          endanger  negative   3
## 862           enemies  negative   3
## 863           enjoyed  positive   3
## 864            exceed  positive   3
## 865      exploitation  negative   3
## 866            fallen  negative   3
## 867           fallout  negative   3
## 868             farce  negative   3
## 869           fearful  negative   3
## 870           fiction  negative   3
## 871          flexible  positive   3
## 872             fried  negative   3
## 873            gained  positive   3
## 874            golden  positive   3
## 875         gratitude  positive   3
## 876             grind  negative   3
## 877             guilt  negative   3
## 878           happier  positive   3
## 879             hated  negative   3
## 880           hateful  negative   3
## 881            haters  negative   3
## 882            heaven  positive   3
## 883         hilarious  positive   3
## 884              hung  negative   3
## 885         hypocrite  negative   3
## 886        hypocrites  negative   3
## 887           impeach  negative   3
## 888          improper  negative   3
## 889         inclement  negative   3
## 890             inept  negative   3
## 891      inflammatory  negative   3
## 892        innovative  positive   3
## 893       inspiration  positive   3
## 894      intelligence  positive   3
## 895       intelligent  positive   3
## 896      interference  negative   3
## 897        invincible  positive   3
## 898            kindly  positive   3
## 899          kindness  positive   3
## 900              lean  positive   3
## 901         legendary  positive   3
## 902             lemon  negative   3
## 903             livid  negative   3
## 904            lonely  negative   3
## 905            losers  negative   3
## 906             loves  positive   3
## 907             loyal  positive   3
## 908           loyalty  positive   3
## 909            luxury  positive   3
## 910           madness  negative   3
## 911        meaningful  positive   3
## 912           mislead  negative   3
## 913           mistake  negative   3
## 914        mistakenly  negative   3
## 915           mocking  negative   3
## 916         motivated  positive   3
## 917         murderous  negative   3
## 918           mystery  negative   3
## 919             obese  negative   3
## 920         obsession  positive   3
## 921          offender  negative   3
## 922           optimal  positive   3
## 923          outraged  negative   3
## 924           overrun  negative   3
## 925         oversight  negative   3
## 926          overturn  negative   3
## 927        overwhelms  negative   3
## 928            pamper  positive   3
## 929         perfectly  positive   3
## 930              plea  negative   3
## 931              ploy  negative   3
## 932            poised  positive   3
## 933            poorer  negative   3
## 934          precious  positive   3
## 935       progressive  positive   3
## 936             punch  negative   3
## 937            punish  negative   3
## 938         qualified  positive   3
## 939      questionable  negative   3
## 940              rant  negative   3
## 941          reckless  negative   3
## 942    recommendation  positive   3
## 943           refusal  negative   3
## 944            remedy  positive   3
## 945        reputation  positive   3
## 946         resilient  positive   3
## 947        respectful  positive   3
## 948           retract  negative   3
## 949           revenge  negative   3
## 950            reward  positive   3
## 951             risky  negative   3
## 952             rocky  negative   3
## 953              rude  negative   3
## 954              ruin  negative   3
## 955           ruining  negative   3
## 956             rumor  negative   3
## 957               rut  negative   3
## 958           sadness  negative   3
## 959            salute  positive   3
## 960              scum  negative   3
## 961         sensation  positive   3
## 962         sensitive  positive   3
## 963              sham  negative   3
## 964          shameful  negative   3
## 965             sharp  positive   3
## 966          shocking  negative   3
## 967         shortness  negative   3
## 968             silly  negative   3
## 969           sinking  negative   3
## 970           skeptic  negative   3
## 971           skilled  positive   3
## 972          sluggish  negative   3
## 973           spewing  negative   3
## 974             stark  negative   3
## 975            stolen  negative   3
## 976         stressful  negative   3
## 977          strictly  negative   3
## 978            struck  negative   3
## 979         struggled  negative   3
## 980             stunt  negative   3
## 981          superior  positive   3
## 982         supporter  positive   3
## 983          suppress  negative   3
## 984           surreal  positive   3
## 985           swamped  negative   3
## 986          swelling  negative   3
## 987              tank  negative   3
## 988         tentative  negative   3
## 989      totalitarian  negative   3
## 990             toxic  negative   3
## 991           traitor  negative   3
## 992            trauma  negative   3
## 993          travesty  negative   3
## 994         troubling  negative   3
## 995          trusting  positive   3
## 996           turmoil  negative   3
## 997             twist  negative   3
## 998            twists  negative   3
## 999       unavailable  negative   3
## 1000     unbelievable  negative   3
## 1001          unclear  negative   3
## 1002       unreliable  negative   3
## 1003          utterly  negative   3
## 1004             vent  negative   3
## 1005        violation  negative   3
## 1006        violently  negative   3
## 1007        visionary  positive   3
## 1008           warmer  positive   3
## 1009           weaken  negative   3
## 1010              woe  negative   3
## 1011        worrisome  negative   3
## 1012          aborted  negative   2
## 1013          abusive  negative   2
## 1014       accomplish  positive   2
## 1015          accuses  negative   2
## 1016      achievement  positive   2
## 1017        admirable  positive   2
## 1018       advantages  positive   2
## 1019            alarm  negative   2
## 1020            ample  positive   2
## 1021          anarchy  negative   2
## 1022            anger  negative   2
## 1023           ardent  positive   2
## 1024       astounding  positive   2
## 1025         backward  negative   2
## 1026         bankrupt  negative   2
## 1027          bashing  negative   2
## 1028              beg  negative   2
## 1029       beneficial  positive   2
## 1030             bent  negative   2
## 1031           biased  negative   2
## 1032          bigotry  negative   2
## 1033          bizarre  negative   2
## 1034      blockbuster  positive   2
## 1035             blow  negative   2
## 1036            blunt  negative   2
## 1037          booming  positive   2
## 1038          boycott  negative   2
## 1039           buckle  negative   2
## 1040         bullying  negative   2
## 1041         bungling  negative   2
## 1042            burns  negative   2
## 1043          callous  negative   2
## 1044         careless  negative   2
## 1045         civility  positive   2
## 1046          clearer  positive   2
## 1047           clears  positive   2
## 1048            cloud  negative   2
## 1049       compatible  positive   2
## 1050      complaining  negative   2
## 1051        compliant  positive   2
## 1052     complication  negative   2
## 1053    complimentary  positive   2
## 1054    comprehensive  positive   2
## 1055     condemnation  negative   2
## 1056         conflict  negative   2
## 1057        conflicts  negative   2
## 1058             cons  negative   2
## 1059     conspiracies  negative   2
## 1060         contempt  negative   2
## 1061       contradict  negative   2
## 1062    contradiction  negative   2
## 1063         cowardly  negative   2
## 1064            crack  negative   2
## 1065          crashed  negative   2
## 1066            creep  negative   2
## 1067         crippled  negative   2
## 1068       criticisms  negative   2
## 1069          crooked  negative   2
## 1070          culprit  negative   2
## 1071          debacle  negative   2
## 1072            debts  negative   2
## 1073        defeating  positive   2
## 1074        defective  negative   2
## 1075         defender  positive   2
## 1076         delaying  negative   2
## 1077          deluded  negative   2
## 1078           denies  negative   2
## 1079        depressed  negative   2
## 1080          deprive  negative   2
## 1081      desperation  negative   2
## 1082       diligently  positive   2
## 1083              dim  negative   2
## 1084              din  negative   2
## 1085        disagrees  negative   2
## 1086     discriminate  negative   2
## 1087        disgusted  negative   2
## 1088    disheartening  negative   2
## 1089        dishonest  negative   2
## 1090       dismissive  negative   2
## 1091         disputed  negative   2
## 1092    disrespecting  negative   2
## 1093       dissonance  negative   2
## 1094      distinction  positive   2
## 1095    distinguished  positive   2
## 1096         distract  negative   2
## 1097      distracting  negative   2
## 1098     divisiveness  negative   2
## 1099         downturn  negative   2
## 1100            dread  negative   2
## 1101         dreadful  negative   2
## 1102           dumped  negative   2
## 1103            eager  positive   2
## 1104        egregious  negative   2
## 1105          elevate  positive   2
## 1106      elimination  negative   2
## 1107    embarrassment  negative   2
## 1108    encouragement  positive   2
## 1109          enhance  positive   2
## 1110        entertain  positive   2
## 1111     entertaining  positive   2
## 1112            erode  negative   2
## 1113          ethical  positive   2
## 1114            evade  negative   2
## 1115         exceeded  positive   2
## 1116          exceeds  positive   2
## 1117        excessive  negative   2
## 1118        expensive  negative   2
## 1119        explosive  negative   2
## 1120    extermination  negative   2
## 1121       extremists  negative   2
## 1122           fairly  positive   2
## 1123        fallacies  negative   2
## 1124           famous  positive   2
## 1125            fancy  positive   2
## 1126          fastest  positive   2
## 1127         fatigued  negative   2
## 1128        favorable  positive   2
## 1129         flimflam  negative   2
## 1130          foolish  negative   2
## 1131      foolishness  negative   2
## 1132           forged  negative   2
## 1133      fortunately  positive   2
## 1134       fraudulent  negative   2
## 1135          fraught  negative   2
## 1136            freak  negative   2
## 1137         freedoms  positive   2
## 1138         freezing  negative   2
## 1139          friggin  negative   2
## 1140           frozen  negative   2
## 1141       frustrated  negative   2
## 1142              ftw  positive   2
## 1143            fudge  negative   2
## 1144           ghetto  negative   2
## 1145           gifted  positive   2
## 1146           gladly  positive   2
## 1147          glimmer  positive   2
## 1148           glitch  negative   2
## 1149             goon  negative   2
## 1150          grapple  negative   2
## 1151           grieve  negative   2
## 1152         grieving  negative   2
## 1153   groundbreaking  positive   2
## 1154           grumpy  negative   2
## 1155         handsome  positive   2
## 1156        hardships  negative   2
## 1157           harmed  negative   2
## 1158            harms  negative   2
## 1159             hazy  negative   2
## 1160       heartening  positive   2
## 1161        heartless  negative   2
## 1162            hedge  negative   2
## 1163          honesty  positive   2
## 1164          hottest  positive   2
## 1165           humble  positive   2
## 1166      humiliating  negative   2
## 1167            humor  positive   2
## 1168         hysteria  negative   2
## 1169        illegally  negative   2
## 1170     illegitimate  negative   2
## 1171         immature  negative   2
## 1172        impending  negative   2
## 1173           impose  negative   2
## 1174          impress  positive   2
## 1175         inactive  negative   2
## 1176  inconsistencies  negative   2
## 1177       ineptitude  negative   2
## 1178     inequalities  negative   2
## 1179      inescapable  negative   2
## 1180           infamy  negative   2
## 1181     inflammation  negative   2
## 1182         inflated  negative   2
## 1183         infringe  negative   2
## 1184      infuriating  negative   2
## 1185       innovation  positive   2
## 1186       insightful  positive   2
## 1187         insolent  negative   2
## 1188        instantly  positive   2
## 1189          intense  negative   2
## 1190     interruption  negative   2
## 1191            irony  negative   2
## 1192           joyous  positive   2
## 1193            lacks  negative   2
## 1194             lame  negative   2
## 1195       lamentable  negative   2
## 1196           lawful  positive   2
## 1197             lazy  negative   2
## 1198             leer  negative   2
## 1199         leverage  positive   2
## 1200           madden  negative   2
## 1201       manageable  positive   2
## 1202              mar  negative   2
## 1203        marvelous  positive   2
## 1204       miraculous  positive   2
## 1205             mist  negative   2
## 1206           misuse  negative   2
## 1207           mocked  negative   2
## 1208          moronic  negative   2
## 1209            mourn  negative   2
## 1210            naive  negative   2
## 1211        negligent  negative   2
## 1212            noble  positive   2
## 1213            noise  negative   2
## 1214             numb  negative   2
## 1215       objections  negative   2
## 1216        obnoxious  negative   2
## 1217        onslaught  negative   2
## 1218         optimism  positive   2
## 1219         overtake  positive   2
## 1220        overtakes  positive   2
## 1221        overthrow  negative   2
## 1222            pains  negative   2
## 1223      paradoxical  negative   2
## 1224          passion  positive   2
## 1225          patriot  positive   2
## 1226       peacefully  positive   2
## 1227          penalty  negative   2
## 1228        persevere  positive   2
## 1229            phony  negative   2
## 1230        poisonous  negative   2
## 1231       positively  positive   2
## 1232        prejudice  negative   2
## 1233        prominent  positive   2
## 1234          prudent  positive   2
## 1235            raped  negative   2
## 1236     recklessness  negative   2
## 1237          reforms  positive   2
## 1238         refunded  positive   2
## 1239          relaxed  positive   2
## 1240       remarkable  positive   2
## 1241       remarkably  positive   2
## 1242          renewed  positive   2
## 1243          respite  positive   2
## 1244             rife  negative   2
## 1245       rightfully  positive   2
## 1246             sane  positive   2
## 1247          savings  positive   2
## 1248            scams  negative   2
## 1249          scarier  negative   2
## 1250         scratchy  negative   2
## 1251        selective  positive   2
## 1252           senile  negative   2
## 1253             sexy  positive   2
## 1254            shaky  negative   2
## 1255          shallow  negative   2
## 1256            shock  negative   2
## 1257        sickening  negative   2
## 1258          sincere  positive   2
## 1259         sinister  negative   2
## 1260       skepticism  negative   2
## 1261            skill  positive   2
## 1262             slap  negative   2
## 1263            slave  negative   2
## 1264            slick  positive   2
## 1265           slowed  negative   2
## 1266           slower  negative   2
## 1267         smartest  positive   2
## 1268            smear  negative   2
## 1269        spiritual  positive   2
## 1270            spoil  negative   2
## 1271        stability  positive   2
## 1272            stall  negative   2
## 1273           starve  negative   2
## 1274       straighten  positive   2
## 1275         stresses  negative   2
## 1276         stunning  positive   2
## 1277          succeed  positive   2
## 1278          suffers  negative   2
## 1279          surpass  positive   2
## 1280        suspicion  negative   2
## 1281          swagger  negative   2
## 1282            swipe  negative   2
## 1283           taunts  negative   2
## 1284            tease  negative   2
## 1285      tentatively  negative   2
## 1286     thoughtfully  positive   2
## 1287           thrive  positive   2
## 1288         toughest  positive   2
## 1289      tranquility  positive   2
## 1290      traumatized  negative   2
## 1291         treasure  positive   2
## 1292     tremendously  positive   2
## 1293           trophy  positive   2
## 1294         troubled  negative   2
## 1295           tyrant  negative   2
## 1296       unaffected  positive   2
## 1297         unbiased  positive   2
## 1298         uncaring  negative   2
## 1299      uncivilized  negative   2
## 1300 unconstitutional  negative   2
## 1301   understandable  positive   2
## 1302       undisputed  positive   2
## 1303        unhealthy  negative   2
## 1304     unimaginable  negative   2
## 1305       uninformed  negative   2
## 1306     unreasonable  negative   2
## 1307      unthinkable  negative   2
## 1308           untrue  negative   2
## 1309          unusual  negative   2
## 1310         unwanted  negative   2
## 1311       unwavering  positive   2
## 1312           unwise  negative   2
## 1313           upheld  positive   2
## 1314         uprising  negative   2
## 1315           uproar  negative   2
## 1316            vague  negative   2
## 1317          variety  positive   2
## 1318        vengeance  negative   2
## 1319          vibrant  positive   2
## 1320         virulent  negative   2
## 1321            vomit  negative   2
## 1322           wanton  negative   2
## 1323             wary  negative   2
## 1324          wealthy  positive   2
## 1325            whiny  negative   2
## 1326           wildly  negative   2
## 1327        willingly  positive   2
## 1328      willingness  positive   2
## 1329              woo  positive   2
## 1330         worrying  negative   2
## 1331       worthwhile  positive   2
## 1332           wounds  negative   2
## 1333            wreak  negative   2
## 1334            wreck  negative   2
## 1335          wrestle  negative   2
## 1336          abolish  negative   1
## 1337      abomination  negative   1
## 1338           aborts  negative   1
## 1339           abound  positive   1
## 1340          abounds  positive   1
## 1341         abruptly  negative   1
## 1342           abused  negative   1
## 1343            abyss  negative   1
## 1344        accolades  positive   1
## 1345  accomplishments  positive   1
## 1346      accusations  negative   1
## 1347         accusing  negative   1
## 1348     achievements  positive   1
## 1349           aching  negative   1
## 1350        adamantly  negative   1
## 1351         adaptive  positive   1
## 1352        addicting  negative   1
## 1353        admirably  positive   1
## 1354         adorable  positive   1
## 1355           adored  positive   1
## 1356          adoring  positive   1
## 1357        adversary  negative   1
## 1358     affectionate  positive   1
## 1359           affirm  positive   1
## 1360      affirmative  positive   1
## 1361         affluent  positive   1
## 1362          affront  negative   1
## 1363       aggression  negative   1
## 1364           aghast  negative   1
## 1365          agility  positive   1
## 1366            agony  negative   1
## 1367       alarmingly  negative   1
## 1368            amaze  positive   1
## 1369           amazed  positive   1
## 1370           amazes  positive   1
## 1371        ambitious  positive   1
## 1372          amenity  positive   1
## 1373        anarchist  negative   1
## 1374           anemic  negative   1
## 1375          annoyed  negative   1
## 1376        anxieties  negative   1
## 1377     appreciative  positive   1
## 1378     apprehensive  negative   1
## 1379          archaic  negative   1
## 1380          arduous  negative   1
## 1381        arrogance  negative   1
## 1382       articulate  positive   1
## 1383          asinine  negative   1
## 1384      assassinate  negative   1
## 1385           assure  positive   1
## 1386          astound  positive   1
## 1387       atrocities  negative   1
## 1388          atrophy  negative   1
## 1389        attentive  positive   1
## 1390         audacity  negative   1
## 1391       autonomous  positive   1
## 1392        avalanche  negative   1
## 1393             avid  positive   1
## 1394          awarded  positive   1
## 1395           babble  negative   1
## 1396         backbone  positive   1
## 1397           baffle  negative   1
## 1398         baffling  negative   1
## 1399         balanced  positive   1
## 1400         barbaric  negative   1
## 1401         baseless  negative   1
## 1402         battered  negative   1
## 1403      beautifully  positive   1
## 1404          belated  negative   1
## 1405       believable  positive   1
## 1406       belittling  negative   1
## 1407      bewildering  negative   1
## 1408           bicker  negative   1
## 1409      blasphemous  negative   1
## 1410        blatantly  negative   1
## 1411           bleeds  negative   1
## 1412          bloated  negative   1
## 1413           bloody  negative   1
## 1414            bloom  positive   1
## 1415          blunder  negative   1
## 1416             bomb  negative   1
## 1417           boring  negative   1
## 1418         bothered  negative   1
## 1419        brainless  negative   1
## 1420             brat  negative   1
## 1421          breakup  negative   1
## 1422     breathtaking  positive   1
## 1423        brightest  positive   1
## 1424       brilliance  positive   1
## 1425            brood  negative   1
## 1426          bruised  negative   1
## 1427      brutalities  negative   1
## 1428        brutalize  negative   1
## 1429             bugs  negative   1
## 1430              bum  negative   1
## 1431           bumped  negative   1
## 1432          bumping  negative   1
## 1433            bumpy  negative   1
## 1434         calamity  negative   1
## 1435         casualty  negative   1
## 1436          chaotic  negative   1
## 1437       charitable  positive   1
## 1438            charm  positive   1
## 1439          cheaper  positive   1
## 1440            cheat  negative   1
## 1441         cheating  negative   1
## 1442         chivalry  positive   1
## 1443      cleanliness  positive   1
## 1444           clever  positive   1
## 1445           clique  negative   1
## 1446             clog  negative   1
## 1447         coherent  positive   1
## 1448          collude  negative   1
## 1449      competitive  positive   1
## 1450       complacent  negative   1
## 1451        complains  negative   1
## 1452        complaint  negative   1
## 1453       compliment  positive   1
## 1454          concede  negative   1
## 1455          confess  negative   1
## 1456      conflicting  negative   1
## 1457          confuse  negative   1
## 1458        congested  negative   1
## 1459          contend  negative   1
## 1460       continuity  positive   1
## 1461       convincing  positive   1
## 1462      cooperative  positive   1
## 1463        courteous  positive   1
## 1464          cracked  negative   1
## 1465         crashing  negative   1
## 1466            crass  negative   1
## 1467           craven  negative   1
## 1468           creeps  negative   1
## 1469        crippling  negative   1
## 1470           critic  negative   1
## 1471       criticized  negative   1
## 1472        crumbling  negative   1
## 1473         culpable  negative   1
## 1474            curse  negative   1
## 1475           curses  negative   1
## 1476             cuss  negative   1
## 1477         cuteness  positive   1
## 1478          cynical  negative   1
## 1479          damaged  negative   1
## 1480          damning  negative   1
## 1481           darker  negative   1
## 1482         daunting  negative   1
## 1483             dawn  positive   1
## 1484         decadent  negative   1
## 1485           deceit  negative   1
## 1486          decency  positive   1
## 1487      deceptively  negative   1
## 1488         declines  negative   1
## 1489        defensive  negative   1
## 1490         defiance  negative   1
## 1491         delicate  positive   1
## 1492        delighted  positive   1
## 1493       delightful  positive   1
## 1494         delirium  negative   1
## 1495           deluge  negative   1
## 1496          demonic  negative   1
## 1497         denounce  negative   1
## 1498         deprived  negative   1
## 1499           desert  negative   1
## 1500         desolate  negative   1
## 1501          despise  negative   1
## 1502        despotism  negative   1
## 1503          destiny  positive   1
## 1504        destroyer  negative   1
## 1505            deter  negative   1
## 1506      deteriorate  negative   1
## 1507       detestable  negative   1
## 1508        detesting  negative   1
## 1509      detrimental  negative   1
## 1510        devastate  negative   1
## 1511      devastation  negative   1
## 1512      dictatorial  negative   1
## 1513      dilapidated  negative   1
## 1514          dilemma  negative   1
## 1515         diligent  positive   1
## 1516       diplomatic  positive   1
## 1517          disable  negative   1
## 1518     disadvantage  negative   1
## 1519    disadvantaged  negative   1
## 1520        disagreed  negative   1
## 1521      disagreeing  negative   1
## 1522     disagreement  negative   1
## 1523       disappoint  negative   1
## 1524       disapprove  negative   1
## 1525        disbelief  negative   1
## 1526       discomfort  negative   1
## 1527          discord  negative   1
## 1528       discourage  negative   1
## 1529     dishonorable  negative   1
## 1530     disingenuous  negative   1
## 1531     disorganized  negative   1
## 1532      disoriented  negative   1
## 1533      dispiriting  negative   1
## 1534          dispute  negative   1
## 1535          dissent  negative   1
## 1536       dissidents  negative   1
## 1537       distortion  negative   1
## 1538       distraught  negative   1
## 1539       distressed  negative   1
## 1540         distrust  negative   1
## 1541        disturbed  negative   1
## 1542           divine  positive   1
## 1543         divisive  negative   1
## 1544        downgrade  negative   1
## 1545         downhill  negative   1
## 1546        draconian  negative   1
## 1547             drag  negative   1
## 1548          dragged  negative   1
## 1549          drained  negative   1
## 1550          drastic  negative   1
## 1551        drawbacks  negative   1
## 1552          dropout  negative   1
## 1553            drunk  negative   1
## 1554              dud  negative   1
## 1555          durable  positive   1
## 1556            eases  positive   1
## 1557        ebullient  positive   1
## 1558           effigy  negative   1
## 1559          empower  positive   1
## 1560          endorse  positive   1
## 1561         endorsed  positive   1
## 1562      endorsement  positive   1
## 1563         engaging  positive   1
## 1564         enhanced  positive   1
## 1565        enjoyable  positive   1
## 1566        enjoyment  positive   1
## 1567           enjoys  positive   1
## 1568        enlighten  positive   1
## 1569 enthusiastically  positive   1
## 1570           entice  positive   1
## 1571          entrust  positive   1
## 1572            erase  negative   1
## 1573         euphoria  positive   1
## 1574            evils  negative   1
## 1575        evocative  positive   1
## 1576       exacerbate  negative   1
## 1577       exaggerate  negative   1
## 1578      exasperated  negative   1
## 1579        exceeding  positive   1
## 1580      exceedingly  positive   1
## 1581         excelled  positive   1
## 1582        exclusion  negative   1
## 1583     excruciating  negative   1
## 1584         expertly  positive   1
## 1585       facilitate  positive   1
## 1586         fairness  positive   1
## 1587       faithfully  positive   1
## 1588       fallacious  negative   1
## 1589          falsify  negative   1
## 1590             fame  positive   1
## 1591         famously  positive   1
## 1592          fanatic  negative   1
## 1593      fascinating  positive   1
## 1594      fashionable  positive   1
## 1595          fatally  negative   1
## 1596           faulty  negative   1
## 1597              fav  positive   1
## 1598             faze  negative   1
## 1599         fearless  positive   1
## 1600            felon  negative   1
## 1601           fiasco  negative   1
## 1602           fierce  negative   1
## 1603            filth  negative   1
## 1604           finest  positive   1
## 1605    flabbergasted  negative   1
## 1606            flare  negative   1
## 1607       flawlessly  positive   1
## 1608         flourish  positive   1
## 1609              foe  negative   1
## 1610        forbidden  negative   1
## 1611         forsaken  negative   1
## 1612          fragile  negative   1
## 1613           freaks  negative   1
## 1614            freed  positive   1
## 1615           frenzy  negative   1
## 1616             fret  negative   1
## 1617           fright  negative   1
## 1618      frightening  negative   1
## 1619            frost  negative   1
## 1620            froze  negative   1
## 1621       frustrates  negative   1
## 1622     frustrations  negative   1
## 1623          gaining  positive   1
## 1624       generosity  positive   1
## 1625       generously  positive   1
## 1626           gentle  positive   1
## 1627          genuine  positive   1
## 1628             glee  positive   1
## 1629       glistening  positive   1
## 1630         glorious  positive   1
## 1631             glut  negative   1
## 1632            goofy  negative   1
## 1633         graceful  positive   1
## 1634     graciousness  positive   1
## 1635        grievance  negative   1
## 1636       grievances  negative   1
## 1637           gritty  negative   1
## 1638         gullible  negative   1
## 1639            gusto  positive   1
## 1640            hacks  negative   1
## 1641             hail  positive   1
## 1642           hamper  negative   1
## 1643            handy  positive   1
## 1644          hapless  negative   1
## 1645       harassment  negative   1
## 1646          harbors  negative   1
## 1647          harmful  negative   1
## 1648           hassle  negative   1
## 1649             haze  negative   1
## 1650        healthful  positive   1
## 1651         heavenly  positive   1
## 1652           heckle  negative   1
## 1653         hegemony  negative   1
## 1654         helpless  negative   1
## 1655           heresy  negative   1
## 1656           heroic  positive   1
## 1657         hesitant  negative   1
## 1658          hideous  negative   1
## 1659           hinder  negative   1
## 1660            hoard  negative   1
## 1661           hollow  negative   1
## 1662           hooray  positive   1
## 1663         hopeless  negative   1
## 1664       horrendous  negative   1
## 1665           horrid  negative   1
## 1666        horrified  negative   1
## 1667       horrifying  negative   1
## 1668          hostage  negative   1
## 1669          hotbeds  negative   1
## 1670         humility  positive   1
## 1671             hype  negative   1
## 1672     hypocritical  negative   1
## 1673           idiocy  negative   1
## 1674             idle  negative   1
## 1675             idol  positive   1
## 1676          illicit  negative   1
## 1677        illogical  negative   1
## 1678         illusion  negative   1
## 1679      illustrious  positive   1
## 1680         imbecile  negative   1
## 1681          immense  positive   1
## 1682     imprisonment  negative   1
## 1683       improperly  negative   1
## 1684       inaccuracy  negative   1
## 1685       inadequacy  negative   1
## 1686    inappropriate  negative   1
## 1687        incapable  negative   1
## 1688           incite  negative   1
## 1689    inconsiderate  negative   1
## 1690      incorrectly  negative   1
## 1691     indifference  negative   1
## 1692   indoctrination  negative   1
## 1693         indolent  negative   1
## 1694      inefficient  negative   1
## 1695       ineligible  negative   1
## 1696       inevitably  negative   1
## 1697     inextricable  negative   1
## 1698         inferior  negative   1
## 1699         infested  negative   1
## 1700          inflict  negative   1
## 1701     infringement  negative   1
## 1702        infuriate  negative   1
## 1703       infuriated  negative   1
## 1704        ingenious  positive   1
## 1705       inhibition  negative   1
## 1706       injustices  negative   1
## 1707        insidious  negative   1
## 1708        insincere  negative   1
## 1709      instability  negative   1
## 1710     insufficient  negative   1
## 1711           insult  negative   1
## 1712        insulting  negative   1
## 1713     intermittent  negative   1
## 1714       intimidate  negative   1
## 1715     intimidation  negative   1
## 1716       intriguing  positive   1
## 1717       invaluable  positive   1
## 1718         invasive  negative   1
## 1719    irresponsibly  negative   1
## 1720        irritated  negative   1
## 1721       irritating  negative   1
## 1722          itching  negative   1
## 1723              jam  negative   1
## 1724          jarring  negative   1
## 1725          jealous  negative   1
## 1726             jerk  negative   1
## 1727            joker  negative   1
## 1728            jolly  positive   1
## 1729             junk  negative   1
## 1730              lag  negative   1
## 1731            lapse  negative   1
## 1732    laughingstock  negative   1
## 1733      lawlessness  negative   1
## 1734            leaks  negative   1
## 1735          lengthy  negative   1
## 1736           liable  negative   1
## 1737         liberate  positive   1
## 1738         lifeless  negative   1
## 1739           liking  positive   1
## 1740      limitations  negative   1
## 1741           lively  positive   1
## 1742           loathe  negative   1
## 1743         loathing  negative   1
## 1744          logical  positive   1
## 1745          longing  negative   1
## 1746            lousy  negative   1
## 1747           lovely  positive   1
## 1748        ludicrous  negative   1
## 1749          lurking  negative   1
## 1750        luxurious  positive   1
## 1751        maddening  negative   1
## 1752           madder  negative   1
## 1753          magical  positive   1
## 1754         majestic  positive   1
## 1755            mania  negative   1
## 1756           maniac  negative   1
## 1757     manipulation  negative   1
## 1758           marvel  positive   1
## 1759           master  positive   1
## 1760        masterful  positive   1
## 1761          masters  positive   1
## 1762         meltdown  negative   1
## 1763            merit  positive   1
## 1764            merry  positive   1
## 1765           messes  negative   1
## 1766        militancy  negative   1
## 1767         miracles  positive   1
## 1768   misconceptions  negative   1
## 1769     misdirection  negative   1
## 1770           misery  negative   1
## 1771        misguided  negative   1
## 1772           mishap  negative   1
## 1773           misses  negative   1
## 1774         mistaken  negative   1
## 1775         mistakes  negative   1
## 1776         mistress  negative   1
## 1777         mistrust  negative   1
## 1778             moan  negative   1
## 1779             mock  negative   1
## 1780          mockery  negative   1
## 1781            mocks  negative   1
## 1782        momentous  positive   1
## 1783            moody  negative   1
## 1784         morality  positive   1
## 1785            mushy  negative   1
## 1786       mysterious  negative   1
## 1787          naughty  negative   1
## 1788         nebulous  negative   1
## 1789        negatives  negative   1
## 1790       negativity  negative   1
## 1791         nepotism  negative   1
## 1792           nicely  positive   1
## 1793          nitpick  negative   1
## 1794      nonexistent  negative   1
## 1795          notably  positive   1
## 1796       noteworthy  positive   1
## 1797      notoriously  negative   1
## 1798          novelty  positive   1
## 1799         nuisance  negative   1
## 1800         obstacle  negative   1
## 1801      obstruction  negative   1
## 1802           oddest  negative   1
## 1803             odor  negative   1
## 1804           offend  negative   1
## 1805           orphan  negative   1
## 1806           outcry  negative   1
## 1807          outdone  positive   1
## 1808     outperformed  positive   1
## 1809       outrageous  negative   1
## 1810         outsmart  positive   1
## 1811        overblown  negative   1
## 1812          overdue  negative   1
## 1813         overkill  negative   1
## 1814       overweight  negative   1
## 1815        overwhelm  negative   1
## 1816   overwhelmingly  negative   1
## 1817             pale  negative   1
## 1818            pales  negative   1
## 1819        pandering  negative   1
## 1820         panicked  negative   1
## 1821         paradise  positive   1
## 1822        paralyzed  negative   1
## 1823        paramount  positive   1
## 1824         paranoia  negative   1
## 1825         paranoid  negative   1
## 1826         partisan  negative   1
## 1827            passe  negative   1
## 1828       passionate  positive   1
## 1829     passionately  positive   1
## 1830        patiently  positive   1
## 1831        patriotic  positive   1
## 1832         penalize  negative   1
## 1833            peril  negative   1
## 1834     personalized  positive   1
## 1835         perverts  negative   1
## 1836  pessimistically  negative   1
## 1837            petty  negative   1
## 1838             pigs  negative   1
## 1839            pinch  negative   1
## 1840             pity  negative   1
## 1841          pleases  positive   1
## 1842           poetic  positive   1
## 1843         poignant  positive   1
## 1844         portable  positive   1
## 1845        powerless  negative   1
## 1846     premeditated  negative   1
## 1847      prestigious  positive   1
## 1848        priceless  positive   1
## 1849        primitive  negative   1
## 1850        proactive  positive   1
## 1851      problematic  negative   1
## 1852         profound  positive   1
## 1853         prolific  positive   1
## 1854             pros  positive   1
## 1855          prosper  positive   1
## 1856         punitive  negative   1
## 1857             punk  negative   1
## 1858           puppet  negative   1
## 1859             pure  positive   1
## 1860            quack  negative   1
## 1861            quash  negative   1
## 1862            queer  negative   1
## 1863        radically  negative   1
## 1864             rail  negative   1
## 1865          rampage  negative   1
## 1866            rants  negative   1
## 1867             rape  negative   1
## 1868             rash  negative   1
## 1869         rational  positive   1
## 1870           ravage  negative   1
## 1871          readily  positive   1
## 1872         reassure  positive   1
## 1873       recklessly  negative   1
## 1874        reconcile  positive   1
## 1875          rectify  positive   1
## 1876       redemption  positive   1
## 1877         reformed  positive   1
## 1878          refresh  positive   1
## 1879       refreshing  positive   1
## 1880            regal  positive   1
## 1881      regretfully  negative   1
## 1882          regrets  negative   1
## 1883           reject  negative   1
## 1884         rejected  negative   1
## 1885          rejects  negative   1
## 1886          rejoice  positive   1
## 1887       relentless  negative   1
## 1888          remorse  negative   1
## 1889         renowned  positive   1
## 1890         reproach  negative   1
## 1891        repugnant  negative   1
## 1892         resigned  negative   1
## 1893     respectfully  positive   1
## 1894       responsive  positive   1
## 1895         restless  negative   1
## 1896         restored  positive   1
## 1897         restrict  negative   1
## 1898      restriction  negative   1
## 1899    restructuring  positive   1
## 1900           retard  negative   1
## 1901           revive  positive   1
## 1902    revolutionary  positive   1
## 1903        rewarding  positive   1
## 1904     ridiculously  negative   1
## 1905          rightly  positive   1
## 1906           ripped  negative   1
## 1907             rosy  positive   1
## 1908          rubbish  negative   1
## 1909            ruins  negative   1
## 1910           rumors  negative   1
## 1911            rusty  negative   1
## 1912             sack  negative   1
## 1913             sass  negative   1
## 1914        satisfied  positive   1
## 1915          satisfy  positive   1
## 1916       satisfying  positive   1
## 1917           savage  negative   1
## 1918          scandal  negative   1
## 1919            scars  negative   1
## 1920            scorn  negative   1
## 1921          scourge  negative   1
## 1922        scrambled  negative   1
## 1923       scrambling  negative   1
## 1924            scrap  negative   1
## 1925         seamless  positive   1
## 1926        senseless  negative   1
## 1927         setbacks  negative   1
## 1928        shameless  negative   1
## 1929          sharply  negative   1
## 1930          shatter  negative   1
## 1931            shine  positive   1
## 1932     shortsighted  negative   1
## 1933 shortsightedness  negative   1
## 1934         showdown  negative   1
## 1935           shrill  negative   1
## 1936          shrivel  negative   1
## 1937           sickly  negative   1
## 1938          slander  negative   1
## 1939         slashing  negative   1
## 1940      slaughtered  negative   1
## 1941           slaves  negative   1
## 1942           slooow  negative   1
## 1943           sloppy  negative   1
## 1944            sloth  negative   1
## 1945           smiles  positive   1
## 1946         smoother  positive   1
## 1947         smoothly  positive   1
## 1948              sob  negative   1
## 1949            sober  negative   1
## 1950         sobering  negative   1
## 1951             soft  positive   1
## 1952           solace  positive   1
## 1953           soothe  positive   1
## 1954    sophisticated  positive   1
## 1955      spectacular  positive   1
## 1956    spectacularly  positive   1
## 1957             spew  negative   1
## 1958            split  negative   1
## 1959        splitting  negative   1
## 1960           squirm  negative   1
## 1961           stable  positive   1
## 1962            stain  negative   1
## 1963           stalls  negative   1
## 1964            steep  negative   1
## 1965          stellar  positive   1
## 1966       stereotype  negative   1
## 1967            stern  negative   1
## 1968             stew  negative   1
## 1969            stiff  negative   1
## 1970         stifling  negative   1
## 1971           stigma  negative   1
## 1972         stinging  negative   1
## 1973           stinks  negative   1
## 1974        straining  negative   1
## 1975           strife  negative   1
## 1976        strongest  positive   1
## 1977          stunned  positive   1
## 1978        stupidest  negative   1
## 1979         stupidly  negative   1
## 1980       stuttering  negative   1
## 1981          stylish  positive   1
## 1982            suave  positive   1
## 1983         subpoena  negative   1
## 1984     subservience  negative   1
## 1985      subservient  negative   1
## 1986        succeeded  positive   1
## 1987       succeeding  positive   1
## 1988         succeeds  positive   1
## 1989          succumb  negative   1
## 1990             sues  negative   1
## 1991     sufficiently  positive   1
## 1992         suitable  positive   1
## 1993           superb  positive   1
## 1994       supportive  positive   1
## 1995       suspicions  negative   1
## 1996           swanky  positive   1
## 1997         sweeping  positive   1
## 1998            swift  positive   1
## 1999          tainted  negative   1
## 2000           tanked  negative   1
## 2001            tanks  negative   1
## 2002          tarnish  negative   1
## 2003           taxing  negative   1
## 2004         tempting  positive   1
## 2005           tender  positive   1
## 2006       tenderness  negative   1
## 2007          tenuous  negative   1
## 2008         terribly  negative   1
## 2009           terror  negative   1
## 2010        terrorize  negative   1
## 2011       thoughtful  positive   1
## 2012           thrift  positive   1
## 2013          thrifty  positive   1
## 2014             thug  negative   1
## 2015         tingling  negative   1
## 2016           tiring  negative   1
## 2017        torturing  negative   1
## 2018       tragically  negative   1
## 2019       traitorous  negative   1
## 2020          trapped  negative   1
## 2021        traumatic  negative   1
## 2022           trendy  positive   1
## 2023           tricky  negative   1
## 2024      trustworthy  positive   1
## 2025         truthful  positive   1
## 2026          twisted  negative   1
## 2027       tyrannical  negative   1
## 2028          tyranny  negative   1
## 2029     unbelievably  negative   1
## 2030         undercut  negative   1
## 2031         underdog  negative   1
## 2032        undermine  negative   1
## 2033       undermined  negative   1
## 2034      undermining  negative   1
## 2035        underpaid  negative   1
## 2036       uneasiness  negative   1
## 2037      unequivocal  positive   1
## 2038    unequivocally  positive   1
## 2039        unethical  negative   1
## 2040           uneven  negative   1
## 2041     unexpectedly  negative   1
## 2042         unfairly  negative   1
## 2043            unfit  negative   1
## 2044       unforeseen  negative   1
## 2045    unforgettable  positive   1
## 2046          unhappy  negative   1
## 2047     unimaginably  negative   1
## 2048           unkind  negative   1
## 2049          unlucky  negative   1
## 2050         unneeded  negative   1
## 2051        unpopular  negative   1
## 2052    unpredictable  negative   1
## 2053       unprepared  negative   1
## 2054           unreal  positive   1
## 2055      unrelenting  negative   1
## 2056       unsettling  negative   1
## 2057         unsteady  negative   1
## 2058           unsure  negative   1
## 2059     unsuspecting  negative   1
## 2060    unsustainable  negative   1
## 2061         untested  negative   1
## 2062         untimely  negative   1
## 2063        untouched  negative   1
## 2064    untrustworthy  negative   1
## 2065         unusable  negative   1
## 2066      unwarranted  negative   1
## 2067           upbeat  positive   1
## 2068         upgraded  positive   1
## 2069           uphold  positive   1
## 2070        uplifting  positive   1
## 2071             vain  negative   1
## 2072            valor  positive   1
## 2073           vanity  negative   1
## 2074            venom  negative   1
## 2075        versatile  positive   1
## 2076          vicious  negative   1
## 2077       victorious  positive   1
## 2078          violate  negative   1
## 2079        violators  negative   1
## 2080           virtue  positive   1
## 2081            vivid  positive   1
## 2082         volatile  negative   1
## 2083           wallow  negative   1
## 2084           warmly  positive   1
## 2085           warped  negative   1
## 2086         wasteful  negative   1
## 2087          wasting  negative   1
## 2088        weakening  negative   1
## 2089           weaker  negative   1
## 2090         weakness  negative   1
## 2091             weep  negative   1
## 2092          weirdly  negative   1
## 2093          whining  negative   1
## 2094             whoa  positive   1
## 2095   wholeheartedly  positive   1
## 2096         windfall  positive   1
## 2097           wisely  positive   1
## 2098      wonderfully  positive   1
## 2099         wondrous  positive   1
## 2100           worsen  negative   1
## 2101       worthiness  positive   1
## 2102    worthlessness  negative   1
## 2103            wrath  negative   1
## 2104          wrinkle  negative   1
## 2105          wrongly  negative   1
## 2106           zenith  positive   1

Let’s graph the US data.

bing_word_counts_US %>%
  group_by(sentiment) %>%
  slice_max(n, n = 10) %>%
  ungroup() %>%
  dplyr::mutate(word = reorder(word, n)) %>%
  ggplot(aes(n, word, fill = sentiment)) +
  geom_col(show.legend = FALSE) +
  facet_wrap(~sentiment, scales = "free_y") +
  labs(x = "Contribution to Sentiment", y = NULL)

Let’s create the function.

custom_stop_words <- bind_rows(tibble(word = c("trump", "positive"), 
                                      lexicon = c("custom")), 
                               stop_words)
custom_stop_words
## # A tibble: 1,151 × 2
##    word        lexicon
##    <chr>       <chr>  
##  1 trump       custom 
##  2 positive    custom 
##  3 a           SMART  
##  4 a's         SMART  
##  5 able        SMART  
##  6 about       SMART  
##  7 above       SMART  
##  8 according   SMART  
##  9 accordingly SMART  
## 10 across      SMART  
## # … with 1,141 more rows

Word Clouds! Let’s load the required packages.

library(wordcloud)
library(tidytext)
library(reshape2)

tidy_tweetsUS %>%
  anti_join(custom_stop_words) %>%
  inner_join(get_sentiments("bing")) %>%
  count(word, sentiment, sort = TRUE) %>%
  acast(word ~ sentiment, value.var = "n", fill = 0) %>%
  comparison.cloud(colors = c("gray20", "gray80"), 
                   max.words = 100)
## Joining, by = "word"
## Joining, by = "word"

Let’s join the data.

tidy_tweetsUS %>%
  anti_join(custom_stop_words) %>%
  count(word) %>%
  with(wordcloud(word, n, max.words = 100))
## Joining, by = "word"

Let’s find the negative words.

bingnegative <- get_sentiments("bing") %>%
  filter(sentiment == "negative") 

wordcounts <- tidy_tweetsCA %>%
  group_by(year) %>%
  dplyr::summarize(words = n())

tidy_tweetsCA %>%
  semi_join(bingnegative) %>%
  group_by(year) %>%
  dplyr::summarize(negativewords = n()) %>%
  left_join(wordcounts, by = "year") %>%
 dplyr:: mutate(ratio = negativewords/words) %>%
  slice_max(ratio, n = 3) %>%
  ungroup()
## Joining, by = "word"
## # A tibble: 3 × 4
##   year  negativewords words  ratio
##   <chr>         <int> <int>  <dbl>
## 1 y2020          2602 48044 0.0542
## 2 y2021          1642 31391 0.0523
## 3 y2022           723 16761 0.0431